Data Description

INTRODUCTION

Overview of the Dataset

The Hotel Booking Dataset is a comprehensive collection of data related to hotel bookings. It includes various details such as booking status, duration of stay, type of hotel, and customer information.

Source of the Dataset

This dataset was sourced from Kaggle.

Objective of the Analysis

The primary objective of this project is to analyze the hotel booking patterns, identify peak seasons, and understand customer preferences to improve service and maximize revenue.

Features of the Dataset

The dataset contains information about various aspects of hotel bookings. Below are the details of each variable

  • adr : Average daily rate.
  • adults : Number of adults.
  • agent : ID of the travel agency that made the booking.
  • arrival_date_day_of_month : Day of the month of the arrival date.
  • arrival_date_month : Month of arrival date with 12 categories: “January” to “December”.
  • arrival_date_week_number : Week number of the arrival date.
  • arrival_date_year : Year of arrival date.
  • assigned_room_type : Code for the type of room assigned to the booking. Sometimes differs from the reserved room type.
  • babies : Number of babies.
  • booking_changes : Number of changes/amendments made to the booking.
  • children : Number of children.
  • company : ID of the company/entity responsible for the booking.
  • country : Country of origin in ISO 3155–3:2013 format.
  • customer_type : Type of booking, assuming one of four categories.
  • days_in_waiting_list : Days the booking was in the waiting list.
  • deposit_type : Type of deposit made for the booking.
  • distribution_channel : Booking distribution channel.
  • is_canceled : Indicates if the booking was canceled (1) or not (0).
  • is_repeated_quests : Indicates if the booking is from a repeated guest (1) or not (0).
  • lead_time : Days elapsed between booking and arrival.
  • market_segment : Market segment designation.
  • meal : Type of meal booked.
  • previous_bookings_not_canceled : Number of previous bookings not cancelled.
  • previous_cancellations : Number of previous bookings cancelled.
  • required_car_parking_spaces : Number of required car parking spaces.
  • reservation_status : Last status of the reservation.
  • reservation_status_date : Date of the last reservation status.
  • reserved_room_type : Code of room type reserved.
  • stays_in_weekend_nights : Number of weekend nights stayed.
  • stays_in_week_nights : Number of week nights stayed.
  • total_of_special_requests : Number of special requests made by the customer. ## Potential Applications

The insights derived from this dataset can be pivotal for predictive analysis, customer behavior understanding, and strategic planning in hotel management.

# Load necessary library
library(readr)
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(tidyr)
## Warning: package 'tidyr' was built under R version 4.3.2
library(caret)
## Warning: package 'caret' was built under R version 4.3.2
## Loading required package: ggplot2
## Warning: package 'ggplot2' was built under R version 4.3.2
## Loading required package: lattice
## Warning: package 'lattice' was built under R version 4.3.2
# Read the CSV file into a data frame
hotel_data <- read_csv("G:/semester_1/4_Statistics_R/projects/hotel_management/hotel_bookings.csv/hotel_bookings.csv")
## Rows: 119390 Columns: 32
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr  (13): hotel, arrival_date_month, meal, country, market_segment, distrib...
## dbl  (18): is_canceled, lead_time, arrival_date_year, arrival_date_week_numb...
## date  (1): reservation_status_date
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
# View the first few rows of the data frame
summary(hotel_data)
##     hotel            is_canceled       lead_time   arrival_date_year
##  Length:119390      Min.   :0.0000   Min.   :  0   Min.   :2015     
##  Class :character   1st Qu.:0.0000   1st Qu.: 18   1st Qu.:2016     
##  Mode  :character   Median :0.0000   Median : 69   Median :2016     
##                     Mean   :0.3704   Mean   :104   Mean   :2016     
##                     3rd Qu.:1.0000   3rd Qu.:160   3rd Qu.:2017     
##                     Max.   :1.0000   Max.   :737   Max.   :2017     
##                                                                     
##  arrival_date_month arrival_date_week_number arrival_date_day_of_month
##  Length:119390      Min.   : 1.00            Min.   : 1.0             
##  Class :character   1st Qu.:16.00            1st Qu.: 8.0             
##  Mode  :character   Median :28.00            Median :16.0             
##                     Mean   :27.17            Mean   :15.8             
##                     3rd Qu.:38.00            3rd Qu.:23.0             
##                     Max.   :53.00            Max.   :31.0             
##                                                                       
##  stays_in_weekend_nights stays_in_week_nights     adults      
##  Min.   : 0.0000         Min.   : 0.0         Min.   : 0.000  
##  1st Qu.: 0.0000         1st Qu.: 1.0         1st Qu.: 2.000  
##  Median : 1.0000         Median : 2.0         Median : 2.000  
##  Mean   : 0.9276         Mean   : 2.5         Mean   : 1.856  
##  3rd Qu.: 2.0000         3rd Qu.: 3.0         3rd Qu.: 2.000  
##  Max.   :19.0000         Max.   :50.0         Max.   :55.000  
##                                                               
##     children           babies              meal             country         
##  Min.   : 0.0000   Min.   : 0.000000   Length:119390      Length:119390     
##  1st Qu.: 0.0000   1st Qu.: 0.000000   Class :character   Class :character  
##  Median : 0.0000   Median : 0.000000   Mode  :character   Mode  :character  
##  Mean   : 0.1039   Mean   : 0.007949                                        
##  3rd Qu.: 0.0000   3rd Qu.: 0.000000                                        
##  Max.   :10.0000   Max.   :10.000000                                        
##  NA's   :4                                                                  
##  market_segment     distribution_channel is_repeated_guest
##  Length:119390      Length:119390        Min.   :0.00000  
##  Class :character   Class :character     1st Qu.:0.00000  
##  Mode  :character   Mode  :character     Median :0.00000  
##                                          Mean   :0.03191  
##                                          3rd Qu.:0.00000  
##                                          Max.   :1.00000  
##                                                           
##  previous_cancellations previous_bookings_not_canceled reserved_room_type
##  Min.   : 0.00000       Min.   : 0.0000                Length:119390     
##  1st Qu.: 0.00000       1st Qu.: 0.0000                Class :character  
##  Median : 0.00000       Median : 0.0000                Mode  :character  
##  Mean   : 0.08712       Mean   : 0.1371                                  
##  3rd Qu.: 0.00000       3rd Qu.: 0.0000                                  
##  Max.   :26.00000       Max.   :72.0000                                  
##                                                                          
##  assigned_room_type booking_changes   deposit_type          agent          
##  Length:119390      Min.   : 0.0000   Length:119390      Length:119390     
##  Class :character   1st Qu.: 0.0000   Class :character   Class :character  
##  Mode  :character   Median : 0.0000   Mode  :character   Mode  :character  
##                     Mean   : 0.2211                                        
##                     3rd Qu.: 0.0000                                        
##                     Max.   :21.0000                                        
##                                                                            
##    company          days_in_waiting_list customer_type           adr         
##  Length:119390      Min.   :  0.000      Length:119390      Min.   :  -6.38  
##  Class :character   1st Qu.:  0.000      Class :character   1st Qu.:  69.29  
##  Mode  :character   Median :  0.000      Mode  :character   Median :  94.58  
##                     Mean   :  2.321                         Mean   : 101.83  
##                     3rd Qu.:  0.000                         3rd Qu.: 126.00  
##                     Max.   :391.000                         Max.   :5400.00  
##                                                                              
##  required_car_parking_spaces total_of_special_requests reservation_status
##  Min.   :0.00000             Min.   :0.0000            Length:119390     
##  1st Qu.:0.00000             1st Qu.:0.0000            Class :character  
##  Median :0.00000             Median :0.0000            Mode  :character  
##  Mean   :0.06252             Mean   :0.5714                              
##  3rd Qu.:0.00000             3rd Qu.:1.0000                              
##  Max.   :8.00000             Max.   :5.0000                              
##                                                                          
##  reservation_status_date
##  Min.   :2014-10-17     
##  1st Qu.:2016-02-01     
##  Median :2016-08-07     
##  Mean   :2016-07-30     
##  3rd Qu.:2017-02-08     
##  Max.   :2017-09-14     
## 
head(hotel_data)
## # A tibble: 6 × 32
##   hotel        is_canceled lead_time arrival_date_year arrival_date_month
##   <chr>              <dbl>     <dbl>             <dbl> <chr>             
## 1 Resort Hotel           0       342              2015 July              
## 2 Resort Hotel           0       737              2015 July              
## 3 Resort Hotel           0         7              2015 July              
## 4 Resort Hotel           0        13              2015 July              
## 5 Resort Hotel           0        14              2015 July              
## 6 Resort Hotel           0        14              2015 July              
## # ℹ 27 more variables: arrival_date_week_number <dbl>,
## #   arrival_date_day_of_month <dbl>, stays_in_weekend_nights <dbl>,
## #   stays_in_week_nights <dbl>, adults <dbl>, children <dbl>, babies <dbl>,
## #   meal <chr>, country <chr>, market_segment <chr>,
## #   distribution_channel <chr>, is_repeated_guest <dbl>,
## #   previous_cancellations <dbl>, previous_bookings_not_canceled <dbl>,
## #   reserved_room_type <chr>, assigned_room_type <chr>, …
dim(hotel_data)
## [1] 119390     32
names(hotel_data)
##  [1] "hotel"                          "is_canceled"                   
##  [3] "lead_time"                      "arrival_date_year"             
##  [5] "arrival_date_month"             "arrival_date_week_number"      
##  [7] "arrival_date_day_of_month"      "stays_in_weekend_nights"       
##  [9] "stays_in_week_nights"           "adults"                        
## [11] "children"                       "babies"                        
## [13] "meal"                           "country"                       
## [15] "market_segment"                 "distribution_channel"          
## [17] "is_repeated_guest"              "previous_cancellations"        
## [19] "previous_bookings_not_canceled" "reserved_room_type"            
## [21] "assigned_room_type"             "booking_changes"               
## [23] "deposit_type"                   "agent"                         
## [25] "company"                        "days_in_waiting_list"          
## [27] "customer_type"                  "adr"                           
## [29] "required_car_parking_spaces"    "total_of_special_requests"     
## [31] "reservation_status"             "reservation_status_date"

Data Cleaning

# Replacing missing values with median for numeric columns
hotel_data <- hotel_data %>%
  mutate(across(where(is.numeric), ~ ifelse(is.na(.), median(., na.rm = TRUE), .)))
# Replacing missing values with the most common value for categorical columns
hotel_data <- hotel_data %>%
  mutate(across(where(is.factor), ~ ifelse(is.na(.), Mode(.), .)))

Dropping columns

hotel_data <- hotel_data[, !(names(hotel_data) %in% c('company', 'arrival_date_week_number'))]

Handle missing values

colSums(is.na(hotel_data))
##                          hotel                    is_canceled 
##                              0                              0 
##                      lead_time              arrival_date_year 
##                              0                              0 
##             arrival_date_month      arrival_date_day_of_month 
##                              0                              0 
##        stays_in_weekend_nights           stays_in_week_nights 
##                              0                              0 
##                         adults                       children 
##                              0                              0 
##                         babies                           meal 
##                              0                              0 
##                        country                 market_segment 
##                              0                              0 
##           distribution_channel              is_repeated_guest 
##                              0                              0 
##         previous_cancellations previous_bookings_not_canceled 
##                              0                              0 
##             reserved_room_type             assigned_room_type 
##                              0                              0 
##                booking_changes                   deposit_type 
##                              0                              0 
##                          agent           days_in_waiting_list 
##                              0                              0 
##                  customer_type                            adr 
##                              0                              0 
##    required_car_parking_spaces      total_of_special_requests 
##                              0                              0 
##             reservation_status        reservation_status_date 
##                              0                              0
summary(hotel_data)
##     hotel            is_canceled       lead_time   arrival_date_year
##  Length:119390      Min.   :0.0000   Min.   :  0   Min.   :2015     
##  Class :character   1st Qu.:0.0000   1st Qu.: 18   1st Qu.:2016     
##  Mode  :character   Median :0.0000   Median : 69   Median :2016     
##                     Mean   :0.3704   Mean   :104   Mean   :2016     
##                     3rd Qu.:1.0000   3rd Qu.:160   3rd Qu.:2017     
##                     Max.   :1.0000   Max.   :737   Max.   :2017     
##  arrival_date_month arrival_date_day_of_month stays_in_weekend_nights
##  Length:119390      Min.   : 1.0              Min.   : 0.0000        
##  Class :character   1st Qu.: 8.0              1st Qu.: 0.0000        
##  Mode  :character   Median :16.0              Median : 1.0000        
##                     Mean   :15.8              Mean   : 0.9276        
##                     3rd Qu.:23.0              3rd Qu.: 2.0000        
##                     Max.   :31.0              Max.   :19.0000        
##  stays_in_week_nights     adults          children           babies         
##  Min.   : 0.0         Min.   : 0.000   Min.   : 0.0000   Min.   : 0.000000  
##  1st Qu.: 1.0         1st Qu.: 2.000   1st Qu.: 0.0000   1st Qu.: 0.000000  
##  Median : 2.0         Median : 2.000   Median : 0.0000   Median : 0.000000  
##  Mean   : 2.5         Mean   : 1.856   Mean   : 0.1039   Mean   : 0.007949  
##  3rd Qu.: 3.0         3rd Qu.: 2.000   3rd Qu.: 0.0000   3rd Qu.: 0.000000  
##  Max.   :50.0         Max.   :55.000   Max.   :10.0000   Max.   :10.000000  
##      meal             country          market_segment     distribution_channel
##  Length:119390      Length:119390      Length:119390      Length:119390       
##  Class :character   Class :character   Class :character   Class :character    
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character    
##                                                                               
##                                                                               
##                                                                               
##  is_repeated_guest previous_cancellations previous_bookings_not_canceled
##  Min.   :0.00000   Min.   : 0.00000       Min.   : 0.0000               
##  1st Qu.:0.00000   1st Qu.: 0.00000       1st Qu.: 0.0000               
##  Median :0.00000   Median : 0.00000       Median : 0.0000               
##  Mean   :0.03191   Mean   : 0.08712       Mean   : 0.1371               
##  3rd Qu.:0.00000   3rd Qu.: 0.00000       3rd Qu.: 0.0000               
##  Max.   :1.00000   Max.   :26.00000       Max.   :72.0000               
##  reserved_room_type assigned_room_type booking_changes   deposit_type      
##  Length:119390      Length:119390      Min.   : 0.0000   Length:119390     
##  Class :character   Class :character   1st Qu.: 0.0000   Class :character  
##  Mode  :character   Mode  :character   Median : 0.0000   Mode  :character  
##                                        Mean   : 0.2211                     
##                                        3rd Qu.: 0.0000                     
##                                        Max.   :21.0000                     
##     agent           days_in_waiting_list customer_type           adr         
##  Length:119390      Min.   :  0.000      Length:119390      Min.   :  -6.38  
##  Class :character   1st Qu.:  0.000      Class :character   1st Qu.:  69.29  
##  Mode  :character   Median :  0.000      Mode  :character   Median :  94.58  
##                     Mean   :  2.321                         Mean   : 101.83  
##                     3rd Qu.:  0.000                         3rd Qu.: 126.00  
##                     Max.   :391.000                         Max.   :5400.00  
##  required_car_parking_spaces total_of_special_requests reservation_status
##  Min.   :0.00000             Min.   :0.0000            Length:119390     
##  1st Qu.:0.00000             1st Qu.:0.0000            Class :character  
##  Median :0.00000             Median :0.0000            Mode  :character  
##  Mean   :0.06252             Mean   :0.5714                              
##  3rd Qu.:0.00000             3rd Qu.:1.0000                              
##  Max.   :8.00000             Max.   :5.0000                              
##  reservation_status_date
##  Min.   :2014-10-17     
##  1st Qu.:2016-02-01     
##  Median :2016-08-07     
##  Mean   :2016-07-30     
##  3rd Qu.:2017-02-08     
##  Max.   :2017-09-14
head(hotel_data)
## # A tibble: 6 × 30
##   hotel        is_canceled lead_time arrival_date_year arrival_date_month
##   <chr>              <dbl>     <dbl>             <dbl> <chr>             
## 1 Resort Hotel           0       342              2015 July              
## 2 Resort Hotel           0       737              2015 July              
## 3 Resort Hotel           0         7              2015 July              
## 4 Resort Hotel           0        13              2015 July              
## 5 Resort Hotel           0        14              2015 July              
## 6 Resort Hotel           0        14              2015 July              
## # ℹ 25 more variables: arrival_date_day_of_month <dbl>,
## #   stays_in_weekend_nights <dbl>, stays_in_week_nights <dbl>, adults <dbl>,
## #   children <dbl>, babies <dbl>, meal <chr>, country <chr>,
## #   market_segment <chr>, distribution_channel <chr>, is_repeated_guest <dbl>,
## #   previous_cancellations <dbl>, previous_bookings_not_canceled <dbl>,
## #   reserved_room_type <chr>, assigned_room_type <chr>, booking_changes <dbl>,
## #   deposit_type <chr>, agent <chr>, days_in_waiting_list <dbl>, …
dim(hotel_data)
## [1] 119390     30
names(hotel_data)
##  [1] "hotel"                          "is_canceled"                   
##  [3] "lead_time"                      "arrival_date_year"             
##  [5] "arrival_date_month"             "arrival_date_day_of_month"     
##  [7] "stays_in_weekend_nights"        "stays_in_week_nights"          
##  [9] "adults"                         "children"                      
## [11] "babies"                         "meal"                          
## [13] "country"                        "market_segment"                
## [15] "distribution_channel"           "is_repeated_guest"             
## [17] "previous_cancellations"         "previous_bookings_not_canceled"
## [19] "reserved_room_type"             "assigned_room_type"            
## [21] "booking_changes"                "deposit_type"                  
## [23] "agent"                          "days_in_waiting_list"          
## [25] "customer_type"                  "adr"                           
## [27] "required_car_parking_spaces"    "total_of_special_requests"     
## [29] "reservation_status"             "reservation_status_date"
head(hotel_data)
## # A tibble: 6 × 30
##   hotel        is_canceled lead_time arrival_date_year arrival_date_month
##   <chr>              <dbl>     <dbl>             <dbl> <chr>             
## 1 Resort Hotel           0       342              2015 July              
## 2 Resort Hotel           0       737              2015 July              
## 3 Resort Hotel           0         7              2015 July              
## 4 Resort Hotel           0        13              2015 July              
## 5 Resort Hotel           0        14              2015 July              
## 6 Resort Hotel           0        14              2015 July              
## # ℹ 25 more variables: arrival_date_day_of_month <dbl>,
## #   stays_in_weekend_nights <dbl>, stays_in_week_nights <dbl>, adults <dbl>,
## #   children <dbl>, babies <dbl>, meal <chr>, country <chr>,
## #   market_segment <chr>, distribution_channel <chr>, is_repeated_guest <dbl>,
## #   previous_cancellations <dbl>, previous_bookings_not_canceled <dbl>,
## #   reserved_room_type <chr>, assigned_room_type <chr>, booking_changes <dbl>,
## #   deposit_type <chr>, agent <chr>, days_in_waiting_list <dbl>, …

Filling Missing Values

I am going to fill the null values in the dataset using the following methods:

  • For the children and agent features I will use the median value to replace them.
  • For the country feature I am going to use the mode method, which will replace the missing values with the most frequent one.
hotel_data$children <- ifelse(is.na(hotel_data$children), median(hotel_data$children, na.rm = TRUE), hotel_data$children)

Explanation

In this line of code,I am addressing missing values (NA) in the children column of the hotel_data dataframe. The code uses the ifelse function to perform conditional replacement. Here’s a breakdown of how it works:

  • The ifelse function checks each entry in the children column.
  • If an entry is NA (indicating a missing value), the function replaces it with the median value of the children column.
  • The median function calculates the median, and the na.rm = TRUE parameter is used to instruct the median function to ignore NA values when calculating the median.

This approach ensures that missing values in the children column are replaced with a representative value (the median) while preserving the overall distribution of the data.

# Convert the 'agent' column to numeric (this will convert non-numeric values to NA)
hotel_data$agent <- as.numeric(hotel_data$agent)
## Warning: NAs introduced by coercion
# Replace NA values in the 'agent' column with the median of the column
hotel_data$agent[is.na(hotel_data$agent)] <- median(hotel_data$agent, na.rm = TRUE)

Explanation

In these lines of code, I am handling the agent column in the hotel_data dataframe. The code aims to address non-numeric values in the agent column and replace missing values with an appropriate value (the median). Here’s how it works:

  • The first line attempts to convert the agent column to a numeric type using the as.numeric function. This conversion may result in NA values for entries that contain non-numeric characters or missing values.

  • The second line uses the ifelse function to perform conditional replacement. It checks each entry in the agent column:

    • If an entry is NA (indicating a missing value), it is replaced with the median value of the agent column.
    • The median function calculates the median, and the na.rm = TRUE parameter is used to ensure that NA values are ignored when computing the median.

This approach ensures that the agent column contains numeric values and replaces any missing or non-numeric entries with a representative value (the median) while maintaining data integrity.

# Create a table of counts for each country
country_counts <- table(hotel_data$country)
# Find the country (or countries) with the highest count
mode_country <- names(country_counts)[country_counts == max(country_counts)]
# find which country is more frequent in our data
# Print the mode
print(mode_country)
## [1] "PRT"

Explanation

In this code block, I am determining the most frequently occurring country in the country column of the hotel_data dataframe. Here’s how it works:

  • The table function is used to create a frequency table of the unique values in the country column. This table contains the count of each country’s occurrences in the dataset.

  • The names function is applied to the result of table, which provides the names of the countries that appear in the dataset.

  • To identify the country or countries with the highest count (the mode), I am comparing the count of each country (retrieved from table) to the maximum count in country_counts.

  • The result of this comparison will be the name(s) of the country(s) with the highest count, which represents the mode.

  • Finally, the mode is printed to the console, providing insight into the most frequently occurring country in the dataset.

replace null values with the most frequent value in the country column

# Calculate the mode (most frequent value)
getmode <- function(v) {
   uniqv <- unique(v)
   uniqv[which.max(tabulate(match(v, uniqv)))]
}
# Get the most frequent value for the country column in hotel_data
mode_value <- getmode(hotel_data$country[!is.na(hotel_data$country)])

# Replace NA values in the country column with the mode value
hotel_data$country[is.na(hotel_data$country)] <- mode_value

colSums(is.na(hotel_data))
##                          hotel                    is_canceled 
##                              0                              0 
##                      lead_time              arrival_date_year 
##                              0                              0 
##             arrival_date_month      arrival_date_day_of_month 
##                              0                              0 
##        stays_in_weekend_nights           stays_in_week_nights 
##                              0                              0 
##                         adults                       children 
##                              0                              0 
##                         babies                           meal 
##                              0                              0 
##                        country                 market_segment 
##                              0                              0 
##           distribution_channel              is_repeated_guest 
##                              0                              0 
##         previous_cancellations previous_bookings_not_canceled 
##                              0                              0 
##             reserved_room_type             assigned_room_type 
##                              0                              0 
##                booking_changes                   deposit_type 
##                              0                              0 
##                          agent           days_in_waiting_list 
##                              0                              0 
##                  customer_type                            adr 
##                              0                              0 
##    required_car_parking_spaces      total_of_special_requests 
##                              0                              0 
##             reservation_status        reservation_status_date 
##                              0                              0

Explanation

This code block addresses missing values in the country column of the hotel_data dataframe. Here’s the breakdown:

  • First, a custom function getmode is defined. This function calculates the mode (most frequent value) in a vector.

  • The getmode function is applied to the country column using the sapply function. This step identifies the most common country in the dataset.

  • Next, any NA values in the country column are replaced with the most frequent country that was determined in the previous step. This effectively fills in missing country values with the mode.

  • Finally, colSums(is.na(hotel_data)) is used to compute a summary count of NA values across all columns of the hotel_data dataframe. This allows you to verify that the missing values in the country column have been successfully replaced, as the count of NA values should have decreased after this operation.

Now that I am done with the null values we can go further and ask questions in our data.

hotel_data$arrival_date_year <- as.character(hotel_data$arrival_date_year)

Explanation

  • This code converts the arrival_date_year column from its current type (likely numeric or integer) to a character type. This might be done for consistency in data types, particularly if the year is not going to be used in calculations but rather as a categorical or grouping variable in analysis or visualizations. # Checking for miswritings

  • There might be miswritings in our data. Therefore I will check the object columns to see if there are errors. Like, in the column arrival_date_month might be typed “Aug” instead of “August”, or in column arrival_date_year might be typed “’15” instead of “2015” etc. But I can see that there are not miswritings here.

Subsetting Data and Exploring Unique Values

# Subset the hotel_data DataFrame with specified columns
# List the column names in the hotel_data dataframe
names(hotel_data)
##  [1] "hotel"                          "is_canceled"                   
##  [3] "lead_time"                      "arrival_date_year"             
##  [5] "arrival_date_month"             "arrival_date_day_of_month"     
##  [7] "stays_in_weekend_nights"        "stays_in_week_nights"          
##  [9] "adults"                         "children"                      
## [11] "babies"                         "meal"                          
## [13] "country"                        "market_segment"                
## [15] "distribution_channel"           "is_repeated_guest"             
## [17] "previous_cancellations"         "previous_bookings_not_canceled"
## [19] "reserved_room_type"             "assigned_room_type"            
## [21] "booking_changes"                "deposit_type"                  
## [23] "agent"                          "days_in_waiting_list"          
## [25] "customer_type"                  "adr"                           
## [27] "required_car_parking_spaces"    "total_of_special_requests"     
## [29] "reservation_status"             "reservation_status_date"
df <- hotel_data[, c("hotel", "arrival_date_month", "arrival_date_year", "country", "market_segment", "distribution_channel", "reserved_room_type", "assigned_room_type", "deposit_type", "customer_type", "reservation_status")]

# Iterate over the columns and print unique values
for (col in names(df)) {
  cat(col, ": ", unique(df[[col]]), "\n\n")
}
## hotel :  Resort Hotel City Hotel 
## 
## arrival_date_month :  July August September October November December January February March April May June 
## 
## arrival_date_year :  2015 2016 2017 
## 
## country :  PRT GBR USA ESP IRL FRA NULL ROU NOR OMN ARG POL DEU BEL CHE CN GRC ITA NLD DNK RUS SWE AUS EST CZE BRA FIN MOZ BWA LUX SVN ALB IND CHN MEX MAR UKR SMR LVA PRI SRB CHL AUT BLR LTU TUR ZAF AGO ISR CYM ZMB CPV ZWE DZA KOR CRI HUN ARE TUN JAM HRV HKG IRN GEO AND GIB URY JEY CAF CYP COL GGY KWT NGA MDV VEN SVK FJI KAZ PAK IDN LBN PHL SEN SYC AZE BHR NZL THA DOM MKD MYS ARM JPN LKA CUB CMR BIH MUS COM SUR UGA BGR CIV JOR SYR SGP BDI SAU VNM PLW QAT EGY PER MLT MWI ECU MDG ISL UZB NPL BHS MAC TGO TWN DJI STP KNA ETH IRQ HND RWA KHM MCO BGD IMN TJK NIC BEN VGB TZA GAB GHA TMP GLP KEN LIE GNB MNE UMI MYT FRO MMR PAN BFA LBY MLI NAM BOL PRY BRB ABW AIA SLV DMA PYF GUY LCA ATA GTM ASM MRT NCL KIR SDN ATF SLE LAO 
## 
## market_segment :  Direct Corporate Online TA Offline TA/TO Complementary Groups Undefined Aviation 
## 
## distribution_channel :  Direct Corporate TA/TO Undefined GDS 
## 
## reserved_room_type :  C A D E G F H L P B 
## 
## assigned_room_type :  C A D E G F I B H P L K 
## 
## deposit_type :  No Deposit Refundable Non Refund 
## 
## customer_type :  Transient Contract Transient-Party Group 
## 
## reservation_status :  Check-Out Canceled No-Show

Explanation

  • This code begins by displaying all column names in the hotel_data dataframe to identify available variables. Then, a new dataframe df is created, which includes only a subset of those columns — specifically, columns that are likely to be relevant for further analysis. After subsetting, the code loops through each column in the new dataframe and prints out the unique values using the cat function, which helps in understanding the distinct categories or ranges of data present for each variable.

Check for logical errors

filtered_data <- subset(hotel_data, children == 0 & adults == 0 & babies == 0)
filtered_data
## # A tibble: 180 × 30
##    hotel        is_canceled lead_time arrival_date_year arrival_date_month
##    <chr>              <dbl>     <dbl> <chr>             <chr>             
##  1 Resort Hotel           0         1 2015              October           
##  2 Resort Hotel           0         0 2015              October           
##  3 Resort Hotel           0        36 2015              November          
##  4 Resort Hotel           0       165 2015              December          
##  5 Resort Hotel           0       165 2015              December          
##  6 Resort Hotel           1         0 2016              February          
##  7 Resort Hotel           1         0 2016              November          
##  8 Resort Hotel           0        31 2016              December          
##  9 Resort Hotel           0         4 2017              January           
## 10 Resort Hotel           0        46 2017              January           
## # ℹ 170 more rows
## # ℹ 25 more variables: arrival_date_day_of_month <dbl>,
## #   stays_in_weekend_nights <dbl>, stays_in_week_nights <dbl>, adults <dbl>,
## #   children <dbl>, babies <dbl>, meal <chr>, country <chr>,
## #   market_segment <chr>, distribution_channel <chr>, is_repeated_guest <dbl>,
## #   previous_cancellations <dbl>, previous_bookings_not_canceled <dbl>,
## #   reserved_room_type <chr>, assigned_room_type <chr>, …
filtered_data <- hotel_data[hotel_data$children == 0 & hotel_data$adults == 0 & hotel_data$babies == 0, ]

Explanation

  • These lines of code create a subset of hotel_data containing rows where there are no guests (adults, children, or babies) associated with the booking, which is a logical inconsistency within the context of hotel bookings. The filtered_data dataframe captures all such rows. This information might be used to review the data extraction process or to understand the context of these entries.
# Identify rows with logical errors
logical_errors <- with(hotel_data, children == 0 & adults == 0 & babies == 0)
# Drop these rows
hotel_data <- hotel_data[!logical_errors, ]
# Reset index (R dataframes do not have an inherent index like pandas, but you can recreate one if needed)
hotel_data <- data.frame(hotel_data)

# View the first few rows of the updated dataframe
head(hotel_data)
##          hotel is_canceled lead_time arrival_date_year arrival_date_month
## 1 Resort Hotel           0       342              2015               July
## 2 Resort Hotel           0       737              2015               July
## 3 Resort Hotel           0         7              2015               July
## 4 Resort Hotel           0        13              2015               July
## 5 Resort Hotel           0        14              2015               July
## 6 Resort Hotel           0        14              2015               July
##   arrival_date_day_of_month stays_in_weekend_nights stays_in_week_nights adults
## 1                         1                       0                    0      2
## 2                         1                       0                    0      2
## 3                         1                       0                    1      1
## 4                         1                       0                    1      1
## 5                         1                       0                    2      2
## 6                         1                       0                    2      2
##   children babies meal country market_segment distribution_channel
## 1        0      0   BB     PRT         Direct               Direct
## 2        0      0   BB     PRT         Direct               Direct
## 3        0      0   BB     GBR         Direct               Direct
## 4        0      0   BB     GBR      Corporate            Corporate
## 5        0      0   BB     GBR      Online TA                TA/TO
## 6        0      0   BB     GBR      Online TA                TA/TO
##   is_repeated_guest previous_cancellations previous_bookings_not_canceled
## 1                 0                      0                              0
## 2                 0                      0                              0
## 3                 0                      0                              0
## 4                 0                      0                              0
## 5                 0                      0                              0
## 6                 0                      0                              0
##   reserved_room_type assigned_room_type booking_changes deposit_type agent
## 1                  C                  C               3   No Deposit    14
## 2                  C                  C               4   No Deposit    14
## 3                  A                  C               0   No Deposit    14
## 4                  A                  A               0   No Deposit   304
## 5                  A                  A               0   No Deposit   240
## 6                  A                  A               0   No Deposit   240
##   days_in_waiting_list customer_type adr required_car_parking_spaces
## 1                    0     Transient   0                           0
## 2                    0     Transient   0                           0
## 3                    0     Transient  75                           0
## 4                    0     Transient  75                           0
## 5                    0     Transient  98                           0
## 6                    0     Transient  98                           0
##   total_of_special_requests reservation_status reservation_status_date
## 1                         0          Check-Out              2015-07-01
## 2                         0          Check-Out              2015-07-01
## 3                         0          Check-Out              2015-07-02
## 4                         0          Check-Out              2015-07-02
## 5                         1          Check-Out              2015-07-03
## 6                         1          Check-Out              2015-07-03
  • Let’s check if the rows with the wrong data are dropped. Now our dataset from 119390 rows has 119210 (exactly 180 rows less)
dim(hotel_data)
## [1] 119210     30
summary(hotel_data)
##     hotel            is_canceled       lead_time     arrival_date_year 
##  Length:119210      Min.   :0.0000   Min.   :  0.0   Length:119210     
##  Class :character   1st Qu.:0.0000   1st Qu.: 18.0   Class :character  
##  Mode  :character   Median :0.0000   Median : 69.0   Mode  :character  
##                     Mean   :0.3708   Mean   :104.1                     
##                     3rd Qu.:1.0000   3rd Qu.:161.0                     
##                     Max.   :1.0000   Max.   :737.0                     
##  arrival_date_month arrival_date_day_of_month stays_in_weekend_nights
##  Length:119210      Min.   : 1.0              Min.   : 0.0000        
##  Class :character   1st Qu.: 8.0              1st Qu.: 0.0000        
##  Mode  :character   Median :16.0              Median : 1.0000        
##                     Mean   :15.8              Mean   : 0.9271        
##                     3rd Qu.:23.0              3rd Qu.: 2.0000        
##                     Max.   :31.0              Max.   :19.0000        
##  stays_in_week_nights     adults          children          babies         
##  Min.   : 0.000       Min.   : 0.000   Min.   : 0.000   Min.   : 0.000000  
##  1st Qu.: 1.000       1st Qu.: 2.000   1st Qu.: 0.000   1st Qu.: 0.000000  
##  Median : 2.000       Median : 2.000   Median : 0.000   Median : 0.000000  
##  Mean   : 2.499       Mean   : 1.859   Mean   : 0.104   Mean   : 0.007961  
##  3rd Qu.: 3.000       3rd Qu.: 2.000   3rd Qu.: 0.000   3rd Qu.: 0.000000  
##  Max.   :50.000       Max.   :55.000   Max.   :10.000   Max.   :10.000000  
##      meal             country          market_segment     distribution_channel
##  Length:119210      Length:119210      Length:119210      Length:119210       
##  Class :character   Class :character   Class :character   Class :character    
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character    
##                                                                               
##                                                                               
##                                                                               
##  is_repeated_guest previous_cancellations previous_bookings_not_canceled
##  Min.   :0.0000    Min.   : 0.00000       Min.   : 0.0000               
##  1st Qu.:0.0000    1st Qu.: 0.00000       1st Qu.: 0.0000               
##  Median :0.0000    Median : 0.00000       Median : 0.0000               
##  Mean   :0.0315    Mean   : 0.08719       Mean   : 0.1371               
##  3rd Qu.:0.0000    3rd Qu.: 0.00000       3rd Qu.: 0.0000               
##  Max.   :1.0000    Max.   :26.00000       Max.   :72.0000               
##  reserved_room_type assigned_room_type booking_changes   deposit_type      
##  Length:119210      Length:119210      Min.   : 0.0000   Length:119210     
##  Class :character   Class :character   1st Qu.: 0.0000   Class :character  
##  Mode  :character   Mode  :character   Median : 0.0000   Mode  :character  
##                                        Mean   : 0.2188                     
##                                        3rd Qu.: 0.0000                     
##                                        Max.   :18.0000                     
##      agent       days_in_waiting_list customer_type           adr         
##  Min.   :  1.0   Min.   :  0.000      Length:119210      Min.   :  -6.38  
##  1st Qu.:  9.0   1st Qu.:  0.000      Class :character   1st Qu.:  69.50  
##  Median : 14.0   Median :  0.000      Mode  :character   Median :  94.95  
##  Mean   : 76.8   Mean   :  2.321                         Mean   : 101.97  
##  3rd Qu.:152.0   3rd Qu.:  0.000                         3rd Qu.: 126.00  
##  Max.   :535.0   Max.   :391.000                         Max.   :5400.00  
##  required_car_parking_spaces total_of_special_requests reservation_status
##  Min.   :0.00000             Min.   :0.0000            Length:119210     
##  1st Qu.:0.00000             1st Qu.:0.0000            Class :character  
##  Median :0.00000             Median :0.0000            Mode  :character  
##  Mean   :0.06255             Mean   :0.5715                              
##  3rd Qu.:0.00000             3rd Qu.:1.0000                              
##  Max.   :8.00000             Max.   :5.0000                              
##  reservation_status_date
##  Min.   :2014-10-17     
##  1st Qu.:2016-02-01     
##  Median :2016-08-07     
##  Mean   :2016-07-29     
##  3rd Qu.:2017-02-08     
##  Max.   :2017-09-14

DESCRIPTIVE ANALYSIS / DATA ANALYSIS

Creating a Subset for Non-Cancelled Bookings

# Assuming 'hotel_bookings' is your data frame
# Filter rows where 'is_canceled' is 0
not_cancelled <- hotel_data[hotel_data$is_canceled == 0, ]

# Display the first few rows
head(not_cancelled)
##          hotel is_canceled lead_time arrival_date_year arrival_date_month
## 1 Resort Hotel           0       342              2015               July
## 2 Resort Hotel           0       737              2015               July
## 3 Resort Hotel           0         7              2015               July
## 4 Resort Hotel           0        13              2015               July
## 5 Resort Hotel           0        14              2015               July
## 6 Resort Hotel           0        14              2015               July
##   arrival_date_day_of_month stays_in_weekend_nights stays_in_week_nights adults
## 1                         1                       0                    0      2
## 2                         1                       0                    0      2
## 3                         1                       0                    1      1
## 4                         1                       0                    1      1
## 5                         1                       0                    2      2
## 6                         1                       0                    2      2
##   children babies meal country market_segment distribution_channel
## 1        0      0   BB     PRT         Direct               Direct
## 2        0      0   BB     PRT         Direct               Direct
## 3        0      0   BB     GBR         Direct               Direct
## 4        0      0   BB     GBR      Corporate            Corporate
## 5        0      0   BB     GBR      Online TA                TA/TO
## 6        0      0   BB     GBR      Online TA                TA/TO
##   is_repeated_guest previous_cancellations previous_bookings_not_canceled
## 1                 0                      0                              0
## 2                 0                      0                              0
## 3                 0                      0                              0
## 4                 0                      0                              0
## 5                 0                      0                              0
## 6                 0                      0                              0
##   reserved_room_type assigned_room_type booking_changes deposit_type agent
## 1                  C                  C               3   No Deposit    14
## 2                  C                  C               4   No Deposit    14
## 3                  A                  C               0   No Deposit    14
## 4                  A                  A               0   No Deposit   304
## 5                  A                  A               0   No Deposit   240
## 6                  A                  A               0   No Deposit   240
##   days_in_waiting_list customer_type adr required_car_parking_spaces
## 1                    0     Transient   0                           0
## 2                    0     Transient   0                           0
## 3                    0     Transient  75                           0
## 4                    0     Transient  75                           0
## 5                    0     Transient  98                           0
## 6                    0     Transient  98                           0
##   total_of_special_requests reservation_status reservation_status_date
## 1                         0          Check-Out              2015-07-01
## 2                         0          Check-Out              2015-07-01
## 3                         0          Check-Out              2015-07-02
## 4                         0          Check-Out              2015-07-02
## 5                         1          Check-Out              2015-07-03
## 6                         1          Check-Out              2015-07-03

Explanation:

  • This code creates a new subset not_cancelled from the hotel_data dataframe, containing only the rows where the booking was not canceled (is_canceled == 0). This subset is focused on bookings that were completed. The head function is then used to display the first few rows of this new subset for a quick preview.

  • Let’s check if I have the right dataset. If the there are any values for columns stays_in_weekend_nights and stays_in_week_night have same value 0 or 1, then something is wrong and we have false data. Maybe something wrong with the data entry. Our outcome is False that means we are good to go.

Validating Data Consistency

# Check if 'stays_in_weekend_nights' and 'stays_in_week_nights' columns are equal in all rows
all(not_cancelled$stays_in_weekend_nights == not_cancelled$stays_in_week_nights)
## [1] FALSE

Explanation

  • This line checks whether all rows in the not_cancelled subset have the same values for stays_in_weekend_nights and stays_in_week_nights. If this returns TRUE, it might indicate an issue (like all values being 0 or 1, which could be unrealistic). In this case, the comment suggests that the output is FALSE, indicating varied and presumably realistic data.

  • The people that did not cancel their reservation is 63% of our data

Statistical Summary of Non-Cancelled Bookings

str(not_cancelled)
## 'data.frame':    75011 obs. of  30 variables:
##  $ hotel                         : chr  "Resort Hotel" "Resort Hotel" "Resort Hotel" "Resort Hotel" ...
##  $ is_canceled                   : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ lead_time                     : num  342 737 7 13 14 14 0 9 35 68 ...
##  $ arrival_date_year             : chr  "2015" "2015" "2015" "2015" ...
##  $ arrival_date_month            : chr  "July" "July" "July" "July" ...
##  $ arrival_date_day_of_month     : num  1 1 1 1 1 1 1 1 1 1 ...
##  $ stays_in_weekend_nights       : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ stays_in_week_nights          : num  0 0 1 1 2 2 2 2 4 4 ...
##  $ adults                        : num  2 2 1 1 2 2 2 2 2 2 ...
##  $ children                      : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ babies                        : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ meal                          : chr  "BB" "BB" "BB" "BB" ...
##  $ country                       : chr  "PRT" "PRT" "GBR" "GBR" ...
##  $ market_segment                : chr  "Direct" "Direct" "Direct" "Corporate" ...
##  $ distribution_channel          : chr  "Direct" "Direct" "Direct" "Corporate" ...
##  $ is_repeated_guest             : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ previous_cancellations        : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ previous_bookings_not_canceled: num  0 0 0 0 0 0 0 0 0 0 ...
##  $ reserved_room_type            : chr  "C" "C" "A" "A" ...
##  $ assigned_room_type            : chr  "C" "C" "C" "A" ...
##  $ booking_changes               : num  3 4 0 0 0 0 0 0 0 0 ...
##  $ deposit_type                  : chr  "No Deposit" "No Deposit" "No Deposit" "No Deposit" ...
##  $ agent                         : num  14 14 14 304 240 240 14 303 240 240 ...
##  $ days_in_waiting_list          : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ customer_type                 : chr  "Transient" "Transient" "Transient" "Transient" ...
##  $ adr                           : num  0 0 75 75 98 98 107 103 145 97 ...
##  $ required_car_parking_spaces   : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ total_of_special_requests     : num  0 0 0 0 1 1 0 1 0 3 ...
##  $ reservation_status            : chr  "Check-Out" "Check-Out" "Check-Out" "Check-Out" ...
##  $ reservation_status_date       : Date, format: "2015-07-01" "2015-07-01" ...
# Get a statistical summary of the dataframe
summary(not_cancelled)
##     hotel            is_canceled   lead_time      arrival_date_year 
##  Length:75011       Min.   :0    Min.   :  0.00   Length:75011      
##  Class :character   1st Qu.:0    1st Qu.:  9.00   Class :character  
##  Mode  :character   Median :0    Median : 45.00   Mode  :character  
##                     Mean   :0    Mean   : 80.08                     
##                     3rd Qu.:0    3rd Qu.:124.00                     
##                     Max.   :0    Max.   :737.00                     
##  arrival_date_month arrival_date_day_of_month stays_in_weekend_nights
##  Length:75011       Min.   : 1.00             Min.   : 0.0000        
##  Class :character   1st Qu.: 8.00             1st Qu.: 0.0000        
##  Mode  :character   Median :16.00             Median : 1.0000        
##                     Mean   :15.84             Mean   : 0.9281        
##                     3rd Qu.:23.00             3rd Qu.: 2.0000        
##                     Max.   :31.00             Max.   :19.0000        
##  stays_in_week_nights     adults         children          babies       
##  Min.   : 0.000       Min.   :0.000   Min.   :0.0000   Min.   : 0.0000  
##  1st Qu.: 1.000       1st Qu.:2.000   1st Qu.:0.0000   1st Qu.: 0.0000  
##  Median : 2.000       Median :2.000   Median :0.0000   Median : 0.0000  
##  Mean   : 2.462       Mean   :1.834   Mean   :0.1026   Mean   : 0.0104  
##  3rd Qu.: 3.000       3rd Qu.:2.000   3rd Qu.:0.0000   3rd Qu.: 0.0000  
##  Max.   :50.000       Max.   :4.000   Max.   :3.0000   Max.   :10.0000  
##      meal             country          market_segment     distribution_channel
##  Length:75011       Length:75011       Length:75011       Length:75011        
##  Class :character   Class :character   Class :character   Class :character    
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character    
##                                                                               
##                                                                               
##                                                                               
##  is_repeated_guest previous_cancellations previous_bookings_not_canceled
##  Min.   :0.00000   Min.   : 0.00000       Min.   : 0.0000               
##  1st Qu.:0.00000   1st Qu.: 0.00000       1st Qu.: 0.0000               
##  Median :0.00000   Median : 0.00000       Median : 0.0000               
##  Mean   :0.04273   Mean   : 0.01576       Mean   : 0.2031               
##  3rd Qu.:0.00000   3rd Qu.: 0.00000       3rd Qu.: 0.0000               
##  Max.   :1.00000   Max.   :13.00000       Max.   :72.0000               
##  reserved_room_type assigned_room_type booking_changes   deposit_type      
##  Length:75011       Length:75011       Min.   : 0.0000   Length:75011      
##  Class :character   Class :character   1st Qu.: 0.0000   Class :character  
##  Mode  :character   Mode  :character   Median : 0.0000   Mode  :character  
##                                        Mean   : 0.2898                     
##                                        3rd Qu.: 0.0000                     
##                                        Max.   :18.0000                     
##      agent        days_in_waiting_list customer_type           adr        
##  Min.   :  1.00   Min.   :  0.000      Length:75011       Min.   : -6.38  
##  1st Qu.:  9.00   1st Qu.:  0.000      Class :character   1st Qu.: 67.76  
##  Median : 14.00   Median :  0.000      Mode  :character   Median : 92.70  
##  Mean   : 81.03   Mean   :  1.588                         Mean   :100.17  
##  3rd Qu.:171.00   3rd Qu.:  0.000                         3rd Qu.:125.00  
##  Max.   :535.00   Max.   :379.000                         Max.   :510.00  
##  required_car_parking_spaces total_of_special_requests reservation_status
##  Min.   :0.00000             Min.   :0.0000            Length:75011      
##  1st Qu.:0.00000             1st Qu.:0.0000            Class :character  
##  Median :0.00000             Median :1.0000            Mode  :character  
##  Mean   :0.09941             Mean   :0.7145                              
##  3rd Qu.:0.00000             3rd Qu.:1.0000                              
##  Max.   :8.00000             Max.   :5.0000                              
##  reservation_status_date
##  Min.   :2015-07-01     
##  1st Qu.:2016-03-11     
##  Median :2016-09-01     
##  Mean   :2016-08-27     
##  3rd Qu.:2017-03-12     
##  Max.   :2017-09-14

I can observe from the following table that:

summary(not_cancelled)
##     hotel            is_canceled   lead_time      arrival_date_year 
##  Length:75011       Min.   :0    Min.   :  0.00   Length:75011      
##  Class :character   1st Qu.:0    1st Qu.:  9.00   Class :character  
##  Mode  :character   Median :0    Median : 45.00   Mode  :character  
##                     Mean   :0    Mean   : 80.08                     
##                     3rd Qu.:0    3rd Qu.:124.00                     
##                     Max.   :0    Max.   :737.00                     
##  arrival_date_month arrival_date_day_of_month stays_in_weekend_nights
##  Length:75011       Min.   : 1.00             Min.   : 0.0000        
##  Class :character   1st Qu.: 8.00             1st Qu.: 0.0000        
##  Mode  :character   Median :16.00             Median : 1.0000        
##                     Mean   :15.84             Mean   : 0.9281        
##                     3rd Qu.:23.00             3rd Qu.: 2.0000        
##                     Max.   :31.00             Max.   :19.0000        
##  stays_in_week_nights     adults         children          babies       
##  Min.   : 0.000       Min.   :0.000   Min.   :0.0000   Min.   : 0.0000  
##  1st Qu.: 1.000       1st Qu.:2.000   1st Qu.:0.0000   1st Qu.: 0.0000  
##  Median : 2.000       Median :2.000   Median :0.0000   Median : 0.0000  
##  Mean   : 2.462       Mean   :1.834   Mean   :0.1026   Mean   : 0.0104  
##  3rd Qu.: 3.000       3rd Qu.:2.000   3rd Qu.:0.0000   3rd Qu.: 0.0000  
##  Max.   :50.000       Max.   :4.000   Max.   :3.0000   Max.   :10.0000  
##      meal             country          market_segment     distribution_channel
##  Length:75011       Length:75011       Length:75011       Length:75011        
##  Class :character   Class :character   Class :character   Class :character    
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character    
##                                                                               
##                                                                               
##                                                                               
##  is_repeated_guest previous_cancellations previous_bookings_not_canceled
##  Min.   :0.00000   Min.   : 0.00000       Min.   : 0.0000               
##  1st Qu.:0.00000   1st Qu.: 0.00000       1st Qu.: 0.0000               
##  Median :0.00000   Median : 0.00000       Median : 0.0000               
##  Mean   :0.04273   Mean   : 0.01576       Mean   : 0.2031               
##  3rd Qu.:0.00000   3rd Qu.: 0.00000       3rd Qu.: 0.0000               
##  Max.   :1.00000   Max.   :13.00000       Max.   :72.0000               
##  reserved_room_type assigned_room_type booking_changes   deposit_type      
##  Length:75011       Length:75011       Min.   : 0.0000   Length:75011      
##  Class :character   Class :character   1st Qu.: 0.0000   Class :character  
##  Mode  :character   Mode  :character   Median : 0.0000   Mode  :character  
##                                        Mean   : 0.2898                     
##                                        3rd Qu.: 0.0000                     
##                                        Max.   :18.0000                     
##      agent        days_in_waiting_list customer_type           adr        
##  Min.   :  1.00   Min.   :  0.000      Length:75011       Min.   : -6.38  
##  1st Qu.:  9.00   1st Qu.:  0.000      Class :character   1st Qu.: 67.76  
##  Median : 14.00   Median :  0.000      Mode  :character   Median : 92.70  
##  Mean   : 81.03   Mean   :  1.588                         Mean   :100.17  
##  3rd Qu.:171.00   3rd Qu.:  0.000                         3rd Qu.:125.00  
##  Max.   :535.00   Max.   :379.000                         Max.   :510.00  
##  required_car_parking_spaces total_of_special_requests reservation_status
##  Min.   :0.00000             Min.   :0.0000            Length:75011      
##  1st Qu.:0.00000             1st Qu.:0.0000            Class :character  
##  Median :0.00000             Median :1.0000            Mode  :character  
##  Mean   :0.09941             Mean   :0.7145                              
##  3rd Qu.:0.00000             3rd Qu.:1.0000                              
##  Max.   :8.00000             Max.   :5.0000                              
##  reservation_status_date
##  Min.   :2015-07-01     
##  1st Qu.:2016-03-11     
##  Median :2016-09-01     
##  Mean   :2016-08-27     
##  3rd Qu.:2017-03-12     
##  Max.   :2017-09-14

Categorical Columns Analysis

# Select only categorical (non-numeric) columns
categorical_columns <- not_cancelled[sapply(not_cancelled, is.character) | sapply(not_cancelled, is.factor)]

# Get a summary of these categorical columns
summary(categorical_columns)
##     hotel           arrival_date_year  arrival_date_month     meal          
##  Length:75011       Length:75011       Length:75011       Length:75011      
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##    country          market_segment     distribution_channel reserved_room_type
##  Length:75011       Length:75011       Length:75011         Length:75011      
##  Class :character   Class :character   Class :character     Class :character  
##  Mode  :character   Mode  :character   Mode  :character     Mode  :character  
##  assigned_room_type deposit_type       customer_type      reservation_status
##  Length:75011       Length:75011       Length:75011       Length:75011      
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character

Explanation

  • This code first isolates the categorical columns (either character or factor types) from the not_cancelled dataframe. It then provides a summary of these categorical columns, which includes counts for different categories and levels in each of these columns. This is particularly useful for understanding the distribution and frequency of different categorical variables within the non-cancelled bookings.

DATA VISUALIZATION- 1

Creating a Pie Chart of Hotel Types

# Assuming 'not_cancelled' is your data frame
# Calculate the value counts for the 'hotel' column
hotel_counts <- table(not_cancelled$hotel)

# Create a pie chart
pie(hotel_counts, main = "Pie Chart of Hotel Types")

## Explanation - This code snippet first calculates the frequency of each hotel type in the not_cancelled dataset using the table function. It then creates a pie chart to visually represent these frequencies. The pie chart, labeled “Pie Chart of Hotel Types,” shows the proportion of each hotel type (e.g., City Hotel, Resort Hotel) in the non-cancelled bookings, providing an immediate visual understanding of the distribution of hotel types in the dataset.

Bar Plot of Visitors Each Month

# Load the ggplot2 package
library(ggplot2)

# Assuming 'not_cancelled' is your data frame
# Note: Ensure 'hotel' and 'arrival_date_month' are factors with the correct order
not_cancelled$arrival_date_month <- factor(not_cancelled$arrival_date_month, 
                                           levels = c("January", "February", "March", "April", "May", "June",
                                                      "July", "August", "September", "October", "November", "December"))

# Creating the plot
ggplot(not_cancelled, aes(x = arrival_date_month, fill = hotel)) +
  geom_bar(position = "dodge") +
  labs(title = "Number of Visitors Each Month", x = "Month", y = "Count") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1)) # Rotate x-axis labels if needed

## Explanation - Here, a bar plot is created to show the number of visitors each month for the non-cancelled bookings. The arrival_date_month column is first converted into an ordered factor to ensure the months are displayed in the correct sequence. The ggplot2 package is used to create the plot, with months on the x-axis and the count of visitors on the y-axis. The bars are color-coded by hotel type and positioned side by side for each month (dodging position) to facilitate comparison.

Bar Plot of Visitors Each Year

# Load the ggplot2 package
library(ggplot2)

# Assuming 'not_cancelled' is your data frame
# Note: Ensure 'hotel' and 'arrival_date_year' are factors with the correct order
not_cancelled$arrival_date_year <- factor(not_cancelled$arrival_date_year, 
                                          levels = c("2015", "2016", "2017"))

# Creating the plot
ggplot(not_cancelled, aes(x = arrival_date_year, fill = hotel)) +
  geom_bar(position = "dodge") +
  labs(title = "Number of Visitors Each Year", x = "Year", y = "Count") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1)) # Rotate x-axis labels if needed

## Explanation - This plot shows the number of visitors each year in the not_cancelled dataset. Similar to the previous plot, arrival_date_year is converted to a factor to maintain the correct order. The plot displays the count of visitors per year, separated by hotel type, to illustrate trends or changes in visitor numbers over the years.

Histogram of Lead Time

# Load the ggplot2 package
library(ggplot2)

# Assuming 'not_cancelled' is your data frame
# Creating the histogram for 'lead_time' column
ggplot(not_cancelled, aes(x = lead_time)) +
  geom_histogram(bins = 20, fill = "blue", color = "black") +
  labs(title = "Histogram of Lead Time", x = "Lead Time", y = "Count") +
  theme_minimal()

## Explanation - A histogram is created to visualize the distribution of the lead_time (the number of days between booking and arrival) in the not_cancelled dataset. The plot helps to identify common lead times and any patterns or outliers in the booking behavior of the guests.

  • Now, Let’s check from which country we the guests that checked-in. I will limit our data to the countries that had at least 200 guests, in order to plot the countries with the most guests.

Analysis of Guests per Country

# Assuming 'not_cancelled' is your data frame
# Calculate the counts for each country
country_counts <- table(not_cancelled$country)

# Convert the table to a data frame
country_counts_df <- as.data.frame(country_counts)

# Rename the columns
names(country_counts_df) <- c("country", "No of guests")

# View the resulting data frame
country_counts_df
##     country No of guests
## 1       ABW            2
## 2       AGO          157
## 3       AIA            1
## 4       ALB           10
## 5       AND            2
## 6       ARE            8
## 7       ARG          160
## 8       ARM            6
## 9       ASM            1
## 10      ATA            2
## 11      ATF            1
## 12      AUS          319
## 13      AUT         1033
## 14      AZE            8
## 15      BDI            1
## 16      BEL         1868
## 17      BFA            1
## 18      BGD            3
## 19      BGR           63
## 20      BHR            1
## 21      BHS            1
## 22      BIH           10
## 23      BLR           17
## 24      BOL           10
## 25      BRA         1392
## 26      BRB            4
## 27      BWA            1
## 28      CAF            5
## 29      CHE         1298
## 30      CHL           49
## 31      CHN          537
## 32      CIV            4
## 33      CMR           10
## 34       CN         1025
## 35      COL           48
## 36      COM            2
## 37      CPV           12
## 38      CRI           18
## 39      CUB            8
## 40      CYM            1
## 41      CYP           40
## 42      CZE          134
## 43      DEU         6067
## 44      DJI            1
## 45      DMA            1
## 46      DNK          326
## 47      DOM            6
## 48      DZA           82
## 49      ECU           19
## 50      EGY           21
## 51      ESP         6383
## 52      EST           65
## 53      ETH            2
## 54      FIN          377
## 55      FRA         8468
## 56      FRO            1
## 57      GAB            2
## 58      GBR         9668
## 59      GEO            7
## 60      GHA            2
## 61      GIB            7
## 62      GNB            8
## 63      GRC           93
## 64      GTM            4
## 65      GUY            1
## 66      HKG            3
## 67      HRV           75
## 68      HUN          153
## 69      IDN           11
## 70      IND          116
## 71      IRL         2542
## 72      IRN           59
## 73      IRQ           14
## 74      ISL           53
## 75      ISR          500
## 76      ITA         2428
## 77      JAM            6
## 78      JOR           18
## 79      JPN          169
## 80      KAZ           14
## 81      KEN            4
## 82      KIR            1
## 83      KNA            2
## 84      KOR           78
## 85      KWT           10
## 86      LAO            2
## 87      LBN           22
## 88      LBY            8
## 89      LCA            1
## 90      LIE            2
## 91      LKA            7
## 92      LTU           74
## 93      LUX          177
## 94      LVA           46
## 95      MAC            1
## 96      MAR          150
## 97      MCO            3
## 98      MDG            1
## 99      MDV            3
## 100     MEX           75
## 101     MKD            8
## 102     MLI            1
## 103     MLT           13
## 104     MMR            1
## 105     MNE            3
## 106     MOZ           48
## 107     MRT            1
## 108     MUS            6
## 109     MWI            2
## 110     MYS           25
## 111     NAM            1
## 112     NCL            1
## 113     NGA           13
## 114     NLD         1716
## 115     NOR          426
## 116     NPL            1
## 117    NULL          421
## 118     NZL           68
## 119     OMN           14
## 120     PAK            5
## 121     PAN            9
## 122     PER           23
## 123     PHL           15
## 124     PLW            1
## 125     POL          703
## 126     PRI           10
## 127     PRT        20977
## 128     PRY            4
## 129     PYF            1
## 130     QAT            4
## 131     ROU          366
## 132     RUS          391
## 133     RWA            2
## 134     SAU           15
## 135     SDN            1
## 136     SEN            3
## 137     SGP           22
## 138     SLE            1
## 139     SLV            2
## 140     SMR            1
## 141     SRB           98
## 142     STP            2
## 143     SUR            5
## 144     SVK           41
## 145     SVN           41
## 146     SWE          793
## 147     SYC            1
## 148     SYR            3
## 149     TGO            2
## 150     THA           41
## 151     TJK            1
## 152     TMP            2
## 153     TUN           20
## 154     TUR          146
## 155     TWN           37
## 156     TZA            2
## 157     UGA            2
## 158     UKR           48
## 159     URY           23
## 160     USA         1592
## 161     UZB            2
## 162     VEN           14
## 163     VNM            6
## 164     ZAF           49
## 165     ZMB            1
## 166     ZWE            2
# Filter out rows where 'No of guests' is less than 200
country_counts_filtered <- country_counts_df[country_counts_df$`No of guests` >= 200, ]

# View the filtered data frame
country_counts_filtered
##     country No of guests
## 12      AUS          319
## 13      AUT         1033
## 16      BEL         1868
## 25      BRA         1392
## 29      CHE         1298
## 31      CHN          537
## 34       CN         1025
## 43      DEU         6067
## 46      DNK          326
## 51      ESP         6383
## 54      FIN          377
## 55      FRA         8468
## 58      GBR         9668
## 71      IRL         2542
## 75      ISR          500
## 76      ITA         2428
## 114     NLD         1716
## 115     NOR          426
## 117    NULL          421
## 125     POL          703
## 127     PRT        20977
## 131     ROU          366
## 132     RUS          391
## 146     SWE          793
## 160     USA         1592

Explanation

  • This code calculates the number of guests from each country in the not_cancelled dataset and converts the resulting table into a dataframe for easier manipulation. The dataframe is then filtered to include only countries with at least 200 guests, focusing the analysis on the countries with the most guests.

Bar Plot of Number of Guests per Country

# Load the ggplot2 package
library(ggplot2)

# Assuming 'country_counts_df' is your data frame
# Creating the bar plot
ggplot(data = country_counts_df, aes(x = country, y = `No of guests`)) +
  geom_bar(stat = "identity", fill = "blue", color = "black") +
  labs(title = "Number of Guests per Country", x = "Country", y = "No of Guests") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1)) # Rotate x-axis labels for better readability

## Explanation - A bar plot is created to visualize the number of guests from each country in the not_cancelled dataset. The x-axis represents different countries, and the y-axis shows the count of guests. The plot provides a clear visual comparison of the guest distribution across different countries, highlighting which countries contribute the most to the hotel’s clientele. The x-axis labels are rotated for better readability.

DATA ANALYSIS FOR CANCELLED ROOM

# Assuming 'hotel_bookings' is your data frame
# Filter rows where 'is_canceled' equals 1
cancelled <- hotel_data[hotel_data$is_canceled == 1, ]

# Display the first few rows of the cancelled subset
head(cancelled)
##           hotel is_canceled lead_time arrival_date_year arrival_date_month
## 9  Resort Hotel           1        85              2015               July
## 10 Resort Hotel           1        75              2015               July
## 11 Resort Hotel           1        23              2015               July
## 28 Resort Hotel           1        60              2015               July
## 33 Resort Hotel           1        96              2015               July
## 35 Resort Hotel           1        45              2015               July
##    arrival_date_day_of_month stays_in_weekend_nights stays_in_week_nights
## 9                          1                       0                    3
## 10                         1                       0                    3
## 11                         1                       0                    4
## 28                         1                       2                    5
## 33                         1                       2                    8
## 35                         2                       1                    3
##    adults children babies meal country market_segment distribution_channel
## 9       2        0      0   BB     PRT      Online TA                TA/TO
## 10      2        0      0   HB     PRT  Offline TA/TO                TA/TO
## 11      2        0      0   BB     PRT      Online TA                TA/TO
## 28      2        0      0   BB     PRT      Online TA                TA/TO
## 33      2        0      0   BB     PRT         Direct               Direct
## 35      3        0      0   BB     PRT      Online TA                TA/TO
##    is_repeated_guest previous_cancellations previous_bookings_not_canceled
## 9                  0                      0                              0
## 10                 0                      0                              0
## 11                 0                      0                              0
## 28                 0                      0                              0
## 33                 0                      0                              0
## 35                 0                      0                              0
##    reserved_room_type assigned_room_type booking_changes deposit_type agent
## 9                   A                  A               0   No Deposit   240
## 10                  D                  D               0   No Deposit    15
## 11                  E                  E               0   No Deposit   240
## 28                  E                  E               0   No Deposit   240
## 33                  E                  E               0   No Deposit    14
## 35                  D                  D               0   No Deposit   241
##    days_in_waiting_list customer_type   adr required_car_parking_spaces
## 9                     0     Transient  82.0                           0
## 10                    0     Transient 105.5                           0
## 11                    0     Transient 123.0                           0
## 28                    0     Transient 107.0                           0
## 33                    0     Transient 108.3                           0
## 35                    0     Transient 108.8                           0
##    total_of_special_requests reservation_status reservation_status_date
## 9                          1           Canceled              2015-05-06
## 10                         0           Canceled              2015-04-22
## 11                         0           Canceled              2015-06-23
## 28                         2           Canceled              2015-05-11
## 33                         2           Canceled              2015-05-29
## 35                         1           Canceled              2015-05-19

Explanation:

  • This code creates a new subset cancelled from the hotel_data dataframe, containing only the rows where the booking was canceled (is_canceled == 1). The head function is used to display the first few rows of this subset for verification.

  • Checking if our dataset is right. By checking the column “reservation_status” I can see that it has only values “Canceled” and “No-show”. Therefore, our dataset is right, having only the cancelled data.

# Get unique values in the 'reservation_status' column of the 'cancelled' dataframe
unique_values <- unique(cancelled$reservation_status)

# Print the unique values
unique_values
## [1] "Canceled" "No-Show"

Explanation

  • The unique function is used to retrieve and print the unique values from the reservation_status column of the cancelled dataframe. This step is crucial for validating that the dataset contains only cancelled reservations, which should show statuses like “Canceled” or “No-show”.
# Check if 'stays_in_weekend_nights' and 'stays_in_week_nights' columns are equal in all rows
are_equal <- all(cancelled$stays_in_weekend_nights == cancelled$stays_in_week_nights)

# Print the result
are_equal
## [1] FALSE

Explanation

  • This code checks whether all bookings in the cancelled subset have the same number of ‘stays_in_weekend_nights’ and ‘stays_in_week_nights’. This is to ensure there is no inconsistency in the data where a booking shows zero nights stayed but is marked as cancelled.

Structural and Statistical Summary of Cancelled Bookings

# Get the structure of the dataframe 'cancelled'
str(cancelled)
## 'data.frame':    44199 obs. of  30 variables:
##  $ hotel                         : chr  "Resort Hotel" "Resort Hotel" "Resort Hotel" "Resort Hotel" ...
##  $ is_canceled                   : num  1 1 1 1 1 1 1 1 1 1 ...
##  $ lead_time                     : num  85 75 23 60 96 45 40 43 45 47 ...
##  $ arrival_date_year             : chr  "2015" "2015" "2015" "2015" ...
##  $ arrival_date_month            : chr  "July" "July" "July" "July" ...
##  $ arrival_date_day_of_month     : num  1 1 1 1 1 2 2 2 2 2 ...
##  $ stays_in_weekend_nights       : num  0 0 0 2 2 1 1 1 2 2 ...
##  $ stays_in_week_nights          : num  3 3 4 5 8 3 3 3 3 5 ...
##  $ adults                        : num  2 2 2 2 2 3 3 3 2 2 ...
##  $ children                      : num  0 0 0 0 0 0 0 0 0 2 ...
##  $ babies                        : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ meal                          : chr  "BB" "HB" "BB" "BB" ...
##  $ country                       : chr  "PRT" "PRT" "PRT" "PRT" ...
##  $ market_segment                : chr  "Online TA" "Offline TA/TO" "Online TA" "Online TA" ...
##  $ distribution_channel          : chr  "TA/TO" "TA/TO" "TA/TO" "TA/TO" ...
##  $ is_repeated_guest             : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ previous_cancellations        : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ previous_bookings_not_canceled: num  0 0 0 0 0 0 0 0 0 0 ...
##  $ reserved_room_type            : chr  "A" "D" "E" "E" ...
##  $ assigned_room_type            : chr  "A" "D" "E" "E" ...
##  $ booking_changes               : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ deposit_type                  : chr  "No Deposit" "No Deposit" "No Deposit" "No Deposit" ...
##  $ agent                         : num  240 15 240 240 14 241 241 241 241 240 ...
##  $ days_in_waiting_list          : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ customer_type                 : chr  "Transient" "Transient" "Transient" "Transient" ...
##  $ adr                           : num  82 106 123 107 108 ...
##  $ required_car_parking_spaces   : num  0 0 0 0 0 0 0 0 0 0 ...
##  $ total_of_special_requests     : num  1 0 0 2 2 1 1 0 0 0 ...
##  $ reservation_status            : chr  "Canceled" "Canceled" "Canceled" "Canceled" ...
##  $ reservation_status_date       : Date, format: "2015-05-06" "2015-04-22" ...
# Optionally, you can also get a statistical summary of the dataframe
summary(cancelled)
##     hotel            is_canceled   lead_time     arrival_date_year 
##  Length:44199       Min.   :1    Min.   :  0.0   Length:44199      
##  Class :character   1st Qu.:1    1st Qu.: 49.0   Class :character  
##  Mode  :character   Median :1    Median :113.0   Mode  :character  
##                     Mean   :1    Mean   :144.9                     
##                     3rd Qu.:1    3rd Qu.:214.0                     
##                     Max.   :1    Max.   :629.0                     
##  arrival_date_month arrival_date_day_of_month stays_in_weekend_nights
##  Length:44199       Min.   : 1.00             Min.   : 0.0000        
##  Class :character   1st Qu.: 8.00             1st Qu.: 0.0000        
##  Mode  :character   Median :16.00             Median : 1.0000        
##                     Mean   :15.73             Mean   : 0.9253        
##                     3rd Qu.:23.00             3rd Qu.: 2.0000        
##                     Max.   :31.00             Max.   :16.0000        
##  stays_in_week_nights     adults          children           babies        
##  Min.   : 0.000       Min.   : 0.000   Min.   : 0.0000   Min.   :0.000000  
##  1st Qu.: 1.000       1st Qu.: 2.000   1st Qu.: 0.0000   1st Qu.:0.000000  
##  Median : 2.000       Median : 2.000   Median : 0.0000   Median :0.000000  
##  Mean   : 2.562       Mean   : 1.903   Mean   : 0.1066   Mean   :0.003824  
##  3rd Qu.: 3.000       3rd Qu.: 2.000   3rd Qu.: 0.0000   3rd Qu.:0.000000  
##  Max.   :40.000       Max.   :55.000   Max.   :10.0000   Max.   :2.000000  
##      meal             country          market_segment     distribution_channel
##  Length:44199       Length:44199       Length:44199       Length:44199        
##  Class :character   Class :character   Class :character   Class :character    
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character    
##                                                                               
##                                                                               
##                                                                               
##  is_repeated_guest previous_cancellations previous_bookings_not_canceled
##  Min.   :0.00000   Min.   : 0.0000        Min.   : 0.00000              
##  1st Qu.:0.00000   1st Qu.: 0.0000        1st Qu.: 0.00000              
##  Median :0.00000   Median : 0.0000        Median : 0.00000              
##  Mean   :0.01244   Mean   : 0.2084        Mean   : 0.02514              
##  3rd Qu.:0.00000   3rd Qu.: 0.0000        3rd Qu.: 0.00000              
##  Max.   :1.00000   Max.   :26.0000        Max.   :58.00000              
##  reserved_room_type assigned_room_type booking_changes    deposit_type      
##  Length:44199       Length:44199       Min.   : 0.00000   Length:44199      
##  Class :character   Class :character   1st Qu.: 0.00000   Class :character  
##  Mode  :character   Mode  :character   Median : 0.00000   Mode  :character  
##                                        Mean   : 0.09833                     
##                                        3rd Qu.: 0.00000                     
##                                        Max.   :16.00000                     
##      agent        days_in_waiting_list customer_type           adr        
##  Min.   :  1.00   Min.   :  0.000      Length:44199       Min.   :   0.0  
##  1st Qu.:  9.00   1st Qu.:  0.000      Class :character   1st Qu.:  72.8  
##  Median : 14.00   Median :  0.000      Mode  :character   Median :  96.3  
##  Mean   : 69.63   Mean   :  3.566                         Mean   : 105.0  
##  3rd Qu.: 96.00   3rd Qu.:  0.000                         3rd Qu.: 127.7  
##  Max.   :531.00   Max.   :391.000                         Max.   :5400.0  
##  required_car_parking_spaces total_of_special_requests reservation_status
##  Min.   :0                   Min.   :0.0000            Length:44199      
##  1st Qu.:0                   1st Qu.:0.0000            Class :character  
##  Median :0                   Median :0.0000            Mode  :character  
##  Mean   :0                   Mean   :0.3289                              
##  3rd Qu.:0                   3rd Qu.:0.0000                              
##  Max.   :0                   Max.   :5.0000                              
##  reservation_status_date
##  Min.   :2014-10-17     
##  1st Qu.:2015-12-18     
##  Median :2016-06-09     
##  Mean   :2016-06-10     
##  3rd Qu.:2017-01-03     
##  Max.   :2017-08-31

Explanation

  • The str function is used to display the structure of the cancelled dataframe, showing details such as column types and brief data previews. The summary function provides a detailed statistical summary, including mean, median, min, max values, and counts for different categories in each column.

I can observe from the following table that:

# Get a statistical summary of the 'cancelled' data frame
summary(cancelled)
##     hotel            is_canceled   lead_time     arrival_date_year 
##  Length:44199       Min.   :1    Min.   :  0.0   Length:44199      
##  Class :character   1st Qu.:1    1st Qu.: 49.0   Class :character  
##  Mode  :character   Median :1    Median :113.0   Mode  :character  
##                     Mean   :1    Mean   :144.9                     
##                     3rd Qu.:1    3rd Qu.:214.0                     
##                     Max.   :1    Max.   :629.0                     
##  arrival_date_month arrival_date_day_of_month stays_in_weekend_nights
##  Length:44199       Min.   : 1.00             Min.   : 0.0000        
##  Class :character   1st Qu.: 8.00             1st Qu.: 0.0000        
##  Mode  :character   Median :16.00             Median : 1.0000        
##                     Mean   :15.73             Mean   : 0.9253        
##                     3rd Qu.:23.00             3rd Qu.: 2.0000        
##                     Max.   :31.00             Max.   :16.0000        
##  stays_in_week_nights     adults          children           babies        
##  Min.   : 0.000       Min.   : 0.000   Min.   : 0.0000   Min.   :0.000000  
##  1st Qu.: 1.000       1st Qu.: 2.000   1st Qu.: 0.0000   1st Qu.:0.000000  
##  Median : 2.000       Median : 2.000   Median : 0.0000   Median :0.000000  
##  Mean   : 2.562       Mean   : 1.903   Mean   : 0.1066   Mean   :0.003824  
##  3rd Qu.: 3.000       3rd Qu.: 2.000   3rd Qu.: 0.0000   3rd Qu.:0.000000  
##  Max.   :40.000       Max.   :55.000   Max.   :10.0000   Max.   :2.000000  
##      meal             country          market_segment     distribution_channel
##  Length:44199       Length:44199       Length:44199       Length:44199        
##  Class :character   Class :character   Class :character   Class :character    
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character    
##                                                                               
##                                                                               
##                                                                               
##  is_repeated_guest previous_cancellations previous_bookings_not_canceled
##  Min.   :0.00000   Min.   : 0.0000        Min.   : 0.00000              
##  1st Qu.:0.00000   1st Qu.: 0.0000        1st Qu.: 0.00000              
##  Median :0.00000   Median : 0.0000        Median : 0.00000              
##  Mean   :0.01244   Mean   : 0.2084        Mean   : 0.02514              
##  3rd Qu.:0.00000   3rd Qu.: 0.0000        3rd Qu.: 0.00000              
##  Max.   :1.00000   Max.   :26.0000        Max.   :58.00000              
##  reserved_room_type assigned_room_type booking_changes    deposit_type      
##  Length:44199       Length:44199       Min.   : 0.00000   Length:44199      
##  Class :character   Class :character   1st Qu.: 0.00000   Class :character  
##  Mode  :character   Mode  :character   Median : 0.00000   Mode  :character  
##                                        Mean   : 0.09833                     
##                                        3rd Qu.: 0.00000                     
##                                        Max.   :16.00000                     
##      agent        days_in_waiting_list customer_type           adr        
##  Min.   :  1.00   Min.   :  0.000      Length:44199       Min.   :   0.0  
##  1st Qu.:  9.00   1st Qu.:  0.000      Class :character   1st Qu.:  72.8  
##  Median : 14.00   Median :  0.000      Mode  :character   Median :  96.3  
##  Mean   : 69.63   Mean   :  3.566                         Mean   : 105.0  
##  3rd Qu.: 96.00   3rd Qu.:  0.000                         3rd Qu.: 127.7  
##  Max.   :531.00   Max.   :391.000                         Max.   :5400.0  
##  required_car_parking_spaces total_of_special_requests reservation_status
##  Min.   :0                   Min.   :0.0000            Length:44199      
##  1st Qu.:0                   1st Qu.:0.0000            Class :character  
##  Median :0                   Median :0.0000            Mode  :character  
##  Mean   :0                   Mean   :0.3289                              
##  3rd Qu.:0                   3rd Qu.:0.0000                              
##  Max.   :0                   Max.   :5.0000                              
##  reservation_status_date
##  Min.   :2014-10-17     
##  1st Qu.:2015-12-18     
##  Median :2016-06-09     
##  Mean   :2016-06-10     
##  3rd Qu.:2017-01-03     
##  Max.   :2017-08-31

Analyzing Categorical Columns

# Select only non-numeric (categorical) columns from the 'cancelled' data frame
categorical_columns <- cancelled[sapply(cancelled, is.character) | sapply(cancelled, is.factor)]

# Get a summary of these categorical columns
summary(categorical_columns)
##     hotel           arrival_date_year  arrival_date_month     meal          
##  Length:44199       Length:44199       Length:44199       Length:44199      
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##    country          market_segment     distribution_channel reserved_room_type
##  Length:44199       Length:44199       Length:44199         Length:44199      
##  Class :character   Class :character   Class :character     Class :character  
##  Mode  :character   Mode  :character   Mode  :character     Mode  :character  
##  assigned_room_type deposit_type       customer_type      reservation_status
##  Length:44199       Length:44199       Length:44199       Length:44199      
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character

Explanation

  • This code isolates the categorical columns (either character or factor types) from the cancelled dataframe and provides a summary of these columns. This is useful for understanding the distribution and frequency of different categorical variables within the cancelled bookings. # COMPARE VISUALY THE GUESTS WHO CANCELLED THE BOOKING AND THOSE WHO CHECKED IN THEIR RESERVATION

Visual Comparison of Cancelled and Non-Cancelled Bookings

Creating Pie Charts for Hotel Distribution

# Assuming 'not_cancelled' and 'cancelled' are your data frames
# Set up the plotting area for two pie charts side by side
par(mfrow = c(1, 2))

# Pie chart for 'hotel' distribution in not_cancelled data
hotel_counts_not_cancelled <- table(not_cancelled$hotel)
pie(hotel_counts_not_cancelled, 
    labels = paste(names(hotel_counts_not_cancelled), "\n", prop.table(hotel_counts_not_cancelled) * 100, "%"), 
    main = "Guests vs Hotel Type")

# Pie chart for 'hotel' distribution in cancelled data
hotel_counts_cancelled <- table(cancelled$hotel)
pie(hotel_counts_cancelled, 
    labels = paste(names(hotel_counts_cancelled), "\n", prop.table(hotel_counts_cancelled) * 100, "%"), 
    main = "Cancellation vs Hotel Type")

## Explanation - This code creates two side-by-side pie charts to visually compare the distribution of hotel types between non-cancelled and cancelled bookings. The table function is used to calculate the frequency of each hotel type in both subsets. The pie charts provide a clear visual representation of the proportion of each hotel type in the two subsets, highlighting differences in hotel preference between guests who cancelled and those who did not.

Bar Plots Comparing Yearly and Monthly Data

# Load the necessary libraries
library(ggplot2)
library(gridExtra)
## Warning: package 'gridExtra' was built under R version 4.3.2
## 
## Attaching package: 'gridExtra'
## The following object is masked from 'package:dplyr':
## 
##     combine
# Assuming 'not_cancelled' and 'cancelled' are your data frames
# Note: Ensure 'hotel' and 'arrival_date_year' are factors with the correct order
not_cancelled$arrival_date_year <- factor(not_cancelled$arrival_date_year, 
                                          levels = c("2015", "2016", "2017"))
cancelled$arrival_date_year <- factor(cancelled$arrival_date_year, 
                                      levels = c("2015", "2016", "2017"))

# Creating the plots
plot1 <- ggplot(not_cancelled, aes(x = arrival_date_year, fill = hotel)) +
  geom_bar(position = "dodge") +
  labs(title = "Number of Visitors Each Year", x = "Year", y = "Count") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1))

plot2 <- ggplot(cancelled, aes(x = arrival_date_year, fill = hotel)) +
  geom_bar(position = "dodge") +
  labs(title = "Number of Cancellations Each Year", x = "Year", y = "Count") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1))

# Combine the plots side by side
grid.arrange(plot1, plot2, ncol = 2)

# Load the necessary libraries
library(ggplot2)
library(patchwork)
## Warning: package 'patchwork' was built under R version 4.3.2
# Assuming 'not_cancelled' and 'cancelled' are your data frames
# Note: Ensure 'hotel' and 'arrival_date_month' are factors with the correct order
not_cancelled$arrival_date_month <- factor(not_cancelled$arrival_date_month, 
                                           levels = c("January", "February", "March", "April", "May", "June",
                                                      "July", "August", "September", "October", "November", "December"))
cancelled$arrival_date_month <- factor(cancelled$arrival_date_month, 
                                       levels = c("January", "February", "March", "April", "May", "June",
                                                  "July", "August", "September", "October", "November", "December"))

# Creating the plots
plot1 <- ggplot(not_cancelled, aes(x = arrival_date_month, fill = hotel)) +
  geom_bar(position = "dodge") +
  labs(title = "Number of Visitors Each Month", x = "Month", y = "Count") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1))

plot2 <- ggplot(cancelled, aes(x = arrival_date_month, fill = hotel)) +
  geom_bar(position = "dodge") +
  labs(title = "Number of Cancellations Each Month", x = "Month", y = "Count") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1))

# Combine the plots side by side with shared y-axis
plot1 + plot2 + plot_layout(guides = 'collect') & theme(axis.text.x = element_text(angle = 45, hjust = 1))

## Explanation - These code segments create bar plots to compare the number of visitors and cancellations by year and month. The data is first converted to factors with the correct order. ggplot2 is used to create the plots, which are then combined side by side for easy comparison. The plots offer visual insights into trends and patterns in booking and cancellation behaviors over time.

Displaying First Few Rows of Non-Cancelled Data

# Assuming 'data' is your data frame and 'is_canceled' is one of its columns
# Filter rows where 'is_canceled' equals 0
df <- hotel_data[hotel_data$is_canceled == 0, ]

# Display the first few rows of the 'df' subset
head(df)
##          hotel is_canceled lead_time arrival_date_year arrival_date_month
## 1 Resort Hotel           0       342              2015               July
## 2 Resort Hotel           0       737              2015               July
## 3 Resort Hotel           0         7              2015               July
## 4 Resort Hotel           0        13              2015               July
## 5 Resort Hotel           0        14              2015               July
## 6 Resort Hotel           0        14              2015               July
##   arrival_date_day_of_month stays_in_weekend_nights stays_in_week_nights adults
## 1                         1                       0                    0      2
## 2                         1                       0                    0      2
## 3                         1                       0                    1      1
## 4                         1                       0                    1      1
## 5                         1                       0                    2      2
## 6                         1                       0                    2      2
##   children babies meal country market_segment distribution_channel
## 1        0      0   BB     PRT         Direct               Direct
## 2        0      0   BB     PRT         Direct               Direct
## 3        0      0   BB     GBR         Direct               Direct
## 4        0      0   BB     GBR      Corporate            Corporate
## 5        0      0   BB     GBR      Online TA                TA/TO
## 6        0      0   BB     GBR      Online TA                TA/TO
##   is_repeated_guest previous_cancellations previous_bookings_not_canceled
## 1                 0                      0                              0
## 2                 0                      0                              0
## 3                 0                      0                              0
## 4                 0                      0                              0
## 5                 0                      0                              0
## 6                 0                      0                              0
##   reserved_room_type assigned_room_type booking_changes deposit_type agent
## 1                  C                  C               3   No Deposit    14
## 2                  C                  C               4   No Deposit    14
## 3                  A                  C               0   No Deposit    14
## 4                  A                  A               0   No Deposit   304
## 5                  A                  A               0   No Deposit   240
## 6                  A                  A               0   No Deposit   240
##   days_in_waiting_list customer_type adr required_car_parking_spaces
## 1                    0     Transient   0                           0
## 2                    0     Transient   0                           0
## 3                    0     Transient  75                           0
## 4                    0     Transient  75                           0
## 5                    0     Transient  98                           0
## 6                    0     Transient  98                           0
##   total_of_special_requests reservation_status reservation_status_date
## 1                         0          Check-Out              2015-07-01
## 2                         0          Check-Out              2015-07-01
## 3                         0          Check-Out              2015-07-02
## 4                         0          Check-Out              2015-07-02
## 5                         1          Check-Out              2015-07-03
## 6                         1          Check-Out              2015-07-03

DATA VISUALIZATION- 2

    library(dplyr)
    library(ggplot2)
    library(gridExtra)

    # Assuming your data frame 'df' is already loaded

    # Create grouped dataframes
    df1 <- df %>% group_by(arrival_date_year) %>% summarise(adr = sum(adr))
    df2 <- df %>% group_by(market_segment) %>% summarise(adr = sum(adr))
    df3 <- df %>% group_by(is_repeated_guest) %>% summarise(adr = sum(adr))
    df4 <- df %>% group_by(meal) %>% summarise(adr = sum(adr))
    df5 <- df %>% group_by(customer_type) %>% summarise(adr = sum(adr))
    df6 <- df %>% group_by(assigned_room_type) %>% summarise(adr = sum(adr))

    # Function to create a horizontal bar plot
    create_barh_plot <- function(df, x, y, title) {
      ggplot(df, aes_string(x = x, y = y)) +
        geom_bar(stat = "identity", fill = "steelblue", color = "black") +
        coord_flip() + # Flipping the coordinates for horizontal bars
        labs(title = title, x = "Adr", y = "") +
        theme_minimal() +
        theme(axis.text.x = element_text(size = 12),
              axis.text.y = element_text(size = 12),
              axis.title = element_text(size = 14),
              plot.title = element_text(size = 16, hjust = 0.5))
    }

    # Create each plot
    plot1 <- create_barh_plot(df1, "adr", "arrival_date_year", "Year")
## Warning: `aes_string()` was deprecated in ggplot2 3.0.0.
## ℹ Please use tidy evaluation idioms with `aes()`.
## ℹ See also `vignette("ggplot2-in-packages")` for more information.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.
    plot2 <- create_barh_plot(df2, "adr", "market_segment", "Market Segment")
    plot3 <- create_barh_plot(df3, "adr", "is_repeated_guest", "Repeated Guest")
    plot4 <- create_barh_plot(df4, "adr", "meal", "Meal")
    plot5 <- create_barh_plot(df5, "adr", "customer_type", "Customer Type")
    plot6 <- create_barh_plot(df6, "adr", "assigned_room_type", "Room Type")

    # Arrange the plots in a 3x2 grid
    grid.arrange(plot1, plot2, plot3, plot4, plot5, plot6, ncol = 2, nrow = 3)

## Explanation - This code creates a series of horizontal bar plots to analyze how the ADR varies across different parameters like year, market segment, customer type, meal type, etc. The create_barh_plot function simplifies the process of creating each plot. The plots are then arranged in a 3x2 grid, providing a comprehensive visual comparison across different categories.

ADR for different months

library(dplyr)

# Assuming 'df' is your data frame

# Create subsets based on hotel type
df_resort <- filter(df, hotel == 'Resort Hotel')
df_city <- filter(df, hotel == 'City Hotel')

# Calculate average adr per month for resort and city hotels
resort_hotel <- df_resort %>%
  group_by(arrival_date_month) %>%
  summarise(adr = mean(adr, na.rm = TRUE)) %>%
  ungroup() %>%
  arrange(match(arrival_date_month, month.abb))

city_hotel <- df_city %>%
  group_by(arrival_date_month) %>%
  summarise(adr = mean(adr, na.rm = TRUE)) %>%
  ungroup() %>%
  arrange(match(arrival_date_month, month.abb))

# Calculate average adr per country for resort and city hotels
resort_hotel_2 <- df_resort %>%
  group_by(country) %>%
  summarise(adr = mean(adr, na.rm = TRUE)) %>%
  ungroup()

city_hotel_2 <- df_city %>%
  group_by(country) %>%
  summarise(adr = mean(adr, na.rm = TRUE)) %>%
  ungroup()
library(dplyr)

# Assuming 'resort_hotel' and 'city_hotel' data frames are already created

# Merge the data frames
hotel_type <- merge(resort_hotel, city_hotel, by = "arrival_date_month")

# Rename the columns
names(hotel_type) <- c("month", "price_for_resort", "price_for_city_hotel")

# View the merged data frame
hotel_type
##        month price_for_resort price_for_city_hotel
## 1      April         75.86782            111.96227
## 2     August        181.20589            118.67460
## 3   December         68.41010             88.40186
## 4   February         54.14748             86.52006
## 5    January         48.76113             82.33098
## 6       July        150.12253            115.81802
## 7       June        107.97485            117.87436
## 8      March         57.05684             90.65853
## 9        May         76.65756            120.66983
## 10  November         48.70629             86.94659
## 11   October         61.77545            102.00467
## 12 September         96.41686            112.77658

Explanation

  • This segment of code is dedicated to comparing the ADR for Resort and City Hotels by month. It first creates subsets for each type of hotel. Then, it calculates and summarizes the average ADR per month for each hotel type. The data frames for each hotel type are merged for comparison, and the columns are renamed for clarity. This comparison helps in understanding how ADR varies between different types of hotels and across different months of the year.
# Assuming 'hotel_type' is your data frame and it has a column named 'month'

# Define the correct order of months
sort_order <- c("January", "February", "March", "April", "May", "June", 
                "July", "August", "September", "October", "November", "December")

# Convert 'month' into a factor with levels in the correct order
hotel_type$month <- factor(hotel_type$month, levels = sort_order)

# Sort the dataframe based on the 'month' factor
hotel_type_sorted <- hotel_type[order(hotel_type$month), ]

# Reset row names (optional)
rownames(hotel_type_sorted) <- NULL

# View the sorted dataframe
hotel_type_sorted
##        month price_for_resort price_for_city_hotel
## 1    January         48.76113             82.33098
## 2   February         54.14748             86.52006
## 3      March         57.05684             90.65853
## 4      April         75.86782            111.96227
## 5        May         76.65756            120.66983
## 6       June        107.97485            117.87436
## 7       July        150.12253            115.81802
## 8     August        181.20589            118.67460
## 9  September         96.41686            112.77658
## 10   October         61.77545            102.00467
## 11  November         48.70629             86.94659
## 12  December         68.41010             88.40186
  • Prices for city hotel are ranged between 70 to 100. But for resort hotel the range is different enough, from 40 to 180. There are months like January and November with very low prices and months like July and August with very high prices.

Bar Plot of ADR by Month for Different Hotel Types

library(ggplot2)

# Assuming 'hotel_type_sorted' is your data frame and it's already sorted by month
# and contains columns 'month', 'price_for_resort', and 'price_for_city_hotel'

# Reshape the data from wide to long format for ggplot2
long_format <- reshape2::melt(hotel_type_sorted, id.vars = "month", 
                              measure.vars = c("price_for_resort", "price_for_city_hotel"))

# Create the bar plot
ggplot(long_format, aes(x = month, y = value, fill = variable)) +
  geom_bar(stat = "identity", position = position_dodge()) +
  labs(title = "Prices for Rooms per Month", x = "Month", y = "Price") +
  theme_minimal() +
  scale_fill_discrete(name = "Hotel Type", labels = c("Resort Hotel", "City Hotel"))

## Explanation - This code creates a bar plot that compares the ADR (Average Daily Rate) for Resort and City Hotels across different months. The data is first reshaped into a long format suitable for ggplot2, making it easier to plot the two types of hotel prices side by side for each month. The plot visually illustrates how prices vary between hotel types and throughout the year, highlighting months with higher or lower rates.

ADR for different countries

library(dplyr)

# Assuming 'resort_hotel_2' and 'city_hotel_2' are already created and have a column named 'country'

# Merge the data frames
hotel_type_2 <- merge(resort_hotel_2, city_hotel_2, by = "country")

# Rename the columns
names(hotel_type_2) <- c("country", "price_for_resort", "price_for_city_hotel")

# View the merged data frame
hotel_type_2
##     country price_for_resort price_for_city_hotel
## 1       AGO        121.23235            110.94243
## 2       ALB         71.07500             81.01125
## 3       ARE        204.44333             80.00000
## 4       ARG        115.45854            113.19920
## 5       ARM         52.35000            111.66250
## 6       AUS        114.72083            116.76239
## 7       AUT         81.79784            107.28782
## 8       AZE        187.80000            100.35500
## 9       BEL         91.43267            116.74986
## 10      BGR         84.70000            111.49172
## 11      BIH         50.00000            114.49444
## 12      BLR         67.56750             98.37769
## 13      BRA        108.65891            107.38630
## 14      CAF         56.30000            114.71000
## 15      CHE        121.04619            115.95673
## 16      CHL        126.62214            114.19886
## 17      CHN         81.11592            112.56265
## 18      CIV         58.50000            123.00000
## 19      CMR         45.43000             99.05125
## 20       CN        101.35669            107.65134
## 21      COL        109.09500            124.20306
## 22      COM         71.61000            259.00000
## 23      CPV         64.00000             96.05000
## 24      CRI         36.26000            108.90937
## 25      CUB         69.50000            129.23250
## 26      CYP         92.00000             90.69382
## 27      CZE        106.28435            107.29387
## 28      DEU         76.89230            106.44052
## 29      DNK         99.17933            120.15910
## 30      DOM         97.76667            109.55667
## 31      DZA        134.98286            107.00800
## 32      ECU         53.16500            131.79706
## 33      EGY        122.89000            112.27000
## 34      ESP        110.85082            110.02880
## 35      EST         94.80345            118.14278
## 36      FIN         79.59370            113.66459
## 37      FRA         91.93590            108.66598
## 38      GBR         76.73502            112.33517
## 39      GEO        221.59250             85.43333
## 40      GRC         72.62500            112.49729
## 41      HKG         92.00000            115.00000
## 42      HRV        109.49556            105.52955
## 43      HUN        120.39316            109.61522
## 44      IDN        115.98333            117.38125
## 45      IND        104.64727            107.79434
## 46      IRL         86.50934            112.36635
## 47      IRN        109.31000            118.31389
## 48      ISL        147.45833            106.16617
## 49      ISR        103.00187            103.88401
## 50      ITA         99.90995            113.03734
## 51      JAM         99.46200            137.40000
## 52      JOR         74.85000             99.08125
## 53      JPN         99.44333            121.70375
## 54      KAZ        148.51250            124.72000
## 55      KOR         66.64000            110.12750
## 56      KWT        136.59000            107.13500
## 57      LBN        139.66667            126.34474
## 58      LKA         33.30000             96.83333
## 59      LTU         98.96889             98.31345
## 60      LUX        139.23685            125.99398
## 61      LVA         71.87103            108.62941
## 62      MAR        145.75923            106.43928
## 63      MDV        133.50000             75.00000
## 64      MEX         85.61667            119.88391
## 65      MKD        108.75000             75.00000
## 66      MLT         43.90000            108.77727
## 67      MOZ        142.00000            101.10578
## 68      MUS         98.00000             80.91400
## 69      MYS         59.23000             96.73867
## 70      NGA        116.46875            106.89000
## 71      NLD         80.57229            113.98853
## 72      NOR        102.09350            121.31617
## 73     NULL         60.27993             87.50000
## 74      NZL         90.58357            112.76778
## 75      OMN         81.62091            143.00000
## 76      PAK        171.90500            123.66667
## 77      PER        234.00000            120.13136
## 78      PHL        164.76143            137.37500
## 79      POL         85.93793            112.94130
## 80      PRI         66.05111            120.00000
## 81      PRT         90.58931             90.84796
## 82      QAT          0.00000            103.00000
## 83      ROU        121.56407            108.41584
## 84      RUS        113.54930            109.84589
## 85      SAU        171.00000            121.95357
## 86      SGP        120.42750             96.25444
## 87      SRB         86.32714             99.97846
## 88      SUR         91.50000             99.00000
## 89      SVK         91.88222            118.71094
## 90      SVN        137.39500            110.38581
## 91      SWE        100.42126            114.69240
## 92      SYR         54.00000            120.50000
## 93      TGO        152.00000             59.50000
## 94      THA        105.83333            100.01371
## 95      TUR        131.87500            102.75315
## 96      TWN        156.50000            114.87760
## 97      UGA         43.00000            126.00000
## 98      UKR         53.40870            120.46760
## 99      URY        137.25800            125.64722
## 100     USA        128.53486            116.09002
## 101     UZB         60.00000            138.50000
## 102     VEN         55.20000            111.96750
## 103     VNM        171.37500            100.07250
## 104     ZAF        118.97231            105.29889

Explanation

  • This snippet merges two data frames - resort_hotel_2 and city_hotel_2 - which contain ADR data for resort and city hotels, respectively. The merge is done based on the country column. The resulting data frame provides a comparison of ADR for both hotel types across different countries.

  • I am going to make a new dataframe where:

    • I am rename the country column into iso_a3, in order to compare it later with the national geographic data that will use to create our map. The data source which I am going to use is Natural Earth.
    • Furthermore, I will round the prices to have a sorter number and a better visualization.
    library(dplyr)
    
    # Assuming 'hotel_type_2' is your data frame
    
    # Rename the 'country' column to 'iso_a3'
    hotel <- hotel_type_2 %>%
      rename(iso_a3 = country) %>%
      mutate(
        price_for_resort = round(price_for_resort, 2),
        price_for_city_hotel = round(price_for_city_hotel, 2)
      )
    
    # View the first few rows
    head(hotel)
    ##   iso_a3 price_for_resort price_for_city_hotel
    ## 1    AGO           121.23               110.94
    ## 2    ALB            71.08                81.01
    ## 3    ARE           204.44                80.00
    ## 4    ARG           115.46               113.20
    ## 5    ARM            52.35               111.66
    ## 6    AUS           114.72               116.76
library(sf)
## Warning: package 'sf' was built under R version 4.3.2
## Linking to GEOS 3.11.2, GDAL 3.7.2, PROJ 9.3.0; sf_use_s2() is TRUE
library(rnaturalearth)
## Warning: package 'rnaturalearth' was built under R version 4.3.2
## Support for Spatial objects (`sp`) will be deprecated in {rnaturalearth} and will be removed in a future release of the package. Please use `sf` objects with {rnaturalearth}. For example: `ne_download(returnclass = 'sf')`
# Load the world map data
world <- ne_countries(scale = "medium", returnclass = "sf")

# View the first few rows
head(world)
## Simple feature collection with 6 features and 63 fields
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -70.06611 ymin: -18.01973 xmax: 74.89131 ymax: 60.40581
## Geodetic CRS:  +proj=longlat +datum=WGS84 +no_defs +ellps=WGS84 +towgs84=0,0,0
##   scalerank      featurecla labelrank     sovereignt sov_a3 adm0_dif level
## 0         3 Admin-0 country         5    Netherlands    NL1        1     2
## 1         1 Admin-0 country         3    Afghanistan    AFG        0     2
## 2         1 Admin-0 country         3         Angola    AGO        0     2
## 3         1 Admin-0 country         6 United Kingdom    GB1        1     2
## 4         1 Admin-0 country         6        Albania    ALB        0     2
## 5         3 Admin-0 country         6        Finland    FI1        1     2
##                type       admin adm0_a3 geou_dif     geounit gu_a3 su_dif
## 0           Country       Aruba     ABW        0       Aruba   ABW      0
## 1 Sovereign country Afghanistan     AFG        0 Afghanistan   AFG      0
## 2 Sovereign country      Angola     AGO        0      Angola   AGO      0
## 3        Dependency    Anguilla     AIA        0    Anguilla   AIA      0
## 4 Sovereign country     Albania     ALB        0     Albania   ALB      0
## 5           Country       Aland     ALD        0       Aland   ALD      0
##       subunit su_a3 brk_diff        name     name_long brk_a3    brk_name
## 0       Aruba   ABW        0       Aruba         Aruba    ABW       Aruba
## 1 Afghanistan   AFG        0 Afghanistan   Afghanistan    AFG Afghanistan
## 2      Angola   AGO        0      Angola        Angola    AGO      Angola
## 3    Anguilla   AIA        0    Anguilla      Anguilla    AIA    Anguilla
## 4     Albania   ALB        0     Albania       Albania    ALB     Albania
## 5       Aland   ALD        0       Aland Aland Islands    ALD       Aland
##   brk_group abbrev postal                    formal_en formal_fr note_adm0
## 0      <NA>  Aruba     AW                        Aruba      <NA>     Neth.
## 1      <NA>   Afg.     AF Islamic State of Afghanistan      <NA>      <NA>
## 2      <NA>   Ang.     AO  People's Republic of Angola      <NA>      <NA>
## 3      <NA>   Ang.     AI                         <NA>      <NA>      U.K.
## 4      <NA>   Alb.     AL          Republic of Albania      <NA>      <NA>
## 5      <NA>  Aland     AI                Åland Islands      <NA>      Fin.
##   note_brk   name_sort name_alt mapcolor7 mapcolor8 mapcolor9 mapcolor13
## 0     <NA>       Aruba     <NA>         4         2         2          9
## 1     <NA> Afghanistan     <NA>         5         6         8          7
## 2     <NA>      Angola     <NA>         3         2         6          1
## 3     <NA>    Anguilla     <NA>         6         6         6          3
## 4     <NA>     Albania     <NA>         1         4         1          6
## 5     <NA>       Aland     <NA>         4         1         4          6
##    pop_est gdp_md_est pop_year lastcensus gdp_year                    economy
## 0   103065     2258.0       NA       2010       NA       6. Developing region
## 1 28400000    22270.0       NA       1979       NA  7. Least developed region
## 2 12799293   110300.0       NA       1970       NA  7. Least developed region
## 3    14436      108.9       NA         NA       NA       6. Developing region
## 4  3639453    21810.0       NA       2001       NA       6. Developing region
## 5    27153     1563.0       NA         NA       NA 2. Developed region: nonG7
##                income_grp wikipedia fips_10 iso_a2 iso_a3 iso_n3 un_a3 wb_a2
## 0 2. High income: nonOECD        NA    <NA>     AW    ABW    533   533    AW
## 1           5. Low income        NA    <NA>     AF    AFG    004   004    AF
## 2  3. Upper middle income        NA    <NA>     AO    AGO    024   024    AO
## 3  3. Upper middle income        NA    <NA>     AI    AIA    660   660  <NA>
## 4  4. Lower middle income        NA    <NA>     AL    ALB    008   008    AL
## 5    1. High income: OECD        NA    <NA>     AX    ALA    248   248  <NA>
##   wb_a3 woe_id adm0_a3_is adm0_a3_us adm0_a3_un adm0_a3_wb     continent
## 0   ABW     NA        ABW        ABW         NA         NA North America
## 1   AFG     NA        AFG        AFG         NA         NA          Asia
## 2   AGO     NA        AGO        AGO         NA         NA        Africa
## 3  <NA>     NA        AIA        AIA         NA         NA North America
## 4   ALB     NA        ALB        ALB         NA         NA        Europe
## 5  <NA>     NA        ALA        ALD         NA         NA        Europe
##   region_un       subregion                 region_wb name_len long_len
## 0  Americas       Caribbean Latin America & Caribbean        5        5
## 1      Asia   Southern Asia                South Asia       11       11
## 2    Africa   Middle Africa        Sub-Saharan Africa        6        6
## 3  Americas       Caribbean Latin America & Caribbean        8        8
## 4    Europe Southern Europe     Europe & Central Asia        7        7
## 5    Europe Northern Europe     Europe & Central Asia        5       13
##   abbrev_len tiny homepart                       geometry
## 0          5    4       NA MULTIPOLYGON (((-69.89912 1...
## 1          4   NA        1 MULTIPOLYGON (((74.89131 37...
## 2          4   NA        1 MULTIPOLYGON (((14.19082 -5...
## 3          4   NA       NA MULTIPOLYGON (((-63.00122 1...
## 4          4   NA        1 MULTIPOLYGON (((20.06396 42...
## 5          5    5       NA MULTIPOLYGON (((20.61133 60...

Explanation

  • The initial block prepares the ADR data for geographical mapping. It renames the country column to iso_a3, which is a standard country code format used in mapping, and rounds off the ADR values for better readability.
    • The second block loads world map data using the rnaturalearth package, which provides country boundaries for the map. The sf package is used to handle spatial data. These steps are part of the process to create a world map visualization that will display ADR data by country.
library(sf)

# Assuming 'world' is a GeoDataFrame and 'hotel' is your DataFrame

# Merge the data frames based on the 'iso_a3' column
# Assuming 'world' is a GeoDataFrame and 'hotel' is your DataFrame

# Merge the data frames based on the 'iso_a3' column
merged_data <- merge(world, hotel, by.x = 'iso_a3', by.y = 'iso_a3', all.y = TRUE)

# Check information about the merged data frame
print(merged_data)
## Simple feature collection with 104 features and 65 fields (with 2 geometries empty)
## Geometry type: GEOMETRY
## Dimension:     XY
## Bounding box:  xmin: -180 ymin: -55.8917 xmax: 180 ymax: 81.8542
## Geodetic CRS:  +proj=longlat +datum=WGS84 +no_defs +ellps=WGS84 +towgs84=0,0,0
## First 10 features:
##    iso_a3 scalerank      featurecla labelrank           sovereignt sov_a3
## 1     AGO         1 Admin-0 country         3               Angola    AGO
## 2     ALB         1 Admin-0 country         6              Albania    ALB
## 3     ARE         1 Admin-0 country         4 United Arab Emirates    ARE
## 4     ARG         1 Admin-0 country         2            Argentina    ARG
## 5     ARM         1 Admin-0 country         6              Armenia    ARM
## 6     AUS         1 Admin-0 country         2            Australia    AU1
## 7     AUT         1 Admin-0 country         4              Austria    AUT
## 8     AZE         1 Admin-0 country         5           Azerbaijan    AZE
## 9     BEL         1 Admin-0 country         2              Belgium    BEL
## 10    BGR         1 Admin-0 country         4             Bulgaria    BGR
##    adm0_dif level              type                admin adm0_a3 geou_dif
## 1         0     2 Sovereign country               Angola     AGO        0
## 2         0     2 Sovereign country              Albania     ALB        0
## 3         0     2 Sovereign country United Arab Emirates     ARE        0
## 4         0     2 Sovereign country            Argentina     ARG        0
## 5         0     2 Sovereign country              Armenia     ARM        0
## 6         1     2           Country            Australia     AUS        0
## 7         0     2 Sovereign country              Austria     AUT        0
## 8         0     2 Sovereign country           Azerbaijan     AZE        0
## 9         0     2 Sovereign country              Belgium     BEL        0
## 10        0     2 Sovereign country             Bulgaria     BGR        0
##                 geounit gu_a3 su_dif              subunit su_a3 brk_diff
## 1                Angola   AGO      0               Angola   AGO        0
## 2               Albania   ALB      0              Albania   ALB        0
## 3  United Arab Emirates   ARE      0 United Arab Emirates   ARE        0
## 4             Argentina   ARG      0            Argentina   ARG        0
## 5               Armenia   ARM      0              Armenia   ARM        0
## 6             Australia   AUS      0            Australia   AUS        0
## 7               Austria   AUT      0              Austria   AUT        0
## 8            Azerbaijan   AZE      0           Azerbaijan   AZE        0
## 9               Belgium   BEL      0              Belgium   BEL        0
## 10             Bulgaria   BGR      0             Bulgaria   BGR        0
##                    name            name_long brk_a3             brk_name
## 1                Angola               Angola    AGO               Angola
## 2               Albania              Albania    ALB              Albania
## 3  United Arab Emirates United Arab Emirates    ARE United Arab Emirates
## 4             Argentina            Argentina    ARG            Argentina
## 5               Armenia              Armenia    ARM              Armenia
## 6             Australia            Australia    AUS            Australia
## 7               Austria              Austria    AUT              Austria
## 8            Azerbaijan           Azerbaijan    AZE           Azerbaijan
## 9               Belgium              Belgium    BEL              Belgium
## 10             Bulgaria             Bulgaria    BGR             Bulgaria
##    brk_group abbrev postal                   formal_en formal_fr note_adm0
## 1       <NA>   Ang.     AO People's Republic of Angola      <NA>      <NA>
## 2       <NA>   Alb.     AL         Republic of Albania      <NA>      <NA>
## 3       <NA> U.A.E.     AE        United Arab Emirates      <NA>      <NA>
## 4       <NA>   Arg.     AR          Argentine Republic      <NA>      <NA>
## 5       <NA>   Arm.    ARM         Republic of Armenia      <NA>      <NA>
## 6       <NA>   Auz.     AU   Commonwealth of Australia      <NA>      <NA>
## 7       <NA>  Aust.      A         Republic of Austria      <NA>      <NA>
## 8       <NA>   Aze.     AZ      Republic of Azerbaijan      <NA>      <NA>
## 9       <NA>  Belg.      B          Kingdom of Belgium      <NA>      <NA>
## 10      <NA>  Bulg.     BG        Republic of Bulgaria      <NA>      <NA>
##    note_brk            name_sort name_alt mapcolor7 mapcolor8 mapcolor9
## 1      <NA>               Angola     <NA>         3         2         6
## 2      <NA>              Albania     <NA>         1         4         1
## 3      <NA> United Arab Emirates     <NA>         2         1         3
## 4      <NA>            Argentina     <NA>         3         1         3
## 5      <NA>              Armenia     <NA>         3         1         2
## 6      <NA>            Australia     <NA>         1         2         2
## 7      <NA>              Austria     <NA>         3         1         3
## 8      <NA>           Azerbaijan     <NA>         1         6         5
## 9      <NA>              Belgium     <NA>         3         2         1
## 10     <NA>             Bulgaria     <NA>         4         5         1
##    mapcolor13  pop_est gdp_md_est pop_year lastcensus gdp_year
## 1           1 12799293     110300       NA       1970       NA
## 2           6  3639453      21810       NA       2001       NA
## 3           3  4798491     184300       NA       2010       NA
## 4          13 40913584     573900       NA       2010       NA
## 5          10  2967004      18770       NA       2001       NA
## 6           7 21262641     800200       NA       2006       NA
## 7           4  8210281     329500       NA       2011       NA
## 8           8  8238672      77610       NA       2009       NA
## 9           8 10414336     389300       NA       2011       NA
## 10          8  7204687      93750       NA       2011       NA
##                       economy              income_grp wikipedia fips_10 iso_a2
## 1   7. Least developed region  3. Upper middle income        NA    <NA>     AO
## 2        6. Developing region  4. Lower middle income        NA    <NA>     AL
## 3        6. Developing region 2. High income: nonOECD        NA    <NA>     AE
## 4     5. Emerging region: G20  3. Upper middle income        NA    <NA>     AR
## 5        6. Developing region  4. Lower middle income        NA    <NA>     AM
## 6  2. Developed region: nonG7    1. High income: OECD        NA    <NA>     AU
## 7  2. Developed region: nonG7    1. High income: OECD        NA    <NA>     AT
## 8        6. Developing region  3. Upper middle income        NA    <NA>     AZ
## 9  2. Developed region: nonG7    1. High income: OECD        NA    <NA>     BE
## 10 2. Developed region: nonG7  3. Upper middle income        NA    <NA>     BG
##    iso_n3 un_a3 wb_a2 wb_a3 woe_id adm0_a3_is adm0_a3_us adm0_a3_un adm0_a3_wb
## 1     024   024    AO   AGO     NA        AGO        AGO         NA         NA
## 2     008   008    AL   ALB     NA        ALB        ALB         NA         NA
## 3     784   784    AE   ARE     NA        ARE        ARE         NA         NA
## 4     032   032    AR   ARG     NA        ARG        ARG         NA         NA
## 5     051   051    AM   ARM     NA        ARM        ARM         NA         NA
## 6     036   036    AU   AUS     NA        AUS        AUS         NA         NA
## 7     040   040    AT   AUT     NA        AUT        AUT         NA         NA
## 8     031   031    AZ   AZE     NA        AZE        AZE         NA         NA
## 9     056   056    BE   BEL     NA        BEL        BEL         NA         NA
## 10    100   100    BG   BGR     NA        BGR        BGR         NA         NA
##        continent region_un                 subregion                  region_wb
## 1         Africa    Africa             Middle Africa         Sub-Saharan Africa
## 2         Europe    Europe           Southern Europe      Europe & Central Asia
## 3           Asia      Asia              Western Asia Middle East & North Africa
## 4  South America  Americas             South America  Latin America & Caribbean
## 5           Asia      Asia              Western Asia      Europe & Central Asia
## 6        Oceania   Oceania Australia and New Zealand        East Asia & Pacific
## 7         Europe    Europe            Western Europe      Europe & Central Asia
## 8           Asia      Asia              Western Asia      Europe & Central Asia
## 9         Europe    Europe            Western Europe      Europe & Central Asia
## 10        Europe    Europe            Eastern Europe      Europe & Central Asia
##    name_len long_len abbrev_len tiny homepart price_for_resort
## 1         6        6          4   NA        1           121.23
## 2         7        7          4   NA        1            71.08
## 3        20       20          6   NA        1           204.44
## 4         9        9          4   NA        1           115.46
## 5         7        7          4   NA        1            52.35
## 6         9        9          4   NA        1           114.72
## 7         7        7          5   NA        1            81.80
## 8        10       10          4   NA        1           187.80
## 9         7        7          5   NA        1            91.43
## 10        8        8          5   NA        1            84.70
##    price_for_city_hotel                       geometry
## 1                110.94 MULTIPOLYGON (((14.19082 -5...
## 2                 81.01 MULTIPOLYGON (((20.06396 42...
## 3                 80.00 MULTIPOLYGON (((53.92783 24...
## 4                113.20 MULTIPOLYGON (((-64.54917 -...
## 5                111.66 MULTIPOLYGON (((45.55234 40...
## 6                116.76 MULTIPOLYGON (((158.8788 -5...
## 7                107.29 MULTIPOLYGON (((16.95312 48...
## 8                100.36 MULTIPOLYGON (((45.15283 39...
## 9                116.75 MULTIPOLYGON (((4.816016 51...
## 10               111.49 MULTIPOLYGON (((28.58535 43...

Explanation

  • This code block involves merging the spatial data of the world (from world, a GeoDataFrame) with the hotel data (from hotel, another DataFrame). The merging is based on the iso_a3 column, which is a common identifier in both data frames, representing country codes. The all.y = TRUE parameter ensures that all entries from the hotel DataFrame are included in the merged result, even if there is no matching iso_a3 code in the world DataFrame. After merging, the print function is used to display the contents of the newly created merged_data DataFrame. This merged data is essential for creating a map visualization that displays hotel data geographically.

  • Now our dataset contains null values and columns that we do not want in our visualization. So let’s get rid of it.

Cleaning the Merged Data for Visualization

# Assuming 'merged_data' is your GeoDataFrame

# Drop columns by name (columns 1 and 5 in this example)
merged_data <- merged_data[, -c(1, 5)]

# Remove rows with missing values
merged_data <- na.omit(merged_data)

# Check information about the modified data frame
print(merged_data)
## Simple feature collection with 0 features and 63 fields
## Bounding box:  xmin: NA ymin: NA xmax: NA ymax: NA
## Geodetic CRS:  +proj=longlat +datum=WGS84 +no_defs +ellps=WGS84 +towgs84=0,0,0
##  [1] scalerank            featurecla           labelrank           
##  [4] sov_a3               adm0_dif             level               
##  [7] type                 admin                adm0_a3             
## [10] geou_dif             geounit              gu_a3               
## [13] su_dif               subunit              su_a3               
## [16] brk_diff             name                 name_long           
## [19] brk_a3               brk_name             brk_group           
## [22] abbrev               postal               formal_en           
## [25] formal_fr            note_adm0            note_brk            
## [28] name_sort            name_alt             mapcolor7           
## [31] mapcolor8            mapcolor9            mapcolor13          
## [34] pop_est              gdp_md_est           pop_year            
## [37] lastcensus           gdp_year             economy             
## [40] income_grp           wikipedia            fips_10             
## [43] iso_a2               iso_n3               un_a3               
## [46] wb_a2                wb_a3                woe_id              
## [49] adm0_a3_is           adm0_a3_us           adm0_a3_un          
## [52] adm0_a3_wb           continent            region_un           
## [55] subregion            region_wb            name_len            
## [58] long_len             abbrev_len           tiny                
## [61] homepart             price_for_resort     price_for_city_hotel
## [64] geometry            
## <0 rows> (or 0-length row.names)

Explanation

  • The first line of this code removes specific columns from the merged_data DataFrame (in this example, columns 1 and 5) that are not required for the visualization. This step is crucial for focusing the data on relevant variables. The second line removes any rows with missing values (NAs) to clean the data further, ensuring that the final visualization is accurate and informative. After these cleaning steps, the print function is again used to display the modified DataFrame. This cleaned and streamlined data is now ready for creating a geographical visualization, such as plotting ADR or other hotel metrics on a world map.

library(dplyr)
library(ggplot2)
library(summarytools)

Load Dataset

head(hotel_data, 10)
##           hotel is_canceled lead_time arrival_date_year arrival_date_month
## 1  Resort Hotel           0       342              2015               July
## 2  Resort Hotel           0       737              2015               July
## 3  Resort Hotel           0         7              2015               July
## 4  Resort Hotel           0        13              2015               July
## 5  Resort Hotel           0        14              2015               July
## 6  Resort Hotel           0        14              2015               July
## 7  Resort Hotel           0         0              2015               July
## 8  Resort Hotel           0         9              2015               July
## 9  Resort Hotel           1        85              2015               July
## 10 Resort Hotel           1        75              2015               July
##    arrival_date_day_of_month stays_in_weekend_nights stays_in_week_nights
## 1                          1                       0                    0
## 2                          1                       0                    0
## 3                          1                       0                    1
## 4                          1                       0                    1
## 5                          1                       0                    2
## 6                          1                       0                    2
## 7                          1                       0                    2
## 8                          1                       0                    2
## 9                          1                       0                    3
## 10                         1                       0                    3
##    adults children babies meal country market_segment distribution_channel
## 1       2        0      0   BB     PRT         Direct               Direct
## 2       2        0      0   BB     PRT         Direct               Direct
## 3       1        0      0   BB     GBR         Direct               Direct
## 4       1        0      0   BB     GBR      Corporate            Corporate
## 5       2        0      0   BB     GBR      Online TA                TA/TO
## 6       2        0      0   BB     GBR      Online TA                TA/TO
## 7       2        0      0   BB     PRT         Direct               Direct
## 8       2        0      0   FB     PRT         Direct               Direct
## 9       2        0      0   BB     PRT      Online TA                TA/TO
## 10      2        0      0   HB     PRT  Offline TA/TO                TA/TO
##    is_repeated_guest previous_cancellations previous_bookings_not_canceled
## 1                  0                      0                              0
## 2                  0                      0                              0
## 3                  0                      0                              0
## 4                  0                      0                              0
## 5                  0                      0                              0
## 6                  0                      0                              0
## 7                  0                      0                              0
## 8                  0                      0                              0
## 9                  0                      0                              0
## 10                 0                      0                              0
##    reserved_room_type assigned_room_type booking_changes deposit_type agent
## 1                   C                  C               3   No Deposit    14
## 2                   C                  C               4   No Deposit    14
## 3                   A                  C               0   No Deposit    14
## 4                   A                  A               0   No Deposit   304
## 5                   A                  A               0   No Deposit   240
## 6                   A                  A               0   No Deposit   240
## 7                   C                  C               0   No Deposit    14
## 8                   C                  C               0   No Deposit   303
## 9                   A                  A               0   No Deposit   240
## 10                  D                  D               0   No Deposit    15
##    days_in_waiting_list customer_type   adr required_car_parking_spaces
## 1                     0     Transient   0.0                           0
## 2                     0     Transient   0.0                           0
## 3                     0     Transient  75.0                           0
## 4                     0     Transient  75.0                           0
## 5                     0     Transient  98.0                           0
## 6                     0     Transient  98.0                           0
## 7                     0     Transient 107.0                           0
## 8                     0     Transient 103.0                           0
## 9                     0     Transient  82.0                           0
## 10                    0     Transient 105.5                           0
##    total_of_special_requests reservation_status reservation_status_date
## 1                          0          Check-Out              2015-07-01
## 2                          0          Check-Out              2015-07-01
## 3                          0          Check-Out              2015-07-02
## 4                          0          Check-Out              2015-07-02
## 5                          1          Check-Out              2015-07-03
## 6                          1          Check-Out              2015-07-03
## 7                          0          Check-Out              2015-07-03
## 8                          1          Check-Out              2015-07-03
## 9                          1           Canceled              2015-05-06
## 10                         0           Canceled              2015-04-22

Hypothesis 1: Lead Time Analysis

Null Hypothesis (H0):

  • The average lead time for canceled bookings is equal to the average lead time for non-canceled bookings.
  • Rationale: We are testing whether there is a significant difference in lead time between canceled and non-canceled bookings. This is important as it can help us understand if lead time plays a role in booking cancellations.

Alternative Hypothesis (H1):

  • The average lead time for canceled bookings is not equal to the average lead time for non-canceled bookings.

  • Alpha Level, Power Level, and Minimum Effect Size:

    • Alpha level (α): 0.05
      • Common significance level in hypothesis testing.
    • Power level: 0.80
      • Ensures a high probability of correctly rejecting the null hypothesis if it is false.
  • Minimum effect size: 10 days (for example)

    • Represents a meaningful difference in lead time between the two groups.
  • Rationale: We chose these values to maintain a balance between Type I and Type II errors and to consider practical significance.

  • Assumptions and Preprocessing:

    • No specific assumptions or preprocessing mentioned.

Performing T-Test

# Perform a t-test to compare the means of lead time for canceled and non-canceled bookings
lead_time_canceled <- hotel_data$lead_time[hotel_data$is_canceled == 1]
lead_time_non_canceled <- hotel_data$lead_time[hotel_data$is_canceled == 0]

t_test_result <- t.test(lead_time_canceled, lead_time_non_canceled)

# Display the t-test result
t_test_result
## 
##  Welch Two Sample t-test
## 
## data:  lead_time_canceled and lead_time_non_canceled
## t = 98.936, df = 74953, p-value < 2.2e-16
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  63.52042 66.08805
## sample estimates:
## mean of x mean of y 
## 144.88626  80.08203

Neyman-Pearson Test

# Define alpha level
alpha <- 0.05

# Calculate critical value for the Neyman-Pearson test
critical_value <- qnorm(1 - alpha) 

# Calculate the test statistic
test_statistic <- (mean(lead_time_canceled) - mean(lead_time_non_canceled)) / 
                  sqrt((var(lead_time_canceled) / length(lead_time_canceled)) + 
                       (var(lead_time_non_canceled) / length(lead_time_non_canceled)))

# Calculate the rejection boundary
rejection_boundary <- critical_value * sqrt((var(lead_time_canceled) / length(lead_time_canceled)) + 
                                            (var(lead_time_non_canceled) / length(lead_time_non_canceled)))

# Calculate power
power_of_test <- 1 - pnorm(test_statistic - rejection_boundary)

# Display the results
cat("Test Statistic:", test_statistic, "\n")
## Test Statistic: 98.93642
cat("Rejection Boundary:", rejection_boundary, "\n")
## Rejection Boundary: 1.077394
cat("Power of Test:", power_of_test, "\n")
## Power of Test: 0

Visualization: Comparing Lead Time for Canceled and Non-Canceled Bookings

# Visualization 1: Bar chart comparing lead time for canceled and non-canceled bookings
lead_time_summary <- hotel_data %>%
  group_by(is_canceled) %>%
  summarize(mean_lead_time = mean(lead_time), sd_lead_time = sd(lead_time))

ggplot(lead_time_summary, aes(x = factor(is_canceled), y = mean_lead_time)) +
  geom_bar(stat = "identity", fill = "blue", alpha = 0.7) +
  geom_errorbar(aes(ymin = mean_lead_time - sd_lead_time, ymax = mean_lead_time + sd_lead_time),
                width = 0.2, position = position_dodge(0.9)) +
  labs(x = "Booking Status", y = "Mean Lead Time") +
  theme_minimal()

Hypothesis 2: ADR Analysis by Market Segment

ANOVA Test for ADR by Market Segment

# Perform Fisher's style test for ADR Analysis by Market Segment
adr_anova_result <- aov(adr ~ market_segment, data = hotel_data)

# Extracting the p-value
p_value <- summary(adr_anova_result)[[1]][["Pr(>F)"]]

# Interpret the p-value
if (any(p_value < alpha)) {
  cat("At least one market segment has a p-value less than the alpha level of", alpha, 
      "which indicates that at least one market segment has a different average daily rate (ADR).\n")
} else {
  cat("All market segments have p-values greater than the alpha level of", alpha, 
      "which suggests that there is not enough evidence to conclude a significant difference in ADR among market segments.\n")
}
## At least one market segment has a p-value less than the alpha level of 0.05 which indicates that at least one market segment has a different average daily rate (ADR).

Visualizations

Box Plot of ADR by Market Segment

# Visualization 2: Box plot of ADR by Market Segment
library(ggplot2)

ggplot(hotel_data, aes(x = market_segment, y = adr)) +
  geom_boxplot(fill = "lightblue", alpha = 0.7) +
  labs(x = "Market Segment", y = "ADR") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1))

- Explanation: - The box plot above illustrates the distribution of ADR (Average Daily Rate) across different market segments. Each box represents a market segment, and the notches in the boxes show the confidence intervals around the median ADR. The box plot helps visualize the spread and distribution of ADR values among market segments. It is evident that some market segments have notably different ADR distributions, while others overlap, indicating potential differences in ADR among market segments.

Fisher’s Exact Test for ADR and Market Segment Association

# Perform Fisher's exact test for ADR Analysis by Market Segment
alpha <- 0.05
specified_mean <- 0

# Create a contingency table
contingency_table <- table(hotel_data$market_segment, hotel_data$adr > specified_mean)

# Performing the Fisher's exact test
fisher_test_result <- fisher.test(contingency_table, simulate.p.value = TRUE)

# Extract the p-value
p_value_fisher <- fisher_test_result$p.value

# Interpret the p-value
if (p_value_fisher < alpha) {
  cat("The Fisher's exact test indicates a significant association between ADR and Market Segment (p-value < 0.05).\n")
} else {
  cat("The Fisher's exact test does not provide enough evidence to conclude a significant association between ADR and Market Segment (p-value >= 0.05).\n")
}
## The Fisher's exact test indicates a significant association between ADR and Market Segment (p-value < 0.05).
# Display the results of the Fisher's exact test
fisher_test_result
## 
##  Fisher's Exact Test for Count Data with simulated p-value (based on
##  2000 replicates)
## 
## data:  contingency_table
## p-value = 0.0004998
## alternative hypothesis: two.sided

Neyman-Pearson Test for Lead Time Analysis and ADR Visualization

Neyman-Pearson Test for Lead Time

# Calculate sample sizes
n_canceled <- length(lead_time_canceled)
n_non_canceled <- length(lead_time_non_canceled)

# Check if sample sizes are large enough
if (n_canceled >= 30 && n_non_canceled >= 30) {
  cat("Sample sizes are large enough for the Neyman-Pearson test.\n")
  
  # Perform Neyman-Pearson test (assuming specified_mean = 0)
  alpha <- 0.05
  specified_mean <- 0
  test_statistic <- (mean(lead_time_canceled) - specified_mean) / (sd(lead_time_canceled) / sqrt(n_canceled))
  rejection_boundary <- qnorm(1 - alpha)
  power_of_test <- 1 - pnorm(test_statistic - rejection_boundary)
  
  # Interpret the results
  if (abs(test_statistic) > rejection_boundary) {
    cat("The test statistic falls within the rejection region. Therefore, we reject the null hypothesis at the", 
        alpha, "significance level.\n")
    cat("The power of the test is", power_of_test, "indicating a high probability of correctly rejecting the null hypothesis when it is false.\n")
  } else {
    cat("The test statistic does not fall within the rejection region. Therefore, we fail to reject the null hypothesis at the", 
        alpha, "significance level.\n")
  }
} else {
  cat("Sample sizes are not large enough for the Neyman-Pearson test. Consider increasing the sample sizes for more reliable results.\n")
}
## Sample sizes are large enough for the Neyman-Pearson test.
## The test statistic falls within the rejection region. Therefore, we reject the null hypothesis at the 0.05 significance level.
## The power of the test is 0 indicating a high probability of correctly rejecting the null hypothesis when it is false.
  • Explanation
    • This code performs the Neyman-Pearson test to compare the lead times of canceled and non-canceled bookings. It first checks if the sample sizes for both groups are sufficient (typically, a sample size of 30 or more is considered large enough for the central limit theorem to apply). The test statistic is calculated based on the lead time data, and the results indicate whether to reject or fail to reject the null hypothesis. The test’s power is also calculated, providing insight into the test’s ability to detect a true effect.
# Visualization 3: Assuming 'market_segment' is a categorical variable and 'adr' is a numeric variable
ggplot(hotel_data, aes(x = market_segment, y = adr, fill = market_segment)) +
  geom_bar(stat = "identity") +
  labs(title = "Grouped Bar Plot of ADR by Market Segment",
       x = "Market Segment",
       y = "ADR") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1))

- Explanation - This visualization presents a grouped bar plot showing the Average Daily Rate (ADR) across different market segments. Each bar represents a market segment, and the height of the bar corresponds to the ADR for that segment. The plot provides a clear visual comparison of the ADR across different segments, highlighting variations and patterns in pricing strategies or guest preferences. The bars are filled with different colors for easier differentiation, and the x-axis labels are angled for better readability.

Statistical Analysis and Visualization: Meal Type vs. Booking Cancellation and ADR by Market Segment

Chi-Squared Test for Association Between Meal Type and Cancellation

# Create a contingency table of the `meal` and `is_canceled` columns
contingency_table <- table(hotel_data$meal, hotel_data$is_canceled)

# Perform the chi-squared test
chi_square_result <- chisq.test(contingency_table)

# Checking if the chi-square test was successful
if (chi_square_result$p.value > 0) {
  # Extract observed and expected frequencies
  observed_freq <- chi_square_result$observed
  expected_freq <- chi_square_result$expected

  # Calculating the likelihood ratio test statistic
  likelihood_ratio_statistic <- 2 * sum(observed_freq * log(observed_freq / expected_freq))

  # Choosing a significance level (alpha)
  alpha <- 0.05

  # Determining the critical value from the chi-square distribution
  critical_value <- qchisq(1 - alpha, df = chi_square_result$parameter)

  # Comparing the test statistic to the critical value
  if (!is.na(likelihood_ratio_statistic) && !is.na(critical_value)) {
    if (likelihood_ratio_statistic > critical_value) {
      cat("Reject the null hypothesis at the", alpha, "significance level.\n")
    } else {
      cat("Fail to reject the null hypothesis at the", alpha, "significance level.\n")
    }
  } else {
    cat("Error: Unable to perform the likelihood ratio test.\n")
  }

  # Print the result of the chi-square test
  print(chi_square_result)
} else {
  cat("Error: Chi-square test unsuccessful. Check your data.\n")
}
## Reject the null hypothesis at the 0.05 significance level.
## 
##  Pearson's Chi-squared test
## 
## data:  contingency_table
## X-squared = 305.02, df = 4, p-value < 2.2e-16
  • Explanation
    • This code performs a chi-squared test to determine if there is a significant association between meal type and booking cancellation status. If the p-value from the test is below the alpha level, the null hypothesis of independence is rejected, indicating a significant relationship between meal type and cancellation.

Fisher’s Exact Test for Meal Type and Cancellation

# Create a contingency table of the `meal` and `is_canceled` columns
contingency_table <- table(hotel_data$meal, hotel_data$is_canceled)

# Perform Fisher's exact test
fisher_test_result <- fisher.test(contingency_table, simulate.p.value = TRUE)

# Extract the p-value
p_value_fisher <- fisher_test_result$p.value

# Define the significance level (alpha)
alpha <- 0.05

# Check if the p-value is less than alpha
if (p_value_fisher < alpha) {
  cat("Reject the null hypothesis at the", alpha, "significance level.\n")
} else {
  cat("Fail to reject the null hypothesis at the", alpha, "significance level.\n")
}
## Reject the null hypothesis at the 0.05 significance level.
# Print the result of Fisher's exact test
print(fisher_test_result)
## 
##  Fisher's Exact Test for Count Data with simulated p-value (based on
##  2000 replicates)
## 
## data:  contingency_table
## p-value = 0.0004998
## alternative hypothesis: two.sided
  • Explanation: Fisher’s exact test is used as an alternative to the chi-squared test, especially when the data set is small or the assumptions for the chi-squared test are not met. It checks for a significant association between meal type and booking cancellation.

Visualization: Meal Type vs. Booking Status

# Create a contingency table of the `meal` and `is_canceled` columns
contingency_table <- table(hotel_data$meal, hotel_data$is_canceled)

# Convert the contingency table to a data frame for visualization
contingency_df <- as.data.frame.matrix(contingency_table)

# Rename the columns for clarity
colnames(contingency_df) <- c("Not Canceled", "Canceled")

# Create a stacked bar chart
ggplot(contingency_df, aes(x = row.names(contingency_df), fill = row.names(contingency_df))) +
  geom_bar(position = "stack") +
  labs(x = "Meal Type", y = "Count", fill = "Booking Status") +
  ggtitle("Stacked Bar Chart of Meal Type vs. Booking Status") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1))

- Explanation: This stacked bar chart visualizes the relationship between meal types and booking statuses (canceled vs. not canceled). Each bar represents a meal type, and the segments within each bar show the proportion of bookings that were canceled or not canceled. This visualization helps in understanding the impact of meal type on booking cancellation.

# Visualization 4: Histograms of Lead Time for Canceled and Non-Canceled Bookings
library(ggplot2)

ggplot(hotel_data, aes(x = lead_time, fill = factor(is_canceled))) +
  geom_histogram(binwidth = 10, alpha = 0.7, position = "identity") +
  labs(x = "Lead Time", y = "Count") +
  facet_wrap(~ is_canceled, ncol = 2) +
  theme_minimal()

# Perform Fisher's style test for ADR Analysis by Market Segment
adr_anova_result <- aov(adr ~ market_segment, data = hotel_data)

# Extracting the p-value
p_value <- summary(adr_anova_result)[[1]][["Pr(>F)"]]

# Interpret the p-value
if (any(p_value < alpha)) {
  cat("At least one market segment has a p-value less than the alpha level of", alpha, 
      "which indicates that at least one market segment has a different average daily rate (ADR).\n")
} else {
  cat("All market segments have p-values greater than the alpha level of", alpha, 
      "which suggests that there is not enough evidence to conclude a significant difference in ADR among market segments.\n")
}
## At least one market segment has a p-value less than the alpha level of 0.05 which indicates that at least one market segment has a different average daily rate (ADR).
lead_time_summary <- hotel_data %>%
  group_by(is_canceled) %>%
  summarize(mean_lead_time = mean(lead_time), sd_lead_time = sd(lead_time))

ggplot(lead_time_summary, aes(x = factor(is_canceled), y = mean_lead_time)) +
  geom_bar(stat = "identity", fill = "blue", alpha = 0.7) +
  geom_errorbar(aes(ymin = mean_lead_time - sd_lead_time, ymax = mean_lead_time + sd_lead_time),
                width = 0.2, position = position_dodge(0.9)) +
  labs(x = "Booking Status", y = "Mean Lead Time") +
  theme_minimal()

print( "Explanation: This visualization consists of two histograms side by side, one for canceled bookings and another for non-canceled bookings. It helps illustrate the distribution of lead time for both groups, allowing you to compare their characteristics.")
## [1] "Explanation: This visualization consists of two histograms side by side, one for canceled bookings and another for non-canceled bookings. It helps illustrate the distribution of lead time for both groups, allowing you to compare their characteristics."
# Visualization 5: Box plot of ADR by Market Segment 

ggplot(hotel_data, aes(x = market_segment, y = adr, fill = market_segment)) +
  geom_boxplot(alpha = 0.7, notch = TRUE) +
  labs(title = "Box Plot of ADR by Market Segment",
       x = "Market Segment",
       y = "ADR") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1))
## Notch went outside hinges
## ℹ Do you want `notch = FALSE`?
## Notch went outside hinges
## ℹ Do you want `notch = FALSE`?

# Assuming 'market_segment' is a categorical variable and 'adr' is a numeric variable
ggplot(hotel_data, aes(x = market_segment, y = adr, fill = market_segment)) +
  geom_bar(stat = "identity") +
  labs(title = "Grouped Bar Plot of ADR by Market Segment",
       x = "Market Segment",
       y = "ADR") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1))

print("Explanation: This visualization is an improved version of the box plot for ADR by market segment. It includes notches to indicate the confidence intervals around the median. It helps visualize the spread and distribution of ADR values across different market segments, making it easier to compare them.

")
## [1] "Explanation: This visualization is an improved version of the box plot for ADR by market segment. It includes notches to indicate the confidence intervals around the median. It helps visualize the spread and distribution of ADR values across different market segments, making it easier to compare them.\n\n"

Exploratory Data Analysis (EDA)

# Summary of each column
summary(hotel_data)
##     hotel            is_canceled       lead_time     arrival_date_year 
##  Length:119210      Min.   :0.0000   Min.   :  0.0   Length:119210     
##  Class :character   1st Qu.:0.0000   1st Qu.: 18.0   Class :character  
##  Mode  :character   Median :0.0000   Median : 69.0   Mode  :character  
##                     Mean   :0.3708   Mean   :104.1                     
##                     3rd Qu.:1.0000   3rd Qu.:161.0                     
##                     Max.   :1.0000   Max.   :737.0                     
##  arrival_date_month arrival_date_day_of_month stays_in_weekend_nights
##  Length:119210      Min.   : 1.0              Min.   : 0.0000        
##  Class :character   1st Qu.: 8.0              1st Qu.: 0.0000        
##  Mode  :character   Median :16.0              Median : 1.0000        
##                     Mean   :15.8              Mean   : 0.9271        
##                     3rd Qu.:23.0              3rd Qu.: 2.0000        
##                     Max.   :31.0              Max.   :19.0000        
##  stays_in_week_nights     adults          children          babies         
##  Min.   : 0.000       Min.   : 0.000   Min.   : 0.000   Min.   : 0.000000  
##  1st Qu.: 1.000       1st Qu.: 2.000   1st Qu.: 0.000   1st Qu.: 0.000000  
##  Median : 2.000       Median : 2.000   Median : 0.000   Median : 0.000000  
##  Mean   : 2.499       Mean   : 1.859   Mean   : 0.104   Mean   : 0.007961  
##  3rd Qu.: 3.000       3rd Qu.: 2.000   3rd Qu.: 0.000   3rd Qu.: 0.000000  
##  Max.   :50.000       Max.   :55.000   Max.   :10.000   Max.   :10.000000  
##      meal             country          market_segment     distribution_channel
##  Length:119210      Length:119210      Length:119210      Length:119210       
##  Class :character   Class :character   Class :character   Class :character    
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character    
##                                                                               
##                                                                               
##                                                                               
##  is_repeated_guest previous_cancellations previous_bookings_not_canceled
##  Min.   :0.0000    Min.   : 0.00000       Min.   : 0.0000               
##  1st Qu.:0.0000    1st Qu.: 0.00000       1st Qu.: 0.0000               
##  Median :0.0000    Median : 0.00000       Median : 0.0000               
##  Mean   :0.0315    Mean   : 0.08719       Mean   : 0.1371               
##  3rd Qu.:0.0000    3rd Qu.: 0.00000       3rd Qu.: 0.0000               
##  Max.   :1.0000    Max.   :26.00000       Max.   :72.0000               
##  reserved_room_type assigned_room_type booking_changes   deposit_type      
##  Length:119210      Length:119210      Min.   : 0.0000   Length:119210     
##  Class :character   Class :character   1st Qu.: 0.0000   Class :character  
##  Mode  :character   Mode  :character   Median : 0.0000   Mode  :character  
##                                        Mean   : 0.2188                     
##                                        3rd Qu.: 0.0000                     
##                                        Max.   :18.0000                     
##      agent       days_in_waiting_list customer_type           adr         
##  Min.   :  1.0   Min.   :  0.000      Length:119210      Min.   :  -6.38  
##  1st Qu.:  9.0   1st Qu.:  0.000      Class :character   1st Qu.:  69.50  
##  Median : 14.0   Median :  0.000      Mode  :character   Median :  94.95  
##  Mean   : 76.8   Mean   :  2.321                         Mean   : 101.97  
##  3rd Qu.:152.0   3rd Qu.:  0.000                         3rd Qu.: 126.00  
##  Max.   :535.0   Max.   :391.000                         Max.   :5400.00  
##  required_car_parking_spaces total_of_special_requests reservation_status
##  Min.   :0.00000             Min.   :0.0000            Length:119210     
##  1st Qu.:0.00000             1st Qu.:0.0000            Class :character  
##  Median :0.00000             Median :0.0000            Mode  :character  
##  Mean   :0.06255             Mean   :0.5715                              
##  3rd Qu.:0.00000             3rd Qu.:1.0000                              
##  Max.   :8.00000             Max.   :5.0000                              
##  reservation_status_date
##  Min.   :2014-10-17     
##  1st Qu.:2016-02-01     
##  Median :2016-08-07     
##  Mean   :2016-07-29     
##  3rd Qu.:2017-02-08     
##  Max.   :2017-09-14
# Distribution of numeric variables
numeric_cols <- sapply(hotel_data, is.numeric)
hist_data <- hotel_data[, numeric_cols]
hist(hist_data$lead_time, main = "Distribution of Lead Time", xlab = "Lead Time")

# Correlation matrix for numerical variables
correlation_matrix <- cor(hist_data)
corrplot::corrplot(correlation_matrix, method = "circle")

# Count plot for a categorical variable (e.g., hotel type)
ggplot(hotel_data, aes(x = hotel)) +
  geom_bar(fill = "steelblue") +
  labs(title = "Hotel Type Distribution", x = "Hotel Type", y = "Count")

# Boxplot for comparing numeric and categorical variables (e.g., ADR by Hotel Type)
ggplot(hotel_data, aes(x = hotel, y = adr)) +
  geom_boxplot(fill = "lightgreen") +
  labs(title = "ADR by Hotel Type", x = "Hotel Type", y = "Average Daily Rate (ADR)")

Hypothesis Testing

Given the nature of my data, I am interested in testing hypotheses related to booking cancellations, lead times, and other factors. Here are a few examples:

Hypothesis 3: Lead Time and Cancellation

  • Hypothesis: Bookings with longer lead times are more likely to be canceled.

Approach

  • To test this hypothesis, I will compare the lead times between canceled and not canceled bookings. The analysis will involve calculating the mean lead times for each group and performing a statistical test to determine if there is a significant difference between them.

Method

  • A t-test will be used to compare the mean lead times. This test will help in determining whether the difference in lead times is statistically significant.

Expected Outcome

  • If the hypothesis is correct, we expect to see a significantly higher mean lead time for canceled bookings compared to not canceled bookings.

This hypothesis testing will provide valuable insights into how the lead time before arrival impacts the likelihood of a booking being canceled.

# Split data into canceled and not canceled
lead_time_canceled <- hotel_data$lead_time[hotel_data$is_canceled == 1]
lead_time_not_canceled <- hotel_data$lead_time[hotel_data$is_canceled == 0]

# Perform a t-test
t_test_lead_time <- t.test(lead_time_canceled, lead_time_not_canceled)
t_test_lead_time
## 
##  Welch Two Sample t-test
## 
## data:  lead_time_canceled and lead_time_not_canceled
## t = 98.936, df = 74953, p-value < 2.2e-16
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  63.52042 66.08805
## sample estimates:
## mean of x mean of y 
## 144.88626  80.08203

Conclusion of Hypothesis-3

Test Details

  • The t-test compares the mean lead time (the number of days between booking and arrival) for canceled bookings (lead_time_canceled) and not canceled bookings (lead_time_not_canceled).

Statistical Results

  • t-Value: 98.936
    A higher t-value indicates a more significant difference between the two groups.
  • Degrees of Freedom: Approximately 74953
    Derived based on the sample sizes of the two groups and their variances.
  • P-Value: Less than 2.2e-16
    Extremely small, indicating a statistically significant difference. A p-value less than 0.05 is typically considered significant.
  • Confidence Interval: 63.52042 to 66.08805
    The 95% confidence interval for the difference in means. I can be 95% confident that the true difference in mean lead times lies within this range.

Sample Estimates

  • Mean of x (canceled bookings): 144.88626
  • Mean of y (not canceled bookings): 80.08203
    On average, the lead time for canceled bookings is much higher than for those that are not canceled.

Interpretation and Implications

  • Lead Time as an Indicator: The significant difference in lead times suggests that bookings made well in advance are more likely to be canceled than those made closer to the arrival date. This could be due to various factors like changes in plans, finding better deals, or uncertainty in long-term planning.
  • Strategic Implications: Hotels may use this information to modify their booking and cancellation policies. For example, implementing non-refundable deposits for early bookings or offering discounts for last-minute bookings to reduce the number of cancellations.
  • Further Exploration: Exploring if this trend holds across different types of hotels (e.g., city vs. resort) or during different seasons could provide more insights.

Further Exploration from Hypothesis-1

  • Analyzing Lead Time and Cancellation by Hotel Type:
    Comparing the lead times and cancellation rates between different types of hotels (e.g., city hotels and resort hotels) can yield further insights into booking dynamics.
# Split data by hotel type
city_hotel_data <- subset(hotel_data, hotel == "City Hotel")
resort_hotel_data <- subset(hotel_data, hotel == "Resort Hotel")

# Perform t-tests for each hotel type
t_test_city <- t.test(city_hotel_data$lead_time[city_hotel_data$is_canceled == 1],
                      city_hotel_data$lead_time[city_hotel_data$is_canceled == 0])

t_test_resort <- t.test(resort_hotel_data$lead_time[resort_hotel_data$is_canceled == 1],
                        resort_hotel_data$lead_time[resort_hotel_data$is_canceled == 0])

# Print results
print(t_test_city)
## 
##  Welch Two Sample t-test
## 
## data:  city_hotel_data$lead_time[city_hotel_data$is_canceled == 1] and city_hotel_data$lead_time[city_hotel_data$is_canceled == 0]
## t = 86.779, df = 56899, p-value < 2.2e-16
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  67.90247 71.04065
## sample estimates:
## mean of x mean of y 
## 150.32628  80.85472
print(t_test_resort)
## 
##  Welch Two Sample t-test
## 
## data:  resort_hotel_data$lead_time[resort_hotel_data$is_canceled == 1] and resort_hotel_data$lead_time[resort_hotel_data$is_canceled == 0]
## t = 45.943, df = 19140, p-value < 2.2e-16
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  47.72578 51.97952
## sample estimates:
## mean of x mean of y 
## 128.70369  78.85104

Analysis of Lead Time and Cancellations in City and Resort Hotels

City Hotel Data:

  • T-Value: 86.779
    A very high t-value, indicating a significant difference in the lead times between canceled and not canceled bookings in city hotels.
  • Degrees of Freedom: Approximately 56899
    This is a large sample size, adding confidence to the test results.
  • P-Value: Less than 2.2e-16
    Extremely small, signifying a statistically significant difference.
  • 95% Confidence Interval: Between 67.90247 and 71.04065 days
    This interval is the estimated range of the true mean difference in lead times.
  • Sample Estimates:
    • Mean lead time for canceled bookings: 150.32628 days
    • Mean lead time for not canceled bookings: 80.85472 days

Resort Hotel Data:

  • T-Value: 45.943
    Also a very high t-value, indicating a significant difference in lead times between canceled and not canceled bookings in resort hotels.
  • Degrees of Freedom: Approximately 19140
    Suggesting reliable results.
  • P-Value: Less than 2.2e-16
    Confirming statistical significance.
  • 95% Confidence Interval: Between 47.72578 and 51.97952 days
  • Sample Estimates:
    • Mean lead time for canceled bookings: 128.70369 days
    • Mean lead time for not canceled bookings: 78.85104 days

Interpretation and Implications:

  • Significant Differences: Both city and resort hotels show a significant difference in lead times between canceled and not canceled bookings, with canceled bookings having notably longer lead times.
  • Higher Lead Times in City Hotels: The lead times are higher for city hotels than resort hotels, which might suggest different booking and cancellation dynamics in these two types of hotels.
  • Strategic Implications: These results can inform hotel management strategies. For instance, city hotels might need more robust cancellation policies or strategies to manage longer lead times, while resort hotels might focus on different aspects of booking management.

This analysis offers valuable insights into how lead time varies with cancellation across different hotel types, enabling more targeted strategies for managing bookings and cancellations.

Hypothesis 4: Special Requests and Cancellation

# Split data into canceled and not canceled for special requests
special_requests_canceled <- hotel_data$total_of_special_requests[hotel_data$is_canceled == 1]
special_requests_not_canceled <- hotel_data$total_of_special_requests[hotel_data$is_canceled == 0]

# Perform a t-test
t_test_special_requests <- t.test(special_requests_canceled, special_requests_not_canceled)
t_test_special_requests
## 
##  Welch Two Sample t-test
## 
## data:  special_requests_canceled and special_requests_not_canceled
## t = -88.899, df = 110423, p-value < 2.2e-16
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  -0.3940569 -0.3770558
## sample estimates:
## mean of x mean of y 
## 0.3288988 0.7144552

Interpretation

Conclusions:

Building a Predictive Model

# Build Logistic Regression Model
model <- glm(is_canceled ~ lead_time + total_of_special_requests + adults + children + babies + hotel, 
             data = hotel_data, family = "binomial")

# Model Summary
summary(model)
## 
## Call:
## glm(formula = is_canceled ~ lead_time + total_of_special_requests + 
##     adults + children + babies + hotel, family = "binomial", 
##     data = hotel_data)
## 
## Coefficients:
##                             Estimate Std. Error z value Pr(>|z|)    
## (Intercept)               -1.171e+00  2.659e-02 -44.057   <2e-16 ***
## lead_time                  5.425e-03  6.454e-05  84.059   <2e-16 ***
## total_of_special_requests -7.271e-01  9.863e-03 -73.722   <2e-16 ***
## adults                     3.109e-01  1.375e-02  22.622   <2e-16 ***
## children                   2.169e-01  1.599e-02  13.567   <2e-16 ***
## babies                    -1.807e-01  8.548e-02  -2.114   0.0345 *  
## hotelResort Hotel         -5.707e-01  1.421e-02 -40.175   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 157205  on 119209  degrees of freedom
## Residual deviance: 138576  on 119203  degrees of freedom
## AIC: 138590
## 
## Number of Fisher Scoring iterations: 4

Model Interpretation

Coefficients:

  • Lead Time (lead_time): The positive coefficient (0.005425) indicates that as lead time increases, the likelihood of cancellation also increases. Each additional day in lead time slightly increases the odds of a booking being canceled.

  • Total of Special Requests (total_of_special_requests): The negative coefficient (-0.7271) suggests that more special requests are associated with a lower probability of cancellation. Each additional special request significantly reduces the likelihood of cancellation.

  • Adults (adults): The positive coefficient (0.3109) implies that bookings with more adults are more likely to be canceled.

  • Children (children): Similar to adults, the positive coefficient (0.2169) indicates that bookings with more children have a higher chance of being canceled.

  • Babies (babies): The negative coefficient (-0.1807) suggests that bookings including babies are less likely to be canceled, though the effect is relatively smaller compared to other predictors.

  • Hotel Type (hotelResort Hotel): The negative coefficient (-0.5707) for resort hotels implies that bookings at resort hotels are less likely to be canceled compared to city hotels.

Statistical Significance:

  • All predictors are statistically significant (p < 0.05), as indicated by the Pr(>|z|) values. This suggests that these factors are important in predicting the likelihood of cancellation.

Model Fit:

  • The null deviance and residual deviance indicate how well the model fits the data. The decrease in deviance from the null model (no predictors) to the current model suggests an improvement in fit.
  • The AIC (Akaike Information Criterion) value provides a measure for model comparison; lower values generally indicate a better model fit, taking into account the number of predictors.

Implications for Hotel Management

  • Lead Time: Hotels might consider strategies to manage long lead times, such as flexible cancellation policies or incentives for early confirmation.

  • Special Requests: Encouraging guests to make special requests could help reduce cancellations. Hotels could proactively communicate with guests to facilitate this.

  • Demographics: Tailoring services to families with children or groups with more adults, as they have higher cancellation probabilities.

  • Hotel Type: Different strategies may be needed for city hotels versus resort hotels due to their differing cancellation likelihoods.

Additional Considerations

  • Model Limitations: While significant, the model’s predictors only provide a partial view. Other factors not included in the model may also influence cancellation rates.

  • Further Analysis: Explore interactions between variables or include additional predictors like seasonality, reason for travel, or customer loyalty.

  • Model Validation: It’s crucial to validate the model on a separate test set to assess its predictive performance.

  • Operational Implementation: Consider how to integrate these insights into operational strategies and decision-making processes.

Model Evaluation

# Split the data
set.seed(123)  # for reproducibility
training_indices <- sample(1:nrow(hotel_data), 0.8 * nrow(hotel_data))
train_data <- hotel_data[training_indices, ]
test_data <- hotel_data[-training_indices, ]

# Rebuild the model using training data
model_train <- update(model, data = train_data)

# Make Predictions on Test Data
predictions <- predict(model_train, newdata = test_data, type = "response")
predicted_class <- ifelse(predictions > 0.5, 1, 0)

# Confusion Matrix
confusion_matrix <- table(Predicted = predicted_class, Actual = test_data$is_canceled)
print(confusion_matrix)
##          Actual
## Predicted     0     1
##         0 13109  5407
##         1  1838  3488

Model Evaluation - Confusion Matrix Analysis

The confusion matrix helps in evaluating the performance of the model. Let’s break down the confusion matrix:

# Confusion Matrix Values
TP <- 3488  # True Positives
TN <- 13109  # True Negatives
FP <- 1838   # False Positives
FN <- 5407   # False Negatives

# Calculating performance metrics
accuracy <- (TP + TN) / (TP + TN + FP + FN)
precision <- TP / (TP + FP)
recall <- TP / (TP + FN)
f1_score <- 2 * (precision * recall) / (precision + recall)

# Print the metrics
print(paste("Accuracy:", accuracy))
## [1] "Accuracy: 0.696124486200822"
print(paste("Precision:", precision))
## [1] "Precision: 0.654900488171235"
print(paste("Recall:", recall))
## [1] "Recall: 0.392130410342889"
print(paste("F1 Score:", f1_score))
## [1] "F1 Score: 0.490542155966528"

Conclusions

Based on the results from the performance metrics calculation of your logistic regression model, here are the interpretations:

Interpretation and Implications

  • Moderate Accuracy: While the model correctly predicts cancellations and non-cancellations with reasonable accuracy, there is still room for improvement. Factors contributing to incorrect predictions should be examined.

  • Higher Precision than Recall: The model is more reliable in its positive predictions (cancellations) than in identifying all actual cancellations. This might be preferable in scenarios where false positives (predicting a cancellation that doesn’t happen) are more costly or disruptive than false negatives (missing a cancellation).

  • Low Recall: The model misses a significant portion of actual cancellations. This could be critical if missing out on actual cancellations is undesirable. For example, if the hotel depends on these predictions for managing bookings and logistics, a low recall might lead to inefficiencies.

  • Moderate F1 Score: This score reflects a balance between precision and recall but indicates that there is a need for improvement in both metrics.

Future Steps

  • Feature Engineering: Review and potentially add new features that could improve the model’s performance, such as guest demographics, seasonal factors, or historical booking trends.

  • Model Tuning: Adjust the model’s parameters or try different modeling techniques to see if the performance can be improved.

  • Data Quality: Ensure the quality of the data used for training the model. Inaccurate or biased data can significantly impact the model’s performance.

  • Advanced Models: Consider exploring more complex models or machine learning techniques which might capture the nuances in the data better.

Summary:

Exploratory Data Analysis (EDA)

# Histogram of Lead Time for Canceled Bookings
ggplot(hotel_data, aes(x = lead_time)) + 
  geom_histogram(binwidth = 10, fill = "red", alpha = 0.5) +
  facet_wrap(~is_canceled) +
  labs(title = "Distribution of Lead Time for Canceled and Not Canceled Bookings", x = "Lead Time", y = "Frequency")

# Bar Plot of Special Requests vs. Cancellation
ggplot(hotel_data, aes(x = as.factor(total_of_special_requests), fill = as.factor(is_canceled))) +
  geom_bar(position = "fill") +
  labs(title = "Proportion of Cancellations by Number of Special Requests", x = "Number of Special Requests", y = "Proportion", fill = "Canceled")

# T-Test for checking if mean lead time is significantly different for canceled vs. non-canceled bookings
lead_time_canceled <- hotel_data$lead_time[hotel_data$is_canceled == 1]
lead_time_not_canceled <- hotel_data$lead_time[hotel_data$is_canceled == 0]

t_test_result <- t.test(lead_time_canceled, lead_time_not_canceled)
print(t_test_result)
## 
##  Welch Two Sample t-test
## 
## data:  lead_time_canceled and lead_time_not_canceled
## t = 98.936, df = 74953, p-value < 2.2e-16
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  63.52042 66.08805
## sample estimates:
## mean of x mean of y 
## 144.88626  80.08203

Understanding the Insights:

Insights:

The results of the t-test suggest that there is a statistically significant difference in the mean lead time between canceled and non-canceled bookings. Specifically, the mean lead time for canceled bookings (approximately 144.89) is significantly higher than that for non-canceled bookings (approximately 80.08).

Predictive Modelling

# Building the model
model <- glm(is_canceled ~ lead_time + total_of_special_requests + adults + children + babies + hotel, data = hotel_data, family = "binomial")

# Summary of the model
summary(model)
## 
## Call:
## glm(formula = is_canceled ~ lead_time + total_of_special_requests + 
##     adults + children + babies + hotel, family = "binomial", 
##     data = hotel_data)
## 
## Coefficients:
##                             Estimate Std. Error z value Pr(>|z|)    
## (Intercept)               -1.171e+00  2.659e-02 -44.057   <2e-16 ***
## lead_time                  5.425e-03  6.454e-05  84.059   <2e-16 ***
## total_of_special_requests -7.271e-01  9.863e-03 -73.722   <2e-16 ***
## adults                     3.109e-01  1.375e-02  22.622   <2e-16 ***
## children                   2.169e-01  1.599e-02  13.567   <2e-16 ***
## babies                    -1.807e-01  8.548e-02  -2.114   0.0345 *  
## hotelResort Hotel         -5.707e-01  1.421e-02 -40.175   <2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 157205  on 119209  degrees of freedom
## Residual deviance: 138576  on 119203  degrees of freedom
## AIC: 138590
## 
## Number of Fisher Scoring iterations: 4

Coefficients

The coefficients for each predictor variable indicate their impact on the log-odds of a booking being canceled (is_canceled = 1). For example:

Statistical Significance

The “z value” and “Pr(>|z|)” columns provide information about the statistical significance of each coefficient. All predictors are highly statistically significant (p < 0.001), as indicated by the very low p-values. This suggests that these factors are important in predicting the likelihood of cancellation.

Model Fit

The model’s null deviance and residual deviance indicate how well the model fits the data. The decrease in deviance from the null model (no predictors) to the current model suggests an improvement in fit. A lower AIC (Akaike Information Criterion) value generally indicates a better model fit, considering the number of predictors.

Implications for Hotel Management

Based on the coefficients, you can derive insights for hotel management:

Additional Considerations

The result reminds you of the limitations and future steps:

In summary, the logistic regression model provides valuable insights into factors influencing booking cancellations. The next steps may involve model validation, fine-tuning, and operational implementation of strategies based on the findings. Additionally, further analysis and exploration of other variables can lead to a more comprehensive understanding of cancellation patterns.

Model Evaluation

# Split data into training and test sets
set.seed(123)
training_indices <- sample(1:nrow(hotel_data), 0.8 * nrow(hotel_data))
train_data <- hotel_data[training_indices, ]
test_data <- hotel_data[-training_indices, ]

# Rebuild the model using training data
model_train <- glm(is_canceled ~ lead_time + total_of_special_requests + adults + children + babies + hotel, data = train_data, family = "binomial")

# Predict on test data
predictions <- predict(model_train, newdata = test_data, type = "response")
predicted_class <- ifelse(predictions > 0.5, 1, 0)

# Confusion Matrix
table(Predicted = predicted_class, Actual = test_data$is_canceled)
##          Actual
## Predicted     0     1
##         0 13109  5407
##         1  1838  3488

Hypothesis Testing Results

Lead Time and Cancellation: There is a statistically significant difference in the mean lead time between canceled and non-canceled bookings. The t-test result indicates that bookings that were canceled had a higher average lead time compared to those that were not canceled. This suggests that longer lead times are associated with a higher likelihood of cancellation.

Special Requests and Cancellation: The t-test shows a significant difference in the mean number of special requests between canceled and non-canceled bookings. Bookings that were not canceled had a higher number of special requests on average, indicating that guests with more special requests are less likely to cancel their bookings.

Predictive Modeling Results

Logistic Regression Model: The model aimed to predict cancellations based on various features like lead time, the number of special requests, the number of adults, children, and babies, and the type of hotel. Significant predictors included: - Lead Time: Positive relationship with cancellation; longer lead times increase the likelihood of cancellation. - Total of Special Requests: Negative relationship; more special requests decrease the likelihood of cancellation. - Adults: Positive relationship; more adults increase the likelihood of cancellation. - Children: Positive relationship; more children slightly increase the likelihood of cancellation. - Babies: Negative relationship; the presence of babies slightly decreases the likelihood of cancellation. - Hotel Type (Resort Hotel): Negative relationship; bookings in resort hotels are less likely to be canceled compared to city hotels.

Model Evaluation Results

Confusion Matrix: The predictive model’s performance was evaluated using a confusion matrix: - True Negatives (TN): 13,109 (correctly predicted non-cancellations) - False Positives (FP): 1,838 (incorrectly predicted cancellations) - False Negatives (FN): 5,407 (incorrectly predicted non-cancellations) - True Positives (TP): 3,488 (correctly predicted cancellations)

Overall Conclusions

Lead Time: Monitoring and managing lead times could be a critical strategy in reducing cancellation rates. Offering incentives for early confirmations or implementing stricter cancellation policies for long lead times might be beneficial.

Special Requests: Encouraging guests to make special requests could be a strategy to reduce cancellation rates. This could involve proactive communication from the hotel to inquire about any additional needs or preferences of the guests.

Target Audience: Tailoring services and marketing strategies towards adults and families with children, who are more likely to cancel, could help in reducing the cancellation rate.

Hotel Type Consideration: Different strategies might be needed for city hotels and resort hotels, given their different cancellation patterns.

Predictive Model Usage: The logistic regression model can be used as a tool for predicting the likelihood of cancellations, which can assist in making informed decisions and strategies for hotel management.

Future Research: Further analysis could explore other variables not included in the model, such as seasonal trends, reasons for cancellation, and guest reviews. Additionally, more advanced machine learning techniques could be employed to improve predictive performance.

Hypothesis Testing

# Split data into canceled and not canceled for lead time
lead_time_canceled <- hotel_data$lead_time[hotel_data$is_canceled == 1]
lead_time_not_canceled <- hotel_data$lead_time[hotel_data$is_canceled == 0]

# Perform a t-test
t_test_result <- t.test(lead_time_canceled, lead_time_not_canceled)
print(t_test_result)
## 
##  Welch Two Sample t-test
## 
## data:  lead_time_canceled and lead_time_not_canceled
## t = 98.936, df = 74953, p-value < 2.2e-16
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  63.52042 66.08805
## sample estimates:
## mean of x mean of y 
## 144.88626  80.08203

Conclusions

Statistical Significance: The p-value associated with the t-test is much less than 0.05 (typically considered the threshold for statistical significance), and it is expressed as p-value < 2.2e-16. This extremely small p-value indicates strong evidence to reject the null hypothesis. In other words, there is a statistically significant difference in the mean lead time between canceled and non-canceled bookings.

Effect Size: The t-value is 98.936, which is a measure of the magnitude of the difference between the means of the two groups. A higher t-value suggests a greater difference between the means. In this case, the large t-value indicates a substantial difference in mean lead times.

Confidence Interval: The 95 percent confidence interval for the difference in means is between 63.52042 and 66.08805. This interval provides a range of values within which we can be 95 percent confident that the true difference in means lies. Importantly, it does not include 0, which further supports the conclusion that the means are significantly different.

Mean Values: The sample estimates for the mean lead times are as follows:

These mean values indicate that, on average, bookings that were canceled had a substantially higher lead time compared to those that were not canceled.

In summary, the t-test results suggest a statistically significant and practically meaningful difference in mean lead times between canceled and non-canceled bookings. Bookings that were canceled had, on average, a significantly longer lead time compared to bookings that were not canceled. This insight can be valuable for hotel management in understanding the relationship between lead times and booking cancellations.

Building Predictive Model

# Logistic Regression Model
model <- glm(is_canceled ~ lead_time + adults + children + babies + hotel, data = hotel_data, family = "binomial")

# Summary of the model
summary(model)
## 
## Call:
## glm(formula = is_canceled ~ lead_time + adults + children + babies + 
##     hotel, family = "binomial", data = hotel_data)
## 
## Coefficients:
##                     Estimate Std. Error z value Pr(>|z|)    
## (Intercept)       -1.220e+00  2.576e-02 -47.344  < 2e-16 ***
## lead_time          5.717e-03  6.261e-05  91.320  < 2e-16 ***
## adults             1.315e-01  1.306e-02  10.068  < 2e-16 ***
## children           1.182e-01  1.552e-02   7.616 2.62e-14 ***
## babies            -7.283e-01  8.639e-02  -8.431  < 2e-16 ***
## hotelResort Hotel -5.793e-01  1.386e-02 -41.798  < 2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 157205  on 119209  degrees of freedom
## Residual deviance: 144949  on 119204  degrees of freedom
## AIC: 144961
## 
## Number of Fisher Scoring iterations: 4

summary

Model Evaluation

# Split the dataset into training and testing sets
set.seed(123)
training_indices <- sample(1:nrow(hotel_data), 0.8 * nrow(hotel_data))
train_data <- hotel_data[training_indices, ]
test_data <- hotel_data[-training_indices, ]

# Build the model using training data
model_train <- glm(is_canceled ~ lead_time + adults + children + babies + hotel, data = train_data, family = "binomial")

# Make predictions on the test data
predictions <- predict(model_train, newdata = test_data, type = "response")
predicted_class <- ifelse(predictions > 0.5, 1, 0)

# Confusion Matrix
confusionMatrix <- table(Predicted = predicted_class, Actual = test_data$is_canceled)
print(confusionMatrix)
##          Actual
## Predicted     0     1
##         0 13178  6318
##         1  1769  2577

Additional Data Exploration:

hotel_data$arrival_date <- as.Date(with(hotel_data, paste(arrival_date_year, arrival_date_month, arrival_date_day_of_month, sep="-")), format="%Y-%B-%d")
ggplot(hotel_data, aes(x = arrival_date)) + geom_line(stat = "count") + labs(title = "Booking Trends Over Time", x = "Date", y = "Number of Bookings")

# Geographical Analysis:

library(ggplot2)
ggplot(hotel_data, aes(x = country)) + geom_bar() + coord_flip() + labs(title = "Guest Distribution by Country", x = "Country", y = "Count")

# Create a month-year column for seasonal analysis
hotel_data$month_year <- format(as.Date(hotel_data$arrival_date), "%Y-%m")

# Aggregate data by month-year
seasonal_data <- hotel_data %>%
  group_by(month_year) %>%
  summarise(total_bookings = n(),
            canceled_bookings = sum(is_canceled))

# Plotting seasonal trends in bookings
ggplot(seasonal_data, aes(x = month_year, y = total_bookings, fill = canceled_bookings)) +
  geom_bar(stat = "identity") +
  labs(title = "Seasonal Booking Trends", x = "Month-Year", y = "Total Bookings") +
  theme(axis.text.x = element_text(angle = 90, hjust = 1))

library(randomForest)
## Warning: package 'randomForest' was built under R version 4.3.2
## randomForest 4.7-1.1
## Type rfNews() to see new features/changes/bug fixes.
## 
## Attaching package: 'randomForest'
## The following object is masked from 'package:gridExtra':
## 
##     combine
## The following object is masked from 'package:ggplot2':
## 
##     margin
## The following object is masked from 'package:dplyr':
## 
##     combine
# Ensure 'is_canceled' is a factor for classification
train_data$is_canceled <- as.factor(train_data$is_canceled)
test_data$is_canceled <- as.factor(test_data$is_canceled)

# Build the Random Forest classification model
rf_model <- randomForest(is_canceled ~ lead_time + total_of_special_requests + 
                         adults + children + babies + hotel, 
                         data = train_data)

# Summary of the model
print(rf_model)
## 
## Call:
##  randomForest(formula = is_canceled ~ lead_time + total_of_special_requests +      adults + children + babies + hotel, data = train_data) 
##                Type of random forest: classification
##                      Number of trees: 500
## No. of variables tried at each split: 2
## 
##         OOB estimate of  error rate: 28.03%
## Confusion matrix:
##       0     1 class.error
## 0 49404 10660   0.1774774
## 1 16072 19232   0.4552459
# Make predictions on the test data
rf_predictions <- predict(rf_model, newdata = test_data, type = "class")

# Generate a confusion matrix
rf_confusion_matrix <- table(Predicted = rf_predictions, Actual = test_data$is_canceled)
print(rf_confusion_matrix)
##          Actual
## Predicted     0     1
##         0 12353  3996
##         1  2594  4899

Inferences

confusion matrix indicates:

  • True Negatives (TN): 12,350 bookings were correctly predicted as not canceled.
  • True Positives (TP): 4,899 bookings were correctly predicted as canceled.
  • False Negatives (FN): 3,996 bookings were incorrectly predicted as not canceled (but they were actually canceled).
  • False Positives (FP): 2,597 bookings were incorrectly predicted as canceled (but they were actually not canceled).

From this confusion matrix, you can calculate several performance metrics:

  • Accuracy: The proportion of all predictions that are correct. It’s calculated as (TP + TN) / Total Predictions.
  • Precision: The proportion of positive identifications that were actually correct. Calculated as TP / (TP + FP).
  • Recall (Sensitivity): The proportion of actual positives that were identified correctly. Calculated as TP / (TP + FN).
  • F1 Score: The harmonic mean of precision and recall. Calculated as 2 * (Precision * Recall) / (Precision + Recall).

These metrics will give you a comprehensive understanding of your model’s performance. Let’s calculate these metrics:

# Calculating performance metrics
TP <- 4899
TN <- 12350
FP <- 2597
FN <- 3996

accuracy <- (TP + TN) / (TP + TN + FP + FN)
precision <- TP / (TP + FP)
recall <- TP / (TP + FN)
f1_score <- 2 * (precision * recall) / (precision + recall)

# Print the metrics
print(paste("Accuracy:", accuracy))
## [1] "Accuracy: 0.723471185303246"
print(paste("Precision:", precision))
## [1] "Precision: 0.65354855923159"
print(paste("Recall:", recall))
## [1] "Recall: 0.550758853288364"
print(paste("F1 Score:", f1_score))
## [1] "F1 Score: 0.597767067293027"

The performance metrics for your Random Forest model are as follows:

  • Accuracy: 72.35% - This means that your model correctly predicts whether a booking will be canceled or not about 72.35% of the time. It’s a good measure of overall performance, but it’s also important to look at the other metrics to understand the model’s strengths and weaknesses in specific areas.

  • Precision: 65.35% - Precision measures the accuracy of the positive predictions. In your case, when your model predicts that a booking will be canceled, it’s correct 65.35% of the time. This is a useful metric to assess the reliability of positive predictions (cancellations).

  • Recall: 55.08% - Recall, or sensitivity, indicates that your model correctly identifies 55.08% of all actual cancellations. This is important in scenarios where missing out on actual cancellations (false negatives) could be costly or problematic.

  • F1 Score: 59.78% - The F1 Score balances precision and recall. An F1 Score of 59.78% suggests a moderate balance between the precision and recall of your model. It’s often more informative than accuracy, especially if the class distribution is imbalanced.

  • Interpretation and Implications: Moderate Accuracy and F1 Score: My model has a decent overall accuracy and a moderate F1 Score, indicating balanced precision and recall. However, there is room for improvement, especially in correctly identifying more true positives (actual cancellations).

  • Precision and Recall: The precision of over 65% is relatively good, indicating fewer false positives. However, the recall of about 55% suggests that the model misses nearly half of the actual cancellations. Depending on the business context, this might be an area to focus on for improvement.

  • Model Usage: The model can be used to predict cancellations, but I might want to improve its recall to capture more actual cancellations, depending on how critical false negatives are for your operation.

  • Improving the Model: I would try different algorithms, tune the parameters of your Random Forest model, or explore feature engineering to improve the model’s recall without significantly sacrificing precision.

Conclusion:

#OVERALL cONCLUSION:

Hypothesis-3

Test Details

  • The t-test compares the mean lead time (the number of days between booking and arrival) for canceled bookings (lead_time_canceled) and not canceled bookings (lead_time_not_canceled).

Statistical Results

  • t-Value: 98.936
    A higher t-value indicates a more significant difference between the two groups.
  • Degrees of Freedom: Approximately 74953
    Derived based on the sample sizes of the two groups and their variances.
  • P-Value: Less than 2.2e-16
    Extremely small, indicating a statistically significant difference. A p-value less than 0.05 is typically considered significant.
  • Confidence Interval: 63.52042 to 66.08805
    The 95% confidence interval for the difference in means. I can be 95% confident that the true difference in mean lead times lies within this range.

Sample Estimates

  • Mean of x (canceled bookings): 144.88626
  • Mean of y (not canceled bookings): 80.08203
    On average, the lead time for canceled bookings is much higher than for those that are not canceled.

Interpretation and Implications

  • Lead Time as an Indicator: The significant difference in lead times suggests that bookings made well in advance are more likely to be canceled than those made closer to the arrival date. This could be due to various factors like changes in plans, finding better deals, or uncertainty in long-term planning.
  • Strategic Implications: Hotels may use this information to modify their booking and cancellation policies. For example, implementing non-refundable deposits for early bookings or offering discounts for last-minute bookings to reduce the number of cancellations.
  • Further Exploration: Exploring if this trend holds across different types of hotels (e.g., city vs. resort) or during different seasons could provide more insights.

Hypothesis-4

Interpretation

  • The negative t-value (-88.899) and the extremely small p-value (< 2.2e-16) indicate a statistically significant difference between the two groups. The mean number of special requests for canceled bookings (mean of x) is 0.3288988, significantly lower than that for not canceled bookings (mean of y), which is 0.7144552. This result supports the hypothesis that bookings with more special requests are less likely to be canceled.

Conclusions:

  • Special Requests Impact: Bookings with fewer special requests are more likely to be canceled. Conversely, more special requests are associated with a lower likelihood of cancellation.
  • Implications for Hotel Management: Encouraging guests to make special requests (e.g., room preferences, dietary needs) might lead to a reduction in cancellation rates. This could be achieved through targeted communication and offers.
  • Further Analysis: This result could be explored further to understand if certain types of special requests are more influential in preventing cancellations or if the effect varies by other factors like season, hotel type, or customer segment.

Q1.Are the Guest with children need parking space then guest with no children?(Multivariate)

#----------------------------------- Questions to Answer -------------------------------------------


hotel_stays <- hotel_data %>%
  filter(is_canceled == 0) %>%
  mutate(
    children = case_when(
      children + babies > 0 ~ "children",
      TRUE ~ "none"
    ),
    required_car_parking_spaces = case_when(
      required_car_parking_spaces > 0 ~ "parking",
      TRUE ~ "none"
    )
  )#%>%
  #select(-is_canceled, -reservation_status, -babies)



hotel_stays
##             hotel is_canceled lead_time arrival_date_year arrival_date_month
## 1    Resort Hotel           0       342              2015               July
## 2    Resort Hotel           0       737              2015               July
## 3    Resort Hotel           0         7              2015               July
## 4    Resort Hotel           0        13              2015               July
## 5    Resort Hotel           0        14              2015               July
## 6    Resort Hotel           0        14              2015               July
## 7    Resort Hotel           0         0              2015               July
## 8    Resort Hotel           0         9              2015               July
## 9    Resort Hotel           0        35              2015               July
## 10   Resort Hotel           0        68              2015               July
## 11   Resort Hotel           0        18              2015               July
## 12   Resort Hotel           0        37              2015               July
## 13   Resort Hotel           0        68              2015               July
## 14   Resort Hotel           0        37              2015               July
## 15   Resort Hotel           0        12              2015               July
## 16   Resort Hotel           0         0              2015               July
## 17   Resort Hotel           0         7              2015               July
## 18   Resort Hotel           0        37              2015               July
## 19   Resort Hotel           0        72              2015               July
## 20   Resort Hotel           0        72              2015               July
## 21   Resort Hotel           0        72              2015               July
## 22   Resort Hotel           0       127              2015               July
## 23   Resort Hotel           0        78              2015               July
## 24   Resort Hotel           0        48              2015               July
## 25   Resort Hotel           0        77              2015               July
## 26   Resort Hotel           0        99              2015               July
## 27   Resort Hotel           0       118              2015               July
## 28   Resort Hotel           0        95              2015               July
## 29   Resort Hotel           0        69              2015               July
## 30   Resort Hotel           0        15              2015               July
## 31   Resort Hotel           0        36              2015               July
## 32   Resort Hotel           0        70              2015               July
## 33   Resort Hotel           0        45              2015               July
## 34   Resort Hotel           0        16              2015               July
## 35   Resort Hotel           0        70              2015               July
## 36   Resort Hotel           0       107              2015               July
## 37   Resort Hotel           0        96              2015               July
## 38   Resort Hotel           0       113              2015               July
## 39   Resort Hotel           0        90              2015               July
## 40   Resort Hotel           0        50              2015               July
## 41   Resort Hotel           0       113              2015               July
## 42   Resort Hotel           0        93              2015               July
## 43   Resort Hotel           0        76              2015               July
## 44   Resort Hotel           0         3              2015               July
## 45   Resort Hotel           0         1              2015               July
## 46   Resort Hotel           0         1              2015               July
## 47   Resort Hotel           0         0              2015               July
## 48   Resort Hotel           0         0              2015               July
## 49   Resort Hotel           0         0              2015               July
## 50   Resort Hotel           0        14              2015               July
## 51   Resort Hotel           0        10              2015               July
## 52   Resort Hotel           0         5              2015               July
## 53   Resort Hotel           0        17              2015               July
## 54   Resort Hotel           0        93              2015               July
## 55   Resort Hotel           0        10              2015               July
## 56   Resort Hotel           0         3              2015               July
## 57   Resort Hotel           0        51              2015               July
## 58   Resort Hotel           0         2              2015               July
## 59   Resort Hotel           0        15              2015               July
## 60   Resort Hotel           0         3              2015               July
## 61   Resort Hotel           0         2              2015               July
## 62   Resort Hotel           0        72              2015               July
## 63   Resort Hotel           0        81              2015               July
## 64   Resort Hotel           0        99              2015               July
## 65   Resort Hotel           0       364              2015               July
## 66   Resort Hotel           0        99              2015               July
## 67   Resort Hotel           0       324              2015               July
## 68   Resort Hotel           0        69              2015               July
## 69   Resort Hotel           0        12              2015               July
## 70   Resort Hotel           0         9              2015               July
## 71   Resort Hotel           0         1              2015               July
## 72   Resort Hotel           0        21              2015               July
## 73   Resort Hotel           0         9              2015               July
## 74   Resort Hotel           0       109              2015               July
## 75   Resort Hotel           0        63              2015               July
## 76   Resort Hotel           0       101              2015               July
## 77   Resort Hotel           0       102              2015               July
## 78   Resort Hotel           0         4              2015               July
## 79   Resort Hotel           0        98              2015               July
## 80   Resort Hotel           0        92              2015               July
## 81   Resort Hotel           0        95              2015               July
## 82   Resort Hotel           0       102              2015               July
## 83   Resort Hotel           0       115              2015               July
## 84   Resort Hotel           0       102              2015               July
## 85   Resort Hotel           0        86              2015               July
## 86   Resort Hotel           0        78              2015               July
## 87   Resort Hotel           0        52              2015               July
## 88   Resort Hotel           0        29              2015               July
## 89   Resort Hotel           0       109              2015               July
## 90   Resort Hotel           0        92              2015               July
## 91   Resort Hotel           0        92              2015               July
## 92   Resort Hotel           0        79              2015               July
## 93   Resort Hotel           0         2              2015               July
## 94   Resort Hotel           0        30              2015               July
## 95   Resort Hotel           0        32              2015               July
## 96   Resort Hotel           0         8              2015               July
## 97   Resort Hotel           0       100              2015               July
## 98   Resort Hotel           0         1              2015               July
## 99   Resort Hotel           0       100              2015               July
## 100  Resort Hotel           0       100              2015               July
## 101  Resort Hotel           0         9              2015               July
## 102  Resort Hotel           0         0              2015               July
## 103  Resort Hotel           0         9              2015               July
## 104  Resort Hotel           0         2              2015               July
## 105  Resort Hotel           0         2              2015               July
## 106  Resort Hotel           0         9              2015               July
## 107  Resort Hotel           0         2              2015               July
## 108  Resort Hotel           0        44              2015               July
## 109  Resort Hotel           0        80              2015               July
## 110  Resort Hotel           0        97              2015               July
## 111  Resort Hotel           0       109              2015               July
## 112  Resort Hotel           0        30              2015               July
## 113  Resort Hotel           0        64              2015               July
## 114  Resort Hotel           0        39              2015               July
## 115  Resort Hotel           0        90              2015               July
## 116  Resort Hotel           0        97              2015               July
## 117  Resort Hotel           0        29              2015               July
## 118  Resort Hotel           0        27              2015               July
## 119  Resort Hotel           0         8              2015               July
## 120  Resort Hotel           0        82              2015               July
## 121  Resort Hotel           0        94              2015               July
## 122  Resort Hotel           0       110              2015               July
## 123  Resort Hotel           0        96              2015               July
## 124  Resort Hotel           0        79              2015               July
## 125  Resort Hotel           0       115              2015               July
## 126  Resort Hotel           0       111              2015               July
## 127  Resort Hotel           0        51              2015               July
## 128  Resort Hotel           0        94              2015               July
## 129  Resort Hotel           0        81              2015               July
## 130  Resort Hotel           0        84              2015               July
## 131  Resort Hotel           0        51              2015               July
## 132  Resort Hotel           0       111              2015               July
## 133  Resort Hotel           0         0              2015               July
## 134  Resort Hotel           0         2              2015               July
## 135  Resort Hotel           0         7              2015               July
## 136  Resort Hotel           0        98              2015               July
## 137  Resort Hotel           0        95              2015               July
## 138  Resort Hotel           0        66              2015               July
## 139  Resort Hotel           0       104              2015               July
## 140  Resort Hotel           0        28              2015               July
## 141  Resort Hotel           0        34              2015               July
## 142  Resort Hotel           0        98              2015               July
## 143  Resort Hotel           0       104              2015               July
## 144  Resort Hotel           0        68              2015               July
## 145  Resort Hotel           0       258              2015               July
## 146  Resort Hotel           0       111              2015               July
## 147  Resort Hotel           0       112              2015               July
## 148  Resort Hotel           0       100              2015               July
## 149  Resort Hotel           0        33              2015               July
## 150  Resort Hotel           0        97              2015               July
## 151  Resort Hotel           0        80              2015               July
## 152  Resort Hotel           0        90              2015               July
## 153  Resort Hotel           0       111              2015               July
## 154  Resort Hotel           0        65              2015               July
## 155  Resort Hotel           0        55              2015               July
## 156  Resort Hotel           0        21              2015               July
## 157  Resort Hotel           0         8              2015               July
## 158  Resort Hotel           0         8              2015               July
## 159  Resort Hotel           0         0              2015               July
## 160  Resort Hotel           0         0              2015               July
## 161  Resort Hotel           0         0              2015               July
## 162  Resort Hotel           0         8              2015               July
## 163  Resort Hotel           0        66              2015               July
## 164  Resort Hotel           0        88              2015               July
## 165  Resort Hotel           0         0              2015               July
## 166  Resort Hotel           0        54              2015               July
## 167  Resort Hotel           0       112              2015               July
## 168  Resort Hotel           0        68              2015               July
## 169  Resort Hotel           0         7              2015               July
## 170  Resort Hotel           0         1              2015               July
## 171  Resort Hotel           0         5              2015               July
## 172  Resort Hotel           0        83              2015               July
## 173  Resort Hotel           0         0              2015               July
## 174  Resort Hotel           0         1              2015               July
## 175  Resort Hotel           0       113              2015               July
## 176  Resort Hotel           0        96              2015               July
## 177  Resort Hotel           0       394              2015               July
## 178  Resort Hotel           0        33              2015               July
## 179  Resort Hotel           0        82              2015               July
## 180  Resort Hotel           0       100              2015               July
## 181  Resort Hotel           0       100              2015               July
## 182  Resort Hotel           0        17              2015               July
## 183  Resort Hotel           0        68              2015               July
## 184  Resort Hotel           0        12              2015               July
## 185  Resort Hotel           0        78              2015               July
## 186  Resort Hotel           0        16              2015               July
## 187  Resort Hotel           0        14              2015               July
## 188  Resort Hotel           0        77              2015               July
## 189  Resort Hotel           0        90              2015               July
## 190  Resort Hotel           0        90              2015               July
## 191  Resort Hotel           0        90              2015               July
## 192  Resort Hotel           0       366              2015               July
## 193  Resort Hotel           0       249              2015               July
## 194  Resort Hotel           0        10              2015               July
## 195  Resort Hotel           0        22              2015               July
## 196  Resort Hotel           0        91              2015               July
## 197  Resort Hotel           0        23              2015               July
## 198  Resort Hotel           0        11              2015               July
## 199  Resort Hotel           0         3              2015               July
## 200  Resort Hotel           0        13              2015               July
## 201  Resort Hotel           0       108              2015               July
## 202  Resort Hotel           0        91              2015               July
## 203  Resort Hotel           0        37              2015               July
## 204  Resort Hotel           0        21              2015               July
## 205  Resort Hotel           0       106              2015               July
## 206  Resort Hotel           0        30              2015               July
## 207  Resort Hotel           0        30              2015               July
## 208  Resort Hotel           0        79              2015               July
## 209  Resort Hotel           0        21              2015               July
## 210  Resort Hotel           0        35              2015               July
## 211  Resort Hotel           0        78              2015               July
## 212  Resort Hotel           0        31              2015               July
## 213  Resort Hotel           0        78              2015               July
## 214  Resort Hotel           0        78              2015               July
## 215  Resort Hotel           0        44              2015               July
## 216  Resort Hotel           0        34              2015               July
## 217  Resort Hotel           0        87              2015               July
## 218  Resort Hotel           0        11              2015               July
## 219  Resort Hotel           0       115              2015               July
## 220  Resort Hotel           0        86              2015               July
## 221  Resort Hotel           0        41              2015               July
## 222  Resort Hotel           0        32              2015               July
## 223  Resort Hotel           0        34              2015               July
## 224  Resort Hotel           0        34              2015               July
## 225  Resort Hotel           0        44              2015               July
## 226  Resort Hotel           0       304              2015               July
## 227  Resort Hotel           0       117              2015               July
## 228  Resort Hotel           0        70              2015               July
## 229  Resort Hotel           0       110              2015               July
## 230  Resort Hotel           0        33              2015               July
## 231  Resort Hotel           0        33              2015               July
## 232  Resort Hotel           0        33              2015               July
## 233  Resort Hotel           0         0              2015               July
## 234  Resort Hotel           0         0              2015               July
## 235  Resort Hotel           0         0              2015               July
## 236  Resort Hotel           0         0              2015               July
## 237  Resort Hotel           0        84              2015               July
## 238  Resort Hotel           0        71              2015               July
## 239  Resort Hotel           0        16              2015               July
## 240  Resort Hotel           0        54              2015               July
## 241  Resort Hotel           0         8              2015               July
## 242  Resort Hotel           0        36              2015               July
## 243  Resort Hotel           0        40              2015               July
## 244  Resort Hotel           0        79              2015               July
## 245  Resort Hotel           0        32              2015               July
## 246  Resort Hotel           0       110              2015               July
## 247  Resort Hotel           0        33              2015               July
## 248  Resort Hotel           0        53              2015               July
## 249  Resort Hotel           0         2              2015               July
## 250  Resort Hotel           0         8              2015               July
## 251  Resort Hotel           0        12              2015               July
## 252  Resort Hotel           0        48              2015               July
## 253  Resort Hotel           0        90              2015               July
## 254  Resort Hotel           0        34              2015               July
## 255  Resort Hotel           0        59              2015               July
## 256  Resort Hotel           0        90              2015               July
## 257  Resort Hotel           0       116              2015               July
## 258  Resort Hotel           0        31              2015               July
## 259  Resort Hotel           0        48              2015               July
## 260  Resort Hotel           0        59              2015               July
## 261  Resort Hotel           0        12              2015               July
## 262  Resort Hotel           0        64              2015               July
## 263  Resort Hotel           0        31              2015               July
## 264  Resort Hotel           0        59              2015               July
## 265  Resort Hotel           0        81              2015               July
## 266  Resort Hotel           0         1              2015               July
## 267  Resort Hotel           0        34              2015               July
## 268  Resort Hotel           0        13              2015               July
## 269  Resort Hotel           0        40              2015               July
## 270  Resort Hotel           0         1              2015               July
## 271  Resort Hotel           0        34              2015               July
## 272  Resort Hotel           0        88              2015               July
## 273  Resort Hotel           0         9              2015               July
## 274  Resort Hotel           0        97              2015               July
## 275  Resort Hotel           0        60              2015               July
## 276  Resort Hotel           0       100              2015               July
## 277  Resort Hotel           0        50              2015               July
## 278  Resort Hotel           0         8              2015               July
## 279  Resort Hotel           0        34              2015               July
## 280  Resort Hotel           0        47              2015               July
## 281  Resort Hotel           0       115              2015               July
## 282  Resort Hotel           0        91              2015               July
## 283  Resort Hotel           0        98              2015               July
## 284  Resort Hotel           0       109              2015               July
## 285  Resort Hotel           0         0              2015               July
## 286  Resort Hotel           0        98              2015               July
## 287  Resort Hotel           0         0              2015               July
## 288  Resort Hotel           0         9              2015               July
## 289  Resort Hotel           0        62              2015               July
## 290  Resort Hotel           0        42              2015               July
## 291  Resort Hotel           0        54              2015               July
## 292  Resort Hotel           0        51              2015               July
## 293  Resort Hotel           0        54              2015               July
## 294  Resort Hotel           0        58              2015               July
## 295  Resort Hotel           0         0              2015               July
## 296  Resort Hotel           0        40              2015               July
## 297  Resort Hotel           0        38              2015               July
## 298  Resort Hotel           0       101              2015               July
## 299  Resort Hotel           0        40              2015               July
## 300  Resort Hotel           0       109              2015               July
## 301  Resort Hotel           0        32              2015               July
## 302  Resort Hotel           0        72              2015               July
## 303  Resort Hotel           0       115              2015               July
## 304  Resort Hotel           0       118              2015               July
## 305  Resort Hotel           0        81              2015               July
## 306  Resort Hotel           0        16              2015               July
## 307  Resort Hotel           0        56              2015               July
## 308  Resort Hotel           0        88              2015               July
## 309  Resort Hotel           0        41              2015               July
## 310  Resort Hotel           0         1              2015               July
## 311  Resort Hotel           0         1              2015               July
## 312  Resort Hotel           0         1              2015               July
## 313  Resort Hotel           0         0              2015               July
## 314  Resort Hotel           0        49              2015               July
## 315  Resort Hotel           0        76              2015               July
## 316  Resort Hotel           0        73              2015               July
## 317  Resort Hotel           0        73              2015               July
## 318  Resort Hotel           0       317              2015               July
## 319  Resort Hotel           0         6              2015               July
## 320  Resort Hotel           0         8              2015               July
## 321  Resort Hotel           0        99              2015               July
## 322  Resort Hotel           0        66              2015               July
## 323  Resort Hotel           0        38              2015               July
## 324  Resort Hotel           0        38              2015               July
## 325  Resort Hotel           0       113              2015               July
## 326  Resort Hotel           0         0              2015               July
## 327  Resort Hotel           0        37              2015               July
## 328  Resort Hotel           0        37              2015               July
## 329  Resort Hotel           0        57              2015               July
## 330  Resort Hotel           0        57              2015               July
## 331  Resort Hotel           0        57              2015               July
## 332  Resort Hotel           0        57              2015               July
## 333  Resort Hotel           0        57              2015               July
## 334  Resort Hotel           0        83              2015               July
## 335  Resort Hotel           0        57              2015               July
## 336  Resort Hotel           0        57              2015               July
## 337  Resort Hotel           0        57              2015               July
## 338  Resort Hotel           0        57              2015               July
## 339  Resort Hotel           0        57              2015               July
## 340  Resort Hotel           0        57              2015               July
## 341  Resort Hotel           0        57              2015               July
## 342  Resort Hotel           0        57              2015               July
## 343  Resort Hotel           0        57              2015               July
## 344  Resort Hotel           0        57              2015               July
## 345  Resort Hotel           0        57              2015               July
## 346  Resort Hotel           0        57              2015               July
## 347  Resort Hotel           0        57              2015               July
## 348  Resort Hotel           0        57              2015               July
## 349  Resort Hotel           0        13              2015               July
## 350  Resort Hotel           0        50              2015               July
## 351  Resort Hotel           0         7              2015               July
## 352  Resort Hotel           0         0              2015               July
## 353  Resort Hotel           0        13              2015               July
## 354  Resort Hotel           0        66              2015               July
## 355  Resort Hotel           0        10              2015               July
## 356  Resort Hotel           0        19              2015               July
## 357  Resort Hotel           0        10              2015               July
## 358  Resort Hotel           0        10              2015               July
## 359  Resort Hotel           0        63              2015               July
## 360  Resort Hotel           0       113              2015               July
## 361  Resort Hotel           0        68              2015               July
## 362  Resort Hotel           0       113              2015               July
## 363  Resort Hotel           0        21              2015               July
## 364  Resort Hotel           0         6              2015               July
## 365  Resort Hotel           0         7              2015               July
## 366  Resort Hotel           0        17              2015               July
## 367  Resort Hotel           0         1              2015               July
## 368  Resort Hotel           0         2              2015               July
## 369  Resort Hotel           0        11              2015               July
## 370  Resort Hotel           0         1              2015               July
## 371  Resort Hotel           0         1              2015               July
## 372  Resort Hotel           0        48              2015               July
## 373  Resort Hotel           0        15              2015               July
## 374  Resort Hotel           0        53              2015               July
## 375  Resort Hotel           0        53              2015               July
## 376  Resort Hotel           0        94              2015               July
## 377  Resort Hotel           0        64              2015               July
## 378  Resort Hotel           0        53              2015               July
## 379  Resort Hotel           0        53              2015               July
## 380  Resort Hotel           0        64              2015               July
## 381  Resort Hotel           0        53              2015               July
## 382  Resort Hotel           0        24              2015               July
## 383  Resort Hotel           0        24              2015               July
## 384  Resort Hotel           0        23              2015               July
## 385  Resort Hotel           0        53              2015               July
## 386  Resort Hotel           0        90              2015               July
## 387  Resort Hotel           0        79              2015               July
## 388  Resort Hotel           0        43              2015               July
## 389  Resort Hotel           0        90              2015               July
## 390  Resort Hotel           0        65              2015               July
## 391  Resort Hotel           0        65              2015               July
## 392  Resort Hotel           0        99              2015               July
## 393  Resort Hotel           0        25              2015               July
## 394  Resort Hotel           0        92              2015               July
## 395  Resort Hotel           0        91              2015               July
## 396  Resort Hotel           0        38              2015               July
## 397  Resort Hotel           0         6              2015               July
## 398  Resort Hotel           0        38              2015               July
## 399  Resort Hotel           0        13              2015               July
## 400  Resort Hotel           0       315              2015               July
## 401  Resort Hotel           0         8              2015               July
## 402  Resort Hotel           0        91              2015               July
## 403  Resort Hotel           0         3              2015               July
## 404  Resort Hotel           0         9              2015               July
## 405  Resort Hotel           0        19              2015               July
## 406  Resort Hotel           0        25              2015               July
## 407  Resort Hotel           0       108              2015               July
## 408  Resort Hotel           0        45              2015               July
## 409  Resort Hotel           0        64              2015               July
## 410  Resort Hotel           0        44              2015               July
## 411  Resort Hotel           0        26              2015               July
## 412  Resort Hotel           0        59              2015               July
## 413  Resort Hotel           0        28              2015               July
## 414  Resort Hotel           0       106              2015               July
## 415  Resort Hotel           0         1              2015               July
## 416  Resort Hotel           0         0              2015               July
## 417  Resort Hotel           0         4              2015               July
## 418  Resort Hotel           0         3              2015               July
## 419  Resort Hotel           0        73              2015               July
## 420  Resort Hotel           0        44              2015               July
## 421  Resort Hotel           0        95              2015               July
## 422  Resort Hotel           0        94              2015               July
## 423  Resort Hotel           0        64              2015               July
## 424  Resort Hotel           0        64              2015               July
## 425  Resort Hotel           0        94              2015               July
## 426  Resort Hotel           0        57              2015               July
## 427  Resort Hotel           0        57              2015               July
## 428  Resort Hotel           0        87              2015               July
## 429  Resort Hotel           0         0              2015               July
## 430  Resort Hotel           0         0              2015               July
## 431  Resort Hotel           0         6              2015               July
## 432  Resort Hotel           0         0              2015               July
## 433  Resort Hotel           0        19              2015               July
## 434  Resort Hotel           0         4              2015               July
## 435  Resort Hotel           0        44              2015               July
## 436  Resort Hotel           0        66              2015               July
## 437  Resort Hotel           0        41              2015               July
## 438  Resort Hotel           0       104              2015               July
## 439  Resort Hotel           0       117              2015               July
## 440  Resort Hotel           0        34              2015               July
## 441  Resort Hotel           0        47              2015               July
## 442  Resort Hotel           0       104              2015               July
## 443  Resort Hotel           0        32              2015               July
## 444  Resort Hotel           0        29              2015               July
## 445  Resort Hotel           0        30              2015               July
## 446  Resort Hotel           0       123              2015               July
## 447  Resort Hotel           0        14              2015               July
## 448  Resort Hotel           0         0              2015               July
## 449  Resort Hotel           0         0              2015               July
## 450  Resort Hotel           0        79              2015               July
## 451  Resort Hotel           0        63              2015               July
## 452  Resort Hotel           0        68              2015               July
## 453  Resort Hotel           0        96              2015               July
## 454  Resort Hotel           0        46              2015               July
## 455  Resort Hotel           0        41              2015               July
## 456  Resort Hotel           0        52              2015               July
## 457  Resort Hotel           0        89              2015               July
## 458  Resort Hotel           0        65              2015               July
## 459  Resort Hotel           0        82              2015               July
## 460  Resort Hotel           0        42              2015               July
## 461  Resort Hotel           0        62              2015               July
## 462  Resort Hotel           0        28              2015               July
## 463  Resort Hotel           0        39              2015               July
## 464  Resort Hotel           0        39              2015               July
## 465  Resort Hotel           0        39              2015               July
## 466  Resort Hotel           0         5              2015               July
## 467  Resort Hotel           0        61              2015               July
## 468  Resort Hotel           0         8              2015               July
## 469  Resort Hotel           0        89              2015               July
## 470  Resort Hotel           0        57              2015               July
## 471  Resort Hotel           0       102              2015               July
## 472  Resort Hotel           0       108              2015               July
## 473  Resort Hotel           0        28              2015               July
## 474  Resort Hotel           0        29              2015               July
## 475  Resort Hotel           0         0              2015               July
## 476  Resort Hotel           0        44              2015               July
## 477  Resort Hotel           0        16              2015               July
## 478  Resort Hotel           0        73              2015               July
## 479  Resort Hotel           0         3              2015               July
## 480  Resort Hotel           0         0              2015               July
## 481  Resort Hotel           0        33              2015               July
## 482  Resort Hotel           0        33              2015               July
## 483  Resort Hotel           0       117              2015               July
## 484  Resort Hotel           0        34              2015               July
## 485  Resort Hotel           0         9              2015               July
## 486  Resort Hotel           0         8              2015               July
## 487  Resort Hotel           0        22              2015               July
## 488  Resort Hotel           0        22              2015               July
## 489  Resort Hotel           0        22              2015               July
## 490  Resort Hotel           0        36              2015               July
## 491  Resort Hotel           0        22              2015               July
## 492  Resort Hotel           0        18              2015               July
## 493  Resort Hotel           0         8              2015               July
## 494  Resort Hotel           0         1              2015               July
## 495  Resort Hotel           0        39              2015               July
## 496  Resort Hotel           0        14              2015               July
## 497  Resort Hotel           0        28              2015               July
## 498  Resort Hotel           0        55              2015               July
## 499  Resort Hotel           0        55              2015               July
## 500  Resort Hotel           0        25              2015               July
## 501  Resort Hotel           0        25              2015               July
## 502  Resort Hotel           0        43              2015               July
## 503  Resort Hotel           0        35              2015               July
## 504  Resort Hotel           0        30              2015               July
## 505  Resort Hotel           0        47              2015               July
## 506  Resort Hotel           0        40              2015               July
## 507  Resort Hotel           0        11              2015               July
## 508  Resort Hotel           0        39              2015               July
## 509  Resort Hotel           0         1              2015               July
## 510  Resort Hotel           0        12              2015               July
## 511  Resort Hotel           0        51              2015               July
## 512  Resort Hotel           0        67              2015               July
## 513  Resort Hotel           0        52              2015               July
## 514  Resort Hotel           0        25              2015               July
## 515  Resort Hotel           0        94              2015               July
## 516  Resort Hotel           0        33              2015               July
## 517  Resort Hotel           0        47              2015               July
## 518  Resort Hotel           0        43              2015               July
## 519  Resort Hotel           0        54              2015               July
## 520  Resort Hotel           0        32              2015               July
## 521  Resort Hotel           0        54              2015               July
## 522  Resort Hotel           0        75              2015               July
## 523  Resort Hotel           0        31              2015               July
## 524  Resort Hotel           0        61              2015               July
## 525  Resort Hotel           0        60              2015               July
## 526  Resort Hotel           0       115              2015               July
## 527  Resort Hotel           0        59              2015               July
## 528  Resort Hotel           0         0              2015               July
## 529  Resort Hotel           0        50              2015               July
## 530  Resort Hotel           0        47              2015               July
## 531  Resort Hotel           0        48              2015               July
## 532  Resort Hotel           0        73              2015               July
## 533  Resort Hotel           0        38              2015               July
## 534  Resort Hotel           0        34              2015               July
## 535  Resort Hotel           0       130              2015               July
## 536  Resort Hotel           0        45              2015               July
## 537  Resort Hotel           0        31              2015               July
## 538  Resort Hotel           0        59              2015               July
## 539  Resort Hotel           0        48              2015               July
## 540  Resort Hotel           0        96              2015               July
## 541  Resort Hotel           0        51              2015               July
## 542  Resort Hotel           0        96              2015               July
## 543  Resort Hotel           0         6              2015               July
## 544  Resort Hotel           0        27              2015               July
## 545  Resort Hotel           0        28              2015               July
## 546  Resort Hotel           0        30              2015               July
## 547  Resort Hotel           0        45              2015               July
## 548  Resort Hotel           0        52              2015               July
## 549  Resort Hotel           0        31              2015               July
## 550  Resort Hotel           0        31              2015               July
## 551  Resort Hotel           0        48              2015               July
## 552  Resort Hotel           0        35              2015               July
## 553  Resort Hotel           0        28              2015               July
## 554  Resort Hotel           0        77              2015               July
## 555  Resort Hotel           0        30              2015               July
## 556  Resort Hotel           0        35              2015               July
## 557  Resort Hotel           0        40              2015               July
## 558  Resort Hotel           0        38              2015               July
## 559  Resort Hotel           0        76              2015               July
## 560  Resort Hotel           0        70              2015               July
## 561  Resort Hotel           0        70              2015               July
## 562  Resort Hotel           0        68              2015               July
## 563  Resort Hotel           0        32              2015               July
## 564  Resort Hotel           0        29              2015               July
## 565  Resort Hotel           0        47              2015               July
## 566  Resort Hotel           0        50              2015               July
## 567  Resort Hotel           0        36              2015               July
## 568  Resort Hotel           0        49              2015               July
## 569  Resort Hotel           0       110              2015               July
## 570  Resort Hotel           0         8              2015               July
## 571  Resort Hotel           0        30              2015               July
## 572  Resort Hotel           0        71              2015               July
## 573  Resort Hotel           0        37              2015               July
## 574  Resort Hotel           0         0              2015               July
## 575  Resort Hotel           0        37              2015               July
## 576  Resort Hotel           0        97              2015               July
## 577  Resort Hotel           0       102              2015               July
## 578  Resort Hotel           0        34              2015               July
## 579  Resort Hotel           0        37              2015               July
## 580  Resort Hotel           0        17              2015               July
## 581  Resort Hotel           0         3              2015               July
## 582  Resort Hotel           0        52              2015               July
## 583  Resort Hotel           0        20              2015               July
## 584  Resort Hotel           0        77              2015               July
## 585  Resort Hotel           0        75              2015               July
## 586  Resort Hotel           0        75              2015               July
## 587  Resort Hotel           0        42              2015               July
## 588  Resort Hotel           0        46              2015               July
## 589  Resort Hotel           0         0              2015               July
## 590  Resort Hotel           0        16              2015               July
## 591  Resort Hotel           0         4              2015               July
## 592  Resort Hotel           0         4              2015               July
## 593  Resort Hotel           0        32              2015               July
## 594  Resort Hotel           0         0              2015               July
## 595  Resort Hotel           0       286              2015               July
## 596  Resort Hotel           0        72              2015               July
## 597  Resort Hotel           0        58              2015               July
## 598  Resort Hotel           0        80              2015               July
## 599  Resort Hotel           0       113              2015               July
## 600  Resort Hotel           0       129              2015             August
## 601  Resort Hotel           0         1              2015             August
## 602  Resort Hotel           0         3              2015             August
## 603  Resort Hotel           0        79              2015             August
## 604  Resort Hotel           0        66              2015             August
## 605  Resort Hotel           0        11              2015             August
## 606  Resort Hotel           0       115              2015             August
## 607  Resort Hotel           0        95              2015             August
## 608  Resort Hotel           0        67              2015             August
## 609  Resort Hotel           0        60              2015             August
## 610  Resort Hotel           0        34              2015             August
## 611  Resort Hotel           0        78              2015             August
## 612  Resort Hotel           0        93              2015             August
## 613  Resort Hotel           0        21              2015             August
## 614  Resort Hotel           0         0              2015             August
## 615  Resort Hotel           0        83              2015             August
## 616  Resort Hotel           0       460              2015             August
## 617  Resort Hotel           0        94              2015             August
## 618  Resort Hotel           0         1              2015             August
## 619  Resort Hotel           0         0              2015             August
## 620  Resort Hotel           0        13              2015             August
## 621  Resort Hotel           0        13              2015             August
## 622  Resort Hotel           0        14              2015             August
## 623  Resort Hotel           0       140              2015             August
## 624  Resort Hotel           0         6              2015             August
## 625  Resort Hotel           0       140              2015             August
## 626  Resort Hotel           0        81              2015             August
## 627  Resort Hotel           0         1              2015             August
## 628  Resort Hotel           0        65              2015             August
## 629  Resort Hotel           0         2              2015             August
## 630  Resort Hotel           0         0              2015             August
## 631  Resort Hotel           0        44              2015             August
## 632  Resort Hotel           0       139              2015             August
## 633  Resort Hotel           0       139              2015             August
## 634  Resort Hotel           0        84              2015             August
## 635  Resort Hotel           0         2              2015             August
## 636  Resort Hotel           0       129              2015             August
## 637  Resort Hotel           0         9              2015             August
## 638  Resort Hotel           0        52              2015             August
## 639  Resort Hotel           0        65              2015             August
## 640  Resort Hotel           0         7              2015             August
## 641  Resort Hotel           0         3              2015             August
## 642  Resort Hotel           0        87              2015             August
## 643  Resort Hotel           0        51              2015             August
## 644  Resort Hotel           0       136              2015             August
## 645  Resort Hotel           0         4              2015             August
## 646  Resort Hotel           0         1              2015             August
## 647  Resort Hotel           0         4              2015             August
## 648  Resort Hotel           0         6              2015             August
## 649  Resort Hotel           0         4              2015             August
## 650  Resort Hotel           0        52              2015             August
## 651  Resort Hotel           0        98              2015             August
## 652  Resort Hotel           0        83              2015             August
## 653  Resort Hotel           0        16              2015             August
## 654  Resort Hotel           0       116              2015             August
## 655  Resort Hotel           0        51              2015             August
## 656  Resort Hotel           0        65              2015             August
## 657  Resort Hotel           0         0              2015             August
## 658  Resort Hotel           0         5              2015             August
## 659  Resort Hotel           0        98              2015             August
## 660  Resort Hotel           0         4              2015             August
## 661  Resort Hotel           0         5              2015             August
## 662  Resort Hotel           0         3              2015             August
## 663  Resort Hotel           0        85              2015             August
## 664  Resort Hotel           0        12              2015             August
## 665  Resort Hotel           0        75              2015             August
## 666  Resort Hotel           0       126              2015             August
## 667  Resort Hotel           0       136              2015             August
## 668  Resort Hotel           0        98              2015             August
## 669  Resort Hotel           0        61              2015             August
## 670  Resort Hotel           0         0              2015             August
## 671  Resort Hotel           0         5              2015             August
## 672  Resort Hotel           0         2              2015             August
## 673  Resort Hotel           0        62              2015             August
## 674  Resort Hotel           0        34              2015             August
## 675  Resort Hotel           0        82              2015             August
## 676  Resort Hotel           0        55              2015             August
## 677  Resort Hotel           0        81              2015             August
## 678  Resort Hotel           0        59              2015             August
## 679  Resort Hotel           0        72              2015             August
## 680  Resort Hotel           0        81              2015             August
## 681  Resort Hotel           0        68              2015             August
## 682  Resort Hotel           0         5              2015             August
## 683  Resort Hotel           0        68              2015             August
## 684  Resort Hotel           0        19              2015             August
## 685  Resort Hotel           0        30              2015             August
## 686  Resort Hotel           0       112              2015             August
## 687  Resort Hotel           0        35              2015             August
## 688  Resort Hotel           0       136              2015             August
## 689  Resort Hotel           0        35              2015             August
## 690  Resort Hotel           0        62              2015             August
## 691  Resort Hotel           0        76              2015             August
## 692  Resort Hotel           0        90              2015             August
## 693  Resort Hotel           0        90              2015             August
## 694  Resort Hotel           0        80              2015             August
## 695  Resort Hotel           0        70              2015             August
## 696  Resort Hotel           0        68              2015             August
## 697  Resort Hotel           0        31              2015             August
## 698  Resort Hotel           0        49              2015             August
## 699  Resort Hotel           0        84              2015             August
## 700  Resort Hotel           0        66              2015             August
## 701  Resort Hotel           0        33              2015             August
## 702  Resort Hotel           0        47              2015             August
## 703  Resort Hotel           0       128              2015             August
## 704  Resort Hotel           0       128              2015             August
## 705  Resort Hotel           0        78              2015             August
## 706  Resort Hotel           0         0              2015             August
## 707  Resort Hotel           0         9              2015             August
## 708  Resort Hotel           0         1              2015             August
## 709  Resort Hotel           0        23              2015             August
## 710  Resort Hotel           0        47              2015             August
## 711  Resort Hotel           0       135              2015             August
## 712  Resort Hotel           0        76              2015             August
## 713  Resort Hotel           0        87              2015             August
## 714  Resort Hotel           0        19              2015             August
## 715  Resort Hotel           0        21              2015             August
## 716  Resort Hotel           0        19              2015             August
## 717  Resort Hotel           0        51              2015             August
## 718  Resort Hotel           0         0              2015             August
## 719  Resort Hotel           0         0              2015             August
## 720  Resort Hotel           0         0              2015             August
## 721  Resort Hotel           0         0              2015             August
## 722  Resort Hotel           0         0              2015             August
## 723  Resort Hotel           0        38              2015             August
## 724  Resort Hotel           0        21              2015             August
## 725  Resort Hotel           0        38              2015             August
## 726  Resort Hotel           0         0              2015             August
## 727  Resort Hotel           0         7              2015             August
## 728  Resort Hotel           0        81              2015             August
## 729  Resort Hotel           0         6              2015             August
## 730  Resort Hotel           0        52              2015             August
## 731  Resort Hotel           0       150              2015             August
## 732  Resort Hotel           0        64              2015             August
## 733  Resort Hotel           0         3              2015             August
## 734  Resort Hotel           0        68              2015             August
## 735  Resort Hotel           0        35              2015             August
## 736  Resort Hotel           0         2              2015             August
## 737  Resort Hotel           0        68              2015             August
## 738  Resort Hotel           0        72              2015             August
## 739  Resort Hotel           0        77              2015             August
## 740  Resort Hotel           0        31              2015             August
## 741  Resort Hotel           0        93              2015             August
## 742  Resort Hotel           0        31              2015             August
## 743  Resort Hotel           0        89              2015             August
## 744  Resort Hotel           0        65              2015             August
## 745  Resort Hotel           0        89              2015             August
## 746  Resort Hotel           0        26              2015             August
## 747  Resort Hotel           0        75              2015             August
## 748  Resort Hotel           0        84              2015             August
## 749  Resort Hotel           0        37              2015             August
## 750  Resort Hotel           0        37              2015             August
## 751  Resort Hotel           0        37              2015             August
## 752  Resort Hotel           0        37              2015             August
## 753  Resort Hotel           0         0              2015             August
## 754  Resort Hotel           0        37              2015             August
## 755  Resort Hotel           0        37              2015             August
## 756  Resort Hotel           0         2              2015             August
## 757  Resort Hotel           0        95              2015             August
## 758  Resort Hotel           0        58              2015             August
## 759  Resort Hotel           0        96              2015             August
## 760  Resort Hotel           0       125              2015             August
## 761  Resort Hotel           0        80              2015             August
## 762  Resort Hotel           0        74              2015             August
## 763  Resort Hotel           0        79              2015             August
## 764  Resort Hotel           0        80              2015             August
## 765  Resort Hotel           0        13              2015             August
## 766  Resort Hotel           0        13              2015             August
## 767  Resort Hotel           0        57              2015             August
## 768  Resort Hotel           0        74              2015             August
## 769  Resort Hotel           0       126              2015             August
## 770  Resort Hotel           0       126              2015             August
## 771  Resort Hotel           0       126              2015             August
## 772  Resort Hotel           0        68              2015             August
## 773  Resort Hotel           0        57              2015             August
## 774  Resort Hotel           0        10              2015             August
## 775  Resort Hotel           0        92              2015             August
## 776  Resort Hotel           0        92              2015             August
## 777  Resort Hotel           0        33              2015             August
## 778  Resort Hotel           0         1              2015             August
## 779  Resort Hotel           0        91              2015             August
## 780  Resort Hotel           0        16              2015             August
## 781  Resort Hotel           0       128              2015             August
## 782  Resort Hotel           0        61              2015             August
## 783  Resort Hotel           0        98              2015             August
## 784  Resort Hotel           0       138              2015             August
## 785  Resort Hotel           0        10              2015             August
## 786  Resort Hotel           0        10              2015             August
## 787  Resort Hotel           0         0              2015             August
## 788  Resort Hotel           0        65              2015             August
## 789  Resort Hotel           0        64              2015             August
## 790  Resort Hotel           0        80              2015             August
## 791  Resort Hotel           0        40              2015             August
## 792  Resort Hotel           0       102              2015             August
## 793  Resort Hotel           0        16              2015             August
## 794  Resort Hotel           0        24              2015             August
## 795  Resort Hotel           0        24              2015             August
## 796  Resort Hotel           0        16              2015             August
## 797  Resort Hotel           0        50              2015             August
## 798  Resort Hotel           0        76              2015             August
## 799  Resort Hotel           0       112              2015             August
## 800  Resort Hotel           0        16              2015             August
## 801  Resort Hotel           0        51              2015             August
## 802  Resort Hotel           0        13              2015             August
## 803  Resort Hotel           0        32              2015             August
## 804  Resort Hotel           0        51              2015             August
## 805  Resort Hotel           0        65              2015             August
## 806  Resort Hotel           0        35              2015             August
## 807  Resort Hotel           0        37              2015             August
## 808  Resort Hotel           0        35              2015             August
## 809  Resort Hotel           0        71              2015             August
## 810  Resort Hotel           0        77              2015             August
## 811  Resort Hotel           0         0              2015             August
## 812  Resort Hotel           0        54              2015             August
## 813  Resort Hotel           0        46              2015             August
## 814  Resort Hotel           0        46              2015             August
## 815  Resort Hotel           0        85              2015             August
## 816  Resort Hotel           0        36              2015             August
## 817  Resort Hotel           0        65              2015             August
## 818  Resort Hotel           0        46              2015             August
## 819  Resort Hotel           0        22              2015             August
## 820  Resort Hotel           0        12              2015             August
## 821  Resort Hotel           0        72              2015             August
## 822  Resort Hotel           0        85              2015             August
## 823  Resort Hotel           0       102              2015             August
## 824  Resort Hotel           0       151              2015             August
## 825  Resort Hotel           0       151              2015             August
## 826  Resort Hotel           0        66              2015             August
## 827  Resort Hotel           0        46              2015             August
## 828  Resort Hotel           0        70              2015             August
## 829  Resort Hotel           0        92              2015             August
## 830  Resort Hotel           0         6              2015             August
## 831  Resort Hotel           0        62              2015             August
## 832  Resort Hotel           0        82              2015             August
## 833  Resort Hotel           0        69              2015             August
## 834  Resort Hotel           0        20              2015             August
## 835  Resort Hotel           0       132              2015             August
## 836  Resort Hotel           0        62              2015             August
## 837  Resort Hotel           0        59              2015             August
## 838  Resort Hotel           0        40              2015             August
## 839  Resort Hotel           0         0              2015             August
## 840  Resort Hotel           0        30              2015             August
## 841  Resort Hotel           0         0              2015             August
## 842  Resort Hotel           0        84              2015             August
## 843  Resort Hotel           0       103              2015             August
## 844  Resort Hotel           0        76              2015             August
## 845  Resort Hotel           0        58              2015             August
## 846  Resort Hotel           0        11              2015             August
## 847  Resort Hotel           0        11              2015             August
## 848  Resort Hotel           0        37              2015             August
## 849  Resort Hotel           0        69              2015             August
## 850  Resort Hotel           0        43              2015             August
## 851  Resort Hotel           0        21              2015             August
## 852  Resort Hotel           0         0              2015             August
## 853  Resort Hotel           0         2              2015             August
## 854  Resort Hotel           0         0              2015             August
## 855  Resort Hotel           0        76              2015             August
## 856  Resort Hotel           0        57              2015             August
## 857  Resort Hotel           0         1              2015             August
## 858  Resort Hotel           0        41              2015             August
## 859  Resort Hotel           0        90              2015             August
## 860  Resort Hotel           0        49              2015             August
## 861  Resort Hotel           0        43              2015             August
## 862  Resort Hotel           0        27              2015             August
## 863  Resort Hotel           0        45              2015             August
## 864  Resort Hotel           0        49              2015             August
## 865  Resort Hotel           0        10              2015             August
## 866  Resort Hotel           0        30              2015             August
## 867  Resort Hotel           0         0              2015             August
## 868  Resort Hotel           0        31              2015             August
## 869  Resort Hotel           0        34              2015             August
## 870  Resort Hotel           0         4              2015             August
## 871  Resort Hotel           0        23              2015             August
## 872  Resort Hotel           0        31              2015             August
## 873  Resort Hotel           0        32              2015             August
## 874  Resort Hotel           0        30              2015             August
## 875  Resort Hotel           0        10              2015             August
## 876  Resort Hotel           0        11              2015             August
## 877  Resort Hotel           0        11              2015             August
## 878  Resort Hotel           0         8              2015             August
## 879  Resort Hotel           0        39              2015             August
## 880  Resort Hotel           0         4              2015             August
## 881  Resort Hotel           0        34              2015             August
## 882  Resort Hotel           0        25              2015             August
## 883  Resort Hotel           0       106              2015             August
## 884  Resort Hotel           0        30              2015             August
## 885  Resort Hotel           0        67              2015             August
## 886  Resort Hotel           0        21              2015             August
## 887  Resort Hotel           0        50              2015             August
## 888  Resort Hotel           0        28              2015             August
## 889  Resort Hotel           0        30              2015             August
## 890  Resort Hotel           0       127              2015             August
## 891  Resort Hotel           0        66              2015             August
## 892  Resort Hotel           0        28              2015             August
## 893  Resort Hotel           0         0              2015             August
## 894  Resort Hotel           0        47              2015             August
## 895  Resort Hotel           0        47              2015             August
## 896  Resort Hotel           0        47              2015             August
## 897  Resort Hotel           0        57              2015             August
## 898  Resort Hotel           0         1              2015             August
## 899  Resort Hotel           0         4              2015             August
## 900  Resort Hotel           0        11              2015             August
## 901  Resort Hotel           0       136              2015             August
## 902  Resort Hotel           0         2              2015             August
## 903  Resort Hotel           0         9              2015             August
## 904  Resort Hotel           0         2              2015             August
## 905  Resort Hotel           0        11              2015             August
## 906  Resort Hotel           0        11              2015             August
## 907  Resort Hotel           0        37              2015             August
## 908  Resort Hotel           0       103              2015             August
## 909  Resort Hotel           0         5              2015             August
## 910  Resort Hotel           0        34              2015             August
## 911  Resort Hotel           0        44              2015             August
## 912  Resort Hotel           0        83              2015             August
## 913  Resort Hotel           0        83              2015             August
## 914  Resort Hotel           0        25              2015             August
## 915  Resort Hotel           0        82              2015             August
## 916  Resort Hotel           0         0              2015             August
## 917  Resort Hotel           0        35              2015             August
## 918  Resort Hotel           0        34              2015             August
## 919  Resort Hotel           0        83              2015             August
## 920  Resort Hotel           0        41              2015             August
## 921  Resort Hotel           0        26              2015             August
## 922  Resort Hotel           0        26              2015             August
## 923  Resort Hotel           0         6              2015             August
## 924  Resort Hotel           0        28              2015             August
## 925  Resort Hotel           0        26              2015             August
## 926  Resort Hotel           0        10              2015             August
## 927  Resort Hotel           0        59              2015             August
## 928  Resort Hotel           0        26              2015             August
## 929  Resort Hotel           0       160              2015             August
## 930  Resort Hotel           0        68              2015             August
## 931  Resort Hotel           0        48              2015          September
## 932  Resort Hotel           0        48              2015          September
## 933  Resort Hotel           0        27              2015          September
## 934  Resort Hotel           0        50              2015          September
## 935  Resort Hotel           0       122              2015          September
## 936  Resort Hotel           0        64              2015          September
## 937  Resort Hotel           0        48              2015          September
## 938  Resort Hotel           0         0              2015          September
## 939  Resort Hotel           0         5              2015          September
## 940  Resort Hotel           0        62              2015          September
## 941  Resort Hotel           0       333              2015          September
## 942  Resort Hotel           0        27              2015          September
## 943  Resort Hotel           0       123              2015          September
## 944  Resort Hotel           0        73              2015          September
## 945  Resort Hotel           0        27              2015          September
## 946  Resort Hotel           0        27              2015          September
## 947  Resort Hotel           0       140              2015          September
## 948  Resort Hotel           0        62              2015          September
## 949  Resort Hotel           0       381              2015          September
## 950  Resort Hotel           0         0              2015          September
## 951  Resort Hotel           0         4              2015          September
## 952  Resort Hotel           0       104              2015          September
## 953  Resort Hotel           0       104              2015          September
## 954  Resort Hotel           0        68              2015          September
## 955  Resort Hotel           0         1              2015          September
## 956  Resort Hotel           0        55              2015          September
## 957  Resort Hotel           0       154              2015          September
## 958  Resort Hotel           0       154              2015          September
## 959  Resort Hotel           0        57              2015          September
## 960  Resort Hotel           0       154              2015          September
## 961  Resort Hotel           0        29              2015          September
## 962  Resort Hotel           0       154              2015          September
## 963  Resort Hotel           0       154              2015          September
## 964  Resort Hotel           0       154              2015          September
## 965  Resort Hotel           0         6              2015          September
## 966  Resort Hotel           0        29              2015          September
## 967  Resort Hotel           0        29              2015          September
## 968  Resort Hotel           0        29              2015          September
## 969  Resort Hotel           0        29              2015          September
## 970  Resort Hotel           0       297              2015          September
## 971  Resort Hotel           0        52              2015          September
## 972  Resort Hotel           0        92              2015          September
## 973  Resort Hotel           0        52              2015          September
## 974  Resort Hotel           0        56              2015          September
## 975  Resort Hotel           0        65              2015          September
## 976  Resort Hotel           0        50              2015          September
## 977  Resort Hotel           0       163              2015          September
## 978  Resort Hotel           0       327              2015          September
## 979  Resort Hotel           0         0              2015          September
## 980  Resort Hotel           0         1              2015          September
## 981  Resort Hotel           0         0              2015          September
## 982  Resort Hotel           0        14              2015          September
## 983  Resort Hotel           0        88              2015          September
## 984  Resort Hotel           0         0              2015          September
## 985  Resort Hotel           0        15              2015          September
## 986  Resort Hotel           0        28              2015          September
## 987  Resort Hotel           0        28              2015          September
## 988  Resort Hotel           0         3              2015          September
## 989  Resort Hotel           0         0              2015          September
## 990  Resort Hotel           0         4              2015          September
## 991  Resort Hotel           0        63              2015          September
## 992  Resort Hotel           0        67              2015          September
## 993  Resort Hotel           0        73              2015          September
## 994  Resort Hotel           0        51              2015          September
## 995  Resort Hotel           0       150              2015          September
## 996  Resort Hotel           0        23              2015          September
## 997  Resort Hotel           0        67              2015          September
## 998  Resort Hotel           0        68              2015          September
## 999  Resort Hotel           0        47              2015          September
## 1000 Resort Hotel           0        47              2015          September
## 1001 Resort Hotel           0        26              2015          September
## 1002 Resort Hotel           0        25              2015          September
## 1003 Resort Hotel           0        71              2015          September
## 1004 Resort Hotel           0        54              2015          September
## 1005 Resort Hotel           0        74              2015          September
## 1006 Resort Hotel           0        26              2015          September
## 1007 Resort Hotel           0        52              2015          September
## 1008 Resort Hotel           0        47              2015          September
## 1009 Resort Hotel           0       340              2015          September
## 1010 Resort Hotel           0       103              2015          September
## 1011 Resort Hotel           0       356              2015          September
## 1012 Resort Hotel           0         5              2015          September
## 1013 Resort Hotel           0        40              2015          September
## 1014 Resort Hotel           0        74              2015          September
## 1015 Resort Hotel           0        25              2015          September
## 1016 Resort Hotel           0       110              2015          September
## 1017 Resort Hotel           0        61              2015          September
## 1018 Resort Hotel           0        57              2015          September
## 1019 Resort Hotel           0        61              2015          September
## 1020 Resort Hotel           0        47              2015          September
## 1021 Resort Hotel           0        30              2015          September
## 1022 Resort Hotel           0        59              2015          September
## 1023 Resort Hotel           0        78              2015          September
## 1024 Resort Hotel           0        94              2015          September
## 1025 Resort Hotel           0        69              2015          September
## 1026 Resort Hotel           0        78              2015          September
## 1027 Resort Hotel           0       115              2015          September
## 1028 Resort Hotel           0       128              2015          September
## 1029 Resort Hotel           0       328              2015          September
## 1030 Resort Hotel           0       143              2015          September
## 1031 Resort Hotel           0        90              2015          September
## 1032 Resort Hotel           0       144              2015          September
## 1033 Resort Hotel           0        90              2015          September
## 1034 Resort Hotel           0        35              2015          September
## 1035 Resort Hotel           0         4              2015          September
## 1036 Resort Hotel           0         0              2015          September
## 1037 Resort Hotel           0         2              2015          September
## 1038 Resort Hotel           0       112              2015          September
## 1039 Resort Hotel           0        30              2015          September
## 1040 Resort Hotel           0       248              2015          September
## 1041 Resort Hotel           0         0              2015          September
## 1042 Resort Hotel           0        11              2015          September
## 1043 Resort Hotel           0       117              2015          September
## 1044 Resort Hotel           0       160              2015          September
## 1045 Resort Hotel           0       175              2015          September
## 1046 Resort Hotel           0        71              2015          September
## 1047 Resort Hotel           0        12              2015          September
## 1048 Resort Hotel           0       382              2015          September
## 1049 Resort Hotel           0         0              2015          September
## 1050 Resort Hotel           0        28              2015          September
## 1051 Resort Hotel           0        58              2015          September
## 1052 Resort Hotel           0        48              2015          September
## 1053 Resort Hotel           0         2              2015          September
## 1054 Resort Hotel           0         0              2015          September
## 1055 Resort Hotel           0       137              2015          September
## 1056 Resort Hotel           0       130              2015          September
## 1057 Resort Hotel           0       130              2015          September
## 1058 Resort Hotel           0       118              2015          September
## 1059 Resort Hotel           0       146              2015          September
## 1060 Resort Hotel           0        49              2015          September
## 1061 Resort Hotel           0         1              2015          September
## 1062 Resort Hotel           0        31              2015          September
## 1063 Resort Hotel           0       170              2015          September
## 1064 Resort Hotel           0       166              2015          September
## 1065 Resort Hotel           0       108              2015          September
## 1066 Resort Hotel           0        82              2015          September
## 1067 Resort Hotel           0       113              2015          September
## 1068 Resort Hotel           0         0              2015          September
## 1069 Resort Hotel           0         3              2015          September
## 1070 Resort Hotel           0        12              2015          September
## 1071 Resort Hotel           0        12              2015          September
## 1072 Resort Hotel           0       140              2015          September
## 1073 Resort Hotel           0       140              2015          September
## 1074 Resort Hotel           0        97              2015          September
## 1075 Resort Hotel           0       160              2015          September
## 1076 Resort Hotel           0        91              2015          September
## 1077 Resort Hotel           0       111              2015          September
## 1078 Resort Hotel           0        90              2015          September
## 1079 Resort Hotel           0       338              2015          September
## 1080 Resort Hotel           0       167              2015          September
## 1081 Resort Hotel           0         2              2015          September
## 1082 Resort Hotel           0         0              2015          September
## 1083 Resort Hotel           0        73              2015          September
## 1084 Resort Hotel           0         0              2015          September
## 1085 Resort Hotel           0        63              2015          September
## 1086 Resort Hotel           0         3              2015          September
## 1087 Resort Hotel           0         8              2015          September
## 1088 Resort Hotel           0         1              2015          September
## 1089 Resort Hotel           0        70              2015          September
## 1090 Resort Hotel           0         4              2015          September
## 1091 Resort Hotel           0       157              2015          September
## 1092 Resort Hotel           0         1              2015          September
## 1093 Resort Hotel           0         1              2015          September
## 1094 Resort Hotel           0         8              2015          September
## 1095 Resort Hotel           0       102              2015          September
## 1096 Resort Hotel           0        11              2015          September
## 1097 Resort Hotel           0       165              2015          September
## 1098 Resort Hotel           0         9              2015          September
## 1099 Resort Hotel           0       143              2015          September
## 1100 Resort Hotel           0         0              2015          September
## 1101 Resort Hotel           0        96              2015          September
## 1102 Resort Hotel           0       136              2015          September
## 1103 Resort Hotel           0         2              2015          September
## 1104 Resort Hotel           0       170              2015          September
## 1105 Resort Hotel           0       149              2015          September
## 1106 Resort Hotel           0         0              2015          September
## 1107 Resort Hotel           0        19              2015          September
## 1108 Resort Hotel           0        12              2015          September
## 1109 Resort Hotel           0        26              2015          September
## 1110 Resort Hotel           0         2              2015          September
## 1111 Resort Hotel           0       137              2015          September
## 1112 Resort Hotel           0       104              2015          September
## 1113 Resort Hotel           0       172              2015          September
## 1114 Resort Hotel           0       305              2015          September
## 1115 Resort Hotel           0        83              2015          September
## 1116 Resort Hotel           0       173              2015          September
## 1117 Resort Hotel           0       118              2015          September
## 1118 Resort Hotel           0       156              2015          September
## 1119 Resort Hotel           0        21              2015          September
## 1120 Resort Hotel           0       128              2015          September
## 1121 Resort Hotel           0        34              2015          September
## 1122 Resort Hotel           0        19              2015          September
## 1123 Resort Hotel           0        25              2015          September
## 1124 Resort Hotel           0       107              2015          September
## 1125 Resort Hotel           0        11              2015          September
## 1126 Resort Hotel           0        83              2015          September
## 1127 Resort Hotel           0        84              2015          September
## 1128 Resort Hotel           0       135              2015          September
## 1129 Resort Hotel           0        11              2015          September
## 1130 Resort Hotel           0         5              2015          September
## 1131 Resort Hotel           0        99              2015          September
## 1132 Resort Hotel           0       152              2015          September
## 1133 Resort Hotel           0       124              2015          September
## 1134 Resort Hotel           0       354              2015          September
## 1135 Resort Hotel           0       119              2015          September
## 1136 Resort Hotel           0         1              2015          September
## 1137 Resort Hotel           0         0              2015          September
## 1138 Resort Hotel           0         5              2015          September
## 1139 Resort Hotel           0         0              2015          September
## 1140 Resort Hotel           0        46              2015          September
## 1141 Resort Hotel           0         0              2015          September
## 1142 Resort Hotel           0         0              2015          September
## 1143 Resort Hotel           0         0              2015          September
## 1144 Resort Hotel           0         6              2015          September
## 1145 Resort Hotel           0        44              2015          September
## 1146 Resort Hotel           0        42              2015          September
## 1147 Resort Hotel           0        65              2015          September
## 1148 Resort Hotel           0        93              2015          September
## 1149 Resort Hotel           0        72              2015          September
## 1150 Resort Hotel           0        42              2015          September
## 1151 Resort Hotel           0       104              2015          September
## 1152 Resort Hotel           0         1              2015          September
## 1153 Resort Hotel           0        56              2015          September
## 1154 Resort Hotel           0       114              2015          September
## 1155 Resort Hotel           0        85              2015          September
## 1156 Resort Hotel           0        85              2015          September
## 1157 Resort Hotel           0         6              2015          September
## 1158 Resort Hotel           0        78              2015          September
## 1159 Resort Hotel           0         1              2015          September
## 1160 Resort Hotel           0        50              2015          September
## 1161 Resort Hotel           0         0              2015          September
## 1162 Resort Hotel           0       110              2015          September
## 1163 Resort Hotel           0       110              2015          September
## 1164 Resort Hotel           0       110              2015          September
## 1165 Resort Hotel           0       110              2015          September
## 1166 Resort Hotel           0       110              2015          September
## 1167 Resort Hotel           0       138              2015          September
## 1168 Resort Hotel           0       110              2015          September
## 1169 Resort Hotel           0       110              2015          September
## 1170 Resort Hotel           0        87              2015          September
## 1171 Resort Hotel           0       104              2015          September
## 1172 Resort Hotel           0        66              2015          September
## 1173 Resort Hotel           0        34              2015          September
## 1174 Resort Hotel           0       131              2015          September
## 1175 Resort Hotel           0       167              2015          September
## 1176 Resort Hotel           0         7              2015          September
## 1177 Resort Hotel           0         7              2015          September
## 1178 Resort Hotel           0        71              2015          September
## 1179 Resort Hotel           0        48              2015          September
## 1180 Resort Hotel           0        99              2015          September
## 1181 Resort Hotel           0        71              2015          September
## 1182 Resort Hotel           0       127              2015          September
## 1183 Resort Hotel           0       119              2015          September
## 1184 Resort Hotel           0        79              2015          September
## 1185 Resort Hotel           0         4              2015          September
## 1186 Resort Hotel           0        65              2015          September
## 1187 Resort Hotel           0        61              2015          September
## 1188 Resort Hotel           0        33              2015          September
## 1189 Resort Hotel           0        99              2015          September
## 1190 Resort Hotel           0        99              2015          September
## 1191 Resort Hotel           0        85              2015          September
## 1192 Resort Hotel           0       110              2015          September
## 1193 Resort Hotel           0        75              2015          September
## 1194 Resort Hotel           0        33              2015          September
## 1195 Resort Hotel           0        35              2015          September
## 1196 Resort Hotel           0        87              2015          September
## 1197 Resort Hotel           0       128              2015          September
## 1198 Resort Hotel           0        87              2015          September
## 1199 Resort Hotel           0        65              2015          September
## 1200 Resort Hotel           0        83              2015          September
## 1201 Resort Hotel           0        86              2015          September
## 1202 Resort Hotel           0       103              2015          September
## 1203 Resort Hotel           0       125              2015          September
## 1204 Resort Hotel           0       131              2015          September
## 1205 Resort Hotel           0       125              2015          September
## 1206 Resort Hotel           0        93              2015          September
## 1207 Resort Hotel           0       130              2015          September
## 1208 Resort Hotel           0       121              2015          September
## 1209 Resort Hotel           0       185              2015          September
## 1210 Resort Hotel           0       128              2015          September
## 1211 Resort Hotel           0       111              2015          September
## 1212 Resort Hotel           0        94              2015          September
## 1213 Resort Hotel           0        96              2015          September
## 1214 Resort Hotel           0       109              2015          September
## 1215 Resort Hotel           0        65              2015          September
## 1216 Resort Hotel           0       124              2015          September
## 1217 Resort Hotel           0        84              2015          September
## 1218 Resort Hotel           0        95              2015          September
## 1219 Resort Hotel           0        90              2015          September
## 1220 Resort Hotel           0        90              2015          September
## 1221 Resort Hotel           0       112              2015          September
## 1222 Resort Hotel           0       130              2015          September
## 1223 Resort Hotel           0        78              2015          September
## 1224 Resort Hotel           0       158              2015          September
## 1225 Resort Hotel           0       108              2015          September
## 1226 Resort Hotel           0       158              2015          September
## 1227 Resort Hotel           0        70              2015          September
## 1228 Resort Hotel           0        76              2015          September
## 1229 Resort Hotel           0        21              2015          September
## 1230 Resort Hotel           0        21              2015          September
## 1231 Resort Hotel           0        21              2015          September
## 1232 Resort Hotel           0        34              2015          September
## 1233 Resort Hotel           0       119              2015          September
## 1234 Resort Hotel           0         8              2015          September
## 1235 Resort Hotel           0       137              2015          September
## 1236 Resort Hotel           0       154              2015          September
## 1237 Resort Hotel           0        76              2015          September
## 1238 Resort Hotel           0        21              2015          September
## 1239 Resort Hotel           0        71              2015          September
## 1240 Resort Hotel           0        36              2015          September
## 1241 Resort Hotel           0        64              2015          September
## 1242 Resort Hotel           0        29              2015          September
## 1243 Resort Hotel           0        76              2015          September
## 1244 Resort Hotel           0        76              2015          September
## 1245 Resort Hotel           0        75              2015          September
## 1246 Resort Hotel           0       115              2015          September
## 1247 Resort Hotel           0        84              2015          September
## 1248 Resort Hotel           0        77              2015          September
## 1249 Resort Hotel           0         0              2015          September
## 1250 Resort Hotel           0        16              2015          September
## 1251 Resort Hotel           0         2              2015          September
## 1252 Resort Hotel           0        16              2015          September
## 1253 Resort Hotel           0         0              2015          September
## 1254 Resort Hotel           0         9              2015          September
## 1255 Resort Hotel           0         8              2015          September
## 1256 Resort Hotel           0         9              2015          September
## 1257 Resort Hotel           0         8              2015          September
## 1258 Resort Hotel           0        79              2015          September
## 1259 Resort Hotel           0        79              2015          September
## 1260 Resort Hotel           0       119              2015          September
## 1261 Resort Hotel           0        51              2015          September
## 1262 Resort Hotel           0       106              2015          September
## 1263 Resort Hotel           0       119              2015          September
## 1264 Resort Hotel           0        39              2015          September
## 1265 Resort Hotel           0         1              2015          September
## 1266 Resort Hotel           0        10              2015          September
## 1267 Resort Hotel           0        44              2015          September
## 1268 Resort Hotel           0        47              2015          September
## 1269 Resort Hotel           0        64              2015          September
## 1270 Resort Hotel           0        98              2015          September
## 1271 Resort Hotel           0       136              2015          September
## 1272 Resort Hotel           0       116              2015          September
## 1273 Resort Hotel           0        41              2015          September
## 1274 Resort Hotel           0        11              2015          September
## 1275 Resort Hotel           0        32              2015          September
## 1276 Resort Hotel           0        53              2015          September
## 1277 Resort Hotel           0       100              2015          September
## 1278 Resort Hotel           0        73              2015          September
## 1279 Resort Hotel           0       177              2015          September
## 1280 Resort Hotel           0        51              2015          September
## 1281 Resort Hotel           0        47              2015          September
## 1282 Resort Hotel           0       163              2015          September
## 1283 Resort Hotel           0        59              2015          September
## 1284 Resort Hotel           0        97              2015          September
## 1285 Resort Hotel           0        85              2015          September
## 1286 Resort Hotel           0       177              2015          September
## 1287 Resort Hotel           0         0              2015          September
## 1288 Resort Hotel           0         0              2015          September
## 1289 Resort Hotel           0        69              2015          September
## 1290 Resort Hotel           0        56              2015          September
## 1291 Resort Hotel           0        60              2015          September
## 1292 Resort Hotel           0        77              2015          September
## 1293 Resort Hotel           0        53              2015          September
## 1294 Resort Hotel           0        72              2015          September
## 1295 Resort Hotel           0       164              2015          September
## 1296 Resort Hotel           0        54              2015          September
## 1297 Resort Hotel           0       172              2015          September
## 1298 Resort Hotel           0        60              2015          September
## 1299 Resort Hotel           0       165              2015          September
## 1300 Resort Hotel           0        55              2015          September
## 1301 Resort Hotel           0        81              2015          September
## 1302 Resort Hotel           0        96              2015          September
## 1303 Resort Hotel           0        61              2015          September
## 1304 Resort Hotel           0        19              2015          September
## 1305 Resort Hotel           0        50              2015          September
## 1306 Resort Hotel           0         0              2015          September
## 1307 Resort Hotel           0         2              2015          September
## 1308 Resort Hotel           0         2              2015          September
## 1309 Resort Hotel           0         2              2015          September
## 1310 Resort Hotel           0        55              2015          September
## 1311 Resort Hotel           0        56              2015          September
## 1312 Resort Hotel           0         2              2015          September
## 1313 Resort Hotel           0         2              2015          September
## 1314 Resort Hotel           0        55              2015          September
## 1315 Resort Hotel           0        55              2015          September
## 1316 Resort Hotel           0        54              2015          September
## 1317 Resort Hotel           0        51              2015          September
## 1318 Resort Hotel           0        49              2015          September
## 1319 Resort Hotel           0        93              2015          September
## 1320 Resort Hotel           0        48              2015          September
## 1321 Resort Hotel           0        92              2015          September
## 1322 Resort Hotel           0        97              2015          September
## 1323 Resort Hotel           0        48              2015          September
## 1324 Resort Hotel           0        58              2015          September
## 1325 Resort Hotel           0        41              2015          September
## 1326 Resort Hotel           0         0              2015            October
## 1327 Resort Hotel           0        44              2015            October
## 1328 Resort Hotel           0        19              2015            October
## 1329 Resort Hotel           0        57              2015            October
## 1330 Resort Hotel           0        24              2015            October
## 1331 Resort Hotel           0        22              2015            October
## 1332 Resort Hotel           0        51              2015            October
## 1333 Resort Hotel           0        23              2015            October
## 1334 Resort Hotel           0        79              2015            October
## 1335 Resort Hotel           0        48              2015            October
## 1336 Resort Hotel           0        51              2015            October
## 1337 Resort Hotel           0        78              2015            October
## 1338 Resort Hotel           0        24              2015            October
## 1339 Resort Hotel           0        45              2015            October
## 1340 Resort Hotel           0        44              2015            October
## 1341 Resort Hotel           0        78              2015            October
## 1342 Resort Hotel           0        45              2015            October
## 1343 Resort Hotel           0       115              2015            October
## 1344 Resort Hotel           0        50              2015            October
## 1345 Resort Hotel           0        45              2015            October
## 1346 Resort Hotel           0       145              2015            October
## 1347 Resort Hotel           0       113              2015            October
## 1348 Resort Hotel           0       102              2015            October
## 1349 Resort Hotel           0       113              2015            October
## 1350 Resort Hotel           0         0              2015            October
## 1351 Resort Hotel           0        73              2015            October
## 1352 Resort Hotel           0       115              2015            October
## 1353 Resort Hotel           0       115              2015            October
## 1354 Resort Hotel           0        20              2015            October
## 1355 Resort Hotel           0        56              2015            October
## 1356 Resort Hotel           0        50              2015            October
## 1357 Resort Hotel           0        20              2015            October
## 1358 Resort Hotel           0        53              2015            October
## 1359 Resort Hotel           0        46              2015            October
## 1360 Resort Hotel           0        63              2015            October
## 1361 Resort Hotel           0       200              2015            October
## 1362 Resort Hotel           0        56              2015            October
## 1363 Resort Hotel           0        49              2015            October
## 1364 Resort Hotel           0        56              2015            October
## 1365 Resort Hotel           0         0              2015            October
## 1366 Resort Hotel           0       114              2015            October
## 1367 Resort Hotel           0         1              2015            October
## 1368 Resort Hotel           0         5              2015            October
## 1369 Resort Hotel           0         1              2015            October
## 1370 Resort Hotel           0       192              2015            October
## 1371 Resort Hotel           0       192              2015            October
## 1372 Resort Hotel           0       192              2015            October
## 1373 Resort Hotel           0        39              2015            October
## 1374 Resort Hotel           0        25              2015            October
## 1375 Resort Hotel           0       192              2015            October
## 1376 Resort Hotel           0        53              2015            October
## 1377 Resort Hotel           0        19              2015            October
## 1378 Resort Hotel           0        10              2015            October
## 1379 Resort Hotel           0        61              2015            October
## 1380 Resort Hotel           0        70              2015            October
## 1381 Resort Hotel           0        46              2015            October
## 1382 Resort Hotel           0        38              2015            October
## 1383 Resort Hotel           0        53              2015            October
## 1384 Resort Hotel           0        51              2015            October
## 1385 Resort Hotel           0       124              2015            October
## 1386 Resort Hotel           0        25              2015            October
## 1387 Resort Hotel           0        53              2015            October
## 1388 Resort Hotel           0        14              2015            October
## 1389 Resort Hotel           0       163              2015            October
## 1390 Resort Hotel           0         2              2015            October
## 1391 Resort Hotel           0         1              2015            October
## 1392 Resort Hotel           0         0              2015            October
## 1393 Resort Hotel           0         0              2015            October
## 1394 Resort Hotel           0        81              2015            October
## 1395 Resort Hotel           0        26              2015            October
## 1396 Resort Hotel           0        75              2015            October
## 1397 Resort Hotel           0        54              2015            October
## 1398 Resort Hotel           0        69              2015            October
## 1399 Resort Hotel           0        69              2015            October
## 1400 Resort Hotel           0        90              2015            October
## 1401 Resort Hotel           0       111              2015            October
## 1402 Resort Hotel           0        18              2015            October
## 1403 Resort Hotel           0         7              2015            October
## 1404 Resort Hotel           0         1              2015            October
## 1405 Resort Hotel           0        69              2015            October
## 1406 Resort Hotel           0        10              2015            October
## 1407 Resort Hotel           0        55              2015            October
## 1408 Resort Hotel           0        10              2015            October
## 1409 Resort Hotel           0        52              2015            October
## 1410 Resort Hotel           0        14              2015            October
## 1411 Resort Hotel           0        17              2015            October
## 1412 Resort Hotel           0       207              2015            October
## 1413 Resort Hotel           0         0              2015            October
## 1414 Resort Hotel           0        70              2015            October
## 1415 Resort Hotel           0         0              2015            October
## 1416 Resort Hotel           0        43              2015            October
## 1417 Resort Hotel           0         3              2015            October
## 1418 Resort Hotel           0        31              2015            October
## 1419 Resort Hotel           0        87              2015            October
## 1420 Resort Hotel           0        84              2015            October
## 1421 Resort Hotel           0       123              2015            October
## 1422 Resort Hotel           0        13              2015            October
## 1423 Resort Hotel           0        33              2015            October
## 1424 Resort Hotel           0        13              2015            October
## 1425 Resort Hotel           0        21              2015            October
## 1426 Resort Hotel           0         0              2015            October
## 1427 Resort Hotel           0         2              2015            October
## 1428 Resort Hotel           0         6              2015            October
## 1429 Resort Hotel           0        78              2015            October
## 1430 Resort Hotel           0        21              2015            October
## 1431 Resort Hotel           0       175              2015            October
## 1432 Resort Hotel           0       158              2015            October
## 1433 Resort Hotel           0        11              2015            October
## 1434 Resort Hotel           0       158              2015            October
## 1435 Resort Hotel           0       174              2015            October
## 1436 Resort Hotel           0       174              2015            October
## 1437 Resort Hotel           0        13              2015            October
## 1438 Resort Hotel           0         3              2015            October
## 1439 Resort Hotel           0         3              2015            October
## 1440 Resort Hotel           0         3              2015            October
## 1441 Resort Hotel           0        33              2015            October
## 1442 Resort Hotel           0         3              2015            October
## 1443 Resort Hotel           0        44              2015            October
## 1444 Resort Hotel           0        77              2015            October
## 1445 Resort Hotel           0        10              2015            October
## 1446 Resort Hotel           0        44              2015            October
## 1447 Resort Hotel           0        76              2015            October
## 1448 Resort Hotel           0        71              2015            October
## 1449 Resort Hotel           0         9              2015            October
## 1450 Resort Hotel           0        33              2015            October
## 1451 Resort Hotel           0         3              2015            October
## 1452 Resort Hotel           0        77              2015            October
## 1453 Resort Hotel           0        59              2015            October
## 1454 Resort Hotel           0        77              2015            October
## 1455 Resort Hotel           0         3              2015            October
## 1456 Resort Hotel           0        71              2015            October
## 1457 Resort Hotel           0        29              2015            October
## 1458 Resort Hotel           0        10              2015            October
## 1459 Resort Hotel           0        22              2015            October
## 1460 Resort Hotel           0       132              2015            October
## 1461 Resort Hotel           0        10              2015            October
## 1462 Resort Hotel           0        94              2015            October
## 1463 Resort Hotel           0       128              2015            October
## 1464 Resort Hotel           0         1              2015            October
## 1465 Resort Hotel           0        16              2015            October
## 1466 Resort Hotel           0         1              2015            October
## 1467 Resort Hotel           0        77              2015            October
## 1468 Resort Hotel           0        77              2015            October
## 1469 Resort Hotel           0        34              2015            October
## 1470 Resort Hotel           0         4              2015            October
## 1471 Resort Hotel           0        77              2015            October
## 1472 Resort Hotel           0        63              2015            October
## 1473 Resort Hotel           0         8              2015            October
## 1474 Resort Hotel           0         4              2015            October
## 1475 Resort Hotel           0        77              2015            October
## 1476 Resort Hotel           0        67              2015            October
## 1477 Resort Hotel           0        21              2015            October
## 1478 Resort Hotel           0        13              2015            October
## 1479 Resort Hotel           0        63              2015            October
## 1480 Resort Hotel           0         9              2015            October
## 1481 Resort Hotel           0         3              2015            October
## 1482 Resort Hotel           0        63              2015            October
## 1483 Resort Hotel           0        14              2015            October
## 1484 Resort Hotel           0         8              2015            October
## 1485 Resort Hotel           0        25              2015            October
## 1486 Resort Hotel           0        22              2015            October
## 1487 Resort Hotel           0         0              2015            October
## 1488 Resort Hotel           0        22              2015            October
## 1489 Resort Hotel           0        10              2015            October
## 1490 Resort Hotel           0         4              2015            October
## 1491 Resort Hotel           0         7              2015            October
## 1492 Resort Hotel           0       350              2015            October
## 1493 Resort Hotel           0        11              2015            October
## 1494 Resort Hotel           0        11              2015            October
## 1495 Resort Hotel           0         5              2015            October
## 1496 Resort Hotel           0        12              2015            October
## 1497 Resort Hotel           0         4              2015            October
## 1498 Resort Hotel           0         5              2015            October
## 1499 Resort Hotel           0        12              2015            October
## 1500 Resort Hotel           0        11              2015            October
## 1501 Resort Hotel           0         4              2015            October
## 1502 Resort Hotel           0         5              2015            October
## 1503 Resort Hotel           0        19              2015            October
## 1504 Resort Hotel           0         5              2015            October
## 1505 Resort Hotel           0         4              2015            October
## 1506 Resort Hotel           0         4              2015            October
## 1507 Resort Hotel           0         5              2015            October
## 1508 Resort Hotel           0        12              2015            October
## 1509 Resort Hotel           0        16              2015            October
## 1510 Resort Hotel           0         0              2015            October
## 1511 Resort Hotel           0        78              2015            October
## 1512 Resort Hotel           0        78              2015            October
## 1513 Resort Hotel           0         2              2015            October
## 1514 Resort Hotel           0         2              2015            October
## 1515 Resort Hotel           0         2              2015            October
## 1516 Resort Hotel           0        39              2015            October
## 1517 Resort Hotel           0         0              2015            October
## 1518 Resort Hotel           0         9              2015            October
## 1519 Resort Hotel           0         6              2015            October
## 1520 Resort Hotel           0         5              2015            October
## 1521 Resort Hotel           0         2              2015            October
## 1522 Resort Hotel           0         1              2015            October
## 1523 Resort Hotel           0         1              2015            October
## 1524 Resort Hotel           0        41              2015            October
## 1525 Resort Hotel           0        83              2015            October
## 1526 Resort Hotel           0        13              2015            October
## 1527 Resort Hotel           0         5              2015            October
## 1528 Resort Hotel           0         5              2015            October
## 1529 Resort Hotel           0         5              2015            October
## 1530 Resort Hotel           0         0              2015            October
## 1531 Resort Hotel           0        13              2015            October
## 1532 Resort Hotel           0        13              2015            October
## 1533 Resort Hotel           0        20              2015            October
## 1534 Resort Hotel           0         0              2015            October
## 1535 Resort Hotel           0         2              2015            October
## 1536 Resort Hotel           0         4              2015            October
## 1537 Resort Hotel           0         6              2015            October
## 1538 Resort Hotel           0       283              2015            October
## 1539 Resort Hotel           0        19              2015            October
## 1540 Resort Hotel           0         1              2015            October
## 1541 Resort Hotel           0         1              2015            October
## 1542 Resort Hotel           0         0              2015            October
## 1543 Resort Hotel           0        17              2015            October
## 1544 Resort Hotel           0         0              2015            October
## 1545 Resort Hotel           0         0              2015            October
## 1546 Resort Hotel           0        56              2015            October
## 1547 Resort Hotel           0        73              2015            October
## 1548 Resort Hotel           0        32              2015            October
## 1549 Resort Hotel           0         1              2015            October
## 1550 Resort Hotel           0         2              2015            October
## 1551 Resort Hotel           0         0              2015            October
## 1552 Resort Hotel           0         1              2015            October
## 1553 Resort Hotel           0         0              2015            October
## 1554 Resort Hotel           0         2              2015            October
## 1555 Resort Hotel           0       106              2015            October
## 1556 Resort Hotel           0         7              2015            October
## 1557 Resort Hotel           0         7              2015            October
## 1558 Resort Hotel           0        27              2015            October
## 1559 Resort Hotel           0       150              2015            October
## 1560 Resort Hotel           0       153              2015            October
## 1561 Resort Hotel           0       153              2015            October
## 1562 Resort Hotel           0       153              2015            October
## 1563 Resort Hotel           0         0              2015            October
## 1564 Resort Hotel           0         8              2015            October
## 1565 Resort Hotel           0         1              2015            October
## 1566 Resort Hotel           0         8              2015            October
## 1567 Resort Hotel           0       130              2015            October
## 1568 Resort Hotel           0        88              2015            October
## 1569 Resort Hotel           0        88              2015            October
## 1570 Resort Hotel           0         0              2015            October
## 1571 Resort Hotel           0        25              2015            October
## 1572 Resort Hotel           0         2              2015            October
## 1573 Resort Hotel           0       136              2015            October
## 1574 Resort Hotel           0        95              2015            October
## 1575 Resort Hotel           0         9              2015            October
## 1576 Resort Hotel           0        17              2015            October
## 1577 Resort Hotel           0        74              2015            October
## 1578 Resort Hotel           0        47              2015            October
## 1579 Resort Hotel           0        41              2015            October
## 1580 Resort Hotel           0        86              2015            October
## 1581 Resort Hotel           0        68              2015            October
## 1582 Resort Hotel           0        80              2015            October
## 1583 Resort Hotel           0         5              2015            October
## 1584 Resort Hotel           0         0              2015            October
## 1585 Resort Hotel           0         7              2015            October
## 1586 Resort Hotel           0         7              2015            October
## 1587 Resort Hotel           0         0              2015            October
## 1588 Resort Hotel           0         7              2015            October
## 1589 Resort Hotel           0        10              2015            October
## 1590 Resort Hotel           0        34              2015            October
## 1591 Resort Hotel           0        10              2015            October
## 1592 Resort Hotel           0        73              2015            October
## 1593 Resort Hotel           0        47              2015            October
## 1594 Resort Hotel           0        47              2015            October
## 1595 Resort Hotel           0        47              2015            October
## 1596 Resort Hotel           0         5              2015            October
## 1597 Resort Hotel           0        47              2015            October
## 1598 Resort Hotel           0        47              2015            October
## 1599 Resort Hotel           0        47              2015            October
## 1600 Resort Hotel           0        47              2015            October
## 1601 Resort Hotel           0        47              2015            October
## 1602 Resort Hotel           0        47              2015            October
## 1603 Resort Hotel           0        47              2015            October
## 1604 Resort Hotel           0        47              2015            October
## 1605 Resort Hotel           0        47              2015            October
## 1606 Resort Hotel           0        47              2015            October
## 1607 Resort Hotel           0        47              2015            October
## 1608 Resort Hotel           0        47              2015            October
## 1609 Resort Hotel           0        47              2015            October
## 1610 Resort Hotel           0        47              2015            October
## 1611 Resort Hotel           0       124              2015            October
## 1612 Resort Hotel           0        47              2015            October
## 1613 Resort Hotel           0        47              2015            October
## 1614 Resort Hotel           0        47              2015            October
## 1615 Resort Hotel           0         3              2015            October
## 1616 Resort Hotel           0        47              2015            October
## 1617 Resort Hotel           0        86              2015            October
## 1618 Resort Hotel           0        69              2015            October
## 1619 Resort Hotel           0        75              2015            October
## 1620 Resort Hotel           0       118              2015            October
## 1621 Resort Hotel           0        60              2015            October
## 1622 Resort Hotel           0         0              2015            October
## 1623 Resort Hotel           0         0              2015            October
## 1624 Resort Hotel           0         0              2015            October
## 1625 Resort Hotel           0        99              2015            October
## 1626 Resort Hotel           0        12              2015            October
## 1627 Resort Hotel           0        75              2015            October
## 1628 Resort Hotel           0        22              2015            October
## 1629 Resort Hotel           0        40              2015            October
## 1630 Resort Hotel           0       108              2015            October
## 1631 Resort Hotel           0        75              2015            October
## 1632 Resort Hotel           0        75              2015            October
## 1633 Resort Hotel           0         0              2015            October
## 1634 Resort Hotel           0       121              2015            October
## 1635 Resort Hotel           0        19              2015            October
## 1636 Resort Hotel           0        28              2015            October
## 1637 Resort Hotel           0        83              2015            October
## 1638 Resort Hotel           0        40              2015            October
## 1639 Resort Hotel           0        83              2015            October
## 1640 Resort Hotel           0        54              2015            October
## 1641 Resort Hotel           0        86              2015            October
## 1642 Resort Hotel           0        34              2015            October
## 1643 Resort Hotel           0        48              2015            October
## 1644 Resort Hotel           0        92              2015            October
## 1645 Resort Hotel           0       160              2015            October
## 1646 Resort Hotel           0        21              2015            October
## 1647 Resort Hotel           0        21              2015            October
## 1648 Resort Hotel           0        92              2015            October
## 1649 Resort Hotel           0        24              2015            October
## 1650 Resort Hotel           0        36              2015            October
## 1651 Resort Hotel           0        24              2015            October
## 1652 Resort Hotel           0        47              2015            October
## 1653 Resort Hotel           0        21              2015            October
## 1654 Resort Hotel           0        21              2015            October
## 1655 Resort Hotel           0         0              2015            October
## 1656 Resort Hotel           0       133              2015            October
## 1657 Resort Hotel           0       122              2015            October
## 1658 Resort Hotel           0        92              2015            October
## 1659 Resort Hotel           0       120              2015            October
## 1660 Resort Hotel           0       122              2015            October
## 1661 Resort Hotel           0       122              2015            October
## 1662 Resort Hotel           0       122              2015            October
## 1663 Resort Hotel           0       122              2015            October
## 1664 Resort Hotel           0        19              2015            October
## 1665 Resort Hotel           0        24              2015            October
## 1666 Resort Hotel           0        21              2015            October
## 1667 Resort Hotel           0        21              2015            October
## 1668 Resort Hotel           0        52              2015            October
## 1669 Resort Hotel           0        61              2015            October
## 1670 Resort Hotel           0        24              2015            October
## 1671 Resort Hotel           0        24              2015            October
## 1672 Resort Hotel           0        24              2015            October
## 1673 Resort Hotel           0        24              2015            October
## 1674 Resort Hotel           0        29              2015            October
## 1675 Resort Hotel           0         4              2015            October
## 1676 Resort Hotel           0        10              2015            October
## 1677 Resort Hotel           0         0              2015            October
## 1678 Resort Hotel           0         1              2015            October
## 1679 Resort Hotel           0        30              2015            October
## 1680 Resort Hotel           0        29              2015            October
## 1681 Resort Hotel           0        11              2015            October
## 1682 Resort Hotel           0        29              2015            October
## 1683 Resort Hotel           0         0              2015            October
## 1684 Resort Hotel           0         3              2015            October
## 1685 Resort Hotel           0        29              2015            October
## 1686 Resort Hotel           0         0              2015            October
## 1687 Resort Hotel           0        93              2015            October
## 1688 Resort Hotel           0        39              2015            October
## 1689 Resort Hotel           0        93              2015            October
## 1690 Resort Hotel           0       119              2015            October
## 1691 Resort Hotel           0       119              2015            October
## 1692 Resort Hotel           0        73              2015            October
## 1693 Resort Hotel           0        51              2015            October
## 1694 Resort Hotel           0        27              2015            October
## 1695 Resort Hotel           0        22              2015            October
## 1696 Resort Hotel           0        72              2015            October
## 1697 Resort Hotel           0        23              2015            October
## 1698 Resort Hotel           0        13              2015            October
## 1699 Resort Hotel           0        39              2015            October
## 1700 Resort Hotel           0       163              2015            October
## 1701 Resort Hotel           0        30              2015            October
## 1702 Resort Hotel           0        11              2015            October
## 1703 Resort Hotel           0         0              2015            October
## 1704 Resort Hotel           0         3              2015            October
## 1705 Resort Hotel           0         9              2015            October
## 1706 Resort Hotel           0        50              2015            October
## 1707 Resort Hotel           0         5              2015            October
## 1708 Resort Hotel           0        98              2015            October
## 1709 Resort Hotel           0        96              2015            October
## 1710 Resort Hotel           0        50              2015            October
## 1711 Resort Hotel           0       120              2015            October
## 1712 Resort Hotel           0         9              2015            October
## 1713 Resort Hotel           0        28              2015            October
## 1714 Resort Hotel           0         1              2015            October
## 1715 Resort Hotel           0       115              2015            October
## 1716 Resort Hotel           0        62              2015            October
## 1717 Resort Hotel           0        68              2015            October
## 1718 Resort Hotel           0        62              2015            October
## 1719 Resort Hotel           0         9              2015            October
## 1720 Resort Hotel           0        35              2015            October
## 1721 Resort Hotel           0         1              2015            October
## 1722 Resort Hotel           0        60              2015            October
## 1723 Resort Hotel           0        24              2015            October
## 1724 Resort Hotel           0         3              2015            October
## 1725 Resort Hotel           0         0              2015            October
## 1726 Resort Hotel           0         0              2015            October
## 1727 Resort Hotel           0         0              2015            October
## 1728 Resort Hotel           0         0              2015            October
## 1729 Resort Hotel           0         3              2015            October
## 1730 Resort Hotel           0        10              2015            October
## 1731 Resort Hotel           0         0              2015            October
## 1732 Resort Hotel           0         0              2015            October
## 1733 Resort Hotel           0        10              2015            October
## 1734 Resort Hotel           0         1              2015            October
## 1735 Resort Hotel           0        34              2015            October
## 1736 Resort Hotel           0        42              2015            October
## 1737 Resort Hotel           0         3              2015            October
## 1738 Resort Hotel           0        61              2015            October
## 1739 Resort Hotel           0         0              2015            October
## 1740 Resort Hotel           0         2              2015            October
## 1741 Resort Hotel           0        19              2015            October
## 1742 Resort Hotel           0         0              2015            October
## 1743 Resort Hotel           0        49              2015            October
## 1744 Resort Hotel           0        49              2015            October
## 1745 Resort Hotel           0        49              2015            October
## 1746 Resort Hotel           0        49              2015            October
## 1747 Resort Hotel           0         0              2015            October
## 1748 Resort Hotel           0         2              2015            October
## 1749 Resort Hotel           0         1              2015            October
## 1750 Resort Hotel           0         1              2015            October
## 1751 Resort Hotel           0         2              2015            October
## 1752 Resort Hotel           0         2              2015            October
## 1753 Resort Hotel           0         3              2015            October
## 1754 Resort Hotel           0         3              2015            October
## 1755 Resort Hotel           0         2              2015            October
## 1756 Resort Hotel           0         3              2015            October
## 1757 Resort Hotel           0       153              2015            October
## 1758 Resort Hotel           0       153              2015            October
## 1759 Resort Hotel           0       153              2015            October
## 1760 Resort Hotel           0         1              2015            October
## 1761 Resort Hotel           0         2              2015            October
## 1762 Resort Hotel           0        16              2015            October
## 1763 Resort Hotel           0         1              2015            October
## 1764 Resort Hotel           0       154              2015            October
## 1765 Resort Hotel           0       154              2015            October
## 1766 Resort Hotel           0        25              2015            October
## 1767 Resort Hotel           0         3              2015            October
## 1768 Resort Hotel           0       154              2015            October
## 1769 Resort Hotel           0        13              2015            October
## 1770 Resort Hotel           0         6              2015            October
## 1771 Resort Hotel           0         1              2015            October
## 1772 Resort Hotel           0         3              2015            October
## 1773 Resort Hotel           0         3              2015            October
## 1774 Resort Hotel           0         4              2015            October
## 1775 Resort Hotel           0        11              2015            October
## 1776 Resort Hotel           0        11              2015            October
## 1777 Resort Hotel           0       154              2015            October
## 1778 Resort Hotel           0         4              2015            October
## 1779 Resort Hotel           0        45              2015            October
## 1780 Resort Hotel           0        11              2015            October
## 1781 Resort Hotel           0         7              2015            October
## 1782 Resort Hotel           0        85              2015            October
## 1783 Resort Hotel           0         4              2015            October
## 1784 Resort Hotel           0        10              2015            October
## 1785 Resort Hotel           0        12              2015            October
## 1786 Resort Hotel           0         5              2015            October
## 1787 Resort Hotel           0       155              2015            October
## 1788 Resort Hotel           0       155              2015            October
## 1789 Resort Hotel           0         4              2015            October
## 1790 Resort Hotel           0         4              2015            October
## 1791 Resort Hotel           0         0              2015            October
## 1792 Resort Hotel           0         3              2015            October
## 1793 Resort Hotel           0         8              2015            October
## 1794 Resort Hotel           0         0              2015            October
## 1795 Resort Hotel           0         1              2015            October
## 1796 Resort Hotel           0       155              2015            October
## 1797 Resort Hotel           0       155              2015            October
## 1798 Resort Hotel           0       155              2015            October
## 1799 Resort Hotel           0         4              2015            October
## 1800 Resort Hotel           0         3              2015            October
## 1801 Resort Hotel           0         4              2015            October
## 1802 Resort Hotel           0        54              2015            October
## 1803 Resort Hotel           0         3              2015            October
## 1804 Resort Hotel           0         1              2015            October
## 1805 Resort Hotel           0         0              2015            October
## 1806 Resort Hotel           0       155              2015            October
## 1807 Resort Hotel           0       155              2015            October
## 1808 Resort Hotel           0         0              2015            October
## 1809 Resort Hotel           0       155              2015            October
## 1810 Resort Hotel           0       155              2015            October
## 1811 Resort Hotel           0       155              2015            October
## 1812 Resort Hotel           0         2              2015            October
## 1813 Resort Hotel           0         2              2015            October
## 1814 Resort Hotel           0        12              2015            October
## 1815 Resort Hotel           0       155              2015            October
## 1816 Resort Hotel           0         0              2015            October
## 1817 Resort Hotel           0       155              2015            October
## 1818 Resort Hotel           0         0              2015            October
## 1819 Resort Hotel           0        25              2015            October
## 1820 Resort Hotel           0        39              2015            October
## 1821 Resort Hotel           0         5              2015            October
## 1822 Resort Hotel           0         4              2015           November
## 1823 Resort Hotel           0         5              2015           November
## 1824 Resort Hotel           0         1              2015           November
## 1825 Resort Hotel           0        76              2015           November
## 1826 Resort Hotel           0       146              2015           November
## 1827 Resort Hotel           0        83              2015           November
## 1828 Resort Hotel           0        39              2015           November
## 1829 Resort Hotel           0        24              2015           November
## 1830 Resort Hotel           0         1              2015           November
## 1831 Resort Hotel           0         0              2015           November
## 1832 Resort Hotel           0        20              2015           November
## 1833 Resort Hotel           0        20              2015           November
## 1834 Resort Hotel           0        21              2015           November
## 1835 Resort Hotel           0        36              2015           November
## 1836 Resort Hotel           0         5              2015           November
## 1837 Resort Hotel           0         5              2015           November
## 1838 Resort Hotel           0         0              2015           November
## 1839 Resort Hotel           0         0              2015           November
## 1840 Resort Hotel           0         7              2015           November
## 1841 Resort Hotel           0         0              2015           November
## 1842 Resort Hotel           0        24              2015           November
## 1843 Resort Hotel           0         6              2015           November
## 1844 Resort Hotel           0        26              2015           November
## 1845 Resort Hotel           0         3              2015           November
## 1846 Resort Hotel           0        49              2015           November
## 1847 Resort Hotel           0        25              2015           November
## 1848 Resort Hotel           0         6              2015           November
## 1849 Resort Hotel           0         8              2015           November
## 1850 Resort Hotel           0        24              2015           November
## 1851 Resort Hotel           0        24              2015           November
## 1852 Resort Hotel           0        24              2015           November
## 1853 Resort Hotel           0        24              2015           November
## 1854 Resort Hotel           0        24              2015           November
## 1855 Resort Hotel           0        24              2015           November
## 1856 Resort Hotel           0        24              2015           November
## 1857 Resort Hotel           0        24              2015           November
## 1858 Resort Hotel           0         1              2015           November
## 1859 Resort Hotel           0         2              2015           November
## 1860 Resort Hotel           0         2              2015           November
## 1861 Resort Hotel           0         0              2015           November
## 1862 Resort Hotel           0        33              2015           November
## 1863 Resort Hotel           0         0              2015           November
## 1864 Resort Hotel           0         0              2015           November
## 1865 Resort Hotel           0         0              2015           November
## 1866 Resort Hotel           0        28              2015           November
## 1867 Resort Hotel           0        28              2015           November
## 1868 Resort Hotel           0        34              2015           November
## 1869 Resort Hotel           0        65              2015           November
## 1870 Resort Hotel           0        34              2015           November
## 1871 Resort Hotel           0        11              2015           November
## 1872 Resort Hotel           0         1              2015           November
## 1873 Resort Hotel           0         4              2015           November
## 1874 Resort Hotel           0         0              2015           November
## 1875 Resort Hotel           0        15              2015           November
## 1876 Resort Hotel           0         0              2015           November
## 1877 Resort Hotel           0        38              2015           November
## 1878 Resort Hotel           0         0              2015           November
## 1879 Resort Hotel           0        91              2015           November
## 1880 Resort Hotel           0        27              2015           November
## 1881 Resort Hotel           0        35              2015           November
## 1882 Resort Hotel           0        35              2015           November
## 1883 Resort Hotel           0        35              2015           November
## 1884 Resort Hotel           0        35              2015           November
## 1885 Resort Hotel           0        27              2015           November
## 1886 Resort Hotel           0        35              2015           November
## 1887 Resort Hotel           0        54              2015           November
## 1888 Resort Hotel           0         0              2015           November
## 1889 Resort Hotel           0        25              2015           November
## 1890 Resort Hotel           0         0              2015           November
## 1891 Resort Hotel           0         4              2015           November
## 1892 Resort Hotel           0         0              2015           November
## 1893 Resort Hotel           0         4              2015           November
## 1894 Resort Hotel           0        18              2015           November
## 1895 Resort Hotel           0        18              2015           November
## 1896 Resort Hotel           0        51              2015           November
## 1897 Resort Hotel           0        54              2015           November
## 1898 Resort Hotel           0        36              2015           November
## 1899 Resort Hotel           0       171              2015           November
## 1900 Resort Hotel           0        36              2015           November
## 1901 Resort Hotel           0        36              2015           November
## 1902 Resort Hotel           0        28              2015           November
## 1903 Resort Hotel           0        36              2015           November
## 1904 Resort Hotel           0        36              2015           November
## 1905 Resort Hotel           0        36              2015           November
## 1906 Resort Hotel           0        36              2015           November
## 1907 Resort Hotel           0        96              2015           November
## 1908 Resort Hotel           0        11              2015           November
## 1909 Resort Hotel           0         0              2015           November
## 1910 Resort Hotel           0        10              2015           November
## 1911 Resort Hotel           0        17              2015           November
## 1912 Resort Hotel           0        37              2015           November
## 1913 Resort Hotel           0        37              2015           November
## 1914 Resort Hotel           0        17              2015           November
## 1915 Resort Hotel           0        29              2015           November
## 1916 Resort Hotel           0        37              2015           November
## 1917 Resort Hotel           0        37              2015           November
## 1918 Resort Hotel           0        89              2015           November
## 1919 Resort Hotel           0         3              2015           November
## 1920 Resort Hotel           0         3              2015           November
## 1921 Resort Hotel           0         5              2015           November
## 1922 Resort Hotel           0         0              2015           November
## 1923 Resort Hotel           0         0              2015           November
## 1924 Resort Hotel           0        11              2015           November
## 1925 Resort Hotel           0        14              2015           November
## 1926 Resort Hotel           0         2              2015           November
## 1927 Resort Hotel           0        79              2015           November
## 1928 Resort Hotel           0        79              2015           November
## 1929 Resort Hotel           0        49              2015           November
## 1930 Resort Hotel           0       164              2015           November
## 1931 Resort Hotel           0        50              2015           November
## 1932 Resort Hotel           0         0              2015           November
## 1933 Resort Hotel           0        36              2015           November
## 1934 Resort Hotel           0         0              2015           November
## 1935 Resort Hotel           0         6              2015           November
## 1936 Resort Hotel           0        32              2015           November
## 1937 Resort Hotel           0        60              2015           November
## 1938 Resort Hotel           0       166              2015           November
## 1939 Resort Hotel           0         0              2015           November
## 1940 Resort Hotel           0        53              2015           November
## 1941 Resort Hotel           0        60              2015           November
## 1942 Resort Hotel           0        61              2015           November
## 1943 Resort Hotel           0        40              2015           November
## 1944 Resort Hotel           0        56              2015           November
## 1945 Resort Hotel           0        32              2015           November
## 1946 Resort Hotel           0       166              2015           November
## 1947 Resort Hotel           0        56              2015           November
## 1948 Resort Hotel           0        60              2015           November
## 1949 Resort Hotel           0        39              2015           November
## 1950 Resort Hotel           0       103              2015           November
## 1951 Resort Hotel           0        32              2015           November
## 1952 Resort Hotel           0        49              2015           November
## 1953 Resort Hotel           0        33              2015           November
## 1954 Resort Hotel           0        41              2015           November
## 1955 Resort Hotel           0        33              2015           November
## 1956 Resort Hotel           0        70              2015           November
## 1957 Resort Hotel           0        33              2015           November
## 1958 Resort Hotel           0        21              2015           November
## 1959 Resort Hotel           0        33              2015           November
## 1960 Resort Hotel           0        21              2015           November
## 1961 Resort Hotel           0        33              2015           November
## 1962 Resort Hotel           0        49              2015           November
## 1963 Resort Hotel           0         2              2015           November
## 1964 Resort Hotel           0        33              2015           November
## 1965 Resort Hotel           0         3              2015           November
## 1966 Resort Hotel           0         2              2015           November
## 1967 Resort Hotel           0        21              2015           November
## 1968 Resort Hotel           0        33              2015           November
## 1969 Resort Hotel           0        82              2015           November
## 1970 Resort Hotel           0        33              2015           November
## 1971 Resort Hotel           0        42              2015           November
## 1972 Resort Hotel           0        42              2015           November
## 1973 Resort Hotel           0         2              2015           November
## 1974 Resort Hotel           0         1              2015           November
## 1975 Resort Hotel           0        31              2015           November
## 1976 Resort Hotel           0         3              2015           November
## 1977 Resort Hotel           0         2              2015           November
## 1978 Resort Hotel           0        15              2015           November
## 1979 Resort Hotel           0         5              2015           November
## 1980 Resort Hotel           0        94              2015           November
## 1981 Resort Hotel           0        10              2015           November
## 1982 Resort Hotel           0        79              2015           November
## 1983 Resort Hotel           0        74              2015           November
## 1984 Resort Hotel           0        74              2015           November
## 1985 Resort Hotel           0         0              2015           November
## 1986 Resort Hotel           0         0              2015           November
## 1987 Resort Hotel           0        28              2015           November
## 1988 Resort Hotel           0        46              2015           November
## 1989 Resort Hotel           0        16              2015           November
## 1990 Resort Hotel           0       193              2015           November
## 1991 Resort Hotel           0       105              2015           November
## 1992 Resort Hotel           0       105              2015           November
## 1993 Resort Hotel           0       105              2015           November
## 1994 Resort Hotel           0        62              2015           November
## 1995 Resort Hotel           0       105              2015           November
## 1996 Resort Hotel           0       105              2015           November
## 1997 Resort Hotel           0       105              2015           November
## 1998 Resort Hotel           0        62              2015           November
## 1999 Resort Hotel           0       105              2015           November
## 2000 Resort Hotel           0       105              2015           November
## 2001 Resort Hotel           0       105              2015           November
## 2002 Resort Hotel           0       105              2015           November
## 2003 Resort Hotel           0       105              2015           November
## 2004 Resort Hotel           0       105              2015           November
## 2005 Resort Hotel           0       105              2015           November
## 2006 Resort Hotel           0        12              2015           November
## 2007 Resort Hotel           0       105              2015           November
## 2008 Resort Hotel           0       105              2015           November
## 2009 Resort Hotel           0       105              2015           November
## 2010 Resort Hotel           0        62              2015           November
## 2011 Resort Hotel           0        62              2015           November
## 2012 Resort Hotel           0       105              2015           November
## 2013 Resort Hotel           0        62              2015           November
## 2014 Resort Hotel           0       105              2015           November
## 2015 Resort Hotel           0       105              2015           November
## 2016 Resort Hotel           0       163              2015           November
## 2017 Resort Hotel           0        10              2015           November
## 2018 Resort Hotel           0        19              2015           November
## 2019 Resort Hotel           0        45              2015           November
## 2020 Resort Hotel           0        16              2015           November
## 2021 Resort Hotel           0        50              2015           November
## 2022 Resort Hotel           0        50              2015           November
## 2023 Resort Hotel           0        36              2015           November
## 2024 Resort Hotel           0        36              2015           November
## 2025 Resort Hotel           0        36              2015           November
## 2026 Resort Hotel           0        36              2015           November
## 2027 Resort Hotel           0        36              2015           November
## 2028 Resort Hotel           0        36              2015           November
## 2029 Resort Hotel           0        39              2015           November
## 2030 Resort Hotel           0        36              2015           November
## 2031 Resort Hotel           0        36              2015           November
## 2032 Resort Hotel           0        36              2015           November
## 2033 Resort Hotel           0         8              2015           November
## 2034 Resort Hotel           0        36              2015           November
## 2035 Resort Hotel           0        36              2015           November
## 2036 Resort Hotel           0        36              2015           November
## 2037 Resort Hotel           0        36              2015           November
## 2038 Resort Hotel           0        36              2015           November
## 2039 Resort Hotel           0        24              2015           November
## 2040 Resort Hotel           0        24              2015           November
## 2041 Resort Hotel           0        24              2015           November
## 2042 Resort Hotel           0        78              2015           November
## 2043 Resort Hotel           0        78              2015           November
## 2044 Resort Hotel           0        78              2015           November
## 2045 Resort Hotel           0        78              2015           November
## 2046 Resort Hotel           0        78              2015           November
## 2047 Resort Hotel           0        78              2015           November
## 2048 Resort Hotel           0        78              2015           November
## 2049 Resort Hotel           0        24              2015           November
## 2050 Resort Hotel           0        24              2015           November
## 2051 Resort Hotel           0        24              2015           November
## 2052 Resort Hotel           0        15              2015           November
## 2053 Resort Hotel           0        78              2015           November
## 2054 Resort Hotel           0        78              2015           November
## 2055 Resort Hotel           0        78              2015           November
## 2056 Resort Hotel           0        78              2015           November
## 2057 Resort Hotel           0        78              2015           November
## 2058 Resort Hotel           0        78              2015           November
## 2059 Resort Hotel           0        24              2015           November
## 2060 Resort Hotel           0        24              2015           November
## 2061 Resort Hotel           0        44              2015           November
## 2062 Resort Hotel           0        15              2015           November
## 2063 Resort Hotel           0       124              2015           November
## 2064 Resort Hotel           0        44              2015           November
## 2065 Resort Hotel           0        78              2015           November
## 2066 Resort Hotel           0        78              2015           November
## 2067 Resort Hotel           0        78              2015           November
## 2068 Resort Hotel           0        24              2015           November
## 2069 Resort Hotel           0        24              2015           November
## 2070 Resort Hotel           0        78              2015           November
## 2071 Resort Hotel           0        78              2015           November
## 2072 Resort Hotel           0        78              2015           November
## 2073 Resort Hotel           0        15              2015           November
## 2074 Resort Hotel           0        78              2015           November
## 2075 Resort Hotel           0        78              2015           November
## 2076 Resort Hotel           0        78              2015           November
## 2077 Resort Hotel           0        33              2015           November
## 2078 Resort Hotel           0        15              2015           November
## 2079 Resort Hotel           0        15              2015           November
## 2080 Resort Hotel           0        24              2015           November
## 2081 Resort Hotel           0        40              2015           November
## 2082 Resort Hotel           0        78              2015           November
## 2083 Resort Hotel           0        78              2015           November
## 2084 Resort Hotel           0        24              2015           November
## 2085 Resort Hotel           0        24              2015           November
## 2086 Resort Hotel           0        14              2015           November
## 2087 Resort Hotel           0         0              2015           November
## 2088 Resort Hotel           0        56              2015           November
## 2089 Resort Hotel           0        20              2015           November
## 2090 Resort Hotel           0        21              2015           November
## 2091 Resort Hotel           0        40              2015           November
## 2092 Resort Hotel           0        12              2015           November
## 2093 Resort Hotel           0        72              2015           November
## 2094 Resort Hotel           0        17              2015           November
## 2095 Resort Hotel           0        57              2015           November
## 2096 Resort Hotel           0        57              2015           November
## 2097 Resort Hotel           0        57              2015           November
## 2098 Resort Hotel           0        57              2015           November
## 2099 Resort Hotel           0        57              2015           November
## 2100 Resort Hotel           0        57              2015           November
## 2101 Resort Hotel           0        17              2015           November
## 2102 Resort Hotel           0        14              2015           November
## 2103 Resort Hotel           0        57              2015           November
## 2104 Resort Hotel           0       174              2015           November
## 2105 Resort Hotel           0        28              2015           November
## 2106 Resort Hotel           0        15              2015           November
## 2107 Resort Hotel           0        28              2015           November
## 2108 Resort Hotel           0        22              2015           November
## 2109 Resort Hotel           0        36              2015           November
## 2110 Resort Hotel           0        62              2015           November
## 2111 Resort Hotel           0        20              2015           December
## 2112 Resort Hotel           0       118              2015           December
## 2113 Resort Hotel           0       118              2015           December
## 2114 Resort Hotel           0        82              2015           December
## 2115 Resort Hotel           0        21              2015           December
## 2116 Resort Hotel           0        21              2015           December
## 2117 Resort Hotel           0        21              2015           December
## 2118 Resort Hotel           0        21              2015           December
## 2119 Resort Hotel           0       119              2015           December
## 2120 Resort Hotel           0        31              2015           December
## 2121 Resort Hotel           0        45              2015           December
## 2122 Resort Hotel           0        48              2015           December
## 2123 Resort Hotel           0        52              2015           December
## 2124 Resort Hotel           0       108              2015           December
## 2125 Resort Hotel           0        30              2015           December
## 2126 Resort Hotel           0        23              2015           December
## 2127 Resort Hotel           0        22              2015           December
## 2128 Resort Hotel           0        22              2015           December
## 2129 Resort Hotel           0        22              2015           December
## 2130 Resort Hotel           0       130              2015           December
## 2131 Resort Hotel           0        44              2015           December
## 2132 Resort Hotel           0        66              2015           December
## 2133 Resort Hotel           0        66              2015           December
## 2134 Resort Hotel           0        66              2015           December
## 2135 Resort Hotel           0        66              2015           December
## 2136 Resort Hotel           0        66              2015           December
## 2137 Resort Hotel           0        26              2015           December
## 2138 Resort Hotel           0        66              2015           December
## 2139 Resort Hotel           0        66              2015           December
## 2140 Resort Hotel           0        66              2015           December
## 2141 Resort Hotel           0        66              2015           December
## 2142 Resort Hotel           0        66              2015           December
## 2143 Resort Hotel           0        66              2015           December
## 2144 Resort Hotel           0        66              2015           December
## 2145 Resort Hotel           0        66              2015           December
## 2146 Resort Hotel           0        66              2015           December
## 2147 Resort Hotel           0        66              2015           December
## 2148 Resort Hotel           0        66              2015           December
## 2149 Resort Hotel           0        59              2015           December
## 2150 Resort Hotel           0        59              2015           December
## 2151 Resort Hotel           0        59              2015           December
## 2152 Resort Hotel           0        45              2015           December
## 2153 Resort Hotel           0        45              2015           December
## 2154 Resort Hotel           0        45              2015           December
## 2155 Resort Hotel           0        45              2015           December
## 2156 Resort Hotel           0        54              2015           December
## 2157 Resort Hotel           0        45              2015           December
## 2158 Resort Hotel           0        45              2015           December
## 2159 Resort Hotel           0       113              2015           December
## 2160 Resort Hotel           0        59              2015           December
## 2161 Resort Hotel           0        59              2015           December
## 2162 Resort Hotel           0        45              2015           December
## 2163 Resort Hotel           0        45              2015           December
## 2164 Resort Hotel           0        33              2015           December
## 2165 Resort Hotel           0        45              2015           December
## 2166 Resort Hotel           0        45              2015           December
## 2167 Resort Hotel           0        45              2015           December
## 2168 Resort Hotel           0        45              2015           December
## 2169 Resort Hotel           0        39              2015           December
## 2170 Resort Hotel           0        31              2015           December
## 2171 Resort Hotel           0        35              2015           December
## 2172 Resort Hotel           0       183              2015           December
## 2173 Resort Hotel           0       140              2015           December
## 2174 Resort Hotel           0       192              2015           December
## 2175 Resort Hotel           0        29              2015           December
## 2176 Resort Hotel           0        29              2015           December
## 2177 Resort Hotel           0        29              2015           December
## 2178 Resort Hotel           0        66              2015           December
## 2179 Resort Hotel           0        29              2015           December
## 2180 Resort Hotel           0        29              2015           December
## 2181 Resort Hotel           0       126              2015           December
## 2182 Resort Hotel           0        56              2015           December
## 2183 Resort Hotel           0        66              2015           December
## 2184 Resort Hotel           0       194              2015           December
## 2185 Resort Hotel           0        70              2015           December
## 2186 Resort Hotel           0       103              2015           December
## 2187 Resort Hotel           0        71              2015           December
## 2188 Resort Hotel           0        50              2015           December
## 2189 Resort Hotel           0        44              2015           December
## 2190 Resort Hotel           0       261              2015           December
## 2191 Resort Hotel           0        52              2015           December
## 2192 Resort Hotel           0        49              2015           December
## 2193 Resort Hotel           0       113              2015           December
## 2194 Resort Hotel           0        60              2015           December
## 2195 Resort Hotel           0        45              2015           December
## 2196 Resort Hotel           0        86              2015           December
## 2197 Resort Hotel           0        39              2015           December
## 2198 Resort Hotel           0        88              2015           December
## 2199 Resort Hotel           0        48              2015           December
## 2200 Resort Hotel           0       126              2015           December
## 2201 Resort Hotel           0        67              2015           December
## 2202 Resort Hotel           0        49              2015           December
## 2203 Resort Hotel           0       119              2015           December
## 2204 Resort Hotel           0        54              2015           December
## 2205 Resort Hotel           0        60              2015           December
## 2206 Resort Hotel           0       131              2015           December
## 2207 Resort Hotel           0       139              2015           December
## 2208 Resort Hotel           0       131              2015           December
## 2209 Resort Hotel           0       131              2015           December
## 2210 Resort Hotel           0       131              2015           December
## 2211 Resort Hotel           0        70              2015           December
## 2212 Resort Hotel           0       131              2015           December
## 2213 Resort Hotel           0       131              2015           December
## 2214 Resort Hotel           0       131              2015           December
## 2215 Resort Hotel           0       131              2015           December
## 2216 Resort Hotel           0       131              2015           December
## 2217 Resort Hotel           0       131              2015           December
## 2218 Resort Hotel           0       131              2015           December
## 2219 Resort Hotel           0        83              2015           December
## 2220 Resort Hotel           0       119              2015           December
## 2221 Resort Hotel           0        49              2015           December
## 2222 Resort Hotel           0        49              2015           December
## 2223 Resort Hotel           0        48              2015           December
## 2224 Resort Hotel           0       111              2015           December
## 2225 Resort Hotel           0       100              2015           December
## 2226 Resort Hotel           0        44              2015           December
## 2227 Resort Hotel           0        99              2015           December
## 2228 Resort Hotel           0        44              2015           December
## 2229 Resort Hotel           0        65              2015           December
## 2230 Resort Hotel           0        45              2015           December
## 2231 Resort Hotel           0        44              2015           December
## 2232 Resort Hotel           0        45              2015           December
## 2233 Resort Hotel           0        66              2015           December
## 2234 Resort Hotel           0        59              2015           December
## 2235 Resort Hotel           0       155              2015           December
## 2236 Resort Hotel           0        59              2015           December
## 2237 Resort Hotel           0       155              2015           December
## 2238 Resort Hotel           0        44              2015           December
## 2239 Resort Hotel           0        86              2015           December
## 2240 Resort Hotel           0       127              2015           December
## 2241 Resort Hotel           0       131              2015           December
## 2242 Resort Hotel           0       119              2015           December
## 2243 Resort Hotel           0       127              2015           December
## 2244 Resort Hotel           0        79              2015           December
## 2245 Resort Hotel           0        57              2015           December
## 2246 Resort Hotel           0       178              2015           December
## 2247 Resort Hotel           0        51              2015           December
## 2248 Resort Hotel           0        55              2015           December
## 2249 Resort Hotel           0        55              2015           December
## 2250 Resort Hotel           0        55              2015           December
## 2251 Resort Hotel           0        45              2015           December
## 2252 Resort Hotel           0        93              2015           December
## 2253 Resort Hotel           0       112              2015           December
## 2254 Resort Hotel           0       114              2015           December
## 2255 Resort Hotel           0       129              2015           December
## 2256 Resort Hotel           0        62              2015           December
## 2257 Resort Hotel           0        62              2015           December
## 2258 Resort Hotel           0        90              2015           December
## 2259 Resort Hotel           0        81              2015           December
## 2260 Resort Hotel           0        81              2015           December
## 2261 Resort Hotel           0       118              2015           December
## 2262 Resort Hotel           0       101              2015           December
## 2263 Resort Hotel           0        49              2015           December
## 2264 Resort Hotel           0        53              2015           December
## 2265 Resort Hotel           0        94              2015           December
## 2266 Resort Hotel           0        76              2015           December
## 2267 Resort Hotel           0       165              2015           December
## 2268 Resort Hotel           0       165              2015           December
## 2269 Resort Hotel           0       165              2015           December
## 2270 Resort Hotel           0       165              2015           December
## 2271 Resort Hotel           0        65              2015           December
## 2272 Resort Hotel           0       165              2015           December
## 2273 Resort Hotel           0       165              2015           December
## 2274 Resort Hotel           0       165              2015           December
## 2275 Resort Hotel           0       165              2015           December
## 2276 Resort Hotel           0       165              2015           December
## 2277 Resort Hotel           0       165              2015           December
## 2278 Resort Hotel           0       165              2015           December
## 2279 Resort Hotel           0       165              2015           December
## 2280 Resort Hotel           0       165              2015           December
## 2281 Resort Hotel           0       165              2015           December
## 2282 Resort Hotel           0       165              2015           December
## 2283 Resort Hotel           0       165              2015           December
## 2284 Resort Hotel           0       165              2015           December
## 2285 Resort Hotel           0       165              2015           December
## 2286 Resort Hotel           0       165              2015           December
## 2287 Resort Hotel           0       165              2015           December
## 2288 Resort Hotel           0       165              2015           December
## 2289 Resort Hotel           0       165              2015           December
## 2290 Resort Hotel           0       165              2015           December
## 2291 Resort Hotel           0       165              2015           December
## 2292 Resort Hotel           0       165              2015           December
## 2293 Resort Hotel           0       165              2015           December
## 2294 Resort Hotel           0       165              2015           December
## 2295 Resort Hotel           0       165              2015           December
## 2296 Resort Hotel           0       165              2015           December
## 2297 Resort Hotel           0       165              2015           December
## 2298 Resort Hotel           0       165              2015           December
## 2299 Resort Hotel           0        65              2015           December
## 2300 Resort Hotel           0        53              2015           December
## 2301 Resort Hotel           0       165              2015           December
## 2302 Resort Hotel           0       165              2015           December
## 2303 Resort Hotel           0       165              2015           December
## 2304 Resort Hotel           0       165              2015           December
## 2305 Resort Hotel           0       165              2015           December
## 2306 Resort Hotel           0       165              2015           December
## 2307 Resort Hotel           0       165              2015           December
## 2308 Resort Hotel           0       165              2015           December
## 2309 Resort Hotel           0       165              2015           December
## 2310 Resort Hotel           0       165              2015           December
## 2311 Resort Hotel           0       165              2015           December
## 2312 Resort Hotel           0       165              2015           December
## 2313 Resort Hotel           0       165              2015           December
## 2314 Resort Hotel           0       165              2015           December
## 2315 Resort Hotel           0       165              2015           December
## 2316 Resort Hotel           0       165              2015           December
## 2317 Resort Hotel           0       165              2015           December
## 2318 Resort Hotel           0       165              2015           December
## 2319 Resort Hotel           0       165              2015           December
## 2320 Resort Hotel           0        52              2015           December
## 2321 Resort Hotel           0        86              2015           December
## 2322 Resort Hotel           0        90              2015           December
## 2323 Resort Hotel           0       161              2015           December
## 2324 Resort Hotel           0        86              2015           December
## 2325 Resort Hotel           0        69              2015           December
## 2326 Resort Hotel           0       141              2015           December
## 2327 Resort Hotel           0        72              2015           December
## 2328 Resort Hotel           0        69              2015           December
## 2329 Resort Hotel           0        79              2015           December
## 2330 Resort Hotel           0        69              2015           December
## 2331 Resort Hotel           0        70              2015           December
## 2332 Resort Hotel           0        92              2015           December
## 2333 Resort Hotel           0        92              2015           December
## 2334 Resort Hotel           0        92              2015           December
## 2335 Resort Hotel           0       109              2016            January
## 2336 Resort Hotel           0       109              2016            January
## 2337 Resort Hotel           0        88              2016            January
## 2338 Resort Hotel           0        88              2016            January
## 2339 Resort Hotel           0       110              2016            January
## 2340 Resort Hotel           0        86              2016            January
## 2341 Resort Hotel           0       187              2016            January
## 2342 Resort Hotel           0        85              2016            January
## 2343 Resort Hotel           0        59              2016            January
## 2344 Resort Hotel           0        74              2016            January
## 2345 Resort Hotel           0       169              2016            January
## 2346 Resort Hotel           0        87              2016            January
## 2347 Resort Hotel           0       172              2016            January
## 2348 Resort Hotel           0         0              2016            January
## 2349 Resort Hotel           0        23              2016            January
## 2350 Resort Hotel           0       101              2016            January
## 2351 Resort Hotel           0       160              2016            January
## 2352 Resort Hotel           0       154              2016            January
## 2353 Resort Hotel           0       214              2016            January
## 2354 Resort Hotel           0       154              2016            January
## 2355 Resort Hotel           0         1              2016            January
## 2356 Resort Hotel           0         0              2016           February
## 2357 Resort Hotel           0       101              2016           February
## 2358 Resort Hotel           0       116              2016           February
## 2359 Resort Hotel           0        97              2016           February
## 2360 Resort Hotel           0        88              2016           February
## 2361 Resort Hotel           0        88              2016           February
## 2362 Resort Hotel           0       211              2016           February
## 2363 Resort Hotel           0        94              2016           February
## 2364 Resort Hotel           0        94              2016           February
## 2365 Resort Hotel           0       168              2016           February
## 2366 Resort Hotel           0       143              2016           February
## 2367 Resort Hotel           0       143              2016           February
## 2368 Resort Hotel           0       117              2016           February
## 2369 Resort Hotel           0       152              2016           February
## 2370 Resort Hotel           0       103              2016           February
## 2371 Resort Hotel           0       103              2016           February
## 2372 Resort Hotel           0       103              2016           February
## 2373 Resort Hotel           0       103              2016           February
## 2374 Resort Hotel           0       103              2016           February
## 2375 Resort Hotel           0       103              2016           February
## 2376 Resort Hotel           0       103              2016           February
## 2377 Resort Hotel           0       103              2016           February
## 2378 Resort Hotel           0       103              2016           February
## 2379 Resort Hotel           0       103              2016           February
## 2380 Resort Hotel           0         2              2016           February
## 2381 Resort Hotel           0       103              2016           February
## 2382 Resort Hotel           0       103              2016           February
## 2383 Resort Hotel           0       103              2016           February
## 2384 Resort Hotel           0       230              2016           February
## 2385 Resort Hotel           0       112              2016           February
## 2386 Resort Hotel           0       112              2016           February
## 2387 Resort Hotel           0       112              2016           February
## 2388 Resort Hotel           0       112              2016           February
## 2389 Resort Hotel           0       112              2016           February
## 2390 Resort Hotel           0       112              2016           February
## 2391 Resort Hotel           0       112              2016           February
## 2392 Resort Hotel           0       112              2016           February
## 2393 Resort Hotel           0       112              2016           February
## 2394 Resort Hotel           0       112              2016           February
## 2395 Resort Hotel           0       112              2016           February
## 2396 Resort Hotel           0       112              2016           February
## 2397 Resort Hotel           0       112              2016           February
## 2398 Resort Hotel           0       112              2016           February
## 2399 Resort Hotel           0       112              2016           February
## 2400 Resort Hotel           0       112              2016           February
## 2401 Resort Hotel           0       112              2016           February
## 2402 Resort Hotel           0       112              2016           February
## 2403 Resort Hotel           0       112              2016           February
## 2404 Resort Hotel           0       112              2016           February
## 2405 Resort Hotel           0       112              2016           February
## 2406 Resort Hotel           0       112              2016           February
## 2407 Resort Hotel           0       112              2016           February
## 2408 Resort Hotel           0       230              2016           February
## 2409 Resort Hotel           0       203              2016           February
## 2410 Resort Hotel           0       101              2016           February
## 2411 Resort Hotel           0       103              2016           February
## 2412 Resort Hotel           0       117              2016           February
## 2413 Resort Hotel           0       133              2016           February
## 2414 Resort Hotel           0       133              2016           February
## 2415 Resort Hotel           0       192              2016           February
## 2416 Resort Hotel           0       188              2016           February
## 2417 Resort Hotel           0       232              2016           February
## 2418 Resort Hotel           0        99              2016           February
## 2419 Resort Hotel           0       131              2016           February
## 2420 Resort Hotel           0       150              2016           February
## 2421 Resort Hotel           0       172              2016           February
## 2422 Resort Hotel           0       150              2016           February
## 2423 Resort Hotel           0       100              2016           February
## 2424 Resort Hotel           0       108              2016           February
## 2425 Resort Hotel           0       108              2016           February
## 2426 Resort Hotel           0       187              2016           February
## 2427 Resort Hotel           0       117              2016           February
## 2428 Resort Hotel           0       117              2016           February
## 2429 Resort Hotel           0       709              2016           February
## 2430 Resort Hotel           0       211              2016           February
## 2431 Resort Hotel           0       123              2016           February
## 2432 Resort Hotel           0       123              2016           February
## 2433 Resort Hotel           0       123              2016           February
## 2434 Resort Hotel           0       123              2016           February
## 2435 Resort Hotel           0       123              2016           February
## 2436 Resort Hotel           0       123              2016           February
## 2437 Resort Hotel           0       123              2016           February
## 2438 Resort Hotel           0       123              2016           February
## 2439 Resort Hotel           0       123              2016           February
## 2440 Resort Hotel           0       123              2016           February
## 2441 Resort Hotel           0       123              2016           February
## 2442 Resort Hotel           0       123              2016           February
## 2443 Resort Hotel           0       123              2016           February
## 2444 Resort Hotel           0       123              2016           February
## 2445 Resort Hotel           0       123              2016           February
## 2446 Resort Hotel           0       123              2016           February
## 2447 Resort Hotel           0       123              2016           February
## 2448 Resort Hotel           0       123              2016           February
## 2449 Resort Hotel           0       123              2016           February
## 2450 Resort Hotel           0       123              2016           February
## 2451 Resort Hotel           0       123              2016           February
## 2452 Resort Hotel           0       123              2016           February
## 2453 Resort Hotel           0       131              2016              March
## 2454 Resort Hotel           0         0              2016              March
## 2455 Resort Hotel           0       119              2016              March
## 2456 Resort Hotel           0       157              2016              March
## 2457 Resort Hotel           0         0              2016              March
## 2458 Resort Hotel           0       190              2016              March
## 2459 Resort Hotel           0       190              2016              March
## 2460 Resort Hotel           0       259              2016              March
## 2461 Resort Hotel           0       130              2016              March
## 2462 Resort Hotel           0         1              2016              March
## 2463 Resort Hotel           0       132              2016              March
## 2464 Resort Hotel           0       176              2016              March
## 2465 Resort Hotel           0       250              2016              March
## 2466 Resort Hotel           0         1              2016              March
## 2467 Resort Hotel           0       148              2016              March
## 2468 Resort Hotel           0       133              2016              March
## 2469 Resort Hotel           0       157              2016              March
## 2470 Resort Hotel           0       167              2016              March
## 2471 Resort Hotel           0       143              2016              March
## 2472 Resort Hotel           0       154              2016              March
## 2473 Resort Hotel           0       166              2016              March
## 2474 Resort Hotel           0       135              2016              March
## 2475 Resort Hotel           0       135              2016              March
## 2476 Resort Hotel           0       177              2016              March
## 2477 Resort Hotel           0       207              2016              March
## 2478 Resort Hotel           0       194              2016              March
## 2479 Resort Hotel           0       140              2016              March
## 2480 Resort Hotel           0       153              2016              March
## 2481 Resort Hotel           0       146              2016              March
## 2482 Resort Hotel           0       138              2016              March
## 2483 Resort Hotel           0       141              2016              March
## 2484 Resort Hotel           0       162              2016              March
## 2485 Resort Hotel           0       162              2016              March
## 2486 Resort Hotel           0       162              2016              March
## 2487 Resort Hotel           0       162              2016              March
## 2488 Resort Hotel           0       136              2016              March
## 2489 Resort Hotel           0       136              2016              March
## 2490 Resort Hotel           0       136              2016              March
## 2491 Resort Hotel           0       136              2016              March
## 2492 Resort Hotel           0       136              2016              March
## 2493 Resort Hotel           0       136              2016              March
## 2494 Resort Hotel           0       162              2016              March
## 2495 Resort Hotel           0       162              2016              March
## 2496 Resort Hotel           0       162              2016              March
## 2497 Resort Hotel           0       162              2016              March
## 2498 Resort Hotel           0       136              2016              March
## 2499 Resort Hotel           0       136              2016              March
## 2500 Resort Hotel           0       136              2016              March
## 2501 Resort Hotel           0       136              2016              March
## 2502 Resort Hotel           0       136              2016              March
## 2503 Resort Hotel           0       136              2016              March
## 2504 Resort Hotel           0       162              2016              March
## 2505 Resort Hotel           0       162              2016              March
## 2506 Resort Hotel           0       136              2016              March
## 2507 Resort Hotel           0       136              2016              March
## 2508 Resort Hotel           0       162              2016              March
## 2509 Resort Hotel           0       162              2016              March
## 2510 Resort Hotel           0       162              2016              March
## 2511 Resort Hotel           0       136              2016              March
## 2512 Resort Hotel           0       136              2016              March
## 2513 Resort Hotel           0       162              2016              March
## 2514 Resort Hotel           0       162              2016              March
## 2515 Resort Hotel           0       162              2016              March
## 2516 Resort Hotel           0       162              2016              March
## 2517 Resort Hotel           0       136              2016              March
## 2518 Resort Hotel           0       136              2016              March
## 2519 Resort Hotel           0       136              2016              March
## 2520 Resort Hotel           0       136              2016              March
## 2521 Resort Hotel           0       136              2016              March
## 2522 Resort Hotel           0       162              2016              March
## 2523 Resort Hotel           0       162              2016              March
## 2524 Resort Hotel           0       162              2016              March
## 2525 Resort Hotel           0       136              2016              March
## 2526 Resort Hotel           0       136              2016              March
## 2527 Resort Hotel           0       136              2016              March
## 2528 Resort Hotel           0       162              2016              March
## 2529 Resort Hotel           0       162              2016              March
## 2530 Resort Hotel           0       162              2016              March
## 2531 Resort Hotel           0       162              2016              March
## 2532 Resort Hotel           0       162              2016              March
## 2533 Resort Hotel           0       136              2016              March
## 2534 Resort Hotel           0       136              2016              March
## 2535 Resort Hotel           0       136              2016              March
## 2536 Resort Hotel           0       136              2016              March
## 2537 Resort Hotel           0       162              2016              March
## 2538 Resort Hotel           0       162              2016              March
## 2539 Resort Hotel           0       136              2016              March
## 2540 Resort Hotel           0       162              2016              March
## 2541 Resort Hotel           0       192              2016              March
## 2542 Resort Hotel           0       192              2016              March
## 2543 Resort Hotel           0       142              2016              March
## 2544 Resort Hotel           0       149              2016              March
## 2545 Resort Hotel           0       147              2016              March
## 2546 Resort Hotel           0       147              2016              March
## 2547 Resort Hotel           0       147              2016              March
## 2548 Resort Hotel           0       147              2016              March
## 2549 Resort Hotel           0       147              2016              March
## 2550 Resort Hotel           0       147              2016              March
## 2551 Resort Hotel           0       147              2016              March
## 2552 Resort Hotel           0       167              2016              March
## 2553 Resort Hotel           0       168              2016              March
## 2554 Resort Hotel           0       168              2016              March
## 2555 Resort Hotel           0       168              2016              March
## 2556 Resort Hotel           0       168              2016              March
## 2557 Resort Hotel           0       168              2016              March
## 2558 Resort Hotel           0       168              2016              March
## 2559 Resort Hotel           0       168              2016              March
## 2560 Resort Hotel           0       168              2016              March
## 2561 Resort Hotel           0       168              2016              March
## 2562 Resort Hotel           0       156              2016              March
## 2563 Resort Hotel           0       168              2016              March
## 2564 Resort Hotel           0       168              2016              March
## 2565 Resort Hotel           0       168              2016              March
## 2566 Resort Hotel           0       168              2016              March
## 2567 Resort Hotel           0       169              2016              March
## 2568 Resort Hotel           0       169              2016              March
## 2569 Resort Hotel           0       169              2016              March
## 2570 Resort Hotel           0       169              2016              March
## 2571 Resort Hotel           0       169              2016              March
## 2572 Resort Hotel           0       169              2016              March
## 2573 Resort Hotel           0       169              2016              March
## 2574 Resort Hotel           0       169              2016              March
## 2575 Resort Hotel           0       169              2016              March
## 2576 Resort Hotel           0       169              2016              March
## 2577 Resort Hotel           0       169              2016              March
## 2578 Resort Hotel           0       169              2016              March
## 2579 Resort Hotel           0       169              2016              March
## 2580 Resort Hotel           0       169              2016              March
## 2581 Resort Hotel           0       169              2016              March
## 2582 Resort Hotel           0       169              2016              March
## 2583 Resort Hotel           0       169              2016              March
## 2584 Resort Hotel           0       169              2016              March
## 2585 Resort Hotel           0       169              2016              March
## 2586 Resort Hotel           0       169              2016              March
## 2587 Resort Hotel           0       169              2016              March
## 2588 Resort Hotel           0       169              2016              March
## 2589 Resort Hotel           0       169              2016              March
## 2590 Resort Hotel           0       169              2016              March
## 2591 Resort Hotel           0       169              2016              March
## 2592 Resort Hotel           0       169              2016              March
## 2593 Resort Hotel           0       169              2016              March
## 2594 Resort Hotel           0       169              2016              March
## 2595 Resort Hotel           0       169              2016              March
## 2596 Resort Hotel           0       169              2016              March
## 2597 Resort Hotel           0       169              2016              March
## 2598 Resort Hotel           0       169              2016              March
## 2599 Resort Hotel           0       169              2016              March
## 2600 Resort Hotel           0       169              2016              March
## 2601 Resort Hotel           0       169              2016              March
## 2602 Resort Hotel           0       169              2016              March
## 2603 Resort Hotel           0       169              2016              March
## 2604 Resort Hotel           0       169              2016              March
## 2605 Resort Hotel           0       169              2016              March
## 2606 Resort Hotel           0       169              2016              March
## 2607 Resort Hotel           0       169              2016              March
## 2608 Resort Hotel           0       169              2016              March
## 2609 Resort Hotel           0       169              2016              March
## 2610 Resort Hotel           0       169              2016              March
## 2611 Resort Hotel           0       169              2016              March
## 2612 Resort Hotel           0       169              2016              March
## 2613 Resort Hotel           0       169              2016              March
## 2614 Resort Hotel           0       169              2016              March
## 2615 Resort Hotel           0       169              2016              March
## 2616 Resort Hotel           0       169              2016              March
## 2617 Resort Hotel           0       169              2016              March
## 2618 Resort Hotel           0       169              2016              March
## 2619 Resort Hotel           0       169              2016              March
## 2620 Resort Hotel           0       169              2016              March
## 2621 Resort Hotel           0         0              2016              April
## 2622 Resort Hotel           0       144              2016              April
## 2623 Resort Hotel           0       144              2016              April
## 2624 Resort Hotel           0       144              2016              April
## 2625 Resort Hotel           0       163              2016              April
## 2626 Resort Hotel           0       175              2016              April
## 2627 Resort Hotel           0       222              2016              April
## 2628 Resort Hotel           0       222              2016              April
## 2629 Resort Hotel           0         0              2016              April
## 2630 Resort Hotel           0         1              2016              April
## 2631 Resort Hotel           0       182              2016              April
## 2632 Resort Hotel           0       171              2016              April
## 2633 Resort Hotel           0       171              2016              April
## 2634 Resort Hotel           0       171              2016              April
## 2635 Resort Hotel           0       171              2016              April
## 2636 Resort Hotel           0       171              2016              April
## 2637 Resort Hotel           0       171              2016              April
## 2638 Resort Hotel           0       171              2016              April
## 2639 Resort Hotel           0       171              2016              April
## 2640 Resort Hotel           0       171              2016              April
## 2641 Resort Hotel           0       171              2016              April
## 2642 Resort Hotel           0       171              2016              April
## 2643 Resort Hotel           0       171              2016              April
## 2644 Resort Hotel           0       171              2016              April
## 2645 Resort Hotel           0       171              2016              April
## 2646 Resort Hotel           0       171              2016              April
## 2647 Resort Hotel           0       171              2016              April
## 2648 Resort Hotel           0       171              2016              April
## 2649 Resort Hotel           0       171              2016              April
## 2650 Resort Hotel           0       171              2016              April
## 2651 Resort Hotel           0       171              2016              April
## 2652 Resort Hotel           0       171              2016              April
## 2653 Resort Hotel           0       171              2016              April
## 2654 Resort Hotel           0       171              2016              April
## 2655 Resort Hotel           0       171              2016              April
## 2656 Resort Hotel           0       171              2016              April
## 2657 Resort Hotel           0       171              2016              April
## 2658 Resort Hotel           0       171              2016              April
## 2659 Resort Hotel           0       171              2016              April
## 2660 Resort Hotel           0       171              2016              April
## 2661 Resort Hotel           0       171              2016              April
## 2662 Resort Hotel           0       171              2016              April
## 2663 Resort Hotel           0       171              2016              April
## 2664 Resort Hotel           0       171              2016              April
## 2665 Resort Hotel           0       171              2016              April
## 2666 Resort Hotel           0       171              2016              April
## 2667 Resort Hotel           0       171              2016              April
## 2668 Resort Hotel           0       171              2016              April
## 2669 Resort Hotel           0       171              2016              April
## 2670 Resort Hotel           0       171              2016              April
## 2671 Resort Hotel           0       171              2016              April
## 2672 Resort Hotel           0       186              2016              April
## 2673 Resort Hotel           0       200              2016              April
## 2674 Resort Hotel           0       200              2016              April
## 2675 Resort Hotel           0       210              2016              April
## 2676 Resort Hotel           0       149              2016              April
## 2677 Resort Hotel           0       190              2016              April
## 2678 Resort Hotel           0       190              2016              April
## 2679 Resort Hotel           0       275              2016              April
## 2680 Resort Hotel           0       275              2016              April
## 2681 Resort Hotel           0       275              2016              April
## 2682 Resort Hotel           0       275              2016              April
## 2683 Resort Hotel           0       275              2016              April
## 2684 Resort Hotel           0       275              2016              April
## 2685 Resort Hotel           0       190              2016              April
## 2686 Resort Hotel           0       275              2016              April
## 2687 Resort Hotel           0       275              2016              April
## 2688 Resort Hotel           0       275              2016              April
## 2689 Resort Hotel           0       275              2016              April
## 2690 Resort Hotel           0       190              2016              April
## 2691 Resort Hotel           0       190              2016              April
## 2692 Resort Hotel           0       275              2016              April
## 2693 Resort Hotel           0       275              2016              April
## 2694 Resort Hotel           0       275              2016              April
## 2695 Resort Hotel           0         0              2016              April
## 2696 Resort Hotel           0       214              2016              April
## 2697 Resort Hotel           0       214              2016              April
## 2698 Resort Hotel           0       187              2016              April
## 2699 Resort Hotel           0       192              2016              April
## 2700 Resort Hotel           0       229              2016              April
## 2701 Resort Hotel           0       183              2016              April
## 2702 Resort Hotel           0       183              2016              April
## 2703 Resort Hotel           0       183              2016              April
## 2704 Resort Hotel           0       183              2016              April
## 2705 Resort Hotel           0       183              2016              April
## 2706 Resort Hotel           0       183              2016              April
## 2707 Resort Hotel           0       183              2016              April
## 2708 Resort Hotel           0       183              2016              April
## 2709 Resort Hotel           0       183              2016              April
## 2710 Resort Hotel           0       183              2016              April
## 2711 Resort Hotel           0       183              2016              April
## 2712 Resort Hotel           0       183              2016              April
## 2713 Resort Hotel           0       183              2016              April
## 2714 Resort Hotel           0       183              2016              April
## 2715 Resort Hotel           0       183              2016              April
## 2716 Resort Hotel           0       183              2016              April
## 2717 Resort Hotel           0       183              2016              April
## 2718 Resort Hotel           0       183              2016              April
## 2719 Resort Hotel           0       183              2016              April
## 2720 Resort Hotel           0       183              2016              April
## 2721 Resort Hotel           0       183              2016              April
## 2722 Resort Hotel           0       183              2016              April
## 2723 Resort Hotel           0       183              2016              April
## 2724 Resort Hotel           0       183              2016              April
## 2725 Resort Hotel           0       183              2016              April
## 2726 Resort Hotel           0       183              2016              April
## 2727 Resort Hotel           0       183              2016              April
## 2728 Resort Hotel           0       183              2016              April
## 2729 Resort Hotel           0       183              2016              April
## 2730 Resort Hotel           0       169              2016              April
## 2731 Resort Hotel           0       169              2016              April
## 2732 Resort Hotel           0       192              2016              April
## 2733 Resort Hotel           0       200              2016              April
## 2734 Resort Hotel           0       218              2016              April
## 2735 Resort Hotel           0       185              2016              April
## 2736 Resort Hotel           0       185              2016              April
## 2737 Resort Hotel           0       185              2016              April
## 2738 Resort Hotel           0       185              2016              April
## 2739 Resort Hotel           0       185              2016              April
## 2740 Resort Hotel           0       185              2016              April
## 2741 Resort Hotel           0       185              2016              April
## 2742 Resort Hotel           0       185              2016              April
## 2743 Resort Hotel           0       185              2016              April
## 2744 Resort Hotel           0       185              2016              April
## 2745 Resort Hotel           0       185              2016              April
## 2746 Resort Hotel           0       185              2016              April
## 2747 Resort Hotel           0       185              2016              April
## 2748 Resort Hotel           0       185              2016              April
## 2749 Resort Hotel           0       185              2016              April
## 2750 Resort Hotel           0       185              2016              April
## 2751 Resort Hotel           0       185              2016              April
## 2752 Resort Hotel           0       185              2016              April
## 2753 Resort Hotel           0       185              2016              April
## 2754 Resort Hotel           0       185              2016              April
## 2755 Resort Hotel           0       185              2016              April
## 2756 Resort Hotel           0       185              2016              April
## 2757 Resort Hotel           0       185              2016              April
## 2758 Resort Hotel           0       185              2016              April
## 2759 Resort Hotel           0       185              2016              April
## 2760 Resort Hotel           0       185              2016              April
## 2761 Resort Hotel           0       185              2016              April
## 2762 Resort Hotel           0       185              2016              April
## 2763 Resort Hotel           0       185              2016              April
## 2764 Resort Hotel           0       172              2016              April
## 2765 Resort Hotel           0       172              2016              April
## 2766 Resort Hotel           0       172              2016              April
## 2767 Resort Hotel           0       172              2016              April
## 2768 Resort Hotel           0       172              2016              April
## 2769 Resort Hotel           0       172              2016              April
## 2770 Resort Hotel           0       215              2016              April
## 2771 Resort Hotel           0       215              2016              April
## 2772 Resort Hotel           0       162              2016              April
## 2773 Resort Hotel           0       206              2016              April
## 2774 Resort Hotel           0       206              2016              April
## 2775 Resort Hotel           0       168              2016              April
## 2776 Resort Hotel           0       191              2016              April
## 2777 Resort Hotel           0       191              2016              April
## 2778 Resort Hotel           0       191              2016              April
## 2779 Resort Hotel           0       191              2016              April
## 2780 Resort Hotel           0       191              2016              April
## 2781 Resort Hotel           0       191              2016              April
## 2782 Resort Hotel           0       191              2016              April
## 2783 Resort Hotel           0       191              2016              April
## 2784 Resort Hotel           0       191              2016              April
## 2785 Resort Hotel           0       191              2016              April
## 2786 Resort Hotel           0       191              2016              April
## 2787 Resort Hotel           0       191              2016              April
## 2788 Resort Hotel           0       191              2016              April
## 2789 Resort Hotel           0       191              2016              April
## 2790 Resort Hotel           0       191              2016              April
## 2791 Resort Hotel           0       191              2016              April
## 2792 Resort Hotel           0       191              2016              April
## 2793 Resort Hotel           0       191              2016              April
## 2794 Resort Hotel           0       191              2016              April
## 2795 Resort Hotel           0       191              2016              April
## 2796 Resort Hotel           0       191              2016              April
## 2797 Resort Hotel           0       191              2016              April
## 2798 Resort Hotel           0       191              2016              April
## 2799 Resort Hotel           0       191              2016              April
## 2800 Resort Hotel           0       191              2016              April
## 2801 Resort Hotel           0       191              2016              April
## 2802 Resort Hotel           0       191              2016              April
## 2803 Resort Hotel           0        41              2016              April
## 2804 Resort Hotel           0       197              2016              April
## 2805 Resort Hotel           0       218              2016              April
## 2806 Resort Hotel           0       222              2016              April
## 2807 Resort Hotel           0       167              2016              April
## 2808 Resort Hotel           0         7              2016              April
## 2809 Resort Hotel           0       189              2016              April
## 2810 Resort Hotel           0       189              2016              April
## 2811 Resort Hotel           0       189              2016              April
## 2812 Resort Hotel           0       189              2016              April
## 2813 Resort Hotel           0       179              2016              April
## 2814 Resort Hotel           0       200              2016              April
## 2815 Resort Hotel           0       206              2016              April
## 2816 Resort Hotel           0       197              2016              April
## 2817 Resort Hotel           0       197              2016              April
## 2818 Resort Hotel           0       197              2016              April
## 2819 Resort Hotel           0       197              2016              April
## 2820 Resort Hotel           0       197              2016              April
## 2821 Resort Hotel           0       197              2016              April
## 2822 Resort Hotel           0       197              2016              April
## 2823 Resort Hotel           0       171              2016              April
## 2824 Resort Hotel           0       173              2016              April
## 2825 Resort Hotel           0       206              2016              April
## 2826 Resort Hotel           0       255              2016              April
## 2827 Resort Hotel           0       171              2016              April
## 2828 Resort Hotel           0       229              2016                May
## 2829 Resort Hotel           0       199              2016                May
## 2830 Resort Hotel           0       199              2016                May
## 2831 Resort Hotel           0       199              2016                May
## 2832 Resort Hotel           0       199              2016                May
## 2833 Resort Hotel           0       199              2016                May
## 2834 Resort Hotel           0       199              2016                May
## 2835 Resort Hotel           0       199              2016                May
## 2836 Resort Hotel           0       199              2016                May
## 2837 Resort Hotel           0       199              2016                May
## 2838 Resort Hotel           0       199              2016                May
## 2839 Resort Hotel           0       199              2016                May
## 2840 Resort Hotel           0       199              2016                May
## 2841 Resort Hotel           0       199              2016                May
## 2842 Resort Hotel           0       199              2016                May
## 2843 Resort Hotel           0       199              2016                May
## 2844 Resort Hotel           0       199              2016                May
## 2845 Resort Hotel           0       199              2016                May
## 2846 Resort Hotel           0       199              2016                May
## 2847 Resort Hotel           0       199              2016                May
## 2848 Resort Hotel           0       199              2016                May
## 2849 Resort Hotel           0       199              2016                May
## 2850 Resort Hotel           0       199              2016                May
## 2851 Resort Hotel           0       199              2016                May
## 2852 Resort Hotel           0       199              2016                May
## 2853 Resort Hotel           0       199              2016                May
## 2854 Resort Hotel           0       199              2016                May
## 2855 Resort Hotel           0       215              2016                May
## 2856 Resort Hotel           0       203              2016                May
## 2857 Resort Hotel           0       201              2016                May
## 2858 Resort Hotel           0       226              2016                May
## 2859 Resort Hotel           0       188              2016                May
## 2860 Resort Hotel           0       288              2016                May
## 2861 Resort Hotel           0       188              2016                May
## 2862 Resort Hotel           0       288              2016                May
## 2863 Resort Hotel           0       188              2016                May
## 2864 Resort Hotel           0       209              2016                May
## 2865 Resort Hotel           0       189              2016                May
## 2866 Resort Hotel           0       209              2016                May
## 2867 Resort Hotel           0       209              2016                May
## 2868 Resort Hotel           0       253              2016                May
## 2869 Resort Hotel           0       253              2016                May
## 2870 Resort Hotel           0       252              2016                May
## 2871 Resort Hotel           0       354              2016                May
## 2872 Resort Hotel           0       260              2016                May
## 2873 Resort Hotel           0       179              2016                May
## 2874 Resort Hotel           0       262              2016                May
## 2875 Resort Hotel           0       232              2016                May
## 2876 Resort Hotel           0       232              2016                May
## 2877 Resort Hotel           0       236              2016                May
## 2878 Resort Hotel           0       256              2016                May
## 2879 Resort Hotel           0       212              2016                May
## 2880 Resort Hotel           0       202              2016                May
## 2881 Resort Hotel           0       235              2016                May
## 2882 Resort Hotel           0       203              2016                May
## 2883 Resort Hotel           0       203              2016                May
## 2884 Resort Hotel           0       203              2016                May
## 2885 Resort Hotel           0       203              2016                May
## 2886 Resort Hotel           0       203              2016                May
## 2887 Resort Hotel           0       203              2016                May
## 2888 Resort Hotel           0        29              2016                May
## 2889 Resort Hotel           0       188              2016                May
## 2890 Resort Hotel           0       236              2016                May
## 2891 Resort Hotel           0       236              2016                May
## 2892 Resort Hotel           0       236              2016                May
## 2893 Resort Hotel           0       236              2016                May
## 2894 Resort Hotel           0       236              2016                May
## 2895 Resort Hotel           0       236              2016                May
## 2896 Resort Hotel           0       236              2016                May
## 2897 Resort Hotel           0       236              2016                May
## 2898 Resort Hotel           0       236              2016                May
## 2899 Resort Hotel           0       236              2016                May
## 2900 Resort Hotel           0       236              2016                May
## 2901 Resort Hotel           0       236              2016                May
## 2902 Resort Hotel           0       236              2016                May
## 2903 Resort Hotel           0       189              2016                May
## 2904 Resort Hotel           0       189              2016                May
## 2905 Resort Hotel           0       213              2016                May
## 2906 Resort Hotel           0       213              2016                May
## 2907 Resort Hotel           0       237              2016                May
## 2908 Resort Hotel           0       237              2016                May
## 2909 Resort Hotel           0       195              2016                May
## 2910 Resort Hotel           0       195              2016                May
## 2911 Resort Hotel           0       206              2016                May
## 2912 Resort Hotel           0       211              2016                May
## 2913 Resort Hotel           0       211              2016                May
## 2914 Resort Hotel           0       211              2016                May
## 2915 Resort Hotel           0       211              2016                May
## 2916 Resort Hotel           0       211              2016                May
## 2917 Resort Hotel           0       211              2016                May
## 2918 Resort Hotel           0       211              2016                May
## 2919 Resort Hotel           0       211              2016                May
## 2920 Resort Hotel           0       211              2016                May
## 2921 Resort Hotel           0       211              2016                May
## 2922 Resort Hotel           0       211              2016                May
## 2923 Resort Hotel           0       211              2016                May
## 2924 Resort Hotel           0       211              2016                May
## 2925 Resort Hotel           0       211              2016                May
## 2926 Resort Hotel           0       211              2016                May
## 2927 Resort Hotel           0       211              2016                May
## 2928 Resort Hotel           0       211              2016                May
## 2929 Resort Hotel           0       211              2016                May
## 2930 Resort Hotel           0       211              2016                May
## 2931 Resort Hotel           0       211              2016                May
## 2932 Resort Hotel           0       211              2016                May
## 2933 Resort Hotel           0       211              2016                May
## 2934 Resort Hotel           0       211              2016                May
## 2935 Resort Hotel           0       211              2016                May
## 2936 Resort Hotel           0       211              2016                May
## 2937 Resort Hotel           0       211              2016                May
## 2938 Resort Hotel           0       211              2016                May
## 2939 Resort Hotel           0       211              2016                May
## 2940 Resort Hotel           0       211              2016                May
## 2941 Resort Hotel           0         9              2016                May
## 2942 Resort Hotel           0       239              2016                May
## 2943 Resort Hotel           0       205              2016                May
## 2944 Resort Hotel           0       208              2016                May
## 2945 Resort Hotel           0       213              2016                May
## 2946 Resort Hotel           0       213              2016                May
## 2947 Resort Hotel           0       213              2016                May
## 2948 Resort Hotel           0       213              2016                May
## 2949 Resort Hotel           0       213              2016                May
## 2950 Resort Hotel           0       213              2016                May
## 2951 Resort Hotel           0       213              2016                May
## 2952 Resort Hotel           0       213              2016                May
## 2953 Resort Hotel           0       213              2016                May
## 2954 Resort Hotel           0       213              2016                May
## 2955 Resort Hotel           0       213              2016                May
## 2956 Resort Hotel           0       213              2016                May
## 2957 Resort Hotel           0       213              2016                May
## 2958 Resort Hotel           0       213              2016                May
## 2959 Resort Hotel           0       213              2016                May
## 2960 Resort Hotel           0       213              2016                May
## 2961 Resort Hotel           0       213              2016                May
## 2962 Resort Hotel           0       213              2016                May
## 2963 Resort Hotel           0       213              2016                May
## 2964 Resort Hotel           0       213              2016                May
## 2965 Resort Hotel           0       213              2016                May
## 2966 Resort Hotel           0       213              2016                May
## 2967 Resort Hotel           0       213              2016                May
## 2968 Resort Hotel           0       213              2016                May
## 2969 Resort Hotel           0       213              2016                May
## 2970 Resort Hotel           0       213              2016                May
## 2971 Resort Hotel           0       213              2016                May
## 2972 Resort Hotel           0       213              2016                May
## 2973 Resort Hotel           0       213              2016                May
## 2974 Resort Hotel           0       213              2016                May
## 2975 Resort Hotel           0       201              2016                May
## 2976 Resort Hotel           0       201              2016                May
## 2977 Resort Hotel           0       189              2016                May
## 2978 Resort Hotel           0       265              2016                May
## 2979 Resort Hotel           0       215              2016                May
## 2980 Resort Hotel           0       265              2016                May
## 2981 Resort Hotel           0       201              2016                May
## 2982 Resort Hotel           0       189              2016                May
## 2983 Resort Hotel           0       201              2016                May
## 2984 Resort Hotel           0       201              2016                May
## 2985 Resort Hotel           0       201              2016                May
## 2986 Resort Hotel           0       196              2016                May
## 2987 Resort Hotel           0       253              2016                May
## 2988 Resort Hotel           0       224              2016                May
## 2989 Resort Hotel           0       224              2016                May
## 2990 Resort Hotel           0       139              2016                May
## 2991 Resort Hotel           0       239              2016                May
## 2992 Resort Hotel           0       191              2016                May
## 2993 Resort Hotel           0         3              2016                May
## 2994 Resort Hotel           0       304              2016                May
## 2995 Resort Hotel           0       304              2016                May
## 2996 Resort Hotel           0       274              2016                May
## 2997 Resort Hotel           0       237              2016                May
## 2998 Resort Hotel           0       193              2016                May
## 2999 Resort Hotel           0       217              2016                May
## 3000 Resort Hotel           0         5              2016                May
## 3001 Resort Hotel           0       210              2016                May
## 3002 Resort Hotel           0       192              2016                May
## 3003 Resort Hotel           0       220              2016                May
## 3004 Resort Hotel           0       248              2016                May
## 3005 Resort Hotel           0       236              2016                May
## 3006 Resort Hotel           0       212              2016                May
## 3007 Resort Hotel           0       307              2016                May
## 3008 Resort Hotel           0       221              2016                May
## 3009 Resort Hotel           0       233              2016                May
## 3010 Resort Hotel           0       222              2016                May
## 3011 Resort Hotel           0       257              2016                May
## 3012 Resort Hotel           0       206              2016                May
## 3013 Resort Hotel           0       222              2016                May
## 3014 Resort Hotel           0       223              2016                May
## 3015 Resort Hotel           0       223              2016                May
## 3016 Resort Hotel           0       223              2016                May
## 3017 Resort Hotel           0       223              2016                May
## 3018 Resort Hotel           0       223              2016                May
## 3019 Resort Hotel           0       223              2016                May
## 3020 Resort Hotel           0       223              2016                May
## 3021 Resort Hotel           0       223              2016                May
## 3022 Resort Hotel           0       223              2016                May
## 3023 Resort Hotel           0       223              2016                May
## 3024 Resort Hotel           0       223              2016                May
## 3025 Resort Hotel           0       223              2016                May
## 3026 Resort Hotel           0       223              2016                May
## 3027 Resort Hotel           0       223              2016                May
## 3028 Resort Hotel           0       223              2016                May
## 3029 Resort Hotel           0       223              2016                May
## 3030 Resort Hotel           0       223              2016                May
## 3031 Resort Hotel           0       223              2016                May
## 3032 Resort Hotel           0       223              2016                May
## 3033 Resort Hotel           0       213              2016                May
## 3034 Resort Hotel           0       223              2016                May
## 3035 Resort Hotel           0       223              2016                May
## 3036 Resort Hotel           0       227              2016                May
## 3037 Resort Hotel           0       227              2016                May
## 3038 Resort Hotel           0       257              2016                May
## 3039 Resort Hotel           0       224              2016                May
## 3040 Resort Hotel           0       224              2016                May
## 3041 Resort Hotel           0       224              2016                May
## 3042 Resort Hotel           0       224              2016                May
## 3043 Resort Hotel           0       224              2016                May
## 3044 Resort Hotel           0       224              2016                May
## 3045 Resort Hotel           0       224              2016                May
## 3046 Resort Hotel           0       224              2016                May
## 3047 Resort Hotel           0       224              2016                May
## 3048 Resort Hotel           0       224              2016                May
## 3049 Resort Hotel           0       197              2016                May
## 3050 Resort Hotel           0       225              2016                May
## 3051 Resort Hotel           0       225              2016                May
## 3052 Resort Hotel           0       225              2016                May
## 3053 Resort Hotel           0       225              2016                May
## 3054 Resort Hotel           0       225              2016                May
## 3055 Resort Hotel           0       225              2016                May
## 3056 Resort Hotel           0       225              2016                May
## 3057 Resort Hotel           0       225              2016                May
## 3058 Resort Hotel           0       225              2016                May
## 3059 Resort Hotel           0       225              2016                May
## 3060 Resort Hotel           0       225              2016                May
## 3061 Resort Hotel           0       225              2016                May
## 3062 Resort Hotel           0       225              2016                May
## 3063 Resort Hotel           0       225              2016                May
## 3064 Resort Hotel           0       225              2016                May
## 3065 Resort Hotel           0       225              2016                May
## 3066 Resort Hotel           0       225              2016                May
## 3067 Resort Hotel           0       225              2016                May
## 3068 Resort Hotel           0       225              2016                May
## 3069 Resort Hotel           0       225              2016                May
## 3070 Resort Hotel           0       225              2016                May
## 3071 Resort Hotel           0       225              2016                May
## 3072 Resort Hotel           0       225              2016                May
## 3073 Resort Hotel           0       225              2016                May
## 3074 Resort Hotel           0       225              2016                May
## 3075 Resort Hotel           0       225              2016                May
## 3076 Resort Hotel           0       225              2016                May
## 3077 Resort Hotel           0       225              2016                May
## 3078 Resort Hotel           0       225              2016                May
## 3079 Resort Hotel           0       225              2016                May
## 3080 Resort Hotel           0       225              2016                May
## 3081 Resort Hotel           0       225              2016                May
## 3082 Resort Hotel           0       225              2016                May
## 3083 Resort Hotel           0       225              2016                May
## 3084 Resort Hotel           0       225              2016                May
## 3085 Resort Hotel           0       225              2016                May
## 3086 Resort Hotel           0       225              2016                May
## 3087 Resort Hotel           0       264              2016                May
## 3088 Resort Hotel           0       311              2016                May
## 3089 Resort Hotel           0       238              2016                May
## 3090 Resort Hotel           0       264              2016                May
## 3091 Resort Hotel           0       226              2016                May
## 3092 Resort Hotel           0       204              2016                May
## 3093 Resort Hotel           0       312              2016                May
## 3094 Resort Hotel           0       204              2016                May
## 3095 Resort Hotel           0       204              2016                May
## 3096 Resort Hotel           0       312              2016                May
## 3097 Resort Hotel           0       225              2016                May
## 3098 Resort Hotel           0       225              2016                May
## 3099 Resort Hotel           0       225              2016                May
## 3100 Resort Hotel           0       225              2016                May
## 3101 Resort Hotel           0       225              2016                May
## 3102 Resort Hotel           0       225              2016                May
## 3103 Resort Hotel           0       225              2016                May
## 3104 Resort Hotel           0       225              2016                May
## 3105 Resort Hotel           0       225              2016                May
## 3106 Resort Hotel           0       225              2016                May
## 3107 Resort Hotel           0       225              2016                May
## 3108 Resort Hotel           0       225              2016                May
## 3109 Resort Hotel           0       225              2016                May
## 3110 Resort Hotel           0       225              2016                May
## 3111 Resort Hotel           0       225              2016                May
## 3112 Resort Hotel           0       213              2016                May
## 3113 Resort Hotel           0       225              2016                May
## 3114 Resort Hotel           0       225              2016                May
## 3115 Resort Hotel           0       225              2016                May
## 3116 Resort Hotel           0       210              2016                May
## 3117 Resort Hotel           0       314              2016                May
## 3118 Resort Hotel           0         0              2016                May
## 3119 Resort Hotel           0         0              2016                May
## 3120 Resort Hotel           0       229              2016                May
## 3121 Resort Hotel           0       215              2016                May
## 3122 Resort Hotel           0       215              2016                May
## 3123 Resort Hotel           0       215              2016                May
## 3124 Resort Hotel           0       213              2016                May
##      arrival_date_day_of_month stays_in_weekend_nights stays_in_week_nights
## 1                            1                       0                    0
## 2                            1                       0                    0
## 3                            1                       0                    1
## 4                            1                       0                    1
## 5                            1                       0                    2
## 6                            1                       0                    2
## 7                            1                       0                    2
## 8                            1                       0                    2
## 9                            1                       0                    4
## 10                           1                       0                    4
## 11                           1                       0                    4
## 12                           1                       0                    4
## 13                           1                       0                    4
## 14                           1                       0                    4
## 15                           1                       0                    1
## 16                           1                       0                    1
## 17                           1                       0                    4
## 18                           1                       1                    4
## 19                           1                       2                    4
## 20                           1                       2                    4
## 21                           1                       2                    4
## 22                           1                       2                    5
## 23                           1                       2                    5
## 24                           1                       2                    5
## 25                           1                       2                    5
## 26                           1                       2                    5
## 27                           1                       4                   10
## 28                           1                       4                   11
## 29                           2                       2                    4
## 30                           2                       1                    3
## 31                           2                       1                    3
## 32                           2                       2                    3
## 33                           2                       2                    3
## 34                           2                       2                    3
## 35                           2                       2                    3
## 36                           2                       2                    5
## 37                           2                       2                    5
## 38                           2                       2                    5
## 39                           2                       2                    5
## 40                           2                       2                    5
## 41                           2                       2                    5
## 42                           2                       3                    8
## 43                           2                       4                   10
## 44                           2                       0                    1
## 45                           2                       0                    1
## 46                           2                       0                    1
## 47                           2                       0                    1
## 48                           2                       0                    1
## 49                           2                       0                    1
## 50                           2                       0                    2
## 51                           2                       0                    2
## 52                           2                       0                    2
## 53                           2                       0                    3
## 54                           2                       0                    3
## 55                           3                       0                    2
## 56                           3                       0                    2
## 57                           3                       0                    2
## 58                           3                       0                    2
## 59                           3                       0                    2
## 60                           3                       1                    2
## 61                           3                       2                    2
## 62                           3                       2                    2
## 63                           3                       2                    6
## 64                           3                       2                    7
## 65                           3                       3                    7
## 66                           3                       3                    7
## 67                           3                       4                   10
## 68                           3                       4                   10
## 69                           3                       0                    1
## 70                           3                       0                    1
## 71                           3                       0                    1
## 72                           3                       0                    1
## 73                           3                       0                    1
## 74                           3                       0                    1
## 75                           3                       2                    5
## 76                           3                       2                    5
## 77                           3                       2                    5
## 78                           4                       2                    1
## 79                           4                       2                    1
## 80                           4                       2                    4
## 81                           4                       2                    4
## 82                           4                       2                    5
## 83                           4                       2                    5
## 84                           4                       2                    5
## 85                           4                       2                    5
## 86                           4                       2                    5
## 87                           4                       2                    5
## 88                           4                       2                    6
## 89                           4                       2                    6
## 90                           4                       4                    6
## 91                           4                       4                    6
## 92                           4                       4                    6
## 93                           4                       0                    1
## 94                           4                       0                    1
## 95                           4                       0                    1
## 96                           4                       0                    1
## 97                           4                       1                    1
## 98                           4                       1                    1
## 99                           4                       1                    1
## 100                          4                       1                    1
## 101                          5                       1                    0
## 102                          5                       1                    0
## 103                          5                       1                    0
## 104                          5                       1                    0
## 105                          5                       1                    0
## 106                          5                       1                    0
## 107                          5                       1                    0
## 108                          5                       2                    0
## 109                          5                       2                    0
## 110                          5                       2                    2
## 111                          5                       2                    3
## 112                          5                       2                    3
## 113                          5                       2                    3
## 114                          5                       2                    4
## 115                          5                       2                    4
## 116                          5                       2                    5
## 117                          5                       2                    5
## 118                          5                       2                    5
## 119                          5                       4                    5
## 120                          5                       4                    6
## 121                          5                       4                    6
## 122                          5                       4                    7
## 123                          5                       4                   10
## 124                          5                       4                   10
## 125                          6                       1                    4
## 126                          6                       1                    3
## 127                          6                       1                    3
## 128                          6                       1                    3
## 129                          6                       1                    3
## 130                          6                       1                    3
## 131                          6                       1                    3
## 132                          6                       0                    0
## 133                          6                       0                    0
## 134                          6                       1                    0
## 135                          6                       1                    1
## 136                          6                       1                    1
## 137                          6                       1                    2
## 138                          6                       1                    3
## 139                          6                       1                    3
## 140                          6                       1                    4
## 141                          6                       1                    4
## 142                          6                       1                    5
## 143                          6                       1                    5
## 144                          6                       2                    5
## 145                          6                       2                    5
## 146                          6                       3                    5
## 147                          6                       3                    7
## 148                          6                       3                    7
## 149                          6                       3                    7
## 150                          6                       3                    7
## 151                          6                       3                    8
## 152                          6                       4                   10
## 153                          6                       4                   10
## 154                          6                       2                    5
## 155                          7                       0                    3
## 156                          7                       0                    3
## 157                          7                       0                    0
## 158                          7                       0                    0
## 159                          7                       0                    1
## 160                          7                       0                    1
## 161                          7                       0                    1
## 162                          7                       0                    4
## 163                          7                       0                    4
## 164                          7                       0                    4
## 165                          7                       0                    4
## 166                          7                       2                    5
## 167                          7                       4                   10
## 168                          8                       0                    3
## 169                          8                       0                    4
## 170                          8                       0                    4
## 171                          8                       0                    4
## 172                          8                       0                    4
## 173                          8                       0                    1
## 174                          8                       0                    2
## 175                          8                       2                    4
## 176                          8                       2                    5
## 177                          8                       2                    5
## 178                          8                       2                    5
## 179                          8                       2                    6
## 180                          8                       2                    7
## 181                          8                       2                    7
## 182                          9                       0                    1
## 183                          9                       0                    2
## 184                          9                       0                    2
## 185                          9                       0                    3
## 186                          9                       1                    3
## 187                          9                       2                    3
## 188                          9                       2                    3
## 189                          9                       2                    5
## 190                          9                       2                    5
## 191                          9                       2                    5
## 192                          9                       2                    5
## 193                          9                       2                    5
## 194                         10                       0                    1
## 195                         10                       0                    2
## 196                         10                       0                    2
## 197                         10                       0                    2
## 198                         10                       0                    2
## 199                         10                       0                    2
## 200                         10                       0                    2
## 201                         10                       0                    2
## 202                         10                       0                    2
## 203                         10                       1                    2
## 204                         10                       1                    2
## 205                         10                       1                    2
## 206                         10                       2                    2
## 207                         10                       2                    2
## 208                         10                       2                    3
## 209                         10                       2                    3
## 210                         10                       2                    3
## 211                         10                       2                    5
## 212                         10                       2                    5
## 213                         10                       2                    5
## 214                         10                       2                    5
## 215                         10                       2                    5
## 216                         10                       2                    5
## 217                         10                       2                    5
## 218                         10                       2                    6
## 219                         10                       2                    7
## 220                         10                       3                    7
## 221                         10                       4                    7
## 222                         10                       4                    9
## 223                         10                       2                    5
## 224                         10                       2                    5
## 225                         11                       2                    3
## 226                         11                       2                    4
## 227                         11                       2                    4
## 228                         11                       2                    4
## 229                         11                       2                    5
## 230                         11                       2                    2
## 231                         11                       2                    2
## 232                         11                       2                    2
## 233                         11                       0                    1
## 234                         11                       0                    1
## 235                         11                       0                    1
## 236                         11                       0                    1
## 237                         11                       1                    1
## 238                         11                       1                    1
## 239                         11                       1                    1
## 240                         11                       2                    1
## 241                         11                       2                    1
## 242                         11                       2                    5
## 243                         11                       2                    5
## 244                         11                       2                    6
## 245                         11                       4                    6
## 246                         11                       2                    5
## 247                         11                       2                    5
## 248                         12                       1                    0
## 249                         12                       1                    0
## 250                         12                       2                    4
## 251                         12                       2                    5
## 252                         12                       2                    5
## 253                         12                       2                    5
## 254                         12                       2                    5
## 255                         12                       2                    5
## 256                         12                       2                    5
## 257                         12                       2                    5
## 258                         12                       2                    5
## 259                         12                       2                    5
## 260                         12                       2                    5
## 261                         12                       4                    5
## 262                         12                       4                    5
## 263                         12                       4                    7
## 264                         12                       4                    7
## 265                         12                       2                    5
## 266                         12                       1                    0
## 267                         12                       2                    0
## 268                         12                       2                    0
## 269                         12                       2                    0
## 270                         12                       2                    0
## 271                         12                       2                    0
## 272                         12                       2                    1
## 273                         12                       2                    1
## 274                         12                       2                    2
## 275                         12                       2                    2
## 276                         12                       2                    2
## 277                         12                       2                    3
## 278                         12                       2                    3
## 279                         12                       2                    3
## 280                         13                       2                    5
## 281                         13                       2                    5
## 282                         13                       2                    5
## 283                         13                       1                    1
## 284                         13                       1                    1
## 285                         13                       1                    1
## 286                         13                       1                    1
## 287                         13                       1                    1
## 288                         13                       1                    1
## 289                         13                       1                    1
## 290                         13                       1                    2
## 291                         13                       1                    2
## 292                         13                       1                    2
## 293                         13                       1                    2
## 294                         13                       1                    2
## 295                         13                       1                    3
## 296                         13                       1                    4
## 297                         13                       1                    4
## 298                         13                       1                    4
## 299                         13                       1                    4
## 300                         13                       1                    4
## 301                         13                       1                    5
## 302                         13                       1                    5
## 303                         13                       2                    5
## 304                         13                       2                    5
## 305                         13                       2                    5
## 306                         13                       1                    0
## 307                         13                       1                    3
## 308                         13                       3                    5
## 309                         13                       3                    6
## 310                         14                       0                    1
## 311                         14                       0                    1
## 312                         14                       0                    2
## 313                         14                       0                    4
## 314                         14                       0                    5
## 315                         14                       0                    5
## 316                         14                       1                    5
## 317                         14                       1                    5
## 318                         14                       1                    5
## 319                         14                       2                    5
## 320                         14                       2                    5
## 321                         14                       2                    7
## 322                         14                       2                    9
## 323                         14                       4                   10
## 324                         14                       4                   10
## 325                         14                       4                   11
## 326                         14                       0                    1
## 327                         15                       2                    4
## 328                         15                       2                    6
## 329                         15                       0                    2
## 330                         15                       0                    2
## 331                         15                       0                    2
## 332                         15                       0                    2
## 333                         15                       0                    2
## 334                         15                       2                    7
## 335                         15                       0                    2
## 336                         15                       0                    2
## 337                         15                       0                    2
## 338                         15                       0                    2
## 339                         15                       0                    2
## 340                         15                       0                    2
## 341                         15                       0                    2
## 342                         15                       0                    2
## 343                         15                       0                    2
## 344                         15                       0                    2
## 345                         15                       0                    2
## 346                         15                       0                    2
## 347                         15                       0                    2
## 348                         15                       0                    2
## 349                         16                       0                    2
## 350                         16                       0                    1
## 351                         16                       0                    1
## 352                         16                       0                    2
## 353                         16                       0                    2
## 354                         16                       0                    2
## 355                         16                       0                    3
## 356                         16                       0                    3
## 357                         16                       2                    3
## 358                         16                       2                    3
## 359                         16                       1                    3
## 360                         16                       2                    4
## 361                         16                       2                    5
## 362                         16                       2                    6
## 363                         16                       4                   10
## 364                         17                       0                    0
## 365                         17                       0                    2
## 366                         17                       0                    2
## 367                         17                       0                    2
## 368                         17                       0                    2
## 369                         17                       0                    2
## 370                         17                       0                    2
## 371                         17                       0                    2
## 372                         17                       0                    2
## 373                         17                       0                    2
## 374                         17                       2                    3
## 375                         17                       2                    3
## 376                         17                       2                    3
## 377                         17                       2                    3
## 378                         17                       2                    3
## 379                         17                       2                    3
## 380                         17                       2                    3
## 381                         17                       2                    3
## 382                         17                       2                    3
## 383                         17                       2                    4
## 384                         17                       2                    5
## 385                         17                       2                    5
## 386                         17                       2                    5
## 387                         17                       2                    5
## 388                         17                       2                    5
## 389                         17                       2                    5
## 390                         17                       2                    6
## 391                         17                       2                    6
## 392                         17                       2                    6
## 393                         17                       3                    7
## 394                         17                       1                    2
## 395                         17                       1                    2
## 396                         17                       1                    2
## 397                         17                       1                    2
## 398                         17                       1                    2
## 399                         17                       1                    2
## 400                         17                       1                    2
## 401                         17                       1                    2
## 402                         17                       1                    2
## 403                         17                       1                    2
## 404                         17                       2                    2
## 405                         18                       2                    1
## 406                         18                       2                    4
## 407                         18                       2                    4
## 408                         18                       2                    5
## 409                         18                       2                    5
## 410                         18                       2                    2
## 411                         18                       2                    2
## 412                         18                       2                    3
## 413                         18                       2                    3
## 414                         18                       2                    3
## 415                         18                       0                    1
## 416                         18                       0                    1
## 417                         18                       1                    1
## 418                         18                       2                    1
## 419                         18                       2                    5
## 420                         18                       2                    5
## 421                         18                       2                    5
## 422                         18                       2                    5
## 423                         18                       2                    5
## 424                         18                       2                    5
## 425                         18                       2                    5
## 426                         18                       2                    6
## 427                         18                       2                    6
## 428                         18                       4                   10
## 429                         19                       1                    0
## 430                         19                       1                    0
## 431                         19                       1                    0
## 432                         19                       1                    0
## 433                         19                       1                    0
## 434                         19                       2                    0
## 435                         19                       2                    2
## 436                         19                       2                    3
## 437                         19                       2                    5
## 438                         19                       2                    5
## 439                         19                       2                    5
## 440                         19                       2                    5
## 441                         19                       2                    4
## 442                         19                       2                    5
## 443                         19                       2                    5
## 444                         19                       4                    6
## 445                         19                       4                   10
## 446                         19                       2                    4
## 447                         20                       1                    0
## 448                         20                       0                    0
## 449                         20                       0                    0
## 450                         20                       1                    3
## 451                         20                       1                    3
## 452                         20                       1                    3
## 453                         20                       1                    3
## 454                         20                       1                    3
## 455                         20                       1                    4
## 456                         20                       1                    5
## 457                         20                       2                    5
## 458                         20                       2                    5
## 459                         20                       2                    5
## 460                         20                       2                    5
## 461                         20                       2                    5
## 462                         20                       2                    5
## 463                         20                       3                    7
## 464                         20                       3                    7
## 465                         20                       3                    7
## 466                         21                       0                    2
## 467                         21                       0                    4
## 468                         21                       0                    5
## 469                         21                       1                    5
## 470                         21                       2                    5
## 471                         21                       2                    5
## 472                         21                       2                    6
## 473                         21                       2                    7
## 474                         21                       2                    8
## 475                         22                       0                    1
## 476                         22                       0                    4
## 477                         23                       0                    0
## 478                         23                       0                    0
## 479                         23                       0                    1
## 480                         23                       0                    1
## 481                         23                       0                    3
## 482                         23                       0                    3
## 483                         23                       2                    3
## 484                         23                       2                    6
## 485                         24                       0                    2
## 486                         24                       0                    2
## 487                         24                       0                    2
## 488                         24                       0                    2
## 489                         24                       0                    2
## 490                         24                       0                    2
## 491                         24                       0                    2
## 492                         24                       0                    2
## 493                         24                       0                    2
## 494                         24                       1                    2
## 495                         24                       0                    2
## 496                         24                       2                    2
## 497                         24                       2                    2
## 498                         24                       2                    3
## 499                         24                       2                    3
## 500                         24                       2                    5
## 501                         24                       2                    6
## 502                         24                       2                    7
## 503                         24                       3                    7
## 504                         25                       0                    0
## 505                         25                       2                    1
## 506                         25                       0                    1
## 507                         25                       0                    1
## 508                         25                       0                    1
## 509                         25                       1                    1
## 510                         25                       1                    1
## 511                         25                       2                    1
## 512                         25                       2                    2
## 513                         25                       2                    3
## 514                         25                       2                    3
## 515                         25                       2                    3
## 516                         25                       2                    3
## 517                         25                       2                    3
## 518                         25                       2                    4
## 519                         25                       2                    5
## 520                         25                       2                    5
## 521                         25                       2                    5
## 522                         25                       2                    5
## 523                         25                       2                    5
## 524                         25                       2                    6
## 525                         25                       2                    6
## 526                         25                       4                    6
## 527                         25                       4                    8
## 528                         25                       2                    5
## 529                         25                       2                    5
## 530                         26                       2                    1
## 531                         26                       2                    1
## 532                         26                       2                    3
## 533                         26                       2                    5
## 534                         26                       2                    0
## 535                         26                       2                    5
## 536                         26                       2                    5
## 537                         27                       0                    0
## 538                         27                       1                    1
## 539                         27                       1                    2
## 540                         27                       1                    2
## 541                         27                       1                    2
## 542                         27                       1                    2
## 543                         27                       1                    3
## 544                         27                       1                    3
## 545                         27                       1                    3
## 546                         27                       1                    3
## 547                         27                       1                    3
## 548                         27                       1                    3
## 549                         27                       1                    3
## 550                         27                       1                    3
## 551                         27                       1                    3
## 552                         27                       1                    3
## 553                         27                       1                    4
## 554                         27                       1                    4
## 555                         27                       1                    4
## 556                         27                       1                    5
## 557                         27                       1                    5
## 558                         27                       2                    5
## 559                         27                       2                    5
## 560                         28                       0                    1
## 561                         28                       0                    1
## 562                         28                       0                    2
## 563                         28                       0                    4
## 564                         28                       0                    4
## 565                         28                       0                    4
## 566                         28                       0                    5
## 567                         28                       0                    5
## 568                         28                       1                    5
## 569                         28                       2                    8
## 570                         29                       0                    0
## 571                         29                       0                    4
## 572                         29                       1                    4
## 573                         29                       1                    4
## 574                         29                       0                    1
## 575                         29                       1                    4
## 576                         29                       1                    4
## 577                         29                       2                    5
## 578                         29                       2                    4
## 579                         30                       0                    1
## 580                         30                       0                    2
## 581                         30                       0                    3
## 582                         30                       0                    3
## 583                         30                       1                    3
## 584                         30                       2                    7
## 585                         30                       2                    7
## 586                         30                       2                    7
## 587                         31                       0                    0
## 588                         31                       0                    0
## 589                         31                       0                    1
## 590                         31                       0                    2
## 591                         31                       0                    2
## 592                         31                       0                    2
## 593                         31                       0                    2
## 594                         31                       0                    2
## 595                         31                       2                    2
## 596                         31                       2                    2
## 597                         31                       2                    3
## 598                         31                       2                    4
## 599                         31                       3                    7
## 600                          1                       1                    1
## 601                          1                       0                    1
## 602                          1                       2                    5
## 603                          1                       2                    5
## 604                          1                       2                    6
## 605                          1                       4                   10
## 606                          2                       2                    5
## 607                          2                       2                    4
## 608                          2                       2                    4
## 609                          2                       2                    5
## 610                          2                       2                    5
## 611                          2                       4                    5
## 612                          2                       2                    5
## 613                          3                       0                    0
## 614                          3                       1                    0
## 615                          3                       2                    5
## 616                          3                       2                    5
## 617                          4                       0                    0
## 618                          4                       0                    0
## 619                          4                       0                    1
## 620                          4                       0                    4
## 621                          4                       0                    4
## 622                          4                       0                    5
## 623                          4                       2                    5
## 624                          4                       2                    5
## 625                          4                       2                    5
## 626                          4                       2                    8
## 627                          5                       0                    0
## 628                          5                       0                    0
## 629                          5                       0                    1
## 630                          5                       0                    1
## 631                          5                       0                    4
## 632                          5                       0                    4
## 633                          5                       0                    4
## 634                          5                       2                    5
## 635                          6                       0                    1
## 636                          6                       0                    3
## 637                          6                       0                    3
## 638                          6                       1                    3
## 639                          6                       2                    3
## 640                          6                       2                    3
## 641                          6                       2                    4
## 642                          6                       2                    6
## 643                          6                       2                    6
## 644                          6                       2                    8
## 645                          7                       0                    0
## 646                          7                       0                    1
## 647                          7                       0                    2
## 648                          7                       0                    2
## 649                          7                       0                    2
## 650                          7                       1                    2
## 651                          7                       2                    2
## 652                          7                       2                    2
## 653                          7                       2                    3
## 654                          7                       2                    5
## 655                          7                       2                    5
## 656                          7                       2                    7
## 657                          8                       0                    1
## 658                          8                       1                    1
## 659                          8                       1                    1
## 660                          8                       2                    1
## 661                          8                       2                    1
## 662                          8                       2                    2
## 663                          8                       2                    2
## 664                          8                       2                    5
## 665                          8                       2                    5
## 666                          8                       2                    5
## 667                          8                       2                    5
## 668                          8                       2                    5
## 669                          8                       4                    9
## 670                          9                       1                    0
## 671                          9                       1                    0
## 672                          9                       1                    0
## 673                          9                       2                    1
## 674                          9                       2                    2
## 675                          9                       2                    2
## 676                          9                       2                    4
## 677                          9                       2                    4
## 678                          9                       2                    5
## 679                          9                       2                    5
## 680                          9                       2                    5
## 681                          9                       2                    5
## 682                         10                       0                    0
## 683                         10                       1                    2
## 684                         10                       1                    2
## 685                         10                       1                    2
## 686                         10                       1                    4
## 687                         10                       1                    5
## 688                         10                       1                    5
## 689                         10                       1                    5
## 690                         10                       2                    5
## 691                         10                       3                    8
## 692                         11                       0                    0
## 693                         11                       0                    0
## 694                         11                       0                    4
## 695                         11                       0                    5
## 696                         11                       2                    5
## 697                         11                       2                    5
## 698                         11                       2                    8
## 699                         11                       2                    8
## 700                         11                       2                   10
## 701                         12                       0                    1
## 702                         12                       0                    3
## 703                         12                       2                    8
## 704                         12                       2                    8
## 705                         12                       1                    4
## 706                         13                       0                    1
## 707                         13                       0                    1
## 708                         13                       0                    1
## 709                         13                       0                    3
## 710                         13                       0                    3
## 711                         13                       1                    3
## 712                         13                       1                    3
## 713                         13                       2                    3
## 714                         13                       2                    3
## 715                         13                       2                    3
## 716                         13                       2                    3
## 717                         14                       0                    0
## 718                         14                       0                    1
## 719                         14                       0                    1
## 720                         14                       0                    1
## 721                         14                       0                    1
## 722                         14                       0                    1
## 723                         14                       0                    2
## 724                         14                       0                    2
## 725                         14                       0                    2
## 726                         14                       1                    2
## 727                         14                       2                    2
## 728                         14                       2                    3
## 729                         14                       2                    3
## 730                         14                       2                    5
## 731                         14                       2                    5
## 732                         14                       2                    5
## 733                         15                       1                    1
## 734                         15                       2                    2
## 735                         15                       2                    2
## 736                         15                       2                    2
## 737                         15                       2                    2
## 738                         15                       2                    3
## 739                         15                       2                    3
## 740                         15                       2                    4
## 741                         15                       2                    4
## 742                         15                       2                    4
## 743                         15                       2                    5
## 744                         15                       2                    5
## 745                         15                       2                    5
## 746                         15                       2                    5
## 747                         15                       2                    5
## 748                         15                       4                   10
## 749                         16                       1                    0
## 750                         16                       1                    0
## 751                         16                       1                    0
## 752                         16                       1                    0
## 753                         16                       1                    0
## 754                         16                       1                    0
## 755                         16                       1                    0
## 756                         16                       1                    0
## 757                         16                       4                    5
## 758                         17                       1                    4
## 759                         17                       1                    5
## 760                         17                       2                    5
## 761                         17                       2                    5
## 762                         17                       2                    5
## 763                         17                       2                    5
## 764                         17                       2                    5
## 765                         18                       0                    1
## 766                         18                       0                    3
## 767                         18                       1                    5
## 768                         18                       1                    5
## 769                         18                       1                    5
## 770                         18                       1                    5
## 771                         18                       1                    5
## 772                         18                       2                    5
## 773                         18                       2                    5
## 774                         18                       2                    5
## 775                         18                       2                    8
## 776                         18                       2                    8
## 777                         19                       0                    0
## 778                         19                       0                    1
## 779                         19                       0                    4
## 780                         19                       0                    4
## 781                         19                       1                    4
## 782                         19                       1                    4
## 783                         19                       2                    7
## 784                         19                       2                    7
## 785                         20                       0                    0
## 786                         20                       0                    0
## 787                         20                       0                    1
## 788                         20                       0                    3
## 789                         20                       2                    4
## 790                         20                       2                    7
## 791                         20                       2                    3
## 792                         21                       0                    2
## 793                         21                       0                    2
## 794                         21                       0                    2
## 795                         21                       0                    2
## 796                         21                       2                    2
## 797                         21                       2                    3
## 798                         21                       2                    3
## 799                         21                       2                    3
## 800                         21                       2                    3
## 801                         21                       2                    4
## 802                         21                       2                    4
## 803                         21                       2                    4
## 804                         21                       2                    4
## 805                         21                       2                    5
## 806                         21                       2                    5
## 807                         21                       2                    5
## 808                         21                       2                    5
## 809                         21                       2                    7
## 810                         21                       3                    7
## 811                         22                       0                    1
## 812                         22                       2                    4
## 813                         22                       2                    5
## 814                         22                       2                    5
## 815                         22                       2                    5
## 816                         22                       2                    5
## 817                         22                       2                    5
## 818                         22                       2                    5
## 819                         22                       2                    5
## 820                         22                       2                    5
## 821                         22                       2                    5
## 822                         22                       2                    5
## 823                         22                       2                    6
## 824                         22                       2                    2
## 825                         22                       2                    3
## 826                         22                       2                    3
## 827                         22                       2                    4
## 828                         22                       2                    4
## 829                         23                       2                    1
## 830                         23                       2                    2
## 831                         23                       2                    3
## 832                         23                       2                    3
## 833                         23                       2                    3
## 834                         23                       2                    5
## 835                         23                       2                    5
## 836                         23                       2                    5
## 837                         23                       4                   10
## 838                         24                       1                    0
## 839                         24                       1                    0
## 840                         24                       1                    0
## 841                         24                       1                    0
## 842                         24                       1                    1
## 843                         24                       1                    1
## 844                         24                       1                    3
## 845                         24                       1                    4
## 846                         24                       1                    4
## 847                         24                       1                    4
## 848                         24                       3                    7
## 849                         25                       0                    3
## 850                         25                       2                    8
## 851                         26                       0                    0
## 852                         26                       0                    1
## 853                         26                       0                    1
## 854                         26                       0                    1
## 855                         26                       0                    4
## 856                         26                       2                    9
## 857                         27                       0                    1
## 858                         27                       0                    2
## 859                         27                       0                    3
## 860                         27                       1                    3
## 861                         27                       2                    4
## 862                         27                       2                    4
## 863                         27                       2                    5
## 864                         27                       2                    5
## 865                         27                       2                    5
## 866                         28                       0                    1
## 867                         28                       0                    2
## 868                         28                       0                    2
## 869                         28                       0                    2
## 870                         28                       0                    2
## 871                         28                       0                    2
## 872                         28                       0                    2
## 873                         28                       1                    2
## 874                         28                       1                    2
## 875                         28                       1                    2
## 876                         28                       1                    2
## 877                         28                       1                    2
## 878                         28                       1                    2
## 879                         28                       1                    2
## 880                         28                       0                    1
## 881                         28                       0                    2
## 882                         28                       2                    2
## 883                         28                       2                    2
## 884                         28                       2                    3
## 885                         28                       2                    4
## 886                         28                       2                    4
## 887                         28                       2                    5
## 888                         28                       2                    5
## 889                         28                       2                    5
## 890                         28                       2                    3
## 891                         28                       2                    5
## 892                         28                       2                    3
## 893                         29                       1                    1
## 894                         29                       1                    1
## 895                         29                       2                    1
## 896                         29                       2                    1
## 897                         29                       0                    1
## 898                         29                       2                    2
## 899                         29                       2                    2
## 900                         29                       2                    3
## 901                         29                       2                    3
## 902                         29                       2                    4
## 903                         29                       2                    5
## 904                         30                       1                    0
## 905                         30                       2                    0
## 906                         30                       2                    0
## 907                         30                       2                    1
## 908                         30                       2                    1
## 909                         30                       2                    2
## 910                         30                       2                    2
## 911                         30                       2                    3
## 912                         30                       2                    4
## 913                         30                       2                    4
## 914                         30                       2                    5
## 915                         30                       2                    5
## 916                         31                       1                    0
## 917                         31                       1                    1
## 918                         31                       1                    1
## 919                         31                       1                    1
## 920                         31                       1                    2
## 921                         31                       1                    2
## 922                         31                       1                    2
## 923                         31                       1                    2
## 924                         31                       1                    2
## 925                         31                       1                    3
## 926                         31                       1                    3
## 927                         31                       1                    3
## 928                         31                       2                    5
## 929                         31                       3                    7
## 930                         31                       3                    8
## 931                          1                       0                    3
## 932                          1                       0                    3
## 933                          1                       0                    3
## 934                          1                       0                    4
## 935                          1                       0                    4
## 936                          1                       0                    4
## 937                          1                       0                    4
## 938                          1                       0                    5
## 939                          1                       0                    2
## 940                          1                       0                    5
## 941                          1                       1                    5
## 942                          1                       2                    5
## 943                          1                       2                    5
## 944                          1                       2                    5
## 945                          1                       2                    6
## 946                          1                       2                    6
## 947                          1                       2                    8
## 948                          1                       2                   10
## 949                          1                       4                   10
## 950                          2                       0                    1
## 951                          2                       0                    4
## 952                          2                       1                    4
## 953                          2                       1                    4
## 954                          2                       2                    5
## 955                          3                       0                    2
## 956                          3                       0                    3
## 957                          3                       0                    3
## 958                          3                       0                    3
## 959                          3                       0                    1
## 960                          3                       0                    3
## 961                          3                       0                    3
## 962                          3                       0                    3
## 963                          3                       0                    3
## 964                          3                       0                    3
## 965                          3                       0                    3
## 966                          3                       1                    3
## 967                          3                       1                    3
## 968                          3                       1                    3
## 969                          3                       1                    3
## 970                          3                       1                    3
## 971                          3                       2                    7
## 972                          3                       2                    7
## 973                          3                       2                    7
## 974                          3                       2                    8
## 975                          3                       2                    8
## 976                          3                       2                    5
## 977                          3                       2                    5
## 978                          3                       4                   10
## 979                          4                       0                    1
## 980                          4                       0                    1
## 981                          4                       0                    1
## 982                          4                       0                    2
## 983                          4                       0                    2
## 984                          4                       0                    2
## 985                          4                       0                    2
## 986                          4                       1                    2
## 987                          4                       1                    2
## 988                          4                       1                    2
## 989                          4                       2                    2
## 990                          4                       2                    2
## 991                          4                       2                    3
## 992                          4                       2                    3
## 993                          4                       2                    7
## 994                          4                       3                    7
## 995                          4                       3                    7
## 996                          4                       2                    4
## 997                          4                       2                    5
## 998                          5                       2                    4
## 999                          5                       2                    4
## 1000                         5                       2                    4
## 1001                         5                       2                    5
## 1002                         5                       1                    1
## 1003                         5                       2                    2
## 1004                         5                       2                    5
## 1005                         5                       2                    5
## 1006                         5                       2                    5
## 1007                         5                       2                    5
## 1008                         5                       2                    5
## 1009                         5                       4                    6
## 1010                         5                       4                   10
## 1011                         5                       4                   10
## 1012                         6                       0                    0
## 1013                         6                       2                    0
## 1014                         6                       2                    1
## 1015                         6                       2                    2
## 1016                         6                       2                    3
## 1017                         6                       2                    4
## 1018                         6                       2                    4
## 1019                         6                       2                    4
## 1020                         6                       2                    4
## 1021                         6                       2                    5
## 1022                         6                       2                    5
## 1023                         6                       2                    5
## 1024                         6                       2                    5
## 1025                         6                       2                    5
## 1026                         6                       2                    5
## 1027                         6                       2                    5
## 1028                         6                       2                    5
## 1029                         6                       4                    6
## 1030                         6                       4                    6
## 1031                         6                       4                    7
## 1032                         6                       4                   10
## 1033                         7                       1                    3
## 1034                         7                       1                    3
## 1035                         7                       1                    4
## 1036                         7                       1                    4
## 1037                         7                       1                    4
## 1038                         7                       1                    5
## 1039                         7                      13                   33
## 1040                         7                       3                    7
## 1041                         8                       0                    2
## 1042                         8                       0                    4
## 1043                         8                       2                    5
## 1044                         8                       2                    5
## 1045                         8                       2                    5
## 1046                         8                       2                    6
## 1047                         8                       2                    5
## 1048                         8                       4                   10
## 1049                         9                       0                    1
## 1050                         9                       0                    1
## 1051                         9                       0                    1
## 1052                         9                       0                    2
## 1053                         9                       0                    3
## 1054                         9                       0                    1
## 1055                         9                       0                    3
## 1056                         9                       2                    4
## 1057                         9                       2                    4
## 1058                         9                       2                    5
## 1059                         9                       2                    5
## 1060                         9                       1                    4
## 1061                         9                       1                    4
## 1062                        10                       0                    3
## 1063                        10                       1                    3
## 1064                        10                       1                    3
## 1065                        10                       2                    3
## 1066                        10                       2                    3
## 1067                        10                       2                    5
## 1068                        10                       0                    1
## 1069                        10                       0                    1
## 1070                        10                       0                    2
## 1071                        10                       0                    2
## 1072                        10                       2                    5
## 1073                        10                       2                    5
## 1074                        10                       2                    5
## 1075                        10                       2                    5
## 1076                        10                       2                    5
## 1077                        10                       2                    7
## 1078                        10                       2                    8
## 1079                        10                       2                    8
## 1080                        10                       4                   10
## 1081                        11                       0                    1
## 1082                        11                       0                    1
## 1083                        11                       0                    1
## 1084                        11                       0                    1
## 1085                        11                       0                    1
## 1086                        11                       0                    1
## 1087                        11                       0                    2
## 1088                        11                       0                    2
## 1089                        11                       0                    2
## 1090                        11                       0                    2
## 1091                        11                       1                    2
## 1092                        11                       1                    2
## 1093                        11                       1                    2
## 1094                        11                       2                    3
## 1095                        11                       2                    5
## 1096                        11                       2                    5
## 1097                        11                       3                    7
## 1098                        12                       2                    2
## 1099                        12                       2                    4
## 1100                        12                       2                    5
## 1101                        12                       2                    5
## 1102                        12                       2                    5
## 1103                        12                       2                    5
## 1104                        12                       6                   12
## 1105                        12                       2                    5
## 1106                        13                       1                    0
## 1107                        13                       2                    2
## 1108                        13                       2                    2
## 1109                        13                       2                    3
## 1110                        13                       2                    3
## 1111                        13                       2                    5
## 1112                        13                       2                    5
## 1113                        13                       3                    5
## 1114                        13                       4                    7
## 1115                        13                       4                    8
## 1116                        13                       4                    8
## 1117                        13                       4                   10
## 1118                        14                       1                    1
## 1119                        14                       1                    2
## 1120                        14                       1                    4
## 1121                        14                       1                    4
## 1122                        14                       1                    4
## 1123                        14                       1                    4
## 1124                        14                       1                    5
## 1125                        14                       1                    5
## 1126                        14                       3                    5
## 1127                        14                       4                   10
## 1128                        14                       8                   20
## 1129                        14                       1                    2
## 1130                        15                       0                    1
## 1131                        15                       0                    5
## 1132                        15                       1                    5
## 1133                        15                       2                    7
## 1134                        15                       4                   10
## 1135                        15                       4                   10
## 1136                        16                       0                    1
## 1137                        16                       0                    1
## 1138                        16                       0                    1
## 1139                        16                       0                    1
## 1140                        16                       0                    1
## 1141                        16                       0                    1
## 1142                        16                       0                    1
## 1143                        16                       0                    1
## 1144                        16                       0                    2
## 1145                        16                       0                    2
## 1146                        16                       0                    3
## 1147                        16                       0                    3
## 1148                        16                       0                    3
## 1149                        16                       0                    3
## 1150                        16                       0                    3
## 1151                        16                       1                    4
## 1152                        16                       0                    4
## 1153                        16                       1                    4
## 1154                        16                       2                    5
## 1155                        16                       2                    5
## 1156                        16                       2                    5
## 1157                        17                       0                    1
## 1158                        17                       0                    2
## 1159                        17                       0                    0
## 1160                        17                       0                    1
## 1161                        17                       0                    1
## 1162                        17                       1                    3
## 1163                        17                       1                    3
## 1164                        17                       1                    3
## 1165                        17                       1                    3
## 1166                        17                       1                    3
## 1167                        17                       2                    3
## 1168                        17                       1                    3
## 1169                        17                       1                    3
## 1170                        17                       2                    5
## 1171                        17                       2                    5
## 1172                        17                       2                    5
## 1173                        17                       2                    5
## 1174                        17                       4                   10
## 1175                        17                       4                   10
## 1176                        18                       0                    2
## 1177                        18                       0                    2
## 1178                        18                       1                    2
## 1179                        18                       1                    2
## 1180                        18                       1                    2
## 1181                        18                       2                    3
## 1182                        18                       2                    5
## 1183                        18                       2                    5
## 1184                        18                       3                    7
## 1185                        19                       1                    1
## 1186                        19                       2                    2
## 1187                        19                       2                    2
## 1188                        19                       2                    3
## 1189                        19                       2                    3
## 1190                        19                       2                    5
## 1191                        19                       2                    5
## 1192                        19                       2                    5
## 1193                        19                       2                    5
## 1194                        19                       2                    5
## 1195                        19                       2                    5
## 1196                        19                       4                    6
## 1197                        19                       4                    6
## 1198                        19                       4                    6
## 1199                        20                       2                    2
## 1200                        20                       2                    5
## 1201                        20                       2                    5
## 1202                        20                       2                    5
## 1203                        20                       2                    5
## 1204                        20                       4                    7
## 1205                        20                       4                    7
## 1206                        20                       4                    7
## 1207                        21                       1                    1
## 1208                        21                       1                    1
## 1209                        21                       1                    1
## 1210                        21                       1                    2
## 1211                        21                       1                    2
## 1212                        21                       2                    5
## 1213                        21                       2                    5
## 1214                        21                       2                    5
## 1215                        21                       2                    5
## 1216                        21                       2                    5
## 1217                        21                       2                    5
## 1218                        21                       3                    6
## 1219                        21                       3                    7
## 1220                        21                       3                    7
## 1221                        21                       3                    7
## 1222                        21                       3                    8
## 1223                        22                       0                    2
## 1224                        22                       2                    5
## 1225                        22                       2                    5
## 1226                        22                       2                    5
## 1227                        22                       2                    5
## 1228                        22                       2                    6
## 1229                        23                       0                    1
## 1230                        23                       0                    1
## 1231                        23                       0                    1
## 1232                        23                       0                    2
## 1233                        23                       0                    2
## 1234                        23                       1                    4
## 1235                        23                       2                    5
## 1236                        23                       2                    6
## 1237                        23                       2                    7
## 1238                        24                       0                    3
## 1239                        24                       0                    2
## 1240                        24                       0                    2
## 1241                        24                       0                    3
## 1242                        24                       0                    1
## 1243                        24                       2                    3
## 1244                        24                       2                    3
## 1245                        24                       2                    5
## 1246                        24                       2                    5
## 1247                        24                       2                    8
## 1248                        24                       4                   10
## 1249                        25                       0                    1
## 1250                        25                       0                    1
## 1251                        25                       0                    1
## 1252                        25                       0                    1
## 1253                        25                       0                    1
## 1254                        25                       0                    2
## 1255                        25                       0                    2
## 1256                        25                       0                    2
## 1257                        25                       0                    2
## 1258                        25                       2                    3
## 1259                        25                       2                    3
## 1260                        25                       2                    5
## 1261                        25                       2                    5
## 1262                        25                       2                    5
## 1263                        25                       2                    6
## 1264                        26                       0                    1
## 1265                        26                       1                    1
## 1266                        26                       1                    1
## 1267                        26                       2                    1
## 1268                        26                       2                    3
## 1269                        26                       2                    4
## 1270                        26                       2                    5
## 1271                        26                       2                    5
## 1272                        26                       2                    5
## 1273                        27                       2                    2
## 1274                        27                       1                    0
## 1275                        27                       1                    0
## 1276                        27                       2                    3
## 1277                        27                       2                    5
## 1278                        27                       2                    5
## 1279                        27                       2                    5
## 1280                        27                       2                    5
## 1281                        27                       2                    5
## 1282                        27                       2                    5
## 1283                        27                       2                    5
## 1284                        27                       4                    6
## 1285                        27                       4                    8
## 1286                        27                       4                   10
## 1287                        28                       1                    0
## 1288                        28                       1                    1
## 1289                        28                       1                    3
## 1290                        28                       1                    3
## 1291                        28                       2                    5
## 1292                        28                       2                    5
## 1293                        28                       2                    5
## 1294                        28                       3                    5
## 1295                        28                       3                    9
## 1296                        29                       2                    5
## 1297                        29                       2                    5
## 1298                        29                       0                    4
## 1299                        29                       2                    5
## 1300                        29                       2                    5
## 1301                        29                       2                    6
## 1302                        29                       2                    7
## 1303                        29                       2                   10
## 1304                        30                       0                    1
## 1305                        30                       0                    1
## 1306                        30                       0                    1
## 1307                        30                       0                    2
## 1308                        30                       0                    3
## 1309                        30                       0                    3
## 1310                        30                       0                    3
## 1311                        30                       0                    3
## 1312                        30                       0                    3
## 1313                        30                       0                    3
## 1314                        30                       0                    3
## 1315                        30                       0                    3
## 1316                        30                       2                    4
## 1317                        30                       2                    4
## 1318                        30                       2                    5
## 1319                        30                       2                    5
## 1320                        30                       2                    5
## 1321                        30                       2                    5
## 1322                        30                       2                    5
## 1323                        30                       2                    5
## 1324                        30                       2                    5
## 1325                        30                       4                   10
## 1326                         1                       0                    1
## 1327                         1                       0                    3
## 1328                         1                       0                    3
## 1329                         1                       0                    3
## 1330                         1                       0                    3
## 1331                         1                       1                    3
## 1332                         1                       1                    3
## 1333                         1                       1                    3
## 1334                         1                       2                    3
## 1335                         1                       2                    3
## 1336                         1                       2                    3
## 1337                         1                       2                    5
## 1338                         1                       2                    5
## 1339                         1                       2                    5
## 1340                         1                       2                    5
## 1341                         1                       2                    5
## 1342                         1                       2                    5
## 1343                         1                       2                    5
## 1344                         1                       2                    5
## 1345                         1                       2                    5
## 1346                         1                       2                    5
## 1347                         2                       0                    2
## 1348                         2                       0                    2
## 1349                         2                       0                    2
## 1350                         2                       0                    2
## 1351                         2                       2                    2
## 1352                         2                       2                    2
## 1353                         2                       2                    3
## 1354                         2                       2                    5
## 1355                         2                       2                    5
## 1356                         2                       2                    5
## 1357                         2                       2                    5
## 1358                         2                       2                    5
## 1359                         2                       2                    5
## 1360                         2                       2                    5
## 1361                         2                       2                    5
## 1362                         2                       2                    6
## 1363                         2                       2                    6
## 1364                         2                       2                    6
## 1365                         3                       0                    1
## 1366                         3                       0                    1
## 1367                         3                       0                    1
## 1368                         3                       0                    1
## 1369                         3                       0                    1
## 1370                         3                       2                    2
## 1371                         3                       2                    2
## 1372                         3                       2                    2
## 1373                         3                       2                    2
## 1374                         3                       2                    2
## 1375                         3                       2                    2
## 1376                         3                       2                    2
## 1377                         3                       2                    5
## 1378                         3                       2                    1
## 1379                         3                       2                    1
## 1380                         3                       2                    5
## 1381                         3                       2                    5
## 1382                         3                       2                    5
## 1383                         3                       2                    5
## 1384                         3                       2                    5
## 1385                         3                       2                    5
## 1386                         3                       2                    5
## 1387                         3                       2                    5
## 1388                         3                       2                    5
## 1389                         3                       2                    5
## 1390                         4                       1                    0
## 1391                         4                       1                    0
## 1392                         4                       2                    0
## 1393                         4                       2                    0
## 1394                         4                       2                    5
## 1395                         4                       2                    5
## 1396                         4                       4                    6
## 1397                         4                       4                    7
## 1398                         4                       2                    3
## 1399                         4                       2                    3
## 1400                         4                       4                   10
## 1401                         4                       2                    4
## 1402                         4                       2                    4
## 1403                         5                       1                    0
## 1404                         5                       1                    1
## 1405                         5                       1                    1
## 1406                         5                       1                    3
## 1407                         5                       1                    3
## 1408                         5                       1                    3
## 1409                         5                       2                    5
## 1410                         5                       2                    5
## 1411                         5                       2                    5
## 1412                         5                       3                    7
## 1413                         6                       0                    0
## 1414                         6                       0                    1
## 1415                         6                       0                    2
## 1416                         6                       0                    4
## 1417                         6                       0                    2
## 1418                         6                       1                    5
## 1419                         6                       2                    5
## 1420                         6                       2                    5
## 1421                         6                       2                    5
## 1422                         7                       0                    1
## 1423                         7                       0                    2
## 1424                         7                       0                    2
## 1425                         7                       0                    2
## 1426                         7                       0                    1
## 1427                         7                       0                    1
## 1428                         7                       0                    1
## 1429                         7                       0                    4
## 1430                         7                       0                    2
## 1431                         7                       2                    5
## 1432                         7                       2                    5
## 1433                         7                       2                    5
## 1434                         7                       2                    5
## 1435                         7                       2                    5
## 1436                         7                       2                    5
## 1437                         8                       0                    1
## 1438                         8                       0                    1
## 1439                         8                       0                    1
## 1440                         8                       0                    1
## 1441                         8                       0                    3
## 1442                         8                       0                    3
## 1443                         8                       0                    3
## 1444                         8                       0                    3
## 1445                         8                       0                    3
## 1446                         8                       0                    3
## 1447                         8                       0                    3
## 1448                         8                       0                    3
## 1449                         8                       0                    3
## 1450                         8                       0                    3
## 1451                         8                       0                    3
## 1452                         8                       0                    3
## 1453                         8                       0                    3
## 1454                         8                       0                    3
## 1455                         8                       0                    3
## 1456                         8                       0                    3
## 1457                         8                       1                    3
## 1458                         8                       2                    5
## 1459                         8                       2                    5
## 1460                         8                       1                    3
## 1461                         8                       2                    5
## 1462                         8                       2                    5
## 1463                         8                       4                    8
## 1464                         9                       0                    1
## 1465                         9                       0                    1
## 1466                         9                       0                    1
## 1467                         9                       0                    2
## 1468                         9                       0                    2
## 1469                         9                       0                    2
## 1470                         9                       0                    2
## 1471                         9                       0                    2
## 1472                         9                       1                    2
## 1473                         9                       1                    2
## 1474                         9                       1                    2
## 1475                         9                       0                    2
## 1476                         9                       0                    2
## 1477                         9                       1                    2
## 1478                         9                       1                    2
## 1479                         9                       1                    2
## 1480                         9                       1                    2
## 1481                         9                       1                    2
## 1482                         9                       1                    2
## 1483                         9                       1                    2
## 1484                         9                       1                    2
## 1485                         9                       1                    2
## 1486                         9                       2                    2
## 1487                         9                       2                    2
## 1488                         9                       2                    2
## 1489                         9                       2                    2
## 1490                         9                       2                    3
## 1491                         9                       2                    3
## 1492                         9                       2                    5
## 1493                        10                       0                    1
## 1494                        10                       0                    1
## 1495                        10                       0                    1
## 1496                        10                       1                    1
## 1497                        10                       1                    1
## 1498                        10                       1                    1
## 1499                        10                       1                    1
## 1500                        10                       1                    1
## 1501                        10                       1                    1
## 1502                        10                       1                    1
## 1503                        10                       1                    1
## 1504                        10                       1                    1
## 1505                        10                       1                    1
## 1506                        10                       1                    1
## 1507                        10                       1                    1
## 1508                        10                       1                    1
## 1509                        10                       1                    1
## 1510                        10                       1                    1
## 1511                        10                       3                    6
## 1512                        10                       6                   15
## 1513                        11                       1                    0
## 1514                        11                       1                    0
## 1515                        11                       1                    0
## 1516                        11                       1                    0
## 1517                        11                       1                    0
## 1518                        11                       1                    0
## 1519                        11                       2                    0
## 1520                        11                       2                    0
## 1521                        11                       2                    0
## 1522                        11                       2                    0
## 1523                        11                       1                    0
## 1524                        11                       2                    2
## 1525                        11                       2                    3
## 1526                        11                       2                    3
## 1527                        11                       2                    5
## 1528                        11                       2                    5
## 1529                        11                       4                    5
## 1530                        12                       0                    0
## 1531                        12                       1                    0
## 1532                        12                       1                    0
## 1533                        12                       1                    0
## 1534                        12                       1                    1
## 1535                        12                       1                    1
## 1536                        12                       1                    1
## 1537                        12                       1                    5
## 1538                        12                       2                    5
## 1539                        12                       3                    5
## 1540                        13                       0                    1
## 1541                        13                       0                    1
## 1542                        13                       0                    1
## 1543                        13                       0                    1
## 1544                        13                       0                    1
## 1545                        13                       0                    2
## 1546                        13                       2                    5
## 1547                        13                       2                    6
## 1548                        14                       0                    1
## 1549                        14                       0                    1
## 1550                        14                       0                    1
## 1551                        14                       0                    1
## 1552                        14                       0                    1
## 1553                        14                       0                    1
## 1554                        14                       0                    1
## 1555                        14                       2                    6
## 1556                        15                       0                    0
## 1557                        15                       0                    3
## 1558                        15                       1                    3
## 1559                        15                       2                    4
## 1560                        16                       0                    0
## 1561                        16                       0                    0
## 1562                        16                       0                    0
## 1563                        16                       0                    1
## 1564                        16                       0                    1
## 1565                        16                       0                    1
## 1566                        16                       0                    2
## 1567                        16                       0                    2
## 1568                        16                       1                    2
## 1569                        16                       1                    2
## 1570                        16                       2                    2
## 1571                        16                       2                    5
## 1572                        17                       0                    1
## 1573                        17                       2                    5
## 1574                        17                       2                    6
## 1575                        18                       2                    2
## 1576                        18                       2                    5
## 1577                        18                       2                    5
## 1578                        18                       2                    5
## 1579                        18                       2                    5
## 1580                        18                       2                    5
## 1581                        18                       4                    6
## 1582                        18                       4                    5
## 1583                        19                       1                    0
## 1584                        19                       1                    1
## 1585                        19                       1                    1
## 1586                        19                       1                    1
## 1587                        19                       1                    0
## 1588                        19                       1                    1
## 1589                        19                       1                    2
## 1590                        19                       1                    2
## 1591                        19                       1                    2
## 1592                        19                       1                    3
## 1593                        19                       1                    4
## 1594                        19                       1                    4
## 1595                        19                       1                    4
## 1596                        19                       1                    4
## 1597                        19                       1                    4
## 1598                        19                       1                    4
## 1599                        19                       1                    4
## 1600                        19                       1                    4
## 1601                        19                       1                    4
## 1602                        19                       1                    4
## 1603                        19                       1                    4
## 1604                        19                       1                    4
## 1605                        19                       1                    4
## 1606                        19                       1                    4
## 1607                        19                       1                    4
## 1608                        19                       1                    4
## 1609                        19                       1                    4
## 1610                        19                       1                    4
## 1611                        19                       1                    4
## 1612                        19                       1                    4
## 1613                        19                       1                    4
## 1614                        19                       1                    4
## 1615                        19                       1                    4
## 1616                        19                       1                    4
## 1617                        19                       2                    5
## 1618                        19                       2                    5
## 1619                        19                       3                    5
## 1620                        19                       3                    8
## 1621                        19                       5                   12
## 1622                        20                       0                    1
## 1623                        20                       0                    1
## 1624                        20                       0                    1
## 1625                        20                       0                    2
## 1626                        20                       0                    2
## 1627                        20                       0                    5
## 1628                        20                       0                    5
## 1629                        20                       2                    5
## 1630                        20                       2                    5
## 1631                        20                       2                    7
## 1632                        20                       2                    8
## 1633                        21                       0                    0
## 1634                        21                       0                    0
## 1635                        21                       0                    2
## 1636                        21                       0                    2
## 1637                        21                       0                    3
## 1638                        21                       0                    3
## 1639                        21                       0                    3
## 1640                        21                       0                    4
## 1641                        21                       0                    4
## 1642                        21                       2                    5
## 1643                        21                       2                    5
## 1644                        21                       2                    5
## 1645                        21                       2                    5
## 1646                        21                       2                    5
## 1647                        21                       2                    5
## 1648                        22                       1                    3
## 1649                        22                       1                    3
## 1650                        22                       1                    3
## 1651                        22                       2                    3
## 1652                        22                       2                    5
## 1653                        22                       2                    5
## 1654                        22                       2                    5
## 1655                        22                       2                    5
## 1656                        22                       2                    5
## 1657                        22                       1                    3
## 1658                        22                       1                    3
## 1659                        22                       1                    3
## 1660                        22                       1                    3
## 1661                        22                       1                    3
## 1662                        22                       1                    3
## 1663                        22                       1                    3
## 1664                        22                       1                    3
## 1665                        22                       1                    3
## 1666                        22                       2                    5
## 1667                        22                       2                    5
## 1668                        22                       2                    5
## 1669                        22                       0                    3
## 1670                        22                       0                    3
## 1671                        22                       0                    3
## 1672                        22                       0                    3
## 1673                        22                       0                    3
## 1674                        22                       1                    3
## 1675                        23                       0                    1
## 1676                        23                       0                    1
## 1677                        23                       0                    1
## 1678                        23                       0                    2
## 1679                        23                       0                    2
## 1680                        23                       0                    2
## 1681                        23                       0                    2
## 1682                        23                       0                    2
## 1683                        23                       0                    2
## 1684                        23                       0                    2
## 1685                        23                       0                    2
## 1686                        23                       1                    2
## 1687                        23                       2                    2
## 1688                        23                       2                    2
## 1689                        23                       2                    2
## 1690                        23                       2                    3
## 1691                        23                       2                    3
## 1692                        23                       2                    4
## 1693                        23                       2                    5
## 1694                        23                       2                    5
## 1695                        23                       2                    5
## 1696                        23                       4                    7
## 1697                        23                       4                   11
## 1698                        23                       0                    2
## 1699                        23                       0                    2
## 1700                        23                       1                    2
## 1701                        23                       1                    2
## 1702                        23                       0                    2
## 1703                        24                       0                    1
## 1704                        24                       1                    1
## 1705                        24                       2                    1
## 1706                        24                       2                    2
## 1707                        24                       2                    2
## 1708                        24                       2                    3
## 1709                        24                       2                    4
## 1710                        24                       2                    5
## 1711                        24                       4                    6
## 1712                        24                       4                    7
## 1713                        24                       0                    1
## 1714                        24                       0                    1
## 1715                        25                       2                    4
## 1716                        25                       2                    4
## 1717                        25                       2                    5
## 1718                        25                       2                    5
## 1719                        25                       3                    5
## 1720                        26                       0                    0
## 1721                        26                       1                    0
## 1722                        26                       1                    4
## 1723                        26                       7                   15
## 1724                        27                       0                    1
## 1725                        27                       0                    1
## 1726                        27                       0                    1
## 1727                        27                       0                    1
## 1728                        27                       0                    1
## 1729                        27                       0                    2
## 1730                        27                       0                    2
## 1731                        27                       0                    2
## 1732                        27                       0                    2
## 1733                        27                       0                    2
## 1734                        27                       0                    3
## 1735                        27                       0                    4
## 1736                        27                       0                    4
## 1737                        27                       2                    5
## 1738                        27                       2                    5
## 1739                        28                       0                    1
## 1740                        28                       0                    1
## 1741                        28                       0                    1
## 1742                        28                       0                    1
## 1743                        28                       2                    5
## 1744                        28                       2                    5
## 1745                        28                       2                    5
## 1746                        28                       2                    5
## 1747                        28                       0                    1
## 1748                        28                       0                    2
## 1749                        29                       0                    1
## 1750                        29                       0                    1
## 1751                        29                       0                    2
## 1752                        29                       0                    2
## 1753                        29                       0                    1
## 1754                        29                       0                    3
## 1755                        29                       0                    3
## 1756                        29                       0                    3
## 1757                        29                       0                    3
## 1758                        29                       1                    3
## 1759                        29                       2                    3
## 1760                        30                       0                    1
## 1761                        30                       0                    1
## 1762                        30                       0                    1
## 1763                        30                       0                    2
## 1764                        30                       0                    2
## 1765                        30                       0                    2
## 1766                        30                       0                    2
## 1767                        30                       0                    2
## 1768                        30                       0                    2
## 1769                        30                       0                    2
## 1770                        30                       1                    2
## 1771                        30                       0                    0
## 1772                        30                       0                    2
## 1773                        30                       0                    2
## 1774                        30                       1                    2
## 1775                        30                       1                    2
## 1776                        30                       1                    2
## 1777                        30                       1                    2
## 1778                        30                       1                    2
## 1779                        30                       1                    2
## 1780                        30                       1                    2
## 1781                        30                       2                    2
## 1782                        30                       2                    5
## 1783                        30                       2                    6
## 1784                        31                       0                    0
## 1785                        31                       0                    1
## 1786                        31                       0                    1
## 1787                        31                       0                    1
## 1788                        31                       0                    1
## 1789                        31                       0                    1
## 1790                        31                       0                    1
## 1791                        31                       0                    1
## 1792                        31                       0                    1
## 1793                        31                       0                    1
## 1794                        31                       0                    1
## 1795                        31                       0                    1
## 1796                        31                       0                    1
## 1797                        31                       0                    1
## 1798                        31                       0                    1
## 1799                        31                       0                    1
## 1800                        31                       0                    1
## 1801                        31                       0                    1
## 1802                        31                       0                    1
## 1803                        31                       0                    1
## 1804                        31                       0                    1
## 1805                        31                       0                    1
## 1806                        31                       0                    1
## 1807                        31                       0                    1
## 1808                        31                       0                    1
## 1809                        31                       0                    1
## 1810                        31                       0                    1
## 1811                        31                       0                    1
## 1812                        31                       0                    1
## 1813                        31                       1                    1
## 1814                        31                       1                    1
## 1815                        31                       1                    1
## 1816                        31                       1                    1
## 1817                        31                       1                    1
## 1818                        31                       2                    1
## 1819                        31                       2                    4
## 1820                        31                       2                    5
## 1821                        31                       2                    5
## 1822                         1                       1                    0
## 1823                         1                       1                    0
## 1824                         1                       1                    0
## 1825                         1                       2                    3
## 1826                         1                       4                    5
## 1827                         2                       1                    4
## 1828                         2                       1                    4
## 1829                         2                       1                    4
## 1830                         2                       1                    2
## 1831                         2                       1                    5
## 1832                         2                       2                    5
## 1833                         2                       2                    5
## 1834                         2                       2                    5
## 1835                         3                       0                    0
## 1836                         3                       0                    1
## 1837                         3                       0                    1
## 1838                         3                       0                    1
## 1839                         3                       0                    1
## 1840                         3                       0                    1
## 1841                         3                       0                    2
## 1842                         3                       0                    3
## 1843                         3                       0                    3
## 1844                         3                       0                    4
## 1845                         3                       0                    4
## 1846                         3                       0                    4
## 1847                         3                       0                    4
## 1848                         3                       2                    5
## 1849                         3                       0                    2
## 1850                         3                       2                   10
## 1851                         3                       3                   10
## 1852                         3                       3                   10
## 1853                         3                       3                   10
## 1854                         3                       3                   10
## 1855                         3                       3                   10
## 1856                         3                       3                   10
## 1857                         3                       3                   10
## 1858                         4                       0                    1
## 1859                         4                       0                    1
## 1860                         4                       0                    2
## 1861                         4                       0                    2
## 1862                         4                       2                    9
## 1863                         5                       0                    1
## 1864                         5                       0                    1
## 1865                         5                       0                    1
## 1866                         5                       2                    4
## 1867                         5                       2                    4
## 1868                         5                       2                    8
## 1869                         5                       2                    8
## 1870                         5                       2                    8
## 1871                         6                       0                    1
## 1872                         6                       0                    1
## 1873                         6                       0                    1
## 1874                         6                       0                    1
## 1875                         6                       0                    2
## 1876                         6                       0                    2
## 1877                         6                       0                    2
## 1878                         6                       0                    2
## 1879                         6                       2                    2
## 1880                         6                       2                    7
## 1881                         6                       4                    7
## 1882                         6                       4                    7
## 1883                         6                       4                    7
## 1884                         6                       4                    7
## 1885                         6                       2                    7
## 1886                         6                       2                    7
## 1887                         7                       0                    0
## 1888                         7                       0                    1
## 1889                         7                       0                    1
## 1890                         7                       0                    1
## 1891                         7                       0                    1
## 1892                         7                       1                    1
## 1893                         7                       2                    1
## 1894                         7                       2                    3
## 1895                         7                       2                    3
## 1896                         7                       2                    5
## 1897                         7                       2                    5
## 1898                         7                       2                    6
## 1899                         7                       2                    6
## 1900                         7                       2                    6
## 1901                         7                       2                    6
## 1902                         7                       2                    6
## 1903                         7                       2                    6
## 1904                         7                       2                    6
## 1905                         7                       2                    6
## 1906                         7                       2                    6
## 1907                         7                       4                    6
## 1908                         8                       2                    0
## 1909                         8                       2                    4
## 1910                         8                       2                    4
## 1911                         8                       2                    5
## 1912                         8                       2                    5
## 1913                         8                       2                    5
## 1914                         8                       2                    5
## 1915                         8                       2                    5
## 1916                         8                       2                    5
## 1917                         8                       2                    5
## 1918                         9                       0                    0
## 1919                         9                       1                    0
## 1920                         9                       1                    0
## 1921                         9                       1                    0
## 1922                         9                       1                    1
## 1923                         9                       1                    0
## 1924                         9                       1                    2
## 1925                         9                       1                    3
## 1926                         9                       1                    3
## 1927                         9                       1                    5
## 1928                         9                       1                    5
## 1929                         9                       1                    3
## 1930                         9                       2                    5
## 1931                        10                       0                    2
## 1932                        10                       0                    2
## 1933                        10                       0                    5
## 1934                        11                       0                    1
## 1935                        11                       0                    1
## 1936                        11                       0                    4
## 1937                        11                       0                    4
## 1938                        11                       0                    4
## 1939                        11                       0                    4
## 1940                        11                       0                    4
## 1941                        11                       0                    4
## 1942                        11                       0                    4
## 1943                        11                       0                    4
## 1944                        11                       0                    4
## 1945                        11                       0                    4
## 1946                        11                       0                    4
## 1947                        11                       0                    4
## 1948                        11                       0                    4
## 1949                        11                       1                    4
## 1950                        11                       1                    4
## 1951                        11                       0                    3
## 1952                        12                       0                    2
## 1953                        12                       0                    2
## 1954                        12                       0                    3
## 1955                        12                       0                    3
## 1956                        12                       0                    3
## 1957                        12                       0                    3
## 1958                        12                       0                    3
## 1959                        12                       0                    3
## 1960                        12                       0                    3
## 1961                        12                       0                    3
## 1962                        12                       0                    2
## 1963                        12                       0                    3
## 1964                        12                       0                    3
## 1965                        12                       0                    3
## 1966                        12                       0                    3
## 1967                        12                       0                    3
## 1968                        12                       0                    3
## 1969                        12                       1                    3
## 1970                        12                       0                    2
## 1971                        13                       0                    0
## 1972                        13                       0                    0
## 1973                        13                       0                    1
## 1974                        13                       0                    1
## 1975                        13                       0                    2
## 1976                        13                       0                    1
## 1977                        13                       0                    2
## 1978                        13                       0                    2
## 1979                        14                       2                    2
## 1980                        14                       2                    6
## 1981                        15                       2                    0
## 1982                        15                       2                    5
## 1983                        16                       0                    0
## 1984                        16                       0                    0
## 1985                        16                       0                    0
## 1986                        17                       0                    0
## 1987                        17                       0                    2
## 1988                        17                       0                    4
## 1989                        18                       0                    2
## 1990                        18                       0                    3
## 1991                        18                       2                    4
## 1992                        18                       2                    4
## 1993                        18                       2                    4
## 1994                        18                       2                    4
## 1995                        18                       2                    4
## 1996                        18                       2                    4
## 1997                        18                       2                    4
## 1998                        18                       2                    4
## 1999                        18                       2                    4
## 2000                        18                       2                    4
## 2001                        18                       2                    4
## 2002                        18                       2                    4
## 2003                        18                       2                    4
## 2004                        18                       2                    4
## 2005                        18                       2                    4
## 2006                        18                       2                    4
## 2007                        18                       2                    4
## 2008                        18                       2                    4
## 2009                        18                       2                    4
## 2010                        18                       2                    4
## 2011                        18                       2                    4
## 2012                        18                       2                    4
## 2013                        18                       2                    4
## 2014                        18                       2                    4
## 2015                        18                       2                    4
## 2016                        18                       2                    5
## 2017                        19                       0                    2
## 2018                        19                       0                    3
## 2019                        19                       0                    3
## 2020                        19                       1                    3
## 2021                        19                       1                    3
## 2022                        19                       1                    3
## 2023                        20                       0                    2
## 2024                        20                       0                    2
## 2025                        20                       0                    2
## 2026                        20                       0                    2
## 2027                        20                       0                    2
## 2028                        20                       0                    2
## 2029                        20                       0                    2
## 2030                        20                       0                    2
## 2031                        20                       0                    2
## 2032                        20                       0                    2
## 2033                        20                       0                    2
## 2034                        20                       0                    2
## 2035                        20                       0                    2
## 2036                        20                       0                    2
## 2037                        20                       0                    2
## 2038                        20                       0                    2
## 2039                        21                       0                    1
## 2040                        21                       0                    1
## 2041                        21                       0                    1
## 2042                        21                       0                    1
## 2043                        21                       0                    1
## 2044                        21                       0                    1
## 2045                        21                       0                    1
## 2046                        21                       0                    1
## 2047                        21                       0                    1
## 2048                        21                       0                    1
## 2049                        21                       0                    1
## 2050                        21                       0                    1
## 2051                        21                       0                    1
## 2052                        21                       0                    1
## 2053                        21                       0                    1
## 2054                        21                       0                    1
## 2055                        21                       0                    1
## 2056                        21                       0                    1
## 2057                        21                       0                    1
## 2058                        21                       0                    1
## 2059                        21                       0                    1
## 2060                        21                       0                    1
## 2061                        21                       0                    1
## 2062                        21                       0                    1
## 2063                        21                       0                    1
## 2064                        21                       0                    1
## 2065                        21                       0                    1
## 2066                        21                       0                    1
## 2067                        21                       0                    1
## 2068                        21                       0                    1
## 2069                        21                       0                    1
## 2070                        21                       0                    1
## 2071                        21                       0                    1
## 2072                        21                       0                    1
## 2073                        21                       0                    1
## 2074                        21                       0                    1
## 2075                        21                       0                    1
## 2076                        21                       0                    1
## 2077                        21                       0                    1
## 2078                        21                       0                    1
## 2079                        21                       0                    1
## 2080                        21                       0                    1
## 2081                        21                       0                    1
## 2082                        21                       0                    1
## 2083                        21                       0                    1
## 2084                        21                       0                    1
## 2085                        21                       0                    1
## 2086                        21                       2                    5
## 2087                        23                       0                    0
## 2088                        23                       0                    0
## 2089                        23                       1                    2
## 2090                        24                       0                    1
## 2091                        24                       0                    3
## 2092                        24                       0                    5
## 2093                        25                       0                    4
## 2094                        26                       0                    3
## 2095                        26                       0                    3
## 2096                        26                       0                    3
## 2097                        26                       0                    3
## 2098                        26                       0                    3
## 2099                        26                       0                    3
## 2100                        26                       0                    3
## 2101                        26                       0                    3
## 2102                        26                       0                    3
## 2103                        26                       0                    3
## 2104                        26                       2                    6
## 2105                        27                       0                    2
## 2106                        27                       0                    2
## 2107                        28                       0                    0
## 2108                        28                       0                    1
## 2109                        28                       2                    4
## 2110                        30                       1                    3
## 2111                         1                       0                    0
## 2112                         1                       0                    5
## 2113                         1                       2                    5
## 2114                         2                       0                    0
## 2115                         2                       0                    1
## 2116                         2                       0                    1
## 2117                         2                       0                    1
## 2118                         2                       0                    1
## 2119                         2                       8                   21
## 2120                         3                       0                    1
## 2121                         3                       0                    2
## 2122                         3                       2                    5
## 2123                         3                       2                    5
## 2124                         3                       2                    5
## 2125                         3                       4                   10
## 2126                         4                       0                    2
## 2127                         4                       2                    2
## 2128                         4                       2                    2
## 2129                         4                       2                    2
## 2130                         4                       2                    6
## 2131                         5                       0                    0
## 2132                         5                       1                    1
## 2133                         5                       1                    1
## 2134                         5                       1                    1
## 2135                         5                       1                    1
## 2136                         5                       1                    1
## 2137                         5                       1                    1
## 2138                         5                       1                    1
## 2139                         5                       1                    1
## 2140                         5                       1                    1
## 2141                         5                       1                    1
## 2142                         5                       1                    1
## 2143                         5                       1                    1
## 2144                         5                       1                    1
## 2145                         5                       1                    1
## 2146                         5                       1                    1
## 2147                         5                       1                    1
## 2148                         5                       1                    1
## 2149                         5                       2                    1
## 2150                         5                       2                    1
## 2151                         5                       2                    1
## 2152                         5                       2                    1
## 2153                         5                       2                    1
## 2154                         5                       2                    1
## 2155                         5                       2                    1
## 2156                         5                       2                    1
## 2157                         5                       2                    1
## 2158                         5                       2                    1
## 2159                         5                       2                    1
## 2160                         5                       2                    1
## 2161                         5                       2                    1
## 2162                         5                       2                    1
## 2163                         5                       2                    1
## 2164                         5                       2                    1
## 2165                         5                       2                    1
## 2166                         5                       2                    1
## 2167                         5                       2                    1
## 2168                         5                       2                    1
## 2169                         6                       2                    0
## 2170                         6                       2                    2
## 2171                         7                       1                    0
## 2172                         8                       8                   20
## 2173                        10                       0                    0
## 2174                        10                       0                    1
## 2175                        10                       0                    3
## 2176                        10                       0                    3
## 2177                        10                       0                    3
## 2178                        10                       2                    5
## 2179                        10                       0                    3
## 2180                        10                       0                    3
## 2181                        11                       2                    2
## 2182                        11                       2                    3
## 2183                        12                       2                    5
## 2184                        12                       2                    5
## 2185                        14                       1                    2
## 2186                        14                       1                    4
## 2187                        15                       0                    0
## 2188                        17                       0                    1
## 2189                        17                       0                    1
## 2190                        17                       2                    7
## 2191                        17                       2                    8
## 2192                        17                       6                   13
## 2193                        18                       0                    0
## 2194                        18                       0                    1
## 2195                        18                       2                    2
## 2196                        18                       2                    3
## 2197                        19                       2                    1
## 2198                        19                       2                    2
## 2199                        20                       2                    2
## 2200                        21                       1                    5
## 2201                        21                       1                    5
## 2202                        21                       3                    5
## 2203                        21                       2                    5
## 2204                        22                       0                    5
## 2205                        22                       2                    5
## 2206                        22                       2                    5
## 2207                        22                       0                    4
## 2208                        22                       2                    5
## 2209                        22                       2                    5
## 2210                        22                       2                    5
## 2211                        22                       2                    5
## 2212                        22                       2                    5
## 2213                        22                       2                    5
## 2214                        22                       2                    5
## 2215                        22                       2                    5
## 2216                        22                       2                    5
## 2217                        22                       2                    5
## 2218                        22                       2                    5
## 2219                        23                       0                    3
## 2220                        23                       0                    4
## 2221                        23                       0                    0
## 2222                        23                       0                    0
## 2223                        23                       1                    4
## 2224                        23                       2                    4
## 2225                        23                       2                    4
## 2226                        23                       2                    5
## 2227                        23                       2                    4
## 2228                        23                       2                    5
## 2229                        23                       2                    8
## 2230                        24                       0                    2
## 2231                        24                       0                    2
## 2232                        24                       0                    2
## 2233                        24                       0                    2
## 2234                        24                       0                    3
## 2235                        24                       0                    3
## 2236                        24                       0                    3
## 2237                        24                       0                    3
## 2238                        24                       0                    3
## 2239                        24                       2                    5
## 2240                        24                       2                    5
## 2241                        24                       2                    5
## 2242                        24                       2                    5
## 2243                        24                       2                    5
## 2244                        24                       2                    5
## 2245                        24                       2                    6
## 2246                        24                       0                    3
## 2247                        24                       1                    3
## 2248                        25                       1                    2
## 2249                        25                       1                    2
## 2250                        25                       1                    2
## 2251                        25                       2                    3
## 2252                        26                       2                    3
## 2253                        26                       2                    4
## 2254                        26                       2                    4
## 2255                        26                       4                    6
## 2256                        27                       2                    0
## 2257                        27                       2                    0
## 2258                        28                       1                    4
## 2259                        28                       1                    5
## 2260                        28                       1                    5
## 2261                        28                       2                    5
## 2262                        28                       4                   10
## 2263                        28                       1                    3
## 2264                        28                       1                    3
## 2265                        29                       2                    7
## 2266                        30                       0                    3
## 2267                        30                       0                    4
## 2268                        30                       0                    4
## 2269                        30                       0                    4
## 2270                        30                       0                    4
## 2271                        30                       0                    4
## 2272                        30                       0                    4
## 2273                        30                       0                    4
## 2274                        30                       0                    4
## 2275                        30                       0                    4
## 2276                        30                       0                    4
## 2277                        30                       0                    4
## 2278                        30                       0                    4
## 2279                        30                       0                    4
## 2280                        30                       0                    4
## 2281                        30                       0                    4
## 2282                        30                       0                    4
## 2283                        30                       0                    4
## 2284                        30                       0                    4
## 2285                        30                       0                    4
## 2286                        30                       0                    4
## 2287                        30                       0                    4
## 2288                        30                       0                    4
## 2289                        30                       0                    4
## 2290                        30                       0                    4
## 2291                        30                       0                    4
## 2292                        30                       0                    4
## 2293                        30                       0                    4
## 2294                        30                       0                    4
## 2295                        30                       0                    4
## 2296                        30                       0                    4
## 2297                        30                       0                    4
## 2298                        30                       0                    4
## 2299                        30                       0                    4
## 2300                        30                       0                    3
## 2301                        30                       0                    4
## 2302                        30                       0                    4
## 2303                        30                       0                    4
## 2304                        30                       0                    4
## 2305                        30                       0                    4
## 2306                        30                       0                    4
## 2307                        30                       0                    4
## 2308                        30                       0                    4
## 2309                        30                       0                    4
## 2310                        30                       0                    4
## 2311                        30                       0                    4
## 2312                        30                       0                    4
## 2313                        30                       0                    4
## 2314                        30                       0                    4
## 2315                        30                       0                    4
## 2316                        30                       0                    4
## 2317                        30                       0                    4
## 2318                        30                       0                    4
## 2319                        30                       0                    4
## 2320                        31                       0                    1
## 2321                        31                       0                    2
## 2322                        31                       0                    2
## 2323                        31                       0                    2
## 2324                        31                       0                    2
## 2325                        31                       0                    3
## 2326                        31                       0                    3
## 2327                        31                       0                    3
## 2328                        31                       0                    3
## 2329                        31                       0                    3
## 2330                        31                       0                    3
## 2331                        31                       0                    3
## 2332                        31                       2                    5
## 2333                        31                       2                    5
## 2334                        31                       2                    5
## 2335                         1                       0                    1
## 2336                         1                       0                    1
## 2337                         1                       0                    2
## 2338                         1                       0                    2
## 2339                         2                       2                    5
## 2340                         6                       0                    1
## 2341                         6                       0                    4
## 2342                         6                       0                    4
## 2343                         8                       0                    2
## 2344                         8                       2                    2
## 2345                         8                       2                    3
## 2346                         9                       4                   10
## 2347                        12                       8                   20
## 2348                        13                       0                    0
## 2349                        14                       0                    1
## 2350                        22                       0                    2
## 2351                        25                       1                    3
## 2352                        26                       0                    1
## 2353                        26                      12                   30
## 2354                        26                       0                    1
## 2355                        29                       0                    1
## 2356                         1                       1                    0
## 2357                         1                       2                    5
## 2358                         3                       0                    4
## 2359                         3                       0                    4
## 2360                         5                       2                    2
## 2361                         5                       2                    2
## 2362                         5                       2                    6
## 2363                         6                       2                    2
## 2364                         6                       2                    2
## 2365                         6                       2                    5
## 2366                         8                       1                    1
## 2367                         8                       1                    1
## 2368                         8                       1                    3
## 2369                         8                       1                    3
## 2370                         9                       0                    2
## 2371                         9                       0                    2
## 2372                         9                       0                    2
## 2373                         9                       0                    2
## 2374                         9                       0                    2
## 2375                         9                       0                    2
## 2376                         9                       0                    2
## 2377                         9                       0                    2
## 2378                         9                       0                    2
## 2379                         9                       0                    2
## 2380                        10                       0                    1
## 2381                        10                       0                    2
## 2382                        10                       0                    3
## 2383                        10                       2                    4
## 2384                        11                       2                    3
## 2385                        12                       0                    2
## 2386                        12                       0                    2
## 2387                        12                       0                    2
## 2388                        12                       0                    2
## 2389                        12                       0                    2
## 2390                        12                       0                    2
## 2391                        12                       0                    2
## 2392                        12                       0                    2
## 2393                        12                       0                    2
## 2394                        12                       0                    2
## 2395                        12                       0                    2
## 2396                        12                       0                    2
## 2397                        12                       0                    2
## 2398                        12                       0                    2
## 2399                        12                       0                    2
## 2400                        12                       0                    2
## 2401                        12                       0                    2
## 2402                        12                       0                    2
## 2403                        12                       0                    2
## 2404                        12                       0                    2
## 2405                        12                       0                    2
## 2406                        12                       0                    2
## 2407                        12                       0                    2
## 2408                        12                       1                    2
## 2409                        13                       2                    5
## 2410                        13                       2                    5
## 2411                        14                       1                    0
## 2412                        14                       2                    4
## 2413                        15                       1                    1
## 2414                        15                       1                    1
## 2415                        15                       1                    5
## 2416                        15                       1                    5
## 2417                        16                       2                    6
## 2418                        16                       2                    7
## 2419                        17                       0                    2
## 2420                        19                       2                    5
## 2421                        19                       2                    5
## 2422                        19                       2                    5
## 2423                        20                       2                    1
## 2424                        20                       4                   10
## 2425                        20                       4                   10
## 2426                        22                       1                    4
## 2427                        22                       3                    7
## 2428                        22                       3                    7
## 2429                        25                       8                   20
## 2430                        26                       2                    5
## 2431                        27                       1                    1
## 2432                        27                       1                    1
## 2433                        27                       1                    1
## 2434                        27                       1                    1
## 2435                        27                       1                    1
## 2436                        27                       1                    1
## 2437                        27                       1                    1
## 2438                        27                       1                    1
## 2439                        27                       1                    1
## 2440                        27                       1                    1
## 2441                        27                       1                    1
## 2442                        27                       1                    1
## 2443                        27                       1                    1
## 2444                        27                       1                    1
## 2445                        27                       1                    1
## 2446                        27                       1                    1
## 2447                        27                       1                    1
## 2448                        27                       1                    1
## 2449                        27                       1                    1
## 2450                        27                       1                    1
## 2451                        27                       1                    1
## 2452                        27                       1                    1
## 2453                         2                       8                   20
## 2454                         3                       0                    1
## 2455                         7                       2                    5
## 2456                         7                       4                   10
## 2457                         8                       0                    1
## 2458                         8                       0                    4
## 2459                         8                       0                    4
## 2460                         8                       4                   10
## 2461                        13                       2                    5
## 2462                        15                       0                    2
## 2463                        15                       2                    5
## 2464                        16                       0                    3
## 2465                        16                       2                    9
## 2466                        17                       0                    1
## 2467                        17                       2                    5
## 2468                        18                       2                    2
## 2469                        18                       2                    6
## 2470                        18                       4                    9
## 2471                        19                       0                    1
## 2472                        19                       2                    5
## 2473                        19                       2                    5
## 2474                        20                       2                    2
## 2475                        20                       2                    2
## 2476                        20                       2                    4
## 2477                        20                       2                    5
## 2478                        21                       2                    5
## 2479                        22                       2                    5
## 2480                        22                       2                    6
## 2481                        22                       2                    8
## 2482                        23                       0                    3
## 2483                        24                       0                    0
## 2484                        24                       0                    3
## 2485                        24                       0                    3
## 2486                        24                       0                    3
## 2487                        24                       0                    3
## 2488                        24                       0                    3
## 2489                        24                       0                    3
## 2490                        24                       0                    3
## 2491                        24                       0                    3
## 2492                        24                       0                    3
## 2493                        24                       0                    3
## 2494                        24                       0                    3
## 2495                        24                       0                    3
## 2496                        24                       0                    3
## 2497                        24                       0                    3
## 2498                        24                       0                    3
## 2499                        24                       0                    3
## 2500                        24                       0                    3
## 2501                        24                       0                    3
## 2502                        24                       0                    3
## 2503                        24                       0                    3
## 2504                        24                       0                    3
## 2505                        24                       0                    3
## 2506                        24                       0                    3
## 2507                        24                       0                    3
## 2508                        24                       0                    3
## 2509                        24                       0                    3
## 2510                        24                       0                    3
## 2511                        24                       0                    3
## 2512                        24                       0                    3
## 2513                        24                       0                    3
## 2514                        24                       0                    3
## 2515                        24                       0                    3
## 2516                        24                       0                    3
## 2517                        24                       0                    3
## 2518                        24                       0                    3
## 2519                        24                       0                    3
## 2520                        24                       0                    3
## 2521                        24                       0                    3
## 2522                        24                       0                    3
## 2523                        24                       0                    3
## 2524                        24                       0                    3
## 2525                        24                       0                    3
## 2526                        24                       0                    3
## 2527                        24                       0                    3
## 2528                        24                       0                    3
## 2529                        24                       0                    3
## 2530                        24                       0                    3
## 2531                        24                       0                    3
## 2532                        24                       0                    3
## 2533                        24                       0                    3
## 2534                        24                       0                    3
## 2535                        24                       0                    3
## 2536                        24                       0                    3
## 2537                        24                       0                    3
## 2538                        24                       0                    3
## 2539                        24                       1                    3
## 2540                        24                       1                    3
## 2541                        25                       1                    2
## 2542                        25                       1                    2
## 2543                        25                       2                    5
## 2544                        25                       2                    6
## 2545                        28                       2                    5
## 2546                        28                       2                    5
## 2547                        28                       2                    5
## 2548                        28                       2                    5
## 2549                        28                       2                    5
## 2550                        28                       2                    5
## 2551                        28                       2                    5
## 2552                        29                       1                    5
## 2553                        30                       0                    4
## 2554                        30                       0                    4
## 2555                        30                       0                    4
## 2556                        30                       1                    4
## 2557                        30                       1                    4
## 2558                        30                       1                    4
## 2559                        30                       1                    4
## 2560                        30                       1                    4
## 2561                        30                       1                    4
## 2562                        30                       1                    4
## 2563                        30                       1                    4
## 2564                        30                       1                    4
## 2565                        30                       1                    4
## 2566                        30                       1                    4
## 2567                        31                       0                    0
## 2568                        31                       0                    3
## 2569                        31                       0                    3
## 2570                        31                       0                    3
## 2571                        31                       0                    3
## 2572                        31                       0                    3
## 2573                        31                       0                    3
## 2574                        31                       0                    3
## 2575                        31                       0                    3
## 2576                        31                       0                    3
## 2577                        31                       0                    3
## 2578                        31                       0                    3
## 2579                        31                       0                    3
## 2580                        31                       0                    3
## 2581                        31                       0                    3
## 2582                        31                       0                    3
## 2583                        31                       0                    3
## 2584                        31                       0                    3
## 2585                        31                       0                    3
## 2586                        31                       0                    3
## 2587                        31                       0                    3
## 2588                        31                       0                    3
## 2589                        31                       0                    3
## 2590                        31                       1                    3
## 2591                        31                       1                    3
## 2592                        31                       1                    3
## 2593                        31                       0                    3
## 2594                        31                       0                    3
## 2595                        31                       0                    3
## 2596                        31                       0                    3
## 2597                        31                       0                    3
## 2598                        31                       0                    3
## 2599                        31                       1                    3
## 2600                        31                       1                    3
## 2601                        31                       1                    3
## 2602                        31                       1                    3
## 2603                        31                       1                    3
## 2604                        31                       1                    3
## 2605                        31                       1                    3
## 2606                        31                       1                    3
## 2607                        31                       1                    3
## 2608                        31                       1                    3
## 2609                        31                       1                    3
## 2610                        31                       1                    3
## 2611                        31                       1                    3
## 2612                        31                       1                    3
## 2613                        31                       1                    3
## 2614                        31                       1                    3
## 2615                        31                       1                    3
## 2616                        31                       1                    3
## 2617                        31                       2                    3
## 2618                        31                       1                    3
## 2619                        31                       1                    3
## 2620                        31                       2                    3
## 2621                         1                       0                    2
## 2622                         1                       2                    2
## 2623                         1                       2                    2
## 2624                         1                       2                    2
## 2625                         1                       2                    5
## 2626                         2                       2                    2
## 2627                         2                       2                    5
## 2628                         2                       2                    5
## 2629                         3                       2                    0
## 2630                         3                       2                    1
## 2631                         4                       0                    0
## 2632                         4                       1                    1
## 2633                         4                       1                    1
## 2634                         4                       1                    1
## 2635                         4                       1                    1
## 2636                         4                       1                    1
## 2637                         4                       1                    1
## 2638                         4                       1                    1
## 2639                         4                       1                    1
## 2640                         4                       1                    1
## 2641                         4                       1                    1
## 2642                         4                       1                    1
## 2643                         4                       1                    1
## 2644                         4                       1                    1
## 2645                         4                       1                    1
## 2646                         4                       1                    1
## 2647                         4                       1                    1
## 2648                         4                       1                    1
## 2649                         4                       1                    1
## 2650                         4                       1                    1
## 2651                         4                       1                    1
## 2652                         4                       1                    1
## 2653                         4                       1                    1
## 2654                         4                       1                    1
## 2655                         4                       1                    1
## 2656                         4                       1                    1
## 2657                         4                       1                    1
## 2658                         4                       1                    1
## 2659                         4                       1                    1
## 2660                         4                       1                    1
## 2661                         4                       1                    1
## 2662                         4                       1                    1
## 2663                         4                       1                    1
## 2664                         4                       1                    1
## 2665                         4                       1                    1
## 2666                         4                       1                    1
## 2667                         4                       1                    1
## 2668                         4                       1                    1
## 2669                         4                       1                    1
## 2670                         4                       1                    1
## 2671                         4                       1                    3
## 2672                         5                       0                    4
## 2673                         5                       2                    5
## 2674                         5                       2                    5
## 2675                         8                       0                    0
## 2676                         8                       2                    6
## 2677                        10                       2                    5
## 2678                        10                       2                    5
## 2679                        10                       2                    5
## 2680                        10                       2                    5
## 2681                        10                       2                    5
## 2682                        10                       2                    5
## 2683                        10                       2                    5
## 2684                        10                       2                    5
## 2685                        10                       2                    5
## 2686                        10                       2                    5
## 2687                        10                       2                    5
## 2688                        10                       2                    5
## 2689                        10                       2                    5
## 2690                        10                       2                    5
## 2691                        10                       2                    5
## 2692                        10                       2                    5
## 2693                        10                       6                   11
## 2694                        10                       2                    5
## 2695                        11                       1                    2
## 2696                        11                       2                    5
## 2697                        11                       2                    5
## 2698                        11                       3                    7
## 2699                        12                       2                    5
## 2700                        12                       2                    6
## 2701                        16                       1                    1
## 2702                        16                       1                    1
## 2703                        16                       1                    1
## 2704                        16                       1                    1
## 2705                        16                       1                    1
## 2706                        16                       1                    1
## 2707                        16                       1                    1
## 2708                        16                       1                    1
## 2709                        16                       1                    1
## 2710                        16                       1                    1
## 2711                        16                       1                    1
## 2712                        16                       1                    1
## 2713                        16                       1                    1
## 2714                        16                       1                    1
## 2715                        16                       1                    1
## 2716                        16                       1                    1
## 2717                        16                       1                    1
## 2718                        16                       1                    1
## 2719                        16                       1                    1
## 2720                        16                       1                    1
## 2721                        16                       1                    1
## 2722                        16                       1                    1
## 2723                        16                       1                    1
## 2724                        16                       1                    1
## 2725                        16                       1                    1
## 2726                        16                       1                    1
## 2727                        16                       1                    1
## 2728                        16                       1                    1
## 2729                        16                       2                    2
## 2730                        16                       2                    4
## 2731                        16                       2                    4
## 2732                        16                       2                    5
## 2733                        17                       2                    2
## 2734                        17                       2                    1
## 2735                        18                       1                    1
## 2736                        18                       1                    1
## 2737                        18                       1                    1
## 2738                        18                       1                    1
## 2739                        18                       1                    1
## 2740                        18                       1                    1
## 2741                        18                       1                    1
## 2742                        18                       1                    1
## 2743                        18                       1                    1
## 2744                        18                       1                    1
## 2745                        18                       1                    1
## 2746                        18                       1                    1
## 2747                        18                       1                    1
## 2748                        18                       1                    1
## 2749                        18                       1                    1
## 2750                        18                       1                    1
## 2751                        18                       1                    1
## 2752                        18                       1                    1
## 2753                        18                       1                    1
## 2754                        18                       1                    1
## 2755                        18                       1                    1
## 2756                        18                       1                    1
## 2757                        18                       1                    1
## 2758                        18                       1                    1
## 2759                        18                       1                    1
## 2760                        18                       1                    1
## 2761                        18                       1                    1
## 2762                        18                       1                    1
## 2763                        18                       1                    1
## 2764                        18                       3                    5
## 2765                        18                       3                    5
## 2766                        18                       3                    5
## 2767                        18                       3                    5
## 2768                        18                       3                    5
## 2769                        18                       3                    5
## 2770                        18                       3                    7
## 2771                        18                       3                    7
## 2772                        19                       0                    3
## 2773                        21                       0                    3
## 2774                        21                       0                    3
## 2775                        21                       2                    5
## 2776                        22                       1                    2
## 2777                        22                       1                    2
## 2778                        22                       1                    2
## 2779                        22                       1                    2
## 2780                        22                       1                    2
## 2781                        22                       1                    2
## 2782                        22                       1                    2
## 2783                        22                       1                    2
## 2784                        22                       1                    2
## 2785                        22                       1                    2
## 2786                        22                       1                    2
## 2787                        22                       1                    2
## 2788                        22                       1                    2
## 2789                        22                       1                    2
## 2790                        22                       1                    2
## 2791                        22                       1                    2
## 2792                        22                       1                    2
## 2793                        22                       1                    2
## 2794                        22                       1                    2
## 2795                        22                       1                    2
## 2796                        22                       1                    2
## 2797                        22                       1                    2
## 2798                        22                       1                    2
## 2799                        22                       1                    2
## 2800                        22                       1                    2
## 2801                        22                       1                    2
## 2802                        22                       1                    2
## 2803                        22                       2                    5
## 2804                        23                       1                    1
## 2805                        23                       2                    5
## 2806                        23                       2                    5
## 2807                        24                       2                    5
## 2808                        26                       0                    2
## 2809                        26                       0                    2
## 2810                        26                       0                    2
## 2811                        26                       0                    2
## 2812                        26                       0                    2
## 2813                        26                       4                   10
## 2814                        27                       1                    4
## 2815                        28                       1                    3
## 2816                        30                       1                    1
## 2817                        30                       1                    1
## 2818                        30                       1                    1
## 2819                        30                       1                    1
## 2820                        30                       1                    1
## 2821                        30                       1                    1
## 2822                        30                       1                    1
## 2823                        30                       2                    5
## 2824                        30                       2                    5
## 2825                        30                       2                    6
## 2826                        30                       4                    8
## 2827                        30                       2                    5
## 2828                         1                       2                    4
## 2829                         2                       1                    1
## 2830                         2                       1                    1
## 2831                         2                       1                    1
## 2832                         2                       1                    1
## 2833                         2                       1                    1
## 2834                         2                       1                    1
## 2835                         2                       1                    1
## 2836                         2                       1                    1
## 2837                         2                       1                    1
## 2838                         2                       1                    1
## 2839                         2                       1                    1
## 2840                         2                       1                    1
## 2841                         2                       1                    1
## 2842                         2                       1                    1
## 2843                         2                       1                    1
## 2844                         2                       1                    1
## 2845                         2                       1                    1
## 2846                         2                       1                    1
## 2847                         2                       1                    1
## 2848                         2                       1                    1
## 2849                         2                       1                    1
## 2850                         2                       1                    1
## 2851                         2                       1                    1
## 2852                         2                       1                    1
## 2853                         2                       1                    1
## 2854                         2                       1                    1
## 2855                         2                       1                    3
## 2856                         2                       1                    5
## 2857                         2                       3                    7
## 2858                         2                       3                    7
## 2859                         3                       2                    5
## 2860                         3                       2                    5
## 2861                         3                       2                    5
## 2862                         3                       2                    5
## 2863                         4                       0                    4
## 2864                         5                       1                    3
## 2865                         5                       1                    3
## 2866                         5                       1                    3
## 2867                         5                       1                    3
## 2868                         5                       2                    5
## 2869                         5                       2                    5
## 2870                         6                       0                    0
## 2871                         6                       2                    5
## 2872                         6                       2                    5
## 2873                         6                       2                    6
## 2874                         7                       2                    5
## 2875                         7                       2                    5
## 2876                         7                       2                    5
## 2877                         7                       2                    5
## 2878                         8                       4                    6
## 2879                         8                       4                    7
## 2880                         9                       1                    5
## 2881                         9                       2                    5
## 2882                        10                       0                    2
## 2883                        10                       0                    2
## 2884                        10                       0                    2
## 2885                        10                       0                    2
## 2886                        10                       0                    2
## 2887                        10                       0                    2
## 2888                        10                       0                    5
## 2889                        11                       2                    8
## 2890                        12                       0                    3
## 2891                        12                       0                    3
## 2892                        12                       0                    3
## 2893                        12                       0                    3
## 2894                        12                       0                    3
## 2895                        12                       0                    3
## 2896                        12                       0                    3
## 2897                        12                       0                    3
## 2898                        12                       0                    3
## 2899                        12                       0                    3
## 2900                        12                       0                    3
## 2901                        12                       0                    3
## 2902                        12                       1                    3
## 2903                        12                       2                    5
## 2904                        12                       2                    5
## 2905                        12                       2                    8
## 2906                        12                       2                    8
## 2907                        13                       0                    0
## 2908                        13                       0                    2
## 2909                        13                       2                    5
## 2910                        13                       2                    5
## 2911                        14                       4                    6
## 2912                        14                       1                    1
## 2913                        14                       1                    1
## 2914                        14                       1                    1
## 2915                        14                       1                    1
## 2916                        14                       1                    1
## 2917                        14                       1                    1
## 2918                        14                       1                    1
## 2919                        14                       1                    1
## 2920                        14                       1                    1
## 2921                        14                       1                    1
## 2922                        14                       1                    1
## 2923                        14                       1                    1
## 2924                        14                       1                    1
## 2925                        14                       1                    1
## 2926                        14                       1                    1
## 2927                        14                       1                    1
## 2928                        14                       1                    1
## 2929                        14                       1                    1
## 2930                        14                       1                    1
## 2931                        14                       1                    1
## 2932                        14                       1                    1
## 2933                        14                       1                    1
## 2934                        14                       1                    1
## 2935                        14                       1                    1
## 2936                        14                       1                    1
## 2937                        14                       1                    1
## 2938                        14                       1                    1
## 2939                        14                       1                    1
## 2940                        14                       1                    1
## 2941                        15                       0                    0
## 2942                        15                       2                    5
## 2943                        15                       4                    6
## 2944                        15                       4                    7
## 2945                        16                       1                    1
## 2946                        16                       1                    1
## 2947                        16                       1                    1
## 2948                        16                       1                    1
## 2949                        16                       1                    1
## 2950                        16                       1                    1
## 2951                        16                       1                    1
## 2952                        16                       1                    1
## 2953                        16                       1                    1
## 2954                        16                       1                    1
## 2955                        16                       1                    1
## 2956                        16                       1                    1
## 2957                        16                       1                    1
## 2958                        16                       1                    1
## 2959                        16                       1                    1
## 2960                        16                       1                    1
## 2961                        16                       1                    1
## 2962                        16                       1                    1
## 2963                        16                       1                    1
## 2964                        16                       1                    1
## 2965                        16                       1                    1
## 2966                        16                       1                    1
## 2967                        16                       1                    1
## 2968                        16                       1                    1
## 2969                        16                       1                    1
## 2970                        16                       1                    1
## 2971                        16                       1                    1
## 2972                        16                       1                    1
## 2973                        16                       1                    1
## 2974                        16                       1                    1
## 2975                        16                       1                    5
## 2976                        16                       1                    5
## 2977                        16                       2                    5
## 2978                        16                       3                    7
## 2979                        16                       3                    7
## 2980                        16                       3                    7
## 2981                        16                       3                    8
## 2982                        16                       3                    8
## 2983                        16                       3                    8
## 2984                        16                       3                    8
## 2985                        16                       3                    8
## 2986                        16                       2                    5
## 2987                        17                       2                    5
## 2988                        17                       2                    5
## 2989                        17                       2                    5
## 2990                        17                       2                    6
## 2991                        17                       2                    8
## 2992                        18                       2                    5
## 2993                        19                       0                    2
## 2994                        19                       2                    5
## 2995                        19                       2                    5
## 2996                        19                       2                    6
## 2997                        19                       2                    8
## 2998                        20                       2                    6
## 2999                        20                       2                    6
## 3000                        21                       1                    1
## 3001                        21                       1                    1
## 3002                        21                       2                    5
## 3003                        21                       3                    6
## 3004                        21                       4                    6
## 3005                        21                       4                    6
## 3006                        21                       2                    5
## 3007                        22                       4                    6
## 3008                        22                       4                    6
## 3009                        23                       1                    5
## 3010                        23                       2                    5
## 3011                        23                       3                    8
## 3012                        23                       2                    5
## 3013                        24                       0                    4
## 3014                        24                       0                    5
## 3015                        24                       0                    5
## 3016                        24                       1                    5
## 3017                        24                       1                    5
## 3018                        24                       1                    5
## 3019                        24                       1                    5
## 3020                        24                       1                    5
## 3021                        24                       1                    5
## 3022                        24                       1                    5
## 3023                        24                       1                    5
## 3024                        24                       1                    5
## 3025                        24                       1                    5
## 3026                        24                       1                    5
## 3027                        24                       1                    5
## 3028                        24                       1                    5
## 3029                        24                       2                    5
## 3030                        24                       2                    5
## 3031                        24                       2                    6
## 3032                        24                       2                    6
## 3033                        24                       2                    6
## 3034                        24                       2                    6
## 3035                        24                       2                    6
## 3036                        24                       2                    8
## 3037                        24                       2                    8
## 3038                        25                       0                    2
## 3039                        25                       0                    4
## 3040                        25                       0                    4
## 3041                        25                       0                    4
## 3042                        25                       1                    4
## 3043                        25                       1                    4
## 3044                        25                       1                    4
## 3045                        25                       1                    4
## 3046                        25                       1                    4
## 3047                        25                       1                    4
## 3048                        25                       1                    4
## 3049                        25                       4                   10
## 3050                        26                       0                    2
## 3051                        26                       0                    3
## 3052                        26                       0                    3
## 3053                        26                       0                    3
## 3054                        26                       0                    3
## 3055                        26                       0                    3
## 3056                        26                       0                    3
## 3057                        26                       0                    3
## 3058                        26                       0                    3
## 3059                        26                       0                    3
## 3060                        26                       0                    3
## 3061                        26                       0                    3
## 3062                        26                       1                    3
## 3063                        26                       1                    3
## 3064                        26                       1                    3
## 3065                        26                       1                    3
## 3066                        26                       1                    3
## 3067                        26                       1                    3
## 3068                        26                       1                    3
## 3069                        26                       1                    3
## 3070                        26                       1                    3
## 3071                        26                       1                    3
## 3072                        26                       1                    3
## 3073                        26                       1                    3
## 3074                        26                       1                    3
## 3075                        26                       1                    3
## 3076                        26                       1                    3
## 3077                        26                       1                    3
## 3078                        26                       1                    3
## 3079                        26                       1                    3
## 3080                        26                       1                    3
## 3081                        26                       2                    3
## 3082                        26                       2                    3
## 3083                        26                       0                    3
## 3084                        26                       0                    3
## 3085                        26                       0                    3
## 3086                        26                       0                    3
## 3087                        26                       2                    5
## 3088                        26                       2                    5
## 3089                        26                       2                    5
## 3090                        26                       2                    5
## 3091                        27                       0                    2
## 3092                        27                       2                    5
## 3093                        27                       2                    5
## 3094                        27                       2                    5
## 3095                        27                       2                    5
## 3096                        27                       2                    5
## 3097                        28                       1                    1
## 3098                        28                       1                    1
## 3099                        28                       1                    1
## 3100                        28                       1                    1
## 3101                        28                       1                    1
## 3102                        28                       1                    1
## 3103                        28                       1                    1
## 3104                        28                       1                    1
## 3105                        28                       1                    1
## 3106                        28                       1                    1
## 3107                        28                       1                    1
## 3108                        28                       1                    1
## 3109                        28                       1                    1
## 3110                        28                       1                    1
## 3111                        28                       1                    1
## 3112                        28                       2                    3
## 3113                        28                       1                    1
## 3114                        28                       1                    1
## 3115                        28                       1                    1
## 3116                        28                       2                    6
## 3117                        29                       2                    5
## 3118                        30                       0                    0
## 3119                        30                       0                    0
## 3120                        30                       0                    0
## 3121                        30                       2                    5
## 3122                        30                       2                    5
## 3123                        30                       2                    5
## 3124                        30                       4                   10
##      adults children babies      meal country market_segment
## 1         2     none      0        BB     PRT         Direct
## 2         2     none      0        BB     PRT         Direct
## 3         1     none      0        BB     GBR         Direct
## 4         1     none      0        BB     GBR      Corporate
## 5         2     none      0        BB     GBR      Online TA
## 6         2     none      0        BB     GBR      Online TA
## 7         2     none      0        BB     PRT         Direct
## 8         2     none      0        FB     PRT         Direct
## 9         2     none      0        HB     PRT      Online TA
## 10        2     none      0        BB     USA      Online TA
## 11        2 children      0        HB     ESP      Online TA
## 12        2     none      0        BB     PRT      Online TA
## 13        2     none      0        BB     IRL      Online TA
## 14        2     none      0        BB     PRT  Offline TA/TO
## 15        2     none      0        BB     IRL      Online TA
## 16        2     none      0        BB     FRA      Corporate
## 17        2     none      0        BB     GBR         Direct
## 18        1     none      0        BB     GBR      Online TA
## 19        2     none      0        BB     PRT         Direct
## 20        2     none      0        BB     PRT         Direct
## 21        2     none      0        BB     PRT         Direct
## 22        2     none      0        HB     GBR  Offline TA/TO
## 23        2     none      0        BB     PRT  Offline TA/TO
## 24        2     none      0        BB     IRL  Offline TA/TO
## 25        2     none      0        BB     PRT      Online TA
## 26        2     none      0        BB     PRT      Online TA
## 27        1     none      0        BB    NULL         Direct
## 28        2     none      0        BB     GBR  Offline TA/TO
## 29        2     none      0        BB     IRL  Offline TA/TO
## 30        2     none      0        BB     ESP      Online TA
## 31        3     none      0        BB     PRT      Online TA
## 32        2     none      0        HB     ROU         Direct
## 33        2     none      0        BB     IRL  Offline TA/TO
## 34        2     none      0        BB     ESP         Direct
## 35        2     none      0        HB     ROU         Direct
## 36        2     none      0        BB     PRT      Online TA
## 37        2     none      0        BB     ESP  Offline TA/TO
## 38        2     none      0        BB     NOR  Offline TA/TO
## 39        2     none      0        HB     GBR  Offline TA/TO
## 40        2     none      0        HB     IRL      Online TA
## 41        2     none      0        BB     NOR  Offline TA/TO
## 42        2     none      0        BB     IRL  Offline TA/TO
## 43        2     none      0        BB     OMN  Offline TA/TO
## 44        2     none      0        BB     ESP      Online TA
## 45        2     none      0        BB     ARG      Online TA
## 46        2 children      0        BB     ESP         Direct
## 47        2     none      0        BB     PRT         Direct
## 48        2     none      0        BB     PRT      Online TA
## 49        2     none      0        BB     PRT         Direct
## 50        2     none      0        BB     USA      Online TA
## 51        2     none      0        BB     PRT      Online TA
## 52        2     none      0        BB     IRL      Online TA
## 53        2     none      0        BB     ESP         Direct
## 54        2     none      0        BB     IRL  Offline TA/TO
## 55        2 children      0        BB     USA      Online TA
## 56        2     none      0        BB     ESP      Online TA
## 57        2     none      0        BB     POL      Online TA
## 58        2     none      0        HB     PRT  Offline TA/TO
## 59        2     none      0        BB     ESP      Online TA
## 60        2     none      0        BB     ESP      Online TA
## 61        1     none      0        BB     PRT      Online TA
## 62        2     none      0        BB     DEU  Offline TA/TO
## 63        3     none      0        BB     PRT  Offline TA/TO
## 64        2     none      0        BB     FRA  Offline TA/TO
## 65        2     none      0        BB     GBR  Offline TA/TO
## 66        2     none      0        HB     GBR  Offline TA/TO
## 67        2     none      0        HB     GBR  Offline TA/TO
## 68        2     none      0        BB     GBR      Online TA
## 69        2     none      0        BB     GBR      Online TA
## 70        2     none      0        BB     PRT      Online TA
## 71        2     none      0        BB     ESP      Online TA
## 72        2     none      0        BB     PRT      Online TA
## 73        2     none      0        BB     USA      Online TA
## 74        2     none      0        BB     BEL      Online TA
## 75        3     none      0        HB     ESP  Offline TA/TO
## 76        2 children      0        BB     PRT      Online TA
## 77        2     none      0        BB     DEU         Direct
## 78        2     none      0        BB     ESP         Direct
## 79        2     none      0        BB     FRA  Offline TA/TO
## 80        1 children      0        BB     FRA  Offline TA/TO
## 81        2     none      0        BB     PRT      Online TA
## 82        2     none      0        BB     PRT      Online TA
## 83        2     none      0        BB     PRT  Offline TA/TO
## 84        2 children      1        BB     PRT      Online TA
## 85        2     none      0        BB     CHE      Online TA
## 86        2 children      1        HB     PRT      Online TA
## 87        2     none      0        BB     GBR      Online TA
## 88        3     none      0        BB     PRT      Online TA
## 89        2     none      0        BB     PRT      Online TA
## 90        2     none      0        BB     GBR  Offline TA/TO
## 91        2     none      0        BB     PRT  Offline TA/TO
## 92        2 children      0        HB     PRT         Direct
## 93        2 children      0        BB     PRT      Online TA
## 94        2     none      0        BB     PRT  Offline TA/TO
## 95        4     none      0        FB     PRT  Complementary
## 96        2     none      0        BB     ESP      Online TA
## 97        2     none      0        BB     FRA      Online TA
## 98        2     none      0        BB     PRT      Online TA
## 99        2     none      0        BB     FRA      Online TA
## 100       2     none      0        BB     FRA      Online TA
## 101       2     none      0        BB     ESP      Online TA
## 102       2     none      0        BB     ESP      Online TA
## 103       1     none      0        BB     DEU      Online TA
## 104       1     none      0        BB     PRT      Online TA
## 105       2     none      0        BB     PRT      Online TA
## 106       1     none      0        BB     DEU      Online TA
## 107       2     none      0        BB     PRT         Direct
## 108       3     none      0        HB     PRT      Online TA
## 109       2     none      0        BB     FRA      Online TA
## 110       2     none      0        BB     ESP      Online TA
## 111       2 children      0        BB      CN  Offline TA/TO
## 112       2     none      0        BB     ESP      Online TA
## 113       2     none      0        BB     PRT      Online TA
## 114       2     none      0        BB     ESP      Online TA
## 115       2     none      0        BB     PRT      Online TA
## 116       2 children      0        HB     PRT         Direct
## 117       2     none      0        BB     IRL      Online TA
## 118       2     none      0        BB     ESP  Offline TA/TO
## 119       2 children      0        BB     CHE      Online TA
## 120       2     none      0        BB     PRT  Offline TA/TO
## 121       3     none      0        BB     PRT         Direct
## 122       2     none      0        BB     GBR  Offline TA/TO
## 123       1     none      0        HB     GBR  Offline TA/TO
## 124       2     none      0        HB     GBR  Offline TA/TO
## 125       2 children      0        BB     PRT      Online TA
## 126       2     none      0        BB     PRT      Online TA
## 127       2     none      0        BB     USA      Online TA
## 128       3     none      0        BB      CN  Offline TA/TO
## 129       2 children      0        HB     CHE         Direct
## 130       2 children      1        BB     PRT      Online TA
## 131       3     none      0        BB     USA      Online TA
## 132       2     none      0        BB     PRT      Online TA
## 133       1     none      0        BB     PRT         Direct
## 134       2 children      0        BB     PRT         Direct
## 135       2     none      0        BB     PRT      Online TA
## 136       2     none      0        BB     USA      Online TA
## 137       2     none      0        BB     GRC      Online TA
## 138       2     none      0        HB     PRT  Offline TA/TO
## 139       2     none      0        BB     PRT      Online TA
## 140       2     none      0        BB     PRT      Online TA
## 141       2     none      0        HB     PRT         Direct
## 142       2     none      0        HB     ESP      Online TA
## 143       2     none      0        BB     PRT      Online TA
## 144       2 children      0        HB     PRT      Online TA
## 145       2     none      0        BB     GBR  Offline TA/TO
## 146       2     none      0        HB     PRT      Online TA
## 147       2     none      0        BB     GBR  Offline TA/TO
## 148       2     none      0        BB     GBR  Offline TA/TO
## 149       2     none      0        HB     PRT         Direct
## 150       2     none      0        HB     GBR  Offline TA/TO
## 151       1     none      0        BB     FRA         Direct
## 152       2     none      0        BB     ITA  Offline TA/TO
## 153       2     none      0        BB     GBR  Offline TA/TO
## 154       2     none      0        BB     PRT  Offline TA/TO
## 155       2     none      0        BB     ESP      Online TA
## 156       2 children      0        HB     PRT         Direct
## 157       2     none      0        BB     PRT         Direct
## 158       2     none      0        BB     PRT      Online TA
## 159       1     none      0        BB     GBR      Online TA
## 160       3     none      0        HB     PRT         Direct
## 161       1     none      0        BB     GBR      Online TA
## 162       3 children      0        BB     ESP      Online TA
## 163       2     none      0        BB     PRT      Online TA
## 164       3     none      0        HB     USA  Offline TA/TO
## 165       2     none      0        BB     NLD         Direct
## 166       2     none      0        BB     IRL  Offline TA/TO
## 167       2     none      0        HB     IRL  Offline TA/TO
## 168       2     none      0        BB     GBR      Online TA
## 169       2     none      0        BB     PRT      Online TA
## 170       2     none      0        BB     ESP      Online TA
## 171       2     none      0        BB     ESP      Online TA
## 172       2     none      0        BB     PRT  Offline TA/TO
## 173       1     none      0        BB     PRT  Offline TA/TO
## 174       2     none      0        BB     CHE      Corporate
## 175       2     none      0        BB     PRT         Direct
## 176       2     none      0        BB     GBR      Online TA
## 177       2     none      0        HB     GBR  Offline TA/TO
## 178       2     none      0        HB     PRT      Online TA
## 179       3     none      0        BB     IRL         Direct
## 180       3     none      0        BB     DNK      Online TA
## 181       2     none      0        BB     DNK      Online TA
## 182       2 children      0        BB     PRT      Online TA
## 183       3     none      0        BB     ARG         Direct
## 184       2 children      0        BB     PRT         Direct
## 185       2 children      1        BB     PRT      Online TA
## 186       1     none      0        BB     RUS         Direct
## 187       2     none      0        BB     SWE      Online TA
## 188       2     none      0        BB     POL  Offline TA/TO
## 189       2     none      0        BB     FRA  Offline TA/TO
## 190       2     none      0        BB     GBR  Offline TA/TO
## 191       2     none      0        BB     GBR  Offline TA/TO
## 192       2     none      0        HB     GBR  Offline TA/TO
## 193       2     none      0        HB     PRT      Online TA
## 194       2     none      0        BB     USA         Direct
## 195       2     none      0        BB     PRT      Online TA
## 196       2     none      0        BB     PRT      Online TA
## 197       2     none      0        BB     PRT      Online TA
## 198       2     none      0        BB     PRT      Online TA
## 199       2     none      0        BB     PRT      Online TA
## 200       2 children      0        HB     PRT      Online TA
## 201       2     none      0        BB     PRT      Online TA
## 202       2     none      0        BB     PRT      Online TA
## 203       2     none      0        BB     GBR      Online TA
## 204       2     none      0        BB     AUS         Direct
## 205       2     none      0        BB     GBR      Online TA
## 206       2     none      0        FB     PRT         Direct
## 207       2     none      0        FB     PRT         Direct
## 208       2     none      0        BB     POL      Online TA
## 209       2 children      2        HB     PRT         Direct
## 210       2 children      0        BB     EST      Online TA
## 211       2     none      0        HB     PRT      Online TA
## 212       2     none      0        HB     PRT         Direct
## 213       2     none      0        HB     PRT      Online TA
## 214       2     none      0        HB     PRT      Online TA
## 215       1     none      0        HB     RUS  Offline TA/TO
## 216       2 children      0        HB     GBR      Online TA
## 217       2 children      1        FB     PRT  Offline TA/TO
## 218       3 children      0        BB     PRT         Direct
## 219       2     none      0        BB     IRL      Online TA
## 220       2     none      0        BB     PRT      Online TA
## 221       2 children      1        BB     GBR      Online TA
## 222       2     none      0        BB     DNK      Online TA
## 223       2 children      0        HB     GBR      Online TA
## 224       2     none      0        HB     GBR      Online TA
## 225       2     none      0        BB     ESP      Online TA
## 226       2 children      1        BB     PRT         Direct
## 227       3     none      0        HB     PRT  Offline TA/TO
## 228       2     none      0        BB     ESP      Online TA
## 229       2     none      0        BB     PRT         Direct
## 230       2     none      0        BB     GBR      Online TA
## 231       2     none      0        BB     PRT      Online TA
## 232       2     none      0        BB     CZE      Online TA
## 233       1     none      0        BB     GBR         Direct
## 234       2     none      0        HB     DEU      Online TA
## 235       2     none      0        BB     ESP         Direct
## 236       2     none      0        BB     ESP      Online TA
## 237       2     none      0        HB     PRT      Corporate
## 238       2     none      0        BB     ESP  Offline TA/TO
## 239       2     none      0        BB     ROU      Online TA
## 240       2     none      0        BB     PRT      Online TA
## 241       2     none      0        BB     ESP      Online TA
## 242       2     none      0        BB     PRT  Offline TA/TO
## 243       2     none      0        HB     PRT      Online TA
## 244       2 children      0        HB     PRT         Direct
## 245       2     none      0        HB     PRT      Online TA
## 246       2     none      0        BB     PRT         Direct
## 247       2     none      0        BB     PRT      Online TA
## 248       2 children      0        BB      CN      Online TA
## 249       2     none      0        BB     PRT      Online TA
## 250       2 children      0        BB     PRT      Online TA
## 251       2     none      0        BB     GBR      Online TA
## 252       2     none      0        BB     BRA  Offline TA/TO
## 253       2     none      0        FB     PRT  Offline TA/TO
## 254       2 children      1        HB     ESP  Offline TA/TO
## 255       2     none      0        BB     GBR  Offline TA/TO
## 256       2 children      1        FB     PRT  Offline TA/TO
## 257       2     none      0        BB     PRT  Offline TA/TO
## 258       2     none      0        BB     GBR  Offline TA/TO
## 259       2     none      0        BB     GBR  Offline TA/TO
## 260       2     none      0        BB     ESP      Online TA
## 261       2     none      0        HB     FRA      Online TA
## 262       2     none      0        BB     PRT      Online TA
## 263       2     none      0        BB     GBR  Offline TA/TO
## 264       2     none      0        HB     GBR  Offline TA/TO
## 265       2     none      0        BB     GBR  Offline TA/TO
## 266       2     none      0        BB     PRT      Online TA
## 267       2 children      0        BB     BEL      Online TA
## 268       2     none      0        BB     ESP      Online TA
## 269       2     none      0        BB     FRA      Online TA
## 270       2     none      0        BB     ESP      Online TA
## 271       2     none      0        BB     BEL      Online TA
## 272       2     none      0        BB     ITA  Offline TA/TO
## 273       2     none      0        BB     ESP      Online TA
## 274       2     none      0        BB     FRA  Offline TA/TO
## 275       2 children      1        BB     FIN      Online TA
## 276       2 children      0        BB      CN         Direct
## 277       2     none      0        BB     ESP  Offline TA/TO
## 278       2 children      0        BB     IRL      Online TA
## 279       2     none      0        HB     ESP      Online TA
## 280       2     none      0        BB     ESP      Online TA
## 281       2 children      1        HB     PRT  Offline TA/TO
## 282       2     none      0        BB     GBR      Online TA
## 283       2     none      0        BB     ESP      Online TA
## 284       2     none      0        BB     ESP      Online TA
## 285       2     none      0        BB     AUS      Online TA
## 286       2     none      0        BB     ESP      Online TA
## 287       4     none      0        BB     PRT         Direct
## 288       2     none      0        HB     ESP      Online TA
## 289       2     none      0        BB     ESP      Online TA
## 290       2     none      0        BB     USA      Online TA
## 291       2     none      0        BB     PRT      Online TA
## 292       2     none      0        HB     ESP      Online TA
## 293       2     none      0        BB     PRT      Online TA
## 294       2     none      0        HB     ESP         Direct
## 295       1     none      0        BB     PRT      Corporate
## 296       2     none      0        BB     ESP         Direct
## 297       2     none      0        BB     PRT         Direct
## 298       2     none      0        BB     PRT      Online TA
## 299       2     none      0        BB     ESP         Direct
## 300       3     none      0        HB     PRT         Direct
## 301       1     none      0        HB     PRT  Offline TA/TO
## 302       2     none      0        BB     FRA      Online TA
## 303       2     none      0        HB     PRT  Offline TA/TO
## 304       2     none      0        FB     PRT         Direct
## 305       2 children      0        HB     ESP         Direct
## 306       2     none      0        BB     ROU      Online TA
## 307       2     none      0        HB     ESP      Online TA
## 308       2     none      0        BB     FIN  Offline TA/TO
## 309       2     none      0        BB     GBR      Online TA
## 310       1     none      0        BB     PRT      Corporate
## 311       2     none      0        BB     PRT      Online TA
## 312       2     none      0        BB     PRT      Online TA
## 313       2     none      0        BB     ESP      Online TA
## 314       2     none      0        BB     POL      Online TA
## 315       2     none      0        BB     PRT         Direct
## 316       2     none      0        HB     PRT         Direct
## 317       2 children      0        HB     PRT         Direct
## 318       2 children      0        HB     PRT         Direct
## 319       2     none      0        HB     ESP      Online TA
## 320       2     none      0        HB     ESP      Online TA
## 321       2     none      0        BB     IRL         Direct
## 322       2     none      0        BB     IRL      Online TA
## 323       2     none      0        HB     SWE      Online TA
## 324       2     none      0        HB     SWE      Online TA
## 325       3     none      0        BB     PRT         Direct
## 326       1     none      0        BB     PRT      Corporate
## 327       2     none      0        HB     POL      Online TA
## 328       2 children      0        BB     GBR      Online TA
## 329       2     none      0        FB     PRT         Groups
## 330       2     none      0        FB     PRT         Groups
## 331       2     none      0        FB     PRT         Groups
## 332       2     none      0        FB     PRT         Groups
## 333       2     none      0        FB     PRT         Groups
## 334       2 children      0        BB     GBR      Online TA
## 335       2     none      0        FB     PRT         Groups
## 336       1     none      0        FB     PRT         Groups
## 337       2     none      0        FB     PRT         Groups
## 338       3     none      0        FB     PRT         Groups
## 339       1     none      0        FB     PRT         Groups
## 340       2     none      0        FB     PRT         Groups
## 341       2     none      0        FB     PRT         Groups
## 342       3     none      0        FB     PRT         Groups
## 343       1     none      0        FB     PRT         Groups
## 344       2     none      0        FB     PRT         Groups
## 345       2     none      0        FB     PRT         Groups
## 346       2     none      0        FB     PRT         Groups
## 347       2     none      0        FB     PRT         Groups
## 348       2     none      0        FB     PRT         Groups
## 349       2     none      0        BB     DNK      Online TA
## 350       2     none      0        BB     FIN      Online TA
## 351       2 children      0        BB     USA      Online TA
## 352       2 children      0        BB     PRT         Direct
## 353       2 children      0        BB     PRT      Online TA
## 354       2     none      0        BB     DNK      Online TA
## 355       2     none      0        BB     ESP         Direct
## 356       2     none      0        BB     ESP      Online TA
## 357       2     none      0        BB     IRL         Direct
## 358       1     none      0        BB     IRL         Direct
## 359       2     none      0        BB     PRT      Online TA
## 360       2     none      0        HB     PRT      Online TA
## 361       2     none      0        HB     GBR  Offline TA/TO
## 362       2     none      0        BB     PRT  Offline TA/TO
## 363       1     none      0        HB     PRT         Direct
## 364       2     none      0        BB     PRT      Online TA
## 365       2     none      0        BB     PRT         Direct
## 366       2     none      0        BB     PRT      Online TA
## 367       2     none      0        BB     PRT      Online TA
## 368       2     none      0        BB     PRT  Offline TA/TO
## 369       2     none      0        BB     ESP      Online TA
## 370       2     none      0        BB     PRT         Direct
## 371       2     none      0        BB     ESP         Direct
## 372       2     none      0        BB     PRT  Offline TA/TO
## 373       2     none      0        BB     PRT      Online TA
## 374       2     none      0        BB     PRT  Offline TA/TO
## 375       2 children      0        BB     PRT  Offline TA/TO
## 376       2     none      0        BB     ESP         Direct
## 377       1     none      0        BB     PRT  Offline TA/TO
## 378       2     none      0        BB     PRT  Offline TA/TO
## 379       1     none      0        BB     PRT  Offline TA/TO
## 380       1     none      0        BB     PRT  Offline TA/TO
## 381       2     none      0        BB     PRT  Offline TA/TO
## 382       3 children      0        BB     PRT         Direct
## 383       2     none      0        BB     PRT      Online TA
## 384       2 children      0        BB     ESP         Direct
## 385       2     none      0        BB     IRL      Online TA
## 386       2     none      0        HB     PRT      Online TA
## 387       2     none      0        BB     PRT      Online TA
## 388       2     none      0        BB     GBR  Offline TA/TO
## 389       2     none      0        HB     PRT      Online TA
## 390       2     none      0        HB     ESP      Online TA
## 391       2     none      0        HB     ESP      Online TA
## 392       3     none      0        BB     FRA         Direct
## 393       2     none      0        HB     ESP         Direct
## 394       2     none      0        BB     MOZ      Online TA
## 395       2 children      0        BB     BWA      Online TA
## 396       2 children      0        HB     PRT      Online TA
## 397       2     none      0        BB     GBR  Offline TA/TO
## 398       2     none      0        BB     ESP      Online TA
## 399       2     none      0        BB     DEU      Online TA
## 400       2     none      0        BB     IRL  Offline TA/TO
## 401       2     none      0        BB     GBR      Online TA
## 402       2 children      0        BB     MOZ      Online TA
## 403       2     none      0        BB     ESP      Online TA
## 404       3     none      0        BB     PRT         Direct
## 405       2     none      0        BB     ESP      Online TA
## 406       2     none      0        BB     PRT         Direct
## 407       2 children      0        HB     LUX      Online TA
## 408       2     none      0        HB     PRT      Online TA
## 409       2     none      0        BB     PRT         Direct
## 410       2     none      0        BB     PRT         Direct
## 411       2     none      0        BB     PRT      Online TA
## 412       2     none      0        BB     PRT  Offline TA/TO
## 413       2     none      0        BB     GBR      Online TA
## 414       2 children      1        BB     PRT         Direct
## 415       2     none      0        BB     PRT         Direct
## 416       2 children      0        FB     PRT         Direct
## 417       1 children      0        BB     PRT      Online TA
## 418       1     none      0        BB      CN         Direct
## 419       2 children      0        FB     PRT         Direct
## 420       2     none      0        HB     ESP      Online TA
## 421       2     none      0        FB     PRT  Offline TA/TO
## 422       2     none      0        BB     PRT         Direct
## 423       2     none      0        BB     PRT         Direct
## 424       2     none      0        BB     PRT         Direct
## 425       2     none      0        BB     PRT         Direct
## 426       2     none      0        HB     ESP  Offline TA/TO
## 427       2     none      0        HB     ESP  Offline TA/TO
## 428       2     none      0        BB     IRL      Online TA
## 429       2     none      0        BB     PRT         Direct
## 430       2     none      0        BB     PRT      Online TA
## 431       2     none      0        BB     NLD         Direct
## 432       2     none      0        BB     PRT      Online TA
## 433       2     none      0        BB     PRT      Online TA
## 434       2     none      0        BB     PRT      Online TA
## 435       2     none      0        BB     PRT         Direct
## 436       2     none      0        BB     PRT         Direct
## 437       2 children      0        HB     ESP      Online TA
## 438       2     none      0        BB     GBR  Offline TA/TO
## 439       2     none      0        BB     RUS      Online TA
## 440       2     none      0        BB     IRL  Offline TA/TO
## 441       2 children      0        BB     PRT      Online TA
## 442       2     none      0        BB     GBR  Offline TA/TO
## 443       2     none      0        BB     IRL  Offline TA/TO
## 444       2     none      0        BB     GBR  Offline TA/TO
## 445       2     none      0        BB     GBR  Offline TA/TO
## 446       2 children      1        BB     ESP      Online TA
## 447       1     none      0        BB     PRT  Offline TA/TO
## 448       1     none      0        BB     PRT  Offline TA/TO
## 449       2     none      0        BB     PRT      Online TA
## 450       2 children      1        BB     PRT      Online TA
## 451       2     none      0        BB     PRT      Online TA
## 452       2     none      0        BB     POL      Online TA
## 453       2     none      0        HB     PRT         Direct
## 454       2     none      0        BB     NOR      Online TA
## 455       2     none      0        BB     ESP  Offline TA/TO
## 456       2     none      0        HB     PRT         Direct
## 457       2     none      0        BB     GBR  Offline TA/TO
## 458       2 children      0        BB     GBR      Online TA
## 459       2 children      1        HB     PRT      Online TA
## 460       2     none      0        FB     ESP  Offline TA/TO
## 461       2     none      0        HB     ESP      Online TA
## 462       2 children      0        FB     PRT  Offline TA/TO
## 463       2 children      0        HB     PRT  Offline TA/TO
## 464       2     none      0        HB     PRT  Offline TA/TO
## 465       2     none      0        HB     PRT  Offline TA/TO
## 466       1     none      0        BB     PRT      Corporate
## 467       2     none      0        BB     PRT      Online TA
## 468       3     none      0        BB     PRT         Direct
## 469       3     none      0        BB     PRT         Direct
## 470       2     none      0        HB     IRL      Online TA
## 471       3     none      0        BB     CHE  Offline TA/TO
## 472       2     none      0        BB     PRT      Online TA
## 473       2 children      0        BB     IRL         Direct
## 474       2     none      0        BB     GBR      Online TA
## 475       2     none      0        BB     ESP         Direct
## 476       2 children      0        HB     FRA      Online TA
## 477       2 children      0        BB     PRT      Online TA
## 478       2     none      0        BB     PRT      Online TA
## 479       2     none      0        BB     PRT      Online TA
## 480       2     none      0        BB     PRT         Direct
## 481       2     none      0        HB     ESP      Online TA
## 482       2     none      0        HB     ESP      Online TA
## 483       2     none      0        BB      CN  Offline TA/TO
## 484       3     none      0        HB     ROU  Offline TA/TO
## 485       2     none      0        BB     ESP      Online TA
## 486       2     none      0        BB     BRA      Online TA
## 487       2     none      0        BB     ESP      Online TA
## 488       2     none      0        BB     ESP      Online TA
## 489       2     none      0        BB     ESP      Online TA
## 490       2     none      0        BB     PRT      Online TA
## 491       2     none      0        BB     ESP      Online TA
## 492       2     none      0        BB     ESP         Direct
## 493       2     none      0        BB     BRA      Online TA
## 494       3     none      0        BB     RUS      Online TA
## 495       2     none      0        BB     ESP  Offline TA/TO
## 496       2     none      0        BB     SVN      Online TA
## 497       2     none      0        BB     ALB  Offline TA/TO
## 498       2     none      0        BB     GBR      Online TA
## 499       2     none      0        BB     GBR      Online TA
## 500       2     none      0        BB     PRT         Direct
## 501       2     none      0        BB     PRT         Direct
## 502       2     none      0        HB     ESP      Online TA
## 503       2     none      0        BB     GBR  Offline TA/TO
## 504       2 children      0        HB     PRT      Online TA
## 505       2     none      0        HB     PRT  Offline TA/TO
## 506       2     none      0        BB     ESP  Offline TA/TO
## 507       2     none      0        BB     ESP      Online TA
## 508       2     none      0        BB     ESP  Offline TA/TO
## 509       2     none      0        BB     PRT         Direct
## 510       2     none      0        BB     ESP      Online TA
## 511       2     none      0        HB     PRT  Offline TA/TO
## 512       2     none      0        BB     GBR      Online TA
## 513       2     none      0        HB     PRT  Offline TA/TO
## 514       2 children      0        HB     ESP      Online TA
## 515       2     none      0        BB     ESP      Online TA
## 516       2 children      0        HB     PRT      Online TA
## 517       2 children      0        HB     PRT         Direct
## 518       2     none      0        BB     IRL         Direct
## 519       2     none      0        HB     PRT      Online TA
## 520       2     none      0        BB     PRT      Online TA
## 521       2     none      0        HB     PRT      Online TA
## 522       2     none      0        HB     PRT      Online TA
## 523       2     none      0        BB     PRT  Offline TA/TO
## 524       3     none      0        HB     GBR      Online TA
## 525       2     none      0        HB     GBR      Online TA
## 526       2     none      0        BB     PRT      Online TA
## 527       2     none      0        BB     IRL  Offline TA/TO
## 528       2     none      0        BB     PRT      Online TA
## 529       3     none      0        BB     PRT         Direct
## 530       2     none      0        BB     ESP      Online TA
## 531       2     none      0        BB      CN      Online TA
## 532       3     none      0        HB     PRT         Direct
## 533       2 children      0        HB     ESP         Direct
## 534       2     none      0        BB     RUS      Online TA
## 535       2     none      0        HB     PRT         Direct
## 536       2     none      0        BB     GBR  Offline TA/TO
## 537       2     none      0        BB     PRT      Online TA
## 538       2     none      0        BB     PRT      Online TA
## 539       2     none      0        BB     PRT      Online TA
## 540       2     none      0        HB     PRT      Online TA
## 541       2     none      0        BB     ESP         Direct
## 542       2     none      0        HB     PRT      Online TA
## 543       2     none      0        BB     ESP         Direct
## 544       2     none      0        BB     PRT      Online TA
## 545       2     none      0        HB     ESP  Offline TA/TO
## 546       2     none      0        BB     PRT      Online TA
## 547       2     none      0        BB     ESP  Offline TA/TO
## 548       2 children      0        HB     PRT         Direct
## 549       2     none      0        HB     ESP         Direct
## 550       2     none      0        BB     PRT  Offline TA/TO
## 551       2 children      0        BB     PRT      Online TA
## 552       2     none      0        HB     PRT  Offline TA/TO
## 553       2     none      0        BB     PRT      Online TA
## 554       2     none      0        BB     PRT      Online TA
## 555       2     none      0        BB     PRT  Offline TA/TO
## 556       2     none      0        HB     ESP      Online TA
## 557       2     none      0        BB     PRT      Online TA
## 558       2     none      0        BB     GBR  Offline TA/TO
## 559       2     none      0        BB     GBR      Online TA
## 560       2 children      0        BB     GBR      Online TA
## 561       2 children      0        BB     USA      Online TA
## 562       2     none      0        BB     PRT      Online TA
## 563       2     none      0        BB     ESP  Offline TA/TO
## 564       2     none      0        BB     RUS  Offline TA/TO
## 565       2     none      0        BB     PRT         Direct
## 566       2     none      0        BB     PRT      Online TA
## 567       2     none      0        BB     ESP         Direct
## 568       2     none      0        BB     NOR      Online TA
## 569       2     none      0        BB     USA  Offline TA/TO
## 570       2     none      0        HB     PRT  Offline TA/TO
## 571       2     none      0        BB     PRT      Online TA
## 572       2     none      0        BB     GBR      Online TA
## 573       2     none      0        HB     PRT         Direct
## 574       2 children      0        BB     PRT         Direct
## 575       2     none      0        HB     PRT         Direct
## 576       2     none      0        BB     GBR      Online TA
## 577       2     none      0        BB     GBR  Offline TA/TO
## 578       2     none      0        BB     GBR      Online TA
## 579       1     none      0        BB     ESP  Offline TA/TO
## 580       2     none      0        BB     GBR      Online TA
## 581       3 children      0        HB     PRT         Direct
## 582       2 children      0        FB     ESP  Offline TA/TO
## 583       2 children      0        BB     BRA      Online TA
## 584       2     none      0        HB     PRT         Direct
## 585       2     none      0        BB     CHE  Offline TA/TO
## 586       2     none      0        BB     CHE  Offline TA/TO
## 587       1     none      0        BB     PRT  Offline TA/TO
## 588       2     none      0        HB     PRT      Online TA
## 589       2 children      0        BB     PRT         Direct
## 590       1     none      0        BB     PRT         Direct
## 591       2     none      0        BB     PRT      Online TA
## 592       2     none      0        BB     PRT      Online TA
## 593       2 children      0        BB     PRT      Online TA
## 594       2     none      0        HB     PRT      Online TA
## 595       1     none      0        BB     IRL         Direct
## 596       2 children      0        BB     PRT      Online TA
## 597       1     none      0        BB     NLD      Online TA
## 598       2     none      0        BB     BEL      Online TA
## 599       2     none      0        BB     IRL  Offline TA/TO
## 600       2     none      0        BB     PRT  Offline TA/TO
## 601       2     none      0        BB     PRT      Online TA
## 602       2     none      0        BB     ESP      Online TA
## 603       3     none      0        HB     PRT         Direct
## 604       2     none      0        HB     PRT      Online TA
## 605       1     none      0        BB     PRT  Offline TA/TO
## 606       3     none      0        HB     PRT  Offline TA/TO
## 607       2 children      0        HB     PRT         Direct
## 608       2     none      0        BB     PRT         Direct
## 609       2     none      0        HB     PRT         Direct
## 610       2     none      0        BB     ESP         Direct
## 611       2     none      0        BB     IRL  Offline TA/TO
## 612       2     none      0        FB     PRT  Offline TA/TO
## 613       2 children      0        BB     PRT         Direct
## 614       2     none      0        BB     PRT      Online TA
## 615       2     none      0        BB     IRL      Online TA
## 616       1     none      0        HB     GBR  Offline TA/TO
## 617       2     none      0        BB     PRT      Online TA
## 618       2     none      0        BB     PRT      Online TA
## 619       2     none      0        BB     PRT         Direct
## 620       2 children      1        HB     PRT         Direct
## 621       2     none      0        HB     PRT         Direct
## 622       2     none      0        HB     ESP      Online TA
## 623       2     none      0        BB     ESP  Offline TA/TO
## 624       2     none      0        BB     ESP      Online TA
## 625       2     none      0        BB     PRT  Offline TA/TO
## 626       2     none      0        HB     RUS         Direct
## 627       3     none      0        BB     PRT      Online TA
## 628       2     none      0        HB     PRT  Offline TA/TO
## 629       2     none      0        BB     ESP      Online TA
## 630       2     none      0        BB     PRT         Direct
## 631       2     none      0        BB     ESP      Online TA
## 632       2     none      0        BB     PRT      Online TA
## 633       3     none      0        BB     PRT      Online TA
## 634       2 children      1        HB     PRT      Online TA
## 635       2     none      0        BB     FRA      Online TA
## 636       2     none      0        BB     PRT         Direct
## 637       2 children      0        HB     ESP      Online TA
## 638       2     none      0        BB     PRT         Direct
## 639       2     none      0        HB     GBR  Offline TA/TO
## 640       2     none      0        HB     PRT      Online TA
## 641       2     none      0        BB     ROU      Online TA
## 642       2     none      0        BB     RUS      Online TA
## 643       2     none      0        BB     ESP      Online TA
## 644       3 children      0        BB     IRL         Direct
## 645       2     none      0        BB     PRT      Online TA
## 646       2     none      0        BB     PRT      Corporate
## 647       2 children      0        BB     IND      Online TA
## 648       2     none      0        BB     PRT      Online TA
## 649       2     none      0        BB     GBR      Online TA
## 650       2     none      0        BB     PRT         Direct
## 651       2     none      0        BB     PRT      Online TA
## 652       2     none      0        BB     ESP  Offline TA/TO
## 653       2     none      0        BB     IRL      Online TA
## 654       2 children      1        BB     PRT  Offline TA/TO
## 655       2     none      0        HB     PRT      Online TA
## 656       2     none      0        BB     NLD      Online TA
## 657       2     none      0        BB     CHN      Online TA
## 658       2     none      0        BB     CHE      Online TA
## 659       2     none      0        HB     ESP      Online TA
## 660       2     none      0        BB     PRT      Online TA
## 661       2     none      0        BB     USA      Online TA
## 662       2     none      0        HB     ESP      Online TA
## 663       2     none      0        HB     FRA      Online TA
## 664       2 children      0        BB     PRT  Offline TA/TO
## 665       2 children      0        FB     PRT         Direct
## 666       2 children      1        HB     PRT  Offline TA/TO
## 667       2     none      0        BB     IRL  Offline TA/TO
## 668       2     none      0        HB     PRT  Offline TA/TO
## 669       2     none      0        BB     FRA      Online TA
## 670       2     none      0        BB     PRT         Direct
## 671       2     none      0        BB     PRT      Online TA
## 672       2     none      0        BB     PRT      Online TA
## 673       2     none      0        BB     FRA      Online TA
## 674       2     none      0        BB     USA      Online TA
## 675       2     none      0        BB      CN      Online TA
## 676       2     none      0        HB     MEX      Online TA
## 677       2 children      1        FB     ESP         Direct
## 678       2     none      0        BB     GBR  Offline TA/TO
## 679       2     none      0        HB     PRT  Offline TA/TO
## 680       2     none      0        HB     GBR  Offline TA/TO
## 681       2     none      0        BB     GBR  Offline TA/TO
## 682       2     none      0        HB     PRT      Online TA
## 683       2 children      0        HB     PRT  Offline TA/TO
## 684       2     none      0        BB     RUS      Online TA
## 685       2     none      0        BB     USA      Online TA
## 686       2     none      0        BB     ESP  Offline TA/TO
## 687       2     none      0        BB     ESP      Online TA
## 688       2     none      0        BB     PRT      Online TA
## 689       2     none      0        BB     PRT      Online TA
## 690       2 children      0        BB     PRT      Online TA
## 691       2     none      0        HB     IRL         Direct
## 692       2     none      0        BB     PRT      Online TA
## 693       2     none      0        BB     PRT      Online TA
## 694       2     none      0        BB     IRL      Online TA
## 695       2     none      0        BB     PRT      Online TA
## 696       2     none      0        HB     RUS      Online TA
## 697       2     none      0        BB     PRT      Online TA
## 698       2 children      0        FB     PRT  Offline TA/TO
## 699       2 children      0        BB     IRL  Offline TA/TO
## 700       2 children      0        BB     GBR      Online TA
## 701       2     none      0        BB     PRT         Groups
## 702       2     none      0        HB     FRA      Online TA
## 703       2     none      0        BB     FRA  Offline TA/TO
## 704       2     none      0        BB     FRA  Offline TA/TO
## 705       2     none      0        BB     PRT      Online TA
## 706       2     none      0        BB     FRA      Online TA
## 707       2     none      0        BB      CN      Corporate
## 708       3     none      0        BB     IRL      Corporate
## 709       2     none      0        BB     ESP  Offline TA/TO
## 710       2 children      1        HB     RUS      Online TA
## 711       2     none      0        HB     ESP      Online TA
## 712       2     none      0        BB     GBR      Online TA
## 713       2     none      0        BB     ESP      Online TA
## 714       1     none      0        HB     PRT      Online TA
## 715       2 children      0        BB     PRT         Direct
## 716       2 children      1        HB     PRT      Online TA
## 717       2     none      0        BB     PRT      Online TA
## 718       2 children      0        BB     CHE         Direct
## 719       2     none      0        BB     PRT         Direct
## 720       2     none      0        BB     PRT      Online TA
## 721       2     none      0        BB     PRT      Online TA
## 722       2     none      0        BB     CHN      Online TA
## 723       3     none      0        HB     ESP      Online TA
## 724       2     none      0        BB     ESP      Online TA
## 725       2     none      0        HB     ESP      Online TA
## 726       3     none      0        BB     PRT      Online TA
## 727       2     none      0        BB     PRT         Direct
## 728       2     none      0        BB     PRT      Online TA
## 729       2     none      0        BB     ESP      Online TA
## 730       2 children      0        HB     PRT         Direct
## 731       2     none      0        BB     NLD  Offline TA/TO
## 732       2     none      0        BB     NLD  Offline TA/TO
## 733       2     none      0        BB     PRT         Direct
## 734       2     none      0        HB     PRT  Offline TA/TO
## 735       2     none      0        HB     PRT         Direct
## 736       2 children      0        BB     USA      Online TA
## 737       2     none      0        HB     PRT  Offline TA/TO
## 738       3     none      0        BB     ESP  Offline TA/TO
## 739       2     none      0        HB     PRT  Offline TA/TO
## 740       2     none      0        FB     PRT         Direct
## 741       2     none      0        BB     ESP  Offline TA/TO
## 742       2     none      0        FB     PRT         Direct
## 743       3     none      0        BB     PRT  Offline TA/TO
## 744       2     none      0        BB     PRT  Offline TA/TO
## 745       2 children      0        BB     PRT  Offline TA/TO
## 746       2     none      0        BB     PRT         Direct
## 747       2     none      0        BB     IRL  Offline TA/TO
## 748       2     none      0        BB     PRT  Offline TA/TO
## 749       1     none      0        BB     PRT         Groups
## 750       1     none      0        BB     PRT         Groups
## 751       1     none      0        BB     PRT         Groups
## 752       1     none      0        BB     PRT         Groups
## 753       2     none      0        BB     GBR      Online TA
## 754       1     none      0        BB     PRT         Groups
## 755       1     none      0        BB     PRT         Groups
## 756       2     none      0        BB     BRA      Online TA
## 757       2 children      0        BB     PRT      Online TA
## 758       2     none      0        BB     PRT      Online TA
## 759       2     none      0        BB     PRT      Online TA
## 760       2 children      0        FB     PRT         Direct
## 761       2     none      0        HB     GBR  Offline TA/TO
## 762       2     none      0        BB     IRL  Offline TA/TO
## 763       2     none      0        HB     PRT  Offline TA/TO
## 764       2     none      0        HB     PRT  Offline TA/TO
## 765       2     none      0        BB     PRT         Direct
## 766       2     none      0        BB     PRT      Online TA
## 767       2 children      0        HB     PRT      Online TA
## 768       2 children      0        BB      CN  Offline TA/TO
## 769       2 children      0        BB     PRT  Offline TA/TO
## 770       2     none      0        BB     PRT  Offline TA/TO
## 771       2     none      0        BB     PRT  Offline TA/TO
## 772       3     none      0        HB     PRT      Online TA
## 773       2 children      0        BB     GBR      Online TA
## 774       2 children      0        BB     PRT         Direct
## 775       2     none      0        BB     IRL      Online TA
## 776       2 children      0        BB     IRL      Online TA
## 777       3     none      0        HB     PRT      Online TA
## 778       3     none      0        BB     ESP      Online TA
## 779       2     none      0        HB     ESP      Online TA
## 780       2     none      0        BB     IRL         Direct
## 781       2     none      0        BB     POL      Online TA
## 782       3     none      0        HB     ESP         Direct
## 783       2     none      0        BB     GBR      Online TA
## 784       2     none      0        HB     PRT      Online TA
## 785       2     none      0        BB     PRT      Online TA
## 786       2     none      0        BB     PRT      Online TA
## 787       1     none      0        BB     USA         Direct
## 788       2     none      0        BB     GBR  Offline TA/TO
## 789       3 children      0        HB     MAR  Offline TA/TO
## 790       2     none      0        BB     RUS      Online TA
## 791       2     none      0        BB     PRT         Direct
## 792       2     none      0        BB     GBR      Online TA
## 793       2     none      0        BB     ESP      Online TA
## 794       2     none      0        BB     ESP      Online TA
## 795       2     none      0        BB     ESP      Online TA
## 796       2     none      0        BB     PRT      Online TA
## 797       2     none      0        BB     IRL  Offline TA/TO
## 798       2     none      0        BB     FRA      Online TA
## 799       2     none      0        BB     FRA      Online TA
## 800       2     none      0        BB     PRT         Direct
## 801       2     none      0        HB     ESP      Online TA
## 802       2     none      0        FB     PRT         Direct
## 803       2     none      0        BB     CHE      Online TA
## 804       3     none      0        HB     ESP         Direct
## 805       2     none      0        HB     IRL      Online TA
## 806       3     none      0        HB     ESP      Online TA
## 807       2     none      0        HB     ESP      Online TA
## 808       2     none      0        BB     IRL      Online TA
## 809       2     none      0        BB     IRL  Offline TA/TO
## 810       2     none      0        BB     IRL      Online TA
## 811       2 children      0        BB     PRT         Direct
## 812       2     none      0        HB     PRT         Direct
## 813       2     none      0        HB     PRT  Offline TA/TO
## 814       2     none      0        HB     PRT  Offline TA/TO
## 815       2     none      0        BB     PRT         Direct
## 816       2     none      0        HB     ESP  Offline TA/TO
## 817       3     none      0        HB     PRT  Offline TA/TO
## 818       2 children      0        HB     PRT  Offline TA/TO
## 819       2     none      0        BB     PRT  Offline TA/TO
## 820       2     none      0        BB     PRT         Direct
## 821       2     none      0        HB     PRT  Offline TA/TO
## 822       2     none      0        BB     PRT         Direct
## 823       2 children      0        HB     PRT         Direct
## 824       2     none      0        BB     PRT  Offline TA/TO
## 825       2     none      0        BB     PRT  Offline TA/TO
## 826       2 children      0        BB     PRT         Direct
## 827       2 children      0        HB     PRT  Offline TA/TO
## 828       2 children      0        HB     PRT         Direct
## 829       2     none      0        HB     ESP      Online TA
## 830       2     none      0        BB     ESP         Direct
## 831       2     none      0        BB     ESP      Online TA
## 832       3 children      0        BB     PRT         Direct
## 833       1     none      0        BB     FRA      Online TA
## 834       2     none      0        HB     IRL  Offline TA/TO
## 835       2     none      0        HB     PRT  Offline TA/TO
## 836       2     none      0        BB     IRL  Offline TA/TO
## 837       2 children      0        BB     GBR      Online TA
## 838       1     none      0        BB     PRT      Corporate
## 839       2     none      0        BB     PRT      Online TA
## 840       3     none      0        BB     PRT         Direct
## 841       2     none      0        BB     PRT         Direct
## 842       2     none      0        BB     ESP      Online TA
## 843       2     none      0        BB     PRT      Online TA
## 844       2     none      0        BB     POL      Online TA
## 845       2 children      0        FB     PRT         Direct
## 846       2 children      1        BB     PRT         Direct
## 847       1 children      0        BB     PRT         Direct
## 848       2     none      0        BB     GBR  Offline TA/TO
## 849       2     none      0        BB     ROU      Online TA
## 850       2 children      0        BB     ROU      Online TA
## 851       2     none      0        BB     PRT  Offline TA/TO
## 852       2 children      0        BB     ESP         Direct
## 853       2     none      0        BB     PRT  Offline TA/TO
## 854       2     none      0        BB     PRT         Direct
## 855       2     none      0        BB     IRL  Offline TA/TO
## 856       2     none      0        BB     PRT         Direct
## 857       2     none      0        BB     PRT      Online TA
## 858       2     none      0        BB     PRT      Online TA
## 859       2     none      0        BB     IRL      Online TA
## 860       2     none      0        BB     ESP  Offline TA/TO
## 861       2     none      0        BB     ESP  Offline TA/TO
## 862       2     none      0        BB     NLD  Offline TA/TO
## 863       2     none      0        BB     IRL  Offline TA/TO
## 864       2     none      0        BB     IRL  Offline TA/TO
## 865       2 children      0        BB     GBR         Direct
## 866       2     none      0        BB     ESP         Direct
## 867       2     none      0        BB     PRT         Direct
## 868       3     none      0        BB     BRA         Direct
## 869       2     none      0        BB     PRT      Online TA
## 870       2 children      0        HB     PRT      Online TA
## 871       2     none      0        FB     ESP         Direct
## 872       2 children      0        BB     BRA         Direct
## 873       2     none      0        BB     MAR      Online TA
## 874       2     none      0        HB     PRT         Direct
## 875       2     none      0        BB     PRT         Direct
## 876       2     none      0        BB     PRT         Direct
## 877       2 children      0        BB     PRT  Offline TA/TO
## 878       2     none      0        BB      CN      Online TA
## 879       2     none      0        BB     PRT      Online TA
## 880       2     none      0        BB     PRT      Online TA
## 881       2 children      1        BB     PRT      Online TA
## 882       2     none      0        FB     FRA         Direct
## 883       2     none      0        BB     PRT         Direct
## 884       2     none      0        BB     RUS      Online TA
## 885       2     none      0        BB     IRL      Online TA
## 886       2     none      0        HB     PRT      Online TA
## 887       2     none      0        BB     ROU  Offline TA/TO
## 888       2     none      0        HB     ESP      Online TA
## 889       2     none      0        BB     GBR         Direct
## 890       2     none      0        BB     PRT  Offline TA/TO
## 891       2     none      0        BB     GBR  Offline TA/TO
## 892       2     none      0        BB     PRT         Direct
## 893       2     none      0        BB     ESP      Online TA
## 894       2     none      0        BB     PRT      Online TA
## 895       1     none      0        BB     BRA      Online TA
## 896       2     none      0        BB     PRT      Online TA
## 897       2     none      0        HB     PRT      Online TA
## 898       2     none      0        HB     PRT         Direct
## 899       2     none      0        BB     PRT  Offline TA/TO
## 900       2     none      0        HB     PRT      Online TA
## 901       2     none      0        BB     PRT         Direct
## 902       3     none      0        BB     PRT         Direct
## 903       2     none      0        BB     PRT      Online TA
## 904       2     none      0        BB     PRT         Direct
## 905       2 children      1        BB     PRT      Online TA
## 906       2     none      0        BB     PRT      Online TA
## 907       2     none      0        HB     NLD      Online TA
## 908       2     none      0        BB     GBR      Online TA
## 909       2     none      0        BB     GBR  Offline TA/TO
## 910       2     none      0        BB     GBR      Online TA
## 911       2     none      0        BB     IRL         Direct
## 912       2     none      0        BB     ROU      Online TA
## 913       2     none      0        BB     ROU      Online TA
## 914       2     none      0        HB     PRT      Online TA
## 915       2     none      0        BB     FRA      Online TA
## 916       2     none      0        BB     SWE      Online TA
## 917       3     none      0        BB     PRT         Direct
## 918       2     none      0        HB     ITA      Online TA
## 919       1     none      0        BB     BEL      Online TA
## 920       2     none      0        BB     ESP      Online TA
## 921       2     none      0        BB     FRA      Online TA
## 922       2     none      0        BB     SVN      Online TA
## 923       2     none      0        BB     ESP      Online TA
## 924       2 children      1        BB     ESP      Online TA
## 925       2 children      0        HB     PRT         Direct
## 926       2     none      0        BB     PRT  Offline TA/TO
## 927       2     none      0        HB     PRT  Offline TA/TO
## 928       2     none      0        BB     NLD      Online TA
## 929       2     none      0        BB     IRL  Offline TA/TO
## 930       2     none      0        BB     IRL      Online TA
## 931       2     none      0        HB     PRT      Online TA
## 932       2     none      0        HB     ESP         Direct
## 933       2 children      0        HB     PRT         Direct
## 934       2 children      0        BB     PRT         Direct
## 935       2     none      0        HB     PRT      Online TA
## 936       2     none      0        BB     PRT      Online TA
## 937       2     none      0        FB     PRT         Direct
## 938       2     none      0        HB     PRT         Direct
## 939       2     none      0        BB     PRT         Direct
## 940       2     none      0        HB     PRT         Direct
## 941       1     none      0        BB     PRT         Direct
## 942       2     none      0        BB     ESP  Offline TA/TO
## 943       1     none      0        BB     GBR      Online TA
## 944       2     none      0        BB     GBR      Online TA
## 945       2 children      0        BB     ESP      Online TA
## 946       2     none      0        BB     ESP      Online TA
## 947       2     none      0        HB     PRT  Offline TA/TO
## 948       2     none      0        BB     UKR      Online TA
## 949       2     none      0        BB     GBR  Offline TA/TO
## 950       1     none      0        BB     PRT      Corporate
## 951       2     none      0        BB     USA      Online TA
## 952       2     none      0        BB     GBR      Online TA
## 953       2     none      0        BB     GBR      Online TA
## 954       3     none      0        HB     PRT         Direct
## 955       2     none      0        BB     ESP      Online TA
## 956       2     none      0        BB     PRT  Offline TA/TO
## 957       2     none      0        BB     ITA      Corporate
## 958       2     none      0        BB     SMR      Corporate
## 959       2     none      0        BB     ESP  Offline TA/TO
## 960       2     none      0        BB     ITA      Corporate
## 961       2 children      0        HB     PRT         Direct
## 962       1     none      0        BB     ITA      Corporate
## 963       2     none      0        BB     ITA      Corporate
## 964       2     none      0        BB     PRT      Corporate
## 965       2     none      0        BB     FRA      Corporate
## 966       2     none      0        BB     PRT  Offline TA/TO
## 967       2     none      0        HB     PRT      Online TA
## 968       2     none      0        BB     ESP  Offline TA/TO
## 969       2 children      0        BB     PRT  Offline TA/TO
## 970       2     none      0        BB     IRL         Direct
## 971       2     none      0        BB     PRT         Direct
## 972       2     none      0        BB     ESP      Online TA
## 973       2 children      0        HB     PRT         Direct
## 974       2     none      0        BB     GBR  Offline TA/TO
## 975       2     none      0        BB     IRL  Offline TA/TO
## 976       2     none      0        BB     GBR  Offline TA/TO
## 977       2     none      0        BB     ESP      Online TA
## 978       2     none      0        BB     GBR  Offline TA/TO
## 979       2     none      0        BB     ITA      Corporate
## 980       2     none      0        BB     FRA      Online TA
## 981       2     none      0        BB     ESP         Direct
## 982       3     none      0        BB     IRL         Groups
## 983       2     none      0        HB     ESP      Online TA
## 984       2     none      0        BB     ESP      Online TA
## 985       2     none      0        BB     PRT      Online TA
## 986       1     none      0        BB     PRT  Offline TA/TO
## 987       2     none      0        BB     DEU  Offline TA/TO
## 988       2     none      0        BB     ESP      Online TA
## 989       3     none      0        BB     PRT         Direct
## 990       2     none      0        HB     PRT      Online TA
## 991       2     none      0        BB     ESP      Online TA
## 992       2     none      0        BB     CHE      Online TA
## 993       2 children      0        BB     GBR      Online TA
## 994       2     none      0        HB     ESP  Offline TA/TO
## 995       2     none      0        HB     CHE         Direct
## 996       2     none      0        BB     PRT      Online TA
## 997       2     none      0        BB     GBR  Offline TA/TO
## 998       2     none      0        BB     PRT      Online TA
## 999       2     none      0        FB     PRT         Direct
## 1000      2     none      0        FB     PRT         Direct
## 1001      2     none      0        BB     GBR         Direct
## 1002      2     none      0        BB     USA      Online TA
## 1003      2     none      0        BB     PRT      Online TA
## 1004      2     none      0        BB      CN         Direct
## 1005      2     none      0        HB     GBR  Offline TA/TO
## 1006      2     none      0        BB     GBR  Offline TA/TO
## 1007      2     none      0        FB     ESP  Offline TA/TO
## 1008      2     none      0        BB     GBR         Direct
## 1009      2     none      0        BB     SWE  Offline TA/TO
## 1010      2     none      0        BB     DEU      Online TA
## 1011      2     none      0        BB     GBR  Offline TA/TO
## 1012      1 children      0        BB     PRT      Online TA
## 1013      2     none      0        HB     PRT         Direct
## 1014      2     none      0        BB     PRT      Online TA
## 1015      2     none      0        BB     ESP      Online TA
## 1016      2     none      0        BB     ESP      Online TA
## 1017      2     none      0        BB     ESP         Direct
## 1018      2     none      0        BB     PRT         Direct
## 1019      3     none      0        BB     ESP      Online TA
## 1020      2     none      0        BB     GBR  Offline TA/TO
## 1021      2     none      0        BB     IRL      Online TA
## 1022      2     none      0        HB     GBR  Offline TA/TO
## 1023      3     none      0        HB     PRT         Direct
## 1024      2     none      0        BB     PRT  Offline TA/TO
## 1025      2 children      1        BB     PRT      Online TA
## 1026      2     none      0        HB     PRT         Direct
## 1027      2     none      0        HB     GBR  Offline TA/TO
## 1028      2     none      0        BB     IRL  Offline TA/TO
## 1029      2     none      0        BB     GBR  Offline TA/TO
## 1030      2     none      0        HB     DEU  Offline TA/TO
## 1031      2 children      0        BB     IRL      Online TA
## 1032      2     none      0        BB     GBR      Online TA
## 1033      2     none      0        BB     ESP  Offline TA/TO
## 1034      2     none      0        HB     PRT      Online TA
## 1035      2     none      0        HB     PRT         Direct
## 1036      2     none      0        BB     PRT         Direct
## 1037      2 children      1        HB     PRT      Online TA
## 1038      2     none      0        BB     IRL      Online TA
## 1039      2     none      0        SC     ESP      Online TA
## 1040      2     none      0        HB     GBR  Offline TA/TO
## 1041      2     none      0        BB     PRT         Direct
## 1042      2     none      0        BB     PRT         Direct
## 1043      2     none      0        HB     GBR  Offline TA/TO
## 1044      2     none      0        HB     GBR  Offline TA/TO
## 1045      2     none      0        HB     GBR  Offline TA/TO
## 1046      2     none      0        BB     GBR      Online TA
## 1047      2     none      0        BB     PRT         Direct
## 1048      2     none      0        BB     GBR  Offline TA/TO
## 1049      2     none      0        BB     ESP         Direct
## 1050      1     none      0        BB     PRT      Corporate
## 1051      2     none      0        BB     CHE  Offline TA/TO
## 1052      2     none      0        BB     ESP      Online TA
## 1053      2     none      0        BB     PRT      Online TA
## 1054      1     none      0        BB     PRT      Corporate
## 1055      1     none      0        BB     PRT      Online TA
## 1056      1     none      0        BB     LVA      Online TA
## 1057      1     none      0        BB     LVA      Online TA
## 1058      2     none      0        BB     GBR  Offline TA/TO
## 1059      2     none      0        HB     DEU  Offline TA/TO
## 1060      1     none      0        BB     RUS      Online TA
## 1061      2     none      0        HB     GBR      Online TA
## 1062      2     none      0        BB     BEL      Online TA
## 1063      2     none      0        BB     GBR  Offline TA/TO
## 1064      2     none      0        BB     PRT      Online TA
## 1065      2     none      0        BB     RUS      Online TA
## 1066      2     none      0        HB     GBR      Online TA
## 1067      2     none      0        BB     IRL      Online TA
## 1068      2     none      0        BB     GBR      Online TA
## 1069      1     none      0        BB     PRT  Complementary
## 1070      3     none      0        BB     PRT      Online TA
## 1071      2 children      1        BB     PRI      Online TA
## 1072      2 children      0        HB     SRB  Offline TA/TO
## 1073      2     none      0        HB     DEU  Offline TA/TO
## 1074      2     none      0        HB     GBR  Offline TA/TO
## 1075      2     none      0        BB     GBR  Offline TA/TO
## 1076      2     none      0        BB     GBR  Offline TA/TO
## 1077      2     none      0        HB     GBR  Offline TA/TO
## 1078      2     none      0        BB     FRA      Online TA
## 1079      2     none      0        BB     GBR  Offline TA/TO
## 1080      2     none      0        BB     IRL  Offline TA/TO
## 1081      1     none      0        BB     SWE      Online TA
## 1082      2     none      0        BB     FRA         Direct
## 1083      2     none      0        BB     DEU  Offline TA/TO
## 1084      2     none      0        BB     ESP  Offline TA/TO
## 1085      2     none      0        BB     POL      Online TA
## 1086      1     none      0        BB     GBR      Corporate
## 1087      2     none      0        BB     PRT         Direct
## 1088      2     none      0        BB     ESP      Online TA
## 1089      2     none      0        BB     FRA      Online TA
## 1090      2     none      0        BB     PRT         Direct
## 1091      3     none      0        BB     GBR      Online TA
## 1092      2 children      0        BB     BRA      Online TA
## 1093      2     none      0        BB     PRT      Online TA
## 1094      2     none      0        BB     FRA      Online TA
## 1095      2     none      0        BB     GBR  Offline TA/TO
## 1096      2     none      0        BB     GBR      Online TA
## 1097      2     none      0        BB     GBR  Offline TA/TO
## 1098      2     none      0        BB     ESP      Online TA
## 1099      2     none      0        BB     BRA      Online TA
## 1100      1     none      0        HB     DEU  Offline TA/TO
## 1101      2     none      0        BB     PRT      Online TA
## 1102      2     none      0        BB     GBR      Online TA
## 1103      2     none      0        BB     IRL         Direct
## 1104      2     none      0        HB     SWE  Offline TA/TO
## 1105      2     none      0        BB     DEU  Offline TA/TO
## 1106      2     none      0        BB     IRL         Direct
## 1107      2     none      0        HB     DEU      Online TA
## 1108      2     none      0        BB     ESP      Online TA
## 1109      2     none      0        BB     PRT         Direct
## 1110      2     none      0        BB     PRT         Direct
## 1111      2     none      0        BB     GBR  Offline TA/TO
## 1112      2     none      0        BB     GBR  Offline TA/TO
## 1113      2     none      0        BB     IRL  Offline TA/TO
## 1114      2     none      0        BB     IRL  Offline TA/TO
## 1115      2 children      1        BB     PRT         Direct
## 1116      2     none      0        BB     GBR  Offline TA/TO
## 1117      2     none      0        BB     GBR  Offline TA/TO
## 1118      1     none      0        BB     NLD      Online TA
## 1119      2     none      0        BB     GBR      Online TA
## 1120      2     none      0        BB     PRT  Offline TA/TO
## 1121      2     none      0        HB     PRT      Online TA
## 1122      2     none      0        HB     PRT  Offline TA/TO
## 1123      2     none      0        HB     PRT      Online TA
## 1124      2     none      0        BB     GBR      Online TA
## 1125      2     none      0        BB     GBR         Direct
## 1126      2     none      0        BB     IRL      Online TA
## 1127      2     none      0        HB     NLD      Online TA
## 1128      2     none      0        HB     GBR  Offline TA/TO
## 1129      2 children      0        BB     IND      Online TA
## 1130      2     none      0        BB     PRT         Direct
## 1131      2     none      0        BB     IRL      Online TA
## 1132      2     none      0        BB     POL      Online TA
## 1133      2     none      0        BB     GBR  Offline TA/TO
## 1134      2     none      0        BB     PRT  Offline TA/TO
## 1135      2     none      0        BB     GBR  Offline TA/TO
## 1136      2     none      0        BB     FRA      Online TA
## 1137      2     none      0        BB     NLD      Online TA
## 1138      2     none      0        BB     BEL      Online TA
## 1139      2     none      0        BB     ESP         Direct
## 1140      2     none      0        BB     CHE  Offline TA/TO
## 1141      2     none      0        BB     PRT      Online TA
## 1142      1     none      0        BB     PRT      Online TA
## 1143      1     none      0        BB     ESP      Online TA
## 1144      1     none      0        BB     PRT      Corporate
## 1145      2     none      0        BB     FRA      Online TA
## 1146      2     none      0        BB     ESP      Online TA
## 1147      2     none      0        HB     PRT         Direct
## 1148      2 children      0        BB     FRA      Online TA
## 1149      2     none      0        BB     ESP         Direct
## 1150      2     none      0        BB     PRT         Direct
## 1151      2     none      0        BB     CHL      Online TA
## 1152      2     none      0        BB     ESP      Online TA
## 1153      2     none      0        BB     RUS      Online TA
## 1154      2     none      0        HB     GBR  Offline TA/TO
## 1155      2     none      0        BB     IRL  Offline TA/TO
## 1156      2     none      0        BB     IRL  Offline TA/TO
## 1157      2     none      0        BB     ESP  Offline TA/TO
## 1158      2     none      0        BB     BRA      Online TA
## 1159      2     none      0        BB     PRT      Online TA
## 1160      2     none      0        BB     EST      Online TA
## 1161      2     none      0        BB     PRT         Direct
## 1162      1     none      0        BB     NLD         Direct
## 1163      1     none      0        BB     NLD         Direct
## 1164      1     none      0        BB     NLD         Direct
## 1165      1     none      0        BB     NLD         Direct
## 1166      1     none      0        BB     NLD         Direct
## 1167      2     none      0        BB     GBR      Online TA
## 1168      1     none      0        BB     NLD         Direct
## 1169      1     none      0        BB     NLD         Direct
## 1170      2     none      0        BB     GBR  Offline TA/TO
## 1171      2     none      0        BB     GBR  Offline TA/TO
## 1172      2     none      0        BB     CHN      Online TA
## 1173      2     none      0        BB     GBR         Direct
## 1174      2     none      0        BB     GBR  Offline TA/TO
## 1175      2     none      0        BB     GBR  Offline TA/TO
## 1176      2     none      0        BB     PRT         Direct
## 1177      2     none      0        BB     PRT         Direct
## 1178      2     none      0        BB     ESP      Online TA
## 1179      2     none      0        BB     CHE         Direct
## 1180      2     none      0        BB     GBR  Offline TA/TO
## 1181      2 children      1        HB     ESP  Offline TA/TO
## 1182      2     none      0        BB     NLD  Offline TA/TO
## 1183      2     none      0        HB     LVA  Offline TA/TO
## 1184      2     none      0        BB     GBR  Offline TA/TO
## 1185      1     none      0        HB     FRA  Offline TA/TO
## 1186      2     none      0        BB     PRT      Online TA
## 1187      2     none      0        BB     ITA         Direct
## 1188      2     none      0        BB     GBR      Online TA
## 1189      2     none      0        HB     PRT      Online TA
## 1190      2     none      0        BB     IRL  Offline TA/TO
## 1191      2     none      0        HB     GBR  Offline TA/TO
## 1192      2     none      0        BB     GBR      Online TA
## 1193      3     none      0        BB     GBR  Offline TA/TO
## 1194      2     none      0        HB     GBR      Online TA
## 1195      2     none      0        BB     GBR      Online TA
## 1196      2     none      0        BB     IRL  Offline TA/TO
## 1197      2     none      0        HB     GBR      Online TA
## 1198      2     none      0        BB     IRL  Offline TA/TO
## 1199      2     none      0        BB     IRL         Direct
## 1200      2     none      0        HB     ESP  Offline TA/TO
## 1201      2     none      0        BB     GBR  Offline TA/TO
## 1202      2     none      0        BB     IRL      Online TA
## 1203      2     none      0        BB     GBR  Offline TA/TO
## 1204      2     none      0        BB     GBR  Offline TA/TO
## 1205      2     none      0        HB     GBR  Offline TA/TO
## 1206      2     none      0        BB     GBR  Offline TA/TO
## 1207      2     none      0        BB     PRT      Online TA
## 1208      2     none      0        BB     PRT      Online TA
## 1209      2     none      0        HB     FRA         Groups
## 1210      2     none      0        BB     IRL      Online TA
## 1211      2     none      0        BB     NLD      Online TA
## 1212      2     none      0        BB     GBR  Offline TA/TO
## 1213      2     none      0        BB      CN  Offline TA/TO
## 1214      2     none      0        BB     GBR  Offline TA/TO
## 1215      2     none      0        BB     GBR      Online TA
## 1216      2     none      0        BB     FRA      Online TA
## 1217      2     none      0        HB     GBR  Offline TA/TO
## 1218      2     none      0        BB     GBR      Online TA
## 1219      2     none      0        HB     GBR      Online TA
## 1220      2     none      0        HB     GBR      Online TA
## 1221      2     none      0        BB     PRT  Offline TA/TO
## 1222      2     none      0        BB     NLD  Offline TA/TO
## 1223      2     none      0        BB     BRA      Online TA
## 1224      2     none      0        BB     IRL      Online TA
## 1225      2     none      0        BB     NLD         Direct
## 1226      2     none      0        BB     IRL      Online TA
## 1227      2     none      0        BB     IRL  Offline TA/TO
## 1228      2     none      0        BB     GBR      Online TA
## 1229      2     none      0        HB     DEU      Corporate
## 1230      2     none      0        BB     PRT      Corporate
## 1231      2     none      0        HB     DEU      Corporate
## 1232      2     none      0        BB     POL      Online TA
## 1233      2     none      0        BB     USA      Online TA
## 1234      2     none      0        BB     ITA  Offline TA/TO
## 1235      2     none      0        BB     IRL      Online TA
## 1236      3     none      0        BB     IRL         Direct
## 1237      2     none      0        BB     POL  Offline TA/TO
## 1238      2     none      0        BB     PRT      Online TA
## 1239      2     none      0        BB     GBR  Offline TA/TO
## 1240      2     none      0        BB     ESP      Online TA
## 1241      2     none      0        BB     FRA      Online TA
## 1242      2     none      0        HB     PRT  Offline TA/TO
## 1243      2     none      0        BB     ITA      Online TA
## 1244      2     none      0        BB     PRT      Online TA
## 1245      2     none      0        BB     GBR  Offline TA/TO
## 1246      2     none      0        BB     IRL      Online TA
## 1247      2     none      0        BB     GBR  Offline TA/TO
## 1248      2     none      0        BB     GBR  Offline TA/TO
## 1249      2     none      0        BB     PRT      Online TA
## 1250      1     none      0        SC     PRT         Direct
## 1251      2 children      0        BB     PRT      Online TA
## 1252      1     none      0        SC     PRT         Direct
## 1253      2     none      0        BB     ESP         Direct
## 1254      2     none      0        BB     ESP      Online TA
## 1255      2     none      0        HB     ESP      Online TA
## 1256      2     none      0        BB     PRT      Online TA
## 1257      2     none      0        HB     ESP      Online TA
## 1258      2     none      0        BB     IRL         Direct
## 1259      2     none      0        BB     IRL         Direct
## 1260      2     none      0        BB     GBR  Offline TA/TO
## 1261      2     none      0        BB     IRL      Online TA
## 1262      2     none      0        BB     GBR      Online TA
## 1263      2     none      0        BB     GBR      Online TA
## 1264      2     none      0        BB     PRT      Online TA
## 1265      2     none      0        BB     ESP      Online TA
## 1266      2     none      0        BB     GBR      Corporate
## 1267      2     none      0        BB     GBR         Direct
## 1268      2     none      0        BB     NLD      Online TA
## 1269      2     none      0        BB     IRL      Online TA
## 1270      2     none      0        BB     PRT         Direct
## 1271      2     none      0        BB      CN  Offline TA/TO
## 1272      2     none      0        BB     GBR      Online TA
## 1273      2     none      0        BB      CN      Online TA
## 1274      2     none      0        BB     DEU      Corporate
## 1275      2     none      0        BB     DEU  Offline TA/TO
## 1276      2     none      0        BB     GBR      Online TA
## 1277      2     none      0        BB     GBR  Offline TA/TO
## 1278      2     none      0        HB     GBR  Offline TA/TO
## 1279      2     none      0        BB     GBR  Offline TA/TO
## 1280      2     none      0        BB     GBR  Offline TA/TO
## 1281      2     none      0        HB     IRL  Offline TA/TO
## 1282      2     none      0        BB     GBR  Offline TA/TO
## 1283      2     none      0        HB     IRL      Online TA
## 1284      2     none      0        HB     IRL      Online TA
## 1285      2     none      0        BB     IRL      Online TA
## 1286      1     none      0        HB     GBR  Offline TA/TO
## 1287      1     none      0        BB     GBR      Online TA
## 1288      2     none      0        BB     FRA      Online TA
## 1289      1     none      0        BB     LVA      Online TA
## 1290      2     none      0        BB     GBR  Offline TA/TO
## 1291      2     none      0        HB     GBR  Offline TA/TO
## 1292      2     none      0        HB     POL      Online TA
## 1293      2     none      0        HB     AUT  Offline TA/TO
## 1294      2     none      0        BB     ESP      Online TA
## 1295      2     none      0        BB     POL  Offline TA/TO
## 1296      2     none      0        BB     IRL  Offline TA/TO
## 1297      2     none      0        BB     IRL  Offline TA/TO
## 1298      2     none      0        BB     GBR  Offline TA/TO
## 1299      2     none      0        BB     IRL  Offline TA/TO
## 1300      2     none      0        BB     GBR  Offline TA/TO
## 1301      2     none      0        BB     IRL      Online TA
## 1302      2     none      0        BB     IRL  Offline TA/TO
## 1303      2     none      0        HB     BLR      Online TA
## 1304      2     none      0        BB     PRT         Direct
## 1305      1 children      0        BB     PRT         Direct
## 1306      2     none      0        BB     DEU      Corporate
## 1307      2     none      0        BB     PRT      Corporate
## 1308      1     none      0        HB     FRA  Offline TA/TO
## 1309      1     none      0        HB     FRA  Offline TA/TO
## 1310      2     none      0        HB     FRA  Offline TA/TO
## 1311      2     none      0        BB     LTU      Online TA
## 1312      1     none      0        HB     FRA  Offline TA/TO
## 1313      1     none      0        HB     FRA  Offline TA/TO
## 1314      2     none      0        HB     FRA  Offline TA/TO
## 1315      2     none      0        HB     FRA  Offline TA/TO
## 1316      2     none      0        BB     PRT      Online TA
## 1317      2 children      1        HB     PRT      Online TA
## 1318      2     none      0        BB     FRA  Offline TA/TO
## 1319      2     none      0        HB     GBR  Offline TA/TO
## 1320      2     none      0        BB     IRL  Offline TA/TO
## 1321      2     none      0        BB     DEU  Offline TA/TO
## 1322      2     none      0        BB     ROU      Online TA
## 1323      2     none      0        BB     PRT  Offline TA/TO
## 1324      2     none      0        BB     GBR      Online TA
## 1325      1     none      0        BB     GBR  Offline TA/TO
## 1326      3     none      0        BB     LUX      Online TA
## 1327      2 children      0        HB     PRT         Direct
## 1328      2     none      0        BB     FRA      Online TA
## 1329      1     none      0        BB     NLD      Online TA
## 1330      1     none      0        BB     FRA      Online TA
## 1331      2     none      0        BB     FRA         Direct
## 1332      2     none      0        BB     FRA      Online TA
## 1333      2     none      0        BB     FRA         Direct
## 1334      2     none      0        BB     IRL  Offline TA/TO
## 1335      2     none      0        HB     BEL      Online TA
## 1336      1 children      0        BB     PRT         Direct
## 1337      2     none      0        HB     GBR  Offline TA/TO
## 1338      2     none      0        BB     ESP         Direct
## 1339      2     none      0        HB     GBR  Offline TA/TO
## 1340      2     none      0        HB     GBR  Offline TA/TO
## 1341      2     none      0        BB     GBR  Offline TA/TO
## 1342      2     none      0        BB     IRL      Online TA
## 1343      2     none      0        BB     GBR      Online TA
## 1344      2     none      0        HB     GBR  Offline TA/TO
## 1345      2     none      0        BB     IRL      Online TA
## 1346      2     none      0        BB     GBR  Offline TA/TO
## 1347      2     none      0        BB     ARG      Online TA
## 1348      2     none      0        BB     PRT      Online TA
## 1349      2     none      0        BB     ARG      Online TA
## 1350      2     none      0        BB     ESP         Direct
## 1351      2     none      0        BB     IRL      Online TA
## 1352      2     none      0        BB     IRL      Online TA
## 1353      2 children      0        BB     IRL      Online TA
## 1354      2     none      0        BB     LVA  Offline TA/TO
## 1355      1     none      0        HB     NLD  Offline TA/TO
## 1356      2     none      0        BB     IRL      Online TA
## 1357      2     none      0        BB     LVA  Offline TA/TO
## 1358      2     none      0        BB     NLD      Online TA
## 1359      2     none      0        BB     NLD  Offline TA/TO
## 1360      1     none      0        HB     GBR  Offline TA/TO
## 1361      2     none      0        HB     IRL  Offline TA/TO
## 1362      2     none      0        BB     NLD      Online TA
## 1363      2     none      0        BB     LUX      Online TA
## 1364      2     none      0        BB     NLD      Online TA
## 1365      1     none      0        BB     AUT         Direct
## 1366      1     none      0        BB     GBR      Online TA
## 1367      1     none      0        BB     DEU         Direct
## 1368      2     none      0        BB     PRT         Direct
## 1369      2     none      0        BB     PRT         Direct
## 1370      1     none      0        BB     GBR      Online TA
## 1371      1     none      0        BB     GBR      Online TA
## 1372      1     none      0        BB     GBR      Online TA
## 1373      2     none      0        HB     IRL  Offline TA/TO
## 1374      1     none      0        BB     OMN      Online TA
## 1375      1     none      0        BB     GBR      Online TA
## 1376      2     none      0        BB     IRL      Online TA
## 1377      2     none      0        BB     BEL      Online TA
## 1378      2     none      0        BB     ESP      Online TA
## 1379      2     none      0        HB     PRT      Online TA
## 1380      2     none      0        BB     DEU      Online TA
## 1381      2     none      0        BB     PRT  Offline TA/TO
## 1382      2     none      0        BB     GBR         Direct
## 1383      2     none      0        BB     GBR  Offline TA/TO
## 1384      2     none      0        BB     GBR      Online TA
## 1385      2     none      0        BB     IRL      Online TA
## 1386      2     none      0        BB     GBR      Online TA
## 1387      2     none      0        BB     GBR      Online TA
## 1388      2     none      0        BB     IRL         Direct
## 1389      2     none      0        BB     FRA         Direct
## 1390      2     none      0        HB     DEU      Corporate
## 1391      1     none      0        BB     PRT      Online TA
## 1392      2     none      0        BB     TUR      Online TA
## 1393      2     none      0        BB     TUR      Online TA
## 1394      2     none      0        BB     IRL  Offline TA/TO
## 1395      2     none      0        BB     GBR         Direct
## 1396      2     none      0        BB     IRL      Online TA
## 1397      2     none      0        HB     GBR  Offline TA/TO
## 1398      2     none      0        BB     IRL  Offline TA/TO
## 1399      2     none      0        BB     IRL  Offline TA/TO
## 1400      2     none      0        BB     PRT      Online TA
## 1401      2     none      0        BB     GBR      Online TA
## 1402      2     none      0        BB     IRL      Online TA
## 1403      2     none      0        BB     ESP      Online TA
## 1404      2     none      0        BB     BEL      Online TA
## 1405      2     none      0        HB     USA      Online TA
## 1406      2     none      0        BB     PRT         Direct
## 1407      2     none      0        BB     GBR  Offline TA/TO
## 1408      2 children      1        BB     PRT         Direct
## 1409      2     none      0        BB     PRT  Offline TA/TO
## 1410      2 children      1        BB     GBR      Online TA
## 1411      2     none      0        BB     CHE      Online TA
## 1412      2     none      0        HB     GBR  Offline TA/TO
## 1413      2     none      0        BB     PRT         Direct
## 1414      2     none      0        BB     MEX      Online TA
## 1415      2     none      0        BB     CHE         Direct
## 1416      2     none      0        BB     IRL      Online TA
## 1417      2     none      0        BB     PRT      Online TA
## 1418      2 children      0        BB     ZAF         Direct
## 1419      2     none      0        HB     POL      Online TA
## 1420      2     none      0        HB     POL      Online TA
## 1421      2     none      0        BB     GBR      Online TA
## 1422      1     none      0        BB     PRT         Direct
## 1423      2     none      0        BB     DEU      Online TA
## 1424      2     none      0        FB     PRT  Complementary
## 1425      1     none      0        BB     IRL         Direct
## 1426      3     none      0        BB     AGO  Complementary
## 1427      2     none      0        BB     PRT         Direct
## 1428      2     none      0        BB     PRT      Online TA
## 1429      2     none      0        BB     PRT  Offline TA/TO
## 1430      1     none      0        BB     NLD         Direct
## 1431      2     none      0        BB     BEL  Offline TA/TO
## 1432      2     none      0        BB     GBR  Offline TA/TO
## 1433      2     none      0        BB     GBR  Offline TA/TO
## 1434      2     none      0        BB     GBR  Offline TA/TO
## 1435      1     none      0        HB     PRT  Offline TA/TO
## 1436      1     none      0        HB     DEU  Offline TA/TO
## 1437      1     none      0        BB     ESP  Offline TA/TO
## 1438      2     none      0        BB     PRT      Online TA
## 1439      2     none      0        BB     PRT      Online TA
## 1440      2     none      0        BB     PRT         Direct
## 1441      2 children      0        BB     PRT      Corporate
## 1442      2     none      0        BB     ESP         Direct
## 1443      2     none      0        BB     PRT      Corporate
## 1444      2     none      0        BB     PRT         Direct
## 1445      2     none      0        BB     FRA      Online TA
## 1446      2     none      0        BB     PRT      Corporate
## 1447      2     none      0        BB     PRT         Direct
## 1448      1     none      0        BB     PRT         Direct
## 1449      2     none      0        BB     PRT      Corporate
## 1450      2     none      0        BB     PRT      Corporate
## 1451      2     none      0        BB     ESP         Direct
## 1452      2 children      0        BB     PRT         Direct
## 1453      2     none      0        BB     PRT      Corporate
## 1454      2     none      0        BB     PRT         Direct
## 1455      2     none      0        BB     PRT      Corporate
## 1456      2 children      0        BB     PRT         Direct
## 1457      2     none      0        BB     DEU      Online TA
## 1458      1     none      0        BB     IRL  Offline TA/TO
## 1459      2     none      0        BB     GBR      Online TA
## 1460      2     none      0        BB     IRL  Offline TA/TO
## 1461      2     none      0        BB     GBR  Offline TA/TO
## 1462      2     none      0        BB     IRL         Direct
## 1463      2     none      0        BB     GBR  Offline TA/TO
## 1464      1     none      0        BB     PRT      Online TA
## 1465      1     none      0        BB     PRT      Corporate
## 1466      2     none      0        BB     PRT         Direct
## 1467      2 children      1        BB     PRT         Direct
## 1468      1     none      0        BB     PRT         Direct
## 1469      2 children      0        BB     PRT      Corporate
## 1470      2     none      0        BB     IRL      Online TA
## 1471      2     none      0        BB     PRT         Direct
## 1472      2     none      0        BB     ESP      Online TA
## 1473      2     none      0        BB     ESP      Online TA
## 1474      2 children      0        BB     ESP      Online TA
## 1475      2 children      0        BB     PRT         Direct
## 1476      2 children      0        BB     PRT         Direct
## 1477      2     none      0        BB     ESP      Online TA
## 1478      2     none      0        HB     ESP  Offline TA/TO
## 1479      2 children      0        BB     ESP      Online TA
## 1480      2     none      0        BB     ESP         Direct
## 1481      2     none      0        BB     DEU      Online TA
## 1482      2     none      0        BB     ESP      Online TA
## 1483      2     none      0        HB     ESP  Offline TA/TO
## 1484      1     none      0        BB     IRL  Offline TA/TO
## 1485      2     none      0        BB     ESP  Offline TA/TO
## 1486      2     none      0        BB     PRT      Online TA
## 1487      2     none      0        BB     ISR         Direct
## 1488      2     none      0        BB     PRT      Online TA
## 1489      2     none      0        BB     ESP      Online TA
## 1490      2     none      0        BB     GBR      Online TA
## 1491      2     none      0        BB     ESP  Offline TA/TO
## 1492      2     none      0        HB     LTU  Offline TA/TO
## 1493      2     none      0        BB     PRT      Corporate
## 1494      2     none      0        BB     PRT      Corporate
## 1495      2     none      0        BB     ESP      Online TA
## 1496      2     none      0        BB     ESP      Online TA
## 1497      2     none      0        HB     ESP         Direct
## 1498      2     none      0        HB     ESP      Online TA
## 1499      2 children      0        BB     ESP      Online TA
## 1500      2     none      0        HB     ESP      Online TA
## 1501      2 children      0        BB     CHL      Online TA
## 1502      2     none      0        BB     GBR      Online TA
## 1503      2 children      0        BB     ESP      Online TA
## 1504      2     none      0        BB     ESP      Online TA
## 1505      2 children      0        BB     ESP         Direct
## 1506      2     none      0        HB     ESP         Direct
## 1507      2     none      0        HB     ESP      Online TA
## 1508      2     none      0        BB     ESP      Online TA
## 1509      2     none      0        BB     ESP      Online TA
## 1510      2     none      0        BB     ESP         Direct
## 1511      2     none      0        BB     GBR         Direct
## 1512      2     none      0        HB     BEL         Direct
## 1513      2     none      0        BB     ESP      Online TA
## 1514      2     none      0        BB     ESP      Online TA
## 1515      2     none      0        BB     ESP      Online TA
## 1516      2     none      0        BB     PRT  Offline TA/TO
## 1517      2     none      0        BB     ESP      Online TA
## 1518      2     none      0        BB     PRT         Direct
## 1519      2     none      0        BB     PRT      Online TA
## 1520      2     none      0        BB     PRT      Online TA
## 1521      1     none      0        BB     PRT  Offline TA/TO
## 1522      2     none      0        BB     ESP      Online TA
## 1523      2     none      0        BB     ESP      Online TA
## 1524      2     none      0        BB     GBR      Online TA
## 1525      2     none      0        BB     RUS      Online TA
## 1526      2     none      0        BB     GBR  Offline TA/TO
## 1527      1     none      0        BB     GBR      Online TA
## 1528      2     none      0        HB     PRT      Online TA
## 1529      1     none      0        SC     PRT      Corporate
## 1530      2     none      0        BB     PRT      Online TA
## 1531      2     none      0        BB     PRT      Corporate
## 1532      2     none      0        BB     PRT      Corporate
## 1533      2     none      0        BB     PRT      Corporate
## 1534      1     none      0        BB     PRT  Offline TA/TO
## 1535      2     none      0        BB     ESP      Online TA
## 1536      1     none      0        BB     PRT      Corporate
## 1537      2     none      0        BB     GBR      Online TA
## 1538      2     none      0        BB     FRA         Groups
## 1539      2 children      0        BB     GBR  Offline TA/TO
## 1540      1     none      0        BB     PRT      Online TA
## 1541      2     none      0        BB     GBR      Online TA
## 1542      1     none      0        BB     PRT         Direct
## 1543      2     none      0        BB     ESP      Online TA
## 1544      2     none      0        BB     PRT         Direct
## 1545      1     none      0        BB     PRT      Online TA
## 1546      2 children      0        BB     IRL      Online TA
## 1547      2     none      0        BB     GBR         Direct
## 1548      2     none      0        HB     FRA         Direct
## 1549      1     none      0        BB     PRT  Offline TA/TO
## 1550      1     none      0        BB     NLD      Online TA
## 1551      2     none      0        BB     PRT      Online TA
## 1552      1     none      0        BB     ESP  Offline TA/TO
## 1553      2     none      0        BB     ESP      Online TA
## 1554      1     none      0        BB     NLD      Online TA
## 1555      2     none      0        BB     GBR      Online TA
## 1556      2     none      0        BB     GBR         Groups
## 1557      1     none      0        BB     GBR         Groups
## 1558      2 children      0        BB     GBR         Direct
## 1559      2     none      0        BB     GBR  Offline TA/TO
## 1560      2     none      0        BB     PRT      Online TA
## 1561      2     none      0        BB     PRT      Online TA
## 1562      2     none      0        BB     PRT      Online TA
## 1563      2     none      0        BB     DEU         Direct
## 1564      2     none      0        BB     PRT         Groups
## 1565      1     none      0        HB     PRT  Complementary
## 1566      2     none      0        BB     GBR         Groups
## 1567      2     none      0        BB     USA      Online TA
## 1568      1     none      0        BB     GBR      Online TA
## 1569      2     none      0        BB     GBR      Online TA
## 1570      2     none      0        BB     PRT      Online TA
## 1571      2     none      0        BB     GBR  Offline TA/TO
## 1572      2     none      0        BB     PRT         Direct
## 1573      2     none      0        BB     GBR      Online TA
## 1574      2     none      0        BB     PRT      Online TA
## 1575      2     none      0        HB     GBR         Direct
## 1576      2     none      0        BB     GBR  Offline TA/TO
## 1577      2 children      0        BB     GBR      Online TA
## 1578      2 children      0        BB     GBR      Online TA
## 1579      2     none      0        BB     GBR  Offline TA/TO
## 1580      2     none      0        BB     GBR  Offline TA/TO
## 1581      2     none      0        BB     IRL      Online TA
## 1582      2     none      0        BB     IRL      Online TA
## 1583      1     none      0        BB     PRT      Corporate
## 1584      2     none      0        BB     ESP      Online TA
## 1585      2     none      0        BB     PRT  Offline TA/TO
## 1586      2     none      0        BB     PRT  Offline TA/TO
## 1587      2     none      0        BB     PRT         Direct
## 1588      1     none      0        BB     PRT  Offline TA/TO
## 1589      2     none      0        HB     ESP      Online TA
## 1590      2     none      0        BB     ESP      Online TA
## 1591      2     none      0        HB     ESP      Online TA
## 1592      2     none      0        BB     GBR      Online TA
## 1593      2     none      0        HB     ESP         Groups
## 1594      2     none      0        HB     ESP         Groups
## 1595      2     none      0        HB     ESP         Groups
## 1596      1     none      0        HB     ESP         Groups
## 1597      2     none      0        HB     ESP         Groups
## 1598      2     none      0        HB     ESP         Groups
## 1599      2     none      0        HB     ESP         Groups
## 1600      2     none      0        HB     ESP         Groups
## 1601      2     none      0        HB     ESP         Groups
## 1602      2     none      0        HB     ESP         Groups
## 1603      2     none      0        HB     ESP         Groups
## 1604      2     none      0        HB     ESP         Groups
## 1605      2     none      0        HB     ESP         Groups
## 1606      2     none      0        HB     ESP         Groups
## 1607      2     none      0        HB     ESP         Groups
## 1608      2     none      0        HB     ESP         Groups
## 1609      2     none      0        HB     ESP         Groups
## 1610      2     none      0        HB     ESP         Groups
## 1611      2     none      0        BB     IRL      Online TA
## 1612      2     none      0        HB     ESP         Groups
## 1613      2     none      0        HB     ESP         Groups
## 1614      2     none      0        HB     PRT         Groups
## 1615      1     none      0        HB     ESP         Groups
## 1616      2     none      0        HB     ESP         Groups
## 1617      2     none      0        HB     GBR  Offline TA/TO
## 1618      2     none      0        BB     GBR  Offline TA/TO
## 1619      2     none      0        BB     ESP      Online TA
## 1620      2     none      0        HB     GBR  Offline TA/TO
## 1621      2     none      0        HB     GBR  Offline TA/TO
## 1622      2     none      0        BB     ESP         Direct
## 1623      2     none      0        BB     ESP         Direct
## 1624      2     none      0        BB     PRT         Direct
## 1625      2     none      0        BB     FRA         Direct
## 1626      1     none      0        BB     ESP      Online TA
## 1627      3     none      0        BB     GBR  Offline TA/TO
## 1628      3     none      0        BB     IRL  Offline TA/TO
## 1629      3     none      0        HB     GBR  Offline TA/TO
## 1630      2     none      0        BB     GBR  Offline TA/TO
## 1631      2     none      0        BB     GBR  Offline TA/TO
## 1632      1     none      0        BB     DEU      Online TA
## 1633      1     none      0        BB     PRT      Online TA
## 1634      1     none      0        BB     PRT      Online TA
## 1635      2     none      0        HB     FRA  Offline TA/TO
## 1636      2     none      0        HB     FRA  Offline TA/TO
## 1637      2     none      0        BB     PRT      Online TA
## 1638      2     none      0        BB     IND      Online TA
## 1639      2     none      0        BB     PRT      Online TA
## 1640      2     none      0        BB     GBR  Offline TA/TO
## 1641      2     none      0        BB     ESP      Online TA
## 1642      2     none      0        BB     LUX         Direct
## 1643      2     none      0        HB     FRA      Online TA
## 1644      2     none      0        BB     GBR      Online TA
## 1645      1     none      0        BB     FIN         Direct
## 1646      2     none      0        HB     GBR      Online TA
## 1647      2     none      0        BB     FRA      Online TA
## 1648      2     none      0        BB     CYM      Online TA
## 1649      2     none      0        BB     GBR      Online TA
## 1650      2     none      0        BB     GBR  Offline TA/TO
## 1651      2     none      0        BB     BEL      Online TA
## 1652      2     none      0        HB     GBR  Offline TA/TO
## 1653      2     none      0        BB     GBR  Offline TA/TO
## 1654      2     none      0        BB     GBR  Offline TA/TO
## 1655      2     none      0        BB     GBR  Offline TA/TO
## 1656      2     none      0        BB     GBR  Offline TA/TO
## 1657      2     none      0        BB     ESP      Online TA
## 1658      1     none      0        BB     GBR      Online TA
## 1659      2     none      0        BB     GBR      Online TA
## 1660      2     none      0        BB     ESP      Online TA
## 1661      1     none      0        BB     ESP      Online TA
## 1662      2     none      0        BB     ESP      Online TA
## 1663      2     none      0        BB     ESP      Online TA
## 1664      2     none      0        BB     FRA      Online TA
## 1665      1     none      0        BB     BEL      Online TA
## 1666      2     none      0        BB     GBR  Offline TA/TO
## 1667      2     none      0        BB     GBR  Offline TA/TO
## 1668      2     none      0        HB     GBR  Offline TA/TO
## 1669      2 children      0        BB     ESP      Online TA
## 1670      2     none      0        BB     BEL      Online TA
## 1671      2     none      0        BB     BEL      Online TA
## 1672      2     none      0        BB     BEL      Online TA
## 1673      2     none      0        BB     BEL      Online TA
## 1674      2     none      0        BB     PRT         Direct
## 1675      2     none      0        BB     PRT      Online TA
## 1676      2     none      0        BB     ESP      Online TA
## 1677      2     none      0        BB     PRT         Direct
## 1678      2     none      0        BB     PRT      Online TA
## 1679      2     none      0        BB     PRT         Direct
## 1680      2     none      0        BB     PRT         Direct
## 1681      1     none      0        BB     ESP  Complementary
## 1682      2     none      0        BB     ESP         Direct
## 1683      2     none      0        BB     PRT         Direct
## 1684      2     none      0        BB     PRT      Online TA
## 1685      2     none      0        BB     PRT         Direct
## 1686      2     none      0        BB     PRT         Direct
## 1687      2     none      0        BB     GBR      Online TA
## 1688      2     none      0        BB     IRL      Online TA
## 1689      2     none      0        BB     GBR      Online TA
## 1690      2     none      0        BB     GBR  Offline TA/TO
## 1691      2     none      0        BB     GBR  Offline TA/TO
## 1692      2     none      0        BB     IRL      Online TA
## 1693      2     none      0        HB     GBR         Direct
## 1694      2     none      0        BB     ESP      Online TA
## 1695      3     none      0        HB     GBR  Offline TA/TO
## 1696      2     none      0        BB     GBR  Offline TA/TO
## 1697      1     none      0        BB     FIN      Online TA
## 1698      2     none      0        BB     PRT      Online TA
## 1699      2     none      0        HB     ESP         Direct
## 1700      1     none      0        BB     GBR      Online TA
## 1701      2     none      0        BB     PRT         Direct
## 1702      2     none      0        BB     ESP      Online TA
## 1703      1     none      0        BB     PRT         Direct
## 1704      2     none      0        BB     GBR      Online TA
## 1705      2     none      0        BB     PRT      Online TA
## 1706      2     none      0        BB     GBR  Offline TA/TO
## 1707      2     none      0        BB     GBR  Offline TA/TO
## 1708      2     none      0        BB     IRL  Offline TA/TO
## 1709      2 children      0        BB     ZMB      Online TA
## 1710      2     none      0        BB     GBR  Offline TA/TO
## 1711      2     none      0        BB     IRL  Offline TA/TO
## 1712      2     none      0        BB     CHE      Online TA
## 1713      2     none      0        BB     PRT         Direct
## 1714      2     none      0        BB     PRT      Online TA
## 1715      2     none      0        BB     IRL  Offline TA/TO
## 1716      1 children      0        BB     GBR  Offline TA/TO
## 1717      2     none      0        HB     GBR  Offline TA/TO
## 1718      2     none      0        BB     DEU      Online TA
## 1719      2 children      0        BB     IRL      Online TA
## 1720      2     none      0        BB     PRT      Online TA
## 1721      2     none      0        BB     PRT      Online TA
## 1722      2     none      0        BB     IRL      Online TA
## 1723      1     none      0        BB     AUT      Corporate
## 1724      2     none      0        BB     PRT      Online TA
## 1725      1     none      0        BB     PRT         Direct
## 1726      2     none      0        BB     NLD         Direct
## 1727      2     none      0        BB     PRT      Online TA
## 1728      1     none      0        BB     PRT         Direct
## 1729      2     none      0        BB     AUT      Online TA
## 1730      2     none      0        HB     ESP  Offline TA/TO
## 1731      2     none      0        BB     AUS      Online TA
## 1732      2     none      0        BB     ESP      Online TA
## 1733      2     none      0        HB     ESP  Offline TA/TO
## 1734      1     none      0        BB     PRT      Online TA
## 1735      2     none      0        BB     IRL      Online TA
## 1736      2     none      0        BB     POL      Online TA
## 1737      2     none      0        HB     FIN      Online TA
## 1738      2 children      0        BB     PRT  Offline TA/TO
## 1739      2     none      0        BB     PRT         Direct
## 1740      1     none      0        BB     PRT      Corporate
## 1741      2     none      0        HB     PRT      Online TA
## 1742      1     none      0        BB     PRT      Corporate
## 1743      1     none      0        HB     CHE         Direct
## 1744      1     none      0        HB     FRA         Direct
## 1745      1     none      0        HB     CHE         Direct
## 1746      1     none      0        HB     CHE         Direct
## 1747      1     none      0        BB     DEU      Corporate
## 1748      1     none      0        BB     PRT         Direct
## 1749      2     none      0        BB     PRT         Direct
## 1750      1     none      0        BB     PRT      Online TA
## 1751      1     none      0        BB     USA      Online TA
## 1752      2     none      0        BB     PRT      Online TA
## 1753      2     none      0        BB     PRT      Online TA
## 1754      2     none      0        BB     PRT      Online TA
## 1755      2     none      0        BB     PRT         Groups
## 1756      2     none      0        BB     PRT      Online TA
## 1757      2     none      0        BB     PRT         Groups
## 1758      2     none      0        BB     PRT         Groups
## 1759      2     none      0        BB     PRT         Groups
## 1760      1     none      0        BB     PRT         Direct
## 1761      2     none      0        BB     ESP      Online TA
## 1762      2     none      0        BB     PRT         Direct
## 1763      2     none      0        BB     PRT         Direct
## 1764      2     none      0        BB     PRT         Groups
## 1765      2     none      0        BB     PRT         Groups
## 1766      2     none      0        BB     USA      Online TA
## 1767      2     none      0        BB     PRT         Groups
## 1768      2     none      0        BB     PRT         Groups
## 1769      2 children      1        BB     PRT      Online TA
## 1770      2     none      0        BB     ESP         Direct
## 1771      1     none      0        BB     PRT      Online TA
## 1772      2     none      0        BB     PRT         Groups
## 1773      2     none      0        BB     PRT         Direct
## 1774      2     none      0        BB     ESP      Online TA
## 1775      2     none      0        BB     ESP  Offline TA/TO
## 1776      2     none      0        BB     ESP  Offline TA/TO
## 1777      2     none      0        BB     PRT         Groups
## 1778      1     none      0        BB     PRT      Online TA
## 1779      2     none      0        BB      CN  Offline TA/TO
## 1780      2     none      0        BB     ESP  Offline TA/TO
## 1781      2     none      0        BB     CPV         Direct
## 1782      2     none      0        BB     BEL      Online TA
## 1783      2     none      0        BB     GBR      Online TA
## 1784      1     none      0        BB     PRT      Online TA
## 1785      2     none      0        BB     PRT      Online TA
## 1786      2     none      0        BB     PRT         Groups
## 1787      2     none      0        BB     CHE         Groups
## 1788      2     none      0        BB     PRT         Groups
## 1789      1     none      0        BB     PRT         Groups
## 1790      2     none      0        BB     PRT  Offline TA/TO
## 1791      2     none      0        BB     ESP         Direct
## 1792      2     none      0        BB     PRT         Groups
## 1793      2     none      0        BB     PRT      Online TA
## 1794      2 children      0        BB     PRT      Online TA
## 1795      2 children      0        BB     ESP         Direct
## 1796      2     none      0        BB     PRT         Groups
## 1797      2     none      0        BB     PRT         Groups
## 1798      2     none      0        BB     PRT         Groups
## 1799      2     none      0        BB     PRT  Offline TA/TO
## 1800      1     none      0        BB     PRT         Groups
## 1801      1     none      0        BB     PRT  Offline TA/TO
## 1802      2     none      0        BB     USA      Online TA
## 1803      1     none      0        BB     PRT         Groups
## 1804      2     none      0        BB     PRT  Offline TA/TO
## 1805      2     none      0        BB     PRT         Groups
## 1806      2     none      0        BB     PRT         Groups
## 1807      2     none      0        BB     PRT         Groups
## 1808      2     none      0        BB     PRT      Online TA
## 1809      2     none      0        BB     PRT         Groups
## 1810      1     none      0        BB     PRT         Groups
## 1811      2     none      0        BB     PRT         Groups
## 1812      2     none      0        HB     PRT         Direct
## 1813      3 children      0        BB     GBR      Online TA
## 1814      1     none      0        BB     PRT         Groups
## 1815      1     none      0        BB     PRT         Groups
## 1816      2     none      0        BB     ESP         Direct
## 1817      2     none      0        BB     PRT         Groups
## 1818      2     none      0        BB     FRA      Online TA
## 1819      2     none      0        BB     PRT      Online TA
## 1820      2     none      0        BB     GBR  Offline TA/TO
## 1821      2     none      0        BB     GBR  Offline TA/TO
## 1822      1     none      0        BB     PRT      Online TA
## 1823      2     none      0        HB     ESP  Offline TA/TO
## 1824      2     none      0        BB     ESP      Online TA
## 1825      2     none      0        HB     GBR  Offline TA/TO
## 1826      2     none      0        BB     GBR  Offline TA/TO
## 1827      2     none      0        HB     GBR  Offline TA/TO
## 1828      2     none      0        BB     IRL  Offline TA/TO
## 1829      2     none      0        BB     ESP      Online TA
## 1830      2     none      0        BB     DEU         Direct
## 1831      2     none      0        BB     GBR      Online TA
## 1832      2 children      1        BB     POL  Offline TA/TO
## 1833      2 children      1        BB     POL  Offline TA/TO
## 1834      2     none      0        BB     FIN      Online TA
## 1835      2     none      0        BB     PRT      Online TA
## 1836      1     none      0        BB     FRA      Corporate
## 1837      2     none      0        BB     FRA      Corporate
## 1838      1     none      0        BB     PRT      Online TA
## 1839      1     none      0        BB     PRT         Direct
## 1840      2     none      0        BB     PRT         Direct
## 1841      1     none      0        BB     PRT      Online TA
## 1842      2     none      0        BB     ESP      Corporate
## 1843      2     none      0        BB     PRT      Online TA
## 1844      2     none      0        BB     PRT  Offline TA/TO
## 1845      2 children      0        BB     BEL  Offline TA/TO
## 1846      1     none      0        BB     PRT      Corporate
## 1847      1     none      0        BB     BEL  Offline TA/TO
## 1848      3     none      0        BB     NLD  Offline TA/TO
## 1849      2     none      0        BB     ESP      Online TA
## 1850      1     none      0        BB     PRT      Corporate
## 1851      2     none      0        BB     ITA      Corporate
## 1852      2     none      0        BB     ITA      Corporate
## 1853      2     none      0        BB     ESP      Corporate
## 1854      1     none      0        BB     ITA      Corporate
## 1855      2     none      0        BB     ITA      Corporate
## 1856      1     none      0        BB     FRA      Corporate
## 1857      1     none      0        BB     FRA      Corporate
## 1858      1     none      0        BB     PRT      Corporate
## 1859      2     none      0        BB     PRT      Online TA
## 1860      1     none      0        BB     PRT      Online TA
## 1861      1     none      0        BB     PRT      Online TA
## 1862      1     none      0        BB     PRT      Corporate
## 1863      1     none      0        BB     PRT      Corporate
## 1864      1     none      0        BB     PRT      Corporate
## 1865      1     none      0        BB     PRT      Corporate
## 1866      2     none      0        HB     ESP      Online TA
## 1867      2     none      0        HB     ESP      Online TA
## 1868      1     none      0        BB     PRT      Corporate
## 1869      2     none      0        BB     GBR  Offline TA/TO
## 1870      2     none      0        BB     PRT      Corporate
## 1871      1     none      0        BB     USA      Online TA
## 1872      1     none      0        BB     PRT      Online TA
## 1873      1     none      0        HB     ESP      Online TA
## 1874      2 children      0        HB     PRT         Direct
## 1875      2     none      0        BB     ZWE  Offline TA/TO
## 1876      2     none      0        BB     ESP      Online TA
## 1877      2     none      0        BB     ESP      Online TA
## 1878      2 children      0        HB     GBR      Online TA
## 1879      2     none      0        BB     GBR  Offline TA/TO
## 1880      1     none      0        BB     FRA      Corporate
## 1881      1     none      0        BB     AUT      Corporate
## 1882      1     none      0        BB     AUT      Corporate
## 1883      1     none      0        BB     AUT      Corporate
## 1884      1     none      0        BB     AUT      Corporate
## 1885      1     none      0        BB     FRA      Corporate
## 1886      1     none      0        BB     AUT      Corporate
## 1887      2     none      0        BB     PRT      Online TA
## 1888      2     none      0        BB     PRT      Online TA
## 1889      2 children      1        BB     PRT  Offline TA/TO
## 1890      2     none      0        BB     ESP         Direct
## 1891      2     none      0        BB     PRT      Online TA
## 1892      2     none      0        HB     ESP      Online TA
## 1893      2     none      0        HB     ESP      Online TA
## 1894      1     none      0        BB     DZA  Offline TA/TO
## 1895      1     none      0        BB     DZA  Offline TA/TO
## 1896      2     none      0        BB     FIN  Offline TA/TO
## 1897      2     none      0        BB     IRL  Offline TA/TO
## 1898      1     none      0        BB     DEU      Corporate
## 1899      2     none      0        BB     RUS      Online TA
## 1900      1     none      0        BB     DEU      Corporate
## 1901      1     none      0        BB     BEL      Corporate
## 1902      1     none      0        BB     CZE      Corporate
## 1903      1     none      0        BB     GBR      Corporate
## 1904      1     none      0        BB     DEU      Corporate
## 1905      1     none      0        BB     DEU      Corporate
## 1906      1     none      0        BB     AUT      Corporate
## 1907      2     none      0        BB     GBR      Online TA
## 1908      2     none      0        HB     ESP      Online TA
## 1909      2     none      0        BB     ESP         Direct
## 1910      1     none      0        BB     GBR      Online TA
## 1911      2     none      0        BB     FRA      Corporate
## 1912      2     none      0        BB     PRT      Corporate
## 1913      1     none      0        BB     PRT      Corporate
## 1914      2     none      0        BB     FRA      Corporate
## 1915      2     none      0        BB     BRA      Online TA
## 1916      1     none      0        BB     PRT      Corporate
## 1917      2     none      0        BB     PRT      Corporate
## 1918      2     none      0        BB     PRT  Offline TA/TO
## 1919      1     none      0        BB     PRT      Online TA
## 1920      1     none      0        BB     PRT      Online TA
## 1921      1     none      0        BB     ESP         Direct
## 1922      3 children      0        BB     PRT      Online TA
## 1923      2     none      0        BB     PRT         Direct
## 1924      2     none      0        HB     ESP      Online TA
## 1925      1     none      0        BB     PRT      Corporate
## 1926      2     none      0        HB     ESP      Online TA
## 1927      2     none      0        BB     PRT  Offline TA/TO
## 1928      2     none      0        BB     PRT  Offline TA/TO
## 1929      2     none      0        BB     FRA      Online TA
## 1930      2     none      0        HB     FRA      Online TA
## 1931      2     none      0        HB     GBR  Offline TA/TO
## 1932      1     none      0        BB     PRT      Online TA
## 1933      2 children      0        BB     ESP         Direct
## 1934      2     none      0        BB     PRT         Direct
## 1935      1     none      0        BB     PRT  Offline TA/TO
## 1936      1     none      0        BB     ESP      Corporate
## 1937      1     none      0        BB     GBR      Online TA
## 1938      1     none      0        BB     DEU      Online TA
## 1939      2     none      0        BB     CHE      Online TA
## 1940      1     none      0        BB     GBR      Online TA
## 1941      1     none      0        BB     GBR      Online TA
## 1942      2     none      0        BB     PRT      Corporate
## 1943      1     none      0        BB     PRT      Corporate
## 1944      1     none      0        BB     GBR      Online TA
## 1945      2     none      0        BB     ESP      Corporate
## 1946      1     none      0        BB     DEU      Online TA
## 1947      1     none      0        BB     GBR      Online TA
## 1948      1     none      0        BB     GBR      Online TA
## 1949      2     none      0        BB     DEU      Online TA
## 1950      2     none      0        BB     DEU      Online TA
## 1951      1     none      0        BB     DEU      Corporate
## 1952      2     none      0        BB     SWE      Online TA
## 1953      1     none      0        BB     PRT      Corporate
## 1954      2     none      0        BB     AUT      Corporate
## 1955      1     none      0        BB     FRA      Corporate
## 1956      2     none      0        BB     ITA      Online TA
## 1957      1     none      0        BB     FRA      Corporate
## 1958      1     none      0        BB     FRA      Corporate
## 1959      1     none      0        BB     FRA      Corporate
## 1960      1     none      0        BB     PRT      Corporate
## 1961      1     none      0        BB     FRA      Corporate
## 1962      2     none      0        BB     GBR      Online TA
## 1963      2     none      0        BB     RUS      Online TA
## 1964      1     none      0        BB     FRA      Corporate
## 1965      2 children      0        BB     RUS      Online TA
## 1966      2     none      0        BB     RUS      Online TA
## 1967      2     none      0        BB     NLD      Corporate
## 1968      1     none      0        BB     FRA      Corporate
## 1969      2     none      0        BB     CHE      Online TA
## 1970      1     none      0        BB     ESP      Corporate
## 1971      2     none      0        BB     PRT      Online TA
## 1972      1     none      0        BB     PRT      Online TA
## 1973      2     none      0        BB     PRT         Direct
## 1974      2     none      0        BB     ITA      Online TA
## 1975      2     none      0        BB     PRT         Direct
## 1976      2     none      0        BB     PRT      Online TA
## 1977      1     none      0        BB     PRT         Direct
## 1978      2     none      0        BB     ITA      Corporate
## 1979      2     none      0        BB     GBR      Online TA
## 1980      2     none      0        BB     GBR      Online TA
## 1981      2     none      0        BB     GBR      Online TA
## 1982      2     none      0        HB     GBR  Offline TA/TO
## 1983      2     none      0        BB     PRT      Online TA
## 1984      2     none      0        BB     PRT      Online TA
## 1985      2 children      0        BB     PRT  Offline TA/TO
## 1986      2 children      1        BB     PRT  Offline TA/TO
## 1987      2     none      0        BB     FRA      Online TA
## 1988      2     none      0        BB     GBR  Offline TA/TO
## 1989      1     none      0        BB     PRT      Online TA
## 1990      1     none      0        BB     NOR      Online TA
## 1991      2     none      0 Undefined     ESP  Offline TA/TO
## 1992      2     none      0 Undefined     ESP  Offline TA/TO
## 1993      2     none      0 Undefined     ESP  Offline TA/TO
## 1994      2     none      0 Undefined     ESP  Offline TA/TO
## 1995      2     none      0 Undefined     ESP  Offline TA/TO
## 1996      2     none      0 Undefined     ESP  Offline TA/TO
## 1997      2     none      0 Undefined     ESP  Offline TA/TO
## 1998      1     none      0 Undefined     ESP  Offline TA/TO
## 1999      2     none      0 Undefined     ESP  Offline TA/TO
## 2000      2     none      0 Undefined     ESP  Offline TA/TO
## 2001      2     none      0 Undefined     ESP  Offline TA/TO
## 2002      2     none      0 Undefined     PRT  Offline TA/TO
## 2003      2     none      0 Undefined     ESP  Offline TA/TO
## 2004      1     none      0 Undefined     ESP  Offline TA/TO
## 2005      2     none      0 Undefined     ESP  Offline TA/TO
## 2006      2     none      0 Undefined     ESP  Offline TA/TO
## 2007      2     none      0 Undefined     ESP  Offline TA/TO
## 2008      2     none      0 Undefined     ESP  Offline TA/TO
## 2009      2     none      0 Undefined     ESP  Offline TA/TO
## 2010      2     none      0 Undefined     ESP  Offline TA/TO
## 2011      2     none      0 Undefined     ESP  Offline TA/TO
## 2012      2     none      0 Undefined     ESP  Offline TA/TO
## 2013      2     none      0 Undefined     ESP  Offline TA/TO
## 2014      2     none      0 Undefined     ESP  Offline TA/TO
## 2015      2     none      0 Undefined     ESP  Offline TA/TO
## 2016      2     none      0        BB     GBR      Online TA
## 2017      2 children      0        BB     POL      Online TA
## 2018      2     none      0        BB     DEU  Offline TA/TO
## 2019      2     none      0        HB     FRA      Online TA
## 2020      2 children      0        BB     FRA      Online TA
## 2021      2     none      0        HB     NLD         Direct
## 2022      2     none      0        HB     NLD         Direct
## 2023      2     none      0        FB     ESP         Groups
## 2024      2     none      0        FB     ESP         Groups
## 2025      2     none      0        FB     ESP         Groups
## 2026      2     none      0        FB     ESP         Groups
## 2027      2     none      0        FB     ESP         Groups
## 2028      1     none      0        FB     ESP         Groups
## 2029      2     none      0        BB     BRA      Online TA
## 2030      2     none      0        FB     ESP         Groups
## 2031      2     none      0        FB     ESP         Groups
## 2032      2     none      0        FB     ESP         Groups
## 2033      2     none      0        BB     PRT         Direct
## 2034      2     none      0        FB     ESP         Groups
## 2035      2     none      0        FB     ESP         Groups
## 2036      2     none      0        FB     ESP         Groups
## 2037      2     none      0        FB     ESP         Groups
## 2038      1     none      0        FB     ESP         Groups
## 2039      2     none      0        BB     PRT      Corporate
## 2040      2     none      0        BB     PRT      Corporate
## 2041      2 children      1        BB     PRT      Corporate
## 2042      2     none      0        BB     PRT      Corporate
## 2043      2     none      0        BB     PRT      Corporate
## 2044      2     none      0        BB     PRT      Corporate
## 2045      2     none      0        BB     PRT      Corporate
## 2046      2     none      0        BB     PRT      Corporate
## 2047      2     none      0        BB     PRT      Corporate
## 2048      2     none      0        BB     PRT      Corporate
## 2049      2 children      0        BB     PRT      Corporate
## 2050      2     none      0        BB     PRT      Corporate
## 2051      2     none      0        BB     PRT      Corporate
## 2052      2 children      0        BB     PRT      Corporate
## 2053      2     none      0        BB     PRT      Corporate
## 2054      2     none      0        BB     PRT      Corporate
## 2055      2     none      0        BB     PRT      Corporate
## 2056      2     none      0        BB     PRT      Corporate
## 2057      2     none      0        BB     PRT      Corporate
## 2058      2     none      0        BB     PRT      Corporate
## 2059      2     none      0        BB     PRT      Corporate
## 2060      2     none      0        BB     PRT      Corporate
## 2061      2 children      1        HB     PRT      Online TA
## 2062      2 children      0        BB     PRT      Corporate
## 2063      2     none      0        HB     GBR      Online TA
## 2064      2     none      0        HB     PRT      Online TA
## 2065      2     none      0        BB     PRT      Corporate
## 2066      2     none      0        BB     PRT      Corporate
## 2067      2     none      0        BB     PRT      Corporate
## 2068      2     none      0        BB     PRT      Corporate
## 2069      2 children      1        BB     PRT      Corporate
## 2070      2     none      0        BB     PRT      Corporate
## 2071      2     none      0        BB     PRT      Corporate
## 2072      2     none      0        BB     PRT      Corporate
## 2073      2 children      0        BB     PRT      Corporate
## 2074      2     none      0        BB     PRT      Corporate
## 2075      2     none      0        BB     PRT      Corporate
## 2076      2     none      0        BB     PRT      Corporate
## 2077      2     none      0        HB     PRT      Online TA
## 2078      2 children      0        BB     PRT      Corporate
## 2079      2 children      1        BB     PRT      Corporate
## 2080      2     none      0        BB     PRT      Corporate
## 2081      3     none      0        HB     PRT         Direct
## 2082      2     none      0        BB     PRT      Corporate
## 2083      2     none      0        BB     PRT      Corporate
## 2084      2     none      0        BB     PRT      Corporate
## 2085      2 children      0        BB     PRT      Corporate
## 2086      2     none      0        BB     FRA  Offline TA/TO
## 2087      2     none      0        BB     PRT      Online TA
## 2088      2     none      0        BB     PRT      Online TA
## 2089      2     none      0        BB     FRA      Online TA
## 2090      2     none      0        BB     ESP  Offline TA/TO
## 2091      2     none      0        BB     ESP      Online TA
## 2092      2     none      0        HB     ESP  Offline TA/TO
## 2093      2     none      0        BB     ESP      Online TA
## 2094      2     none      0        BB     POL      Online TA
## 2095      1     none      0        BB     NLD      Online TA
## 2096      1     none      0        BB     NLD      Online TA
## 2097      1     none      0        BB     NLD      Online TA
## 2098      1     none      0        BB     NLD      Online TA
## 2099      1     none      0        BB     NLD      Online TA
## 2100      1     none      0        BB     NLD      Online TA
## 2101      2     none      0        BB     GBR  Offline TA/TO
## 2102      2     none      0        BB     IRL      Online TA
## 2103      1     none      0        BB     NLD      Online TA
## 2104      2     none      0        BB     GBR  Offline TA/TO
## 2105      2     none      0        BB     PRT  Offline TA/TO
## 2106      2     none      0        BB     PRT  Complementary
## 2107      2     none      0        BB     PRT      Online TA
## 2108      3     none      0        FB     ESP  Offline TA/TO
## 2109      2     none      0        BB     PRT  Offline TA/TO
## 2110      2     none      0        HB     BEL         Direct
## 2111      1     none      0        BB     PRT      Online TA
## 2112      2     none      0        BB     PRT      Online TA
## 2113      2     none      0        BB     BEL      Online TA
## 2114      2     none      0        BB     PRT      Online TA
## 2115      2     none      0        BB     GBR      Online TA
## 2116      2     none      0        BB     GBR      Online TA
## 2117      2     none      0        BB     GBR      Online TA
## 2118      2     none      0        BB     PRT      Online TA
## 2119      2     none      0        HB     GBR  Offline TA/TO
## 2120      2     none      0        BB     CZE      Online TA
## 2121      2     none      0        BB     GBR      Online TA
## 2122      2     none      0        BB     GBR  Offline TA/TO
## 2123      2     none      0        HB     GBR         Direct
## 2124      2     none      0        HB     GBR  Offline TA/TO
## 2125      2     none      0        BB     NLD  Offline TA/TO
## 2126      2     none      0        BB     PRT         Direct
## 2127      2     none      0        BB     ESP      Online TA
## 2128      2     none      0        HB     ESP  Offline TA/TO
## 2129      2     none      0        BB     ESP      Online TA
## 2130      2     none      0        BB     GBR  Offline TA/TO
## 2131      2     none      0        BB     PRT         Groups
## 2132      2     none      0        FB     ESP         Groups
## 2133      2     none      0        FB     ESP         Groups
## 2134      2     none      0        FB     ESP         Groups
## 2135      2     none      0        FB     ESP         Groups
## 2136      2     none      0        FB     ESP         Groups
## 2137      2     none      0        BB     ESP  Offline TA/TO
## 2138      2     none      0        FB     ESP         Groups
## 2139      2     none      0        FB     ESP         Groups
## 2140      3     none      0        FB     ESP         Groups
## 2141      1     none      0        FB     PRT         Groups
## 2142      2     none      0        FB     ESP         Groups
## 2143      2     none      0        FB     ESP         Groups
## 2144      1     none      0        FB     ESP         Groups
## 2145      2     none      0        FB     ESP         Groups
## 2146      2     none      0        FB     ESP         Groups
## 2147      2     none      0        FB     ESP         Groups
## 2148      1     none      0        FB     PRT         Groups
## 2149      1     none      0        HB     ESP      Online TA
## 2150      2     none      0        HB     ESP      Online TA
## 2151      2     none      0        HB     ESP      Online TA
## 2152      2     none      0 Undefined     ESP         Groups
## 2153      2     none      0 Undefined     ESP         Groups
## 2154      2     none      0 Undefined     ESP         Groups
## 2155      2     none      0 Undefined     ESP         Groups
## 2156      2     none      0        HB     ESP      Online TA
## 2157      2     none      0 Undefined     ESP         Groups
## 2158      2     none      0 Undefined     ESP         Groups
## 2159      3     none      0        BB     ESP  Offline TA/TO
## 2160      2     none      0        HB     ESP      Online TA
## 2161      2     none      0        HB     ESP      Online TA
## 2162      2     none      0 Undefined     PRT         Groups
## 2163      2     none      0 Undefined     ESP         Groups
## 2164      2     none      0        HB     ESP         Direct
## 2165      2     none      0 Undefined     ESP         Groups
## 2166      2     none      0 Undefined     ESP         Groups
## 2167      2     none      0 Undefined     ESP         Groups
## 2168      3     none      0 Undefined     ESP         Groups
## 2169      2     none      0        HB     ESP  Offline TA/TO
## 2170      2     none      0        BB     GBR      Online TA
## 2171      2     none      0        BB     POL  Offline TA/TO
## 2172      2     none      0        BB     GBR      Online TA
## 2173      2     none      0        HB     PRT      Online TA
## 2174      2     none      0        BB     ZAF      Online TA
## 2175      2     none      0        BB     GBR  Offline TA/TO
## 2176      2     none      0        BB     GBR  Offline TA/TO
## 2177      2     none      0        BB     GBR  Offline TA/TO
## 2178      2     none      0        HB     GBR  Offline TA/TO
## 2179      2     none      0        BB     GBR  Offline TA/TO
## 2180      2     none      0        BB     GBR  Offline TA/TO
## 2181      2     none      0        BB     GBR      Online TA
## 2182      2     none      0        BB     IRL      Online TA
## 2183      2     none      0        HB     GBR  Offline TA/TO
## 2184      2     none      0        BB     GBR      Online TA
## 2185      1     none      0        BB     GBR  Offline TA/TO
## 2186      2     none      0        BB     GBR      Online TA
## 2187      2     none      0        BB     PRT      Online TA
## 2188      1     none      0        BB     ESP  Offline TA/TO
## 2189      2     none      0        BB     PRT  Offline TA/TO
## 2190      2     none      0        BB     GBR      Online TA
## 2191      2     none      0        BB     GBR  Offline TA/TO
## 2192      2     none      0        BB     DEU  Offline TA/TO
## 2193      2     none      0        BB     PRT      Online TA
## 2194      2     none      0        BB     PRT      Online TA
## 2195      2     none      0        BB     ITA  Offline TA/TO
## 2196      2     none      0        BB     FIN      Online TA
## 2197      2     none      0        BB     KOR      Online TA
## 2198      2     none      0        BB     GBR  Offline TA/TO
## 2199      2     none      0        BB     PRT      Online TA
## 2200      2     none      0        HB     GBR      Online TA
## 2201      2     none      0        HB     GBR  Offline TA/TO
## 2202      1     none      0        BB      CN      Online TA
## 2203      2     none      0        BB     PRT      Online TA
## 2204      3     none      0        BB     ESP  Offline TA/TO
## 2205      2     none      0        BB     GBR         Direct
## 2206      2     none      0        HB     IRL  Offline TA/TO
## 2207      1     none      0        BB     FRA      Online TA
## 2208      2     none      0        HB     IRL  Offline TA/TO
## 2209      2     none      0        HB     IRL  Offline TA/TO
## 2210      2     none      0        HB     PRT  Offline TA/TO
## 2211      2     none      0        BB     IRL  Offline TA/TO
## 2212      2     none      0        HB     IRL  Offline TA/TO
## 2213      2     none      0        HB     IRL  Offline TA/TO
## 2214      2     none      0        HB     IRL         Groups
## 2215      2     none      0        HB     IRL  Offline TA/TO
## 2216      1     none      0        HB     IRL  Offline TA/TO
## 2217      2     none      0        HB     AUS  Offline TA/TO
## 2218      2     none      0        HB     IRL  Offline TA/TO
## 2219      1     none      0        BB     PRT      Online TA
## 2220      2     none      0        HB     ITA      Online TA
## 2221      2     none      0        HB     PRT      Online TA
## 2222      2 children      0        HB     PRT      Online TA
## 2223      2     none      0        BB     BRA      Online TA
## 2224      1     none      0        BB     GBR      Online TA
## 2225      2     none      0        BB     IRL  Offline TA/TO
## 2226      2     none      0        HB     FRA  Offline TA/TO
## 2227      1     none      0        BB     IRL      Online TA
## 2228      2     none      0        BB     FRA  Offline TA/TO
## 2229      2     none      0        BB     IRL      Online TA
## 2230      2     none      0        BB     PRT         Direct
## 2231      1     none      0        BB     PRT         Direct
## 2232      3     none      0        BB     PRT         Direct
## 2233      2     none      0        BB     PRT      Online TA
## 2234      2     none      0        BB     PRT         Direct
## 2235      2 children      1        BB     GBR         Direct
## 2236      2     none      0        BB     PRT         Direct
## 2237      3     none      0        BB     GBR         Direct
## 2238      2     none      0        HB     ESP  Offline TA/TO
## 2239      2     none      0        BB     GBR  Offline TA/TO
## 2240      2 children      0        BB     POL      Online TA
## 2241      2 children      0        BB     POL      Online TA
## 2242      2     none      0        BB     GBR  Offline TA/TO
## 2243      2     none      0        BB     POL      Online TA
## 2244      2     none      0        HB     GBR  Offline TA/TO
## 2245      2     none      0        BB     CHE      Online TA
## 2246      2     none      0        BB     PRT      Online TA
## 2247      2     none      0        BB     LTU      Online TA
## 2248      2     none      0        BB     ESP  Offline TA/TO
## 2249      1     none      0        BB     ESP  Offline TA/TO
## 2250      2     none      0        BB     ESP  Offline TA/TO
## 2251      2     none      0        BB     ESP  Offline TA/TO
## 2252      2 children      1        BB     PRT      Online TA
## 2253      2 children      0        BB     ESP      Online TA
## 2254      2     none      0        BB     GBR  Offline TA/TO
## 2255      2     none      0        BB     ESP      Online TA
## 2256      2     none      0        BB     CRI      Online TA
## 2257      2     none      0        BB     CRI      Online TA
## 2258      2     none      0        BB     FRA         Direct
## 2259      2     none      0        BB     GBR  Offline TA/TO
## 2260      2     none      0        BB     GBR  Offline TA/TO
## 2261      1 children      0        BB     GBR      Online TA
## 2262      2     none      0        HB     GBR  Offline TA/TO
## 2263      2     none      0        BB     PRT      Online TA
## 2264      2     none      0        BB     FRA      Online TA
## 2265      2     none      0        BB     PRT      Online TA
## 2266      2 children      0        HB     PRT         Direct
## 2267      2     none      0 Undefined     PRT         Groups
## 2268      2     none      0 Undefined     PRT         Groups
## 2269      2     none      0 Undefined     PRT         Groups
## 2270      2     none      0 Undefined     PRT         Groups
## 2271      2     none      0        BB     PRT      Online TA
## 2272      2     none      0 Undefined     PRT         Groups
## 2273      2     none      0 Undefined     PRT         Groups
## 2274      1     none      0        HB     PRT         Groups
## 2275      1     none      0        HB     PRT         Groups
## 2276      2     none      0 Undefined     PRT         Groups
## 2277      2     none      0 Undefined     PRT         Groups
## 2278      2     none      0 Undefined     PRT         Groups
## 2279      2     none      0 Undefined     PRT         Groups
## 2280      2     none      0 Undefined     PRT         Groups
## 2281      2     none      0 Undefined     PRT         Groups
## 2282      1     none      0 Undefined     PRT         Groups
## 2283      2     none      0 Undefined     PRT         Groups
## 2284      2     none      0 Undefined     PRT         Groups
## 2285      2     none      0 Undefined     PRT         Groups
## 2286      2     none      0 Undefined     PRT         Groups
## 2287      2     none      0 Undefined     PRT         Groups
## 2288      1     none      0 Undefined     PRT         Groups
## 2289      2     none      0 Undefined     PRT         Groups
## 2290      1     none      0        HB     PRT         Groups
## 2291      1     none      0        HB     PRT         Groups
## 2292      1     none      0        HB     PRT         Groups
## 2293      2     none      0 Undefined     PRT         Groups
## 2294      2     none      0 Undefined     PRT         Groups
## 2295      2     none      0 Undefined     PRT         Groups
## 2296      2     none      0 Undefined     PRT         Groups
## 2297      3     none      0 Undefined     PRT         Groups
## 2298      2     none      0 Undefined     PRT         Groups
## 2299      2     none      0        BB     PRT      Online TA
## 2300      2 children      0        BB     PRT  Offline TA/TO
## 2301      2     none      0 Undefined     PRT         Groups
## 2302      2     none      0 Undefined     PRT         Groups
## 2303      2     none      0 Undefined     PRT         Groups
## 2304      2     none      0 Undefined     PRT         Groups
## 2305      2     none      0 Undefined     PRT         Groups
## 2306      2     none      0 Undefined     PRT         Groups
## 2307      2     none      0 Undefined     PRT         Groups
## 2308      1     none      0 Undefined     PRT         Groups
## 2309      2     none      0 Undefined     PRT         Groups
## 2310      2     none      0 Undefined     PRT         Groups
## 2311      2     none      0 Undefined     PRT         Groups
## 2312      2     none      0 Undefined     PRT         Groups
## 2313      2     none      0 Undefined     PRT         Groups
## 2314      1     none      0 Undefined     PRT         Groups
## 2315      1     none      0 Undefined     PRT         Groups
## 2316      2     none      0 Undefined     PRT         Groups
## 2317      2     none      0 Undefined     PRT         Groups
## 2318      1     none      0        HB     PRT         Groups
## 2319      1     none      0        HB     PRT         Groups
## 2320      2     none      0        HB     PRT         Direct
## 2321      2     none      0        BB     PRT         Direct
## 2322      2     none      0        BB     PRT      Online TA
## 2323      2 children      0        HB     PRT      Online TA
## 2324      3     none      0        BB     PRT         Direct
## 2325      2     none      0        BB     PRT         Direct
## 2326      2 children      0        BB     PRT  Offline TA/TO
## 2327      2 children      0        BB     PRT      Online TA
## 2328      2     none      0        BB     PRT         Direct
## 2329      2     none      0        BB     PRT         Direct
## 2330      2 children      0        BB     PRT         Direct
## 2331      2     none      0        BB     PRT         Direct
## 2332      2     none      0        HB     GBR  Offline TA/TO
## 2333      2     none      0        HB     GBR  Offline TA/TO
## 2334      2     none      0        HB     GBR  Offline TA/TO
## 2335      2     none      0        BB     RUS      Online TA
## 2336      2 children      0        BB     RUS      Online TA
## 2337      2     none      0        HB     ARG      Online TA
## 2338      2 children      0        HB     ARG      Online TA
## 2339      2     none      0        BB     FRA      Online TA
## 2340      2     none      0        HB     GBR      Online TA
## 2341      2     none      0        BB     DEU      Online TA
## 2342      2     none      0        BB     BRA      Online TA
## 2343      2     none      0        BB     PRT  Offline TA/TO
## 2344      2     none      0        BB     IRL  Offline TA/TO
## 2345      2     none      0        BB     GBR      Online TA
## 2346      2     none      0        BB     DEU  Offline TA/TO
## 2347      2     none      0        BB     GBR  Offline TA/TO
## 2348      2     none      0        BB     PRT      Online TA
## 2349      2     none      0        BB     USA         Direct
## 2350      2     none      0        HB     GBR      Online TA
## 2351      2     none      0        BB     GBR      Online TA
## 2352      2     none      0        BB     KOR      Online TA
## 2353      2     none      0        BB     GBR  Offline TA/TO
## 2354      2     none      0        BB     KOR      Online TA
## 2355      2     none      0        BB     PRT         Direct
## 2356      1     none      0        BB     PRT      Corporate
## 2357      2     none      0        BB     GBR      Online TA
## 2358      2     none      0        BB     GBR         Direct
## 2359      2     none      0        BB     GBR  Offline TA/TO
## 2360      2     none      0        BB     ESP  Offline TA/TO
## 2361      2     none      0        BB     ESP  Offline TA/TO
## 2362      2     none      0        HB     GBR  Offline TA/TO
## 2363      2     none      0        BB     IRL  Offline TA/TO
## 2364      2     none      0        BB     IRL  Offline TA/TO
## 2365      2     none      0        BB     DNK      Online TA
## 2366      2     none      0        BB     CHN      Online TA
## 2367      2     none      0        BB     CHN      Online TA
## 2368      2     none      0        BB     IRL      Online TA
## 2369      2     none      0        BB     IRL      Online TA
## 2370      2     none      0        HB     FRA         Groups
## 2371      2     none      0        HB     FRA         Groups
## 2372      2     none      0        HB     FRA         Groups
## 2373      2     none      0        HB     FRA         Groups
## 2374      2     none      0        HB     FRA         Groups
## 2375      2     none      0        HB     PRT         Groups
## 2376      2     none      0        HB     FRA         Groups
## 2377      2     none      0        HB     FRA         Groups
## 2378      2     none      0        HB     FRA         Groups
## 2379      2     none      0        HB     FRA         Groups
## 2380      1     none      0        BB     PRT  Offline TA/TO
## 2381      2     none      0        BB     NLD      Online TA
## 2382      2     none      0        BB     NLD      Online TA
## 2383      1     none      0        BB     NLD      Online TA
## 2384      2     none      0        BB     GBR  Offline TA/TO
## 2385      2     none      0 Undefined     ESP         Groups
## 2386      3     none      0 Undefined     ESP         Groups
## 2387      1     none      0 Undefined     ESP         Groups
## 2388      2     none      0 Undefined     ESP         Groups
## 2389      2     none      0 Undefined     ESP         Groups
## 2390      2     none      0 Undefined     ESP         Groups
## 2391      2     none      0 Undefined     ESP         Groups
## 2392      2     none      0 Undefined     ESP         Groups
## 2393      2     none      0 Undefined     ESP         Groups
## 2394      2     none      0 Undefined     ESP         Groups
## 2395      2     none      0 Undefined     ESP         Groups
## 2396      1     none      0 Undefined     ESP         Groups
## 2397      2     none      0 Undefined     ESP         Groups
## 2398      2     none      0 Undefined     ESP         Groups
## 2399      2     none      0 Undefined     ESP         Groups
## 2400      3     none      0 Undefined     ESP         Groups
## 2401      1     none      0 Undefined     ESP         Groups
## 2402      2     none      0 Undefined     ESP         Groups
## 2403      2     none      0 Undefined     ESP         Groups
## 2404      2     none      0 Undefined     ESP         Groups
## 2405      2     none      0 Undefined     ESP         Groups
## 2406      3     none      0 Undefined     ESP         Groups
## 2407      1     none      0 Undefined     ESP         Groups
## 2408      2     none      0        BB     GBR      Online TA
## 2409      2     none      0        BB     GBR      Online TA
## 2410      2     none      0        BB     FRA  Offline TA/TO
## 2411      1     none      0        BB     BRA      Online TA
## 2412      2 children      0        BB     HUN      Online TA
## 2413      2     none      0        BB     POL  Offline TA/TO
## 2414      2     none      0        BB     POL  Offline TA/TO
## 2415      2     none      0        BB     GBR      Online TA
## 2416      2 children      0        BB     GBR      Online TA
## 2417      2     none      0        BB     GBR      Online TA
## 2418      2     none      0        BB     IRL  Offline TA/TO
## 2419      2     none      0        BB     PRT      Online TA
## 2420      1     none      0        BB     NLD  Offline TA/TO
## 2421      2     none      0        FB     IRL  Offline TA/TO
## 2422      1     none      0        BB     NLD  Offline TA/TO
## 2423      2     none      0        BB     IRL         Direct
## 2424      2     none      0        HB     GBR  Offline TA/TO
## 2425      2     none      0        HB     GBR  Offline TA/TO
## 2426      2     none      0        HB     GBR  Offline TA/TO
## 2427      1     none      0        BB     GBR  Offline TA/TO
## 2428      1     none      0        BB     GBR  Offline TA/TO
## 2429      2     none      0        HB     GBR         Direct
## 2430      1     none      0        BB     PRT      Online TA
## 2431      2     none      0        FB     ESP         Groups
## 2432      2     none      0        FB     ESP         Groups
## 2433      2     none      0        FB     ESP         Groups
## 2434      2     none      0        FB     ESP         Groups
## 2435      2     none      0        FB     ESP         Groups
## 2436      2     none      0        FB     ESP         Groups
## 2437      2     none      0        FB     ESP         Groups
## 2438      2     none      0        FB     ESP         Groups
## 2439      2     none      0        FB     ESP         Groups
## 2440      2     none      0        FB     ESP         Groups
## 2441      2     none      0        FB     ESP         Groups
## 2442      2     none      0        FB     ESP         Groups
## 2443      2     none      0        FB     ESP         Groups
## 2444      2     none      0        FB     ESP         Groups
## 2445      2     none      0        FB     ESP         Groups
## 2446      2     none      0        FB     ESP         Groups
## 2447      2     none      0        FB     ESP         Groups
## 2448      2     none      0        FB     ESP         Groups
## 2449      2     none      0        FB     ESP         Groups
## 2450      2     none      0        FB     ESP         Groups
## 2451      2     none      0        FB     ESP         Groups
## 2452      2     none      0        FB     ESP         Groups
## 2453      2     none      0        BB      CN  Offline TA/TO
## 2454      1     none      0        BB     PRT      Corporate
## 2455      2     none      0        BB     FRA  Offline TA/TO
## 2456      2     none      0        HB     GBR  Offline TA/TO
## 2457      1     none      0        BB     PRT         Direct
## 2458      2     none      0        BB     DEU      Online TA
## 2459      2     none      0        BB     DEU      Online TA
## 2460      2     none      0        BB     GBR  Offline TA/TO
## 2461      2     none      0        BB     GBR  Offline TA/TO
## 2462      1     none      0        BB     PRT      Corporate
## 2463      2     none      0        HB     PRT  Offline TA/TO
## 2464      2     none      0        BB     GBR      Online TA
## 2465      2     none      0        BB      CN         Direct
## 2466      1     none      0        BB     PRT         Direct
## 2467      2     none      0        BB     BEL      Online TA
## 2468      2     none      0        BB     ESP  Offline TA/TO
## 2469      2     none      0        BB     GBR      Online TA
## 2470      2     none      0        BB      CN  Offline TA/TO
## 2471      2     none      0        BB     PRT      Online TA
## 2472      2     none      0        BB     GBR  Offline TA/TO
## 2473      2     none      0        BB     GBR  Offline TA/TO
## 2474      2     none      0        FB     ESP  Offline TA/TO
## 2475      2     none      0        FB     ESP  Offline TA/TO
## 2476      2     none      0        BB     GBR      Online TA
## 2477      2     none      0        HB     ESP      Online TA
## 2478      2     none      0        BB     IRL      Online TA
## 2479      2     none      0        BB     PRT         Direct
## 2480      2     none      0        BB     ESP      Online TA
## 2481      3     none      0        BB     GBR  Offline TA/TO
## 2482      2     none      0        BB     IRL  Offline TA/TO
## 2483      2     none      0        BB     PRT      Online TA
## 2484      2     none      0 Undefined     ESP         Groups
## 2485      2     none      0 Undefined     ESP         Groups
## 2486      2     none      0 Undefined     PRT         Groups
## 2487      3     none      0 Undefined     ESP         Groups
## 2488      2     none      0        BB     ESP      Online TA
## 2489      2     none      0 Undefined     PRT  Offline TA/TO
## 2490      2     none      0 Undefined     ESP  Offline TA/TO
## 2491      2     none      0 Undefined     PRT  Offline TA/TO
## 2492      1     none      0 Undefined     ESP  Offline TA/TO
## 2493      1     none      0 Undefined     ESP  Offline TA/TO
## 2494      2     none      0 Undefined     PRT         Groups
## 2495      2     none      0 Undefined     ESP         Groups
## 2496      2     none      0 Undefined     ESP         Groups
## 2497      2     none      0 Undefined     ESP         Groups
## 2498      2     none      0 Undefined     ESP  Offline TA/TO
## 2499      2     none      0 Undefined     ESP  Offline TA/TO
## 2500      3     none      0 Undefined     ESP  Offline TA/TO
## 2501      2     none      0 Undefined     PRT  Offline TA/TO
## 2502      2     none      0 Undefined     ESP  Offline TA/TO
## 2503      2     none      0 Undefined     PRT  Offline TA/TO
## 2504      2     none      0 Undefined     ESP         Groups
## 2505      2     none      0 Undefined     ESP         Groups
## 2506      2     none      0 Undefined     ESP  Offline TA/TO
## 2507      2     none      0 Undefined     ESP  Offline TA/TO
## 2508      2     none      0 Undefined     ESP         Groups
## 2509      2     none      0 Undefined     ESP         Groups
## 2510      2     none      0 Undefined     ESP         Groups
## 2511      2     none      0 Undefined     ESP  Offline TA/TO
## 2512      2     none      0 Undefined     ESP  Offline TA/TO
## 2513      2     none      0 Undefined     ESP         Groups
## 2514      2     none      0 Undefined     ESP         Groups
## 2515      2     none      0 Undefined     ESP         Groups
## 2516      2     none      0 Undefined     PRT         Groups
## 2517      2     none      0 Undefined     ESP  Offline TA/TO
## 2518      2     none      0 Undefined     PRT  Offline TA/TO
## 2519      2     none      0 Undefined     ESP  Offline TA/TO
## 2520      3     none      0 Undefined     ESP  Offline TA/TO
## 2521      1     none      0 Undefined     ESP  Offline TA/TO
## 2522      2     none      0 Undefined     ESP         Groups
## 2523      2     none      0 Undefined     ESP         Groups
## 2524      2     none      0 Undefined     ESP         Groups
## 2525      2     none      0 Undefined     ESP  Offline TA/TO
## 2526      2     none      0 Undefined     ESP  Offline TA/TO
## 2527      2     none      0        BB     ESP      Online TA
## 2528      2     none      0 Undefined     ESP         Groups
## 2529      2     none      0 Undefined     ESP         Groups
## 2530      2     none      0 Undefined     ESP         Groups
## 2531      2     none      0 Undefined     ESP         Groups
## 2532      3     none      0 Undefined     PRT         Groups
## 2533      2     none      0 Undefined     ESP  Offline TA/TO
## 2534      2     none      0 Undefined     ESP  Offline TA/TO
## 2535      2     none      0 Undefined     ESP  Offline TA/TO
## 2536      3     none      0 Undefined     ESP  Offline TA/TO
## 2537      2     none      0 Undefined     ESP         Groups
## 2538      2     none      0 Undefined     PRT         Groups
## 2539      2     none      0        SC     ESP  Offline TA/TO
## 2540      2     none      0        SC     ESP  Offline TA/TO
## 2541      2     none      0        BB     PRT      Online TA
## 2542      2     none      0        BB     PRT      Online TA
## 2543      2     none      0        BB     GBR  Offline TA/TO
## 2544      2     none      0        BB     GBR  Offline TA/TO
## 2545      2     none      0        HB     LUX  Offline TA/TO
## 2546      2     none      0        HB     LUX  Offline TA/TO
## 2547      2     none      0        HB     LUX  Offline TA/TO
## 2548      2     none      0        HB     LUX  Offline TA/TO
## 2549      2     none      0        HB     LUX  Offline TA/TO
## 2550      2     none      0        HB     LUX  Offline TA/TO
## 2551      2     none      0        HB     PRT  Offline TA/TO
## 2552      1     none      0        BB     GBR         Groups
## 2553      2     none      0        BB     GBR         Groups
## 2554      2     none      0        BB     GBR         Groups
## 2555      1     none      0        BB     DEU         Groups
## 2556      3     none      0        BB     GBR         Groups
## 2557      1     none      0        BB     GBR         Groups
## 2558      2 children      0        BB     GBR         Groups
## 2559      2     none      0        BB     GBR         Groups
## 2560      2     none      0        BB     GBR         Groups
## 2561      2     none      0        BB     PRT         Groups
## 2562      2     none      0        BB     GBR         Direct
## 2563      2     none      0        BB     GBR         Groups
## 2564      2     none      0        BB     GBR         Groups
## 2565      2 children      1        BB     GBR         Groups
## 2566      2     none      0        BB     GBR         Groups
## 2567      2     none      0        BB     PRT         Groups
## 2568      2     none      0        BB     GBR         Groups
## 2569      2     none      0        BB     PRT         Groups
## 2570      2     none      0        BB     PRT         Groups
## 2571      2     none      0        BB     GBR         Groups
## 2572      2     none      0        BB     GBR         Groups
## 2573      2     none      0        BB     PRT         Groups
## 2574      2     none      0        BB     GBR         Groups
## 2575      2     none      0        BB     PRT         Groups
## 2576      2     none      0        BB     PRT         Groups
## 2577      2     none      0        BB     GBR         Groups
## 2578      2     none      0        BB     PRT         Groups
## 2579      2     none      0        BB     PRT         Groups
## 2580      2     none      0        BB     PRT         Groups
## 2581      2     none      0        BB     GBR         Groups
## 2582      1     none      0        BB     AUT         Groups
## 2583      2     none      0        BB     GBR         Groups
## 2584      2     none      0        BB     GBR         Groups
## 2585      2     none      0        BB     POL         Groups
## 2586      2     none      0        BB     BEL         Groups
## 2587      2     none      0        BB     GBR         Groups
## 2588      2     none      0        BB     PRT         Groups
## 2589      2     none      0        BB     GBR         Groups
## 2590      1     none      0        BB     NLD         Groups
## 2591      2     none      0        BB     GBR         Groups
## 2592      3     none      0        BB     PRT         Groups
## 2593      1     none      0        BB     BEL         Groups
## 2594      2 children      0        BB     PRT         Groups
## 2595      2     none      0        BB     PRT         Groups
## 2596      2     none      0        BB     GBR         Groups
## 2597      1     none      0        BB     PRT         Groups
## 2598      1     none      0        BB     GBR         Groups
## 2599      2     none      0        BB     PRT         Groups
## 2600      2     none      0        BB     PRT         Groups
## 2601      3     none      0        BB     GBR         Groups
## 2602      2     none      0        BB     PRT         Groups
## 2603      2     none      0        BB     GBR         Groups
## 2604      2     none      0        BB     GBR         Groups
## 2605      2     none      0        BB     PRT         Groups
## 2606      2     none      0        BB     GBR         Groups
## 2607      1     none      0        BB     PRT         Groups
## 2608      1     none      0        BB     PRT         Groups
## 2609      2     none      0        BB     NLD         Groups
## 2610      2     none      0        BB     PRT         Groups
## 2611      2     none      0        BB     GBR         Groups
## 2612      2     none      0        BB     PRT         Groups
## 2613      1     none      0        BB     GBR         Groups
## 2614      1     none      0        BB     BEL         Groups
## 2615      2     none      0        BB     GBR         Groups
## 2616      2     none      0        BB     GBR         Groups
## 2617      2     none      0        BB     NLD         Groups
## 2618      2     none      0        BB     NLD         Groups
## 2619      2     none      0        BB     GBR         Groups
## 2620      2     none      0        BB     BEL         Groups
## 2621      1     none      0        BB     GBR         Groups
## 2622      2     none      0        BB     GBR  Offline TA/TO
## 2623      2     none      0        BB     IRL  Offline TA/TO
## 2624      2     none      0        BB     GBR  Offline TA/TO
## 2625      2     none      0        BB     CHE      Online TA
## 2626      2     none      0        BB     FRA      Online TA
## 2627      2     none      0        BB     GBR      Online TA
## 2628      2     none      0        BB     GBR      Online TA
## 2629      2     none      0        BB     GBR         Groups
## 2630      2     none      0        BB     PRT         Groups
## 2631      2 children      0        BB     PRT  Offline TA/TO
## 2632      2     none      0        HB     DEU         Groups
## 2633      1     none      0        HB     DEU         Groups
## 2634      2     none      0        HB     DEU         Groups
## 2635      2     none      0        HB     PRT         Groups
## 2636      2     none      0        HB     DEU         Groups
## 2637      1     none      0        HB     DEU         Groups
## 2638      1     none      0        HB     DEU         Groups
## 2639      1     none      0        HB     DEU         Groups
## 2640      2     none      0        HB     DEU         Groups
## 2641      2     none      0        HB     DEU         Groups
## 2642      2     none      0        HB     DEU         Groups
## 2643      2     none      0        HB     DEU         Groups
## 2644      2     none      0        HB     DEU         Groups
## 2645      1     none      0        HB     DEU         Groups
## 2646      1     none      0        HB     PRT         Groups
## 2647      1     none      0        HB     DEU         Groups
## 2648      2     none      0        HB     DEU         Groups
## 2649      2     none      0        HB     DEU         Groups
## 2650      1     none      0        HB     DEU         Groups
## 2651      2     none      0        HB     PRT         Groups
## 2652      2     none      0        HB     DEU         Groups
## 2653      1     none      0        HB     DEU         Groups
## 2654      1     none      0        HB     DEU         Groups
## 2655      2     none      0        HB     DEU         Groups
## 2656      2     none      0        HB     DEU         Groups
## 2657      2     none      0        HB     DEU         Groups
## 2658      1     none      0        HB     DEU         Groups
## 2659      2     none      0        HB     PRT         Groups
## 2660      1     none      0        HB     DEU         Groups
## 2661      2     none      0        HB     DEU         Groups
## 2662      2     none      0        HB     DEU         Groups
## 2663      2     none      0        HB     DEU         Groups
## 2664      1     none      0        HB     DEU         Groups
## 2665      1     none      0        HB     DEU         Groups
## 2666      1     none      0        HB     DEU         Groups
## 2667      1     none      0        HB     DEU         Groups
## 2668      2     none      0        HB     DEU         Groups
## 2669      2     none      0        HB     DEU         Groups
## 2670      2     none      0        HB     DEU         Groups
## 2671      2     none      0        SC     DEU         Groups
## 2672      2     none      0        BB     DEU      Online TA
## 2673      1     none      0        BB     GBR  Offline TA/TO
## 2674      1     none      0        BB     GBR  Offline TA/TO
## 2675      2     none      0        BB     PRT      Online TA
## 2676      2 children      0        HB     FRA         Direct
## 2677      1     none      0        HB     GBR         Groups
## 2678      1     none      0        HB     GBR         Groups
## 2679      2     none      0        HB     GBR         Groups
## 2680      1     none      0        HB     GBR         Groups
## 2681      2     none      0        HB     GBR         Groups
## 2682      2     none      0        HB     GBR         Groups
## 2683      2     none      0        HB     GBR         Groups
## 2684      2     none      0        HB     BRA         Groups
## 2685      1     none      0        HB     GBR         Groups
## 2686      2     none      0        HB     GBR         Groups
## 2687      2     none      0        HB     GBR         Groups
## 2688      2     none      0        HB     GBR         Groups
## 2689      2     none      0        HB     GBR         Groups
## 2690      1     none      0        HB     GBR         Groups
## 2691      1     none      0        HB     GBR         Groups
## 2692      2     none      0        HB     GBR         Groups
## 2693      2     none      0        SC     GBR         Groups
## 2694      2     none      0        HB     GBR         Groups
## 2695      1     none      0        BB     PRT      Corporate
## 2696      2     none      0        BB     PRT      Online TA
## 2697      2     none      0        BB     FRA      Online TA
## 2698      2     none      0        HB     GBR      Online TA
## 2699      2     none      0        BB     IRL      Online TA
## 2700      2     none      0        BB     IRL         Direct
## 2701      2     none      0        HB     DEU         Groups
## 2702      2     none      0        HB     DEU         Groups
## 2703      1     none      0        HB     PRT         Groups
## 2704      2     none      0        HB     DEU         Groups
## 2705      2     none      0        HB     DEU         Groups
## 2706      1     none      0        HB     DEU         Groups
## 2707      1     none      0        HB     DEU         Groups
## 2708      2     none      0        HB     DEU         Groups
## 2709      1     none      0        HB     DEU         Groups
## 2710      2     none      0        HB     DEU         Groups
## 2711      2     none      0        HB     ESP         Groups
## 2712      2     none      0        HB     DEU         Groups
## 2713      2     none      0        HB     DEU         Groups
## 2714      2     none      0        HB     DEU         Groups
## 2715      2     none      0        HB     DEU         Groups
## 2716      2     none      0        HB     DEU         Groups
## 2717      1     none      0        HB     DEU         Groups
## 2718      1     none      0        HB     DEU         Groups
## 2719      2     none      0        HB     DEU         Groups
## 2720      1     none      0        HB     DEU         Groups
## 2721      1     none      0        HB     DEU         Groups
## 2722      2     none      0        HB     DEU         Groups
## 2723      1     none      0        HB     DEU         Groups
## 2724      2     none      0        HB     DEU         Groups
## 2725      2     none      0        HB     DEU         Groups
## 2726      1     none      0        HB     DEU         Groups
## 2727      1     none      0        HB     DEU         Groups
## 2728      1     none      0        HB     DEU         Groups
## 2729      2     none      0        SC     DEU         Groups
## 2730      2     none      0        HB     FRA  Offline TA/TO
## 2731      3     none      0        HB     FRA  Offline TA/TO
## 2732      2     none      0        BB     GBR  Offline TA/TO
## 2733      2     none      0        BB     PRT      Online TA
## 2734      2     none      0        BB     GBR         Direct
## 2735      2     none      0        HB     DEU         Groups
## 2736      1     none      0        HB     DEU         Groups
## 2737      1     none      0        HB     DEU         Groups
## 2738      2     none      0        HB     DEU         Groups
## 2739      1     none      0        HB     DEU         Groups
## 2740      2     none      0        HB     DEU         Groups
## 2741      2     none      0        HB     DEU         Groups
## 2742      2     none      0        HB     DEU         Groups
## 2743      2     none      0        HB     DEU         Groups
## 2744      2     none      0        HB     DEU         Groups
## 2745      2     none      0        HB     DEU         Groups
## 2746      2     none      0        HB     DEU         Groups
## 2747      2     none      0        SC     DEU         Groups
## 2748      2     none      0        HB     DEU         Groups
## 2749      2     none      0        HB     DEU         Groups
## 2750      2     none      0        HB     DEU         Groups
## 2751      1     none      0        HB     DEU         Groups
## 2752      1     none      0        HB     DEU         Groups
## 2753      1     none      0        HB     DEU         Groups
## 2754      2     none      0        HB     DEU         Groups
## 2755      1     none      0        HB     DEU         Groups
## 2756      2     none      0        HB     DEU         Groups
## 2757      1     none      0        HB     DEU         Groups
## 2758      2     none      0        HB     DEU         Groups
## 2759      2     none      0        HB     DEU         Groups
## 2760      2     none      0        HB     DEU         Groups
## 2761      1     none      0        HB     DEU         Groups
## 2762      1     none      0        HB     DEU         Groups
## 2763      2     none      0        HB     DEU         Groups
## 2764      1     none      0        HB     GBR  Offline TA/TO
## 2765      1     none      0        HB     GBR  Offline TA/TO
## 2766      2     none      0        BB     GBR  Offline TA/TO
## 2767      1     none      0        HB     GBR  Offline TA/TO
## 2768      1     none      0        HB     BRA  Offline TA/TO
## 2769      2     none      0        HB     GBR  Offline TA/TO
## 2770      2     none      0        BB     IRL         Direct
## 2771      2     none      0        BB     IRL         Direct
## 2772      2     none      0        HB     POL  Offline TA/TO
## 2773      2     none      0        BB     ITA      Online TA
## 2774      2     none      0        BB     ITA      Online TA
## 2775      2     none      0        BB     GBR  Offline TA/TO
## 2776      2     none      0 Undefined     PRT  Offline TA/TO
## 2777      2     none      0 Undefined     PRT  Offline TA/TO
## 2778      2     none      0 Undefined     PRT  Offline TA/TO
## 2779      2     none      0 Undefined     PRT  Offline TA/TO
## 2780      2     none      0 Undefined     PRT  Offline TA/TO
## 2781      2     none      0 Undefined     PRT  Offline TA/TO
## 2782      2     none      0 Undefined     PRT  Offline TA/TO
## 2783      2     none      0 Undefined     PRT  Offline TA/TO
## 2784      2     none      0 Undefined     PRT  Offline TA/TO
## 2785      2     none      0 Undefined     PRT  Offline TA/TO
## 2786      2     none      0 Undefined     PRT  Offline TA/TO
## 2787      2     none      0 Undefined     PRT  Offline TA/TO
## 2788      2     none      0 Undefined     PRT  Offline TA/TO
## 2789      2     none      0 Undefined     PRT  Offline TA/TO
## 2790      2     none      0 Undefined     PRT  Offline TA/TO
## 2791      2     none      0 Undefined     PRT  Offline TA/TO
## 2792      2     none      0 Undefined     PRT  Offline TA/TO
## 2793      2     none      0 Undefined     PRT  Offline TA/TO
## 2794      3     none      0 Undefined     PRT  Offline TA/TO
## 2795      2     none      0 Undefined     PRT  Offline TA/TO
## 2796      2     none      0 Undefined     PRT  Offline TA/TO
## 2797      1     none      0 Undefined     PRT  Offline TA/TO
## 2798      2     none      0 Undefined     PRT  Offline TA/TO
## 2799      2     none      0 Undefined     PRT  Offline TA/TO
## 2800      2     none      0 Undefined     PRT  Offline TA/TO
## 2801      2     none      0 Undefined     PRT  Offline TA/TO
## 2802      2     none      0 Undefined     PRT  Offline TA/TO
## 2803      2     none      0        FB     PRT      Online TA
## 2804      2     none      0        BB     PRT         Direct
## 2805      2     none      0        BB     IRL  Offline TA/TO
## 2806      2     none      0        BB     IRL  Offline TA/TO
## 2807      2     none      0        BB     GBR  Offline TA/TO
## 2808      1     none      0        BB     PRT         Groups
## 2809      2     none      0        BB     FRA         Groups
## 2810      2     none      0        BB     FRA         Groups
## 2811      1     none      0        BB     PRT         Groups
## 2812      1     none      0        BB     FRA         Groups
## 2813      2     none      0        HB     GBR  Offline TA/TO
## 2814      2     none      0        BB     GBR      Online TA
## 2815      2     none      0        BB     GBR  Offline TA/TO
## 2816      2     none      0        HB     DEU         Groups
## 2817      2     none      0        HB     DEU         Groups
## 2818      2     none      0        HB     PRT         Groups
## 2819      2     none      0        HB     DEU         Groups
## 2820      2     none      0        HB     DEU         Groups
## 2821      2     none      0        HB     DEU         Groups
## 2822      2     none      0        HB     DEU         Groups
## 2823      2     none      0        HB     GBR  Offline TA/TO
## 2824      2     none      0        BB     IRL      Online TA
## 2825      2     none      0        BB     NLD  Offline TA/TO
## 2826      2     none      0        BB     GBR  Offline TA/TO
## 2827      2 children      1        HB     GBR  Offline TA/TO
## 2828      2     none      0        BB     GBR  Offline TA/TO
## 2829      2     none      0        HB     DEU         Groups
## 2830      2     none      0        HB     DEU         Groups
## 2831      1     none      0        HB     DEU         Groups
## 2832      2     none      0        HB     DEU         Groups
## 2833      2     none      0        HB     DEU         Groups
## 2834      2     none      0        HB     DEU         Groups
## 2835      2     none      0        HB     DEU         Groups
## 2836      2     none      0        HB     DEU         Groups
## 2837      2     none      0        HB     DEU         Groups
## 2838      2     none      0        HB     DEU         Groups
## 2839      2     none      0        HB     DEU         Groups
## 2840      2     none      0        HB     DEU         Groups
## 2841      2     none      0        HB     DEU         Groups
## 2842      1     none      0        HB     DEU         Groups
## 2843      1     none      0        HB     DEU         Groups
## 2844      2     none      0        HB     DEU         Groups
## 2845      2     none      0        HB     DEU         Groups
## 2846      2     none      0        HB     DEU         Groups
## 2847      2     none      0        HB     DEU         Groups
## 2848      2     none      0        HB     DEU         Groups
## 2849      1     none      0        HB     DEU         Groups
## 2850      2     none      0        HB     DEU         Groups
## 2851      2     none      0        HB     DEU         Groups
## 2852      1     none      0        HB     DEU         Groups
## 2853      2     none      0        HB     DEU         Groups
## 2854      1     none      0        HB     DEU         Groups
## 2855      2     none      0        BB     IRL      Online TA
## 2856      2     none      0        BB     IRL      Online TA
## 2857      2     none      0        HB     GBR  Offline TA/TO
## 2858      2     none      0        BB     GBR  Offline TA/TO
## 2859      2     none      0        HB     GBR  Offline TA/TO
## 2860      2     none      0        BB     GBR  Offline TA/TO
## 2861      2     none      0        HB     GBR  Offline TA/TO
## 2862      2     none      0        BB     GBR  Offline TA/TO
## 2863      2     none      0        BB     PRT      Online TA
## 2864      2     none      0        BB     IRL      Online TA
## 2865      2     none      0        BB     ESP      Online TA
## 2866      2     none      0        BB     IRL      Online TA
## 2867      2     none      0        BB     IRL      Online TA
## 2868      1     none      0        BB     GBR  Offline TA/TO
## 2869      2     none      0        BB     GBR  Offline TA/TO
## 2870      1     none      0        BB     PRT  Offline TA/TO
## 2871      2     none      0        BB     GBR  Offline TA/TO
## 2872      2     none      0        BB     IRL  Offline TA/TO
## 2873      2     none      0        BB     BRA      Online TA
## 2874      2     none      0        HB     GBR  Offline TA/TO
## 2875      2     none      0        BB     GBR      Online TA
## 2876      2     none      0        BB     GBR      Online TA
## 2877      2     none      0        BB     GBR  Offline TA/TO
## 2878      2     none      0        BB     GBR  Offline TA/TO
## 2879      2     none      0        HB     GBR  Offline TA/TO
## 2880      2     none      0        BB     IRL  Offline TA/TO
## 2881      2     none      0        BB     IRL      Online TA
## 2882      2     none      0        BB     FRA         Groups
## 2883      2     none      0        BB     PRT         Groups
## 2884      1     none      0        BB     FRA         Groups
## 2885      1     none      0        BB     PRT         Groups
## 2886      2     none      0        BB     FRA         Groups
## 2887      2     none      0        BB     FRA         Groups
## 2888      2     none      0        BB     IRL      Online TA
## 2889      2     none      0        HB     DEU  Offline TA/TO
## 2890      2     none      0        BB     GBR         Groups
## 2891      1     none      0        BB     IRL         Groups
## 2892      2     none      0        BB     GBR         Groups
## 2893      2     none      0        BB     GBR         Groups
## 2894      1     none      0        BB     GBR         Groups
## 2895      2     none      0        BB     GBR         Groups
## 2896      2     none      0        BB     GBR         Groups
## 2897      2     none      0        BB     GBR         Groups
## 2898      2     none      0        BB     GBR         Groups
## 2899      1     none      0        BB     GBR         Groups
## 2900      1     none      0        BB     GBR         Groups
## 2901      2     none      0        BB     GBR         Groups
## 2902      2     none      0        SC     GBR         Groups
## 2903      2     none      0        HB     DEU      Online TA
## 2904      2     none      0        HB     DEU      Online TA
## 2905      2     none      0        BB     GBR  Offline TA/TO
## 2906      2     none      0        BB     GBR  Offline TA/TO
## 2907      1     none      0        BB     PRT         Groups
## 2908      1     none      0        BB     GBR         Groups
## 2909      2     none      0        BB     IRL  Offline TA/TO
## 2910      2     none      0        BB     IRL  Offline TA/TO
## 2911      2     none      0        BB     GBR      Online TA
## 2912      2     none      0        HB     DEU         Groups
## 2913      2     none      0        HB     DEU         Groups
## 2914      1     none      0        HB     DEU         Groups
## 2915      1     none      0        HB     DEU         Groups
## 2916      2     none      0        HB     DEU         Groups
## 2917      2     none      0        HB     DEU         Groups
## 2918      1     none      0        HB     DEU         Groups
## 2919      1     none      0        HB     DEU         Groups
## 2920      2     none      0        HB     DEU         Groups
## 2921      2     none      0        HB     DEU         Groups
## 2922      2     none      0        HB     DEU         Groups
## 2923      2     none      0        HB     DEU         Groups
## 2924      2     none      0        HB     DEU         Groups
## 2925      1     none      0        HB     DEU         Groups
## 2926      2     none      0        HB     DEU         Groups
## 2927      2     none      0        HB     DEU         Groups
## 2928      2     none      0        HB     DEU         Groups
## 2929      1     none      0        HB     PRT         Groups
## 2930      1     none      0        HB     DEU         Groups
## 2931      2     none      0        HB     DEU         Groups
## 2932      2     none      0        HB     NLD         Groups
## 2933      2     none      0        HB     DEU         Groups
## 2934      2     none      0        HB     DEU         Groups
## 2935      2     none      0        HB     DEU         Groups
## 2936      2     none      0        HB     DEU         Groups
## 2937      2     none      0        HB     DEU         Groups
## 2938      2     none      0        HB     DEU         Groups
## 2939      2     none      0        HB     DEU         Groups
## 2940      1     none      0        HB     DEU         Groups
## 2941      2     none      0        BB     PRT         Groups
## 2942      2     none      0        BB     GBR  Offline TA/TO
## 2943      1     none      0        BB     IRL      Online TA
## 2944      2     none      0        BB     IRL  Offline TA/TO
## 2945      2     none      0        HB     DEU         Groups
## 2946      2     none      0        HB     DEU         Groups
## 2947      2     none      0        HB     DEU         Groups
## 2948      1     none      0        HB     DEU         Groups
## 2949      2     none      0        HB     DEU         Groups
## 2950      2     none      0        HB     DEU         Groups
## 2951      2     none      0        HB     DEU         Groups
## 2952      1     none      0        HB     DEU         Groups
## 2953      2     none      0        HB     DEU         Groups
## 2954      2     none      0        HB     DEU         Groups
## 2955      2     none      0        HB     DEU         Groups
## 2956      2     none      0        HB     DEU         Groups
## 2957      2     none      0        HB     DEU         Groups
## 2958      2     none      0        HB     DEU         Groups
## 2959      2     none      0        HB     DEU         Groups
## 2960      2     none      0        HB     DEU         Groups
## 2961      2     none      0        HB     DEU         Groups
## 2962      1     none      0        HB     DEU         Groups
## 2963      2     none      0        HB     DEU         Groups
## 2964      2     none      0        HB     DEU         Groups
## 2965      1     none      0        HB     DEU         Groups
## 2966      1     none      0        HB     DEU         Groups
## 2967      1     none      0        HB     PRT         Groups
## 2968      2     none      0        HB     DEU         Groups
## 2969      2     none      0        HB     DEU         Groups
## 2970      2     none      0        HB     DEU         Groups
## 2971      1     none      0        HB     DEU         Groups
## 2972      2     none      0        HB     DEU         Groups
## 2973      2     none      0        HB     DEU         Groups
## 2974      2     none      0        HB     DEU         Groups
## 2975      2     none      0        BB     GBR  Offline TA/TO
## 2976      2     none      0        BB     GBR  Offline TA/TO
## 2977      1     none      0        HB     POL  Offline TA/TO
## 2978      2     none      0        BB     GBR  Offline TA/TO
## 2979      2     none      0        HB     GBR  Offline TA/TO
## 2980      2     none      0        BB     IRL  Offline TA/TO
## 2981      2     none      0        BB     DEU      Online TA
## 2982      2     none      0        BB     DEU      Online TA
## 2983      2     none      0        BB     DEU      Online TA
## 2984      2     none      0        BB     DEU      Online TA
## 2985      2     none      0        BB     DEU      Online TA
## 2986      2     none      0        BB     PRT  Offline TA/TO
## 2987      2     none      0        BB     GBR  Offline TA/TO
## 2988      2     none      0        BB     GBR  Offline TA/TO
## 2989      2     none      0        BB     GBR  Offline TA/TO
## 2990      2     none      0        HB     IRL  Offline TA/TO
## 2991      2     none      0        BB     GBR  Offline TA/TO
## 2992      2     none      0        BB     NLD      Online TA
## 2993      2     none      0        BB     PRT  Complementary
## 2994      2     none      0        BB     GBR  Offline TA/TO
## 2995      2     none      0        BB     GBR  Offline TA/TO
## 2996      2     none      0        BB     IRL  Offline TA/TO
## 2997      2     none      0        BB     GBR  Offline TA/TO
## 2998      2     none      0        BB     IRL      Online TA
## 2999      2     none      0        HB     GBR  Offline TA/TO
## 3000      3     none      0        BB     PRT         Direct
## 3001      2     none      0        BB     BEL         Direct
## 3002      2     none      0        BB     IRL      Online TA
## 3003      2     none      0        BB     GBR         Groups
## 3004      2     none      0        HB     GBR  Offline TA/TO
## 3005      2     none      0        HB     GBR      Online TA
## 3006      2     none      0        HB     GBR  Offline TA/TO
## 3007      2     none      0        BB     GBR  Offline TA/TO
## 3008      2     none      0        BB     GBR         Groups
## 3009      2     none      0        HB     ESP      Online TA
## 3010      2     none      0        BB     GBR         Groups
## 3011      2     none      0        HB     IRL         Direct
## 3012      2     none      0        HB     BEL         Direct
## 3013      2     none      0        BB     PRT      Online TA
## 3014      1     none      0        BB     GBR         Groups
## 3015      2     none      0        BB     GBR         Groups
## 3016      2     none      0        BB     GBR         Groups
## 3017      2 children      1        BB     GBR         Groups
## 3018      2     none      0        BB     GBR         Groups
## 3019      2     none      0        BB     GBR         Groups
## 3020      2     none      0        BB     GBR         Groups
## 3021      2     none      0        BB     GBR         Groups
## 3022      2     none      0        BB     GBR         Groups
## 3023      2     none      0        BB     GBR         Groups
## 3024      2     none      0        BB     GBR         Groups
## 3025      1     none      0        BB     GBR         Groups
## 3026      2     none      0        BB     GBR         Groups
## 3027      2     none      0        BB     GBR         Groups
## 3028      2     none      0        BB     GBR         Groups
## 3029      2     none      0        BB     GBR         Groups
## 3030      2     none      0        BB     GBR         Groups
## 3031      2     none      0        BB     GBR         Groups
## 3032      2     none      0        BB     GBR         Groups
## 3033      2     none      0        BB     IRL  Offline TA/TO
## 3034      2     none      0        BB     GBR      Online TA
## 3035      1     none      0        BB     GBR         Groups
## 3036      2     none      0        HB     IRL  Offline TA/TO
## 3037      2     none      0        HB     IRL  Offline TA/TO
## 3038      2 children      0        BB     DEU      Online TA
## 3039      2     none      0        BB     FRA         Groups
## 3040      2     none      0        BB     ITA         Groups
## 3041      2     none      0        BB     GBR         Groups
## 3042      2     none      0        BB     GBR         Groups
## 3043      2     none      0        BB     GBR         Groups
## 3044      2     none      0        BB     GBR         Groups
## 3045      2     none      0        BB     GBR         Groups
## 3046      2     none      0        BB     GBR         Groups
## 3047      2     none      0        BB     GBR         Groups
## 3048      1     none      0        BB     GBR         Groups
## 3049      2     none      0        BB     CHE      Online TA
## 3050      1     none      0        BB     GBR         Groups
## 3051      1     none      0        BB     GBR         Groups
## 3052      1     none      0        BB     GBR         Groups
## 3053      1     none      0        BB     GBR         Groups
## 3054      2     none      0        BB     GBR         Groups
## 3055      2     none      0        BB     GBR         Groups
## 3056      1     none      0        BB     GBR         Groups
## 3057      1     none      0        BB     GBR         Groups
## 3058      3     none      0        BB     GBR         Groups
## 3059      1     none      0        BB     ROU         Groups
## 3060      1     none      0        BB     GBR         Groups
## 3061      1     none      0        BB     GBR         Groups
## 3062      1     none      0        BB     GBR         Groups
## 3063      2     none      0        BB     GBR         Groups
## 3064      2     none      0        BB     GBR         Groups
## 3065      2     none      0        BB     GBR         Groups
## 3066      2     none      0        BB     GBR         Groups
## 3067      1     none      0        BB     GBR         Groups
## 3068      2     none      0        BB     GBR         Groups
## 3069      2     none      0        BB     GBR         Groups
## 3070      1     none      0        BB     GBR         Groups
## 3071      1     none      0        BB     GBR         Groups
## 3072      2     none      0        BB     GBR         Groups
## 3073      2     none      0        BB     GBR         Groups
## 3074      1     none      0        BB     GBR         Groups
## 3075      1     none      0        BB     GBR         Groups
## 3076      2     none      0        BB     GBR         Groups
## 3077      1     none      0        BB     GBR         Groups
## 3078      1     none      0        BB     GBR         Groups
## 3079      2     none      0        BB     GBR         Groups
## 3080      2     none      0        BB     GBR         Groups
## 3081      2     none      0        BB     GBR         Groups
## 3082      1     none      0        BB     GBR         Groups
## 3083      1     none      0        BB     GBR         Groups
## 3084      1     none      0        BB     GBR         Groups
## 3085      1     none      0        BB     GBR         Groups
## 3086      1     none      0        BB     GBR         Groups
## 3087      2 children      0        BB     JAM  Offline TA/TO
## 3088      2     none      0        HB     GBR  Offline TA/TO
## 3089      2 children      0        BB     GBR  Offline TA/TO
## 3090      2 children      1        BB     GBR  Offline TA/TO
## 3091      1     none      0        BB     GBR         Groups
## 3092      2     none      0        BB     IRL      Online TA
## 3093      2     none      0        BB     GBR  Offline TA/TO
## 3094      2     none      0        BB     IRL      Online TA
## 3095      2     none      0        BB     IRL      Online TA
## 3096      2     none      0        BB     GBR  Offline TA/TO
## 3097      2     none      0        HB     DEU         Groups
## 3098      2     none      0        HB     DEU         Groups
## 3099      2     none      0        HB     DEU         Groups
## 3100      2     none      0        HB     DEU         Groups
## 3101      1     none      0        HB     DEU         Groups
## 3102      1     none      0        HB     DEU         Groups
## 3103      1     none      0        HB     DEU         Groups
## 3104      1     none      0        HB     DEU         Groups
## 3105      2     none      0        HB     DEU         Groups
## 3106      2     none      0        HB     DEU         Groups
## 3107      1     none      0        HB     DEU         Groups
## 3108      2     none      0        HB     DEU         Groups
## 3109      1     none      0        HB     DEU         Groups
## 3110      1     none      0        HB     DEU         Groups
## 3111      2     none      0        HB     DEU         Groups
## 3112      2     none      0        BB     GBR  Offline TA/TO
## 3113      2     none      0        HB     DEU         Groups
## 3114      2     none      0        HB     DEU         Groups
## 3115      2     none      0        HB     DEU         Groups
## 3116      2     none      0        HB     GBR  Offline TA/TO
## 3117      2     none      0        BB     GBR  Offline TA/TO
## 3118      1     none      0        BB     PRT         Groups
## 3119      1     none      0        BB     GBR         Groups
## 3120      2     none      0        BB     PRT         Groups
## 3121      2     none      0        BB     IRL      Online TA
## 3122      2     none      0        BB     IRL      Online TA
## 3123      2     none      0        BB     IRL      Online TA
## 3124      1     none      0        HB     DEU  Offline TA/TO
##      distribution_channel is_repeated_guest previous_cancellations
## 1                  Direct                 0                      0
## 2                  Direct                 0                      0
## 3                  Direct                 0                      0
## 4               Corporate                 0                      0
## 5                   TA/TO                 0                      0
## 6                   TA/TO                 0                      0
## 7                  Direct                 0                      0
## 8                  Direct                 0                      0
## 9                   TA/TO                 0                      0
## 10                  TA/TO                 0                      0
## 11                  TA/TO                 0                      0
## 12                  TA/TO                 0                      0
## 13                  TA/TO                 0                      0
## 14                  TA/TO                 0                      0
## 15                  TA/TO                 0                      0
## 16              Corporate                 0                      0
## 17                 Direct                 0                      0
## 18                  TA/TO                 0                      0
## 19                 Direct                 0                      0
## 20                 Direct                 0                      0
## 21                 Direct                 0                      0
## 22                  TA/TO                 0                      0
## 23                  TA/TO                 0                      0
## 24                  TA/TO                 0                      0
## 25                  TA/TO                 0                      0
## 26                  TA/TO                 0                      0
## 27                 Direct                 0                      0
## 28                  TA/TO                 0                      0
## 29                  TA/TO                 0                      0
## 30                  TA/TO                 0                      0
## 31                  TA/TO                 0                      0
## 32                 Direct                 0                      0
## 33                  TA/TO                 0                      0
## 34                 Direct                 0                      0
## 35                 Direct                 0                      0
## 36                  TA/TO                 0                      0
## 37                  TA/TO                 0                      0
## 38                  TA/TO                 0                      0
## 39                  TA/TO                 0                      0
## 40                  TA/TO                 0                      0
## 41                  TA/TO                 0                      0
## 42                  TA/TO                 0                      0
## 43                  TA/TO                 0                      0
## 44                  TA/TO                 0                      0
## 45                  TA/TO                 0                      0
## 46                 Direct                 0                      0
## 47                 Direct                 0                      0
## 48                  TA/TO                 0                      0
## 49                 Direct                 0                      0
## 50                  TA/TO                 0                      0
## 51                  TA/TO                 0                      0
## 52                  TA/TO                 0                      0
## 53                 Direct                 0                      0
## 54                  TA/TO                 0                      0
## 55                  TA/TO                 0                      0
## 56                  TA/TO                 0                      0
## 57                  TA/TO                 0                      0
## 58                  TA/TO                 0                      0
## 59                  TA/TO                 0                      0
## 60                  TA/TO                 0                      0
## 61                  TA/TO                 0                      0
## 62                  TA/TO                 0                      0
## 63                  TA/TO                 0                      0
## 64                  TA/TO                 0                      0
## 65                  TA/TO                 0                      0
## 66                  TA/TO                 0                      0
## 67                  TA/TO                 0                      0
## 68                  TA/TO                 0                      0
## 69                  TA/TO                 0                      0
## 70                  TA/TO                 0                      0
## 71                  TA/TO                 0                      0
## 72                  TA/TO                 0                      0
## 73                  TA/TO                 0                      0
## 74                  TA/TO                 0                      0
## 75                  TA/TO                 0                      0
## 76                  TA/TO                 0                      0
## 77                 Direct                 0                      0
## 78                 Direct                 0                      0
## 79                  TA/TO                 0                      0
## 80                  TA/TO                 0                      0
## 81                  TA/TO                 0                      0
## 82                  TA/TO                 0                      0
## 83                  TA/TO                 0                      0
## 84                  TA/TO                 0                      0
## 85                  TA/TO                 0                      0
## 86                  TA/TO                 0                      0
## 87                  TA/TO                 0                      0
## 88                  TA/TO                 0                      0
## 89                  TA/TO                 0                      0
## 90                  TA/TO                 0                      0
## 91                  TA/TO                 0                      0
## 92                 Direct                 0                      0
## 93                  TA/TO                 0                      0
## 94                  TA/TO                 0                      0
## 95                 Direct                 0                      0
## 96                  TA/TO                 0                      0
## 97                  TA/TO                 0                      0
## 98                  TA/TO                 0                      0
## 99                  TA/TO                 0                      0
## 100                 TA/TO                 0                      0
## 101                 TA/TO                 0                      0
## 102                 TA/TO                 0                      0
## 103                 TA/TO                 0                      0
## 104                 TA/TO                 0                      0
## 105                 TA/TO                 0                      0
## 106                 TA/TO                 0                      0
## 107                Direct                 0                      0
## 108                 TA/TO                 0                      0
## 109                 TA/TO                 0                      0
## 110                 TA/TO                 0                      0
## 111                 TA/TO                 0                      0
## 112                 TA/TO                 0                      0
## 113                 TA/TO                 0                      0
## 114                 TA/TO                 0                      0
## 115                 TA/TO                 0                      0
## 116                Direct                 0                      0
## 117                 TA/TO                 0                      0
## 118                 TA/TO                 0                      0
## 119                 TA/TO                 0                      0
## 120                 TA/TO                 0                      0
## 121                Direct                 0                      0
## 122                 TA/TO                 0                      0
## 123                 TA/TO                 0                      0
## 124                 TA/TO                 0                      0
## 125                 TA/TO                 0                      0
## 126                 TA/TO                 0                      0
## 127                 TA/TO                 0                      0
## 128                 TA/TO                 0                      0
## 129                Direct                 0                      0
## 130                 TA/TO                 0                      0
## 131                 TA/TO                 0                      0
## 132                 TA/TO                 0                      0
## 133                Direct                 0                      0
## 134                Direct                 0                      0
## 135                 TA/TO                 0                      0
## 136                 TA/TO                 0                      0
## 137                 TA/TO                 0                      0
## 138                 TA/TO                 0                      0
## 139                 TA/TO                 0                      0
## 140                 TA/TO                 0                      0
## 141                Direct                 0                      0
## 142                 TA/TO                 0                      0
## 143                 TA/TO                 0                      0
## 144                 TA/TO                 0                      0
## 145                 TA/TO                 0                      0
## 146                 TA/TO                 0                      0
## 147                 TA/TO                 0                      0
## 148                 TA/TO                 0                      0
## 149                Direct                 0                      0
## 150                 TA/TO                 0                      0
## 151                Direct                 0                      0
## 152                 TA/TO                 0                      0
## 153                 TA/TO                 0                      0
## 154                 TA/TO                 0                      0
## 155                 TA/TO                 0                      0
## 156                Direct                 0                      0
## 157                Direct                 0                      0
## 158                 TA/TO                 0                      0
## 159                 TA/TO                 0                      0
## 160                Direct                 0                      0
## 161                 TA/TO                 0                      0
## 162                 TA/TO                 0                      0
## 163                 TA/TO                 0                      0
## 164                 TA/TO                 0                      0
## 165                Direct                 0                      0
## 166                 TA/TO                 0                      0
## 167                 TA/TO                 0                      0
## 168                 TA/TO                 0                      0
## 169                 TA/TO                 0                      0
## 170                 TA/TO                 0                      0
## 171                 TA/TO                 0                      0
## 172                 TA/TO                 0                      0
## 173                 TA/TO                 0                      0
## 174             Corporate                 0                      0
## 175                Direct                 0                      0
## 176                 TA/TO                 0                      0
## 177                 TA/TO                 0                      0
## 178                 TA/TO                 0                      0
## 179                Direct                 0                      0
## 180                 TA/TO                 0                      0
## 181                 TA/TO                 0                      0
## 182                 TA/TO                 0                      0
## 183                Direct                 0                      0
## 184                Direct                 0                      0
## 185                 TA/TO                 0                      0
## 186                Direct                 0                      0
## 187                 TA/TO                 0                      0
## 188                 TA/TO                 0                      0
## 189                 TA/TO                 0                      0
## 190                 TA/TO                 0                      0
## 191                 TA/TO                 0                      0
## 192                 TA/TO                 0                      0
## 193                 TA/TO                 0                      0
## 194                Direct                 0                      0
## 195                 TA/TO                 0                      0
## 196                 TA/TO                 0                      0
## 197                 TA/TO                 0                      0
## 198                 TA/TO                 0                      0
## 199                 TA/TO                 0                      0
## 200                 TA/TO                 0                      0
## 201                 TA/TO                 0                      0
## 202                 TA/TO                 0                      0
## 203                 TA/TO                 0                      0
## 204                Direct                 0                      0
## 205                 TA/TO                 0                      0
## 206                Direct                 0                      0
## 207                Direct                 0                      0
## 208                 TA/TO                 0                      0
## 209                Direct                 0                      0
## 210                 TA/TO                 0                      0
## 211                 TA/TO                 0                      0
## 212                Direct                 0                      0
## 213                 TA/TO                 0                      0
## 214                 TA/TO                 0                      0
## 215                 TA/TO                 0                      0
## 216                 TA/TO                 0                      0
## 217                 TA/TO                 0                      0
## 218                Direct                 0                      0
## 219                 TA/TO                 0                      0
## 220                 TA/TO                 0                      0
## 221                 TA/TO                 0                      0
## 222                 TA/TO                 0                      0
## 223                 TA/TO                 0                      0
## 224                 TA/TO                 0                      0
## 225                 TA/TO                 0                      0
## 226                 TA/TO                 0                      0
## 227                 TA/TO                 0                      0
## 228                 TA/TO                 0                      0
## 229                Direct                 0                      0
## 230                 TA/TO                 0                      0
## 231                 TA/TO                 0                      0
## 232                 TA/TO                 0                      0
## 233                Direct                 0                      0
## 234                 TA/TO                 0                      0
## 235                Direct                 0                      0
## 236                 TA/TO                 0                      0
## 237             Corporate                 0                      0
## 238                 TA/TO                 0                      0
## 239                 TA/TO                 0                      0
## 240                 TA/TO                 0                      0
## 241                 TA/TO                 0                      0
## 242                 TA/TO                 0                      0
## 243                 TA/TO                 0                      0
## 244                Direct                 0                      0
## 245                 TA/TO                 0                      0
## 246                Direct                 0                      0
## 247                 TA/TO                 0                      0
## 248                 TA/TO                 0                      0
## 249                 TA/TO                 0                      0
## 250                 TA/TO                 0                      0
## 251                 TA/TO                 0                      0
## 252                 TA/TO                 0                      0
## 253                 TA/TO                 0                      0
## 254                 TA/TO                 0                      0
## 255                 TA/TO                 0                      0
## 256                 TA/TO                 0                      0
## 257                 TA/TO                 0                      0
## 258                 TA/TO                 0                      0
## 259                 TA/TO                 0                      0
## 260                 TA/TO                 0                      0
## 261                 TA/TO                 0                      0
## 262                 TA/TO                 0                      0
## 263                 TA/TO                 0                      0
## 264                 TA/TO                 0                      0
## 265                 TA/TO                 0                      0
## 266                 TA/TO                 0                      0
## 267                 TA/TO                 0                      0
## 268                 TA/TO                 0                      0
## 269                 TA/TO                 0                      0
## 270                 TA/TO                 0                      0
## 271                 TA/TO                 0                      0
## 272                 TA/TO                 0                      0
## 273                 TA/TO                 0                      0
## 274                 TA/TO                 0                      0
## 275                 TA/TO                 0                      0
## 276                Direct                 0                      0
## 277                 TA/TO                 0                      0
## 278                 TA/TO                 0                      0
## 279                 TA/TO                 0                      0
## 280                 TA/TO                 0                      0
## 281                 TA/TO                 0                      0
## 282                 TA/TO                 0                      0
## 283                 TA/TO                 0                      0
## 284                 TA/TO                 0                      0
## 285                 TA/TO                 0                      0
## 286                 TA/TO                 0                      0
## 287                Direct                 0                      0
## 288                 TA/TO                 0                      0
## 289                 TA/TO                 0                      0
## 290                 TA/TO                 0                      0
## 291                 TA/TO                 0                      0
## 292                 TA/TO                 0                      0
## 293                 TA/TO                 0                      0
## 294                Direct                 0                      0
## 295             Corporate                 0                      0
## 296                Direct                 0                      0
## 297                Direct                 0                      0
## 298                 TA/TO                 0                      0
## 299                Direct                 0                      0
## 300                Direct                 0                      0
## 301                 TA/TO                 0                      0
## 302                 TA/TO                 0                      0
## 303                 TA/TO                 0                      0
## 304                Direct                 0                      0
## 305                Direct                 0                      0
## 306                 TA/TO                 0                      0
## 307                 TA/TO                 0                      0
## 308                 TA/TO                 0                      0
## 309                 TA/TO                 0                      0
## 310             Corporate                 0                      0
## 311                 TA/TO                 0                      0
## 312                 TA/TO                 0                      0
## 313                 TA/TO                 0                      0
## 314                 TA/TO                 0                      0
## 315                Direct                 0                      0
## 316                Direct                 0                      0
## 317                Direct                 0                      0
## 318                 TA/TO                 0                      0
## 319                 TA/TO                 0                      0
## 320                 TA/TO                 0                      0
## 321                Direct                 0                      0
## 322                 TA/TO                 0                      0
## 323                 TA/TO                 0                      0
## 324                 TA/TO                 0                      0
## 325                Direct                 0                      0
## 326             Corporate                 0                      0
## 327                 TA/TO                 0                      0
## 328                 TA/TO                 0                      0
## 329                Direct                 0                      0
## 330                Direct                 0                      0
## 331                Direct                 0                      0
## 332                Direct                 0                      0
## 333                Direct                 0                      0
## 334                 TA/TO                 0                      0
## 335                Direct                 0                      0
## 336                Direct                 0                      0
## 337                Direct                 0                      0
## 338                Direct                 0                      0
## 339                Direct                 0                      0
## 340                Direct                 0                      0
## 341                Direct                 0                      0
## 342                Direct                 0                      0
## 343                Direct                 0                      0
## 344                Direct                 0                      0
## 345                Direct                 0                      0
## 346                Direct                 0                      0
## 347                Direct                 0                      0
## 348                Direct                 0                      0
## 349                 TA/TO                 0                      0
## 350                 TA/TO                 0                      0
## 351                 TA/TO                 0                      0
## 352                Direct                 0                      0
## 353                 TA/TO                 0                      0
## 354                 TA/TO                 0                      0
## 355                Direct                 0                      0
## 356                 TA/TO                 0                      0
## 357                Direct                 0                      0
## 358                Direct                 0                      0
## 359                 TA/TO                 0                      0
## 360                 TA/TO                 0                      0
## 361                 TA/TO                 0                      0
## 362                 TA/TO                 0                      0
## 363                Direct                 0                      0
## 364                 TA/TO                 0                      0
## 365                Direct                 0                      0
## 366                 TA/TO                 0                      0
## 367                 TA/TO                 0                      0
## 368                 TA/TO                 0                      0
## 369                 TA/TO                 0                      0
## 370                Direct                 0                      0
## 371                Direct                 0                      0
## 372                 TA/TO                 0                      0
## 373                 TA/TO                 0                      0
## 374                 TA/TO                 0                      0
## 375                 TA/TO                 0                      0
## 376                Direct                 0                      0
## 377                 TA/TO                 0                      0
## 378                 TA/TO                 0                      0
## 379                 TA/TO                 0                      0
## 380                 TA/TO                 0                      0
## 381                 TA/TO                 0                      0
## 382                Direct                 0                      0
## 383                 TA/TO                 0                      0
## 384                Direct                 0                      0
## 385                 TA/TO                 0                      0
## 386                 TA/TO                 0                      0
## 387                 TA/TO                 0                      0
## 388                 TA/TO                 0                      0
## 389                 TA/TO                 0                      0
## 390                 TA/TO                 0                      0
## 391                 TA/TO                 0                      0
## 392                Direct                 0                      0
## 393                Direct                 0                      0
## 394                 TA/TO                 0                      0
## 395                 TA/TO                 0                      0
## 396                 TA/TO                 0                      0
## 397                 TA/TO                 0                      0
## 398                 TA/TO                 0                      0
## 399                 TA/TO                 0                      0
## 400                 TA/TO                 0                      0
## 401                 TA/TO                 0                      0
## 402                 TA/TO                 0                      0
## 403                 TA/TO                 0                      0
## 404                Direct                 0                      0
## 405                 TA/TO                 0                      0
## 406                Direct                 0                      0
## 407                 TA/TO                 0                      0
## 408                 TA/TO                 0                      0
## 409                Direct                 0                      0
## 410                Direct                 0                      0
## 411                 TA/TO                 0                      0
## 412                 TA/TO                 0                      0
## 413                 TA/TO                 0                      0
## 414                Direct                 0                      0
## 415                Direct                 0                      0
## 416                Direct                 0                      0
## 417                 TA/TO                 0                      0
## 418                Direct                 0                      0
## 419                Direct                 0                      0
## 420                 TA/TO                 0                      0
## 421                 TA/TO                 0                      0
## 422                Direct                 0                      0
## 423                Direct                 0                      0
## 424                Direct                 0                      0
## 425                Direct                 0                      0
## 426                 TA/TO                 0                      0
## 427                 TA/TO                 0                      0
## 428                 TA/TO                 0                      0
## 429                Direct                 0                      0
## 430                 TA/TO                 0                      0
## 431                Direct                 0                      0
## 432                 TA/TO                 0                      0
## 433                 TA/TO                 0                      0
## 434                 TA/TO                 0                      0
## 435                Direct                 0                      0
## 436                Direct                 0                      0
## 437                 TA/TO                 0                      0
## 438                 TA/TO                 0                      0
## 439                 TA/TO                 0                      0
## 440                 TA/TO                 0                      0
## 441                 TA/TO                 0                      0
## 442                 TA/TO                 0                      0
## 443                 TA/TO                 0                      0
## 444                 TA/TO                 0                      0
## 445                 TA/TO                 0                      0
## 446                 TA/TO                 0                      0
## 447                 TA/TO                 0                      0
## 448                 TA/TO                 0                      0
## 449                 TA/TO                 0                      0
## 450                 TA/TO                 0                      0
## 451                 TA/TO                 0                      0
## 452                 TA/TO                 0                      0
## 453                Direct                 0                      0
## 454                 TA/TO                 0                      0
## 455                 TA/TO                 0                      0
## 456                Direct                 0                      0
## 457                 TA/TO                 0                      0
## 458                 TA/TO                 0                      0
## 459                 TA/TO                 0                      0
## 460                 TA/TO                 0                      0
## 461                 TA/TO                 0                      0
## 462                 TA/TO                 0                      0
## 463                 TA/TO                 0                      0
## 464                 TA/TO                 0                      0
## 465                 TA/TO                 0                      0
## 466             Corporate                 0                      0
## 467                 TA/TO                 0                      0
## 468                Direct                 0                      0
## 469                Direct                 0                      0
## 470                 TA/TO                 0                      0
## 471                 TA/TO                 0                      0
## 472                 TA/TO                 0                      0
## 473                Direct                 0                      0
## 474                 TA/TO                 0                      0
## 475                Direct                 0                      0
## 476                 TA/TO                 0                      0
## 477                 TA/TO                 0                      0
## 478                 TA/TO                 0                      0
## 479                 TA/TO                 0                      0
## 480                Direct                 0                      0
## 481                 TA/TO                 0                      0
## 482                 TA/TO                 0                      0
## 483                 TA/TO                 0                      0
## 484                 TA/TO                 0                      0
## 485                 TA/TO                 0                      0
## 486                 TA/TO                 0                      0
## 487                 TA/TO                 0                      0
## 488                 TA/TO                 0                      0
## 489                 TA/TO                 0                      0
## 490                 TA/TO                 0                      0
## 491                 TA/TO                 0                      0
## 492                Direct                 0                      0
## 493                 TA/TO                 0                      0
## 494                 TA/TO                 0                      0
## 495                 TA/TO                 0                      0
## 496                 TA/TO                 0                      0
## 497                 TA/TO                 0                      0
## 498                 TA/TO                 0                      0
## 499                 TA/TO                 0                      0
## 500                Direct                 0                      0
## 501                 TA/TO                 0                      0
## 502                 TA/TO                 0                      0
## 503                 TA/TO                 0                      0
## 504                 TA/TO                 0                      0
## 505                 TA/TO                 0                      0
## 506                 TA/TO                 0                      0
## 507                 TA/TO                 0                      0
## 508                 TA/TO                 0                      0
## 509                Direct                 0                      0
## 510                 TA/TO                 0                      0
## 511                 TA/TO                 0                      0
## 512                 TA/TO                 0                      0
## 513                 TA/TO                 0                      0
## 514                 TA/TO                 0                      0
## 515                 TA/TO                 0                      0
## 516                 TA/TO                 0                      0
## 517                Direct                 0                      0
## 518                Direct                 0                      0
## 519                 TA/TO                 0                      0
## 520                 TA/TO                 0                      0
## 521                 TA/TO                 0                      0
## 522                 TA/TO                 0                      0
## 523                 TA/TO                 0                      0
## 524                 TA/TO                 0                      0
## 525                 TA/TO                 0                      0
## 526                 TA/TO                 0                      0
## 527                 TA/TO                 0                      0
## 528                 TA/TO                 0                      0
## 529                Direct                 0                      0
## 530                 TA/TO                 0                      0
## 531                 TA/TO                 0                      0
## 532                Direct                 0                      0
## 533                Direct                 0                      0
## 534                 TA/TO                 0                      0
## 535                Direct                 0                      0
## 536                 TA/TO                 0                      0
## 537                 TA/TO                 0                      0
## 538                 TA/TO                 0                      0
## 539                 TA/TO                 0                      0
## 540                 TA/TO                 0                      0
## 541                Direct                 0                      0
## 542                 TA/TO                 0                      0
## 543                Direct                 0                      0
## 544                 TA/TO                 0                      0
## 545                 TA/TO                 0                      0
## 546                 TA/TO                 0                      0
## 547                 TA/TO                 0                      0
## 548                Direct                 0                      0
## 549                Direct                 0                      0
## 550                 TA/TO                 0                      0
## 551                 TA/TO                 0                      0
## 552                 TA/TO                 0                      0
## 553                 TA/TO                 0                      0
## 554                 TA/TO                 0                      0
## 555                 TA/TO                 0                      0
## 556                 TA/TO                 0                      0
## 557                 TA/TO                 0                      0
## 558                 TA/TO                 0                      0
## 559                 TA/TO                 0                      0
## 560                 TA/TO                 0                      0
## 561                 TA/TO                 0                      0
## 562                 TA/TO                 0                      0
## 563                 TA/TO                 0                      0
## 564                 TA/TO                 0                      0
## 565                Direct                 0                      0
## 566                 TA/TO                 0                      0
## 567                Direct                 0                      0
## 568                 TA/TO                 0                      0
## 569                 TA/TO                 0                      0
## 570                 TA/TO                 0                      0
## 571                 TA/TO                 0                      0
## 572                 TA/TO                 0                      0
## 573                Direct                 0                      0
## 574                Direct                 0                      0
## 575                Direct                 0                      0
## 576                 TA/TO                 0                      0
## 577                 TA/TO                 0                      0
## 578                 TA/TO                 0                      0
## 579                 TA/TO                 0                      0
## 580                 TA/TO                 0                      0
## 581                Direct                 0                      0
## 582                 TA/TO                 0                      0
## 583                 TA/TO                 0                      0
## 584                Direct                 0                      0
## 585                 TA/TO                 0                      0
## 586                 TA/TO                 0                      0
## 587                 TA/TO                 0                      0
## 588                 TA/TO                 0                      0
## 589                Direct                 0                      0
## 590                Direct                 0                      0
## 591                 TA/TO                 0                      0
## 592                 TA/TO                 0                      0
## 593                 TA/TO                 0                      0
## 594                 TA/TO                 0                      0
## 595                Direct                 0                      0
## 596                 TA/TO                 0                      0
## 597                 TA/TO                 0                      0
## 598                 TA/TO                 0                      0
## 599                 TA/TO                 0                      0
## 600                 TA/TO                 0                      0
## 601                 TA/TO                 0                      0
## 602                 TA/TO                 0                      0
## 603                Direct                 0                      0
## 604                 TA/TO                 0                      0
## 605                 TA/TO                 0                      0
## 606                 TA/TO                 0                      0
## 607                Direct                 0                      0
## 608                Direct                 0                      0
## 609                Direct                 0                      0
## 610                Direct                 0                      0
## 611                 TA/TO                 0                      0
## 612                 TA/TO                 0                      0
## 613                Direct                 0                      0
## 614                 TA/TO                 0                      0
## 615                 TA/TO                 0                      0
## 616                 TA/TO                 0                      0
## 617                 TA/TO                 0                      0
## 618                 TA/TO                 0                      0
## 619                Direct                 0                      0
## 620                Direct                 0                      0
## 621                Direct                 0                      0
## 622                 TA/TO                 0                      0
## 623                 TA/TO                 0                      0
## 624                 TA/TO                 0                      0
## 625                 TA/TO                 0                      0
## 626                Direct                 0                      0
## 627                 TA/TO                 0                      0
## 628                 TA/TO                 0                      0
## 629                 TA/TO                 0                      0
## 630                Direct                 0                      0
## 631                 TA/TO                 0                      0
## 632                 TA/TO                 0                      0
## 633                 TA/TO                 0                      0
## 634                 TA/TO                 0                      0
## 635                 TA/TO                 0                      0
## 636                Direct                 0                      0
## 637                 TA/TO                 0                      0
## 638                Direct                 0                      0
## 639                 TA/TO                 0                      0
## 640                 TA/TO                 0                      0
## 641                 TA/TO                 0                      0
## 642                 TA/TO                 0                      0
## 643                 TA/TO                 0                      0
## 644                Direct                 0                      0
## 645                 TA/TO                 0                      0
## 646             Corporate                 0                      0
## 647                 TA/TO                 0                      0
## 648                 TA/TO                 0                      0
## 649                 TA/TO                 0                      0
## 650                Direct                 0                      0
## 651                 TA/TO                 0                      0
## 652                 TA/TO                 0                      0
## 653                 TA/TO                 0                      0
## 654                 TA/TO                 0                      0
## 655                 TA/TO                 0                      0
## 656                 TA/TO                 0                      0
## 657                 TA/TO                 0                      0
## 658                 TA/TO                 0                      0
## 659                 TA/TO                 0                      0
## 660                 TA/TO                 0                      0
## 661                 TA/TO                 0                      0
## 662                 TA/TO                 0                      0
## 663                 TA/TO                 0                      0
## 664                 TA/TO                 0                      0
## 665                Direct                 0                      0
## 666                 TA/TO                 0                      0
## 667                 TA/TO                 0                      0
## 668                 TA/TO                 0                      0
## 669                 TA/TO                 0                      0
## 670                Direct                 0                      0
## 671                 TA/TO                 0                      0
## 672                 TA/TO                 0                      0
## 673                 TA/TO                 0                      0
## 674                 TA/TO                 0                      0
## 675                 TA/TO                 0                      0
## 676                 TA/TO                 0                      0
## 677                Direct                 0                      0
## 678                 TA/TO                 0                      0
## 679                 TA/TO                 0                      0
## 680                 TA/TO                 0                      0
## 681                 TA/TO                 0                      0
## 682                 TA/TO                 0                      0
## 683                 TA/TO                 0                      0
## 684                 TA/TO                 0                      0
## 685                 TA/TO                 0                      0
## 686                 TA/TO                 0                      0
## 687                 TA/TO                 0                      0
## 688                 TA/TO                 0                      0
## 689                 TA/TO                 0                      0
## 690                 TA/TO                 0                      0
## 691                Direct                 0                      0
## 692                 TA/TO                 0                      0
## 693                 TA/TO                 0                      0
## 694                 TA/TO                 0                      0
## 695                 TA/TO                 0                      0
## 696                 TA/TO                 0                      0
## 697                 TA/TO                 0                      0
## 698                 TA/TO                 0                      0
## 699                 TA/TO                 0                      0
## 700                 TA/TO                 0                      0
## 701             Corporate                 0                      0
## 702                 TA/TO                 0                      0
## 703                 TA/TO                 0                      0
## 704                 TA/TO                 0                      0
## 705                 TA/TO                 0                      0
## 706                 TA/TO                 0                      0
## 707             Corporate                 0                      0
## 708             Corporate                 0                      0
## 709                 TA/TO                 0                      0
## 710                 TA/TO                 0                      0
## 711                 TA/TO                 0                      0
## 712                 TA/TO                 0                      0
## 713                 TA/TO                 0                      0
## 714                 TA/TO                 0                      0
## 715                Direct                 0                      0
## 716                 TA/TO                 0                      0
## 717                 TA/TO                 0                      0
## 718                Direct                 0                      0
## 719                Direct                 0                      0
## 720                 TA/TO                 0                      0
## 721                 TA/TO                 0                      0
## 722                 TA/TO                 0                      0
## 723                 TA/TO                 0                      0
## 724                 TA/TO                 0                      0
## 725                 TA/TO                 0                      0
## 726                 TA/TO                 0                      0
## 727                Direct                 0                      0
## 728                 TA/TO                 0                      0
## 729                 TA/TO                 0                      0
## 730                Direct                 0                      0
## 731                 TA/TO                 0                      0
## 732                 TA/TO                 0                      0
## 733                Direct                 0                      0
## 734                 TA/TO                 0                      0
## 735                Direct                 0                      0
## 736                 TA/TO                 0                      0
## 737                 TA/TO                 0                      0
## 738                 TA/TO                 0                      0
## 739                 TA/TO                 0                      0
## 740                Direct                 0                      0
## 741                 TA/TO                 0                      0
## 742                Direct                 0                      0
## 743                 TA/TO                 0                      0
## 744                 TA/TO                 0                      0
## 745                 TA/TO                 0                      0
## 746                Direct                 0                      0
## 747                 TA/TO                 0                      0
## 748                 TA/TO                 0                      0
## 749             Corporate                 0                      0
## 750             Corporate                 0                      0
## 751             Corporate                 0                      0
## 752             Corporate                 0                      0
## 753                 TA/TO                 0                      0
## 754             Corporate                 0                      0
## 755             Corporate                 0                      0
## 756                 TA/TO                 0                      0
## 757                 TA/TO                 0                      0
## 758                 TA/TO                 0                      0
## 759                 TA/TO                 0                      0
## 760                Direct                 0                      0
## 761                 TA/TO                 0                      0
## 762                 TA/TO                 0                      0
## 763                 TA/TO                 0                      0
## 764                 TA/TO                 0                      0
## 765                Direct                 0                      0
## 766                 TA/TO                 0                      0
## 767                 TA/TO                 0                      0
## 768                 TA/TO                 0                      0
## 769                 TA/TO                 0                      0
## 770                 TA/TO                 0                      0
## 771                 TA/TO                 0                      0
## 772                 TA/TO                 0                      0
## 773                 TA/TO                 0                      0
## 774                Direct                 0                      0
## 775                 TA/TO                 0                      0
## 776                 TA/TO                 0                      0
## 777                 TA/TO                 0                      0
## 778                 TA/TO                 0                      0
## 779                 TA/TO                 0                      0
## 780                Direct                 0                      0
## 781                 TA/TO                 0                      0
## 782                Direct                 0                      0
## 783                 TA/TO                 0                      0
## 784                 TA/TO                 0                      0
## 785                 TA/TO                 0                      0
## 786                 TA/TO                 0                      0
## 787                Direct                 0                      0
## 788                 TA/TO                 0                      0
## 789                 TA/TO                 0                      0
## 790                 TA/TO                 0                      0
## 791                Direct                 0                      0
## 792                 TA/TO                 0                      0
## 793                 TA/TO                 0                      0
## 794                 TA/TO                 0                      0
## 795                 TA/TO                 0                      0
## 796                 TA/TO                 0                      0
## 797                 TA/TO                 0                      0
## 798                 TA/TO                 0                      0
## 799                 TA/TO                 0                      0
## 800                Direct                 0                      0
## 801                 TA/TO                 0                      0
## 802                Direct                 0                      0
## 803                 TA/TO                 0                      0
## 804                Direct                 0                      0
## 805                 TA/TO                 0                      0
## 806                 TA/TO                 0                      0
## 807                 TA/TO                 0                      0
## 808                 TA/TO                 0                      0
## 809                 TA/TO                 0                      0
## 810                 TA/TO                 0                      0
## 811                Direct                 0                      0
## 812                Direct                 0                      0
## 813                 TA/TO                 0                      0
## 814                 TA/TO                 0                      0
## 815                Direct                 0                      0
## 816                 TA/TO                 0                      0
## 817                 TA/TO                 0                      0
## 818                 TA/TO                 0                      0
## 819                 TA/TO                 0                      0
## 820                Direct                 0                      0
## 821                 TA/TO                 0                      0
## 822                Direct                 0                      0
## 823                Direct                 0                      0
## 824                 TA/TO                 0                      0
## 825                 TA/TO                 0                      0
## 826                Direct                 0                      0
## 827                 TA/TO                 0                      0
## 828                Direct                 0                      0
## 829                 TA/TO                 0                      0
## 830                Direct                 0                      0
## 831                 TA/TO                 0                      0
## 832                Direct                 0                      0
## 833                 TA/TO                 0                      0
## 834                 TA/TO                 0                      0
## 835                 TA/TO                 0                      0
## 836                 TA/TO                 0                      0
## 837                 TA/TO                 0                      0
## 838             Corporate                 0                      0
## 839                 TA/TO                 0                      0
## 840                Direct                 0                      0
## 841                Direct                 0                      0
## 842                 TA/TO                 0                      0
## 843                 TA/TO                 0                      0
## 844                 TA/TO                 0                      0
## 845                Direct                 0                      0
## 846                Direct                 0                      0
## 847                Direct                 0                      0
## 848                 TA/TO                 0                      0
## 849                 TA/TO                 0                      0
## 850                 TA/TO                 0                      0
## 851                 TA/TO                 0                      0
## 852                Direct                 0                      0
## 853                 TA/TO                 0                      0
## 854                Direct                 0                      0
## 855                 TA/TO                 0                      0
## 856                Direct                 0                      0
## 857                 TA/TO                 0                      0
## 858                 TA/TO                 0                      0
## 859                 TA/TO                 0                      0
## 860                 TA/TO                 0                      0
## 861                 TA/TO                 0                      0
## 862                 TA/TO                 0                      0
## 863                 TA/TO                 0                      0
## 864                 TA/TO                 0                      0
## 865                Direct                 0                      0
## 866                Direct                 0                      0
## 867                Direct                 0                      0
## 868                Direct                 0                      0
## 869                 TA/TO                 0                      0
## 870                 TA/TO                 0                      0
## 871                Direct                 0                      0
## 872                Direct                 0                      0
## 873                 TA/TO                 0                      0
## 874                Direct                 0                      0
## 875                Direct                 0                      0
## 876                Direct                 0                      0
## 877                 TA/TO                 0                      0
## 878                 TA/TO                 0                      0
## 879                 TA/TO                 0                      0
## 880                 TA/TO                 0                      0
## 881                 TA/TO                 0                      0
## 882                Direct                 0                      0
## 883                Direct                 0                      0
## 884                 TA/TO                 0                      0
## 885                 TA/TO                 0                      0
## 886                 TA/TO                 0                      0
## 887                 TA/TO                 0                      0
## 888                 TA/TO                 0                      0
## 889                Direct                 0                      0
## 890                 TA/TO                 0                      0
## 891                 TA/TO                 0                      0
## 892                Direct                 0                      0
## 893                 TA/TO                 0                      0
## 894                 TA/TO                 0                      0
## 895                 TA/TO                 0                      0
## 896                 TA/TO                 0                      0
## 897                 TA/TO                 0                      0
## 898                Direct                 0                      0
## 899                 TA/TO                 0                      0
## 900                 TA/TO                 0                      0
## 901                Direct                 0                      0
## 902                Direct                 0                      0
## 903                 TA/TO                 0                      0
## 904                Direct                 0                      0
## 905                 TA/TO                 0                      0
## 906                 TA/TO                 0                      0
## 907                 TA/TO                 0                      0
## 908                 TA/TO                 0                      0
## 909                 TA/TO                 0                      0
## 910                 TA/TO                 0                      0
## 911                Direct                 0                      0
## 912                 TA/TO                 0                      0
## 913                 TA/TO                 0                      0
## 914                 TA/TO                 0                      0
## 915                 TA/TO                 0                      0
## 916                 TA/TO                 0                      0
## 917                Direct                 0                      0
## 918                 TA/TO                 0                      0
## 919                 TA/TO                 0                      0
## 920                 TA/TO                 0                      0
## 921                 TA/TO                 0                      0
## 922                 TA/TO                 0                      0
## 923                 TA/TO                 0                      0
## 924                 TA/TO                 0                      0
## 925                Direct                 0                      0
## 926                 TA/TO                 0                      0
## 927                 TA/TO                 0                      0
## 928                 TA/TO                 0                      0
## 929                 TA/TO                 0                      0
## 930                 TA/TO                 0                      0
## 931                 TA/TO                 0                      0
## 932                Direct                 0                      0
## 933                Direct                 0                      0
## 934                Direct                 0                      0
## 935                 TA/TO                 0                      0
## 936                 TA/TO                 0                      0
## 937                Direct                 0                      0
## 938                Direct                 0                      0
## 939                Direct                 0                      0
## 940                Direct                 0                      0
## 941                 TA/TO                 0                      0
## 942                 TA/TO                 0                      0
## 943                 TA/TO                 0                      0
## 944                 TA/TO                 0                      0
## 945                 TA/TO                 0                      0
## 946                 TA/TO                 0                      0
## 947                 TA/TO                 0                      0
## 948                 TA/TO                 0                      0
## 949                 TA/TO                 0                      0
## 950             Corporate                 0                      0
## 951                 TA/TO                 0                      0
## 952                 TA/TO                 0                      0
## 953                 TA/TO                 0                      0
## 954                Direct                 0                      0
## 955                 TA/TO                 0                      0
## 956                 TA/TO                 0                      0
## 957                Direct                 0                      0
## 958                Direct                 0                      0
## 959                 TA/TO                 0                      0
## 960                Direct                 0                      0
## 961                Direct                 0                      0
## 962                Direct                 0                      0
## 963                Direct                 0                      0
## 964                Direct                 0                      0
## 965                Direct                 0                      0
## 966                 TA/TO                 0                      0
## 967                 TA/TO                 0                      0
## 968                 TA/TO                 0                      0
## 969                 TA/TO                 0                      0
## 970                 TA/TO                 0                      0
## 971                Direct                 0                      0
## 972                 TA/TO                 0                      0
## 973                Direct                 0                      0
## 974                 TA/TO                 0                      0
## 975                 TA/TO                 0                      0
## 976                 TA/TO                 0                      0
## 977                 TA/TO                 0                      0
## 978                 TA/TO                 0                      0
## 979             Corporate                 0                      0
## 980                 TA/TO                 0                      0
## 981                Direct                 0                      0
## 982                 TA/TO                 0                      0
## 983                 TA/TO                 0                      0
## 984                 TA/TO                 0                      0
## 985                 TA/TO                 0                      0
## 986                 TA/TO                 0                      0
## 987                 TA/TO                 0                      0
## 988                 TA/TO                 0                      0
## 989                Direct                 0                      0
## 990                 TA/TO                 0                      0
## 991                 TA/TO                 0                      0
## 992                 TA/TO                 0                      0
## 993                 TA/TO                 0                      0
## 994                 TA/TO                 0                      0
## 995                Direct                 0                      0
## 996                 TA/TO                 0                      0
## 997                 TA/TO                 0                      0
## 998                 TA/TO                 0                      0
## 999                Direct                 0                      0
## 1000               Direct                 0                      0
## 1001               Direct                 0                      0
## 1002                TA/TO                 0                      0
## 1003                TA/TO                 0                      0
## 1004               Direct                 0                      0
## 1005                TA/TO                 0                      0
## 1006                TA/TO                 0                      0
## 1007                TA/TO                 0                      0
## 1008               Direct                 0                      0
## 1009                TA/TO                 0                      0
## 1010                TA/TO                 0                      0
## 1011                TA/TO                 0                      0
## 1012                TA/TO                 0                      0
## 1013               Direct                 0                      0
## 1014                TA/TO                 0                      0
## 1015                TA/TO                 0                      0
## 1016                TA/TO                 0                      0
## 1017               Direct                 0                      0
## 1018               Direct                 0                      0
## 1019                TA/TO                 0                      0
## 1020                TA/TO                 0                      0
## 1021                TA/TO                 0                      0
## 1022                TA/TO                 0                      0
## 1023               Direct                 0                      0
## 1024                TA/TO                 0                      0
## 1025                TA/TO                 0                      0
## 1026               Direct                 0                      0
## 1027                TA/TO                 0                      0
## 1028                TA/TO                 0                      0
## 1029                TA/TO                 0                      0
## 1030                TA/TO                 0                      0
## 1031                TA/TO                 0                      0
## 1032                TA/TO                 0                      0
## 1033                TA/TO                 0                      0
## 1034                TA/TO                 0                      0
## 1035               Direct                 0                      0
## 1036               Direct                 0                      0
## 1037                TA/TO                 0                      0
## 1038                TA/TO                 0                      0
## 1039                TA/TO                 0                      0
## 1040                TA/TO                 0                      0
## 1041               Direct                 0                      0
## 1042               Direct                 0                      0
## 1043                TA/TO                 0                      0
## 1044                TA/TO                 0                      0
## 1045                TA/TO                 0                      0
## 1046                TA/TO                 0                      0
## 1047               Direct                 0                      0
## 1048                TA/TO                 0                      0
## 1049               Direct                 0                      0
## 1050            Corporate                 0                      0
## 1051                TA/TO                 0                      0
## 1052                TA/TO                 0                      0
## 1053                TA/TO                 0                      0
## 1054               Direct                 0                      0
## 1055                TA/TO                 0                      0
## 1056                TA/TO                 0                      0
## 1057                TA/TO                 0                      0
## 1058                TA/TO                 0                      0
## 1059                TA/TO                 0                      0
## 1060                TA/TO                 0                      0
## 1061                TA/TO                 0                      0
## 1062                TA/TO                 0                      0
## 1063                TA/TO                 0                      0
## 1064                TA/TO                 0                      0
## 1065                TA/TO                 0                      0
## 1066                TA/TO                 0                      0
## 1067                TA/TO                 0                      0
## 1068                TA/TO                 0                      0
## 1069               Direct                 0                      0
## 1070                TA/TO                 0                      0
## 1071                TA/TO                 0                      0
## 1072                TA/TO                 0                      0
## 1073                TA/TO                 0                      0
## 1074                TA/TO                 0                      0
## 1075                TA/TO                 0                      0
## 1076                TA/TO                 0                      0
## 1077                TA/TO                 0                      0
## 1078                TA/TO                 0                      0
## 1079                TA/TO                 0                      0
## 1080                TA/TO                 0                      0
## 1081                TA/TO                 0                      0
## 1082               Direct                 0                      0
## 1083                TA/TO                 0                      0
## 1084                TA/TO                 0                      0
## 1085                TA/TO                 0                      0
## 1086               Direct                 0                      0
## 1087               Direct                 0                      0
## 1088                TA/TO                 0                      0
## 1089                TA/TO                 0                      0
## 1090               Direct                 0                      0
## 1091                TA/TO                 0                      0
## 1092                TA/TO                 0                      0
## 1093                TA/TO                 0                      0
## 1094                TA/TO                 0                      0
## 1095                TA/TO                 0                      0
## 1096                TA/TO                 0                      0
## 1097                TA/TO                 0                      0
## 1098                TA/TO                 0                      0
## 1099                TA/TO                 0                      0
## 1100                TA/TO                 0                      0
## 1101                TA/TO                 0                      0
## 1102                TA/TO                 0                      0
## 1103               Direct                 0                      0
## 1104                TA/TO                 0                      0
## 1105                TA/TO                 0                      0
## 1106               Direct                 0                      0
## 1107                TA/TO                 0                      0
## 1108                TA/TO                 0                      0
## 1109               Direct                 0                      0
## 1110               Direct                 0                      0
## 1111                TA/TO                 0                      0
## 1112                TA/TO                 0                      0
## 1113                TA/TO                 0                      0
## 1114                TA/TO                 0                      0
## 1115               Direct                 0                      0
## 1116                TA/TO                 0                      0
## 1117                TA/TO                 0                      0
## 1118                TA/TO                 0                      0
## 1119                TA/TO                 0                      0
## 1120                TA/TO                 0                      0
## 1121                TA/TO                 0                      0
## 1122                TA/TO                 0                      0
## 1123                TA/TO                 0                      0
## 1124                TA/TO                 0                      0
## 1125               Direct                 0                      0
## 1126                TA/TO                 0                      0
## 1127                TA/TO                 0                      0
## 1128                TA/TO                 0                      0
## 1129                TA/TO                 0                      0
## 1130               Direct                 0                      0
## 1131                TA/TO                 0                      0
## 1132                TA/TO                 0                      0
## 1133                TA/TO                 0                      0
## 1134                TA/TO                 0                      0
## 1135                TA/TO                 0                      0
## 1136                TA/TO                 0                      0
## 1137                TA/TO                 0                      0
## 1138                TA/TO                 0                      0
## 1139               Direct                 0                      0
## 1140                TA/TO                 0                      0
## 1141                TA/TO                 0                      0
## 1142                TA/TO                 0                      0
## 1143                TA/TO                 0                      0
## 1144            Corporate                 0                      0
## 1145                TA/TO                 0                      0
## 1146                TA/TO                 0                      0
## 1147               Direct                 0                      0
## 1148                TA/TO                 0                      0
## 1149               Direct                 0                      0
## 1150               Direct                 0                      0
## 1151                TA/TO                 0                      0
## 1152                TA/TO                 0                      0
## 1153                TA/TO                 0                      0
## 1154                TA/TO                 0                      0
## 1155                TA/TO                 0                      0
## 1156                TA/TO                 0                      0
## 1157                TA/TO                 0                      0
## 1158                TA/TO                 0                      0
## 1159                TA/TO                 0                      0
## 1160                TA/TO                 0                      0
## 1161               Direct                 0                      0
## 1162               Direct                 0                      0
## 1163               Direct                 0                      0
## 1164               Direct                 0                      0
## 1165               Direct                 0                      0
## 1166               Direct                 0                      0
## 1167                TA/TO                 0                      0
## 1168               Direct                 0                      0
## 1169               Direct                 0                      0
## 1170                TA/TO                 0                      0
## 1171                TA/TO                 0                      0
## 1172                TA/TO                 0                      0
## 1173               Direct                 0                      0
## 1174                TA/TO                 0                      0
## 1175                TA/TO                 0                      0
## 1176               Direct                 0                      0
## 1177               Direct                 0                      0
## 1178                TA/TO                 0                      0
## 1179               Direct                 0                      0
## 1180                TA/TO                 0                      0
## 1181                TA/TO                 0                      0
## 1182                TA/TO                 0                      0
## 1183                TA/TO                 0                      0
## 1184                TA/TO                 0                      0
## 1185                TA/TO                 0                      0
## 1186                TA/TO                 0                      0
## 1187               Direct                 0                      0
## 1188                TA/TO                 0                      0
## 1189                TA/TO                 0                      0
## 1190                TA/TO                 0                      0
## 1191                TA/TO                 0                      0
## 1192                TA/TO                 0                      0
## 1193                TA/TO                 0                      0
## 1194                TA/TO                 0                      0
## 1195                TA/TO                 0                      0
## 1196                TA/TO                 0                      0
## 1197                TA/TO                 0                      0
## 1198                TA/TO                 0                      0
## 1199               Direct                 0                      0
## 1200                TA/TO                 0                      0
## 1201                TA/TO                 0                      0
## 1202                TA/TO                 0                      0
## 1203                TA/TO                 0                      0
## 1204                TA/TO                 0                      0
## 1205                TA/TO                 0                      0
## 1206                TA/TO                 0                      0
## 1207                TA/TO                 0                      0
## 1208                TA/TO                 0                      0
## 1209                TA/TO                 0                      0
## 1210                TA/TO                 0                      0
## 1211                TA/TO                 0                      0
## 1212                TA/TO                 0                      0
## 1213                TA/TO                 0                      0
## 1214                TA/TO                 0                      0
## 1215                TA/TO                 0                      0
## 1216                TA/TO                 0                      0
## 1217                TA/TO                 0                      0
## 1218                TA/TO                 0                      0
## 1219                TA/TO                 0                      0
## 1220                TA/TO                 0                      0
## 1221                TA/TO                 0                      0
## 1222                TA/TO                 0                      0
## 1223                TA/TO                 0                      0
## 1224                TA/TO                 0                      0
## 1225               Direct                 0                      0
## 1226                TA/TO                 0                      0
## 1227                TA/TO                 0                      0
## 1228                TA/TO                 0                      0
## 1229            Corporate                 0                      0
## 1230            Corporate                 0                      0
## 1231            Corporate                 0                      0
## 1232                TA/TO                 0                      0
## 1233                TA/TO                 0                      0
## 1234                TA/TO                 0                      0
## 1235                TA/TO                 0                      0
## 1236               Direct                 0                      0
## 1237                TA/TO                 0                      0
## 1238                TA/TO                 0                      0
## 1239                TA/TO                 0                      0
## 1240                TA/TO                 0                      0
## 1241                TA/TO                 0                      0
## 1242                TA/TO                 0                      0
## 1243                TA/TO                 0                      0
## 1244                TA/TO                 0                      0
## 1245                TA/TO                 0                      0
## 1246                TA/TO                 0                      0
## 1247                TA/TO                 0                      0
## 1248                TA/TO                 0                      0
## 1249                TA/TO                 0                      0
## 1250               Direct                 0                      0
## 1251                TA/TO                 0                      0
## 1252               Direct                 0                      0
## 1253               Direct                 0                      0
## 1254                TA/TO                 0                      0
## 1255                TA/TO                 0                      0
## 1256                TA/TO                 0                      0
## 1257                TA/TO                 0                      0
## 1258               Direct                 0                      0
## 1259               Direct                 0                      0
## 1260                TA/TO                 0                      0
## 1261                TA/TO                 0                      0
## 1262                TA/TO                 0                      0
## 1263                TA/TO                 0                      0
## 1264                TA/TO                 0                      0
## 1265                TA/TO                 0                      0
## 1266            Corporate                 0                      0
## 1267               Direct                 0                      0
## 1268                TA/TO                 0                      0
## 1269                TA/TO                 0                      0
## 1270               Direct                 0                      0
## 1271                TA/TO                 0                      0
## 1272                TA/TO                 0                      0
## 1273                TA/TO                 0                      0
## 1274            Corporate                 0                      0
## 1275                TA/TO                 0                      0
## 1276                TA/TO                 0                      0
## 1277                TA/TO                 0                      0
## 1278                TA/TO                 0                      0
## 1279                TA/TO                 0                      0
## 1280                TA/TO                 0                      0
## 1281                TA/TO                 0                      0
## 1282                TA/TO                 0                      0
## 1283                TA/TO                 0                      0
## 1284                TA/TO                 0                      0
## 1285                TA/TO                 0                      0
## 1286                TA/TO                 0                      0
## 1287                TA/TO                 0                      0
## 1288                TA/TO                 0                      0
## 1289                TA/TO                 0                      0
## 1290                TA/TO                 0                      0
## 1291                TA/TO                 0                      0
## 1292                TA/TO                 0                      0
## 1293                TA/TO                 0                      0
## 1294                TA/TO                 0                      0
## 1295                TA/TO                 0                      0
## 1296                TA/TO                 0                      0
## 1297                TA/TO                 0                      0
## 1298                TA/TO                 0                      0
## 1299                TA/TO                 0                      0
## 1300                TA/TO                 0                      0
## 1301                TA/TO                 0                      0
## 1302                TA/TO                 0                      0
## 1303                TA/TO                 0                      0
## 1304               Direct                 0                      0
## 1305               Direct                 0                      0
## 1306            Corporate                 0                      0
## 1307            Corporate                 0                      0
## 1308                TA/TO                 0                      0
## 1309                TA/TO                 0                      0
## 1310                TA/TO                 0                      0
## 1311                TA/TO                 0                      0
## 1312                TA/TO                 0                      0
## 1313                TA/TO                 0                      0
## 1314                TA/TO                 0                      0
## 1315                TA/TO                 0                      0
## 1316                TA/TO                 0                      0
## 1317                TA/TO                 0                      0
## 1318                TA/TO                 0                      0
## 1319                TA/TO                 0                      0
## 1320                TA/TO                 0                      0
## 1321                TA/TO                 0                      0
## 1322                TA/TO                 0                      0
## 1323                TA/TO                 0                      0
## 1324                TA/TO                 0                      0
## 1325                TA/TO                 0                      0
## 1326                TA/TO                 0                      0
## 1327               Direct                 0                      0
## 1328                TA/TO                 0                      0
## 1329                TA/TO                 0                      0
## 1330                TA/TO                 0                      0
## 1331               Direct                 0                      0
## 1332                TA/TO                 0                      0
## 1333               Direct                 0                      0
## 1334                TA/TO                 0                      0
## 1335                TA/TO                 0                      0
## 1336               Direct                 0                      0
## 1337                TA/TO                 0                      0
## 1338               Direct                 0                      0
## 1339                TA/TO                 0                      0
## 1340                TA/TO                 0                      0
## 1341                TA/TO                 0                      0
## 1342                TA/TO                 0                      0
## 1343                TA/TO                 0                      0
## 1344                TA/TO                 0                      0
## 1345                TA/TO                 0                      0
## 1346                TA/TO                 0                      0
## 1347                TA/TO                 0                      0
## 1348                TA/TO                 0                      0
## 1349                TA/TO                 0                      0
## 1350               Direct                 0                      0
## 1351                TA/TO                 0                      0
## 1352                TA/TO                 0                      0
## 1353                TA/TO                 0                      0
## 1354                TA/TO                 0                      0
## 1355                TA/TO                 0                      0
## 1356                TA/TO                 0                      0
## 1357                TA/TO                 0                      0
## 1358                TA/TO                 0                      0
## 1359                TA/TO                 0                      0
## 1360                TA/TO                 0                      0
## 1361                TA/TO                 0                      0
## 1362                TA/TO                 0                      0
## 1363                TA/TO                 0                      0
## 1364                TA/TO                 0                      0
## 1365               Direct                 0                      0
## 1366                TA/TO                 0                      0
## 1367               Direct                 0                      0
## 1368               Direct                 0                      0
## 1369               Direct                 0                      0
## 1370                TA/TO                 0                      0
## 1371                TA/TO                 0                      0
## 1372                TA/TO                 0                      0
## 1373                TA/TO                 0                      0
## 1374                TA/TO                 0                      0
## 1375                TA/TO                 0                      0
## 1376                TA/TO                 0                      0
## 1377                TA/TO                 0                      0
## 1378                TA/TO                 0                      0
## 1379                TA/TO                 0                      0
## 1380                TA/TO                 0                      0
## 1381                TA/TO                 0                      0
## 1382               Direct                 0                      0
## 1383                TA/TO                 0                      0
## 1384                TA/TO                 0                      0
## 1385                TA/TO                 0                      0
## 1386                TA/TO                 0                      0
## 1387                TA/TO                 0                      0
## 1388               Direct                 0                      0
## 1389               Direct                 0                      0
## 1390            Corporate                 0                      0
## 1391                TA/TO                 0                      0
## 1392                TA/TO                 0                      0
## 1393                TA/TO                 0                      0
## 1394                TA/TO                 0                      0
## 1395               Direct                 0                      0
## 1396                TA/TO                 0                      0
## 1397                TA/TO                 0                      0
## 1398                TA/TO                 0                      0
## 1399                TA/TO                 0                      0
## 1400                TA/TO                 0                      0
## 1401                TA/TO                 0                      0
## 1402                TA/TO                 0                      0
## 1403                TA/TO                 0                      0
## 1404                TA/TO                 0                      0
## 1405                TA/TO                 0                      0
## 1406               Direct                 0                      0
## 1407                TA/TO                 0                      0
## 1408               Direct                 0                      0
## 1409                TA/TO                 0                      0
## 1410                TA/TO                 0                      0
## 1411                TA/TO                 0                      0
## 1412                TA/TO                 0                      0
## 1413               Direct                 0                      0
## 1414                TA/TO                 0                      0
## 1415               Direct                 0                      0
## 1416                TA/TO                 0                      0
## 1417                TA/TO                 0                      0
## 1418               Direct                 0                      0
## 1419                TA/TO                 0                      0
## 1420                TA/TO                 0                      0
## 1421                TA/TO                 0                      0
## 1422               Direct                 0                      0
## 1423                TA/TO                 0                      0
## 1424               Direct                 0                      0
## 1425               Direct                 0                      0
## 1426               Direct                 0                      0
## 1427               Direct                 0                      0
## 1428                TA/TO                 0                      0
## 1429                TA/TO                 0                      0
## 1430               Direct                 0                      0
## 1431                TA/TO                 0                      0
## 1432                TA/TO                 0                      0
## 1433                TA/TO                 0                      0
## 1434                TA/TO                 0                      0
## 1435                TA/TO                 0                      0
## 1436                TA/TO                 0                      0
## 1437               Direct                 0                      0
## 1438                TA/TO                 0                      0
## 1439                TA/TO                 0                      0
## 1440               Direct                 0                      0
## 1441            Corporate                 0                      0
## 1442               Direct                 0                      0
## 1443            Corporate                 0                      0
## 1444               Direct                 0                      0
## 1445                TA/TO                 0                      0
## 1446            Corporate                 0                      0
## 1447               Direct                 0                      0
## 1448               Direct                 0                      0
## 1449            Corporate                 0                      0
## 1450            Corporate                 0                      0
## 1451               Direct                 0                      0
## 1452               Direct                 0                      0
## 1453            Corporate                 0                      0
## 1454               Direct                 0                      0
## 1455            Corporate                 0                      0
## 1456               Direct                 0                      0
## 1457                TA/TO                 0                      0
## 1458                TA/TO                 0                      0
## 1459                TA/TO                 0                      0
## 1460                TA/TO                 0                      0
## 1461                TA/TO                 0                      0
## 1462               Direct                 0                      0
## 1463                TA/TO                 0                      0
## 1464                TA/TO                 0                      0
## 1465            Corporate                 0                      0
## 1466               Direct                 0                      0
## 1467               Direct                 0                      0
## 1468               Direct                 0                      0
## 1469            Corporate                 0                      0
## 1470                TA/TO                 0                      0
## 1471               Direct                 0                      0
## 1472                TA/TO                 0                      0
## 1473                TA/TO                 0                      0
## 1474                TA/TO                 0                      0
## 1475               Direct                 0                      0
## 1476               Direct                 0                      0
## 1477                TA/TO                 0                      0
## 1478                TA/TO                 0                      0
## 1479                TA/TO                 0                      0
## 1480               Direct                 0                      0
## 1481                TA/TO                 0                      0
## 1482                TA/TO                 0                      0
## 1483                TA/TO                 0                      0
## 1484                TA/TO                 0                      0
## 1485                TA/TO                 0                      0
## 1486                TA/TO                 0                      0
## 1487               Direct                 0                      0
## 1488                TA/TO                 0                      0
## 1489                TA/TO                 0                      0
## 1490                TA/TO                 0                      0
## 1491                TA/TO                 0                      0
## 1492                TA/TO                 0                      0
## 1493            Corporate                 0                      0
## 1494            Corporate                 0                      0
## 1495                TA/TO                 0                      0
## 1496                TA/TO                 0                      0
## 1497               Direct                 0                      0
## 1498                TA/TO                 0                      0
## 1499                TA/TO                 0                      0
## 1500                TA/TO                 0                      0
## 1501                TA/TO                 0                      0
## 1502                TA/TO                 0                      0
## 1503                TA/TO                 0                      0
## 1504                TA/TO                 0                      0
## 1505               Direct                 0                      0
## 1506               Direct                 0                      0
## 1507                TA/TO                 0                      0
## 1508                TA/TO                 0                      0
## 1509                TA/TO                 0                      0
## 1510               Direct                 0                      0
## 1511               Direct                 0                      0
## 1512               Direct                 0                      0
## 1513                TA/TO                 0                      0
## 1514                TA/TO                 0                      0
## 1515                TA/TO                 0                      0
## 1516                TA/TO                 0                      0
## 1517                TA/TO                 0                      0
## 1518               Direct                 0                      0
## 1519                TA/TO                 0                      0
## 1520                TA/TO                 0                      0
## 1521                TA/TO                 0                      0
## 1522                TA/TO                 0                      0
## 1523                TA/TO                 0                      0
## 1524                TA/TO                 0                      0
## 1525                TA/TO                 0                      0
## 1526                TA/TO                 0                      0
## 1527                TA/TO                 0                      0
## 1528                TA/TO                 0                      0
## 1529            Corporate                 0                      0
## 1530                TA/TO                 0                      0
## 1531            Corporate                 0                      0
## 1532            Corporate                 0                      0
## 1533            Corporate                 0                      0
## 1534                TA/TO                 0                      0
## 1535                TA/TO                 0                      0
## 1536            Corporate                 0                      0
## 1537                TA/TO                 0                      0
## 1538               Direct                 0                      0
## 1539                TA/TO                 0                      0
## 1540                TA/TO                 0                      0
## 1541                TA/TO                 0                      0
## 1542               Direct                 0                      0
## 1543                TA/TO                 0                      0
## 1544               Direct                 0                      0
## 1545                TA/TO                 0                      0
## 1546                TA/TO                 0                      0
## 1547               Direct                 0                      0
## 1548               Direct                 0                      0
## 1549                TA/TO                 0                      0
## 1550                TA/TO                 0                      0
## 1551                TA/TO                 0                      0
## 1552                TA/TO                 0                      0
## 1553                TA/TO                 0                      0
## 1554                TA/TO                 0                      0
## 1555                TA/TO                 0                      0
## 1556            Corporate                 0                      0
## 1557            Corporate                 0                      0
## 1558               Direct                 0                      0
## 1559                TA/TO                 0                      0
## 1560                TA/TO                 0                      0
## 1561                TA/TO                 0                      0
## 1562                TA/TO                 0                      0
## 1563               Direct                 0                      0
## 1564            Corporate                 0                      0
## 1565               Direct                 0                      0
## 1566            Corporate                 0                      0
## 1567                TA/TO                 0                      0
## 1568                TA/TO                 0                      0
## 1569                TA/TO                 0                      0
## 1570                TA/TO                 0                      0
## 1571                TA/TO                 0                      0
## 1572               Direct                 0                      0
## 1573                TA/TO                 0                      0
## 1574                TA/TO                 0                      0
## 1575               Direct                 0                      0
## 1576                TA/TO                 0                      0
## 1577                TA/TO                 0                      0
## 1578                TA/TO                 0                      0
## 1579                TA/TO                 0                      0
## 1580                TA/TO                 0                      0
## 1581                TA/TO                 0                      0
## 1582                TA/TO                 0                      0
## 1583            Corporate                 0                      0
## 1584                TA/TO                 0                      0
## 1585                TA/TO                 0                      0
## 1586                TA/TO                 0                      0
## 1587               Direct                 0                      0
## 1588                TA/TO                 0                      0
## 1589                TA/TO                 0                      0
## 1590                TA/TO                 0                      0
## 1591                TA/TO                 0                      0
## 1592                TA/TO                 0                      0
## 1593               Direct                 0                      0
## 1594               Direct                 0                      0
## 1595               Direct                 0                      0
## 1596               Direct                 0                      0
## 1597               Direct                 0                      0
## 1598               Direct                 0                      0
## 1599               Direct                 0                      0
## 1600               Direct                 0                      0
## 1601               Direct                 0                      0
## 1602               Direct                 0                      0
## 1603               Direct                 0                      0
## 1604               Direct                 0                      0
## 1605               Direct                 0                      0
## 1606               Direct                 0                      0
## 1607               Direct                 0                      0
## 1608               Direct                 0                      0
## 1609               Direct                 0                      0
## 1610               Direct                 0                      0
## 1611                TA/TO                 0                      0
## 1612               Direct                 0                      0
## 1613               Direct                 0                      0
## 1614               Direct                 0                      0
## 1615               Direct                 0                      0
## 1616               Direct                 0                      0
## 1617                TA/TO                 0                      0
## 1618                TA/TO                 0                      0
## 1619                TA/TO                 0                      0
## 1620                TA/TO                 0                      0
## 1621                TA/TO                 0                      0
## 1622               Direct                 0                      0
## 1623               Direct                 0                      0
## 1624               Direct                 0                      0
## 1625               Direct                 0                      0
## 1626                TA/TO                 0                      0
## 1627                TA/TO                 0                      0
## 1628                TA/TO                 0                      0
## 1629                TA/TO                 0                      0
## 1630                TA/TO                 0                      0
## 1631                TA/TO                 0                      0
## 1632                TA/TO                 0                      0
## 1633                TA/TO                 0                      0
## 1634                TA/TO                 0                      0
## 1635                TA/TO                 0                      0
## 1636                TA/TO                 0                      0
## 1637                TA/TO                 0                      0
## 1638                TA/TO                 0                      0
## 1639                TA/TO                 0                      0
## 1640                TA/TO                 0                      0
## 1641                TA/TO                 0                      0
## 1642               Direct                 0                      0
## 1643                TA/TO                 0                      0
## 1644                TA/TO                 0                      0
## 1645               Direct                 0                      0
## 1646                TA/TO                 0                      0
## 1647                TA/TO                 0                      0
## 1648                TA/TO                 0                      0
## 1649                TA/TO                 0                      0
## 1650                TA/TO                 0                      0
## 1651                TA/TO                 0                      0
## 1652                TA/TO                 0                      0
## 1653                TA/TO                 0                      0
## 1654                TA/TO                 0                      0
## 1655                TA/TO                 0                      0
## 1656                TA/TO                 0                      0
## 1657                TA/TO                 0                      0
## 1658                TA/TO                 0                      0
## 1659                TA/TO                 0                      0
## 1660                TA/TO                 0                      0
## 1661                TA/TO                 0                      0
## 1662                TA/TO                 0                      0
## 1663                TA/TO                 0                      0
## 1664                TA/TO                 0                      0
## 1665                TA/TO                 0                      0
## 1666                TA/TO                 0                      0
## 1667                TA/TO                 0                      0
## 1668                TA/TO                 0                      0
## 1669                TA/TO                 0                      0
## 1670                TA/TO                 0                      0
## 1671                TA/TO                 0                      0
## 1672                TA/TO                 0                      0
## 1673                TA/TO                 0                      0
## 1674               Direct                 0                      0
## 1675                TA/TO                 0                      0
## 1676                TA/TO                 0                      0
## 1677               Direct                 0                      0
## 1678                TA/TO                 0                      0
## 1679               Direct                 0                      0
## 1680               Direct                 0                      0
## 1681                TA/TO                 0                      0
## 1682               Direct                 0                      0
## 1683               Direct                 0                      0
## 1684                TA/TO                 0                      0
## 1685               Direct                 0                      0
## 1686               Direct                 0                      0
## 1687                TA/TO                 0                      0
## 1688                TA/TO                 0                      0
## 1689                TA/TO                 0                      0
## 1690                TA/TO                 0                      0
## 1691                TA/TO                 0                      0
## 1692                TA/TO                 0                      0
## 1693               Direct                 0                      0
## 1694                TA/TO                 0                      0
## 1695                TA/TO                 0                      0
## 1696                TA/TO                 0                      0
## 1697                TA/TO                 0                      0
## 1698                TA/TO                 0                      0
## 1699               Direct                 0                      0
## 1700                TA/TO                 0                      0
## 1701               Direct                 0                      0
## 1702                TA/TO                 0                      0
## 1703               Direct                 0                      0
## 1704                TA/TO                 0                      0
## 1705                TA/TO                 0                      0
## 1706                TA/TO                 0                      0
## 1707                TA/TO                 0                      0
## 1708                TA/TO                 0                      0
## 1709                TA/TO                 0                      0
## 1710                TA/TO                 0                      0
## 1711                TA/TO                 0                      0
## 1712                TA/TO                 0                      0
## 1713               Direct                 0                      0
## 1714                TA/TO                 0                      0
## 1715                TA/TO                 0                      0
## 1716                TA/TO                 0                      0
## 1717                TA/TO                 0                      0
## 1718                TA/TO                 0                      0
## 1719                TA/TO                 0                      0
## 1720                TA/TO                 0                      0
## 1721                TA/TO                 0                      0
## 1722                TA/TO                 0                      0
## 1723            Corporate                 0                      0
## 1724                TA/TO                 0                      0
## 1725               Direct                 0                      0
## 1726               Direct                 0                      0
## 1727                TA/TO                 0                      0
## 1728               Direct                 0                      0
## 1729                TA/TO                 0                      0
## 1730                TA/TO                 0                      0
## 1731                TA/TO                 0                      0
## 1732                TA/TO                 0                      0
## 1733                TA/TO                 0                      0
## 1734                TA/TO                 0                      0
## 1735                TA/TO                 0                      0
## 1736                TA/TO                 0                      0
## 1737                TA/TO                 0                      0
## 1738                TA/TO                 0                      0
## 1739               Direct                 0                      0
## 1740            Corporate                 0                      0
## 1741                TA/TO                 0                      0
## 1742            Corporate                 0                      0
## 1743               Direct                 0                      0
## 1744               Direct                 0                      0
## 1745               Direct                 0                      0
## 1746               Direct                 0                      0
## 1747            Corporate                 0                      0
## 1748               Direct                 0                      0
## 1749               Direct                 0                      0
## 1750                TA/TO                 0                      0
## 1751                TA/TO                 0                      0
## 1752                TA/TO                 0                      0
## 1753                TA/TO                 0                      0
## 1754                TA/TO                 0                      0
## 1755               Direct                 0                      0
## 1756                TA/TO                 0                      0
## 1757               Direct                 0                      0
## 1758               Direct                 0                      0
## 1759               Direct                 0                      0
## 1760               Direct                 0                      0
## 1761                TA/TO                 0                      0
## 1762               Direct                 0                      0
## 1763               Direct                 0                      0
## 1764               Direct                 0                      0
## 1765               Direct                 0                      0
## 1766                TA/TO                 0                      0
## 1767               Direct                 0                      0
## 1768               Direct                 0                      0
## 1769                TA/TO                 0                      0
## 1770               Direct                 0                      0
## 1771                TA/TO                 0                      0
## 1772               Direct                 0                      0
## 1773               Direct                 0                      0
## 1774                TA/TO                 0                      0
## 1775                TA/TO                 0                      0
## 1776                TA/TO                 0                      0
## 1777               Direct                 0                      0
## 1778                TA/TO                 0                      0
## 1779                TA/TO                 0                      0
## 1780                TA/TO                 0                      0
## 1781               Direct                 0                      0
## 1782                TA/TO                 0                      0
## 1783                TA/TO                 0                      0
## 1784                TA/TO                 0                      0
## 1785                TA/TO                 0                      0
## 1786               Direct                 0                      0
## 1787               Direct                 0                      0
## 1788               Direct                 0                      0
## 1789               Direct                 0                      0
## 1790                TA/TO                 0                      0
## 1791               Direct                 0                      0
## 1792               Direct                 0                      0
## 1793                TA/TO                 0                      0
## 1794                TA/TO                 0                      0
## 1795               Direct                 0                      0
## 1796               Direct                 0                      0
## 1797               Direct                 0                      0
## 1798               Direct                 0                      0
## 1799                TA/TO                 0                      0
## 1800               Direct                 0                      0
## 1801                TA/TO                 0                      0
## 1802                TA/TO                 0                      0
## 1803               Direct                 0                      0
## 1804                TA/TO                 0                      0
## 1805               Direct                 0                      0
## 1806               Direct                 0                      0
## 1807               Direct                 0                      0
## 1808                TA/TO                 0                      0
## 1809               Direct                 0                      0
## 1810               Direct                 0                      0
## 1811               Direct                 0                      0
## 1812               Direct                 0                      0
## 1813                TA/TO                 0                      0
## 1814               Direct                 0                      0
## 1815               Direct                 0                      0
## 1816               Direct                 0                      0
## 1817               Direct                 0                      0
## 1818                TA/TO                 0                      0
## 1819                TA/TO                 0                      0
## 1820                TA/TO                 0                      0
## 1821                TA/TO                 0                      0
## 1822                TA/TO                 0                      0
## 1823                TA/TO                 0                      0
## 1824                TA/TO                 0                      0
## 1825                TA/TO                 0                      0
## 1826                TA/TO                 0                      0
## 1827                TA/TO                 0                      0
## 1828                TA/TO                 0                      0
## 1829                TA/TO                 0                      0
## 1830               Direct                 0                      0
## 1831                TA/TO                 0                      0
## 1832                TA/TO                 0                      0
## 1833                TA/TO                 0                      0
## 1834                TA/TO                 0                      0
## 1835                TA/TO                 0                      0
## 1836            Corporate                 0                      0
## 1837            Corporate                 0                      0
## 1838                TA/TO                 0                      0
## 1839               Direct                 0                      0
## 1840               Direct                 0                      0
## 1841                TA/TO                 0                      0
## 1842            Corporate                 0                      0
## 1843                TA/TO                 0                      0
## 1844                TA/TO                 0                      0
## 1845                TA/TO                 0                      0
## 1846            Corporate                 0                      0
## 1847                TA/TO                 0                      0
## 1848                TA/TO                 0                      0
## 1849                TA/TO                 0                      0
## 1850            Corporate                 0                      0
## 1851            Corporate                 0                      0
## 1852            Corporate                 0                      0
## 1853            Corporate                 0                      0
## 1854            Corporate                 0                      0
## 1855            Corporate                 0                      0
## 1856            Corporate                 0                      0
## 1857            Corporate                 0                      0
## 1858            Corporate                 0                      0
## 1859                TA/TO                 0                      0
## 1860                TA/TO                 0                      0
## 1861                TA/TO                 0                      0
## 1862            Corporate                 0                      0
## 1863            Corporate                 0                      0
## 1864            Corporate                 0                      0
## 1865            Corporate                 0                      0
## 1866                TA/TO                 0                      0
## 1867                TA/TO                 0                      0
## 1868            Corporate                 0                      0
## 1869                TA/TO                 0                      0
## 1870            Corporate                 0                      0
## 1871                TA/TO                 0                      0
## 1872                TA/TO                 0                      0
## 1873                TA/TO                 0                      0
## 1874               Direct                 0                      0
## 1875                TA/TO                 0                      0
## 1876                TA/TO                 0                      0
## 1877                TA/TO                 0                      0
## 1878                TA/TO                 0                      0
## 1879                TA/TO                 0                      0
## 1880            Corporate                 0                      0
## 1881            Corporate                 0                      0
## 1882            Corporate                 0                      0
## 1883            Corporate                 0                      0
## 1884            Corporate                 0                      0
## 1885            Corporate                 0                      0
## 1886            Corporate                 0                      0
## 1887                TA/TO                 0                      0
## 1888                TA/TO                 0                      0
## 1889                TA/TO                 0                      0
## 1890               Direct                 0                      0
## 1891                TA/TO                 0                      0
## 1892                TA/TO                 0                      0
## 1893                TA/TO                 0                      0
## 1894                TA/TO                 0                      0
## 1895                TA/TO                 0                      0
## 1896                TA/TO                 0                      0
## 1897                TA/TO                 0                      0
## 1898            Corporate                 0                      0
## 1899                TA/TO                 0                      0
## 1900            Corporate                 0                      0
## 1901            Corporate                 0                      0
## 1902            Corporate                 0                      0
## 1903            Corporate                 0                      0
## 1904            Corporate                 0                      0
## 1905            Corporate                 0                      0
## 1906            Corporate                 0                      0
## 1907                TA/TO                 0                      0
## 1908                TA/TO                 0                      0
## 1909               Direct                 0                      0
## 1910                TA/TO                 0                      0
## 1911            Corporate                 0                      0
## 1912            Corporate                 0                      0
## 1913            Corporate                 0                      0
## 1914            Corporate                 0                      0
## 1915                TA/TO                 0                      0
## 1916            Corporate                 0                      0
## 1917            Corporate                 0                      0
## 1918                TA/TO                 0                      0
## 1919                TA/TO                 0                      0
## 1920                TA/TO                 0                      0
## 1921               Direct                 0                      0
## 1922                TA/TO                 0                      0
## 1923               Direct                 0                      0
## 1924                TA/TO                 0                      0
## 1925            Corporate                 0                      0
## 1926                TA/TO                 0                      0
## 1927                TA/TO                 0                      0
## 1928                TA/TO                 0                      0
## 1929                TA/TO                 0                      0
## 1930                TA/TO                 0                      0
## 1931                TA/TO                 0                      0
## 1932                TA/TO                 0                      0
## 1933               Direct                 0                      0
## 1934               Direct                 0                      0
## 1935                TA/TO                 0                      0
## 1936            Corporate                 0                      0
## 1937                TA/TO                 0                      0
## 1938                TA/TO                 0                      0
## 1939                TA/TO                 0                      0
## 1940                TA/TO                 0                      0
## 1941                TA/TO                 0                      0
## 1942            Corporate                 0                      0
## 1943            Corporate                 0                      0
## 1944                TA/TO                 0                      0
## 1945            Corporate                 0                      0
## 1946                TA/TO                 0                      0
## 1947                TA/TO                 0                      0
## 1948                TA/TO                 0                      0
## 1949                TA/TO                 0                      0
## 1950                TA/TO                 0                      0
## 1951            Corporate                 0                      0
## 1952                TA/TO                 0                      0
## 1953            Corporate                 0                      0
## 1954            Corporate                 0                      0
## 1955            Corporate                 0                      0
## 1956                TA/TO                 0                      0
## 1957            Corporate                 0                      0
## 1958            Corporate                 0                      0
## 1959            Corporate                 0                      0
## 1960            Corporate                 0                      0
## 1961            Corporate                 0                      0
## 1962                TA/TO                 0                      0
## 1963                TA/TO                 0                      0
## 1964            Corporate                 0                      0
## 1965                TA/TO                 0                      0
## 1966                TA/TO                 0                      0
## 1967            Corporate                 0                      0
## 1968            Corporate                 0                      0
## 1969                TA/TO                 0                      0
## 1970            Corporate                 0                      0
## 1971                TA/TO                 0                      0
## 1972                TA/TO                 0                      0
## 1973               Direct                 0                      0
## 1974                TA/TO                 0                      0
## 1975               Direct                 0                      0
## 1976                TA/TO                 0                      0
## 1977               Direct                 0                      0
## 1978            Corporate                 0                      0
## 1979                TA/TO                 0                      0
## 1980                TA/TO                 0                      0
## 1981                TA/TO                 0                      0
## 1982                TA/TO                 0                      0
## 1983                TA/TO                 0                      0
## 1984                TA/TO                 0                      0
## 1985                TA/TO                 0                      0
## 1986                TA/TO                 0                      0
## 1987                TA/TO                 0                      0
## 1988                TA/TO                 0                      0
## 1989                TA/TO                 0                      0
## 1990                TA/TO                 0                      0
## 1991                TA/TO                 0                      0
## 1992                TA/TO                 0                      0
## 1993                TA/TO                 0                      0
## 1994                TA/TO                 0                      0
## 1995                TA/TO                 0                      0
## 1996                TA/TO                 0                      0
## 1997                TA/TO                 0                      0
## 1998                TA/TO                 0                      0
## 1999                TA/TO                 0                      0
## 2000                TA/TO                 0                      0
## 2001                TA/TO                 0                      0
## 2002                TA/TO                 0                      0
## 2003                TA/TO                 0                      0
## 2004                TA/TO                 0                      0
## 2005                TA/TO                 0                      0
## 2006                TA/TO                 0                      0
## 2007                TA/TO                 0                      0
## 2008                TA/TO                 0                      0
## 2009                TA/TO                 0                      0
## 2010                TA/TO                 0                      0
## 2011                TA/TO                 0                      0
## 2012                TA/TO                 0                      0
## 2013                TA/TO                 0                      0
## 2014                TA/TO                 0                      0
## 2015                TA/TO                 0                      0
## 2016                TA/TO                 0                      0
## 2017                TA/TO                 0                      0
## 2018                TA/TO                 0                      0
## 2019                TA/TO                 0                      0
## 2020                TA/TO                 0                      0
## 2021               Direct                 0                      0
## 2022               Direct                 0                      0
## 2023                TA/TO                 0                      0
## 2024                TA/TO                 0                      0
## 2025                TA/TO                 0                      0
## 2026                TA/TO                 0                      0
## 2027                TA/TO                 0                      0
## 2028                TA/TO                 0                      0
## 2029                TA/TO                 0                      0
## 2030                TA/TO                 0                      0
## 2031                TA/TO                 0                      0
## 2032                TA/TO                 0                      0
## 2033               Direct                 0                      0
## 2034                TA/TO                 0                      0
## 2035                TA/TO                 0                      0
## 2036                TA/TO                 0                      0
## 2037                TA/TO                 0                      0
## 2038                TA/TO                 0                      0
## 2039            Corporate                 0                      0
## 2040            Corporate                 0                      0
## 2041            Corporate                 0                      0
## 2042            Corporate                 0                      0
## 2043            Corporate                 0                      0
## 2044            Corporate                 0                      0
## 2045            Corporate                 0                      0
## 2046            Corporate                 0                      0
## 2047            Corporate                 0                      0
## 2048            Corporate                 0                      0
## 2049            Corporate                 0                      0
## 2050            Corporate                 0                      0
## 2051            Corporate                 0                      0
## 2052            Corporate                 0                      0
## 2053            Corporate                 0                      0
## 2054            Corporate                 0                      0
## 2055            Corporate                 0                      0
## 2056            Corporate                 0                      0
## 2057            Corporate                 0                      0
## 2058            Corporate                 0                      0
## 2059            Corporate                 0                      0
## 2060            Corporate                 0                      0
## 2061                TA/TO                 0                      0
## 2062            Corporate                 0                      0
## 2063                TA/TO                 0                      0
## 2064                TA/TO                 0                      0
## 2065            Corporate                 0                      0
## 2066            Corporate                 0                      0
## 2067            Corporate                 0                      0
## 2068            Corporate                 0                      0
## 2069            Corporate                 0                      0
## 2070            Corporate                 0                      0
## 2071            Corporate                 0                      0
## 2072            Corporate                 0                      0
## 2073            Corporate                 0                      0
## 2074            Corporate                 0                      0
## 2075            Corporate                 0                      0
## 2076            Corporate                 0                      0
## 2077                TA/TO                 0                      0
## 2078            Corporate                 0                      0
## 2079            Corporate                 0                      0
## 2080            Corporate                 0                      0
## 2081               Direct                 0                      0
## 2082            Corporate                 0                      0
## 2083            Corporate                 0                      0
## 2084            Corporate                 0                      0
## 2085            Corporate                 0                      0
## 2086                TA/TO                 0                      0
## 2087                TA/TO                 0                      0
## 2088                TA/TO                 0                      0
## 2089                TA/TO                 0                      0
## 2090                TA/TO                 0                      0
## 2091                TA/TO                 0                      0
## 2092                TA/TO                 0                      0
## 2093                TA/TO                 0                      0
## 2094                TA/TO                 0                      0
## 2095                TA/TO                 0                      0
## 2096                TA/TO                 0                      0
## 2097                TA/TO                 0                      0
## 2098                TA/TO                 0                      0
## 2099                TA/TO                 0                      0
## 2100                TA/TO                 0                      0
## 2101                TA/TO                 0                      0
## 2102                TA/TO                 0                      0
## 2103                TA/TO                 0                      0
## 2104                TA/TO                 0                      0
## 2105                TA/TO                 0                      0
## 2106            Corporate                 0                      0
## 2107                TA/TO                 0                      0
## 2108                TA/TO                 0                      0
## 2109                TA/TO                 0                      0
## 2110               Direct                 0                      0
## 2111                TA/TO                 0                      0
## 2112                TA/TO                 0                      0
## 2113                TA/TO                 0                      0
## 2114                TA/TO                 0                      0
## 2115                TA/TO                 0                      0
## 2116                TA/TO                 0                      0
## 2117                TA/TO                 0                      0
## 2118                TA/TO                 0                      0
## 2119                TA/TO                 0                      0
## 2120                TA/TO                 0                      0
## 2121                TA/TO                 0                      0
## 2122                TA/TO                 0                      0
## 2123               Direct                 0                      0
## 2124                TA/TO                 0                      0
## 2125                TA/TO                 0                      0
## 2126               Direct                 0                      0
## 2127                TA/TO                 0                      0
## 2128                TA/TO                 0                      0
## 2129                TA/TO                 0                      0
## 2130                TA/TO                 0                      0
## 2131                TA/TO                 0                      0
## 2132                TA/TO                 0                      0
## 2133                TA/TO                 0                      0
## 2134                TA/TO                 0                      0
## 2135                TA/TO                 0                      0
## 2136                TA/TO                 0                      0
## 2137                TA/TO                 0                      0
## 2138                TA/TO                 0                      0
## 2139                TA/TO                 0                      0
## 2140                TA/TO                 0                      0
## 2141                TA/TO                 0                      0
## 2142                TA/TO                 0                      0
## 2143                TA/TO                 0                      0
## 2144                TA/TO                 0                      0
## 2145                TA/TO                 0                      0
## 2146                TA/TO                 0                      0
## 2147                TA/TO                 0                      0
## 2148                TA/TO                 0                      0
## 2149                TA/TO                 0                      0
## 2150                TA/TO                 0                      0
## 2151                TA/TO                 0                      0
## 2152                TA/TO                 0                      0
## 2153                TA/TO                 0                      0
## 2154                TA/TO                 0                      0
## 2155                TA/TO                 0                      0
## 2156                TA/TO                 0                      0
## 2157                TA/TO                 0                      0
## 2158                TA/TO                 0                      0
## 2159                TA/TO                 0                      0
## 2160                TA/TO                 0                      0
## 2161                TA/TO                 0                      0
## 2162                TA/TO                 0                      0
## 2163                TA/TO                 0                      0
## 2164               Direct                 0                      0
## 2165                TA/TO                 0                      0
## 2166                TA/TO                 0                      0
## 2167                TA/TO                 0                      0
## 2168                TA/TO                 0                      0
## 2169                TA/TO                 0                      0
## 2170                TA/TO                 0                      0
## 2171                TA/TO                 0                      0
## 2172                TA/TO                 0                      0
## 2173                TA/TO                 0                      0
## 2174                TA/TO                 0                      0
## 2175                TA/TO                 0                      0
## 2176                TA/TO                 0                      0
## 2177                TA/TO                 0                      0
## 2178                TA/TO                 0                      0
## 2179                TA/TO                 0                      0
## 2180                TA/TO                 0                      0
## 2181                TA/TO                 0                      0
## 2182                TA/TO                 0                      0
## 2183                TA/TO                 0                      0
## 2184                TA/TO                 0                      0
## 2185                TA/TO                 0                      0
## 2186                TA/TO                 0                      0
## 2187                TA/TO                 0                      0
## 2188                TA/TO                 0                      0
## 2189                TA/TO                 0                      0
## 2190                TA/TO                 0                      0
## 2191                TA/TO                 0                      0
## 2192                TA/TO                 0                      0
## 2193                TA/TO                 0                      0
## 2194                TA/TO                 0                      0
## 2195                TA/TO                 0                      0
## 2196                TA/TO                 0                      0
## 2197                TA/TO                 0                      0
## 2198                TA/TO                 0                      0
## 2199                TA/TO                 0                      0
## 2200                TA/TO                 0                      0
## 2201                TA/TO                 0                      0
## 2202                TA/TO                 0                      0
## 2203                TA/TO                 0                      0
## 2204                TA/TO                 0                      0
## 2205               Direct                 0                      0
## 2206                TA/TO                 0                      0
## 2207                TA/TO                 0                      0
## 2208                TA/TO                 0                      0
## 2209                TA/TO                 0                      0
## 2210                TA/TO                 0                      0
## 2211                TA/TO                 0                      0
## 2212                TA/TO                 0                      0
## 2213                TA/TO                 0                      0
## 2214                TA/TO                 0                      0
## 2215                TA/TO                 0                      0
## 2216                TA/TO                 0                      0
## 2217                TA/TO                 0                      0
## 2218                TA/TO                 0                      0
## 2219                TA/TO                 0                      0
## 2220                TA/TO                 0                      0
## 2221                TA/TO                 0                      0
## 2222                TA/TO                 0                      0
## 2223                TA/TO                 0                      0
## 2224                TA/TO                 0                      0
## 2225                TA/TO                 0                      0
## 2226                TA/TO                 0                      0
## 2227                TA/TO                 0                      0
## 2228                TA/TO                 0                      0
## 2229                TA/TO                 0                      0
## 2230               Direct                 0                      0
## 2231               Direct                 0                      0
## 2232               Direct                 0                      0
## 2233                TA/TO                 0                      0
## 2234               Direct                 0                      0
## 2235               Direct                 0                      0
## 2236               Direct                 0                      0
## 2237               Direct                 0                      0
## 2238                TA/TO                 0                      0
## 2239                TA/TO                 0                      0
## 2240                TA/TO                 0                      0
## 2241                TA/TO                 0                      0
## 2242                TA/TO                 0                      0
## 2243                TA/TO                 0                      0
## 2244                TA/TO                 0                      0
## 2245                TA/TO                 0                      0
## 2246                TA/TO                 0                      0
## 2247                TA/TO                 0                      0
## 2248                TA/TO                 0                      0
## 2249                TA/TO                 0                      0
## 2250                TA/TO                 0                      0
## 2251                TA/TO                 0                      0
## 2252                TA/TO                 0                      0
## 2253                TA/TO                 0                      0
## 2254                TA/TO                 0                      0
## 2255                TA/TO                 0                      0
## 2256                TA/TO                 0                      0
## 2257                TA/TO                 0                      0
## 2258               Direct                 0                      0
## 2259                TA/TO                 0                      0
## 2260                TA/TO                 0                      0
## 2261                TA/TO                 0                      0
## 2262                TA/TO                 0                      0
## 2263                TA/TO                 0                      0
## 2264                TA/TO                 0                      0
## 2265                TA/TO                 0                      0
## 2266               Direct                 0                      0
## 2267                TA/TO                 0                      0
## 2268                TA/TO                 0                      0
## 2269                TA/TO                 0                      0
## 2270                TA/TO                 0                      0
## 2271                TA/TO                 0                      0
## 2272                TA/TO                 0                      0
## 2273                TA/TO                 0                      0
## 2274                TA/TO                 0                      0
## 2275                TA/TO                 0                      0
## 2276                TA/TO                 0                      0
## 2277                TA/TO                 0                      0
## 2278                TA/TO                 0                      0
## 2279                TA/TO                 0                      0
## 2280                TA/TO                 0                      0
## 2281                TA/TO                 0                      0
## 2282                TA/TO                 0                      0
## 2283                TA/TO                 0                      0
## 2284                TA/TO                 0                      0
## 2285                TA/TO                 0                      0
## 2286                TA/TO                 0                      0
## 2287                TA/TO                 0                      0
## 2288                TA/TO                 0                      0
## 2289                TA/TO                 0                      0
## 2290                TA/TO                 0                      0
## 2291                TA/TO                 0                      0
## 2292                TA/TO                 0                      0
## 2293                TA/TO                 0                      0
## 2294                TA/TO                 0                      0
## 2295                TA/TO                 0                      0
## 2296                TA/TO                 0                      0
## 2297                TA/TO                 0                      0
## 2298                TA/TO                 0                      0
## 2299                TA/TO                 0                      0
## 2300                TA/TO                 0                      0
## 2301                TA/TO                 0                      0
## 2302                TA/TO                 0                      0
## 2303                TA/TO                 0                      0
## 2304                TA/TO                 0                      0
## 2305                TA/TO                 0                      0
## 2306                TA/TO                 0                      0
## 2307                TA/TO                 0                      0
## 2308                TA/TO                 0                      0
## 2309                TA/TO                 0                      0
## 2310                TA/TO                 0                      0
## 2311                TA/TO                 0                      0
## 2312                TA/TO                 0                      0
## 2313                TA/TO                 0                      0
## 2314                TA/TO                 0                      0
## 2315                TA/TO                 0                      0
## 2316                TA/TO                 0                      0
## 2317                TA/TO                 0                      0
## 2318                TA/TO                 0                      0
## 2319                TA/TO                 0                      0
## 2320               Direct                 0                      0
## 2321               Direct                 0                      0
## 2322                TA/TO                 0                      0
## 2323                TA/TO                 0                      0
## 2324               Direct                 0                      0
## 2325               Direct                 0                      0
## 2326                TA/TO                 0                      0
## 2327                TA/TO                 0                      0
## 2328               Direct                 0                      0
## 2329               Direct                 0                      0
## 2330               Direct                 0                      0
## 2331               Direct                 0                      0
## 2332                TA/TO                 0                      0
## 2333                TA/TO                 0                      0
## 2334                TA/TO                 0                      0
## 2335                TA/TO                 0                      0
## 2336                TA/TO                 0                      0
## 2337                TA/TO                 0                      0
## 2338                TA/TO                 0                      0
## 2339                TA/TO                 0                      0
## 2340                TA/TO                 0                      0
## 2341                TA/TO                 0                      0
## 2342                TA/TO                 0                      0
## 2343                TA/TO                 0                      0
## 2344                TA/TO                 0                      0
## 2345                TA/TO                 0                      0
## 2346                TA/TO                 0                      0
## 2347                TA/TO                 0                      0
## 2348                TA/TO                 0                      0
## 2349               Direct                 0                      0
## 2350                TA/TO                 0                      0
## 2351                TA/TO                 0                      0
## 2352                TA/TO                 0                      0
## 2353                TA/TO                 0                      0
## 2354                TA/TO                 0                      0
## 2355               Direct                 0                      0
## 2356            Corporate                 0                      0
## 2357                TA/TO                 0                      0
## 2358               Direct                 0                      0
## 2359                TA/TO                 0                      0
## 2360                TA/TO                 0                      0
## 2361                TA/TO                 0                      0
## 2362                TA/TO                 0                      0
## 2363                TA/TO                 0                      0
## 2364                TA/TO                 0                      0
## 2365                TA/TO                 0                      0
## 2366                TA/TO                 0                      0
## 2367                TA/TO                 0                      0
## 2368                TA/TO                 0                      0
## 2369                TA/TO                 0                      0
## 2370                TA/TO                 0                      0
## 2371                TA/TO                 0                      0
## 2372                TA/TO                 0                      0
## 2373                TA/TO                 0                      0
## 2374                TA/TO                 0                      0
## 2375                TA/TO                 0                      0
## 2376                TA/TO                 0                      0
## 2377                TA/TO                 0                      0
## 2378                TA/TO                 0                      0
## 2379                TA/TO                 0                      0
## 2380                TA/TO                 0                      0
## 2381                TA/TO                 0                      0
## 2382                TA/TO                 0                      0
## 2383                TA/TO                 0                      0
## 2384                TA/TO                 0                      0
## 2385                TA/TO                 0                      0
## 2386                TA/TO                 0                      0
## 2387                TA/TO                 0                      0
## 2388                TA/TO                 0                      0
## 2389                TA/TO                 0                      0
## 2390                TA/TO                 0                      0
## 2391                TA/TO                 0                      0
## 2392                TA/TO                 0                      0
## 2393                TA/TO                 0                      0
## 2394                TA/TO                 0                      0
## 2395                TA/TO                 0                      0
## 2396                TA/TO                 0                      0
## 2397                TA/TO                 0                      0
## 2398                TA/TO                 0                      0
## 2399                TA/TO                 0                      0
## 2400                TA/TO                 0                      0
## 2401                TA/TO                 0                      0
## 2402                TA/TO                 0                      0
## 2403                TA/TO                 0                      0
## 2404                TA/TO                 0                      0
## 2405                TA/TO                 0                      0
## 2406                TA/TO                 0                      0
## 2407                TA/TO                 0                      0
## 2408                TA/TO                 0                      0
## 2409                TA/TO                 0                      0
## 2410                TA/TO                 0                      0
## 2411                TA/TO                 0                      0
## 2412                TA/TO                 0                      0
## 2413                TA/TO                 0                      0
## 2414                TA/TO                 0                      0
## 2415                TA/TO                 0                      0
## 2416                TA/TO                 0                      0
## 2417                TA/TO                 0                      0
## 2418                TA/TO                 0                      0
## 2419                TA/TO                 0                      0
## 2420                TA/TO                 0                      0
## 2421                TA/TO                 0                      0
## 2422                TA/TO                 0                      0
## 2423               Direct                 0                      0
## 2424                TA/TO                 0                      0
## 2425                TA/TO                 0                      0
## 2426                TA/TO                 0                      0
## 2427                TA/TO                 0                      0
## 2428                TA/TO                 0                      0
## 2429               Direct                 0                      0
## 2430                TA/TO                 0                      0
## 2431               Direct                 0                      0
## 2432               Direct                 0                      0
## 2433               Direct                 0                      0
## 2434               Direct                 0                      0
## 2435               Direct                 0                      0
## 2436               Direct                 0                      0
## 2437               Direct                 0                      0
## 2438               Direct                 0                      0
## 2439               Direct                 0                      0
## 2440               Direct                 0                      0
## 2441               Direct                 0                      0
## 2442               Direct                 0                      0
## 2443               Direct                 0                      0
## 2444               Direct                 0                      0
## 2445               Direct                 0                      0
## 2446               Direct                 0                      0
## 2447               Direct                 0                      0
## 2448               Direct                 0                      0
## 2449               Direct                 0                      0
## 2450               Direct                 0                      0
## 2451               Direct                 0                      0
## 2452               Direct                 0                      0
## 2453                TA/TO                 0                      0
## 2454            Corporate                 0                      0
## 2455                TA/TO                 0                      0
## 2456                TA/TO                 0                      0
## 2457               Direct                 0                      0
## 2458                TA/TO                 0                      0
## 2459                TA/TO                 0                      0
## 2460                TA/TO                 0                      0
## 2461                TA/TO                 0                      0
## 2462            Corporate                 0                      0
## 2463                TA/TO                 0                      0
## 2464                TA/TO                 0                      0
## 2465               Direct                 0                      0
## 2466               Direct                 0                      0
## 2467                TA/TO                 0                      0
## 2468                TA/TO                 0                      0
## 2469                TA/TO                 0                      0
## 2470                TA/TO                 0                      0
## 2471                TA/TO                 0                      0
## 2472                TA/TO                 0                      0
## 2473                TA/TO                 0                      0
## 2474                TA/TO                 0                      0
## 2475                TA/TO                 0                      0
## 2476                TA/TO                 0                      0
## 2477                TA/TO                 0                      0
## 2478                TA/TO                 0                      0
## 2479               Direct                 0                      0
## 2480                TA/TO                 0                      0
## 2481                TA/TO                 0                      0
## 2482                TA/TO                 0                      0
## 2483                TA/TO                 0                      0
## 2484                TA/TO                 0                      0
## 2485                TA/TO                 0                      0
## 2486                TA/TO                 0                      0
## 2487                TA/TO                 0                      0
## 2488                TA/TO                 0                      0
## 2489                TA/TO                 0                      0
## 2490                TA/TO                 0                      0
## 2491                TA/TO                 0                      0
## 2492                TA/TO                 0                      0
## 2493                TA/TO                 0                      0
## 2494                TA/TO                 0                      0
## 2495                TA/TO                 0                      0
## 2496                TA/TO                 0                      0
## 2497                TA/TO                 0                      0
## 2498                TA/TO                 0                      0
## 2499                TA/TO                 0                      0
## 2500                TA/TO                 0                      0
## 2501                TA/TO                 0                      0
## 2502                TA/TO                 0                      0
## 2503                TA/TO                 0                      0
## 2504                TA/TO                 0                      0
## 2505                TA/TO                 0                      0
## 2506                TA/TO                 0                      0
## 2507                TA/TO                 0                      0
## 2508                TA/TO                 0                      0
## 2509                TA/TO                 0                      0
## 2510                TA/TO                 0                      0
## 2511                TA/TO                 0                      0
## 2512                TA/TO                 0                      0
## 2513                TA/TO                 0                      0
## 2514                TA/TO                 0                      0
## 2515                TA/TO                 0                      0
## 2516                TA/TO                 0                      0
## 2517                TA/TO                 0                      0
## 2518                TA/TO                 0                      0
## 2519                TA/TO                 0                      0
## 2520                TA/TO                 0                      0
## 2521                TA/TO                 0                      0
## 2522                TA/TO                 0                      0
## 2523                TA/TO                 0                      0
## 2524                TA/TO                 0                      0
## 2525                TA/TO                 0                      0
## 2526                TA/TO                 0                      0
## 2527                TA/TO                 0                      0
## 2528                TA/TO                 0                      0
## 2529                TA/TO                 0                      0
## 2530                TA/TO                 0                      0
## 2531                TA/TO                 0                      0
## 2532                TA/TO                 0                      0
## 2533                TA/TO                 0                      0
## 2534                TA/TO                 0                      0
## 2535                TA/TO                 0                      0
## 2536                TA/TO                 0                      0
## 2537                TA/TO                 0                      0
## 2538                TA/TO                 0                      0
## 2539                TA/TO                 0                      0
## 2540                TA/TO                 0                      0
## 2541                TA/TO                 0                      0
## 2542                TA/TO                 0                      0
## 2543                TA/TO                 0                      0
## 2544                TA/TO                 0                      0
## 2545                TA/TO                 0                      0
## 2546                TA/TO                 0                      0
## 2547                TA/TO                 0                      0
## 2548                TA/TO                 0                      0
## 2549                TA/TO                 0                      0
## 2550                TA/TO                 0                      0
## 2551                TA/TO                 0                      0
## 2552               Direct                 0                      0
## 2553               Direct                 0                      0
## 2554               Direct                 0                      0
## 2555               Direct                 0                      0
## 2556               Direct                 0                      0
## 2557               Direct                 0                      0
## 2558               Direct                 0                      0
## 2559               Direct                 0                      0
## 2560               Direct                 0                      0
## 2561               Direct                 0                      0
## 2562               Direct                 0                      0
## 2563               Direct                 0                      0
## 2564               Direct                 0                      0
## 2565               Direct                 0                      0
## 2566               Direct                 0                      0
## 2567               Direct                 0                      0
## 2568               Direct                 0                      0
## 2569               Direct                 0                      0
## 2570               Direct                 0                      0
## 2571               Direct                 0                      0
## 2572               Direct                 0                      0
## 2573               Direct                 0                      0
## 2574               Direct                 0                      0
## 2575               Direct                 0                      0
## 2576               Direct                 0                      0
## 2577               Direct                 0                      0
## 2578               Direct                 0                      0
## 2579               Direct                 0                      0
## 2580               Direct                 0                      0
## 2581               Direct                 0                      0
## 2582               Direct                 0                      0
## 2583               Direct                 0                      0
## 2584               Direct                 0                      0
## 2585               Direct                 0                      0
## 2586               Direct                 0                      0
## 2587               Direct                 0                      0
## 2588               Direct                 0                      0
## 2589               Direct                 0                      0
## 2590               Direct                 0                      0
## 2591               Direct                 0                      0
## 2592               Direct                 0                      0
## 2593               Direct                 0                      0
## 2594               Direct                 0                      0
## 2595               Direct                 0                      0
## 2596               Direct                 0                      0
## 2597               Direct                 0                      0
## 2598               Direct                 0                      0
## 2599               Direct                 0                      0
## 2600               Direct                 0                      0
## 2601               Direct                 0                      0
## 2602               Direct                 0                      0
## 2603               Direct                 0                      0
## 2604               Direct                 0                      0
## 2605               Direct                 0                      0
## 2606               Direct                 0                      0
## 2607               Direct                 0                      0
## 2608               Direct                 0                      0
## 2609               Direct                 0                      0
## 2610               Direct                 0                      0
## 2611               Direct                 0                      0
## 2612               Direct                 0                      0
## 2613               Direct                 0                      0
## 2614               Direct                 0                      0
## 2615               Direct                 0                      0
## 2616               Direct                 0                      0
## 2617               Direct                 0                      0
## 2618               Direct                 0                      0
## 2619               Direct                 0                      0
## 2620               Direct                 0                      0
## 2621               Direct                 0                      0
## 2622                TA/TO                 0                      0
## 2623                TA/TO                 0                      0
## 2624                TA/TO                 0                      0
## 2625                TA/TO                 0                      0
## 2626                TA/TO                 0                      0
## 2627                TA/TO                 0                      0
## 2628                TA/TO                 0                      0
## 2629               Direct                 0                      0
## 2630               Direct                 0                      0
## 2631                TA/TO                 0                      0
## 2632                TA/TO                 0                      0
## 2633                TA/TO                 0                      0
## 2634                TA/TO                 0                      0
## 2635                TA/TO                 0                      0
## 2636                TA/TO                 0                      0
## 2637                TA/TO                 0                      0
## 2638                TA/TO                 0                      0
## 2639                TA/TO                 0                      0
## 2640                TA/TO                 0                      0
## 2641                TA/TO                 0                      0
## 2642                TA/TO                 0                      0
## 2643                TA/TO                 0                      0
## 2644                TA/TO                 0                      0
## 2645                TA/TO                 0                      0
## 2646                TA/TO                 0                      0
## 2647                TA/TO                 0                      0
## 2648                TA/TO                 0                      0
## 2649                TA/TO                 0                      0
## 2650                TA/TO                 0                      0
## 2651                TA/TO                 0                      0
## 2652                TA/TO                 0                      0
## 2653                TA/TO                 0                      0
## 2654                TA/TO                 0                      0
## 2655                TA/TO                 0                      0
## 2656                TA/TO                 0                      0
## 2657                TA/TO                 0                      0
## 2658                TA/TO                 0                      0
## 2659                TA/TO                 0                      0
## 2660                TA/TO                 0                      0
## 2661                TA/TO                 0                      0
## 2662                TA/TO                 0                      0
## 2663                TA/TO                 0                      0
## 2664                TA/TO                 0                      0
## 2665                TA/TO                 0                      0
## 2666                TA/TO                 0                      0
## 2667                TA/TO                 0                      0
## 2668                TA/TO                 0                      0
## 2669                TA/TO                 0                      0
## 2670                TA/TO                 0                      0
## 2671                TA/TO                 0                      0
## 2672                TA/TO                 0                      0
## 2673                TA/TO                 0                      0
## 2674                TA/TO                 0                      0
## 2675                TA/TO                 0                      0
## 2676               Direct                 0                      0
## 2677               Direct                 0                      0
## 2678               Direct                 0                      0
## 2679               Direct                 0                      0
## 2680               Direct                 0                      0
## 2681               Direct                 0                      0
## 2682               Direct                 0                      0
## 2683               Direct                 0                      0
## 2684               Direct                 0                      0
## 2685               Direct                 0                      0
## 2686               Direct                 0                      0
## 2687               Direct                 0                      0
## 2688               Direct                 0                      0
## 2689               Direct                 0                      0
## 2690               Direct                 0                      0
## 2691               Direct                 0                      0
## 2692               Direct                 0                      0
## 2693               Direct                 0                      0
## 2694               Direct                 0                      0
## 2695            Corporate                 0                      0
## 2696                TA/TO                 0                      0
## 2697                TA/TO                 0                      0
## 2698                TA/TO                 0                      0
## 2699                TA/TO                 0                      0
## 2700               Direct                 0                      0
## 2701                TA/TO                 0                      0
## 2702                TA/TO                 0                      0
## 2703                TA/TO                 0                      0
## 2704                TA/TO                 0                      0
## 2705                TA/TO                 0                      0
## 2706                TA/TO                 0                      0
## 2707                TA/TO                 0                      0
## 2708                TA/TO                 0                      0
## 2709                TA/TO                 0                      0
## 2710                TA/TO                 0                      0
## 2711                TA/TO                 0                      0
## 2712                TA/TO                 0                      0
## 2713                TA/TO                 0                      0
## 2714                TA/TO                 0                      0
## 2715                TA/TO                 0                      0
## 2716                TA/TO                 0                      0
## 2717                TA/TO                 0                      0
## 2718                TA/TO                 0                      0
## 2719                TA/TO                 0                      0
## 2720                TA/TO                 0                      0
## 2721                TA/TO                 0                      0
## 2722                TA/TO                 0                      0
## 2723                TA/TO                 0                      0
## 2724                TA/TO                 0                      0
## 2725                TA/TO                 0                      0
## 2726                TA/TO                 0                      0
## 2727                TA/TO                 0                      0
## 2728                TA/TO                 0                      0
## 2729                TA/TO                 0                      0
## 2730                TA/TO                 0                      0
## 2731                TA/TO                 0                      0
## 2732                TA/TO                 0                      0
## 2733                TA/TO                 0                      0
## 2734               Direct                 0                      0
## 2735                TA/TO                 0                      0
## 2736                TA/TO                 0                      0
## 2737                TA/TO                 0                      0
## 2738                TA/TO                 0                      0
## 2739                TA/TO                 0                      0
## 2740                TA/TO                 0                      0
## 2741                TA/TO                 0                      0
## 2742                TA/TO                 0                      0
## 2743                TA/TO                 0                      0
## 2744                TA/TO                 0                      0
## 2745                TA/TO                 0                      0
## 2746                TA/TO                 0                      0
## 2747                TA/TO                 0                      0
## 2748                TA/TO                 0                      0
## 2749                TA/TO                 0                      0
## 2750                TA/TO                 0                      0
## 2751                TA/TO                 0                      0
## 2752                TA/TO                 0                      0
## 2753                TA/TO                 0                      0
## 2754                TA/TO                 0                      0
## 2755                TA/TO                 0                      0
## 2756                TA/TO                 0                      0
## 2757                TA/TO                 0                      0
## 2758                TA/TO                 0                      0
## 2759                TA/TO                 0                      0
## 2760                TA/TO                 0                      0
## 2761                TA/TO                 0                      0
## 2762                TA/TO                 0                      0
## 2763                TA/TO                 0                      0
## 2764                TA/TO                 0                      0
## 2765                TA/TO                 0                      0
## 2766                TA/TO                 0                      0
## 2767                TA/TO                 0                      0
## 2768                TA/TO                 0                      0
## 2769                TA/TO                 0                      0
## 2770               Direct                 0                      0
## 2771               Direct                 0                      0
## 2772                TA/TO                 0                      0
## 2773                TA/TO                 0                      0
## 2774                TA/TO                 0                      0
## 2775                TA/TO                 0                      0
## 2776                TA/TO                 0                      0
## 2777                TA/TO                 0                      0
## 2778                TA/TO                 0                      0
## 2779                TA/TO                 0                      0
## 2780                TA/TO                 0                      0
## 2781                TA/TO                 0                      0
## 2782                TA/TO                 0                      0
## 2783                TA/TO                 0                      0
## 2784                TA/TO                 0                      0
## 2785                TA/TO                 0                      0
## 2786                TA/TO                 0                      0
## 2787                TA/TO                 0                      0
## 2788                TA/TO                 0                      0
## 2789                TA/TO                 0                      0
## 2790                TA/TO                 0                      0
## 2791                TA/TO                 0                      0
## 2792                TA/TO                 0                      0
## 2793                TA/TO                 0                      0
## 2794                TA/TO                 0                      0
## 2795                TA/TO                 0                      0
## 2796                TA/TO                 0                      0
## 2797                TA/TO                 0                      0
## 2798                TA/TO                 0                      0
## 2799                TA/TO                 0                      0
## 2800                TA/TO                 0                      0
## 2801                TA/TO                 0                      0
## 2802                TA/TO                 0                      0
## 2803                TA/TO                 0                      0
## 2804               Direct                 0                      0
## 2805                TA/TO                 0                      0
## 2806                TA/TO                 0                      0
## 2807                TA/TO                 0                      0
## 2808                TA/TO                 0                      0
## 2809                TA/TO                 0                      0
## 2810                TA/TO                 0                      0
## 2811                TA/TO                 0                      0
## 2812                TA/TO                 0                      0
## 2813                TA/TO                 0                      0
## 2814                TA/TO                 0                      0
## 2815                TA/TO                 0                      0
## 2816                TA/TO                 0                      0
## 2817                TA/TO                 0                      0
## 2818                TA/TO                 0                      0
## 2819                TA/TO                 0                      0
## 2820                TA/TO                 0                      0
## 2821                TA/TO                 0                      0
## 2822                TA/TO                 0                      0
## 2823                TA/TO                 0                      0
## 2824                TA/TO                 0                      0
## 2825                TA/TO                 0                      0
## 2826                TA/TO                 0                      0
## 2827                TA/TO                 0                      0
## 2828                TA/TO                 0                      0
## 2829                TA/TO                 0                      0
## 2830                TA/TO                 0                      0
## 2831                TA/TO                 0                      0
## 2832                TA/TO                 0                      0
## 2833                TA/TO                 0                      0
## 2834                TA/TO                 0                      0
## 2835                TA/TO                 0                      0
## 2836                TA/TO                 0                      0
## 2837                TA/TO                 0                      0
## 2838                TA/TO                 0                      0
## 2839                TA/TO                 0                      0
## 2840                TA/TO                 0                      0
## 2841                TA/TO                 0                      0
## 2842                TA/TO                 0                      0
## 2843                TA/TO                 0                      0
## 2844                TA/TO                 0                      0
## 2845                TA/TO                 0                      0
## 2846                TA/TO                 0                      0
## 2847                TA/TO                 0                      0
## 2848                TA/TO                 0                      0
## 2849                TA/TO                 0                      0
## 2850                TA/TO                 0                      0
## 2851                TA/TO                 0                      0
## 2852                TA/TO                 0                      0
## 2853                TA/TO                 0                      0
## 2854                TA/TO                 0                      0
## 2855                TA/TO                 0                      0
## 2856                TA/TO                 0                      0
## 2857                TA/TO                 0                      0
## 2858                TA/TO                 0                      0
## 2859                TA/TO                 0                      0
## 2860                TA/TO                 0                      0
## 2861                TA/TO                 0                      0
## 2862                TA/TO                 0                      0
## 2863                TA/TO                 0                      0
## 2864                TA/TO                 0                      0
## 2865                TA/TO                 0                      0
## 2866                TA/TO                 0                      0
## 2867                TA/TO                 0                      0
## 2868                TA/TO                 0                      0
## 2869                TA/TO                 0                      0
## 2870                TA/TO                 0                      0
## 2871                TA/TO                 0                      0
## 2872                TA/TO                 0                      0
## 2873                TA/TO                 0                      0
## 2874                TA/TO                 0                      0
## 2875                TA/TO                 0                      0
## 2876                TA/TO                 0                      0
## 2877                TA/TO                 0                      0
## 2878                TA/TO                 0                      0
## 2879                TA/TO                 0                      0
## 2880                TA/TO                 0                      0
## 2881                TA/TO                 0                      0
## 2882                TA/TO                 0                      0
## 2883                TA/TO                 0                      0
## 2884                TA/TO                 0                      0
## 2885                TA/TO                 0                      0
## 2886                TA/TO                 0                      0
## 2887                TA/TO                 0                      0
## 2888                TA/TO                 0                      0
## 2889                TA/TO                 0                      0
## 2890                TA/TO                 0                      0
## 2891                TA/TO                 0                      0
## 2892                TA/TO                 0                      0
## 2893                TA/TO                 0                      0
## 2894                TA/TO                 0                      0
## 2895                TA/TO                 0                      0
## 2896                TA/TO                 0                      0
## 2897                TA/TO                 0                      0
## 2898                TA/TO                 0                      0
## 2899                TA/TO                 0                      0
## 2900                TA/TO                 0                      0
## 2901                TA/TO                 0                      0
## 2902                TA/TO                 0                      0
## 2903                TA/TO                 0                      0
## 2904                TA/TO                 0                      0
## 2905                TA/TO                 0                      0
## 2906                TA/TO                 0                      0
## 2907                TA/TO                 0                      0
## 2908                TA/TO                 0                      0
## 2909                TA/TO                 0                      0
## 2910                TA/TO                 0                      0
## 2911                TA/TO                 0                      0
## 2912                TA/TO                 0                      0
## 2913                TA/TO                 0                      0
## 2914                TA/TO                 0                      0
## 2915                TA/TO                 0                      0
## 2916                TA/TO                 0                      0
## 2917                TA/TO                 0                      0
## 2918                TA/TO                 0                      0
## 2919                TA/TO                 0                      0
## 2920                TA/TO                 0                      0
## 2921                TA/TO                 0                      0
## 2922                TA/TO                 0                      0
## 2923                TA/TO                 0                      0
## 2924                TA/TO                 0                      0
## 2925                TA/TO                 0                      0
## 2926                TA/TO                 0                      0
## 2927                TA/TO                 0                      0
## 2928                TA/TO                 0                      0
## 2929                TA/TO                 0                      0
## 2930                TA/TO                 0                      0
## 2931                TA/TO                 0                      0
## 2932                TA/TO                 0                      0
## 2933                TA/TO                 0                      0
## 2934                TA/TO                 0                      0
## 2935                TA/TO                 0                      0
## 2936                TA/TO                 0                      0
## 2937                TA/TO                 0                      0
## 2938                TA/TO                 0                      0
## 2939                TA/TO                 0                      0
## 2940                TA/TO                 0                      0
## 2941               Direct                 0                      0
## 2942                TA/TO                 0                      0
## 2943                TA/TO                 0                      0
## 2944                TA/TO                 0                      0
## 2945                TA/TO                 0                      0
## 2946                TA/TO                 0                      0
## 2947                TA/TO                 0                      0
## 2948                TA/TO                 0                      0
## 2949                TA/TO                 0                      0
## 2950                TA/TO                 0                      0
## 2951                TA/TO                 0                      0
## 2952                TA/TO                 0                      0
## 2953                TA/TO                 0                      0
## 2954                TA/TO                 0                      0
## 2955                TA/TO                 0                      0
## 2956                TA/TO                 0                      0
## 2957                TA/TO                 0                      0
## 2958                TA/TO                 0                      0
## 2959                TA/TO                 0                      0
## 2960                TA/TO                 0                      0
## 2961                TA/TO                 0                      0
## 2962                TA/TO                 0                      0
## 2963                TA/TO                 0                      0
## 2964                TA/TO                 0                      0
## 2965                TA/TO                 0                      0
## 2966                TA/TO                 0                      0
## 2967                TA/TO                 0                      0
## 2968                TA/TO                 0                      0
## 2969                TA/TO                 0                      0
## 2970                TA/TO                 0                      0
## 2971                TA/TO                 0                      0
## 2972                TA/TO                 0                      0
## 2973                TA/TO                 0                      0
## 2974                TA/TO                 0                      0
## 2975                TA/TO                 0                      0
## 2976                TA/TO                 0                      0
## 2977                TA/TO                 0                      0
## 2978                TA/TO                 0                      0
## 2979                TA/TO                 0                      0
## 2980                TA/TO                 0                      0
## 2981                TA/TO                 0                      0
## 2982                TA/TO                 0                      0
## 2983                TA/TO                 0                      0
## 2984                TA/TO                 0                      0
## 2985                TA/TO                 0                      0
## 2986                TA/TO                 0                      0
## 2987                TA/TO                 0                      0
## 2988                TA/TO                 0                      0
## 2989                TA/TO                 0                      0
## 2990                TA/TO                 0                      0
## 2991                TA/TO                 0                      0
## 2992                TA/TO                 0                      0
## 2993                TA/TO                 0                      0
## 2994                TA/TO                 0                      0
## 2995                TA/TO                 0                      0
## 2996                TA/TO                 0                      0
## 2997                TA/TO                 0                      0
## 2998                TA/TO                 0                      0
## 2999                TA/TO                 0                      0
## 3000               Direct                 0                      0
## 3001               Direct                 0                      0
## 3002                TA/TO                 0                      0
## 3003               Direct                 0                      0
## 3004                TA/TO                 0                      0
## 3005                TA/TO                 0                      0
## 3006                TA/TO                 0                      0
## 3007                TA/TO                 0                      0
## 3008               Direct                 0                      0
## 3009                TA/TO                 0                      0
## 3010               Direct                 0                      0
## 3011               Direct                 0                      0
## 3012               Direct                 0                      0
## 3013                TA/TO                 0                      0
## 3014               Direct                 0                      0
## 3015               Direct                 0                      0
## 3016               Direct                 0                      0
## 3017               Direct                 0                      0
## 3018               Direct                 0                      0
## 3019               Direct                 0                      0
## 3020               Direct                 0                      0
## 3021               Direct                 0                      0
## 3022               Direct                 0                      0
## 3023               Direct                 0                      0
## 3024               Direct                 0                      0
## 3025               Direct                 0                      0
## 3026               Direct                 0                      0
## 3027               Direct                 0                      0
## 3028               Direct                 0                      0
## 3029               Direct                 0                      0
## 3030               Direct                 0                      0
## 3031               Direct                 0                      0
## 3032               Direct                 0                      0
## 3033                TA/TO                 0                      0
## 3034                TA/TO                 0                      0
## 3035               Direct                 0                      0
## 3036                TA/TO                 0                      0
## 3037                TA/TO                 0                      0
## 3038                TA/TO                 0                      0
## 3039               Direct                 0                      0
## 3040               Direct                 0                      0
## 3041               Direct                 0                      0
## 3042               Direct                 0                      0
## 3043               Direct                 0                      0
## 3044               Direct                 0                      0
## 3045               Direct                 0                      0
## 3046               Direct                 0                      0
## 3047               Direct                 0                      0
## 3048               Direct                 0                      0
## 3049                TA/TO                 0                      0
## 3050               Direct                 0                      0
## 3051               Direct                 0                      0
## 3052               Direct                 0                      0
## 3053               Direct                 0                      0
## 3054               Direct                 0                      0
## 3055               Direct                 0                      0
## 3056               Direct                 0                      0
## 3057               Direct                 0                      0
## 3058               Direct                 0                      0
## 3059               Direct                 0                      0
## 3060               Direct                 0                      0
## 3061               Direct                 0                      0
## 3062               Direct                 0                      0
## 3063               Direct                 0                      0
## 3064               Direct                 0                      0
## 3065               Direct                 0                      0
## 3066               Direct                 0                      0
## 3067               Direct                 0                      0
## 3068               Direct                 0                      0
## 3069               Direct                 0                      0
## 3070               Direct                 0                      0
## 3071               Direct                 0                      0
## 3072               Direct                 0                      0
## 3073               Direct                 0                      0
## 3074               Direct                 0                      0
## 3075               Direct                 0                      0
## 3076               Direct                 0                      0
## 3077               Direct                 0                      0
## 3078               Direct                 0                      0
## 3079               Direct                 0                      0
## 3080               Direct                 0                      0
## 3081               Direct                 0                      0
## 3082               Direct                 0                      0
## 3083               Direct                 0                      0
## 3084               Direct                 0                      0
## 3085               Direct                 0                      0
## 3086               Direct                 0                      0
## 3087                TA/TO                 0                      0
## 3088                TA/TO                 0                      0
## 3089                TA/TO                 0                      0
## 3090                TA/TO                 0                      0
## 3091               Direct                 0                      0
## 3092                TA/TO                 0                      0
## 3093                TA/TO                 0                      0
## 3094                TA/TO                 0                      0
## 3095                TA/TO                 0                      0
## 3096                TA/TO                 0                      0
## 3097                TA/TO                 0                      0
## 3098                TA/TO                 0                      0
## 3099                TA/TO                 0                      0
## 3100                TA/TO                 0                      0
## 3101                TA/TO                 0                      0
## 3102                TA/TO                 0                      0
## 3103                TA/TO                 0                      0
## 3104                TA/TO                 0                      0
## 3105                TA/TO                 0                      0
## 3106                TA/TO                 0                      0
## 3107                TA/TO                 0                      0
## 3108                TA/TO                 0                      0
## 3109                TA/TO                 0                      0
## 3110                TA/TO                 0                      0
## 3111                TA/TO                 0                      0
## 3112                TA/TO                 0                      0
## 3113                TA/TO                 0                      0
## 3114                TA/TO                 0                      0
## 3115                TA/TO                 0                      0
## 3116                TA/TO                 0                      0
## 3117                TA/TO                 0                      0
## 3118               Direct                 0                      0
## 3119               Direct                 0                      0
## 3120               Direct                 0                      0
## 3121                TA/TO                 0                      0
## 3122                TA/TO                 0                      0
## 3123                TA/TO                 0                      0
## 3124                TA/TO                 0                      0
##      previous_bookings_not_canceled reserved_room_type assigned_room_type
## 1                                 0                  C                  C
## 2                                 0                  C                  C
## 3                                 0                  A                  C
## 4                                 0                  A                  A
## 5                                 0                  A                  A
## 6                                 0                  A                  A
## 7                                 0                  C                  C
## 8                                 0                  C                  C
## 9                                 0                  D                  D
## 10                                0                  D                  E
## 11                                0                  G                  G
## 12                                0                  E                  E
## 13                                0                  D                  E
## 14                                0                  E                  E
## 15                                0                  A                  E
## 16                                0                  A                  G
## 17                                0                  G                  G
## 18                                0                  F                  F
## 19                                0                  A                  A
## 20                                0                  A                  A
## 21                                0                  D                  D
## 22                                0                  D                  I
## 23                                0                  D                  D
## 24                                0                  D                  D
## 25                                0                  A                  A
## 26                                0                  D                  D
## 27                                0                  A                  A
## 28                                0                  D                  D
## 29                                0                  A                  C
## 30                                0                  A                  C
## 31                                0                  D                  D
## 32                                0                  E                  E
## 33                                0                  D                  D
## 34                                0                  F                  F
## 35                                0                  E                  E
## 36                                0                  A                  A
## 37                                0                  A                  A
## 38                                0                  E                  E
## 39                                0                  A                  B
## 40                                0                  E                  F
## 41                                0                  D                  D
## 42                                0                  A                  A
## 43                                0                  D                  D
## 44                                0                  A                  C
## 45                                0                  H                  H
## 46                                0                  C                  C
## 47                                0                  H                  H
## 48                                0                  A                  D
## 49                                0                  G                  G
## 50                                0                  A                  C
## 51                                0                  G                  G
## 52                                0                  E                  E
## 53                                0                  F                  F
## 54                                0                  A                  C
## 55                                0                  G                  H
## 56                                0                  A                  C
## 57                                0                  D                  D
## 58                                0                  A                  A
## 59                                0                  A                  A
## 60                                0                  A                  A
## 61                                0                  A                  A
## 62                                0                  A                  A
## 63                                0                  D                  D
## 64                                0                  A                  A
## 65                                0                  A                  A
## 66                                0                  E                  E
## 67                                0                  E                  E
## 68                                0                  F                  F
## 69                                0                  A                  C
## 70                                0                  A                  C
## 71                                0                  A                  C
## 72                                0                  E                  E
## 73                                0                  C                  C
## 74                                0                  A                  A
## 75                                0                  E                  E
## 76                                0                  D                  D
## 77                                0                  E                  E
## 78                                0                  A                  C
## 79                                0                  D                  D
## 80                                0                  F                  F
## 81                                0                  A                  C
## 82                                0                  E                  E
## 83                                0                  A                  A
## 84                                0                  A                  A
## 85                                0                  D                  D
## 86                                0                  E                  F
## 87                                0                  A                  A
## 88                                0                  E                  E
## 89                                0                  A                  A
## 90                                0                  D                  D
## 91                                0                  D                  D
## 92                                0                  D                  D
## 93                                0                  H                  G
## 94                                0                  D                  C
## 95                                0                  H                  H
## 96                                0                  E                  E
## 97                                0                  A                  C
## 98                                0                  A                  A
## 99                                0                  A                  A
## 100                               0                  A                  C
## 101                               0                  A                  C
## 102                               0                  A                  C
## 103                               0                  A                  A
## 104                               0                  A                  D
## 105                               0                  A                  E
## 106                               0                  A                  A
## 107                               0                  G                  G
## 108                               0                  G                  G
## 109                               0                  D                  E
## 110                               0                  D                  D
## 111                               0                  A                  D
## 112                               0                  E                  E
## 113                               0                  E                  E
## 114                               0                  H                  H
## 115                               0                  A                  A
## 116                               0                  C                  C
## 117                               0                  F                  F
## 118                               0                  E                  E
## 119                               0                  H                  H
## 120                               0                  D                  D
## 121                               0                  D                  C
## 122                               0                  D                  D
## 123                               0                  A                  A
## 124                               0                  D                  D
## 125                               0                  G                  G
## 126                               0                  A                  C
## 127                               0                  G                  G
## 128                               0                  D                  D
## 129                               0                  G                  G
## 130                               0                  D                  E
## 131                               0                  G                  G
## 132                               0                  A                  H
## 133                               0                  E                  H
## 134                               0                  A                  E
## 135                               0                  A                  E
## 136                               0                  D                  F
## 137                               0                  D                  D
## 138                               0                  A                  E
## 139                               0                  A                  C
## 140                               0                  E                  E
## 141                               0                  F                  F
## 142                               0                  A                  C
## 143                               0                  E                  E
## 144                               0                  G                  G
## 145                               0                  A                  A
## 146                               0                  A                  C
## 147                               0                  A                  A
## 148                               0                  D                  D
## 149                               0                  F                  F
## 150                               0                  D                  D
## 151                               0                  A                  A
## 152                               0                  D                  D
## 153                               0                  A                  A
## 154                               0                  D                  D
## 155                               0                  A                  A
## 156                               0                  F                  F
## 157                               0                  A                  A
## 158                               0                  A                  E
## 159                               0                  A                  A
## 160                               0                  C                  C
## 161                               0                  A                  A
## 162                               0                  H                  H
## 163                               0                  D                  D
## 164                               0                  D                  E
## 165                               0                  A                  A
## 166                               0                  D                  D
## 167                               0                  D                  D
## 168                               0                  E                  E
## 169                               0                  A                  A
## 170                               0                  A                  A
## 171                               0                  D                  D
## 172                               0                  A                  A
## 173                               0                  A                  A
## 174                               0                  A                  F
## 175                               0                  E                  E
## 176                               0                  E                  F
## 177                               0                  D                  D
## 178                               0                  E                  E
## 179                               0                  A                  A
## 180                               0                  E                  E
## 181                               0                  E                  E
## 182                               0                  C                  C
## 183                               0                  A                  C
## 184                               0                  H                  G
## 185                               0                  A                  A
## 186                               0                  A                  A
## 187                               0                  A                  A
## 188                               0                  A                  A
## 189                               0                  A                  D
## 190                               0                  A                  A
## 191                               0                  E                  E
## 192                               0                  E                  E
## 193                               0                  A                  A
## 194                               0                  A                  A
## 195                               0                  A                  A
## 196                               0                  A                  A
## 197                               0                  A                  A
## 198                               0                  A                  A
## 199                               0                  A                  A
## 200                               0                  G                  G
## 201                               0                  D                  D
## 202                               0                  A                  A
## 203                               0                  C                  C
## 204                               0                  A                  C
## 205                               0                  E                  E
## 206                               0                  F                  F
## 207                               0                  F                  F
## 208                               0                  A                  A
## 209                               0                  C                  C
## 210                               0                  G                  G
## 211                               0                  A                  A
## 212                               0                  D                  D
## 213                               0                  D                  D
## 214                               0                  E                  E
## 215                               0                  E                  E
## 216                               0                  F                  F
## 217                               0                  C                  C
## 218                               0                  C                  C
## 219                               0                  A                  A
## 220                               0                  D                  D
## 221                               0                  F                  F
## 222                               0                  C                  C
## 223                               0                  D                  D
## 224                               0                  F                  F
## 225                               0                  A                  A
## 226                               0                  A                  A
## 227                               0                  D                  D
## 228                               0                  A                  A
## 229                               0                  E                  E
## 230                               0                  E                  E
## 231                               0                  E                  E
## 232                               0                  E                  E
## 233                               0                  A                  A
## 234                               0                  A                  A
## 235                               0                  G                  G
## 236                               0                  A                  A
## 237                               0                  A                  A
## 238                               0                  A                  A
## 239                               0                  C                  C
## 240                               0                  E                  F
## 241                               0                  A                  A
## 242                               0                  D                  D
## 243                               0                  A                  A
## 244                               0                  G                  G
## 245                               0                  E                  E
## 246                               0                  A                  A
## 247                               0                  E                  E
## 248                               0                  G                  G
## 249                               0                  A                  A
## 250                               0                  A                  A
## 251                               0                  A                  A
## 252                               0                  D                  D
## 253                               0                  A                  A
## 254                               0                  D                  D
## 255                               0                  A                  A
## 256                               0                  A                  A
## 257                               0                  E                  E
## 258                               0                  D                  D
## 259                               0                  D                  D
## 260                               0                  E                  E
## 261                               0                  A                  A
## 262                               0                  A                  A
## 263                               0                  D                  D
## 264                               0                  A                  A
## 265                               0                  A                  A
## 266                               0                  A                  A
## 267                               0                  G                  G
## 268                               0                  A                  A
## 269                               0                  F                  E
## 270                               0                  A                  B
## 271                               0                  A                  A
## 272                               0                  D                  D
## 273                               0                  A                  A
## 274                               0                  A                  D
## 275                               0                  E                  E
## 276                               0                  G                  G
## 277                               0                  D                  D
## 278                               0                  H                  H
## 279                               0                  D                  D
## 280                               0                  G                  G
## 281                               0                  A                  A
## 282                               0                  A                  A
## 283                               0                  A                  A
## 284                               0                  A                  C
## 285                               0                  A                  C
## 286                               0                  A                  A
## 287                               0                  L                  H
## 288                               0                  A                  A
## 289                               0                  A                  A
## 290                               0                  D                  E
## 291                               0                  A                  A
## 292                               0                  A                  A
## 293                               0                  A                  A
## 294                               0                  E                  F
## 295                               0                  A                  A
## 296                               0                  D                  D
## 297                               0                  D                  E
## 298                               0                  A                  A
## 299                               0                  D                  D
## 300                               0                  E                  E
## 301                               0                  D                  C
## 302                               0                  A                  A
## 303                               0                  A                  A
## 304                               0                  D                  D
## 305                               0                  E                  E
## 306                               0                  A                  A
## 307                               0                  A                  A
## 308                               0                  A                  A
## 309                               0                  D                  D
## 310                               0                  A                  A
## 311                               0                  A                  A
## 312                               0                  D                  D
## 313                               0                  A                  C
## 314                               0                  E                  F
## 315                               0                  A                  A
## 316                               0                  A                  A
## 317                               0                  E                  E
## 318                               0                  H                  G
## 319                               0                  A                  A
## 320                               0                  A                  A
## 321                               0                  A                  A
## 322                               0                  A                  B
## 323                               0                  D                  D
## 324                               0                  D                  D
## 325                               0                  H                  H
## 326                               0                  A                  C
## 327                               0                  D                  D
## 328                               0                  H                  H
## 329                               0                  A                  C
## 330                               0                  A                  A
## 331                               0                  A                  A
## 332                               0                  A                  C
## 333                               0                  A                  D
## 334                               0                  G                  G
## 335                               0                  A                  A
## 336                               0                  A                  F
## 337                               0                  A                  C
## 338                               0                  A                  C
## 339                               0                  A                  E
## 340                               0                  A                  D
## 341                               0                  A                  D
## 342                               0                  A                  C
## 343                               0                  A                  A
## 344                               0                  A                  A
## 345                               0                  A                  A
## 346                               0                  A                  A
## 347                               0                  A                  A
## 348                               0                  A                  C
## 349                               0                  A                  D
## 350                               0                  F                  F
## 351                               0                  C                  C
## 352                               0                  H                  G
## 353                               0                  A                  D
## 354                               0                  A                  A
## 355                               0                  D                  D
## 356                               0                  A                  D
## 357                               0                  D                  D
## 358                               0                  D                  D
## 359                               0                  A                  F
## 360                               0                  A                  A
## 361                               0                  A                  A
## 362                               0                  A                  A
## 363                               0                  E                  E
## 364                               0                  A                  A
## 365                               0                  A                  F
## 366                               0                  E                  F
## 367                               0                  D                  E
## 368                               0                  A                  A
## 369                               0                  A                  D
## 370                               0                  D                  D
## 371                               0                  D                  E
## 372                               0                  D                  F
## 373                               0                  A                  E
## 374                               0                  A                  A
## 375                               0                  A                  A
## 376                               0                  A                  D
## 377                               0                  A                  A
## 378                               0                  A                  A
## 379                               0                  A                  A
## 380                               0                  A                  A
## 381                               0                  A                  A
## 382                               0                  G                  G
## 383                               0                  E                  E
## 384                               0                  G                  G
## 385                               0                  A                  D
## 386                               0                  A                  A
## 387                               0                  E                  E
## 388                               0                  A                  A
## 389                               0                  A                  A
## 390                               0                  A                  A
## 391                               0                  D                  D
## 392                               0                  H                  H
## 393                               0                  F                  F
## 394                               0                  A                  A
## 395                               0                  A                  A
## 396                               0                  E                  E
## 397                               0                  D                  D
## 398                               0                  D                  D
## 399                               0                  A                  A
## 400                               0                  A                  D
## 401                               0                  A                  D
## 402                               0                  A                  A
## 403                               0                  A                  C
## 404                               0                  A                  A
## 405                               0                  D                  F
## 406                               0                  E                  E
## 407                               0                  A                  A
## 408                               0                  D                  D
## 409                               0                  E                  E
## 410                               0                  E                  E
## 411                               0                  A                  A
## 412                               0                  E                  E
## 413                               0                  A                  A
## 414                               0                  C                  C
## 415                               0                  D                  D
## 416                               0                  C                  C
## 417                               0                  G                  G
## 418                               0                  D                  E
## 419                               0                  D                  D
## 420                               0                  E                  E
## 421                               0                  A                  A
## 422                               0                  A                  D
## 423                               0                  D                  D
## 424                               0                  D                  D
## 425                               0                  A                  D
## 426                               0                  A                  A
## 427                               0                  A                  A
## 428                               0                  A                  A
## 429                               0                  A                  A
## 430                               0                  A                  A
## 431                               0                  D                  D
## 432                               0                  A                  A
## 433                               0                  A                  A
## 434                               0                  E                  E
## 435                               0                  A                  A
## 436                               0                  A                  A
## 437                               0                  C                  C
## 438                               0                  D                  D
## 439                               0                  A                  A
## 440                               0                  D                  D
## 441                               0                  A                  A
## 442                               0                  D                  D
## 443                               0                  D                  D
## 444                               0                  C                  C
## 445                               0                  D                  D
## 446                               0                  E                  E
## 447                               0                  A                  C
## 448                               0                  A                  I
## 449                               0                  A                  I
## 450                               0                  A                  C
## 451                               0                  A                  D
## 452                               0                  A                  C
## 453                               0                  A                  A
## 454                               0                  E                  E
## 455                               0                  A                  A
## 456                               0                  A                  D
## 457                               0                  E                  E
## 458                               0                  C                  C
## 459                               0                  A                  A
## 460                               0                  A                  A
## 461                               0                  D                  D
## 462                               0                  F                  F
## 463                               0                  D                  D
## 464                               0                  D                  D
## 465                               0                  D                  D
## 466                               0                  A                  F
## 467                               0                  A                  D
## 468                               0                  G                  G
## 469                               0                  A                  D
## 470                               0                  E                  E
## 471                               0                  A                  D
## 472                               0                  A                  A
## 473                               0                  E                  E
## 474                               0                  A                  A
## 475                               0                  E                  E
## 476                               0                  D                  D
## 477                               0                  C                  I
## 478                               0                  D                  I
## 479                               0                  D                  E
## 480                               0                  C                  C
## 481                               0                  E                  E
## 482                               0                  D                  E
## 483                               0                  D                  F
## 484                               0                  D                  D
## 485                               0                  E                  E
## 486                               0                  D                  F
## 487                               0                  A                  A
## 488                               0                  D                  D
## 489                               0                  A                  A
## 490                               0                  A                  D
## 491                               0                  A                  A
## 492                               0                  D                  G
## 493                               0                  D                  F
## 494                               0                  H                  H
## 495                               0                  A                  A
## 496                               0                  A                  D
## 497                               0                  A                  A
## 498                               0                  A                  A
## 499                               0                  A                  A
## 500                               0                  A                  A
## 501                               0                  D                  D
## 502                               0                  A                  A
## 503                               0                  E                  E
## 504                               0                  D                  D
## 505                               0                  A                  E
## 506                               0                  A                  F
## 507                               0                  A                  F
## 508                               0                  A                  F
## 509                               0                  D                  E
## 510                               0                  A                  E
## 511                               0                  A                  A
## 512                               0                  A                  D
## 513                               0                  A                  A
## 514                               0                  D                  D
## 515                               0                  A                  A
## 516                               0                  C                  C
## 517                               0                  G                  G
## 518                               0                  A                  A
## 519                               0                  A                  A
## 520                               0                  E                  E
## 521                               0                  A                  A
## 522                               0                  D                  D
## 523                               0                  A                  A
## 524                               0                  E                  E
## 525                               0                  A                  A
## 526                               0                  A                  A
## 527                               0                  D                  D
## 528                               0                  A                  D
## 529                               0                  G                  G
## 530                               0                  A                  D
## 531                               0                  A                  D
## 532                               0                  E                  E
## 533                               0                  C                  C
## 534                               0                  A                  A
## 535                               0                  E                  E
## 536                               0                  A                  A
## 537                               0                  A                  I
## 538                               0                  E                  E
## 539                               0                  E                  F
## 540                               0                  A                  E
## 541                               0                  A                  G
## 542                               0                  A                  E
## 543                               0                  F                  F
## 544                               0                  A                  D
## 545                               0                  A                  C
## 546                               0                  A                  D
## 547                               0                  A                  A
## 548                               0                  D                  F
## 549                               0                  A                  C
## 550                               0                  F                  F
## 551                               0                  A                  C
## 552                               0                  D                  D
## 553                               0                  D                  D
## 554                               0                  G                  G
## 555                               0                  A                  A
## 556                               0                  A                  A
## 557                               0                  A                  A
## 558                               0                  A                  A
## 559                               0                  D                  D
## 560                               0                  D                  E
## 561                               0                  D                  E
## 562                               0                  D                  E
## 563                               0                  A                  A
## 564                               0                  A                  A
## 565                               0                  F                  F
## 566                               0                  D                  D
## 567                               0                  D                  D
## 568                               0                  A                  A
## 569                               0                  A                  D
## 570                               0                  D                  I
## 571                               0                  A                  E
## 572                               0                  A                  C
## 573                               0                  A                  D
## 574                               0                  H                  H
## 575                               0                  A                  D
## 576                               0                  A                  A
## 577                               0                  A                  D
## 578                               0                  A                  D
## 579                               0                  A                  F
## 580                               0                  A                  E
## 581                               0                  G                  G
## 582                               0                  C                  C
## 583                               0                  A                  C
## 584                               0                  E                  E
## 585                               0                  D                  D
## 586                               0                  D                  D
## 587                               0                  A                  I
## 588                               0                  E                  I
## 589                               0                  F                  F
## 590                               0                  A                  A
## 591                               0                  D                  D
## 592                               0                  D                  D
## 593                               0                  H                  H
## 594                               0                  A                  C
## 595                               0                  A                  A
## 596                               0                  G                  G
## 597                               0                  D                  D
## 598                               0                  E                  E
## 599                               0                  E                  E
## 600                               0                  A                  A
## 601                               0                  D                  D
## 602                               0                  A                  A
## 603                               0                  E                  E
## 604                               0                  D                  D
## 605                               0                  A                  A
## 606                               0                  E                  E
## 607                               0                  A                  A
## 608                               0                  D                  D
## 609                               0                  A                  A
## 610                               0                  C                  C
## 611                               0                  D                  D
## 612                               0                  A                  A
## 613                               0                  C                  F
## 614                               0                  C                  C
## 615                               0                  D                  D
## 616                               0                  E                  E
## 617                               0                  A                  F
## 618                               0                  D                  F
## 619                               0                  A                  C
## 620                               0                  C                  C
## 621                               0                  C                  C
## 622                               0                  D                  D
## 623                               0                  A                  D
## 624                               0                  A                  A
## 625                               0                  A                  D
## 626                               0                  D                  D
## 627                               0                  D                  I
## 628                               0                  D                  I
## 629                               0                  A                  D
## 630                               0                  L                  F
## 631                               0                  A                  A
## 632                               0                  A                  A
## 633                               0                  A                  A
## 634                               0                  A                  A
## 635                               0                  A                  A
## 636                               0                  E                  F
## 637                               0                  G                  C
## 638                               0                  E                  E
## 639                               0                  D                  D
## 640                               0                  A                  A
## 641                               0                  A                  A
## 642                               0                  D                  D
## 643                               0                  D                  D
## 644                               0                  G                  G
## 645                               0                  E                  I
## 646                               0                  A                  F
## 647                               0                  D                  D
## 648                               0                  D                  F
## 649                               0                  A                  H
## 650                               0                  E                  F
## 651                               0                  A                  D
## 652                               0                  A                  A
## 653                               0                  E                  E
## 654                               0                  C                  C
## 655                               0                  D                  D
## 656                               0                  A                  A
## 657                               0                  A                  A
## 658                               0                  G                  H
## 659                               0                  E                  F
## 660                               0                  A                  A
## 661                               0                  D                  D
## 662                               0                  A                  D
## 663                               0                  G                  G
## 664                               0                  G                  G
## 665                               0                  C                  C
## 666                               0                  A                  A
## 667                               0                  A                  A
## 668                               0                  A                  A
## 669                               0                  D                  D
## 670                               0                  G                  G
## 671                               0                  A                  E
## 672                               0                  D                  D
## 673                               0                  E                  F
## 674                               0                  D                  D
## 675                               0                  D                  D
## 676                               0                  D                  D
## 677                               0                  C                  C
## 678                               0                  A                  A
## 679                               0                  A                  A
## 680                               0                  A                  A
## 681                               0                  A                  A
## 682                               0                  D                  F
## 683                               0                  E                  E
## 684                               0                  E                  F
## 685                               0                  A                  C
## 686                               0                  D                  D
## 687                               0                  A                  A
## 688                               0                  G                  G
## 689                               0                  F                  F
## 690                               0                  G                  G
## 691                               0                  D                  D
## 692                               0                  E                  E
## 693                               0                  A                  D
## 694                               0                  D                  D
## 695                               0                  D                  D
## 696                               0                  A                  A
## 697                               0                  D                  D
## 698                               0                  E                  E
## 699                               0                  D                  D
## 700                               0                  C                  C
## 701                               0                  G                  G
## 702                               0                  A                  A
## 703                               0                  A                  D
## 704                               0                  A                  D
## 705                               0                  A                  A
## 706                               0                  A                  B
## 707                               0                  E                  F
## 708                               0                  A                  F
## 709                               0                  D                  E
## 710                               0                  C                  C
## 711                               0                  E                  E
## 712                               0                  A                  A
## 713                               0                  D                  E
## 714                               0                  D                  D
## 715                               0                  D                  E
## 716                               0                  D                  D
## 717                               0                  D                  D
## 718                               0                  G                  G
## 719                               0                  A                  D
## 720                               0                  D                  F
## 721                               0                  A                  E
## 722                               0                  D                  F
## 723                               0                  A                  D
## 724                               0                  E                  E
## 725                               0                  A                  D
## 726                               0                  A                  B
## 727                               0                  A                  A
## 728                               0                  D                  D
## 729                               0                  D                  D
## 730                               0                  C                  C
## 731                               0                  A                  A
## 732                               0                  A                  A
## 733                               0                  D                  F
## 734                               0                  D                  D
## 735                               0                  D                  E
## 736                               0                  G                  G
## 737                               0                  D                  D
## 738                               0                  A                  A
## 739                               0                  A                  A
## 740                               0                  D                  D
## 741                               0                  A                  A
## 742                               0                  D                  D
## 743                               0                  A                  A
## 744                               0                  A                  A
## 745                               0                  A                  A
## 746                               0                  D                  D
## 747                               0                  A                  A
## 748                               0                  A                  A
## 749                               0                  A                  A
## 750                               0                  A                  A
## 751                               0                  A                  A
## 752                               0                  A                  A
## 753                               0                  A                  G
## 754                               0                  A                  A
## 755                               0                  A                  A
## 756                               0                  A                  E
## 757                               0                  G                  G
## 758                               0                  E                  E
## 759                               0                  A                  A
## 760                               0                  E                  E
## 761                               0                  A                  A
## 762                               0                  A                  A
## 763                               0                  A                  A
## 764                               0                  A                  A
## 765                               0                  A                  A
## 766                               0                  A                  A
## 767                               0                  C                  C
## 768                               0                  D                  D
## 769                               0                  C                  C
## 770                               0                  A                  A
## 771                               0                  A                  A
## 772                               0                  D                  D
## 773                               0                  C                  C
## 774                               0                  A                  A
## 775                               0                  A                  A
## 776                               0                  D                  D
## 777                               0                  D                  A
## 778                               0                  A                  E
## 779                               0                  A                  C
## 780                               0                  D                  D
## 781                               0                  A                  A
## 782                               0                  A                  D
## 783                               0                  D                  D
## 784                               0                  E                  E
## 785                               0                  A                  D
## 786                               0                  A                  D
## 787                               0                  G                  G
## 788                               0                  A                  B
## 789                               0                  C                  C
## 790                               0                  E                  E
## 791                               0                  D                  D
## 792                               0                  A                  A
## 793                               0                  A                  A
## 794                               0                  A                  A
## 795                               0                  A                  A
## 796                               0                  A                  A
## 797                               0                  D                  D
## 798                               0                  A                  A
## 799                               0                  A                  A
## 800                               0                  D                  D
## 801                               0                  A                  A
## 802                               0                  A                  A
## 803                               0                  A                  A
## 804                               0                  D                  D
## 805                               0                  D                  D
## 806                               0                  D                  D
## 807                               0                  D                  D
## 808                               0                  A                  A
## 809                               0                  D                  D
## 810                               0                  F                  F
## 811                               0                  A                  C
## 812                               0                  A                  A
## 813                               0                  D                  D
## 814                               0                  D                  D
## 815                               0                  D                  D
## 816                               0                  A                  A
## 817                               0                  A                  C
## 818                               0                  D                  D
## 819                               0                  D                  E
## 820                               0                  H                  H
## 821                               0                  A                  A
## 822                               0                  D                  D
## 823                               0                  D                  D
## 824                               0                  A                  A
## 825                               0                  A                  A
## 826                               0                  A                  A
## 827                               0                  D                  D
## 828                               0                  C                  C
## 829                               0                  A                  A
## 830                               0                  E                  E
## 831                               0                  A                  A
## 832                               0                  C                  C
## 833                               0                  A                  A
## 834                               0                  D                  D
## 835                               0                  A                  A
## 836                               0                  A                  A
## 837                               0                  C                  C
## 838                               0                  A                  A
## 839                               0                  A                  F
## 840                               0                  A                  H
## 841                               0                  A                  F
## 842                               0                  A                  A
## 843                               0                  D                  E
## 844                               0                  E                  E
## 845                               0                  C                  C
## 846                               0                  D                  D
## 847                               0                  D                  D
## 848                               0                  E                  E
## 849                               0                  E                  G
## 850                               0                  G                  G
## 851                               0                  A                  C
## 852                               0                  G                  G
## 853                               0                  A                  A
## 854                               0                  A                  A
## 855                               0                  D                  D
## 856                               0                  A                  A
## 857                               0                  A                  A
## 858                               0                  D                  E
## 859                               0                  A                  A
## 860                               0                  A                  B
## 861                               0                  D                  E
## 862                               0                  D                  D
## 863                               0                  D                  D
## 864                               0                  A                  A
## 865                               0                  C                  C
## 866                               0                  A                  G
## 867                               0                  H                  H
## 868                               0                  A                  A
## 869                               0                  A                  A
## 870                               0                  D                  G
## 871                               0                  A                  D
## 872                               0                  C                  C
## 873                               0                  A                  A
## 874                               0                  D                  D
## 875                               0                  A                  A
## 876                               0                  A                  A
## 877                               0                  A                  C
## 878                               0                  D                  D
## 879                               0                  A                  D
## 880                               0                  A                  D
## 881                               0                  A                  A
## 882                               0                  F                  F
## 883                               0                  E                  F
## 884                               0                  A                  A
## 885                               0                  A                  A
## 886                               0                  D                  D
## 887                               0                  A                  A
## 888                               0                  E                  E
## 889                               0                  F                  F
## 890                               0                  A                  A
## 891                               0                  E                  E
## 892                               0                  A                  A
## 893                               0                  A                  C
## 894                               0                  A                  D
## 895                               0                  A                  A
## 896                               0                  A                  C
## 897                               0                  A                  A
## 898                               0                  A                  D
## 899                               0                  A                  A
## 900                               0                  D                  D
## 901                               0                  A                  A
## 902                               0                  C                  C
## 903                               0                  D                  D
## 904                               0                  A                  D
## 905                               0                  A                  A
## 906                               0                  A                  A
## 907                               0                  A                  A
## 908                               0                  A                  A
## 909                               0                  D                  D
## 910                               0                  A                  A
## 911                               0                  E                  F
## 912                               0                  D                  D
## 913                               0                  D                  D
## 914                               0                  A                  A
## 915                               0                  F                  F
## 916                               0                  A                  A
## 917                               0                  A                  A
## 918                               0                  A                  A
## 919                               0                  A                  A
## 920                               0                  D                  D
## 921                               0                  D                  D
## 922                               0                  A                  A
## 923                               0                  D                  D
## 924                               0                  A                  A
## 925                               0                  C                  C
## 926                               0                  E                  E
## 927                               0                  D                  D
## 928                               0                  A                  A
## 929                               0                  E                  E
## 930                               0                  D                  D
## 931                               0                  A                  A
## 932                               0                  A                  C
## 933                               0                  C                  C
## 934                               0                  C                  C
## 935                               0                  E                  F
## 936                               0                  D                  D
## 937                               0                  A                  B
## 938                               0                  A                  A
## 939                               0                  A                  E
## 940                               0                  A                  A
## 941                               0                  A                  A
## 942                               0                  A                  A
## 943                               0                  A                  A
## 944                               0                  D                  D
## 945                               0                  G                  G
## 946                               0                  A                  A
## 947                               0                  A                  A
## 948                               0                  D                  D
## 949                               0                  E                  E
## 950                               0                  A                  E
## 951                               0                  D                  D
## 952                               0                  A                  D
## 953                               0                  A                  D
## 954                               0                  G                  G
## 955                               0                  A                  A
## 956                               0                  D                  E
## 957                               0                  A                  A
## 958                               0                  A                  A
## 959                               0                  A                  C
## 960                               0                  A                  A
## 961                               0                  D                  F
## 962                               0                  A                  A
## 963                               0                  A                  A
## 964                               0                  A                  A
## 965                               0                  A                  A
## 966                               0                  E                  F
## 967                               0                  A                  A
## 968                               0                  D                  E
## 969                               0                  E                  F
## 970                               0                  A                  A
## 971                               0                  D                  D
## 972                               0                  E                  E
## 973                               0                  D                  D
## 974                               0                  D                  D
## 975                               0                  D                  D
## 976                               0                  D                  D
## 977                               0                  D                  D
## 978                               0                  D                  D
## 979                               0                  D                  F
## 980                               0                  A                  F
## 981                               0                  D                  E
## 982                               0                  A                  C
## 983                               0                  E                  E
## 984                               0                  F                  F
## 985                               0                  D                  E
## 986                               0                  D                  D
## 987                               0                  D                  E
## 988                               0                  D                  D
## 989                               0                  A                  C
## 990                               0                  D                  D
## 991                               0                  E                  E
## 992                               0                  E                  E
## 993                               0                  G                  G
## 994                               0                  A                  A
## 995                               0                  G                  G
## 996                               0                  A                  A
## 997                               0                  E                  E
## 998                               0                  E                  E
## 999                               0                  D                  D
## 1000                              0                  D                  D
## 1001                              0                  F                  F
## 1002                              0                  E                  F
## 1003                              0                  D                  D
## 1004                              0                  A                  A
## 1005                              0                  D                  D
## 1006                              0                  C                  C
## 1007                              0                  A                  B
## 1008                              0                  A                  A
## 1009                              0                  E                  E
## 1010                              0                  E                  E
## 1011                              0                  D                  D
## 1012                              0                  H                  H
## 1013                              0                  A                  A
## 1014                              0                  A                  A
## 1015                              0                  A                  A
## 1016                              0                  A                  A
## 1017                              0                  A                  A
## 1018                              0                  A                  A
## 1019                              0                  A                  A
## 1020                              0                  D                  D
## 1021                              0                  A                  E
## 1022                              0                  D                  D
## 1023                              0                  H                  H
## 1024                              0                  D                  D
## 1025                              0                  D                  G
## 1026                              0                  F                  F
## 1027                              0                  D                  D
## 1028                              0                  E                  E
## 1029                              0                  D                  D
## 1030                              0                  E                  E
## 1031                              0                  G                  G
## 1032                              0                  A                  A
## 1033                              0                  D                  D
## 1034                              0                  A                  C
## 1035                              0                  A                  C
## 1036                              0                  E                  E
## 1037                              0                  A                  A
## 1038                              0                  A                  A
## 1039                              0                  A                  I
## 1040                              0                  A                  A
## 1041                              0                  A                  C
## 1042                              0                  A                  A
## 1043                              0                  D                  C
## 1044                              0                  D                  C
## 1045                              0                  A                  A
## 1046                              0                  D                  D
## 1047                              0                  F                  G
## 1048                              0                  E                  E
## 1049                              0                  F                  F
## 1050                              0                  A                  A
## 1051                              0                  A                  A
## 1052                              0                  A                  A
## 1053                              0                  A                  D
## 1054                              0                  A                  A
## 1055                              0                  D                  D
## 1056                              0                  A                  A
## 1057                              0                  A                  A
## 1058                              0                  A                  A
## 1059                              0                  A                  A
## 1060                              0                  A                  A
## 1061                              0                  A                  A
## 1062                              0                  A                  C
## 1063                              0                  D                  E
## 1064                              0                  A                  A
## 1065                              0                  A                  A
## 1066                              0                  E                  E
## 1067                              0                  A                  A
## 1068                              0                  A                  C
## 1069                              0                  C                  H
## 1070                              0                  A                  A
## 1071                              0                  A                  A
## 1072                              0                  A                  A
## 1073                              0                  A                  A
## 1074                              0                  A                  A
## 1075                              0                  A                  A
## 1076                              0                  D                  D
## 1077                              0                  D                  D
## 1078                              0                  E                  E
## 1079                              0                  D                  D
## 1080                              0                  A                  A
## 1081                              0                  D                  D
## 1082                              0                  A                  C
## 1083                              0                  A                  A
## 1084                              0                  A                  C
## 1085                              0                  A                  D
## 1086                              0                  A                  D
## 1087                              0                  D                  D
## 1088                              0                  A                  D
## 1089                              0                  D                  D
## 1090                              0                  D                  D
## 1091                              0                  G                  F
## 1092                              0                  H                  H
## 1093                              0                  D                  F
## 1094                              0                  A                  A
## 1095                              0                  A                  A
## 1096                              0                  A                  A
## 1097                              0                  A                  A
## 1098                              0                  D                  D
## 1099                              0                  A                  D
## 1100                              0                  A                  A
## 1101                              0                  D                  D
## 1102                              0                  D                  D
## 1103                              0                  E                  F
## 1104                              0                  A                  A
## 1105                              0                  A                  A
## 1106                              0                  A                  E
## 1107                              0                  A                  C
## 1108                              0                  D                  D
## 1109                              0                  E                  F
## 1110                              0                  C                  C
## 1111                              0                  D                  D
## 1112                              0                  E                  E
## 1113                              0                  A                  A
## 1114                              0                  A                  A
## 1115                              0                  E                  E
## 1116                              0                  D                  D
## 1117                              0                  D                  D
## 1118                              0                  A                  G
## 1119                              0                  E                  E
## 1120                              0                  D                  D
## 1121                              0                  A                  E
## 1122                              0                  C                  C
## 1123                              0                  E                  E
## 1124                              0                  A                  A
## 1125                              0                  A                  D
## 1126                              0                  D                  D
## 1127                              0                  E                  E
## 1128                              0                  D                  D
## 1129                              0                  H                  H
## 1130                              0                  D                  G
## 1131                              0                  A                  A
## 1132                              0                  E                  E
## 1133                              0                  D                  D
## 1134                              0                  A                  E
## 1135                              0                  D                  D
## 1136                              0                  A                  A
## 1137                              0                  A                  A
## 1138                              0                  A                  A
## 1139                              0                  C                  C
## 1140                              0                  A                  A
## 1141                              0                  E                  E
## 1142                              0                  A                  A
## 1143                              0                  A                  A
## 1144                              0                  A                  A
## 1145                              0                  A                  A
## 1146                              0                  A                  A
## 1147                              0                  E                  E
## 1148                              0                  G                  G
## 1149                              0                  A                  A
## 1150                              0                  A                  A
## 1151                              0                  A                  A
## 1152                              0                  H                  H
## 1153                              0                  A                  A
## 1154                              0                  A                  A
## 1155                              0                  D                  D
## 1156                              0                  D                  D
## 1157                              0                  A                  A
## 1158                              0                  A                  A
## 1159                              0                  A                  C
## 1160                              0                  E                  E
## 1161                              0                  H                  H
## 1162                              0                  A                  A
## 1163                              0                  A                  A
## 1164                              0                  A                  A
## 1165                              0                  A                  A
## 1166                              0                  A                  A
## 1167                              0                  A                  A
## 1168                              0                  A                  A
## 1169                              0                  A                  A
## 1170                              0                  A                  A
## 1171                              0                  D                  D
## 1172                              0                  E                  E
## 1173                              0                  A                  A
## 1174                              0                  E                  E
## 1175                              0                  D                  D
## 1176                              0                  F                  F
## 1177                              0                  F                  F
## 1178                              0                  A                  A
## 1179                              0                  F                  G
## 1180                              0                  E                  F
## 1181                              0                  D                  D
## 1182                              0                  D                  D
## 1183                              0                  A                  A
## 1184                              0                  D                  D
## 1185                              0                  A                  A
## 1186                              0                  E                  E
## 1187                              0                  E                  E
## 1188                              0                  G                  G
## 1189                              0                  D                  F
## 1190                              0                  D                  D
## 1191                              0                  D                  D
## 1192                              0                  D                  E
## 1193                              0                  D                  D
## 1194                              0                  C                  C
## 1195                              0                  D                  D
## 1196                              0                  A                  A
## 1197                              0                  G                  G
## 1198                              0                  A                  A
## 1199                              0                  E                  E
## 1200                              0                  D                  E
## 1201                              0                  D                  D
## 1202                              0                  A                  E
## 1203                              0                  A                  A
## 1204                              0                  A                  A
## 1205                              0                  A                  A
## 1206                              0                  D                  D
## 1207                              0                  A                  F
## 1208                              0                  E                  G
## 1209                              0                  A                  A
## 1210                              0                  A                  H
## 1211                              0                  D                  D
## 1212                              0                  A                  A
## 1213                              0                  D                  G
## 1214                              0                  D                  E
## 1215                              0                  F                  F
## 1216                              0                  A                  A
## 1217                              0                  E                  F
## 1218                              0                  E                  F
## 1219                              0                  D                  F
## 1220                              0                  D                  F
## 1221                              0                  A                  A
## 1222                              0                  E                  E
## 1223                              0                  A                  E
## 1224                              0                  A                  A
## 1225                              0                  A                  D
## 1226                              0                  A                  A
## 1227                              0                  E                  E
## 1228                              0                  G                  G
## 1229                              0                  A                  C
## 1230                              0                  A                  C
## 1231                              0                  A                  C
## 1232                              0                  E                  E
## 1233                              0                  A                  E
## 1234                              0                  A                  B
## 1235                              0                  A                  A
## 1236                              0                  G                  G
## 1237                              0                  E                  E
## 1238                              0                  D                  D
## 1239                              0                  D                  D
## 1240                              0                  A                  F
## 1241                              0                  A                  C
## 1242                              0                  A                  F
## 1243                              0                  A                  E
## 1244                              0                  A                  E
## 1245                              0                  D                  D
## 1246                              0                  A                  D
## 1247                              0                  E                  E
## 1248                              0                  A                  A
## 1249                              0                  A                  A
## 1250                              0                  A                  A
## 1251                              0                  G                  G
## 1252                              0                  A                  A
## 1253                              0                  A                  A
## 1254                              0                  D                  E
## 1255                              0                  E                  E
## 1256                              0                  D                  E
## 1257                              0                  E                  E
## 1258                              0                  D                  D
## 1259                              0                  D                  D
## 1260                              0                  D                  D
## 1261                              0                  D                  D
## 1262                              0                  A                  A
## 1263                              0                  F                  F
## 1264                              0                  D                  D
## 1265                              0                  A                  H
## 1266                              0                  E                  F
## 1267                              0                  E                  G
## 1268                              0                  D                  D
## 1269                              0                  A                  A
## 1270                              0                  G                  G
## 1271                              0                  A                  A
## 1272                              0                  E                  F
## 1273                              0                  E                  E
## 1274                              0                  D                  D
## 1275                              0                  E                  E
## 1276                              0                  D                  E
## 1277                              0                  D                  D
## 1278                              0                  E                  E
## 1279                              0                  A                  A
## 1280                              0                  D                  D
## 1281                              0                  D                  D
## 1282                              0                  A                  A
## 1283                              0                  D                  D
## 1284                              0                  A                  A
## 1285                              0                  E                  E
## 1286                              0                  A                  A
## 1287                              0                  A                  A
## 1288                              0                  A                  A
## 1289                              0                  A                  A
## 1290                              0                  A                  A
## 1291                              0                  D                  D
## 1292                              0                  D                  D
## 1293                              0                  A                  A
## 1294                              0                  D                  D
## 1295                              0                  A                  D
## 1296                              0                  D                  D
## 1297                              0                  E                  E
## 1298                              0                  D                  G
## 1299                              0                  A                  A
## 1300                              0                  A                  A
## 1301                              0                  E                  E
## 1302                              0                  D                  D
## 1303                              0                  A                  A
## 1304                              0                  F                  F
## 1305                              0                  A                  E
## 1306                              0                  G                  G
## 1307                              0                  A                  H
## 1308                              0                  A                  A
## 1309                              0                  A                  A
## 1310                              0                  A                  C
## 1311                              0                  A                  H
## 1312                              0                  A                  A
## 1313                              0                  A                  A
## 1314                              0                  A                  A
## 1315                              0                  A                  C
## 1316                              0                  D                  E
## 1317                              0                  D                  E
## 1318                              0                  A                  A
## 1319                              0                  A                  A
## 1320                              0                  D                  D
## 1321                              0                  A                  A
## 1322                              0                  E                  E
## 1323                              0                  D                  D
## 1324                              0                  A                  A
## 1325                              0                  A                  A
## 1326                              0                  A                  G
## 1327                              0                  D                  D
## 1328                              0                  E                  F
## 1329                              0                  A                  C
## 1330                              0                  E                  E
## 1331                              0                  E                  E
## 1332                              0                  A                  D
## 1333                              0                  E                  E
## 1334                              0                  E                  E
## 1335                              0                  A                  C
## 1336                              0                  D                  D
## 1337                              0                  A                  A
## 1338                              0                  F                  F
## 1339                              0                  D                  D
## 1340                              0                  A                  A
## 1341                              0                  A                  A
## 1342                              0                  A                  A
## 1343                              0                  A                  A
## 1344                              0                  A                  A
## 1345                              0                  A                  A
## 1346                              0                  D                  D
## 1347                              0                  E                  F
## 1348                              0                  A                  D
## 1349                              0                  E                  F
## 1350                              0                  A                  H
## 1351                              0                  A                  E
## 1352                              0                  A                  E
## 1353                              0                  G                  G
## 1354                              0                  A                  A
## 1355                              0                  E                  E
## 1356                              0                  A                  H
## 1357                              0                  A                  A
## 1358                              0                  D                  D
## 1359                              0                  D                  D
## 1360                              0                  A                  A
## 1361                              0                  D                  D
## 1362                              0                  D                  D
## 1363                              0                  D                  D
## 1364                              0                  D                  D
## 1365                              0                  A                  C
## 1366                              0                  A                  A
## 1367                              0                  A                  A
## 1368                              0                  A                  C
## 1369                              0                  E                  G
## 1370                              0                  A                  A
## 1371                              0                  A                  A
## 1372                              0                  A                  C
## 1373                              0                  A                  A
## 1374                              0                  A                  A
## 1375                              0                  A                  A
## 1376                              0                  D                  F
## 1377                              0                  A                  A
## 1378                              0                  E                  E
## 1379                              0                  A                  A
## 1380                              0                  A                  A
## 1381                              0                  A                  A
## 1382                              0                  F                  F
## 1383                              0                  D                  D
## 1384                              0                  G                  G
## 1385                              0                  E                  F
## 1386                              0                  A                  A
## 1387                              0                  A                  A
## 1388                              0                  G                  G
## 1389                              0                  D                  D
## 1390                              0                  A                  E
## 1391                              0                  A                  A
## 1392                              0                  A                  D
## 1393                              0                  A                  D
## 1394                              0                  A                  E
## 1395                              0                  A                  A
## 1396                              0                  A                  A
## 1397                              0                  E                  E
## 1398                              0                  A                  A
## 1399                              0                  A                  C
## 1400                              0                  D                  D
## 1401                              0                  A                  A
## 1402                              0                  A                  A
## 1403                              0                  A                  D
## 1404                              0                  A                  G
## 1405                              0                  A                  A
## 1406                              0                  A                  C
## 1407                              0                  A                  D
## 1408                              0                  A                  C
## 1409                              0                  E                  E
## 1410                              0                  C                  C
## 1411                              0                  A                  A
## 1412                              0                  A                  A
## 1413                              0                  A                  A
## 1414                              0                  A                  A
## 1415                              0                  A                  A
## 1416                              0                  A                  A
## 1417                              0                  E                  G
## 1418                              0                  G                  G
## 1419                              0                  E                  E
## 1420                              0                  E                  E
## 1421                              0                  D                  D
## 1422                              0                  A                  A
## 1423                              0                  A                  A
## 1424                              0                  F                  F
## 1425                              0                  A                  A
## 1426                              0                  A                  C
## 1427                              0                  A                  A
## 1428                              0                  A                  A
## 1429                              0                  A                  A
## 1430                              0                  A                  A
## 1431                              0                  A                  E
## 1432                              0                  D                  D
## 1433                              0                  A                  A
## 1434                              0                  D                  D
## 1435                              0                  D                  D
## 1436                              0                  D                  D
## 1437                              0                  A                  G
## 1438                              0                  A                  F
## 1439                              0                  A                  D
## 1440                              0                  F                  F
## 1441                              0                  A                  A
## 1442                              0                  D                  D
## 1443                              0                  A                  A
## 1444                              0                  A                  A
## 1445                              0                  D                  E
## 1446                              0                  A                  A
## 1447                              0                  A                  A
## 1448                              0                  A                  A
## 1449                              0                  A                  D
## 1450                              0                  A                  A
## 1451                              0                  A                  D
## 1452                              0                  A                  A
## 1453                              0                  A                  A
## 1454                              0                  A                  A
## 1455                              0                  A                  D
## 1456                              0                  A                  A
## 1457                              0                  D                  D
## 1458                              0                  A                  A
## 1459                              0                  D                  D
## 1460                              0                  A                  A
## 1461                              0                  A                  A
## 1462                              0                  F                  F
## 1463                              0                  E                  E
## 1464                              0                  A                  D
## 1465                              0                  A                  A
## 1466                              0                  D                  D
## 1467                              0                  A                  A
## 1468                              0                  A                  A
## 1469                              0                  A                  A
## 1470                              0                  E                  E
## 1471                              0                  A                  A
## 1472                              0                  A                  A
## 1473                              0                  E                  E
## 1474                              0                  G                  G
## 1475                              0                  A                  C
## 1476                              0                  A                  A
## 1477                              0                  A                  A
## 1478                              0                  A                  A
## 1479                              0                  A                  A
## 1480                              0                  A                  A
## 1481                              0                  E                  E
## 1482                              0                  A                  A
## 1483                              0                  A                  A
## 1484                              0                  A                  A
## 1485                              0                  A                  A
## 1486                              0                  D                  D
## 1487                              0                  A                  A
## 1488                              0                  D                  D
## 1489                              0                  D                  D
## 1490                              0                  D                  D
## 1491                              0                  D                  D
## 1492                              0                  D                  D
## 1493                              0                  A                  E
## 1494                              0                  A                  E
## 1495                              0                  A                  E
## 1496                              0                  A                  D
## 1497                              0                  D                  D
## 1498                              0                  D                  D
## 1499                              0                  A                  E
## 1500                              0                  A                  H
## 1501                              0                  G                  G
## 1502                              0                  A                  H
## 1503                              0                  G                  G
## 1504                              0                  D                  D
## 1505                              0                  F                  F
## 1506                              0                  D                  D
## 1507                              0                  D                  D
## 1508                              0                  A                  E
## 1509                              0                  A                  D
## 1510                              0                  F                  F
## 1511                              0                  F                  F
## 1512                              0                  D                  D
## 1513                              0                  A                  A
## 1514                              0                  D                  D
## 1515                              0                  A                  A
## 1516                              0                  A                  A
## 1517                              0                  D                  D
## 1518                              0                  A                  A
## 1519                              0                  E                  E
## 1520                              0                  A                  A
## 1521                              0                  A                  A
## 1522                              0                  A                  A
## 1523                              0                  A                  A
## 1524                              0                  A                  A
## 1525                              0                  A                  A
## 1526                              0                  D                  D
## 1527                              0                  F                  F
## 1528                              0                  A                  A
## 1529                              0                  A                  I
## 1530                              0                  D                  A
## 1531                              0                  A                  A
## 1532                              0                  A                  A
## 1533                              0                  A                  A
## 1534                              0                  A                  A
## 1535                              0                  A                  A
## 1536                              0                  A                  A
## 1537                              0                  E                  E
## 1538                              0                  E                  F
## 1539                              0                  C                  C
## 1540                              0                  A                  A
## 1541                              0                  A                  E
## 1542                              0                  A                  A
## 1543                              0                  A                  A
## 1544                              0                  A                  A
## 1545                              0                  A                  A
## 1546                              0                  G                  G
## 1547                              0                  E                  F
## 1548                              0                  E                  E
## 1549                              0                  A                  A
## 1550                              0                  A                  A
## 1551                              0                  D                  D
## 1552                              0                  A                  A
## 1553                              0                  D                  D
## 1554                              0                  A                  A
## 1555                              0                  A                  A
## 1556                              0                  A                  I
## 1557                              0                  A                  E
## 1558                              0                  G                  G
## 1559                              0                  A                  A
## 1560                              0                  D                  D
## 1561                              0                  D                  D
## 1562                              0                  D                  D
## 1563                              0                  A                  A
## 1564                              0                  A                  A
## 1565                              0                  E                  D
## 1566                              0                  A                  A
## 1567                              0                  F                  E
## 1568                              0                  A                  A
## 1569                              0                  A                  A
## 1570                              0                  A                  A
## 1571                              0                  E                  F
## 1572                              0                  A                  A
## 1573                              0                  A                  A
## 1574                              0                  A                  A
## 1575                              0                  F                  F
## 1576                              0                  A                  D
## 1577                              0                  C                  C
## 1578                              0                  E                  E
## 1579                              0                  A                  E
## 1580                              0                  A                  A
## 1581                              0                  D                  D
## 1582                              0                  A                  G
## 1583                              0                  A                  D
## 1584                              0                  A                  D
## 1585                              0                  A                  D
## 1586                              0                  A                  D
## 1587                              0                  A                  F
## 1588                              0                  A                  D
## 1589                              0                  A                  D
## 1590                              0                  D                  D
## 1591                              0                  A                  D
## 1592                              0                  D                  D
## 1593                              0                  A                  A
## 1594                              0                  A                  A
## 1595                              0                  A                  A
## 1596                              0                  A                  A
## 1597                              0                  A                  A
## 1598                              0                  A                  A
## 1599                              0                  A                  A
## 1600                              0                  A                  A
## 1601                              0                  A                  A
## 1602                              0                  A                  A
## 1603                              0                  A                  A
## 1604                              0                  A                  A
## 1605                              0                  A                  A
## 1606                              0                  A                  A
## 1607                              0                  A                  A
## 1608                              0                  A                  A
## 1609                              0                  A                  A
## 1610                              0                  A                  A
## 1611                              0                  D                  D
## 1612                              0                  A                  A
## 1613                              0                  A                  A
## 1614                              0                  A                  A
## 1615                              0                  A                  A
## 1616                              0                  A                  A
## 1617                              0                  E                  E
## 1618                              0                  A                  A
## 1619                              0                  A                  A
## 1620                              0                  D                  D
## 1621                              0                  A                  A
## 1622                              0                  D                  D
## 1623                              0                  D                  D
## 1624                              0                  E                  E
## 1625                              0                  F                  F
## 1626                              0                  A                  F
## 1627                              0                  A                  C
## 1628                              0                  A                  F
## 1629                              0                  D                  D
## 1630                              0                  A                  A
## 1631                              0                  E                  E
## 1632                              0                  A                  A
## 1633                              0                  A                  I
## 1634                              0                  A                  I
## 1635                              0                  A                  D
## 1636                              0                  A                  C
## 1637                              0                  A                  A
## 1638                              0                  D                  D
## 1639                              0                  A                  A
## 1640                              0                  A                  A
## 1641                              0                  D                  D
## 1642                              0                  E                  E
## 1643                              0                  A                  D
## 1644                              0                  D                  E
## 1645                              0                  A                  D
## 1646                              0                  E                  E
## 1647                              0                  A                  A
## 1648                              0                  A                  E
## 1649                              0                  E                  F
## 1650                              0                  A                  C
## 1651                              0                  E                  E
## 1652                              0                  F                  F
## 1653                              0                  D                  D
## 1654                              0                  A                  C
## 1655                              0                  A                  D
## 1656                              0                  D                  D
## 1657                              0                  D                  E
## 1658                              0                  A                  E
## 1659                              0                  A                  E
## 1660                              0                  D                  E
## 1661                              0                  A                  D
## 1662                              0                  D                  E
## 1663                              0                  D                  E
## 1664                              0                  E                  E
## 1665                              0                  A                  E
## 1666                              0                  A                  A
## 1667                              0                  D                  D
## 1668                              0                  A                  A
## 1669                              0                  G                  G
## 1670                              0                  E                  E
## 1671                              0                  E                  E
## 1672                              0                  E                  E
## 1673                              0                  E                  G
## 1674                              0                  D                  D
## 1675                              0                  D                  D
## 1676                              0                  A                  D
## 1677                              0                  D                  D
## 1678                              0                  D                  D
## 1679                              0                  D                  D
## 1680                              0                  A                  D
## 1681                              0                  F                  G
## 1682                              0                  A                  D
## 1683                              0                  A                  A
## 1684                              0                  D                  D
## 1685                              0                  A                  D
## 1686                              0                  D                  D
## 1687                              0                  A                  A
## 1688                              0                  D                  D
## 1689                              0                  A                  D
## 1690                              0                  A                  C
## 1691                              0                  A                  C
## 1692                              0                  A                  A
## 1693                              0                  F                  F
## 1694                              0                  D                  D
## 1695                              0                  A                  B
## 1696                              0                  E                  E
## 1697                              0                  A                  A
## 1698                              0                  A                  D
## 1699                              0                  E                  E
## 1700                              0                  A                  C
## 1701                              0                  D                  D
## 1702                              0                  A                  D
## 1703                              0                  A                  A
## 1704                              0                  E                  E
## 1705                              0                  D                  D
## 1706                              0                  A                  A
## 1707                              0                  A                  A
## 1708                              0                  E                  E
## 1709                              0                  G                  G
## 1710                              0                  A                  A
## 1711                              0                  A                  A
## 1712                              0                  D                  D
## 1713                              0                  E                  F
## 1714                              0                  A                  D
## 1715                              0                  A                  A
## 1716                              0                  D                  D
## 1717                              0                  A                  A
## 1718                              0                  A                  A
## 1719                              0                  C                  C
## 1720                              0                  D                  D
## 1721                              0                  A                  A
## 1722                              0                  E                  E
## 1723                              0                  E                  G
## 1724                              0                  A                  A
## 1725                              0                  D                  D
## 1726                              0                  E                  E
## 1727                              0                  A                  A
## 1728                              0                  D                  D
## 1729                              0                  A                  A
## 1730                              0                  A                  A
## 1731                              0                  A                  A
## 1732                              0                  A                  A
## 1733                              0                  A                  A
## 1734                              0                  A                  A
## 1735                              0                  D                  F
## 1736                              0                  D                  D
## 1737                              0                  A                  A
## 1738                              0                  A                  A
## 1739                              0                  D                  D
## 1740                              0                  A                  A
## 1741                              0                  A                  A
## 1742                              0                  A                  A
## 1743                              0                  A                  A
## 1744                              0                  A                  A
## 1745                              0                  A                  A
## 1746                              0                  A                  A
## 1747                              0                  A                  D
## 1748                              0                  A                  A
## 1749                              0                  A                  D
## 1750                              0                  A                  D
## 1751                              0                  A                  D
## 1752                              0                  A                  D
## 1753                              0                  A                  A
## 1754                              0                  A                  A
## 1755                              0                  A                  E
## 1756                              0                  A                  A
## 1757                              0                  A                  A
## 1758                              0                  A                  A
## 1759                              0                  A                  A
## 1760                              0                  F                  F
## 1761                              0                  A                  D
## 1762                              0                  D                  D
## 1763                              0                  D                  D
## 1764                              0                  A                  A
## 1765                              0                  A                  A
## 1766                              0                  A                  A
## 1767                              0                  A                  D
## 1768                              0                  A                  A
## 1769                              0                  E                  E
## 1770                              0                  A                  A
## 1771                              0                  A                  A
## 1772                              0                  A                  D
## 1773                              0                  F                  F
## 1774                              0                  A                  A
## 1775                              0                  A                  A
## 1776                              0                  A                  A
## 1777                              0                  A                  A
## 1778                              0                  E                  E
## 1779                              0                  D                  D
## 1780                              0                  A                  A
## 1781                              0                  E                  E
## 1782                              0                  D                  D
## 1783                              0                  E                  E
## 1784                              0                  A                  E
## 1785                              0                  A                  D
## 1786                              0                  A                  A
## 1787                              0                  A                  A
## 1788                              0                  A                  A
## 1789                              0                  F                  F
## 1790                              0                  A                  A
## 1791                              0                  D                  D
## 1792                              0                  A                  A
## 1793                              0                  A                  D
## 1794                              0                  A                  D
## 1795                              0                  E                  E
## 1796                              0                  A                  A
## 1797                              0                  A                  D
## 1798                              0                  A                  A
## 1799                              0                  A                  A
## 1800                              0                  A                  D
## 1801                              0                  A                  A
## 1802                              0                  A                  D
## 1803                              0                  A                  A
## 1804                              0                  A                  A
## 1805                              0                  A                  A
## 1806                              0                  A                  A
## 1807                              0                  A                  A
## 1808                              0                  A                  D
## 1809                              0                  A                  A
## 1810                              0                  A                  A
## 1811                              0                  A                  E
## 1812                              0                  E                  E
## 1813                              0                  H                  H
## 1814                              0                  A                  A
## 1815                              0                  A                  A
## 1816                              0                  D                  D
## 1817                              0                  A                  A
## 1818                              0                  E                  G
## 1819                              0                  A                  D
## 1820                              0                  A                  A
## 1821                              0                  E                  E
## 1822                              0                  A                  D
## 1823                              0                  A                  A
## 1824                              0                  A                  D
## 1825                              0                  D                  D
## 1826                              0                  F                  F
## 1827                              0                  E                  E
## 1828                              0                  A                  A
## 1829                              0                  A                  A
## 1830                              0                  D                  D
## 1831                              0                  A                  D
## 1832                              0                  A                  D
## 1833                              0                  A                  D
## 1834                              0                  E                  E
## 1835                              0                  A                  A
## 1836                              0                  A                  E
## 1837                              0                  E                  G
## 1838                              0                  A                  A
## 1839                              0                  A                  A
## 1840                              0                  D                  D
## 1841                              0                  A                  A
## 1842                              0                  A                  A
## 1843                              0                  A                  D
## 1844                              0                  D                  D
## 1845                              0                  C                  C
## 1846                              0                  A                  D
## 1847                              0                  D                  D
## 1848                              0                  D                  D
## 1849                              0                  A                  A
## 1850                              0                  A                  A
## 1851                              0                  A                  A
## 1852                              0                  A                  A
## 1853                              0                  A                  A
## 1854                              0                  A                  A
## 1855                              0                  A                  A
## 1856                              0                  A                  A
## 1857                              0                  A                  F
## 1858                              0                  A                  A
## 1859                              0                  A                  A
## 1860                              0                  A                  A
## 1861                              0                  A                  A
## 1862                              0                  A                  A
## 1863                              0                  A                  A
## 1864                              0                  A                  A
## 1865                              0                  A                  A
## 1866                              0                  E                  E
## 1867                              0                  E                  E
## 1868                              0                  A                  A
## 1869                              0                  E                  E
## 1870                              0                  A                  A
## 1871                              0                  A                  A
## 1872                              0                  A                  D
## 1873                              0                  A                  D
## 1874                              0                  A                  C
## 1875                              0                  A                  D
## 1876                              0                  D                  D
## 1877                              0                  A                  D
## 1878                              0                  A                  C
## 1879                              0                  A                  D
## 1880                              0                  A                  A
## 1881                              0                  E                  E
## 1882                              0                  A                  A
## 1883                              0                  A                  A
## 1884                              0                  A                  A
## 1885                              0                  A                  A
## 1886                              0                  E                  E
## 1887                              0                  D                  D
## 1888                              0                  D                  D
## 1889                              0                  A                  E
## 1890                              0                  A                  A
## 1891                              0                  E                  E
## 1892                              0                  E                  F
## 1893                              0                  A                  D
## 1894                              0                  E                  E
## 1895                              0                  E                  E
## 1896                              0                  E                  E
## 1897                              0                  E                  E
## 1898                              0                  A                  A
## 1899                              0                  A                  D
## 1900                              0                  A                  A
## 1901                              0                  A                  A
## 1902                              0                  A                  D
## 1903                              0                  A                  A
## 1904                              0                  A                  A
## 1905                              0                  A                  A
## 1906                              0                  A                  A
## 1907                              0                  A                  D
## 1908                              0                  A                  D
## 1909                              0                  F                  F
## 1910                              0                  D                  D
## 1911                              0                  A                  A
## 1912                              0                  A                  D
## 1913                              0                  A                  A
## 1914                              0                  A                  D
## 1915                              0                  D                  D
## 1916                              0                  A                  A
## 1917                              0                  A                  D
## 1918                              0                  E                  E
## 1919                              0                  A                  D
## 1920                              0                  A                  D
## 1921                              0                  A                  D
## 1922                              0                  H                  H
## 1923                              0                  A                  C
## 1924                              0                  A                  D
## 1925                              0                  A                  D
## 1926                              0                  A                  A
## 1927                              0                  E                  E
## 1928                              0                  E                  E
## 1929                              0                  A                  D
## 1930                              0                  A                  D
## 1931                              0                  D                  D
## 1932                              0                  D                  D
## 1933                              0                  A                  D
## 1934                              0                  A                  E
## 1935                              0                  D                  D
## 1936                              0                  A                  C
## 1937                              0                  A                  C
## 1938                              0                  A                  D
## 1939                              0                  D                  D
## 1940                              0                  E                  E
## 1941                              0                  A                  D
## 1942                              0                  A                  C
## 1943                              0                  A                  A
## 1944                              0                  A                  D
## 1945                              0                  A                  C
## 1946                              0                  A                  D
## 1947                              0                  A                  D
## 1948                              0                  A                  D
## 1949                              0                  D                  D
## 1950                              0                  A                  A
## 1951                              0                  A                  A
## 1952                              0                  D                  D
## 1953                              0                  A                  C
## 1954                              0                  E                  E
## 1955                              0                  A                  E
## 1956                              0                  A                  D
## 1957                              0                  A                  C
## 1958                              0                  A                  A
## 1959                              0                  A                  A
## 1960                              0                  A                  E
## 1961                              0                  A                  E
## 1962                              0                  D                  D
## 1963                              0                  D                  D
## 1964                              0                  A                  C
## 1965                              0                  G                  G
## 1966                              0                  D                  D
## 1967                              0                  A                  D
## 1968                              0                  A                  C
## 1969                              0                  E                  E
## 1970                              0                  A                  F
## 1971                              0                  A                  I
## 1972                              0                  A                  I
## 1973                              0                  A                  D
## 1974                              0                  D                  F
## 1975                              0                  F                  F
## 1976                              0                  D                  D
## 1977                              0                  E                  E
## 1978                              0                  E                  E
## 1979                              0                  F                  F
## 1980                              0                  E                  E
## 1981                              0                  D                  D
## 1982                              0                  E                  E
## 1983                              0                  A                  A
## 1984                              0                  A                  A
## 1985                              0                  A                  A
## 1986                              0                  A                  E
## 1987                              0                  A                  A
## 1988                              0                  A                  A
## 1989                              0                  A                  D
## 1990                              0                  A                  D
## 1991                              0                  A                  A
## 1992                              0                  A                  A
## 1993                              0                  A                  A
## 1994                              0                  A                  A
## 1995                              0                  A                  A
## 1996                              0                  A                  A
## 1997                              0                  A                  A
## 1998                              0                  A                  A
## 1999                              0                  A                  A
## 2000                              0                  A                  A
## 2001                              0                  A                  A
## 2002                              0                  A                  A
## 2003                              0                  A                  A
## 2004                              0                  A                  A
## 2005                              0                  A                  A
## 2006                              0                  A                  A
## 2007                              0                  A                  A
## 2008                              0                  A                  A
## 2009                              0                  A                  A
## 2010                              0                  A                  A
## 2011                              0                  A                  A
## 2012                              0                  A                  A
## 2013                              0                  A                  A
## 2014                              0                  A                  A
## 2015                              0                  A                  A
## 2016                              0                  A                  A
## 2017                              0                  C                  C
## 2018                              0                  A                  A
## 2019                              0                  E                  E
## 2020                              0                  G                  G
## 2021                              0                  E                  E
## 2022                              0                  E                  E
## 2023                              0                  A                  C
## 2024                              0                  A                  C
## 2025                              0                  A                  A
## 2026                              0                  A                  A
## 2027                              0                  A                  A
## 2028                              0                  A                  A
## 2029                              0                  A                  D
## 2030                              0                  A                  C
## 2031                              0                  A                  C
## 2032                              0                  A                  C
## 2033                              0                  A                  E
## 2034                              0                  A                  C
## 2035                              0                  A                  A
## 2036                              0                  A                  C
## 2037                              0                  A                  C
## 2038                              0                  A                  A
## 2039                              0                  A                  E
## 2040                              0                  A                  A
## 2041                              0                  A                  C
## 2042                              0                  A                  D
## 2043                              0                  A                  A
## 2044                              0                  A                  D
## 2045                              0                  A                  E
## 2046                              0                  A                  D
## 2047                              0                  A                  D
## 2048                              0                  A                  D
## 2049                              0                  A                  G
## 2050                              0                  A                  E
## 2051                              0                  A                  A
## 2052                              0                  C                  H
## 2053                              0                  A                  D
## 2054                              0                  A                  E
## 2055                              0                  A                  D
## 2056                              0                  A                  D
## 2057                              0                  A                  D
## 2058                              0                  A                  E
## 2059                              0                  A                  E
## 2060                              0                  A                  E
## 2061                              0                  A                  E
## 2062                              0                  C                  H
## 2063                              0                  D                  F
## 2064                              0                  A                  E
## 2065                              0                  A                  D
## 2066                              0                  A                  D
## 2067                              0                  A                  E
## 2068                              0                  A                  A
## 2069                              0                  A                  F
## 2070                              0                  A                  D
## 2071                              0                  A                  D
## 2072                              0                  A                  D
## 2073                              0                  A                  G
## 2074                              0                  A                  D
## 2075                              0                  A                  D
## 2076                              0                  A                  D
## 2077                              0                  D                  G
## 2078                              0                  C                  H
## 2079                              0                  A                  G
## 2080                              0                  A                  E
## 2081                              0                  A                  E
## 2082                              0                  A                  D
## 2083                              0                  A                  D
## 2084                              0                  A                  E
## 2085                              0                  A                  G
## 2086                              0                  A                  D
## 2087                              0                  A                  A
## 2088                              0                  E                  A
## 2089                              0                  E                  E
## 2090                              0                  A                  A
## 2091                              0                  D                  D
## 2092                              0                  A                  D
## 2093                              0                  A                  A
## 2094                              0                  D                  D
## 2095                              0                  A                  A
## 2096                              0                  A                  A
## 2097                              0                  A                  A
## 2098                              0                  A                  A
## 2099                              0                  A                  A
## 2100                              0                  A                  A
## 2101                              0                  D                  D
## 2102                              0                  D                  D
## 2103                              0                  A                  A
## 2104                              0                  E                  E
## 2105                              0                  A                  A
## 2106                              0                  A                  A
## 2107                              0                  A                  D
## 2108                              0                  A                  C
## 2109                              0                  A                  A
## 2110                              0                  E                  E
## 2111                              0                  A                  I
## 2112                              0                  A                  A
## 2113                              0                  A                  A
## 2114                              0                  A                  I
## 2115                              0                  E                  E
## 2116                              0                  E                  E
## 2117                              0                  E                  E
## 2118                              0                  E                  E
## 2119                              0                  E                  E
## 2120                              0                  E                  E
## 2121                              0                  D                  D
## 2122                              0                  D                  D
## 2123                              0                  F                  F
## 2124                              0                  A                  A
## 2125                              0                  A                  A
## 2126                              0                  D                  D
## 2127                              0                  D                  D
## 2128                              0                  A                  D
## 2129                              0                  D                  D
## 2130                              0                  A                  A
## 2131                              0                  A                  I
## 2132                              0                  A                  A
## 2133                              0                  A                  A
## 2134                              0                  A                  A
## 2135                              0                  A                  A
## 2136                              0                  A                  A
## 2137                              0                  A                  D
## 2138                              0                  A                  A
## 2139                              0                  A                  A
## 2140                              0                  A                  C
## 2141                              0                  A                  A
## 2142                              0                  A                  A
## 2143                              0                  A                  A
## 2144                              0                  A                  A
## 2145                              0                  A                  A
## 2146                              0                  A                  A
## 2147                              0                  A                  A
## 2148                              0                  A                  A
## 2149                              0                  A                  D
## 2150                              0                  A                  D
## 2151                              0                  A                  D
## 2152                              0                  A                  F
## 2153                              0                  A                  A
## 2154                              0                  A                  A
## 2155                              0                  A                  A
## 2156                              0                  A                  D
## 2157                              0                  A                  A
## 2158                              0                  A                  A
## 2159                              0                  A                  C
## 2160                              0                  A                  D
## 2161                              0                  A                  D
## 2162                              0                  A                  A
## 2163                              0                  A                  A
## 2164                              0                  F                  F
## 2165                              0                  A                  A
## 2166                              0                  A                  A
## 2167                              0                  A                  A
## 2168                              0                  A                  C
## 2169                              0                  E                  E
## 2170                              0                  E                  E
## 2171                              0                  E                  E
## 2172                              0                  E                  E
## 2173                              0                  F                  I
## 2174                              0                  A                  D
## 2175                              0                  A                  A
## 2176                              0                  A                  A
## 2177                              0                  A                  A
## 2178                              0                  A                  A
## 2179                              0                  A                  A
## 2180                              0                  A                  A
## 2181                              0                  A                  A
## 2182                              0                  E                  E
## 2183                              0                  D                  D
## 2184                              0                  A                  A
## 2185                              0                  A                  A
## 2186                              0                  A                  A
## 2187                              0                  A                  I
## 2188                              0                  A                  A
## 2189                              0                  A                  A
## 2190                              0                  D                  E
## 2191                              0                  D                  D
## 2192                              0                  E                  E
## 2193                              0                  A                  I
## 2194                              0                  E                  E
## 2195                              0                  A                  F
## 2196                              0                  E                  E
## 2197                              0                  D                  D
## 2198                              0                  E                  E
## 2199                              0                  A                  D
## 2200                              0                  A                  A
## 2201                              0                  A                  A
## 2202                              0                  E                  E
## 2203                              0                  A                  A
## 2204                              0                  E                  E
## 2205                              0                  A                  A
## 2206                              0                  A                  A
## 2207                              0                  A                  D
## 2208                              0                  A                  A
## 2209                              0                  A                  A
## 2210                              0                  A                  A
## 2211                              0                  A                  A
## 2212                              0                  A                  A
## 2213                              0                  A                  A
## 2214                              0                  A                  D
## 2215                              0                  E                  E
## 2216                              0                  A                  A
## 2217                              0                  D                  D
## 2218                              0                  D                  D
## 2219                              0                  A                  D
## 2220                              0                  E                  E
## 2221                              0                  F                  F
## 2222                              0                  F                  F
## 2223                              0                  E                  E
## 2224                              0                  A                  A
## 2225                              0                  D                  D
## 2226                              0                  A                  D
## 2227                              0                  A                  A
## 2228                              0                  A                  D
## 2229                              0                  E                  E
## 2230                              0                  A                  A
## 2231                              0                  A                  A
## 2232                              0                  A                  C
## 2233                              0                  A                  D
## 2234                              0                  A                  A
## 2235                              0                  C                  C
## 2236                              0                  D                  D
## 2237                              0                  G                  G
## 2238                              0                  A                  A
## 2239                              0                  A                  A
## 2240                              0                  G                  G
## 2241                              0                  G                  G
## 2242                              0                  A                  A
## 2243                              0                  A                  D
## 2244                              0                  A                  A
## 2245                              0                  D                  D
## 2246                              0                  A                  D
## 2247                              0                  A                  A
## 2248                              0                  A                  A
## 2249                              0                  A                  A
## 2250                              0                  A                  A
## 2251                              0                  A                  A
## 2252                              0                  A                  A
## 2253                              0                  G                  G
## 2254                              0                  D                  D
## 2255                              0                  E                  E
## 2256                              0                  A                  A
## 2257                              0                  A                  A
## 2258                              0                  E                  E
## 2259                              0                  A                  A
## 2260                              0                  A                  A
## 2261                              0                  G                  G
## 2262                              0                  E                  E
## 2263                              0                  D                  D
## 2264                              0                  E                  E
## 2265                              0                  E                  E
## 2266                              0                  A                  D
## 2267                              0                  A                  A
## 2268                              0                  A                  A
## 2269                              0                  A                  C
## 2270                              0                  A                  D
## 2271                              0                  E                  E
## 2272                              0                  A                  C
## 2273                              0                  A                  C
## 2274                              0                  A                  A
## 2275                              0                  A                  A
## 2276                              0                  A                  A
## 2277                              0                  A                  A
## 2278                              0                  A                  A
## 2279                              0                  A                  A
## 2280                              0                  A                  E
## 2281                              0                  A                  A
## 2282                              0                  A                  A
## 2283                              0                  A                  A
## 2284                              0                  A                  A
## 2285                              0                  A                  A
## 2286                              0                  A                  A
## 2287                              0                  A                  A
## 2288                              0                  A                  A
## 2289                              0                  A                  C
## 2290                              0                  A                  A
## 2291                              0                  A                  A
## 2292                              0                  A                  A
## 2293                              0                  A                  A
## 2294                              0                  A                  A
## 2295                              0                  A                  A
## 2296                              0                  A                  C
## 2297                              0                  A                  C
## 2298                              0                  A                  A
## 2299                              0                  E                  E
## 2300                              0                  C                  C
## 2301                              0                  A                  A
## 2302                              0                  A                  A
## 2303                              0                  A                  A
## 2304                              0                  A                  E
## 2305                              0                  A                  C
## 2306                              0                  A                  A
## 2307                              0                  A                  A
## 2308                              0                  A                  A
## 2309                              0                  A                  A
## 2310                              0                  A                  C
## 2311                              0                  A                  D
## 2312                              0                  A                  A
## 2313                              0                  A                  A
## 2314                              0                  A                  A
## 2315                              0                  A                  B
## 2316                              0                  A                  C
## 2317                              0                  A                  D
## 2318                              0                  A                  A
## 2319                              0                  A                  A
## 2320                              0                  E                  F
## 2321                              0                  A                  A
## 2322                              0                  A                  A
## 2323                              0                  G                  G
## 2324                              0                  A                  D
## 2325                              0                  D                  D
## 2326                              0                  D                  D
## 2327                              0                  A                  A
## 2328                              0                  D                  D
## 2329                              0                  E                  E
## 2330                              0                  D                  D
## 2331                              0                  D                  D
## 2332                              0                  A                  A
## 2333                              0                  A                  A
## 2334                              0                  A                  A
## 2335                              0                  A                  D
## 2336                              0                  H                  H
## 2337                              0                  A                  D
## 2338                              0                  A                  D
## 2339                              0                  D                  E
## 2340                              0                  A                  A
## 2341                              0                  D                  D
## 2342                              0                  D                  D
## 2343                              0                  A                  A
## 2344                              0                  D                  D
## 2345                              0                  E                  E
## 2346                              0                  A                  A
## 2347                              0                  A                  A
## 2348                              0                  D                  I
## 2349                              0                  E                  E
## 2350                              0                  E                  E
## 2351                              0                  E                  E
## 2352                              0                  A                  D
## 2353                              0                  D                  D
## 2354                              0                  A                  D
## 2355                              0                  G                  G
## 2356                              0                  A                  D
## 2357                              0                  A                  A
## 2358                              0                  F                  F
## 2359                              0                  F                  F
## 2360                              0                  A                  D
## 2361                              0                  A                  D
## 2362                              0                  E                  E
## 2363                              0                  A                  A
## 2364                              0                  A                  A
## 2365                              0                  E                  E
## 2366                              0                  D                  D
## 2367                              0                  D                  D
## 2368                              0                  D                  D
## 2369                              0                  D                  G
## 2370                              0                  A                  A
## 2371                              0                  A                  A
## 2372                              0                  A                  A
## 2373                              0                  A                  A
## 2374                              0                  A                  A
## 2375                              0                  A                  A
## 2376                              0                  A                  A
## 2377                              0                  A                  A
## 2378                              0                  A                  A
## 2379                              0                  A                  A
## 2380                              0                  A                  D
## 2381                              0                  E                  E
## 2382                              0                  E                  E
## 2383                              0                  A                  D
## 2384                              0                  E                  E
## 2385                              0                  A                  A
## 2386                              0                  A                  C
## 2387                              0                  A                  A
## 2388                              0                  A                  A
## 2389                              0                  A                  A
## 2390                              0                  A                  A
## 2391                              0                  A                  A
## 2392                              0                  A                  A
## 2393                              0                  A                  A
## 2394                              0                  A                  A
## 2395                              0                  A                  A
## 2396                              0                  A                  A
## 2397                              0                  A                  A
## 2398                              0                  A                  A
## 2399                              0                  A                  A
## 2400                              0                  A                  C
## 2401                              0                  A                  A
## 2402                              0                  A                  A
## 2403                              0                  A                  A
## 2404                              0                  A                  A
## 2405                              0                  A                  A
## 2406                              0                  A                  C
## 2407                              0                  A                  A
## 2408                              0                  D                  D
## 2409                              0                  A                  A
## 2410                              0                  D                  D
## 2411                              0                  A                  D
## 2412                              0                  A                  C
## 2413                              0                  A                  A
## 2414                              0                  A                  A
## 2415                              0                  E                  E
## 2416                              0                  G                  G
## 2417                              0                  E                  E
## 2418                              0                  D                  D
## 2419                              0                  E                  F
## 2420                              0                  A                  A
## 2421                              0                  E                  E
## 2422                              0                  A                  A
## 2423                              0                  D                  D
## 2424                              0                  E                  E
## 2425                              0                  E                  E
## 2426                              0                  E                  E
## 2427                              0                  A                  A
## 2428                              0                  A                  A
## 2429                              0                  E                  E
## 2430                              0                  A                  A
## 2431                              0                  A                  A
## 2432                              0                  A                  C
## 2433                              0                  A                  A
## 2434                              0                  A                  C
## 2435                              0                  A                  A
## 2436                              0                  A                  A
## 2437                              0                  A                  A
## 2438                              0                  A                  A
## 2439                              0                  A                  A
## 2440                              0                  A                  C
## 2441                              0                  A                  A
## 2442                              0                  A                  A
## 2443                              0                  A                  A
## 2444                              0                  A                  C
## 2445                              0                  A                  A
## 2446                              0                  A                  C
## 2447                              0                  A                  A
## 2448                              0                  A                  C
## 2449                              0                  A                  A
## 2450                              0                  A                  A
## 2451                              0                  A                  A
## 2452                              0                  A                  A
## 2453                              0                  D                  D
## 2454                              0                  A                  A
## 2455                              0                  A                  D
## 2456                              0                  E                  E
## 2457                              0                  A                  A
## 2458                              0                  D                  D
## 2459                              0                  D                  D
## 2460                              0                  A                  A
## 2461                              0                  A                  A
## 2462                              0                  A                  A
## 2463                              0                  D                  D
## 2464                              0                  A                  D
## 2465                              0                  F                  F
## 2466                              0                  A                  A
## 2467                              0                  A                  A
## 2468                              0                  A                  D
## 2469                              0                  A                  A
## 2470                              0                  D                  D
## 2471                              0                  E                  E
## 2472                              0                  A                  A
## 2473                              0                  E                  E
## 2474                              0                  A                  D
## 2475                              0                  A                  D
## 2476                              0                  E                  E
## 2477                              0                  A                  A
## 2478                              0                  A                  A
## 2479                              0                  E                  E
## 2480                              0                  D                  D
## 2481                              0                  E                  E
## 2482                              0                  A                  H
## 2483                              0                  A                  I
## 2484                              0                  A                  A
## 2485                              0                  A                  A
## 2486                              0                  A                  A
## 2487                              0                  A                  C
## 2488                              0                  A                  A
## 2489                              0                  A                  A
## 2490                              0                  A                  A
## 2491                              0                  A                  A
## 2492                              0                  A                  A
## 2493                              0                  A                  A
## 2494                              0                  A                  A
## 2495                              0                  A                  A
## 2496                              0                  A                  A
## 2497                              0                  A                  A
## 2498                              0                  A                  A
## 2499                              0                  A                  C
## 2500                              0                  A                  C
## 2501                              0                  A                  A
## 2502                              0                  A                  A
## 2503                              0                  A                  A
## 2504                              0                  A                  A
## 2505                              0                  A                  A
## 2506                              0                  A                  A
## 2507                              0                  A                  A
## 2508                              0                  A                  A
## 2509                              0                  A                  A
## 2510                              0                  A                  A
## 2511                              0                  A                  A
## 2512                              0                  A                  A
## 2513                              0                  A                  A
## 2514                              0                  A                  A
## 2515                              0                  A                  A
## 2516                              0                  A                  A
## 2517                              0                  A                  A
## 2518                              0                  A                  A
## 2519                              0                  A                  C
## 2520                              0                  A                  C
## 2521                              0                  A                  A
## 2522                              0                  A                  A
## 2523                              0                  A                  A
## 2524                              0                  A                  A
## 2525                              0                  A                  A
## 2526                              0                  A                  A
## 2527                              0                  A                  A
## 2528                              0                  A                  A
## 2529                              0                  A                  A
## 2530                              0                  A                  A
## 2531                              0                  A                  A
## 2532                              0                  A                  C
## 2533                              0                  A                  A
## 2534                              0                  A                  A
## 2535                              0                  A                  C
## 2536                              0                  A                  C
## 2537                              0                  A                  A
## 2538                              0                  A                  A
## 2539                              0                  A                  I
## 2540                              0                  A                  I
## 2541                              0                  A                  A
## 2542                              0                  A                  A
## 2543                              0                  E                  E
## 2544                              0                  D                  D
## 2545                              0                  A                  D
## 2546                              0                  A                  D
## 2547                              0                  A                  D
## 2548                              0                  A                  D
## 2549                              0                  A                  D
## 2550                              0                  A                  D
## 2551                              0                  A                  D
## 2552                              0                  A                  D
## 2553                              0                  A                  A
## 2554                              0                  A                  E
## 2555                              0                  A                  A
## 2556                              0                  A                  C
## 2557                              0                  A                  E
## 2558                              0                  A                  C
## 2559                              0                  A                  A
## 2560                              0                  A                  F
## 2561                              0                  A                  A
## 2562                              0                  A                  A
## 2563                              0                  A                  A
## 2564                              0                  A                  A
## 2565                              0                  A                  C
## 2566                              0                  A                  A
## 2567                              0                  A                  I
## 2568                              0                  A                  C
## 2569                              0                  A                  D
## 2570                              0                  A                  D
## 2571                              0                  A                  E
## 2572                              0                  A                  A
## 2573                              0                  A                  D
## 2574                              0                  A                  E
## 2575                              0                  A                  B
## 2576                              0                  A                  A
## 2577                              0                  A                  E
## 2578                              0                  A                  C
## 2579                              0                  A                  A
## 2580                              0                  A                  D
## 2581                              0                  A                  A
## 2582                              0                  A                  A
## 2583                              0                  A                  A
## 2584                              0                  A                  D
## 2585                              0                  A                  E
## 2586                              0                  A                  E
## 2587                              0                  A                  D
## 2588                              0                  A                  D
## 2589                              0                  A                  D
## 2590                              0                  A                  A
## 2591                              0                  A                  A
## 2592                              0                  A                  C
## 2593                              0                  A                  A
## 2594                              0                  A                  C
## 2595                              0                  A                  C
## 2596                              0                  A                  A
## 2597                              0                  A                  A
## 2598                              0                  A                  A
## 2599                              0                  A                  A
## 2600                              0                  A                  A
## 2601                              0                  A                  C
## 2602                              0                  A                  A
## 2603                              0                  A                  A
## 2604                              0                  A                  A
## 2605                              0                  A                  A
## 2606                              0                  A                  A
## 2607                              0                  A                  A
## 2608                              0                  A                  A
## 2609                              0                  A                  A
## 2610                              0                  A                  A
## 2611                              0                  A                  A
## 2612                              0                  A                  C
## 2613                              0                  A                  A
## 2614                              0                  A                  A
## 2615                              0                  A                  A
## 2616                              0                  A                  A
## 2617                              0                  A                  A
## 2618                              0                  A                  A
## 2619                              0                  A                  E
## 2620                              0                  A                  A
## 2621                              0                  A                  D
## 2622                              0                  A                  D
## 2623                              0                  A                  D
## 2624                              0                  A                  D
## 2625                              0                  A                  D
## 2626                              0                  A                  D
## 2627                              0                  A                  A
## 2628                              0                  A                  A
## 2629                              0                  A                  D
## 2630                              0                  A                  F
## 2631                              0                  D                  I
## 2632                              0                  A                  A
## 2633                              0                  A                  A
## 2634                              0                  A                  A
## 2635                              0                  A                  A
## 2636                              0                  A                  A
## 2637                              0                  A                  A
## 2638                              0                  A                  A
## 2639                              0                  A                  A
## 2640                              0                  A                  A
## 2641                              0                  A                  A
## 2642                              0                  A                  A
## 2643                              0                  A                  A
## 2644                              0                  A                  A
## 2645                              0                  A                  A
## 2646                              0                  A                  A
## 2647                              0                  A                  A
## 2648                              0                  A                  A
## 2649                              0                  A                  A
## 2650                              0                  A                  A
## 2651                              0                  A                  A
## 2652                              0                  A                  A
## 2653                              0                  A                  A
## 2654                              0                  A                  A
## 2655                              0                  A                  A
## 2656                              0                  A                  A
## 2657                              0                  A                  A
## 2658                              0                  A                  A
## 2659                              0                  A                  A
## 2660                              0                  A                  D
## 2661                              0                  A                  A
## 2662                              0                  A                  A
## 2663                              0                  A                  A
## 2664                              0                  A                  A
## 2665                              0                  A                  A
## 2666                              0                  A                  A
## 2667                              0                  A                  A
## 2668                              0                  A                  A
## 2669                              0                  A                  A
## 2670                              0                  A                  A
## 2671                              0                  A                  I
## 2672                              0                  A                  D
## 2673                              0                  E                  E
## 2674                              0                  E                  E
## 2675                              0                  D                  I
## 2676                              0                  C                  C
## 2677                              0                  A                  A
## 2678                              0                  A                  A
## 2679                              0                  D                  D
## 2680                              0                  A                  A
## 2681                              0                  D                  D
## 2682                              0                  D                  D
## 2683                              0                  D                  D
## 2684                              0                  D                  D
## 2685                              0                  A                  A
## 2686                              0                  D                  D
## 2687                              0                  D                  D
## 2688                              0                  D                  D
## 2689                              0                  D                  D
## 2690                              0                  A                  A
## 2691                              0                  A                  A
## 2692                              0                  D                  D
## 2693                              0                  D                  I
## 2694                              0                  D                  D
## 2695                              0                  A                  A
## 2696                              0                  A                  A
## 2697                              0                  A                  A
## 2698                              0                  E                  E
## 2699                              0                  A                  A
## 2700                              0                  D                  D
## 2701                              0                  A                  A
## 2702                              0                  A                  A
## 2703                              0                  A                  C
## 2704                              0                  A                  A
## 2705                              0                  A                  B
## 2706                              0                  A                  A
## 2707                              0                  A                  A
## 2708                              0                  A                  C
## 2709                              0                  A                  A
## 2710                              0                  A                  A
## 2711                              0                  A                  A
## 2712                              0                  A                  A
## 2713                              0                  A                  C
## 2714                              0                  A                  C
## 2715                              0                  A                  A
## 2716                              0                  A                  A
## 2717                              0                  A                  A
## 2718                              0                  A                  A
## 2719                              0                  A                  A
## 2720                              0                  A                  A
## 2721                              0                  A                  A
## 2722                              0                  A                  A
## 2723                              0                  A                  A
## 2724                              0                  A                  C
## 2725                              0                  A                  C
## 2726                              0                  A                  A
## 2727                              0                  A                  A
## 2728                              0                  A                  A
## 2729                              0                  A                  I
## 2730                              0                  A                  A
## 2731                              0                  A                  C
## 2732                              0                  A                  A
## 2733                              0                  A                  A
## 2734                              0                  F                  F
## 2735                              0                  A                  A
## 2736                              0                  A                  A
## 2737                              0                  A                  A
## 2738                              0                  A                  C
## 2739                              0                  A                  A
## 2740                              0                  A                  A
## 2741                              0                  A                  A
## 2742                              0                  A                  A
## 2743                              0                  A                  A
## 2744                              0                  A                  C
## 2745                              0                  A                  C
## 2746                              0                  A                  C
## 2747                              0                  A                  I
## 2748                              0                  A                  A
## 2749                              0                  A                  A
## 2750                              0                  A                  C
## 2751                              0                  A                  A
## 2752                              0                  A                  A
## 2753                              0                  A                  A
## 2754                              0                  A                  A
## 2755                              0                  A                  A
## 2756                              0                  A                  C
## 2757                              0                  A                  A
## 2758                              0                  A                  A
## 2759                              0                  A                  A
## 2760                              0                  A                  C
## 2761                              0                  A                  A
## 2762                              0                  A                  A
## 2763                              0                  A                  A
## 2764                              0                  A                  A
## 2765                              0                  A                  A
## 2766                              0                  A                  A
## 2767                              0                  A                  A
## 2768                              0                  A                  A
## 2769                              0                  A                  A
## 2770                              0                  D                  D
## 2771                              0                  D                  D
## 2772                              0                  D                  D
## 2773                              0                  A                  A
## 2774                              0                  A                  A
## 2775                              0                  E                  E
## 2776                              0                  A                  A
## 2777                              0                  A                  A
## 2778                              0                  A                  A
## 2779                              0                  A                  C
## 2780                              0                  A                  A
## 2781                              0                  A                  A
## 2782                              0                  A                  A
## 2783                              0                  A                  A
## 2784                              0                  A                  A
## 2785                              0                  A                  A
## 2786                              0                  A                  A
## 2787                              0                  A                  A
## 2788                              0                  A                  A
## 2789                              0                  A                  A
## 2790                              0                  A                  A
## 2791                              0                  A                  A
## 2792                              0                  A                  A
## 2793                              0                  A                  A
## 2794                              0                  A                  C
## 2795                              0                  A                  A
## 2796                              0                  A                  A
## 2797                              0                  A                  C
## 2798                              0                  A                  A
## 2799                              0                  A                  A
## 2800                              0                  A                  A
## 2801                              0                  A                  A
## 2802                              0                  A                  A
## 2803                              0                  E                  I
## 2804                              0                  A                  A
## 2805                              0                  A                  A
## 2806                              0                  A                  A
## 2807                              0                  E                  E
## 2808                              0                  A                  A
## 2809                              0                  A                  A
## 2810                              0                  A                  A
## 2811                              0                  A                  A
## 2812                              0                  A                  A
## 2813                              0                  E                  E
## 2814                              0                  E                  E
## 2815                              0                  A                  A
## 2816                              0                  A                  C
## 2817                              0                  A                  C
## 2818                              0                  A                  A
## 2819                              0                  A                  A
## 2820                              0                  A                  A
## 2821                              0                  A                  A
## 2822                              0                  A                  C
## 2823                              0                  A                  A
## 2824                              0                  A                  D
## 2825                              0                  A                  A
## 2826                              0                  A                  A
## 2827                              0                  A                  A
## 2828                              0                  E                  E
## 2829                              0                  A                  A
## 2830                              0                  A                  A
## 2831                              0                  A                  A
## 2832                              0                  A                  A
## 2833                              0                  A                  A
## 2834                              0                  A                  A
## 2835                              0                  A                  A
## 2836                              0                  A                  A
## 2837                              0                  A                  A
## 2838                              0                  A                  A
## 2839                              0                  A                  A
## 2840                              0                  A                  A
## 2841                              0                  A                  A
## 2842                              0                  A                  A
## 2843                              0                  A                  A
## 2844                              0                  A                  A
## 2845                              0                  A                  A
## 2846                              0                  A                  A
## 2847                              0                  A                  A
## 2848                              0                  A                  A
## 2849                              0                  A                  A
## 2850                              0                  A                  A
## 2851                              0                  A                  A
## 2852                              0                  A                  A
## 2853                              0                  A                  A
## 2854                              0                  A                  A
## 2855                              0                  A                  A
## 2856                              0                  A                  A
## 2857                              0                  A                  E
## 2858                              0                  D                  D
## 2859                              0                  D                  D
## 2860                              0                  E                  E
## 2861                              0                  D                  D
## 2862                              0                  E                  E
## 2863                              0                  D                  D
## 2864                              0                  A                  A
## 2865                              0                  A                  A
## 2866                              0                  A                  A
## 2867                              0                  A                  A
## 2868                              0                  A                  A
## 2869                              0                  A                  A
## 2870                              0                  A                  A
## 2871                              0                  A                  A
## 2872                              0                  A                  A
## 2873                              0                  E                  E
## 2874                              0                  A                  A
## 2875                              0                  D                  D
## 2876                              0                  A                  A
## 2877                              0                  D                  D
## 2878                              0                  E                  E
## 2879                              0                  E                  E
## 2880                              0                  A                  A
## 2881                              0                  D                  D
## 2882                              0                  A                  A
## 2883                              0                  A                  A
## 2884                              0                  A                  A
## 2885                              0                  A                  A
## 2886                              0                  A                  A
## 2887                              0                  A                  A
## 2888                              0                  A                  A
## 2889                              0                  D                  D
## 2890                              0                  A                  A
## 2891                              0                  A                  A
## 2892                              0                  A                  A
## 2893                              0                  A                  A
## 2894                              0                  A                  A
## 2895                              0                  A                  A
## 2896                              0                  A                  D
## 2897                              0                  A                  C
## 2898                              0                  A                  D
## 2899                              0                  A                  A
## 2900                              0                  A                  A
## 2901                              0                  A                  A
## 2902                              0                  A                  I
## 2903                              0                  E                  E
## 2904                              0                  E                  E
## 2905                              0                  E                  E
## 2906                              0                  E                  E
## 2907                              0                  A                  A
## 2908                              0                  A                  A
## 2909                              0                  A                  C
## 2910                              0                  A                  C
## 2911                              0                  E                  E
## 2912                              0                  A                  D
## 2913                              0                  A                  E
## 2914                              0                  A                  A
## 2915                              0                  A                  A
## 2916                              0                  A                  A
## 2917                              0                  A                  A
## 2918                              0                  A                  A
## 2919                              0                  A                  A
## 2920                              0                  A                  A
## 2921                              0                  A                  A
## 2922                              0                  A                  D
## 2923                              0                  A                  A
## 2924                              0                  A                  D
## 2925                              0                  A                  E
## 2926                              0                  A                  A
## 2927                              0                  A                  D
## 2928                              0                  A                  E
## 2929                              0                  A                  A
## 2930                              0                  A                  A
## 2931                              0                  A                  A
## 2932                              0                  A                  A
## 2933                              0                  A                  A
## 2934                              0                  A                  D
## 2935                              0                  A                  E
## 2936                              0                  A                  A
## 2937                              0                  A                  D
## 2938                              0                  A                  A
## 2939                              0                  A                  C
## 2940                              0                  A                  A
## 2941                              0                  A                  A
## 2942                              0                  A                  A
## 2943                              0                  A                  A
## 2944                              0                  A                  C
## 2945                              0                  A                  A
## 2946                              0                  A                  A
## 2947                              0                  A                  C
## 2948                              0                  A                  A
## 2949                              0                  A                  A
## 2950                              0                  A                  A
## 2951                              0                  A                  A
## 2952                              0                  A                  A
## 2953                              0                  A                  A
## 2954                              0                  A                  C
## 2955                              0                  A                  C
## 2956                              0                  A                  I
## 2957                              0                  A                  C
## 2958                              0                  A                  C
## 2959                              0                  A                  A
## 2960                              0                  A                  A
## 2961                              0                  A                  A
## 2962                              0                  A                  A
## 2963                              0                  A                  A
## 2964                              0                  A                  A
## 2965                              0                  A                  A
## 2966                              0                  A                  A
## 2967                              0                  A                  A
## 2968                              0                  A                  A
## 2969                              0                  A                  C
## 2970                              0                  A                  A
## 2971                              0                  A                  A
## 2972                              0                  A                  A
## 2973                              0                  A                  A
## 2974                              0                  A                  A
## 2975                              0                  D                  D
## 2976                              0                  D                  D
## 2977                              0                  A                  A
## 2978                              0                  D                  D
## 2979                              0                  D                  D
## 2980                              0                  D                  D
## 2981                              0                  A                  A
## 2982                              0                  A                  A
## 2983                              0                  A                  C
## 2984                              0                  A                  A
## 2985                              0                  A                  A
## 2986                              0                  A                  A
## 2987                              0                  A                  A
## 2988                              0                  A                  A
## 2989                              0                  A                  A
## 2990                              0                  E                  I
## 2991                              0                  E                  E
## 2992                              0                  A                  A
## 2993                              0                  F                  G
## 2994                              0                  A                  A
## 2995                              0                  A                  A
## 2996                              0                  A                  A
## 2997                              0                  E                  E
## 2998                              0                  A                  A
## 2999                              0                  E                  E
## 3000                              0                  H                  H
## 3001                              0                  F                  F
## 3002                              0                  D                  D
## 3003                              0                  A                  A
## 3004                              0                  D                  D
## 3005                              0                  G                  G
## 3006                              0                  D                  D
## 3007                              0                  A                  A
## 3008                              0                  A                  A
## 3009                              0                  A                  A
## 3010                              0                  A                  C
## 3011                              0                  D                  D
## 3012                              0                  A                  A
## 3013                              0                  A                  E
## 3014                              0                  A                  A
## 3015                              0                  A                  D
## 3016                              0                  A                  A
## 3017                              0                  A                  C
## 3018                              0                  A                  A
## 3019                              0                  A                  E
## 3020                              0                  A                  A
## 3021                              0                  A                  A
## 3022                              0                  A                  E
## 3023                              0                  A                  A
## 3024                              0                  A                  A
## 3025                              0                  A                  A
## 3026                              0                  A                  E
## 3027                              0                  A                  A
## 3028                              0                  A                  B
## 3029                              0                  A                  A
## 3030                              0                  A                  E
## 3031                              0                  A                  A
## 3032                              0                  A                  A
## 3033                              0                  D                  D
## 3034                              0                  A                  C
## 3035                              0                  A                  A
## 3036                              0                  D                  D
## 3037                              0                  D                  D
## 3038                              0                  G                  G
## 3039                              0                  A                  A
## 3040                              0                  A                  D
## 3041                              0                  A                  A
## 3042                              0                  A                  A
## 3043                              0                  A                  A
## 3044                              0                  A                  C
## 3045                              0                  A                  A
## 3046                              0                  A                  A
## 3047                              0                  A                  A
## 3048                              0                  A                  A
## 3049                              0                  A                  A
## 3050                              0                  A                  A
## 3051                              0                  A                  A
## 3052                              0                  A                  A
## 3053                              0                  A                  A
## 3054                              0                  A                  F
## 3055                              0                  A                  A
## 3056                              0                  A                  A
## 3057                              0                  A                  A
## 3058                              0                  A                  C
## 3059                              0                  A                  A
## 3060                              0                  A                  A
## 3061                              0                  A                  A
## 3062                              0                  A                  A
## 3063                              0                  A                  D
## 3064                              0                  A                  C
## 3065                              0                  A                  C
## 3066                              0                  A                  D
## 3067                              0                  A                  A
## 3068                              0                  A                  C
## 3069                              0                  A                  C
## 3070                              0                  A                  A
## 3071                              0                  A                  A
## 3072                              0                  A                  E
## 3073                              0                  A                  D
## 3074                              0                  A                  A
## 3075                              0                  A                  A
## 3076                              0                  A                  E
## 3077                              0                  A                  A
## 3078                              0                  A                  A
## 3079                              0                  A                  D
## 3080                              0                  A                  D
## 3081                              0                  A                  A
## 3082                              0                  A                  I
## 3083                              0                  A                  A
## 3084                              0                  A                  A
## 3085                              0                  A                  A
## 3086                              0                  A                  A
## 3087                              0                  E                  E
## 3088                              0                  A                  C
## 3089                              0                  E                  E
## 3090                              0                  E                  E
## 3091                              0                  A                  D
## 3092                              0                  A                  A
## 3093                              0                  D                  D
## 3094                              0                  A                  A
## 3095                              0                  A                  A
## 3096                              0                  D                  D
## 3097                              0                  A                  F
## 3098                              0                  A                  E
## 3099                              0                  A                  E
## 3100                              0                  A                  E
## 3101                              0                  A                  F
## 3102                              0                  A                  D
## 3103                              0                  A                  E
## 3104                              0                  A                  E
## 3105                              0                  A                  E
## 3106                              0                  A                  E
## 3107                              0                  A                  D
## 3108                              0                  A                  E
## 3109                              0                  A                  F
## 3110                              0                  A                  E
## 3111                              0                  A                  E
## 3112                              0                  A                  A
## 3113                              0                  A                  F
## 3114                              0                  A                  D
## 3115                              0                  A                  E
## 3116                              0                  D                  D
## 3117                              0                  A                  A
## 3118                              0                  A                  I
## 3119                              0                  A                  I
## 3120                              0                  A                  D
## 3121                              0                  A                  A
## 3122                              0                  A                  A
## 3123                              0                  A                  A
## 3124                              0                  A                  A
##      booking_changes deposit_type agent days_in_waiting_list   customer_type
## 1                  3   No Deposit    14                    0       Transient
## 2                  4   No Deposit    14                    0       Transient
## 3                  0   No Deposit    14                    0       Transient
## 4                  0   No Deposit   304                    0       Transient
## 5                  0   No Deposit   240                    0       Transient
## 6                  0   No Deposit   240                    0       Transient
## 7                  0   No Deposit    14                    0       Transient
## 8                  0   No Deposit   303                    0       Transient
## 9                  0   No Deposit   240                    0       Transient
## 10                 0   No Deposit   240                    0       Transient
## 11                 1   No Deposit   241                    0       Transient
## 12                 0   No Deposit   241                    0       Transient
## 13                 0   No Deposit   240                    0       Transient
## 14                 0   No Deposit     8                    0        Contract
## 15                 0   No Deposit   240                    0       Transient
## 16                 0   No Deposit    14                    0       Transient
## 17                 0   No Deposit   250                    0       Transient
## 18                 0   No Deposit   241                    0       Transient
## 19                 1   No Deposit   250                    0       Transient
## 20                 1   No Deposit   250                    0       Transient
## 21                 1   No Deposit   250                    0       Transient
## 22                 0   No Deposit   115                    0        Contract
## 23                 0   No Deposit     5                    0       Transient
## 24                 0   No Deposit     8                    0        Contract
## 25                 0   No Deposit   240                    0       Transient
## 26                 0   No Deposit   240                    0       Transient
## 27                 2   No Deposit    14                    0       Transient
## 28                 0   No Deposit   241                    0       Transient
## 29                 0   No Deposit   175                    0       Transient
## 30                 0   No Deposit   240                    0       Transient
## 31                 0   No Deposit   241                    0       Transient
## 32                 0   No Deposit   250                    0       Transient
## 33                 0   No Deposit     8                    0        Contract
## 34                 0   No Deposit    14                    0       Transient
## 35                 0   No Deposit   250                    0       Transient
## 36                 0   No Deposit   240                    0       Transient
## 37                 0   No Deposit   134                    0       Transient
## 38                 0   No Deposit   156                    0 Transient-Party
## 39                 1   No Deposit   243                    0        Contract
## 40                 1   No Deposit   241                    0       Transient
## 41                 0   No Deposit   156                    0 Transient-Party
## 42                 0   No Deposit   156                    0        Contract
## 43                 0   No Deposit   243                    0        Contract
## 44                 0   No Deposit   240                    0       Transient
## 45                 0   No Deposit   240                    0       Transient
## 46                 0   No Deposit    14                    0       Transient
## 47                 0   No Deposit    14                    0       Transient
## 48                 0   No Deposit   240                    0       Transient
## 49                 0   No Deposit    14                    0       Transient
## 50                 0   No Deposit   242                    0       Transient
## 51                 0   No Deposit   241                    0       Transient
## 52                 0   No Deposit   240                    0       Transient
## 53                 0   No Deposit   250                    0       Transient
## 54                 0   No Deposit   115                    0        Contract
## 55                 0   No Deposit   240                    0       Transient
## 56                 0   No Deposit   240                    0       Transient
## 57                 0   No Deposit   242                    0       Transient
## 58                 0   No Deposit     3                    0       Transient
## 59                 0   No Deposit   240                    0       Transient
## 60                 0   No Deposit   240                    0       Transient
## 61                 0   No Deposit   240                    0       Transient
## 62                 0   No Deposit   105                    0       Transient
## 63                 0   No Deposit     5                    0       Transient
## 64                 0   No Deposit    40                    0        Contract
## 65                 0   No Deposit    40                    0        Contract
## 66                 0   No Deposit   115                    0        Contract
## 67                 0   No Deposit    40                    0        Contract
## 68                 1   No Deposit   241                    0       Transient
## 69                 0   No Deposit   240                    0       Transient
## 70                 0   No Deposit   240                    0       Transient
## 71                 0   No Deposit   240                    0       Transient
## 72                 0   No Deposit   240                    0       Transient
## 73                 0   No Deposit   241                    0       Transient
## 74                 0   No Deposit   240                    0       Transient
## 75                 0   No Deposit   105                    0       Transient
## 76                 0   No Deposit   240                    0       Transient
## 77                 0   No Deposit   250                    0       Transient
## 78                 0   No Deposit   250                    0       Transient
## 79                 0   No Deposit     8                    0       Transient
## 80                 0   No Deposit   241                    0       Transient
## 81                 0   No Deposit   240                    0       Transient
## 82                 0   No Deposit   240                    0       Transient
## 83                 0   No Deposit   134                    0       Transient
## 84                 0   No Deposit   240                    0       Transient
## 85                 0   No Deposit   240                    0       Transient
## 86                 0   No Deposit   240                    0       Transient
## 87                 0   No Deposit   147                    0       Transient
## 88                 0   No Deposit   241                    0       Transient
## 89                 0   No Deposit   240                    0       Transient
## 90                 0   No Deposit    40                    0        Contract
## 91                 0   No Deposit    40                    0        Contract
## 92                 1   No Deposit   250                    0       Transient
## 93                 1   No Deposit   240                    0       Transient
## 94                 0   No Deposit     8                    0        Contract
## 95                 2   No Deposit    14                    0       Transient
## 96                 0   No Deposit   240                    0       Transient
## 97                 0   No Deposit   240                    0 Transient-Party
## 98                 0   No Deposit   240                    0       Transient
## 99                 0   No Deposit   240                    0 Transient-Party
## 100                0   No Deposit   240                    0 Transient-Party
## 101                0   No Deposit   240                    0       Transient
## 102                1   No Deposit   306                    0       Transient
## 103                0   No Deposit   184                    0       Transient
## 104                0   No Deposit   240                    0       Transient
## 105                0   No Deposit   240                    0       Transient
## 106                0   No Deposit   184                    0       Transient
## 107                0   No Deposit    14                    0       Transient
## 108                3   No Deposit   240                    0       Transient
## 109                0   No Deposit   240                    0       Transient
## 110                0   No Deposit   240                    0       Transient
## 111                0   No Deposit   241                    0       Transient
## 112                0   No Deposit   240                    0       Transient
## 113                0   No Deposit   240                    0       Transient
## 114                0   No Deposit   240                    0       Transient
## 115                0   No Deposit   240                    0       Transient
## 116                1   No Deposit   250                    0       Transient
## 117                0   No Deposit   241                    0       Transient
## 118                0   No Deposit   175                    0       Transient
## 119                1   No Deposit   240                    0       Transient
## 120                0   No Deposit     5                    0       Transient
## 121                3   No Deposit    14                    0       Transient
## 122                0   No Deposit    40                    0        Contract
## 123                0   No Deposit    40                    0        Contract
## 124                0   No Deposit   243                    0        Contract
## 125                1   No Deposit   240                    0       Transient
## 126                0   No Deposit   240                    0       Transient
## 127                0   No Deposit   241                    0       Transient
## 128                0   No Deposit    96                    0       Transient
## 129                0   No Deposit   250                    0       Transient
## 130                1   No Deposit   240                    0       Transient
## 131                0   No Deposit   241                    0       Transient
## 132                0   No Deposit   240                    0       Transient
## 133                0   No Deposit   250                    0       Transient
## 134                0   No Deposit    14                    0       Transient
## 135                0   No Deposit   240                    0       Transient
## 136                0   No Deposit   240                    0       Transient
## 137                0   No Deposit   240                    0       Transient
## 138                0   No Deposit   175                    0       Transient
## 139                1   No Deposit   240                    0       Transient
## 140                0   No Deposit   240                    0       Transient
## 141                0   No Deposit   250                    0       Transient
## 142                0   No Deposit   240                    0       Transient
## 143                1   No Deposit   240                    0       Transient
## 144                0   No Deposit   240                    0       Transient
## 145                0   No Deposit     2                    0        Contract
## 146                0   No Deposit   240                    0       Transient
## 147                0   No Deposit   242                    0       Transient
## 148                1   No Deposit   241                    0       Transient
## 149                5   No Deposit   250                    0       Transient
## 150                0   No Deposit   156                    0        Contract
## 151                1   No Deposit    14                    0       Transient
## 152                0   No Deposit     8                    0        Contract
## 153                0   No Deposit    40                    0        Contract
## 154                0   No Deposit   127                    0       Transient
## 155                0   No Deposit   240                    0       Transient
## 156                0   No Deposit   250                    0       Transient
## 157                0   No Deposit    14                    0       Transient
## 158                0   No Deposit   240                    0       Transient
## 159                0   No Deposit   240                    0       Transient
## 160                0   No Deposit    14                    0       Transient
## 161                0   No Deposit   240                    0       Transient
## 162                2   No Deposit   240                    0       Transient
## 163                0   No Deposit   240                    0       Transient
## 164                0   No Deposit    95                    0       Transient
## 165                2   No Deposit    14                    0       Transient
## 166                0   No Deposit     8                    0       Transient
## 167                0   No Deposit   156                    0        Contract
## 168                0   No Deposit   240                    0       Transient
## 169                0   No Deposit   240                    0       Transient
## 170                0   No Deposit   240                    0       Transient
## 171                0   No Deposit   240                    0       Transient
## 172                0   No Deposit   105                    0       Transient
## 173                0   No Deposit   146                    0       Transient
## 174                0   No Deposit    14                    0       Transient
## 175                1   No Deposit   250                    0       Transient
## 176                0   No Deposit   240                    0       Transient
## 177                0   No Deposit    40                    0        Contract
## 178                0   No Deposit   240                    0       Transient
## 179                0   No Deposit   250                    0       Transient
## 180                1   No Deposit   240                    0 Transient-Party
## 181                0   No Deposit   240                    0 Transient-Party
## 182                0   No Deposit   242                    0       Transient
## 183                0   No Deposit   250                    0       Transient
## 184                2   No Deposit    14                    0       Transient
## 185                0   No Deposit   240                    0       Transient
## 186                0   No Deposit   250                    0       Transient
## 187                0   No Deposit   241                    0       Transient
## 188                0   No Deposit   177                    0       Transient
## 189                0   No Deposit     6                    0       Transient
## 190                0   No Deposit    40                    0        Contract
## 191                0   No Deposit   143                    0        Contract
## 192                0   No Deposit    40                    0        Contract
## 193                0   No Deposit   240                    0       Transient
## 194                0   No Deposit   250                    0       Transient
## 195                0   No Deposit   240                    0       Transient
## 196                0   No Deposit   240                    0       Transient
## 197                0   No Deposit   240                    0       Transient
## 198                0   No Deposit   240                    0       Transient
## 199                0   No Deposit   240                    0       Transient
## 200                2   No Deposit   240                    0       Transient
## 201                1   No Deposit   240                    0       Transient
## 202                0   No Deposit   240                    0       Transient
## 203                0   No Deposit   105                    0       Transient
## 204                0   No Deposit   250                    0       Transient
## 205                0   No Deposit   240                    0       Transient
## 206                0   No Deposit    14                    0 Transient-Party
## 207                0   No Deposit    14                    0 Transient-Party
## 208                0   No Deposit   240                    0       Transient
## 209                1   No Deposit   250                    0       Transient
## 210                0   No Deposit   240                    0       Transient
## 211                1   No Deposit   240                    0       Transient
## 212                1   No Deposit   250                    0       Transient
## 213                1   No Deposit   240                    0       Transient
## 214                1   No Deposit   240                    0       Transient
## 215                2   No Deposit   244                    0       Transient
## 216                0   No Deposit   241                    0       Transient
## 217                0   No Deposit     5                    0       Transient
## 218                0   No Deposit   250                    0       Transient
## 219                0   No Deposit   240                    0       Transient
## 220                0   No Deposit   240                    0       Transient
## 221                0   No Deposit   241                    0       Transient
## 222                0   No Deposit   241                    0       Transient
## 223                0   No Deposit   241                    0       Transient
## 224                0   No Deposit   241                    0       Transient
## 225                0   No Deposit   240                    0       Transient
## 226                1   No Deposit   240                    0       Transient
## 227                0   No Deposit    15                    0       Transient
## 228                0   No Deposit   240                    0       Transient
## 229                0   No Deposit   250                    0       Transient
## 230                0   No Deposit   241                    0       Transient
## 231                0   No Deposit   240                    0       Transient
## 232                1   No Deposit   240                    0       Transient
## 233                0   No Deposit    14                    0       Transient
## 234                1   No Deposit   240                    0       Transient
## 235                0   No Deposit    14                    0       Transient
## 236                0   No Deposit   240                    0       Transient
## 237                0   No Deposit    14                    0       Transient
## 238                0   No Deposit   175                    0       Transient
## 239                0   No Deposit   242                    0       Transient
## 240                0   No Deposit   240                    0       Transient
## 241                0   No Deposit   240                    0       Transient
## 242                0   No Deposit     5                    0       Transient
## 243                0   No Deposit   242                    0       Transient
## 244                1   No Deposit   250                    0       Transient
## 245                1   No Deposit   240                    0       Transient
## 246                0   No Deposit   250                    0       Transient
## 247                0   No Deposit   240                    0       Transient
## 248                0   No Deposit   240                    0       Transient
## 249                0   No Deposit   240                    0       Transient
## 250                0   No Deposit   240                    0       Transient
## 251                0   No Deposit   240                    0       Transient
## 252                0   No Deposit   243                    0       Transient
## 253                0   No Deposit     5                    0 Transient-Party
## 254                1   No Deposit   156                    0       Transient
## 255                0   No Deposit   115                    0        Contract
## 256                0   No Deposit     5                    0 Transient-Party
## 257                0   No Deposit    40                    0        Contract
## 258                0   No Deposit   243                    0       Transient
## 259                0   No Deposit   243                    0       Transient
## 260                0   No Deposit   240                    0       Transient
## 261                0   No Deposit   240                    0       Transient
## 262                0   No Deposit   240                    0       Transient
## 263                0   No Deposit   243                    0       Transient
## 264                0   No Deposit   243                    0        Contract
## 265                0   No Deposit   147                    0       Transient
## 266                0   No Deposit   240                    0       Transient
## 267                0   No Deposit   240                    0       Transient
## 268                0   No Deposit   240                    0       Transient
## 269                0   No Deposit   241                    0       Transient
## 270                0   No Deposit   240                    0       Transient
## 271                0   No Deposit   240                    0       Transient
## 272                1   No Deposit     8                    0        Contract
## 273                0   No Deposit   240                    0       Transient
## 274                0   No Deposit     6                    0       Transient
## 275                2   No Deposit   240                    0       Transient
## 276                0   No Deposit   250                    0       Transient
## 277                0   No Deposit   156                    0        Contract
## 278                0   No Deposit   240                    0       Transient
## 279                0   No Deposit   240                    0       Transient
## 280                0   No Deposit   240                    0       Transient
## 281                1   No Deposit   134                    0 Transient-Party
## 282                0   No Deposit   240                    0       Transient
## 283                0   No Deposit   240                    0 Transient-Party
## 284                0   No Deposit   240                    0       Transient
## 285                0   No Deposit   240                    0       Transient
## 286                0   No Deposit   240                    0 Transient-Party
## 287                0   No Deposit    14                    0       Transient
## 288                0   No Deposit   240                    0       Transient
## 289                0   No Deposit   147                    0       Transient
## 290                0   No Deposit   240                    0       Transient
## 291                0   No Deposit   240                    0       Transient
## 292                0   No Deposit   240                    0       Transient
## 293                0   No Deposit   240                    0       Transient
## 294                2   No Deposit   250                    0       Transient
## 295                0   No Deposit   167                    0       Transient
## 296                0   No Deposit   250                    0       Transient
## 297                0   No Deposit    14                    0       Transient
## 298                0   No Deposit   240                    0       Transient
## 299                0   No Deposit   250                    0       Transient
## 300                0   No Deposit    14                    0       Transient
## 301                2   No Deposit   300                    0       Transient
## 302                0   No Deposit   240                    0       Transient
## 303                0   No Deposit   134                    0 Transient-Party
## 304                0   No Deposit   250                    0       Transient
## 305                0   No Deposit   250                    0       Transient
## 306                0   No Deposit   240                    0       Transient
## 307                1   No Deposit   240                    0       Transient
## 308                0   No Deposit     8                    0        Contract
## 309                0   No Deposit   147                    0       Transient
## 310                0   No Deposit    14                    0       Transient
## 311                2   No Deposit   240                    0       Transient
## 312                1   No Deposit   240                    0       Transient
## 313                0   No Deposit   240                    0       Transient
## 314                1   No Deposit   240                    0       Transient
## 315                0   No Deposit   250                    0       Transient
## 316                0   No Deposit    14                    0 Transient-Party
## 317                0   No Deposit    14                    0 Transient-Party
## 318                1   No Deposit   240                    0       Transient
## 319                0   No Deposit   240                    0       Transient
## 320                1   No Deposit   240                    0       Transient
## 321                0   No Deposit    14                    0       Transient
## 322                0   No Deposit   147                    0       Transient
## 323                0   No Deposit   241                    0       Transient
## 324                1   No Deposit   241                    0       Transient
## 325                1   No Deposit    14                    0       Transient
## 326                0   No Deposit    14                    0       Transient
## 327                0   No Deposit   241                    0       Transient
## 328                0   No Deposit   240                    0       Transient
## 329                0   No Deposit   305                    0 Transient-Party
## 330                0   No Deposit   305                    0 Transient-Party
## 331                0   No Deposit   305                    0 Transient-Party
## 332                0   No Deposit   305                    0 Transient-Party
## 333                0   No Deposit   305                    0       Transient
## 334                0   No Deposit   240                    0       Transient
## 335                0   No Deposit   305                    0       Transient
## 336                1   No Deposit   305                    0 Transient-Party
## 337                0   No Deposit   305                    0 Transient-Party
## 338                1   No Deposit   305                    0 Transient-Party
## 339                1   No Deposit   305                    0 Transient-Party
## 340                0   No Deposit   305                    0       Transient
## 341                0   No Deposit   305                    0       Transient
## 342                1   No Deposit   305                    0 Transient-Party
## 343                1   No Deposit   305                    0 Transient-Party
## 344                0   No Deposit   305                    0 Transient-Party
## 345                0   No Deposit   305                    0       Transient
## 346                0   No Deposit   305                    0       Transient
## 347                0   No Deposit   305                    0 Transient-Party
## 348                0   No Deposit   305                    0 Transient-Party
## 349                0   No Deposit   240                    0       Transient
## 350                0   No Deposit   241                    0       Transient
## 351                1   No Deposit   242                    0       Transient
## 352                1   No Deposit    14                    0       Transient
## 353                0   No Deposit   240                    0       Transient
## 354                0   No Deposit   240                    0       Transient
## 355                0   No Deposit   250                    0       Transient
## 356                0   No Deposit   240                    0       Transient
## 357                0   No Deposit   250                    0 Transient-Party
## 358                1   No Deposit   250                    0 Transient-Party
## 359                0   No Deposit   147                    0       Transient
## 360                0   No Deposit   240                    0       Transient
## 361                0   No Deposit   243                    0        Contract
## 362                1   No Deposit    67                    0       Transient
## 363                1   No Deposit    14                    0       Transient
## 364                0   No Deposit   240                    0       Transient
## 365                0   No Deposit    14                    0       Transient
## 366                0   No Deposit   240                    0       Transient
## 367                0   No Deposit   240                    0       Transient
## 368                0   No Deposit   196                    0       Transient
## 369                0   No Deposit   240                    0       Transient
## 370                0   No Deposit    14                    0       Transient
## 371                0   No Deposit   250                    0       Transient
## 372                0   No Deposit   196                    0       Transient
## 373                0   No Deposit   240                    0       Transient
## 374                0   No Deposit   152                    0 Transient-Party
## 375                0   No Deposit   152                    0 Transient-Party
## 376                0   No Deposit   250                    0       Transient
## 377                0   No Deposit   175                    0 Transient-Party
## 378                0   No Deposit   152                    0 Transient-Party
## 379                0   No Deposit   152                    0 Transient-Party
## 380                0   No Deposit   175                    0 Transient-Party
## 381                0   No Deposit   152                    0 Transient-Party
## 382                1   No Deposit    14                    0       Transient
## 383                0   No Deposit   240                    0       Transient
## 384                0   No Deposit   250                    0       Transient
## 385                1   No Deposit   240                    0       Transient
## 386                1   No Deposit   240                    0       Transient
## 387                0   No Deposit   240                    0       Transient
## 388                0   No Deposit   142                    0       Transient
## 389                1   No Deposit   240                    0       Transient
## 390                0   No Deposit   240                    0       Transient
## 391                0   No Deposit   240                    0       Transient
## 392                0   No Deposit   250                    0       Transient
## 393                1   No Deposit    14                    0       Transient
## 394                3   No Deposit   240                    0       Transient
## 395                3   No Deposit   240                    0       Transient
## 396                1   No Deposit   240                    0       Transient
## 397                0   No Deposit   142                    0        Contract
## 398                0   No Deposit   240                    0       Transient
## 399                0   No Deposit   240                    0       Transient
## 400                0   No Deposit   171                    0       Transient
## 401                0   No Deposit   240                    0       Transient
## 402                4   No Deposit   240                    0       Transient
## 403                0   No Deposit   240                    0       Transient
## 404                0   No Deposit    14                    0       Transient
## 405                0   No Deposit   240                    0       Transient
## 406                0   No Deposit   250                    0       Transient
## 407                1   No Deposit   240                    0       Transient
## 408                0   No Deposit   240                    0       Transient
## 409                0   No Deposit    14                    0       Transient
## 410                1   No Deposit   250                    0       Transient
## 411                0   No Deposit   240                    0       Transient
## 412                0   No Deposit     8                    0        Contract
## 413                0   No Deposit   241                    0       Transient
## 414                0   No Deposit    14                    0       Transient
## 415                0   No Deposit    14                    0       Transient
## 416                0   No Deposit    14                    0       Transient
## 417                0   No Deposit   240                    0       Transient
## 418                0   No Deposit    14                    0       Transient
## 419                0   No Deposit    14                    0       Transient
## 420                0   No Deposit   240                    0       Transient
## 421                0   No Deposit     5                    0       Transient
## 422                0   No Deposit   250                    0       Transient
## 423                0   No Deposit    14                    0       Transient
## 424                0   No Deposit    14                    0       Transient
## 425                0   No Deposit   250                    0       Transient
## 426                0   No Deposit   196                    0       Transient
## 427                0   No Deposit   196                    0       Transient
## 428                0   No Deposit   240                    0       Transient
## 429                0   No Deposit    14                    0       Transient
## 430                0   No Deposit   240                    0           Group
## 431                0   No Deposit   250                    0       Transient
## 432                0   No Deposit    14                    0           Group
## 433                0   No Deposit   240                    0       Transient
## 434                0   No Deposit   240                    0       Transient
## 435                0   No Deposit    14                    0       Transient
## 436                0   No Deposit    14                    0       Transient
## 437                0   No Deposit   241                    0       Transient
## 438                0   No Deposit   115                    0        Contract
## 439                1   No Deposit   240                    0       Transient
## 440                0   No Deposit   156                    0       Transient
## 441                0   No Deposit   241                    0       Transient
## 442                0   No Deposit   115                    0        Contract
## 443                0   No Deposit   156                    0       Transient
## 444                0   No Deposit   142                    0        Contract
## 445                0   No Deposit   243                    0       Transient
## 446                2   No Deposit   240                    0       Transient
## 447                0   No Deposit   104                    0       Transient
## 448                0   No Deposit     5                    0       Transient
## 449                0   No Deposit   241                    0       Transient
## 450                0   No Deposit   240                    0       Transient
## 451                0   No Deposit   240                    0       Transient
## 452                3   No Deposit   240                    0       Transient
## 453                0   No Deposit   250                    0       Transient
## 454                0   No Deposit   241                    0       Transient
## 455                0   No Deposit   175                    0       Transient
## 456                0   No Deposit   250                    0       Transient
## 457                0   No Deposit   241                    0       Transient
## 458                0   No Deposit   105                    0       Transient
## 459                0   No Deposit   240                    0       Transient
## 460                0   No Deposit   175                    0       Transient
## 461                1   No Deposit   240                    0       Transient
## 462                0   No Deposit    15                    0       Transient
## 463                1   No Deposit   142                    0       Transient
## 464                0   No Deposit   142                    0       Transient
## 465                0   No Deposit   142                    0       Transient
## 466                0   No Deposit    14                    0       Transient
## 467                0   No Deposit   240                    0       Transient
## 468                1   No Deposit   250                    0       Transient
## 469                0   No Deposit   250                    0       Transient
## 470                0   No Deposit   240                    0       Transient
## 471                0   No Deposit     6                    0       Transient
## 472                0   No Deposit   240                    0       Transient
## 473                0   No Deposit   250                    0       Transient
## 474                0   No Deposit   241                    0       Transient
## 475                0   No Deposit    14                    0       Transient
## 476                1   No Deposit   242                    0       Transient
## 477                0   No Deposit   242                    0       Transient
## 478                1   No Deposit   240                    0       Transient
## 479                0   No Deposit   240                    0       Transient
## 480                0   No Deposit   250                    0       Transient
## 481                1   No Deposit   240                    0 Transient-Party
## 482                0   No Deposit   240                    0       Transient
## 483                0   No Deposit   241                    0       Transient
## 484                1   No Deposit   171                    0       Transient
## 485                0   No Deposit   240                    0 Transient-Party
## 486                0   No Deposit   240                    0 Transient-Party
## 487                0   No Deposit   240                    0 Transient-Party
## 488                0   No Deposit   240                    0 Transient-Party
## 489                0   No Deposit   240                    0 Transient-Party
## 490                0   No Deposit   240                    0       Transient
## 491                0   No Deposit   240                    0 Transient-Party
## 492                0   No Deposit   250                    0       Transient
## 493                0   No Deposit   240                    0 Transient-Party
## 494                2   No Deposit   240                    0       Transient
## 495                0   No Deposit   134                    0       Transient
## 496                0   No Deposit   240                    0       Transient
## 497                0   No Deposit   177                    0       Transient
## 498                0   No Deposit   147                    0 Transient-Party
## 499                0   No Deposit   147                    0 Transient-Party
## 500                1   No Deposit   250                    0       Transient
## 501                0   No Deposit   240                    0       Transient
## 502                0   No Deposit   240                    0       Transient
## 503                0   No Deposit    95                    0       Transient
## 504                0   No Deposit   241                    0       Transient
## 505                0   No Deposit   261                    0       Transient
## 506                0   No Deposit   134                    0       Transient
## 507                0   No Deposit   241                    0       Transient
## 508                0   No Deposit   134                    0       Transient
## 509                0   No Deposit    14                    0       Transient
## 510                0   No Deposit   240                    0       Transient
## 511                0   No Deposit   142                    0       Transient
## 512                1   No Deposit   240                    0       Transient
## 513                0   No Deposit   196                    0       Transient
## 514                0   No Deposit   241                    0       Transient
## 515                0   No Deposit   240                    0       Transient
## 516                0   No Deposit   241                    0       Transient
## 517                1   No Deposit    14                    0       Transient
## 518                0   No Deposit   250                    0       Transient
## 519                0   No Deposit   242                    0       Transient
## 520                0   No Deposit   240                    0       Transient
## 521                0   No Deposit   242                    0       Transient
## 522                1   No Deposit   240                    0       Transient
## 523                0   No Deposit   142                    0       Transient
## 524                0   No Deposit   105                    0       Transient
## 525                1   No Deposit   147                    0       Transient
## 526                0   No Deposit   240                    0       Transient
## 527                0   No Deposit     8                    0        Contract
## 528                0   No Deposit   241                    0       Transient
## 529                0   No Deposit    14                    0       Transient
## 530                0   No Deposit   240                    0       Transient
## 531                0   No Deposit   240                    0 Transient-Party
## 532                0   No Deposit   250                    0       Transient
## 533                0   No Deposit   250                    0       Transient
## 534                0   No Deposit   241                    0       Transient
## 535                0   No Deposit   250                    0       Transient
## 536                0   No Deposit   142                    0       Transient
## 537                1   No Deposit   241                    0       Transient
## 538                0   No Deposit   240                    0       Transient
## 539                0   No Deposit   240                    0       Transient
## 540                0   No Deposit   240                    0       Transient
## 541                0   No Deposit   250                    0       Transient
## 542                0   No Deposit   240                    0       Transient
## 543                5   No Deposit    14                    0       Transient
## 544                0   No Deposit   240                    0       Transient
## 545                0   No Deposit   142                    0       Transient
## 546                0   No Deposit   240                    0       Transient
## 547                0   No Deposit   196                    0       Transient
## 548                0   No Deposit    14                    0       Transient
## 549                0   No Deposit   250                    0       Transient
## 550                0   No Deposit    36                    0       Transient
## 551                1   No Deposit   240                    0       Transient
## 552                0   No Deposit   196                    0       Transient
## 553                0   No Deposit   240                    0       Transient
## 554                1   No Deposit   240                    0       Transient
## 555                0   No Deposit     5                    0       Transient
## 556                0   No Deposit   240                    0       Transient
## 557                0   No Deposit   240                    0       Transient
## 558                0   No Deposit   142                    0       Transient
## 559                0   No Deposit   241                    0       Transient
## 560                0   No Deposit   241                    0       Transient
## 561                0   No Deposit   241                    0       Transient
## 562                0   No Deposit   240                    0       Transient
## 563                0   No Deposit   177                    0       Transient
## 564                0   No Deposit   171                    0       Transient
## 565                0   No Deposit    14                    0       Transient
## 566                0   No Deposit   240                    0       Transient
## 567                0   No Deposit   250                    0       Transient
## 568                0   No Deposit   241                    0       Transient
## 569                1   No Deposit     6                    0       Transient
## 570                0   No Deposit   142                    0        Contract
## 571                0   No Deposit   240                    0       Transient
## 572                0   No Deposit   240                    0       Transient
## 573                0   No Deposit   250                    0       Transient
## 574                0   No Deposit    14                    0       Transient
## 575                0   No Deposit   250                    0       Transient
## 576                0   No Deposit   240                    0       Transient
## 577                0   No Deposit     6                    0       Transient
## 578                0   No Deposit   241                    0       Transient
## 579                1   No Deposit   134                    0       Transient
## 580                0   No Deposit   240                    0       Transient
## 581                0   No Deposit    14                    0       Transient
## 582                0   No Deposit   196                    0       Transient
## 583                0   No Deposit   240                    0       Transient
## 584                2   No Deposit    14                    0       Transient
## 585                0   No Deposit    36                    0 Transient-Party
## 586                0   No Deposit    36                    0 Transient-Party
## 587                0   No Deposit   142                    0        Contract
## 588                0   No Deposit   240                    0       Transient
## 589                0   No Deposit    14                    0       Transient
## 590                0   No Deposit    14                    0 Transient-Party
## 591                0   No Deposit   240                    0 Transient-Party
## 592                0   No Deposit   240                    0 Transient-Party
## 593                0   No Deposit   240                    0       Transient
## 594                0   No Deposit   240                    0       Transient
## 595                0   No Deposit     2                    0       Transient
## 596                0   No Deposit   240                    0       Transient
## 597                1   No Deposit   105                    0       Transient
## 598                0   No Deposit   240                    0       Transient
## 599                0   No Deposit    40                    0        Contract
## 600                0   No Deposit    67                    0       Transient
## 601                0   No Deposit    14                    0       Transient
## 602                0   No Deposit   240                    0       Transient
## 603                1   No Deposit    14                    0       Transient
## 604                2   No Deposit   240                    0       Transient
## 605                0   No Deposit   104                    0       Transient
## 606                0   No Deposit     5                    0       Transient
## 607                4   No Deposit    14                    0       Transient
## 608                0   No Deposit    14                    0       Transient
## 609                0   No Deposit    14                    0       Transient
## 610                3   No Deposit   250                    0       Transient
## 611                0   No Deposit   171                    0       Transient
## 612                0   No Deposit   175                    0       Transient
## 613                0   No Deposit   250                    0       Transient
## 614                0   No Deposit   241                    0       Transient
## 615                0   No Deposit   240                    0       Transient
## 616                0   No Deposit    40                    0        Contract
## 617                0   No Deposit   240                    0       Transient
## 618                0   No Deposit   240                    0       Transient
## 619                0   No Deposit   250                    0       Transient
## 620                1   No Deposit    14                    0 Transient-Party
## 621                1   No Deposit    14                    0 Transient-Party
## 622                1   No Deposit   240                    0       Transient
## 623                0   No Deposit     6                    0 Transient-Party
## 624                0   No Deposit   240                    0       Transient
## 625                0   No Deposit     6                    0 Transient-Party
## 626                1   No Deposit   250                    0       Transient
## 627                0   No Deposit   240                    0       Transient
## 628                0   No Deposit   261                    0       Transient
## 629                0   No Deposit   240                    0       Transient
## 630                0   No Deposit    14                    0       Transient
## 631                0   No Deposit   240                    0       Transient
## 632                0   No Deposit   240                    0       Transient
## 633                1   No Deposit   240                    0       Transient
## 634                1   No Deposit   240                    0       Transient
## 635                0   No Deposit   240                    0       Transient
## 636                0   No Deposit    14                    0 Transient-Party
## 637                2   No Deposit   240                    0       Transient
## 638                1   No Deposit   250                    0       Transient
## 639                1   No Deposit   142                    0       Transient
## 640                1   No Deposit   240                    0       Transient
## 641                0   No Deposit   240                    0       Transient
## 642                2   No Deposit   240                    0       Transient
## 643                0   No Deposit   240                    0       Transient
## 644                1   No Deposit   250                    0       Transient
## 645                0   No Deposit   240                    0       Transient
## 646                0   No Deposit    14                    0       Transient
## 647                1   No Deposit   240                    0       Transient
## 648                0   No Deposit   240                    0       Transient
## 649                0   No Deposit   240                    0       Transient
## 650                0   No Deposit   250                    0       Transient
## 651                0   No Deposit   240                    0       Transient
## 652                0   No Deposit   175                    0 Transient-Party
## 653                0   No Deposit   240                    0       Transient
## 654                0   No Deposit     5                    0       Transient
## 655                0   No Deposit   240                    0       Transient
## 656                1   No Deposit   240                    0       Transient
## 657                0   No Deposit   240                    0       Transient
## 658                0   No Deposit   240                    0       Transient
## 659                0   No Deposit   240                    0       Transient
## 660                0   No Deposit   240                    0       Transient
## 661                0   No Deposit   241                    0       Transient
## 662                0   No Deposit   240                    0       Transient
## 663                0   No Deposit   240                    0       Transient
## 664                0   No Deposit    14                    0       Transient
## 665                0   No Deposit   250                    0       Transient
## 666                0   No Deposit   261                    0       Transient
## 667                0   No Deposit   156                    0        Contract
## 668                0   No Deposit   127                    0       Transient
## 669                0   No Deposit   240                    0       Transient
## 670                0   No Deposit    14                    0       Transient
## 671                0   No Deposit   306                    0       Transient
## 672                0   No Deposit   240                    0       Transient
## 673                1   No Deposit   240                    0       Transient
## 674                0   No Deposit   240                    0       Transient
## 675                0   No Deposit   240                    0       Transient
## 676                0   No Deposit   242                    0       Transient
## 677                0   No Deposit   250                    0       Transient
## 678                0   No Deposit   243                    0       Transient
## 679                0   No Deposit   149                    0       Transient
## 680                0   No Deposit   243                    0       Transient
## 681                0   No Deposit    26                    0       Transient
## 682                0   No Deposit   240                    0       Transient
## 683                0   No Deposit    96                    0       Transient
## 684                0   No Deposit   240                    0       Transient
## 685                0   No Deposit   240                    0       Transient
## 686                0   No Deposit   258                    0       Transient
## 687                0   No Deposit   241                    0       Transient
## 688                0   No Deposit   240                    0       Transient
## 689                0   No Deposit   241                    0       Transient
## 690                0   No Deposit   240                    0       Transient
## 691                0   No Deposit    14                    0       Transient
## 692                0   No Deposit   240                    0       Transient
## 693                0   No Deposit   240                    0       Transient
## 694                0   No Deposit   240                    0       Transient
## 695                0   No Deposit   240                    0       Transient
## 696                0   No Deposit   240                    0       Transient
## 697                0   No Deposit   240                    0       Transient
## 698                1   No Deposit     5                    0       Transient
## 699                1   No Deposit   171                    0       Transient
## 700                1   No Deposit   241                    0       Transient
## 701                0   No Deposit    14                    0 Transient-Party
## 702                0   No Deposit   241                    0       Transient
## 703                0   No Deposit     6                    0 Transient-Party
## 704                0   No Deposit     6                    0 Transient-Party
## 705                0   No Deposit   240                    0       Transient
## 706                0   No Deposit   240                    0       Transient
## 707                0   No Deposit   110                    0       Transient
## 708                0   No Deposit    14                    0       Transient
## 709                0   No Deposit   142                    0        Contract
## 710                0   No Deposit   242                    0       Transient
## 711                0   No Deposit   240                    0       Transient
## 712                0   No Deposit   147                    0       Transient
## 713                1   No Deposit   240                    0       Transient
## 714                0   No Deposit   242                    0       Transient
## 715                0   No Deposit    14                    0 Transient-Party
## 716                0   No Deposit   242                    0       Transient
## 717                0   No Deposit   240                    0       Transient
## 718                0   No Deposit    14                    0       Transient
## 719                1   No Deposit    14                    0       Transient
## 720                0   No Deposit   240                    0 Transient-Party
## 721                0   No Deposit   240                    0       Transient
## 722                0   No Deposit   240                    0 Transient-Party
## 723                1   No Deposit   242                    0       Transient
## 724                0   No Deposit   240                    0       Transient
## 725                0   No Deposit   242                    0       Transient
## 726                0   No Deposit   240                    0       Transient
## 727                0   No Deposit    14                    0       Transient
## 728                0   No Deposit   240                    0       Transient
## 729                0   No Deposit   240                    0       Transient
## 730                2   No Deposit    14                    0       Transient
## 731                0   No Deposit    71                    0       Transient
## 732                0   No Deposit    71                    0       Transient
## 733                0   No Deposit   250                    0       Transient
## 734                0   No Deposit   146                    0       Transient
## 735                0   No Deposit   250                    0       Transient
## 736                0   No Deposit   240                    0       Transient
## 737                0   No Deposit   146                    0       Transient
## 738                0   No Deposit   175                    0       Transient
## 739                0   No Deposit    96                    0 Transient-Party
## 740                0   No Deposit    14                    0 Transient-Party
## 741                0   No Deposit   134                    0       Transient
## 742                0   No Deposit    14                    0 Transient-Party
## 743                1   No Deposit    67                    0       Transient
## 744                0   No Deposit     8                    0       Transient
## 745                0   No Deposit    67                    0       Transient
## 746                1   No Deposit    14                    0       Transient
## 747                0   No Deposit   156                    0       Transient
## 748                0   No Deposit   261                    0       Transient
## 749                0   No Deposit    14                    0 Transient-Party
## 750                0   No Deposit    14                    0       Transient
## 751                0   No Deposit    14                    0 Transient-Party
## 752                0   No Deposit    14                    0 Transient-Party
## 753                0   No Deposit   240                    0           Group
## 754                0   No Deposit    14                    0 Transient-Party
## 755                0   No Deposit    14                    0 Transient-Party
## 756                0   No Deposit   240                    0       Transient
## 757                2   No Deposit   240                    0       Transient
## 758                0   No Deposit   240                    0 Transient-Party
## 759                0   No Deposit   240                    0 Transient-Party
## 760                0   No Deposit    14                    0       Transient
## 761                0   No Deposit    26                    0       Transient
## 762                0   No Deposit    40                    0       Transient
## 763                0   No Deposit   134                    0       Transient
## 764                0   No Deposit   171                    0       Transient
## 765                0   No Deposit   250                    0       Transient
## 766                2   No Deposit   240                    0       Transient
## 767                1   No Deposit   242                    0       Transient
## 768                0   No Deposit     5                    0       Transient
## 769                0   No Deposit     5                    0       Transient
## 770                0   No Deposit     5                    0 Transient-Party
## 771                0   No Deposit     5                    0 Transient-Party
## 772                1   No Deposit   241                    0       Transient
## 773                1   No Deposit   242                    0       Transient
## 774                0   No Deposit    14                    0       Transient
## 775                0   No Deposit   240                    0       Transient
## 776                1   No Deposit   240                    0       Transient
## 777                0   No Deposit   242                    0       Transient
## 778                3   No Deposit   240                    0       Transient
## 779                1   No Deposit   240                    0       Transient
## 780                1   No Deposit   250                    0       Transient
## 781                0   No Deposit   240                    0       Transient
## 782                0   No Deposit    14                    0       Transient
## 783                0   No Deposit   147                    0       Transient
## 784                1   No Deposit   240                    0       Transient
## 785                0   No Deposit   240                    0       Transient
## 786                0   No Deposit   240                    0       Transient
## 787                1   No Deposit    14                    0       Transient
## 788                0   No Deposit   156                    0       Transient
## 789                4   No Deposit   142                    0       Transient
## 790                0   No Deposit   240                    0       Transient
## 791                0   No Deposit   250                    0       Transient
## 792                0   No Deposit   240                    0       Transient
## 793                0   No Deposit   240                    0       Transient
## 794                0   No Deposit   240                    0       Transient
## 795                0   No Deposit   240                    0       Transient
## 796                0   No Deposit   240                    0       Transient
## 797                0   No Deposit   156                    0       Transient
## 798                1   No Deposit   240                    0       Transient
## 799                2   No Deposit   240                    0       Transient
## 800                0   No Deposit   250                    0       Transient
## 801                1   No Deposit   240                    0       Transient
## 802                0   No Deposit    14                    0       Transient
## 803                0   No Deposit   240                    0       Transient
## 804                0   No Deposit    14                    0       Transient
## 805                1   No Deposit   240                    0       Transient
## 806                1   No Deposit   240                    0       Transient
## 807                0   No Deposit   240                    0       Transient
## 808                0   No Deposit   240                    0       Transient
## 809                0   No Deposit   156                    0       Transient
## 810                0   No Deposit   241                    0       Transient
## 811                0   No Deposit    14                    0       Transient
## 812                0   No Deposit   250                    0       Transient
## 813                0   No Deposit   261                    0       Transient
## 814                0   No Deposit   261                    0       Transient
## 815                0   No Deposit    14                    0       Transient
## 816                0   No Deposit   142                    0        Contract
## 817                0   No Deposit   134                    0       Transient
## 818                0   No Deposit   261                    0       Transient
## 819                0   No Deposit     5                    0       Transient
## 820                1   No Deposit    14                    0 Transient-Party
## 821                0   No Deposit   261                    0       Transient
## 822                0   No Deposit    14                    0       Transient
## 823                1   No Deposit    14                    0       Transient
## 824                1   No Deposit   181                    0 Transient-Party
## 825                2   No Deposit   181                    0 Transient-Party
## 826                1   No Deposit   250                    0       Transient
## 827                1   No Deposit   261                    0       Transient
## 828                1   No Deposit   250                    0       Transient
## 829                1   No Deposit   240                    0       Transient
## 830                0   No Deposit   250                    0       Transient
## 831                0   No Deposit   240                    0       Transient
## 832                0   No Deposit   250                    0       Transient
## 833                0   No Deposit   240                    0       Transient
## 834                0   No Deposit   142                    0        Contract
## 835                0   No Deposit     5                    0       Transient
## 836                0   No Deposit   156                    0       Transient
## 837                1   No Deposit   241                    0       Transient
## 838                0   No Deposit    14                    0       Transient
## 839                0   No Deposit   240                    0       Transient
## 840                0   No Deposit   250                    0       Transient
## 841                0   No Deposit    14                    0       Transient
## 842                0   No Deposit   240                    0       Transient
## 843                0   No Deposit   240                    0       Transient
## 844                2   No Deposit   240                    0       Transient
## 845                1   No Deposit   250                    0       Transient
## 846                0   No Deposit    14                    0       Transient
## 847                0   No Deposit    14                    0       Transient
## 848                0   No Deposit   175                    0       Transient
## 849                0   No Deposit   240                    0       Transient
## 850                0   No Deposit   240                    0       Transient
## 851                0   No Deposit   171                    0       Transient
## 852                0   No Deposit    14                    0       Transient
## 853                0   No Deposit   181                    0 Transient-Party
## 854                0   No Deposit    14                    0       Transient
## 855                0   No Deposit   156                    0       Transient
## 856                0   No Deposit    14                    0       Transient
## 857                1   No Deposit   240                    0       Transient
## 858                0   No Deposit   240                    0       Transient
## 859                1   No Deposit   240                    0       Transient
## 860                0   No Deposit   134                    0       Transient
## 861                0   No Deposit   156                    0        Contract
## 862                0   No Deposit     5                    0       Transient
## 863                0   No Deposit   156                    0        Contract
## 864                0   No Deposit   156                    0        Contract
## 865                0   No Deposit   250                    0       Transient
## 866                0   No Deposit   250                    0       Transient
## 867                0   No Deposit    14                    0       Transient
## 868                1   No Deposit   250                    0       Transient
## 869                0   No Deposit   240                    0       Transient
## 870                1   No Deposit   242                    0       Transient
## 871                1   No Deposit   250                    0       Transient
## 872                0   No Deposit   250                    0       Transient
## 873                0   No Deposit   240                    0       Transient
## 874                1   No Deposit    14                    0       Transient
## 875                0   No Deposit   250                    0 Transient-Party
## 876                0   No Deposit   250                    0 Transient-Party
## 877                0   No Deposit     5                    0       Transient
## 878                0   No Deposit   241                    0       Transient
## 879                1   No Deposit   240                    0       Transient
## 880                0   No Deposit   240                    0       Transient
## 881                0   No Deposit   240                    0       Transient
## 882                1   No Deposit   250                    0       Transient
## 883                0   No Deposit   250                    0       Transient
## 884                0   No Deposit   240                    0       Transient
## 885                0   No Deposit   240                    0       Transient
## 886                0   No Deposit   240                    0       Transient
## 887                0   No Deposit   142                    0        Contract
## 888                0   No Deposit   240                    0       Transient
## 889                0   No Deposit   250                    0       Transient
## 890                0   No Deposit   147                    0       Transient
## 891                0   No Deposit    40                    0       Transient
## 892                0   No Deposit   250                    0       Transient
## 893                0   No Deposit   240                    0       Transient
## 894                0   No Deposit   240                    0       Transient
## 895                0   No Deposit   241                    0       Transient
## 896                0   No Deposit   241                    0       Transient
## 897                0   No Deposit   240                    0       Transient
## 898                1   No Deposit    14                    0 Transient-Party
## 899                0   No Deposit    67                    0       Transient
## 900                1   No Deposit   240                    0       Transient
## 901                0   No Deposit    14                    0       Transient
## 902                5   No Deposit    14                    0       Transient
## 903                0   No Deposit   240                    0       Transient
## 904                0   No Deposit    14                    0       Transient
## 905                1   No Deposit   240                    0       Transient
## 906                0   No Deposit   240                    0       Transient
## 907                0   No Deposit   240                    0       Transient
## 908                0   No Deposit   147                    0       Transient
## 909                0   No Deposit   142                    0        Contract
## 910                0   No Deposit   241                    0       Transient
## 911                0   No Deposit   250                    0       Transient
## 912                0   No Deposit   240                    0       Transient
## 913                0   No Deposit   240                    0       Transient
## 914                0   No Deposit   240                    0       Transient
## 915                0   No Deposit   241                    0       Transient
## 916                0   No Deposit   241                    0       Transient
## 917                0   No Deposit   250                    0       Transient
## 918                0   No Deposit   240                    0       Transient
## 919                0   No Deposit   240                    0       Transient
## 920                0   No Deposit   240                    0       Transient
## 921                0   No Deposit   240                    0       Transient
## 922                0   No Deposit   241                    0       Transient
## 923                0   No Deposit   240                    0       Transient
## 924                0   No Deposit   240                    0       Transient
## 925                3   No Deposit   250                    0       Transient
## 926                0   No Deposit   142                    0        Contract
## 927                0   No Deposit    15                    0       Transient
## 928                0   No Deposit   240                    0       Transient
## 929                0   No Deposit   175                    0       Transient
## 930                0   No Deposit   240                    0       Transient
## 931                0   No Deposit   240                    0       Transient
## 932                0   No Deposit   250                    0       Transient
## 933                0   No Deposit   250                    0       Transient
## 934                0   No Deposit   250                    0       Transient
## 935                0   No Deposit   240                    0       Transient
## 936                1   No Deposit   240                    0       Transient
## 937                2   No Deposit   250                    0       Transient
## 938                1   No Deposit   250                    0       Transient
## 939                0   No Deposit   250                    0       Transient
## 940                1   No Deposit   250                    0       Transient
## 941                0   No Deposit   240                    0       Transient
## 942                0   No Deposit   142                    0        Contract
## 943                1   No Deposit   241                    0       Transient
## 944                0   No Deposit   240                    0       Transient
## 945                2   No Deposit   240                    0 Transient-Party
## 946                2   No Deposit   240                    0 Transient-Party
## 947                0   No Deposit     8                    0       Transient
## 948                0   No Deposit   240                    0       Transient
## 949                0   No Deposit    40                    0        Contract
## 950                0   No Deposit    88                    0       Transient
## 951                0   No Deposit   240                    0       Transient
## 952                0   No Deposit   241                    0       Transient
## 953                0   No Deposit   241                    0       Transient
## 954                2   No Deposit   250                    0       Transient
## 955                1   No Deposit   240                    0       Transient
## 956                0   No Deposit     5                    0       Transient
## 957                0   No Deposit    14                    0 Transient-Party
## 958                0   No Deposit    14                    0 Transient-Party
## 959                0   No Deposit   171                    0       Transient
## 960                0   No Deposit    14                    0 Transient-Party
## 961                2   No Deposit   250                    0       Transient
## 962                1   No Deposit    14                    0 Transient-Party
## 963                0   No Deposit    14                    0 Transient-Party
## 964                0   No Deposit    14                    0       Transient
## 965                0   No Deposit    14                    0 Transient-Party
## 966                0   No Deposit     8                    0        Contract
## 967                0   No Deposit   240                    0       Transient
## 968                0   No Deposit     8                    0        Contract
## 969                0   No Deposit     8                    0        Contract
## 970                0   No Deposit   240                    0 Transient-Party
## 971                0   No Deposit    14                    0 Transient-Party
## 972                0   No Deposit   240                    0       Transient
## 973                1   No Deposit    14                    0 Transient-Party
## 974                0   No Deposit   243                    0        Contract
## 975                0   No Deposit    40                    0       Transient
## 976                0   No Deposit   243                    0        Contract
## 977                0   No Deposit   240                    0       Transient
## 978                0   No Deposit    40                    0        Contract
## 979                1   No Deposit    14                    0       Transient
## 980                1   No Deposit   240                    0       Transient
## 981                0   No Deposit   250                    0       Transient
## 982                0   Refundable    96                    0 Transient-Party
## 983                1   No Deposit   240                    0       Transient
## 984                0   No Deposit    14                    0       Transient
## 985                0   No Deposit   240                    0       Transient
## 986                0   No Deposit   142                    0        Contract
## 987                0   No Deposit     8                    0        Contract
## 988                0   No Deposit   240                    0       Transient
## 989                2   No Deposit    14                    0       Transient
## 990                1   No Deposit   240                    0       Transient
## 991                0   No Deposit   240                    0       Transient
## 992                0   No Deposit   240                    0       Transient
## 993                1   No Deposit   240                    0       Transient
## 994                0   No Deposit   142                    0        Contract
## 995                0   No Deposit   250                    0       Transient
## 996                0   No Deposit   240                    0       Transient
## 997                0   No Deposit    40                    0       Transient
## 998                0   No Deposit   240                    0       Transient
## 999                0   No Deposit    14                    0       Transient
## 1000               0   No Deposit    14                    0       Transient
## 1001               0   No Deposit   250                    0       Transient
## 1002               0   No Deposit   240                    0       Transient
## 1003               0   No Deposit   240                    0       Transient
## 1004               0   No Deposit   250                    0       Transient
## 1005               0   No Deposit    40                    0       Transient
## 1006               0   No Deposit   142                    0        Contract
## 1007               1   No Deposit   149                    0       Transient
## 1008               0   No Deposit   250                    0       Transient
## 1009               2   No Deposit    96                    0       Transient
## 1010               0   No Deposit   241                    0       Transient
## 1011               0   No Deposit     2                    0        Contract
## 1012               0   No Deposit   240                    0       Transient
## 1013               0   No Deposit   250                    0       Transient
## 1014               2   No Deposit   241                    0       Transient
## 1015               0   No Deposit   240                    0       Transient
## 1016               0   No Deposit   240                    0       Transient
## 1017               0   No Deposit   250                    0       Transient
## 1018               1   No Deposit   250                    0       Transient
## 1019               1   No Deposit   240                    0       Transient
## 1020               0   No Deposit     8                    0        Contract
## 1021               0   No Deposit   240                    0       Transient
## 1022               1   No Deposit   243                    0       Transient
## 1023               0   No Deposit   250                    0       Transient
## 1024               0   No Deposit    96                    0       Transient
## 1025               1   No Deposit   240                    0       Transient
## 1026               0   No Deposit   250                    0       Transient
## 1027               0   No Deposit    40                    0        Contract
## 1028               0   No Deposit    95                    0       Transient
## 1029               0   No Deposit   171                    0       Transient
## 1030               0   No Deposit   142                    0        Contract
## 1031               0   No Deposit   240                    0       Transient
## 1032               0   No Deposit   240                    0       Transient
## 1033               0   No Deposit   175                    0       Transient
## 1034               0   No Deposit   240                    0       Transient
## 1035               1   No Deposit   250                    0       Transient
## 1036               3   No Deposit    14                    0       Transient
## 1037               2   No Deposit   240                    0       Transient
## 1038               0   No Deposit   147                    0       Transient
## 1039              17   No Deposit   240                    0       Transient
## 1040               0   No Deposit    40                    0       Transient
## 1041               1   No Deposit    14                    0       Transient
## 1042               0   No Deposit   250                    0       Transient
## 1043               0   No Deposit   156                    0        Contract
## 1044               0   No Deposit    40                    0        Contract
## 1045               0   No Deposit   143                    0       Transient
## 1046               0   No Deposit   240                    0       Transient
## 1047               0   No Deposit   250                    0       Transient
## 1048               0   No Deposit    40                    0        Contract
## 1049               0   No Deposit    14                    0       Transient
## 1050               0   No Deposit    14                    0       Transient
## 1051               0   No Deposit   251                    0       Transient
## 1052               1   No Deposit   240                    0       Transient
## 1053               0   No Deposit   240                    0       Transient
## 1054               0   No Deposit    14                    0       Transient
## 1055               0   No Deposit   241                    0       Transient
## 1056               1   No Deposit   240                    0       Transient
## 1057               1   No Deposit   240                    0       Transient
## 1058               0   No Deposit   115                    0        Contract
## 1059               0   No Deposit   275                    0       Transient
## 1060               0   No Deposit   240                    0       Transient
## 1061               1   No Deposit   240                    0       Transient
## 1062               0   No Deposit   240                    0       Transient
## 1063               0   No Deposit    26                    0        Contract
## 1064               0   No Deposit   240                    0       Transient
## 1065               1   No Deposit   240                    0       Transient
## 1066               0   No Deposit   240                    0       Transient
## 1067               0   No Deposit   147                    0       Transient
## 1068               0   No Deposit   240                    0       Transient
## 1069               0   No Deposit    14                    0       Transient
## 1070               1   No Deposit   241                    0       Transient
## 1071               0   No Deposit   241                    0       Transient
## 1072               1   No Deposit   177                    0       Transient
## 1073               0   No Deposit   177                    0       Transient
## 1074               0   No Deposit    40                    0       Transient
## 1075               0   No Deposit   243                    0        Contract
## 1076               0   No Deposit   243                    0       Transient
## 1077               0   No Deposit    40                    0        Contract
## 1078               0   No Deposit   240                    0       Transient
## 1079               0   No Deposit   156                    0        Contract
## 1080               0   No Deposit   156                    0        Contract
## 1081               0   No Deposit   241                    0       Transient
## 1082               0   No Deposit    14                    0       Transient
## 1083               0   No Deposit   251                    0       Transient
## 1084               0   No Deposit   142                    0       Transient
## 1085               0   No Deposit   240                    0       Transient
## 1086               0   No Deposit    14                    0       Transient
## 1087               0   No Deposit    14                    0       Transient
## 1088               0   No Deposit   240                    0       Transient
## 1089               0   No Deposit   240                    0       Transient
## 1090               0   No Deposit   250                    0       Transient
## 1091               0   No Deposit   240                    0       Transient
## 1092               0   No Deposit   240                    0           Group
## 1093               0   No Deposit   240                    0       Transient
## 1094               0   No Deposit   240                    0       Transient
## 1095               0   No Deposit    40                    0        Contract
## 1096               0   No Deposit   241                    0       Transient
## 1097               0   No Deposit    40                    0        Contract
## 1098               0   No Deposit   240                    0       Transient
## 1099               0   No Deposit   240                    0       Transient
## 1100               0   No Deposit   275                    0       Transient
## 1101               0   No Deposit   240                    0       Transient
## 1102               0   No Deposit   241                    0       Transient
## 1103               0   No Deposit   250                    0       Transient
## 1104               0   No Deposit    69                    0        Contract
## 1105               0   No Deposit   275                    0       Transient
## 1106               0   No Deposit    14                    0       Transient
## 1107               0   No Deposit   242                    0       Transient
## 1108               0   No Deposit   240                    0       Transient
## 1109               0   No Deposit    14                    0       Transient
## 1110               0   No Deposit   250                    0       Transient
## 1111               0   No Deposit    40                    0        Contract
## 1112               0   No Deposit    40                    0       Transient
## 1113               0   No Deposit   142                    0        Contract
## 1114               0   No Deposit   142                    0           Group
## 1115               0   No Deposit   250                    0       Transient
## 1116               0   No Deposit    40                    0        Contract
## 1117               0   No Deposit   243                    0        Contract
## 1118               0   No Deposit   240                    0       Transient
## 1119               0   No Deposit   240                    0       Transient
## 1120               0   No Deposit    96                    0       Transient
## 1121               2   No Deposit   241                    0       Transient
## 1122               0   No Deposit   142                    0       Transient
## 1123               0   No Deposit   240                    0       Transient
## 1124               0   No Deposit   240                    0       Transient
## 1125               0   No Deposit   250                    0       Transient
## 1126               0   No Deposit   240                    0       Transient
## 1127               1   No Deposit   241                    0       Transient
## 1128               0   No Deposit     2                    0        Contract
## 1129               0   No Deposit   240                    0       Transient
## 1130               0   No Deposit   250                    0       Transient
## 1131               0   No Deposit   147                    0       Transient
## 1132               0   No Deposit   240                    0       Transient
## 1133               0   No Deposit    40                    0       Transient
## 1134               1   No Deposit    40                    0        Contract
## 1135               0   No Deposit   142                    0       Transient
## 1136               0   No Deposit   240                    0       Transient
## 1137               0   No Deposit   240                    0       Transient
## 1138               0   No Deposit   240                    0       Transient
## 1139               0   No Deposit    14                    0       Transient
## 1140               0   No Deposit   251                    0       Transient
## 1141               0   No Deposit   240                    0       Transient
## 1142               1   No Deposit   240                    0       Transient
## 1143               0   No Deposit   240                    0       Transient
## 1144               1   No Deposit    14                    0       Transient
## 1145               0   No Deposit   240                    0       Transient
## 1146               0   No Deposit   240                    0       Transient
## 1147               0   No Deposit   250                    0       Transient
## 1148               0   No Deposit   240                    0       Transient
## 1149               0   No Deposit   250                    0       Transient
## 1150               0   No Deposit   250                    0       Transient
## 1151               0   No Deposit   240                    0       Transient
## 1152               0   No Deposit   240                    0       Transient
## 1153               1   No Deposit   240                    0       Transient
## 1154               0   No Deposit    40                    0        Contract
## 1155               0   No Deposit     5                    0       Transient
## 1156               0   No Deposit     5                    0       Transient
## 1157               0   No Deposit   142                    0        Contract
## 1158               0   No Deposit   240                    0       Transient
## 1159               0   No Deposit   240                    0       Transient
## 1160               0   No Deposit   240                    0       Transient
## 1161               1   No Deposit    14                    0       Transient
## 1162               1   No Deposit   250                    0 Transient-Party
## 1163               1   No Deposit   250                    0 Transient-Party
## 1164               1   No Deposit   250                    0 Transient-Party
## 1165               1   No Deposit   250                    0 Transient-Party
## 1166               1   No Deposit   250                    0 Transient-Party
## 1167               0   No Deposit   240                    0       Transient
## 1168               1   No Deposit   250                    0 Transient-Party
## 1169               0   No Deposit   250                    0 Transient-Party
## 1170               0   No Deposit   175                    0       Transient
## 1171               0   No Deposit     2                    0        Contract
## 1172               0   No Deposit   240                    0       Transient
## 1173               0   No Deposit   250                    0       Transient
## 1174               0   No Deposit   142                    0        Contract
## 1175               0   No Deposit   243                    0        Contract
## 1176               0   No Deposit   250                    0       Transient
## 1177               0   No Deposit   250                    0       Transient
## 1178               0   No Deposit   240                    0       Transient
## 1179               1   No Deposit   250                    0       Transient
## 1180               0   No Deposit   142                    0       Transient
## 1181               1   No Deposit   196                    0       Transient
## 1182               0   No Deposit    71                    0        Contract
## 1183               0   No Deposit   171                    0       Transient
## 1184               0   No Deposit   115                    0       Transient
## 1185               0   No Deposit   248                    0 Transient-Party
## 1186               0   No Deposit   240                    0       Transient
## 1187               0   No Deposit   250                    0       Transient
## 1188               0   No Deposit   240                    0       Transient
## 1189               0   No Deposit   240                    0       Transient
## 1190               0   No Deposit   156                    0       Transient
## 1191               0   No Deposit    40                    0       Transient
## 1192               0   No Deposit   241                    0       Transient
## 1193               1   No Deposit   156                    0       Transient
## 1194               0   No Deposit   241                    0       Transient
## 1195               0   No Deposit   240                    0       Transient
## 1196               0   No Deposit   175                    0 Transient-Party
## 1197               1   No Deposit   241                    0       Transient
## 1198               0   No Deposit   175                    0 Transient-Party
## 1199               0   No Deposit   250                    0       Transient
## 1200               0   No Deposit   134                    0       Transient
## 1201               0   No Deposit    40                    0       Transient
## 1202               0   No Deposit   241                    0       Transient
## 1203               1   No Deposit   243                    0        Contract
## 1204               1   No Deposit    40                    0       Transient
## 1205               0   No Deposit   243                    0        Contract
## 1206               0   No Deposit   243                    0       Transient
## 1207               0   No Deposit   240                    0       Transient
## 1208               0   No Deposit   242                    0       Transient
## 1209               0   No Deposit   208                    0 Transient-Party
## 1210               0   No Deposit   240                    0       Transient
## 1211               1   No Deposit   240                    0       Transient
## 1212               0   No Deposit   175                    0       Transient
## 1213               0   No Deposit     8                    0       Transient
## 1214               0   No Deposit    40                    0        Contract
## 1215               0   No Deposit   241                    0       Transient
## 1216               0   No Deposit   147                    0       Transient
## 1217               0   No Deposit    26                    0       Transient
## 1218               0   No Deposit   241                    0       Transient
## 1219               0   No Deposit   147                    0       Transient
## 1220               0   No Deposit   147                    0       Transient
## 1221               0   No Deposit   142                    0       Transient
## 1222               0   No Deposit    71                    0        Contract
## 1223               1   No Deposit   240                    0       Transient
## 1224               0   No Deposit   240                    0       Transient
## 1225               0   No Deposit    14                    0       Transient
## 1226               0   No Deposit   240                    0       Transient
## 1227               0   No Deposit     5                    0       Transient
## 1228               2   No Deposit   242                    0       Transient
## 1229               1   No Deposit    14                    0 Transient-Party
## 1230               0   No Deposit    14                    0 Transient-Party
## 1231               0   No Deposit    14                    0 Transient-Party
## 1232               0   No Deposit   240                    0       Transient
## 1233               0   No Deposit   241                    0       Transient
## 1234               0   No Deposit   175                    0       Transient
## 1235               0   No Deposit   240                    0       Transient
## 1236               1   No Deposit    14                    0       Transient
## 1237               0   No Deposit    69                    0        Contract
## 1238               0   No Deposit   240                    0       Transient
## 1239               0   No Deposit   115                    0        Contract
## 1240               0   No Deposit   240                    0       Transient
## 1241               0   No Deposit   240                    0       Transient
## 1242               0   No Deposit   175                    0       Transient
## 1243               0   No Deposit   240                    0       Transient
## 1244               0   No Deposit   240                    0       Transient
## 1245               0   No Deposit    40                    0        Contract
## 1246               0   No Deposit   147                    0       Transient
## 1247               0   No Deposit    40                    0        Contract
## 1248               0   No Deposit   243                    0        Contract
## 1249               0   No Deposit    14                    0           Group
## 1250               4   No Deposit    14                    0 Transient-Party
## 1251               0   No Deposit   240                    0       Transient
## 1252               4   No Deposit    14                    0 Transient-Party
## 1253               0   No Deposit    14                    0       Transient
## 1254               0   No Deposit   240                    0       Transient
## 1255               1   No Deposit   240                    0       Transient
## 1256               0   No Deposit   240                    0       Transient
## 1257               1   No Deposit   240                    0       Transient
## 1258               0   No Deposit   250                    0       Transient
## 1259               0   No Deposit   250                    0       Transient
## 1260               0   No Deposit   171                    0       Transient
## 1261               0   No Deposit   240                    0       Transient
## 1262               0   No Deposit   241                    0       Transient
## 1263               0   No Deposit   241                    0       Transient
## 1264               0   No Deposit   241                    0       Transient
## 1265               0   No Deposit   240                    0       Transient
## 1266               0   No Deposit    14                    0 Transient-Party
## 1267               0   No Deposit   250                    0       Transient
## 1268               1   No Deposit   242                    0       Transient
## 1269               0   No Deposit   240                    0       Transient
## 1270               0   No Deposit    14                    0       Transient
## 1271               0   No Deposit    36                    0       Transient
## 1272               0   No Deposit   240                    0       Transient
## 1273               0   No Deposit   242                    0       Transient
## 1274               0   No Deposit    14                    0 Transient-Party
## 1275               0   No Deposit   251                    0       Transient
## 1276               0   No Deposit   240                    0       Transient
## 1277               0   No Deposit   243                    0       Transient
## 1278               0   No Deposit    40                    0        Contract
## 1279               0   No Deposit   243                    0        Contract
## 1280               0   No Deposit   243                    0        Contract
## 1281               0   No Deposit   142                    0        Contract
## 1282               0   No Deposit   243                    0        Contract
## 1283               0   No Deposit   240                    0       Transient
## 1284               1   No Deposit   240                    0       Transient
## 1285               0   No Deposit   240                    0       Transient
## 1286               0   No Deposit   243                    0        Contract
## 1287               0   No Deposit   241                    0       Transient
## 1288               0   No Deposit   240                    0       Transient
## 1289               0   No Deposit   240                    0       Transient
## 1290               0   No Deposit   115                    0       Transient
## 1291               0   No Deposit    40                    0        Contract
## 1292               0   No Deposit   241                    0       Transient
## 1293               0   No Deposit    69                    0        Contract
## 1294               0   No Deposit   240                    0       Transient
## 1295               0   No Deposit     6                    0       Transient
## 1296               0   No Deposit   171                    0       Transient
## 1297               0   No Deposit     8                    0        Contract
## 1298               0   No Deposit     5                    0       Transient
## 1299               0   No Deposit   175                    0       Transient
## 1300               0   No Deposit    69                    0        Contract
## 1301               0   No Deposit   240                    0       Transient
## 1302               0   No Deposit    36                    0       Transient
## 1303               0   No Deposit   240                    0       Transient
## 1304               1   No Deposit    14                    0       Transient
## 1305               0   No Deposit    14                    0       Transient
## 1306               0   No Deposit   110                    0       Transient
## 1307               1   No Deposit    14                    0       Transient
## 1308               0   No Deposit   256                    0 Transient-Party
## 1309               0   No Deposit   256                    0 Transient-Party
## 1310               0   No Deposit   256                    0 Transient-Party
## 1311               0   No Deposit   240                    0       Transient
## 1312               0   No Deposit   256                    0 Transient-Party
## 1313               0   No Deposit   256                    0 Transient-Party
## 1314               0   No Deposit   256                    0 Transient-Party
## 1315               0   No Deposit   256                    0 Transient-Party
## 1316               0   No Deposit   240                    0       Transient
## 1317               0   No Deposit   240                    0       Transient
## 1318               0   No Deposit   171                    0       Transient
## 1319               0   No Deposit     2                    0       Transient
## 1320               0   No Deposit   171                    0       Transient
## 1321               0   No Deposit   171                    0       Transient
## 1322               0   No Deposit   241                    0       Transient
## 1323               0   No Deposit   171                    0       Transient
## 1324               0   No Deposit   241                    0       Transient
## 1325               0   No Deposit   142                    0        Contract
## 1326               0   No Deposit    14                    0 Transient-Party
## 1327               0   No Deposit    14                    0       Transient
## 1328               0   No Deposit   240                    0       Transient
## 1329               0   No Deposit   240                    0       Transient
## 1330               0   No Deposit   240                    0       Transient
## 1331               0   No Deposit   250                    0       Transient
## 1332               0   No Deposit   240                    0       Transient
## 1333               0   No Deposit   250                    0       Transient
## 1334               0   No Deposit   115                    0        Contract
## 1335               1   No Deposit   240                    0       Transient
## 1336               0   No Deposit    14                    0       Transient
## 1337               0   No Deposit   314                    0        Contract
## 1338               0   No Deposit   250                    0       Transient
## 1339               0   No Deposit     2                    0        Contract
## 1340               0   No Deposit   243                    0        Contract
## 1341               0   No Deposit   243                    0        Contract
## 1342               0   No Deposit   240                    0       Transient
## 1343               0   No Deposit   147                    0       Transient
## 1344               0   No Deposit   243                    0       Transient
## 1345               0   No Deposit   240                    0       Transient
## 1346               0   No Deposit   243                    0        Contract
## 1347               0   No Deposit   240                    0       Transient
## 1348               0   No Deposit   240                    0       Transient
## 1349               0   No Deposit   240                    0       Transient
## 1350               0   No Deposit    14                    0       Transient
## 1351               0   No Deposit   240                    0       Transient
## 1352               1   No Deposit   240                    0       Transient
## 1353               0   No Deposit   240                    0       Transient
## 1354               0   No Deposit   171                    0 Transient-Party
## 1355               0   No Deposit    71                    0        Contract
## 1356               0   No Deposit   240                    0       Transient
## 1357               0   No Deposit   171                    0       Transient
## 1358               0   No Deposit   240                    0       Transient
## 1359               1   No Deposit    71                    0       Transient
## 1360               0   No Deposit    40                    0        Contract
## 1361               0   No Deposit   115                    0       Transient
## 1362               0   No Deposit   240                    0       Transient
## 1363               0   No Deposit   240                    0       Transient
## 1364               0   No Deposit   240                    0       Transient
## 1365               0   No Deposit    14                    0       Transient
## 1366               0   No Deposit   240                    0 Transient-Party
## 1367               0   No Deposit   250                    0       Transient
## 1368               0   No Deposit    14                    0       Transient
## 1369               0   No Deposit    14                    0       Transient
## 1370               0   No Deposit   240                    0 Transient-Party
## 1371               0   No Deposit   240                    0 Transient-Party
## 1372               0   No Deposit   240                    0 Transient-Party
## 1373               0   No Deposit   314                    0        Contract
## 1374               0   No Deposit   241                    0       Transient
## 1375               0   No Deposit   240                    0 Transient-Party
## 1376               0   No Deposit   240                    0       Transient
## 1377               0   No Deposit   240                    0       Transient
## 1378               0   No Deposit   240                    0       Transient
## 1379               0   No Deposit   240                    0       Transient
## 1380               0   No Deposit   241                    0       Transient
## 1381               0   No Deposit    36                    0       Transient
## 1382               0   No Deposit   250                    0       Transient
## 1383               0   No Deposit    40                    0        Contract
## 1384               0   No Deposit   241                    0       Transient
## 1385               3   No Deposit   240                    0       Transient
## 1386               0   No Deposit   240                    0       Transient
## 1387               0   No Deposit   240                    0       Transient
## 1388               0   No Deposit   250                    0       Transient
## 1389               1   No Deposit    14                    0       Transient
## 1390               0   No Deposit   110                    0       Transient
## 1391               1   No Deposit   240                    0       Transient
## 1392               0   No Deposit   240                    0 Transient-Party
## 1393               0   No Deposit   240                    0 Transient-Party
## 1394               0   No Deposit   175                    0       Transient
## 1395               0   No Deposit   250                    0       Transient
## 1396               1   No Deposit   240                    0       Transient
## 1397               0   No Deposit    40                    0        Contract
## 1398               0   No Deposit     6                    0       Transient
## 1399               0   No Deposit     6                    0       Transient
## 1400               0   No Deposit   240                    0       Transient
## 1401               0   No Deposit   240                    0       Transient
## 1402               0   No Deposit   240                    0       Transient
## 1403               0   No Deposit   240                    0       Transient
## 1404               0   No Deposit   240                    0           Group
## 1405               0   No Deposit   242                    0       Transient
## 1406               0   No Deposit    14                    0       Transient
## 1407               0   No Deposit     2                    0        Contract
## 1408               0   No Deposit    14                    0       Transient
## 1409               0   No Deposit   171                    0       Transient
## 1410               1   No Deposit   241                    0       Transient
## 1411               0   No Deposit   240                    0       Transient
## 1412               0   No Deposit   156                    0       Transient
## 1413               0   No Deposit    14                    0       Transient
## 1414               0   No Deposit   241                    0       Transient
## 1415               1   No Deposit    14                    0       Transient
## 1416               0   No Deposit   240                    0       Transient
## 1417               0   No Deposit   240                    0       Transient
## 1418               0   No Deposit   250                    0       Transient
## 1419               0   No Deposit   240                    0       Transient
## 1420               0   No Deposit   240                    0       Transient
## 1421               0   No Deposit   147                    0       Transient
## 1422               0   No Deposit   250                    0       Transient
## 1423               0   No Deposit   240                    0       Transient
## 1424               0   No Deposit    14                    0       Transient
## 1425               1   No Deposit    14                    0       Transient
## 1426               1   No Deposit    14                    0       Transient
## 1427               0   No Deposit   250                    0       Transient
## 1428               0   No Deposit   241                    0       Transient
## 1429               0   No Deposit    36                    0       Transient
## 1430               1   No Deposit    14                    0       Transient
## 1431               0   No Deposit     6                    0       Transient
## 1432               0   No Deposit   177                    0 Transient-Party
## 1433               0   No Deposit   314                    0       Transient
## 1434               0   No Deposit   177                    0 Transient-Party
## 1435               0   No Deposit   171                    0 Transient-Party
## 1436               0   No Deposit   171                    0 Transient-Party
## 1437               0   No Deposit   126                    0       Transient
## 1438               0   No Deposit   240                    0       Transient
## 1439               0   No Deposit   240                    0       Transient
## 1440               0   No Deposit   250                    0       Transient
## 1441               3   No Deposit    14                    0 Transient-Party
## 1442               0   No Deposit   250                    0       Transient
## 1443               0   No Deposit    14                    0        Contract
## 1444               1   No Deposit   250                    0        Contract
## 1445               0   No Deposit   240                    0       Transient
## 1446               1   No Deposit    14                    0        Contract
## 1447               0   No Deposit   250                    0        Contract
## 1448               0   No Deposit   250                    0        Contract
## 1449               2   No Deposit   281                    0        Contract
## 1450               2   No Deposit    14                    0 Transient-Party
## 1451               0   No Deposit   250                    0       Transient
## 1452               1   No Deposit   250                    0        Contract
## 1453               0   No Deposit   281                   50        Contract
## 1454               0   No Deposit   250                    0        Contract
## 1455               0   No Deposit   281                    0        Contract
## 1456               0   No Deposit   250                    0        Contract
## 1457               0   No Deposit   240                    0       Transient
## 1458               0   No Deposit   314                    0 Transient-Party
## 1459               0   No Deposit   241                    0       Transient
## 1460               0   No Deposit     8                    0        Contract
## 1461               0   No Deposit   314                    0 Transient-Party
## 1462               0   No Deposit   250                    0       Transient
## 1463               2   No Deposit   314                    0       Transient
## 1464               0   No Deposit   240                    0       Transient
## 1465               0   No Deposit    14                    0 Transient-Party
## 1466               0   No Deposit   250                    0       Transient
## 1467               0   No Deposit   250                    0        Contract
## 1468               0   No Deposit   250                    0        Contract
## 1469               2   No Deposit    14                    0       Transient
## 1470               0   No Deposit   240                    0       Transient
## 1471               0   No Deposit   250                    0        Contract
## 1472               0   No Deposit   241                    0       Transient
## 1473               0   No Deposit   240                    0       Transient
## 1474               1   No Deposit   240                    0       Transient
## 1475               0   No Deposit   250                    0        Contract
## 1476               0   No Deposit   250                    0        Contract
## 1477               0   No Deposit   240                    0       Transient
## 1478               1   No Deposit   314                    0       Transient
## 1479               0   No Deposit   241                    0       Transient
## 1480               0   No Deposit   250                    0       Transient
## 1481               0   No Deposit   240                    0       Transient
## 1482               0   No Deposit   241                    0       Transient
## 1483               0   No Deposit   314                    0       Transient
## 1484               0   No Deposit   314                    0       Transient
## 1485               0   No Deposit   196                    0       Transient
## 1486               0   No Deposit   240                    0       Transient
## 1487               0   No Deposit    14                    0       Transient
## 1488               0   No Deposit   240                    0       Transient
## 1489               0   No Deposit   240                    0       Transient
## 1490               0   No Deposit   240                    0       Transient
## 1491               0   No Deposit   175                    0       Transient
## 1492               0   No Deposit   171                    0       Transient
## 1493               0   No Deposit   281                    0        Contract
## 1494               0   No Deposit   281                    0        Contract
## 1495               0   No Deposit   240                    0       Transient
## 1496               0   No Deposit   240                    0       Transient
## 1497               0   No Deposit   250                    0       Transient
## 1498               1   No Deposit   240                    0       Transient
## 1499               0   No Deposit   240                    0       Transient
## 1500               1   No Deposit   240                    0       Transient
## 1501               0   No Deposit   240                    0       Transient
## 1502               0   No Deposit   240                    0       Transient
## 1503               0   No Deposit   240                    0       Transient
## 1504               0   No Deposit   240                    0       Transient
## 1505               0   No Deposit    14                    0       Transient
## 1506               0   No Deposit   250                    0       Transient
## 1507               1   No Deposit   240                    0       Transient
## 1508               0   No Deposit   240                    0       Transient
## 1509               0   No Deposit   240                    0       Transient
## 1510               0   No Deposit    14                    0       Transient
## 1511               0   No Deposit   250                    0       Transient
## 1512               1   No Deposit    14                    0       Transient
## 1513               0   No Deposit   240                    0       Transient
## 1514               0   No Deposit   240                    0       Transient
## 1515               0   No Deposit   240                    0       Transient
## 1516               2   No Deposit   171                    0       Transient
## 1517               0   No Deposit   240                    0       Transient
## 1518               0   No Deposit   250                    0       Transient
## 1519               1   No Deposit   240                    0       Transient
## 1520               0   No Deposit   240                    0       Transient
## 1521               0   No Deposit   314                    0       Transient
## 1522               0   No Deposit   240                    0       Transient
## 1523               0   No Deposit   240                    0       Transient
## 1524               0   No Deposit   240                    0       Transient
## 1525               0   No Deposit   240                    0       Transient
## 1526               0   No Deposit    36                    0       Transient
## 1527               0   No Deposit   241                    0       Transient
## 1528               0   No Deposit   242                    0       Transient
## 1529               0   No Deposit    14                    0 Transient-Party
## 1530               0   No Deposit   240                    0       Transient
## 1531               0   No Deposit    14                    0       Transient
## 1532               0   No Deposit    14                    0       Transient
## 1533               0   No Deposit    14                    0       Transient
## 1534               0   No Deposit    96                    0       Transient
## 1535               1   No Deposit   240                    0       Transient
## 1536               0   No Deposit    14                    0       Transient
## 1537               0   No Deposit   241                    0       Transient
## 1538               0   No Deposit   273                    0 Transient-Party
## 1539               1   No Deposit   147                    0       Transient
## 1540               0   No Deposit   240                    0       Transient
## 1541               0   No Deposit   240                    0       Transient
## 1542               0   No Deposit    14                    0       Transient
## 1543               2   No Deposit   240                    0       Transient
## 1544               0   No Deposit    14                    0       Transient
## 1545               0   No Deposit   240                    0       Transient
## 1546               0   No Deposit   240                    0       Transient
## 1547               0   No Deposit   250                    0       Transient
## 1548               0   No Deposit   250                    0       Transient
## 1549               1   No Deposit     5                    0 Transient-Party
## 1550               0   No Deposit   240                    0 Transient-Party
## 1551               0   No Deposit   240                    0       Transient
## 1552               1   No Deposit     5                    0 Transient-Party
## 1553               0   No Deposit   240                    0       Transient
## 1554               0   No Deposit   240                    0 Transient-Party
## 1555               0   No Deposit   242                    0       Transient
## 1556               3   No Deposit    14                    0 Transient-Party
## 1557               1   No Deposit    14                    0 Transient-Party
## 1558               0   No Deposit   250                    0       Transient
## 1559               0   No Deposit     8                    0        Contract
## 1560               1   No Deposit   240                    0 Transient-Party
## 1561               1   No Deposit   240                    0 Transient-Party
## 1562               2   No Deposit   240                    0 Transient-Party
## 1563               1   No Deposit    14                    0       Transient
## 1564               2   No Deposit    14                    0 Transient-Party
## 1565               0   No Deposit    14                    0       Transient
## 1566               1   No Deposit    14                    0 Transient-Party
## 1567               0   No Deposit   241                    0       Transient
## 1568               0   No Deposit   240                    0       Transient
## 1569               0   No Deposit   240                    0       Transient
## 1570               0   No Deposit   240                    0       Transient
## 1571               0   No Deposit   314                    0       Transient
## 1572               1   No Deposit    14                    0       Transient
## 1573               0   No Deposit   240                    0       Transient
## 1574               0   No Deposit   240                    0       Transient
## 1575               1   No Deposit   250                    0       Transient
## 1576               0   No Deposit   243                    0       Transient
## 1577               0   No Deposit   241                    0       Transient
## 1578               1   No Deposit   241                    0       Transient
## 1579               0   No Deposit   243                    0        Contract
## 1580               0   No Deposit   243                    0       Transient
## 1581               0   No Deposit   240                    0       Transient
## 1582               0   No Deposit   147                    0       Transient
## 1583               0   No Deposit    14                    0       Transient
## 1584               0   No Deposit   240                    0       Transient
## 1585               0   No Deposit     8                    0 Transient-Party
## 1586               0   No Deposit     8                    0 Transient-Party
## 1587               0   No Deposit    14                    0       Transient
## 1588               0   No Deposit   127                    0       Transient
## 1589               1   No Deposit   240                    0       Transient
## 1590               0   No Deposit   240                    0       Transient
## 1591               0   No Deposit   240                    0       Transient
## 1592               0   No Deposit   241                    0       Transient
## 1593               0   No Deposit    14                   47 Transient-Party
## 1594               0   No Deposit    14                   47 Transient-Party
## 1595               0   No Deposit    14                   47 Transient-Party
## 1596               0   No Deposit    14                    0 Transient-Party
## 1597               0   No Deposit    14                   47 Transient-Party
## 1598               0   No Deposit    14                   47 Transient-Party
## 1599               0   No Deposit    14                   47 Transient-Party
## 1600               0   No Deposit    14                   47 Transient-Party
## 1601               0   No Deposit    14                   47 Transient-Party
## 1602               0   No Deposit    14                   47 Transient-Party
## 1603               0   No Deposit    14                   47 Transient-Party
## 1604               0   No Deposit    14                   47 Transient-Party
## 1605               0   No Deposit    14                   47 Transient-Party
## 1606               0   No Deposit    14                   47 Transient-Party
## 1607               0   No Deposit    14                   47 Transient-Party
## 1608               0   No Deposit    14                   47 Transient-Party
## 1609               0   No Deposit    14                   47 Transient-Party
## 1610               0   No Deposit    14                   47 Transient-Party
## 1611               0   No Deposit   240                    0       Transient
## 1612               0   No Deposit    14                   47 Transient-Party
## 1613               0   No Deposit    14                   47 Transient-Party
## 1614               0   No Deposit    14                   47 Transient-Party
## 1615               0   No Deposit    14                    0       Transient
## 1616               0   No Deposit    14                   47 Transient-Party
## 1617               0   No Deposit    40                    0        Contract
## 1618               0   No Deposit    40                    0        Contract
## 1619               0   No Deposit   147                    0       Transient
## 1620               0   No Deposit   314                    0       Transient
## 1621               0   No Deposit   171                    0       Transient
## 1622               1   No Deposit    14                    0       Transient
## 1623               0   No Deposit    14                    0       Transient
## 1624               0   No Deposit    14                    0       Transient
## 1625               1   No Deposit   250                    0       Transient
## 1626               0   No Deposit   240                    0       Transient
## 1627               0   No Deposit   314                    0        Contract
## 1628               0   No Deposit   171                    0       Transient
## 1629               0   No Deposit   115                    0        Contract
## 1630               0   No Deposit   314                    0        Contract
## 1631               0   No Deposit    40                    0        Contract
## 1632               1   No Deposit   240                    0       Transient
## 1633               0   No Deposit   240                    0       Transient
## 1634               0   No Deposit   240                    0       Transient
## 1635               2   No Deposit   208                    0 Transient-Party
## 1636               0   No Deposit   208                    0 Transient-Party
## 1637               0   No Deposit   241                    0       Transient
## 1638               0   No Deposit   240                    0       Transient
## 1639               0   No Deposit   241                    0       Transient
## 1640               0   No Deposit   177                    0       Transient
## 1641               0   No Deposit   240                    0       Transient
## 1642               0   No Deposit   250                    0       Transient
## 1643               1   No Deposit   240                    0       Transient
## 1644               0   No Deposit   240                    0       Transient
## 1645               1   No Deposit    14                    0       Transient
## 1646               1   No Deposit   240                    0       Transient
## 1647               0   No Deposit   240                    0       Transient
## 1648               0   No Deposit   240                    0 Transient-Party
## 1649               0   No Deposit   241                    0       Transient
## 1650               0   No Deposit     2                    0        Contract
## 1651               1   No Deposit   240                    0 Transient-Party
## 1652               0   No Deposit   177                    0       Transient
## 1653               0   No Deposit   243                    0 Transient-Party
## 1654               0   No Deposit   243                    0       Transient
## 1655               0   No Deposit   243                    0       Transient
## 1656               0   No Deposit   243                    0       Transient
## 1657               0   No Deposit   240                    0       Transient
## 1658               1   No Deposit   240                    0 Transient-Party
## 1659               0   No Deposit   240                    0       Transient
## 1660               0   No Deposit   240                    0       Transient
## 1661               0   No Deposit   240                    0       Transient
## 1662               0   No Deposit   240                    0       Transient
## 1663               0   No Deposit   240                    0       Transient
## 1664               0   No Deposit   240                    0       Transient
## 1665               1   No Deposit   240                    0       Transient
## 1666               0   No Deposit   243                    0 Transient-Party
## 1667               0   No Deposit   243                    0       Transient
## 1668               1   No Deposit    26                    0        Contract
## 1669               0   No Deposit   240                    0       Transient
## 1670               0   No Deposit   240                    0 Transient-Party
## 1671               0   No Deposit   240                    0 Transient-Party
## 1672               0   No Deposit   240                    0 Transient-Party
## 1673               0   No Deposit   240                    0 Transient-Party
## 1674               2   No Deposit    14                    0 Transient-Party
## 1675               0   No Deposit   240                    0       Transient
## 1676               0   No Deposit   240                    0       Transient
## 1677               0   No Deposit    14                    0       Transient
## 1678               0   No Deposit   240                    0       Transient
## 1679               2   No Deposit    14                    0 Transient-Party
## 1680               0   No Deposit    14                    0 Transient-Party
## 1681               0   No Deposit   253                    0       Transient
## 1682               0   No Deposit    14                    0 Transient-Party
## 1683               1   No Deposit    14                    0       Transient
## 1684               0   No Deposit   240                    0       Transient
## 1685               2   No Deposit    14                    0 Transient-Party
## 1686               0   No Deposit    14                    0       Transient
## 1687               0   No Deposit   241                    0       Transient
## 1688               0   No Deposit   240                    0       Transient
## 1689               0   No Deposit   241                    0       Transient
## 1690               0   No Deposit     2                    0        Contract
## 1691               0   No Deposit     2                    0        Contract
## 1692               0   No Deposit   241                    0       Transient
## 1693               0   No Deposit   250                    0       Transient
## 1694               0   No Deposit   240                    0       Transient
## 1695               0   No Deposit     2                    0       Transient
## 1696               0   No Deposit     5                    0       Transient
## 1697               2   No Deposit   240                    0       Transient
## 1698               0   No Deposit   240                    0       Transient
## 1699               0   No Deposit   250                    0       Transient
## 1700               0   No Deposit   240                    0 Transient-Party
## 1701               4   No Deposit    14                    0 Transient-Party
## 1702               0   No Deposit   240                    0       Transient
## 1703               0   No Deposit    14                    0       Transient
## 1704               0   No Deposit   240                    0       Transient
## 1705               0   No Deposit   240                    0       Transient
## 1706               0   No Deposit   177                    0       Transient
## 1707               0   No Deposit   314                    0       Transient
## 1708               0   No Deposit   175                    0       Transient
## 1709               0   No Deposit   240                    0       Transient
## 1710               0   No Deposit   143                    0        Contract
## 1711               0   No Deposit   175                    0       Transient
## 1712               0   No Deposit   240                    0       Transient
## 1713               0   No Deposit   250                    0       Transient
## 1714               0   No Deposit   240                    0       Transient
## 1715               0   No Deposit     8                    0        Contract
## 1716               0   No Deposit   314                    0        Contract
## 1717               0   No Deposit   243                    0        Contract
## 1718               1   No Deposit   240                    0       Transient
## 1719               0   No Deposit   242                    0       Transient
## 1720               0   No Deposit   242                    0       Transient
## 1721               0   No Deposit   240                    0       Transient
## 1722               1   No Deposit   240                    0       Transient
## 1723               2   No Deposit   185                    0 Transient-Party
## 1724               0   No Deposit   240                    0       Transient
## 1725               0   No Deposit    14                    0       Transient
## 1726               1   No Deposit    14                    0       Transient
## 1727               0   No Deposit   240                    0       Transient
## 1728               0   No Deposit    14                    0       Transient
## 1729               0   No Deposit   240                    0       Transient
## 1730               0   No Deposit   196                    0 Transient-Party
## 1731               0   No Deposit   240                    0       Transient
## 1732               0   No Deposit   240                    0       Transient
## 1733               0   No Deposit   196                    0 Transient-Party
## 1734               0   No Deposit   240                    0       Transient
## 1735               0   No Deposit   240                    0       Transient
## 1736               0   No Deposit   240                    0       Transient
## 1737               1   No Deposit   240                    0       Transient
## 1738               0   No Deposit   156                    0       Transient
## 1739               0   No Deposit    14                    0       Transient
## 1740               0   No Deposit    14                    0       Transient
## 1741               2   No Deposit   240                    0       Transient
## 1742               0   No Deposit    14                    0       Transient
## 1743               1   No Deposit    14                    0       Transient
## 1744               0   No Deposit    14                    0       Transient
## 1745               0   No Deposit    14                    0       Transient
## 1746               0   No Deposit    14                    0       Transient
## 1747               0   No Deposit    14                    0       Transient
## 1748               0   No Deposit    14                    0       Transient
## 1749               0   No Deposit    14                    0       Transient
## 1750               0   No Deposit   240                    0       Transient
## 1751               0   No Deposit   240                    0       Transient
## 1752               1   No Deposit   240                    0       Transient
## 1753               0   No Deposit   240                    0       Transient
## 1754               1   No Deposit   240                    0       Transient
## 1755               1   No Deposit    14                    0       Transient
## 1756               2   No Deposit   240                    0       Transient
## 1757               0   No Deposit    14                    0       Transient
## 1758               1   No Deposit    14                    0       Transient
## 1759               0   No Deposit    14                    0 Transient-Party
## 1760               0   No Deposit    14                    0       Transient
## 1761               1   No Deposit   240                    0       Transient
## 1762               0   No Deposit   250                    0       Transient
## 1763               0   No Deposit    14                    0       Transient
## 1764               0   No Deposit    14                    0       Transient
## 1765               0   No Deposit    14                    0       Transient
## 1766               0   No Deposit   240                    0       Transient
## 1767               0   No Deposit    14                    0       Transient
## 1768               0   No Deposit    14                    0       Transient
## 1769               1   No Deposit   240                    0       Transient
## 1770               0   No Deposit    14                    0       Transient
## 1771               0   No Deposit   240                    0       Transient
## 1772               0   No Deposit    14                    0       Transient
## 1773               0   No Deposit    14                    0       Transient
## 1774               0   No Deposit   240                    0       Transient
## 1775               0   No Deposit   177                    0 Transient-Party
## 1776               0   No Deposit   177                    0 Transient-Party
## 1777               0   No Deposit    14                    0       Transient
## 1778               0   No Deposit   241                    0       Transient
## 1779               0   No Deposit    96                    0       Transient
## 1780               0   No Deposit    14                    0       Transient
## 1781               2   No Deposit    14                    0       Transient
## 1782               0   No Deposit   241                    0       Transient
## 1783               0   No Deposit   241                    0       Transient
## 1784               0   No Deposit   240                    0       Transient
## 1785               0   No Deposit   240                    0       Transient
## 1786               0   No Deposit    14                    0       Transient
## 1787               0   No Deposit    14                    0       Transient
## 1788               0   No Deposit    14                    0       Transient
## 1789               0   No Deposit    14                    0       Transient
## 1790               0   No Deposit   330                    0       Transient
## 1791               0   No Deposit    14                    0       Transient
## 1792               0   No Deposit    14                    0       Transient
## 1793               0   No Deposit   240                    0       Transient
## 1794               1   No Deposit   240                    0       Transient
## 1795               0   No Deposit   250                    0       Transient
## 1796               0   No Deposit    14                    0       Transient
## 1797               0   No Deposit    14                    0       Transient
## 1798               0   No Deposit    14                    0       Transient
## 1799               0   No Deposit   330                    0       Transient
## 1800               0   No Deposit    14                    0       Transient
## 1801               0   No Deposit   330                    0       Transient
## 1802               0   No Deposit   241                    0       Transient
## 1803               0   No Deposit    14                    0       Transient
## 1804               0   No Deposit   175                    0       Transient
## 1805               0   No Deposit    14                    0       Transient
## 1806               0   No Deposit    14                    0       Transient
## 1807               0   No Deposit    14                    0       Transient
## 1808               0   No Deposit   240                    0       Transient
## 1809               0   No Deposit    14                    0       Transient
## 1810               0   No Deposit    14                    0       Transient
## 1811               0   No Deposit    14                    0       Transient
## 1812               1   No Deposit   250                    0       Transient
## 1813               0   No Deposit   240                    0       Transient
## 1814               0   No Deposit    14                    0       Transient
## 1815               1   No Deposit    14                    0       Transient
## 1816               0   No Deposit   250                    0       Transient
## 1817               0   No Deposit    14                    0       Transient
## 1818               1   No Deposit   240                    0       Transient
## 1819               0   No Deposit   240                    0       Transient
## 1820               0   No Deposit    36                    0       Transient
## 1821               0   No Deposit   156                    0       Transient
## 1822               0   No Deposit   240                    0       Transient
## 1823               0   No Deposit   196                    0       Transient
## 1824               1   No Deposit   240                    0       Transient
## 1825               0   No Deposit   156                    0        Contract
## 1826               0   No Deposit    36                    0       Transient
## 1827               0   No Deposit   156                    0       Transient
## 1828               0   No Deposit   156                    0       Transient
## 1829               0   No Deposit   240                    0       Transient
## 1830               1   No Deposit    14                    0       Transient
## 1831               1   No Deposit   240                    0       Transient
## 1832               0   No Deposit    69                    0       Transient
## 1833               0   No Deposit    69                    0       Transient
## 1834               0   No Deposit   240                    0       Transient
## 1835               0   No Deposit   241                    0       Transient
## 1836               0   No Deposit    14                    0       Transient
## 1837               0   No Deposit    14                    0       Transient
## 1838               0   No Deposit   240                    0       Transient
## 1839               0   No Deposit    14                    0       Transient
## 1840               0   No Deposit    14                    0       Transient
## 1841               0   No Deposit   240                    0       Transient
## 1842               1   No Deposit   334                    0 Transient-Party
## 1843               1   No Deposit   240                    0       Transient
## 1844               0   No Deposit    15                    0       Transient
## 1845               0   No Deposit   196                    0       Transient
## 1846               0   No Deposit    14                    0       Transient
## 1847               0   No Deposit   314                    0       Transient
## 1848               0   No Deposit     8                    0       Transient
## 1849               0   No Deposit   240                    0       Transient
## 1850               2   No Deposit   328                    0 Transient-Party
## 1851               2   No Deposit   326                    0 Transient-Party
## 1852               1   No Deposit   326                    0       Transient
## 1853               2   No Deposit   334                    0 Transient-Party
## 1854               6   No Deposit   328                    0       Transient
## 1855               1   No Deposit   326                    0       Transient
## 1856               2   No Deposit   334                    0 Transient-Party
## 1857               2   No Deposit   334                    0 Transient-Party
## 1858               0   No Deposit    14                    0       Transient
## 1859               0   No Deposit   240                    0       Transient
## 1860               0   No Deposit   240                    0       Transient
## 1861               1   No Deposit   240                    0       Transient
## 1862               3   No Deposit   185                    0 Transient-Party
## 1863               0   No Deposit    14                    0       Transient
## 1864               0   No Deposit    14                    0       Transient
## 1865               0   No Deposit    14                    0       Transient
## 1866               1   No Deposit   240                    0       Transient
## 1867               1   No Deposit   240                    0       Transient
## 1868               1   No Deposit   185                    0 Transient-Party
## 1869               0   No Deposit   314                    0        Contract
## 1870               2   No Deposit   185                    0 Transient-Party
## 1871               1   No Deposit   240                    0       Transient
## 1872               0   No Deposit   240                    0       Transient
## 1873               0   No Deposit   240                    0       Transient
## 1874               0   No Deposit   250                    0       Transient
## 1875               0   No Deposit   115                    0       Transient
## 1876               0   No Deposit   240                    0       Transient
## 1877               0   No Deposit   240                    0       Transient
## 1878               1   No Deposit   241                    0       Transient
## 1879               0   No Deposit   156                    0        Contract
## 1880               1   No Deposit   334                    0 Transient-Party
## 1881               2   No Deposit   185                    0 Transient-Party
## 1882               2   No Deposit   185                    0 Transient-Party
## 1883               2   No Deposit   185                    0 Transient-Party
## 1884               3   No Deposit   185                    0 Transient-Party
## 1885               1   No Deposit   334                    0 Transient-Party
## 1886               2   No Deposit   185                    0 Transient-Party
## 1887               0   No Deposit   240                    0 Transient-Party
## 1888               0   No Deposit   240                    0       Transient
## 1889               0   No Deposit   321                    0       Transient
## 1890               0   No Deposit    14                    0       Transient
## 1891               0   No Deposit   240                    0       Transient
## 1892               1   No Deposit   240                    0       Transient
## 1893               0   No Deposit   240                    0       Transient
## 1894               0   No Deposit   314                    0       Transient
## 1895               0   No Deposit   314                    0       Transient
## 1896               0   No Deposit   156                    0       Transient
## 1897               0   No Deposit   156                    0       Transient
## 1898               1   No Deposit   185                    0 Transient-Party
## 1899               0   No Deposit   240                    0       Transient
## 1900               2   No Deposit   185                    0 Transient-Party
## 1901               2   No Deposit   185                    0 Transient-Party
## 1902               1   No Deposit   328                    0 Transient-Party
## 1903               2   No Deposit   185                    0 Transient-Party
## 1904               1   No Deposit   185                    0 Transient-Party
## 1905               1   No Deposit   185                    0 Transient-Party
## 1906               2   No Deposit   185                    0 Transient-Party
## 1907               0   No Deposit   240                    0       Transient
## 1908               1   No Deposit   240                    0       Transient
## 1909               0   No Deposit    14                    0       Transient
## 1910               1   No Deposit   240                    0       Transient
## 1911               1   No Deposit   334                    0 Transient-Party
## 1912               2   No Deposit   185                    0 Transient-Party
## 1913               1   No Deposit   185                    0 Transient-Party
## 1914               1   No Deposit   334                    0 Transient-Party
## 1915               0   No Deposit   240                    0       Transient
## 1916               2   No Deposit   185                    0 Transient-Party
## 1917               1   No Deposit   185                    0 Transient-Party
## 1918               0   No Deposit   314                    0        Contract
## 1919               0   No Deposit   240                    0       Transient
## 1920               0   No Deposit   240                    0       Transient
## 1921               0   No Deposit    14                    0       Transient
## 1922               1   No Deposit   240                    0       Transient
## 1923               1   No Deposit   334                    0           Group
## 1924               2   No Deposit   240                    0       Transient
## 1925               0   No Deposit    14                    0       Transient
## 1926               1   No Deposit   241                    0       Transient
## 1927               0   No Deposit   314                    0        Contract
## 1928               0   No Deposit   314                    0        Contract
## 1929               0   No Deposit   240                    0       Transient
## 1930               0   No Deposit   240                    0       Transient
## 1931               0   No Deposit   156                    0       Transient
## 1932               0   No Deposit   240                    0       Transient
## 1933               2   No Deposit   250                    0       Transient
## 1934               0   No Deposit    14                    0       Transient
## 1935               1   No Deposit    96                    0       Transient
## 1936               4   No Deposit   324                    0 Transient-Party
## 1937               0   No Deposit   240                    0       Transient
## 1938               0   No Deposit   240                    0       Transient
## 1939               1   No Deposit   240                    0       Transient
## 1940               1   No Deposit   240                    0       Transient
## 1941               0   No Deposit   240                    0       Transient
## 1942               3   No Deposit   281                    0        Contract
## 1943               2   No Deposit   185                    0 Transient-Party
## 1944               0   No Deposit   240                    0       Transient
## 1945               4   No Deposit   324                    0 Transient-Party
## 1946               1   No Deposit   240                    0       Transient
## 1947               0   No Deposit   240                    0       Transient
## 1948               0   No Deposit   240                    0       Transient
## 1949               0   No Deposit   240                    0       Transient
## 1950               0   No Deposit   240                    0       Transient
## 1951               3   No Deposit   324                    0       Transient
## 1952               0   No Deposit   240                    0 Transient-Party
## 1953               3   No Deposit   324                    0 Transient-Party
## 1954               1   No Deposit   185                    0 Transient-Party
## 1955               2   No Deposit   334                    0 Transient-Party
## 1956               0   No Deposit   240                    0       Transient
## 1957               2   No Deposit   334                    0 Transient-Party
## 1958               1   No Deposit   334                    0 Transient-Party
## 1959               3   No Deposit   334                    0 Transient-Party
## 1960               0   No Deposit   334                    0 Transient-Party
## 1961               4   No Deposit   334                    0 Transient-Party
## 1962               0   No Deposit   240                    0 Transient-Party
## 1963               0   No Deposit   240                    0 Transient-Party
## 1964               1   No Deposit   334                    0 Transient-Party
## 1965               1   No Deposit   240                    0       Transient
## 1966               0   No Deposit   240                    0 Transient-Party
## 1967               2   No Deposit   334                    0 Transient-Party
## 1968               2   No Deposit   334                    0 Transient-Party
## 1969               0   No Deposit   240                    0       Transient
## 1970               4   No Deposit   324                    0 Transient-Party
## 1971               1   No Deposit   240                    0 Transient-Party
## 1972               0   No Deposit   240                    0 Transient-Party
## 1973               0   No Deposit   185                    0 Transient-Party
## 1974               0   No Deposit   240                    0       Transient
## 1975               0   No Deposit    14                    0       Transient
## 1976               0   No Deposit   240                    0       Transient
## 1977               0   No Deposit    14                    0       Transient
## 1978               0   No Deposit   185                    0 Transient-Party
## 1979               0   No Deposit   241                    0       Transient
## 1980               0   No Deposit   240                    0       Transient
## 1981               0   No Deposit   240                    0       Transient
## 1982               0   No Deposit     6                    0       Transient
## 1983               0   No Deposit   242                    0       Transient
## 1984               0   No Deposit   242                    0       Transient
## 1985               0   No Deposit     6                    0       Transient
## 1986               0   No Deposit   321                    0       Transient
## 1987               0   No Deposit   240                    0       Transient
## 1988               1   No Deposit   115                    0       Transient
## 1989               0   No Deposit   240                    0       Transient
## 1990               0   No Deposit   240                    0       Transient
## 1991               0   No Deposit   313                   65 Transient-Party
## 1992               0   No Deposit   313                   65 Transient-Party
## 1993               0   No Deposit   313                   65 Transient-Party
## 1994               0   No Deposit   313                    0 Transient-Party
## 1995               0   No Deposit   313                   65 Transient-Party
## 1996               0   No Deposit   313                   65 Transient-Party
## 1997               0   No Deposit   313                   65 Transient-Party
## 1998               0   No Deposit   313                    0 Transient-Party
## 1999               0   No Deposit   313                   65 Transient-Party
## 2000               0   No Deposit   313                   65 Transient-Party
## 2001               0   No Deposit   313                   65 Transient-Party
## 2002               1   No Deposit   313                   65 Transient-Party
## 2003               0   No Deposit   313                   65 Transient-Party
## 2004               0   No Deposit   313                   65 Transient-Party
## 2005               0   No Deposit   313                   65 Transient-Party
## 2006               0   No Deposit   313                    0 Transient-Party
## 2007               0   No Deposit   313                   65 Transient-Party
## 2008               0   No Deposit   313                   65 Transient-Party
## 2009               0   No Deposit   313                   65 Transient-Party
## 2010               0   No Deposit   313                    0 Transient-Party
## 2011               0   No Deposit   313                    0 Transient-Party
## 2012               0   No Deposit   313                   65 Transient-Party
## 2013               0   No Deposit   313                    0 Transient-Party
## 2014               0   No Deposit   313                   65 Transient-Party
## 2015               0   No Deposit   313                   65 Transient-Party
## 2016               0   No Deposit   241                    0       Transient
## 2017               0   No Deposit   241                    0       Transient
## 2018               0   No Deposit   171                    0       Transient
## 2019               1   No Deposit   240                    0       Transient
## 2020               0   No Deposit   240                    0       Transient
## 2021               0   No Deposit   250                    0       Transient
## 2022               0   No Deposit   250                    0       Transient
## 2023               0   No Deposit    38                    0 Transient-Party
## 2024               0   No Deposit    38                    0 Transient-Party
## 2025               0   No Deposit    38                    0 Transient-Party
## 2026               0   No Deposit    38                    0 Transient-Party
## 2027               0   No Deposit    38                    0 Transient-Party
## 2028               1   No Deposit    38                    0 Transient-Party
## 2029               0   No Deposit   240                    0       Transient
## 2030               0   No Deposit    38                    0 Transient-Party
## 2031               0   No Deposit    38                    0 Transient-Party
## 2032               0   No Deposit    38                    0 Transient-Party
## 2033               1   No Deposit    14                    0       Transient
## 2034               0   No Deposit    38                    0 Transient-Party
## 2035               0   No Deposit    38                    0 Transient-Party
## 2036               0   No Deposit    38                    0 Transient-Party
## 2037               0   No Deposit    38                    0 Transient-Party
## 2038               0   No Deposit    38                    0 Transient-Party
## 2039               0   No Deposit    14                    0 Transient-Party
## 2040               0   No Deposit    14                    0 Transient-Party
## 2041               1   No Deposit    14                    0 Transient-Party
## 2042               0   No Deposit    14                    0 Transient-Party
## 2043               0   No Deposit    14                    0 Transient-Party
## 2044               0   No Deposit    14                    0 Transient-Party
## 2045               0   No Deposit    14                    0 Transient-Party
## 2046               0   No Deposit    14                    0 Transient-Party
## 2047               0   No Deposit    14                    0 Transient-Party
## 2048               0   No Deposit    14                    0 Transient-Party
## 2049               1   No Deposit    14                    0 Transient-Party
## 2050               0   No Deposit    14                    0 Transient-Party
## 2051               0   No Deposit    14                    0 Transient-Party
## 2052               2   No Deposit    14                    0 Transient-Party
## 2053               0   No Deposit    14                    0 Transient-Party
## 2054               0   No Deposit    14                    0 Transient-Party
## 2055               0   No Deposit    14                    0 Transient-Party
## 2056               0   No Deposit    14                    0 Transient-Party
## 2057               0   No Deposit    14                    0 Transient-Party
## 2058               0   No Deposit    14                    0 Transient-Party
## 2059               0   No Deposit    14                    0 Transient-Party
## 2060               0   No Deposit    14                    0 Transient-Party
## 2061               1   No Deposit   240                    0       Transient
## 2062               3   No Deposit    14                    0 Transient-Party
## 2063               0   No Deposit   241                    0       Transient
## 2064               3   No Deposit   240                    0       Transient
## 2065               0   No Deposit    14                    0 Transient-Party
## 2066               0   No Deposit    14                    0 Transient-Party
## 2067               0   No Deposit    14                    0 Transient-Party
## 2068               0   No Deposit    14                    0 Transient-Party
## 2069               1   No Deposit    14                    0 Transient-Party
## 2070               0   No Deposit    14                    0 Transient-Party
## 2071               0   No Deposit    14                    0 Transient-Party
## 2072               0   No Deposit    14                    0 Transient-Party
## 2073               1   No Deposit    14                    0 Transient-Party
## 2074               0   No Deposit    14                    0 Transient-Party
## 2075               0   No Deposit    14                    0 Transient-Party
## 2076               0   No Deposit    14                    0 Transient-Party
## 2077               1   No Deposit   240                    0       Transient
## 2078               2   No Deposit    14                    0 Transient-Party
## 2079               3   No Deposit    14                    0 Transient-Party
## 2080               0   No Deposit    14                    0 Transient-Party
## 2081               2   No Deposit    14                    0       Transient
## 2082               0   No Deposit    14                    0 Transient-Party
## 2083               0   No Deposit    14                    0 Transient-Party
## 2084               0   No Deposit    14                    0 Transient-Party
## 2085               2   No Deposit    14                    0 Transient-Party
## 2086               1   No Deposit     6                    0       Transient
## 2087               0   No Deposit   240                    0       Transient
## 2088               0   No Deposit   240                    0       Transient
## 2089               0   No Deposit   240                    0       Transient
## 2090               0   No Deposit   314                    0       Transient
## 2091               0   No Deposit   242                    0       Transient
## 2092               0   No Deposit     6                    0       Transient
## 2093               0   No Deposit   240                    0       Transient
## 2094               0   No Deposit   240                    0       Transient
## 2095               0   No Deposit   240                    0       Transient
## 2096               0   No Deposit   240                    0       Transient
## 2097               0   No Deposit   240                    0       Transient
## 2098               0   No Deposit   240                    0       Transient
## 2099               0   No Deposit   240                    0       Transient
## 2100               0   No Deposit   240                    0       Transient
## 2101               0   No Deposit   314                    0       Transient
## 2102               0   No Deposit   240                    0       Transient
## 2103               0   No Deposit   240                    0       Transient
## 2104               0   No Deposit     8                    0        Contract
## 2105               0   No Deposit    15                    0       Transient
## 2106               1   No Deposit    14                    0       Transient
## 2107               0   No Deposit   240                    0       Transient
## 2108               0   No Deposit   177                    0       Transient
## 2109               0   No Deposit     8                    0       Transient
## 2110               0   No Deposit   250                    0       Transient
## 2111               0   No Deposit   240                    0       Transient
## 2112               0   No Deposit   240                    0       Transient
## 2113               0   No Deposit   240                    0       Transient
## 2114               0   No Deposit   240                    0       Transient
## 2115               0   No Deposit   240                    0       Transient
## 2116               0   No Deposit   240                    0       Transient
## 2117               0   No Deposit   240                    0       Transient
## 2118               0   No Deposit   240                    0       Transient
## 2119               0   No Deposit   177                    0       Transient
## 2120               0   No Deposit   240                    0       Transient
## 2121               0   No Deposit   240                    0       Transient
## 2122               0   No Deposit   115                    0       Transient
## 2123               0   No Deposit   250                    0       Transient
## 2124               0   No Deposit   171                    0       Transient
## 2125               0   No Deposit     5                    0       Transient
## 2126               0   No Deposit    14                    0       Transient
## 2127               0   No Deposit   240                    0       Transient
## 2128               0   No Deposit     6                    0       Transient
## 2129               0   No Deposit   240                    0       Transient
## 2130               1   No Deposit   314                    0        Contract
## 2131               1   No Deposit   134                    0 Transient-Party
## 2132               0   No Deposit   155                    0 Transient-Party
## 2133               0   No Deposit   155                    0 Transient-Party
## 2134               0   No Deposit   155                    0 Transient-Party
## 2135               0   No Deposit   155                    0 Transient-Party
## 2136               3   No Deposit   155                    0 Transient-Party
## 2137               2   No Deposit     6                    0       Transient
## 2138               0   No Deposit   155                    0 Transient-Party
## 2139               0   No Deposit   155                    0 Transient-Party
## 2140               1   No Deposit   155                    0 Transient-Party
## 2141               0   No Deposit   155                    0 Transient-Party
## 2142               0   No Deposit    68                    0 Transient-Party
## 2143               0   No Deposit   155                    0 Transient-Party
## 2144               1   No Deposit   155                    0 Transient-Party
## 2145               0   No Deposit   155                    0 Transient-Party
## 2146               0   No Deposit   155                    0 Transient-Party
## 2147               0   No Deposit   155                    0 Transient-Party
## 2148               0   No Deposit   155                    0 Transient-Party
## 2149               1   No Deposit   240                    0       Transient
## 2150               2   No Deposit   240                    0       Transient
## 2151               2   No Deposit   240                    0       Transient
## 2152               4   No Deposit    38                    0 Transient-Party
## 2153               0   No Deposit    38                    0 Transient-Party
## 2154               0   No Deposit    38                    0 Transient-Party
## 2155               0   No Deposit    38                    0 Transient-Party
## 2156               1   No Deposit   240                    0       Transient
## 2157               0   No Deposit    38                    0 Transient-Party
## 2158               0   No Deposit    38                    0 Transient-Party
## 2159               1   No Deposit   314                    0        Contract
## 2160               2   No Deposit   240                    0       Transient
## 2161               2   No Deposit   240                    0       Transient
## 2162               0   No Deposit    38                    0 Transient-Party
## 2163               0   No Deposit    38                    0 Transient-Party
## 2164               0   No Deposit   250                    0       Transient
## 2165               0   No Deposit    38                    0 Transient-Party
## 2166               0   No Deposit    38                    0 Transient-Party
## 2167               0   No Deposit    38                    0 Transient-Party
## 2168               1   No Deposit    38                    0 Transient-Party
## 2169               0   No Deposit   175                    0       Transient
## 2170               0   No Deposit   240                    0       Transient
## 2171               0   No Deposit     8                    0       Transient
## 2172               0   No Deposit   241                    0       Transient
## 2173               0   No Deposit   241                    0       Transient
## 2174               2   No Deposit   240                    0       Transient
## 2175               0   No Deposit   115                    0 Transient-Party
## 2176               0   No Deposit   115                    0 Transient-Party
## 2177               0   No Deposit   115                    0 Transient-Party
## 2178               0   No Deposit   115                    0       Transient
## 2179               0   No Deposit   115                    0 Transient-Party
## 2180               0   No Deposit   115                    0 Transient-Party
## 2181               0   No Deposit   241                    0       Transient
## 2182               0   No Deposit   240                    0       Transient
## 2183               0   No Deposit   115                    0       Transient
## 2184               0   No Deposit   241                    0       Transient
## 2185               0   No Deposit   156                    0       Transient
## 2186               0   No Deposit   241                    0       Transient
## 2187               1   No Deposit   240                    0       Transient
## 2188               1   No Deposit   196                    0       Transient
## 2189               0   No Deposit     6                    0       Transient
## 2190               0   No Deposit   240                    0       Transient
## 2191               0   No Deposit   115                    0       Transient
## 2192               0   No Deposit   177                    0       Transient
## 2193               0   No Deposit   240                    0       Transient
## 2194               1   No Deposit   240                    0       Transient
## 2195               1   No Deposit     8                    0       Transient
## 2196               1   No Deposit   240                    0       Transient
## 2197               1   No Deposit   240                    0       Transient
## 2198               0   No Deposit   177                    0       Transient
## 2199               0   No Deposit   240                    0       Transient
## 2200               0   No Deposit   147                    0       Transient
## 2201               0   No Deposit     6                    0       Transient
## 2202               0   No Deposit   241                    0       Transient
## 2203               0   No Deposit   241                    0       Transient
## 2204               0   No Deposit   196                    0       Transient
## 2205               0   No Deposit   250                    0       Transient
## 2206               1   No Deposit   314                    0 Transient-Party
## 2207               0   No Deposit   240                    0       Transient
## 2208               0   No Deposit   314                    0       Transient
## 2209               0   No Deposit   314                    0 Transient-Party
## 2210               0   No Deposit   314                    0 Transient-Party
## 2211               0   No Deposit   156                    0       Transient
## 2212               0   No Deposit   314                    0 Transient-Party
## 2213               0   No Deposit   314                    0       Transient
## 2214               0   No Deposit   335                    0 Transient-Party
## 2215               1   No Deposit   314                    0 Transient-Party
## 2216               1   No Deposit   314                    0 Transient-Party
## 2217               1   No Deposit   314                    0 Transient-Party
## 2218               1   No Deposit   314                    0 Transient-Party
## 2219               1   No Deposit   240                    0       Transient
## 2220               1   No Deposit   242                    0       Transient
## 2221               1   No Deposit   242                    0       Transient
## 2222               1   No Deposit   242                    0       Transient
## 2223               0   No Deposit   240                    0       Transient
## 2224               1   No Deposit   241                    0       Transient
## 2225               0   No Deposit   156                    0       Transient
## 2226               1   No Deposit     6                    0       Transient
## 2227               0   No Deposit   240                    0       Transient
## 2228               0   No Deposit     6                    0       Transient
## 2229               0   No Deposit   240                    0       Transient
## 2230               0   No Deposit    14                    0       Transient
## 2231               0   No Deposit    14                    0       Transient
## 2232               0   No Deposit    14                    0       Transient
## 2233               0   No Deposit   240                    0       Transient
## 2234               1   No Deposit    14                    0 Transient-Party
## 2235               0   No Deposit   250                    0 Transient-Party
## 2236               1   No Deposit    14                    0 Transient-Party
## 2237               0   No Deposit   250                    0 Transient-Party
## 2238               0   No Deposit   196                    0       Transient
## 2239               1   No Deposit   171                    0       Transient
## 2240               0   No Deposit   240                    0 Transient-Party
## 2241               0   No Deposit   240                    0       Transient
## 2242               0   No Deposit   171                    0       Transient
## 2243               1   No Deposit   240                    0 Transient-Party
## 2244               0   No Deposit   156                    0       Transient
## 2245               0   No Deposit   240                    0       Transient
## 2246               0   No Deposit   240                    0       Transient
## 2247               0   No Deposit   240                    0       Transient
## 2248               0   No Deposit     6                    0       Transient
## 2249               0   No Deposit     6                    0       Transient
## 2250               0   No Deposit     6                    0       Transient
## 2251               0   No Deposit   196                    0       Transient
## 2252               1   No Deposit   240                    0       Transient
## 2253               0   No Deposit   240                    0       Transient
## 2254               1   No Deposit   156                    0        Contract
## 2255               0   No Deposit   240                    0       Transient
## 2256               0   No Deposit   241                    0       Transient
## 2257               0   No Deposit   241                    0       Transient
## 2258               0   No Deposit    14                    0       Transient
## 2259               1   No Deposit    36                    0 Transient-Party
## 2260               1   No Deposit    36                    0 Transient-Party
## 2261               0   No Deposit   240                    0       Transient
## 2262               0   No Deposit   115                    0       Transient
## 2263               0   No Deposit   240                    0       Transient
## 2264               0   No Deposit   240                    0       Transient
## 2265               0   No Deposit   241                    0       Transient
## 2266               0   No Deposit    14                    0       Transient
## 2267               0   No Deposit   308                  122 Transient-Party
## 2268               0   No Deposit   308                  122 Transient-Party
## 2269               0   No Deposit   308                  122 Transient-Party
## 2270               0   No Deposit   308                  122 Transient-Party
## 2271               0   No Deposit   240                    0       Transient
## 2272               0   No Deposit   308                  122 Transient-Party
## 2273               0   No Deposit   308                  122 Transient-Party
## 2274               1   No Deposit   308                  122 Transient-Party
## 2275               0   No Deposit   308                  122 Transient-Party
## 2276               0   No Deposit   308                  122 Transient-Party
## 2277               0   No Deposit   308                  122 Transient-Party
## 2278               0   No Deposit   308                  122 Transient-Party
## 2279               1   No Deposit   308                  122 Transient-Party
## 2280               0   No Deposit   308                  122 Transient-Party
## 2281               0   No Deposit   308                  122 Transient-Party
## 2282               1   No Deposit   308                  122 Transient-Party
## 2283               0   No Deposit   308                  122 Transient-Party
## 2284               2   No Deposit   308                  122 Transient-Party
## 2285               0   No Deposit   308                  122 Transient-Party
## 2286               0   No Deposit   308                  122 Transient-Party
## 2287               0   No Deposit   308                  122 Transient-Party
## 2288               0   No Deposit   308                  122 Transient-Party
## 2289               0   No Deposit   308                  122 Transient-Party
## 2290               1   No Deposit   308                  122 Transient-Party
## 2291               1   No Deposit   308                  122 Transient-Party
## 2292               0   No Deposit   308                  122 Transient-Party
## 2293               0   No Deposit   308                  122 Transient-Party
## 2294               0   No Deposit   308                  122 Transient-Party
## 2295               0   No Deposit   308                  122 Transient-Party
## 2296               0   No Deposit   308                  122 Transient-Party
## 2297               1   No Deposit   308                  122 Transient-Party
## 2298               0   No Deposit   308                  122 Transient-Party
## 2299               0   No Deposit   240                    0       Transient
## 2300               0   No Deposit     5                    0       Transient
## 2301               0   No Deposit   308                  122 Transient-Party
## 2302               0   No Deposit   308                  122 Transient-Party
## 2303               0   No Deposit   308                  122 Transient-Party
## 2304               0   No Deposit   308                  122 Transient-Party
## 2305               1   No Deposit   308                  122 Transient-Party
## 2306               0   No Deposit   308                  122 Transient-Party
## 2307               0   No Deposit   308                  122 Transient-Party
## 2308               0   No Deposit   308                  122 Transient-Party
## 2309               0   No Deposit   308                  122 Transient-Party
## 2310               0   No Deposit   308                  122 Transient-Party
## 2311               0   No Deposit   308                  122 Transient-Party
## 2312               0   No Deposit   308                  122 Transient-Party
## 2313               0   No Deposit   308                  122 Transient-Party
## 2314               3   No Deposit   308                  122 Transient-Party
## 2315               0   No Deposit   308                  122 Transient-Party
## 2316               0   No Deposit   308                  122       Transient
## 2317               0   No Deposit   308                  122 Transient-Party
## 2318               5   No Deposit   308                  122 Transient-Party
## 2319               1   No Deposit   308                  122 Transient-Party
## 2320               1   No Deposit    14                    0       Transient
## 2321               3   No Deposit   250                    0       Transient
## 2322               0   No Deposit   240                    0       Transient
## 2323               1   No Deposit   240                    0       Transient
## 2324               1   No Deposit   250                    0       Transient
## 2325               0   No Deposit    14                    0       Transient
## 2326               1   No Deposit   314                    0       Transient
## 2327               0   No Deposit   240                    0       Transient
## 2328               0   No Deposit    14                    0       Transient
## 2329               0   No Deposit    14                    0       Transient
## 2330               0   No Deposit    14                    0       Transient
## 2331               0   No Deposit    14                    0       Transient
## 2332               0   No Deposit   156                    0 Transient-Party
## 2333               0   No Deposit   156                    0 Transient-Party
## 2334               0   No Deposit   156                    0 Transient-Party
## 2335               0   No Deposit   240                    0 Transient-Party
## 2336               0   No Deposit   240                    0 Transient-Party
## 2337               0   No Deposit   241                    0       Transient
## 2338               0   No Deposit   241                    0       Transient
## 2339               0   No Deposit   240                    0       Transient
## 2340               0   No Deposit   240                    0       Transient
## 2341               0   No Deposit   240                    0       Transient
## 2342               2   No Deposit   240                    0       Transient
## 2343               0   No Deposit     8                    0       Transient
## 2344               0   No Deposit   115                    0       Transient
## 2345               0   No Deposit   240                    0       Transient
## 2346               0   No Deposit   171                    0       Transient
## 2347               0   No Deposit   314                    0        Contract
## 2348               0   No Deposit   242                    0       Transient
## 2349               0   No Deposit    14                    0       Transient
## 2350               0   No Deposit   241                    0       Transient
## 2351               0   No Deposit   241                    0       Transient
## 2352               0   No Deposit   240                    0       Transient
## 2353               0   No Deposit     8                    0       Transient
## 2354               0   No Deposit   240                    0       Transient
## 2355               0   No Deposit    14                    0       Transient
## 2356               0   No Deposit    14                    0       Transient
## 2357               0   No Deposit   240                    0       Transient
## 2358               0   No Deposit   250                    0       Transient
## 2359               0   No Deposit    36                    0       Transient
## 2360               0   No Deposit     6                    0 Transient-Party
## 2361               0   No Deposit     6                    0 Transient-Party
## 2362               1   No Deposit   314                    0       Transient
## 2363               0   No Deposit   115                    0       Transient
## 2364               0   No Deposit   115                    0       Transient
## 2365               0   No Deposit   241                    0       Transient
## 2366               0   No Deposit   240                    0       Transient
## 2367               0   No Deposit   240                    0       Transient
## 2368               0   No Deposit   240                    0       Transient
## 2369               1   No Deposit   241                    0       Transient
## 2370               0   No Deposit   332                    0 Transient-Party
## 2371               0   No Deposit   332                    0 Transient-Party
## 2372               0   No Deposit   332                    0 Transient-Party
## 2373               0   No Deposit   332                    0 Transient-Party
## 2374               0   No Deposit   332                    0 Transient-Party
## 2375               0   No Deposit   332                    0       Transient
## 2376               0   No Deposit   332                    0 Transient-Party
## 2377               0   No Deposit   332                    0 Transient-Party
## 2378               0   No Deposit   332                    0 Transient-Party
## 2379               0   No Deposit   332                    0 Transient-Party
## 2380               0   No Deposit    14                    0       Transient
## 2381               0   No Deposit   240                    0       Transient
## 2382               0   No Deposit   240                    0       Transient
## 2383               0   No Deposit   240                    0       Transient
## 2384               0   No Deposit   314                    0       Transient
## 2385               0   No Deposit   134                    0 Transient-Party
## 2386               1   No Deposit   134                    0 Transient-Party
## 2387               1   No Deposit   134                    0 Transient-Party
## 2388               0   No Deposit   134                    0 Transient-Party
## 2389               0   No Deposit   134                    0 Transient-Party
## 2390               0   No Deposit   134                    0 Transient-Party
## 2391               0   No Deposit   134                    0 Transient-Party
## 2392               0   No Deposit   134                    0 Transient-Party
## 2393               0   No Deposit   134                    0 Transient-Party
## 2394               0   No Deposit   134                    0 Transient-Party
## 2395               0   No Deposit   134                    0 Transient-Party
## 2396               1   No Deposit   134                    0 Transient-Party
## 2397               0   No Deposit   134                    0 Transient-Party
## 2398               0   No Deposit   134                    0 Transient-Party
## 2399               0   No Deposit   134                    0 Transient-Party
## 2400               1   No Deposit   134                    0 Transient-Party
## 2401               1   No Deposit   134                    0 Transient-Party
## 2402               0   No Deposit   134                    0 Transient-Party
## 2403               0   No Deposit   134                    0 Transient-Party
## 2404               0   No Deposit   134                    0       Transient
## 2405               0   No Deposit   134                    0 Transient-Party
## 2406               1   No Deposit   134                    0 Transient-Party
## 2407               1   No Deposit   134                    0 Transient-Party
## 2408               0   No Deposit   241                    0       Transient
## 2409               0   No Deposit   241                    0       Transient
## 2410               0   No Deposit     6                    0       Transient
## 2411               0   No Deposit   240                    0       Transient
## 2412               1   No Deposit   240                    0       Transient
## 2413               0   No Deposit     8                    0 Transient-Party
## 2414               0   No Deposit     8                    0 Transient-Party
## 2415               0   No Deposit   240                    0       Transient
## 2416               1   No Deposit   241                    0       Transient
## 2417               0   No Deposit   241                    0       Transient
## 2418               0   No Deposit   115                    0       Transient
## 2419               0   No Deposit   240                    0       Transient
## 2420               0   No Deposit     8                    0       Transient
## 2421               0   No Deposit   177                    0       Transient
## 2422               0   No Deposit     8                    0       Transient
## 2423               0   No Deposit   250                    0       Transient
## 2424               0   No Deposit   115                    0 Transient-Party
## 2425               0   No Deposit   115                    0 Transient-Party
## 2426               0   No Deposit   314                    0       Transient
## 2427               0   No Deposit     2                    0        Contract
## 2428               0   No Deposit     2                    0        Contract
## 2429               2   No Deposit    14                    0       Transient
## 2430               1   No Deposit   240                    0       Transient
## 2431               0   No Deposit    38                    0 Transient-Party
## 2432               0   No Deposit    38                    0 Transient-Party
## 2433               0   No Deposit    38                    0 Transient-Party
## 2434               0   No Deposit    38                    0 Transient-Party
## 2435               0   No Deposit    38                    0 Transient-Party
## 2436               0   No Deposit    38                    0 Transient-Party
## 2437               0   No Deposit    38                    0 Transient-Party
## 2438               0   No Deposit    38                    0 Transient-Party
## 2439               0   No Deposit    38                    0 Transient-Party
## 2440               0   No Deposit    38                    0 Transient-Party
## 2441               0   No Deposit    38                    0 Transient-Party
## 2442               0   No Deposit    38                    0 Transient-Party
## 2443               0   No Deposit    38                    0 Transient-Party
## 2444               0   No Deposit    38                    0 Transient-Party
## 2445               0   No Deposit    38                    0 Transient-Party
## 2446               0   No Deposit    38                    0 Transient-Party
## 2447               0   No Deposit    38                    0 Transient-Party
## 2448               0   No Deposit    38                    0 Transient-Party
## 2449               0   No Deposit    38                    0 Transient-Party
## 2450               0   No Deposit    38                    0 Transient-Party
## 2451               0   No Deposit    38                    0 Transient-Party
## 2452               0   No Deposit    38                    0 Transient-Party
## 2453               0   No Deposit    96                    0       Transient
## 2454               0   No Deposit    14                    0       Transient
## 2455               0   No Deposit     6                    0       Transient
## 2456               0   No Deposit   115                    0       Transient
## 2457               0   No Deposit    14                    0       Transient
## 2458               0   No Deposit   242                    0       Transient
## 2459               0   No Deposit   242                    0       Transient
## 2460               4   No Deposit     2                    0        Contract
## 2461               0   No Deposit   115                    0       Transient
## 2462               0   No Deposit    14                    0       Transient
## 2463               0   No Deposit     6                    0       Transient
## 2464               1   No Deposit   240                    0       Transient
## 2465               1   No Deposit   250                    0       Transient
## 2466               0   No Deposit    14                    0       Transient
## 2467               0   No Deposit   240                    0       Transient
## 2468               0   No Deposit     6                    0       Transient
## 2469               0   No Deposit   240                    0       Transient
## 2470               0   No Deposit     8                    0       Transient
## 2471               0   No Deposit   240                    0       Transient
## 2472               0   No Deposit    26                    0       Transient
## 2473               0   No Deposit     2                    0        Contract
## 2474               0   No Deposit     6                    0       Transient
## 2475               0   No Deposit     6                    0       Transient
## 2476               0   No Deposit   241                    0       Transient
## 2477               0   No Deposit   242                    0       Transient
## 2478               1   No Deposit   240                    0       Transient
## 2479               0   No Deposit   250                    0       Transient
## 2480               0   No Deposit   240                    0       Transient
## 2481               1   No Deposit   314                    0       Transient
## 2482               1   No Deposit   314                    0       Transient
## 2483               0   No Deposit   240                    0       Transient
## 2484               0   No Deposit    14                    0 Transient-Party
## 2485               1   No Deposit    14                    0 Transient-Party
## 2486               0   No Deposit    14                    0 Transient-Party
## 2487               1   No Deposit    14                    0 Transient-Party
## 2488               0   No Deposit   240                    0 Transient-Party
## 2489               0   No Deposit   387                    0 Transient-Party
## 2490               0   No Deposit   387                    0 Transient-Party
## 2491               0   No Deposit   387                    0 Transient-Party
## 2492               1   No Deposit   387                    0 Transient-Party
## 2493               1   No Deposit   387                    0 Transient-Party
## 2494               0   No Deposit    14                    0 Transient-Party
## 2495               0   No Deposit    14                    0 Transient-Party
## 2496               0   No Deposit    14                    0 Transient-Party
## 2497               0   No Deposit    14                    0 Transient-Party
## 2498               0   No Deposit   387                    0 Transient-Party
## 2499               1   No Deposit   387                    0 Transient-Party
## 2500               1   No Deposit   387                    0 Transient-Party
## 2501               0   No Deposit   387                    0 Transient-Party
## 2502               0   No Deposit   387                    0 Transient-Party
## 2503               0   No Deposit   387                    0 Transient-Party
## 2504               0   No Deposit    14                    0 Transient-Party
## 2505               0   No Deposit    14                    0 Transient-Party
## 2506               0   No Deposit   387                    0 Transient-Party
## 2507               0   No Deposit   387                    0 Transient-Party
## 2508               0   No Deposit    14                    0 Transient-Party
## 2509               0   No Deposit    14                    0 Transient-Party
## 2510               0   No Deposit    14                    0 Transient-Party
## 2511               0   No Deposit   387                    0 Transient-Party
## 2512               0   No Deposit   387                    0 Transient-Party
## 2513               0   No Deposit    14                    0 Transient-Party
## 2514               0   No Deposit    14                    0 Transient-Party
## 2515               0   No Deposit    14                    0 Transient-Party
## 2516               0   No Deposit    14                    0 Transient-Party
## 2517               0   No Deposit   387                    0 Transient-Party
## 2518               0   No Deposit   387                    0 Transient-Party
## 2519               1   No Deposit   387                    0 Transient-Party
## 2520               1   No Deposit   387                    0 Transient-Party
## 2521               1   No Deposit   387                    0 Transient-Party
## 2522               0   No Deposit    14                    0 Transient-Party
## 2523               0   No Deposit    14                    0 Transient-Party
## 2524               0   No Deposit    14                    0 Transient-Party
## 2525               0   No Deposit   387                    0 Transient-Party
## 2526               0   No Deposit   387                    0 Transient-Party
## 2527               0   No Deposit   240                    0       Transient
## 2528               0   No Deposit    14                    0 Transient-Party
## 2529               0   No Deposit    14                    0 Transient-Party
## 2530               0   No Deposit    14                    0 Transient-Party
## 2531               0   No Deposit    14                    0 Transient-Party
## 2532               1   No Deposit    14                    0 Transient-Party
## 2533               0   No Deposit   387                    0       Transient
## 2534               0   No Deposit   387                    0 Transient-Party
## 2535               1   No Deposit   387                    0 Transient-Party
## 2536               1   No Deposit   387                    0 Transient-Party
## 2537               0   No Deposit    14                    0 Transient-Party
## 2538               0   No Deposit    14                    0 Transient-Party
## 2539               1   No Deposit   387                    0 Transient-Party
## 2540               0   No Deposit   387                    0 Transient-Party
## 2541               0   No Deposit   240                    0       Transient
## 2542               0   No Deposit   240                    0       Transient
## 2543               0   No Deposit    26                    0       Transient
## 2544               0   No Deposit   314                    0       Transient
## 2545               0   No Deposit    14                    0 Transient-Party
## 2546               0   No Deposit    14                    0 Transient-Party
## 2547               0   No Deposit    14                    0 Transient-Party
## 2548               0   No Deposit    14                    0 Transient-Party
## 2549               0   No Deposit    14                    0 Transient-Party
## 2550               0   No Deposit    14                    0 Transient-Party
## 2551               0   No Deposit    14                    0 Transient-Party
## 2552               2   No Deposit    14                    0 Transient-Party
## 2553               1   No Deposit    14                    0 Transient-Party
## 2554               4   No Deposit    14                    0 Transient-Party
## 2555               1   No Deposit    14                    0 Transient-Party
## 2556               2   No Deposit    14                    0 Transient-Party
## 2557               2   No Deposit    14                    0 Transient-Party
## 2558               2   No Deposit    14                    0 Transient-Party
## 2559               1   No Deposit    14                    0 Transient-Party
## 2560               2   No Deposit    14                    0 Transient-Party
## 2561               1   No Deposit    14                    0 Transient-Party
## 2562               0   No Deposit   250                    0       Transient
## 2563               1   No Deposit    14                    0 Transient-Party
## 2564               1   No Deposit    14                    0 Transient-Party
## 2565               2   No Deposit    14                    0 Transient-Party
## 2566               1   No Deposit    14                    0 Transient-Party
## 2567               2   No Deposit    14                    0 Transient-Party
## 2568               1   Refundable    14                    0 Transient-Party
## 2569               1   Refundable    14                    0 Transient-Party
## 2570               1   Refundable    14                    0 Transient-Party
## 2571               1   Refundable    14                    0 Transient-Party
## 2572               1   Refundable    14                    0 Transient-Party
## 2573               1   Refundable    14                    0 Transient-Party
## 2574               1   Refundable    14                    0 Transient-Party
## 2575               1   Refundable    14                    0 Transient-Party
## 2576               2   Refundable    14                    0 Transient-Party
## 2577               1   Refundable    14                    0 Transient-Party
## 2578               1   Refundable    14                    0 Transient-Party
## 2579               1   Refundable    14                    0 Transient-Party
## 2580               1   Refundable    14                    0 Transient-Party
## 2581               1   Refundable    14                    0 Transient-Party
## 2582               2   Refundable    14                    0 Transient-Party
## 2583               2   Refundable    14                    0 Transient-Party
## 2584               1   Refundable    14                    0 Transient-Party
## 2585               1   Refundable    14                    0 Transient-Party
## 2586               1   Refundable    14                    0 Transient-Party
## 2587               1   Refundable    14                    0 Transient-Party
## 2588               1   Refundable    14                    0 Transient-Party
## 2589               1   Refundable    14                    0 Transient-Party
## 2590               1   Refundable    14                    0 Transient-Party
## 2591               0   Refundable    14                    0 Transient-Party
## 2592               1   Refundable    14                    0 Transient-Party
## 2593               2   Refundable    14                    0 Transient-Party
## 2594               2   Refundable    14                    0 Transient-Party
## 2595               1   Refundable    14                    0 Transient-Party
## 2596               1   Refundable    14                    0 Transient-Party
## 2597               2   Refundable    14                    0 Transient-Party
## 2598               2   Refundable    14                    0 Transient-Party
## 2599               0   Refundable    14                    0 Transient-Party
## 2600               0   Refundable    14                    0 Transient-Party
## 2601               1   Refundable    14                    0 Transient-Party
## 2602               0   Refundable    14                    0 Transient-Party
## 2603               0   Refundable    14                    0 Transient-Party
## 2604               0   Refundable    14                    0 Transient-Party
## 2605               0   Refundable    14                    0 Transient-Party
## 2606               0   Refundable    14                    0 Transient-Party
## 2607               2   Refundable    14                    0 Transient-Party
## 2608               1   Refundable    14                    0 Transient-Party
## 2609               0   Refundable    14                    0 Transient-Party
## 2610               0   Refundable    14                    0 Transient-Party
## 2611               1   Refundable    14                    0 Transient-Party
## 2612               3   Refundable    14                    0 Transient-Party
## 2613               2   Refundable    14                    0 Transient-Party
## 2614               2   Refundable    14                    0 Transient-Party
## 2615               0   Refundable    14                    0 Transient-Party
## 2616               2   Refundable    14                    0 Transient-Party
## 2617               1   Refundable    14                    0 Transient-Party
## 2618               0   Refundable    14                    0 Transient-Party
## 2619               3   Refundable    14                    0 Transient-Party
## 2620               1   Refundable    14                    0 Transient-Party
## 2621               0   Non Refund    14                    0 Transient-Party
## 2622               1   No Deposit   177                    0 Transient-Party
## 2623               1   No Deposit   177                    0 Transient-Party
## 2624               1   No Deposit   177                    0 Transient-Party
## 2625               0   No Deposit   240                    0       Transient
## 2626               0   No Deposit   240                    0       Transient
## 2627               0   No Deposit   241                    0       Transient
## 2628               0   No Deposit   241                    0       Transient
## 2629               0   No Deposit    14                    0       Transient
## 2630               2   No Deposit    14                    0       Transient
## 2631               0   No Deposit   156                    0       Transient
## 2632               1   No Deposit   298                    0       Transient
## 2633               1   Non Refund   298                    0 Transient-Party
## 2634               0   Non Refund   298                    0 Transient-Party
## 2635               0   Non Refund   298                    0 Transient-Party
## 2636               0   Non Refund   298                    0 Transient-Party
## 2637               1   Non Refund   298                    0 Transient-Party
## 2638               1   Non Refund   298                    0 Transient-Party
## 2639               1   Non Refund   298                    0 Transient-Party
## 2640               0   Non Refund   298                    0 Transient-Party
## 2641               0   Non Refund   298                    0 Transient-Party
## 2642               0   Non Refund   298                    0 Transient-Party
## 2643               0   Non Refund   298                    0 Transient-Party
## 2644               0   Non Refund   298                    0 Transient-Party
## 2645               1   Non Refund   298                    0 Transient-Party
## 2646               2   Non Refund   298                    0 Transient-Party
## 2647               1   Non Refund   298                    0 Transient-Party
## 2648               0   Non Refund   298                    0 Transient-Party
## 2649               0   Non Refund   298                    0 Transient-Party
## 2650               1   Non Refund   298                    0 Transient-Party
## 2651               0   Non Refund   298                    0 Transient-Party
## 2652               0   Non Refund   298                    0 Transient-Party
## 2653               1   Non Refund   298                    0 Transient-Party
## 2654               1   Non Refund   298                    0 Transient-Party
## 2655               0   Non Refund   298                    0 Transient-Party
## 2656               0   Non Refund   298                    0 Transient-Party
## 2657               0   Non Refund   298                    0 Transient-Party
## 2658               1   Non Refund   298                    0 Transient-Party
## 2659               0   Non Refund   298                    0 Transient-Party
## 2660               1   Non Refund   298                    0 Transient-Party
## 2661               1   Non Refund   298                    0 Transient-Party
## 2662               0   Non Refund   298                    0 Transient-Party
## 2663               0   Non Refund   298                    0 Transient-Party
## 2664               0   Non Refund   298                    0 Transient-Party
## 2665               1   Non Refund   298                    0 Transient-Party
## 2666               1   Non Refund   298                    0 Transient-Party
## 2667               1   Non Refund   298                    0 Transient-Party
## 2668               0   Non Refund   298                    0 Transient-Party
## 2669               0   Non Refund   298                    0 Transient-Party
## 2670               0   Non Refund   298                    0 Transient-Party
## 2671               4   No Deposit   298                    0 Transient-Party
## 2672               0   No Deposit   240                    0       Transient
## 2673               0   No Deposit   314                    0 Transient-Party
## 2674               0   No Deposit   314                    0 Transient-Party
## 2675               0   No Deposit   241                    0       Transient
## 2676               0   No Deposit   250                    0 Transient-Party
## 2677               0   No Deposit   273                    0 Transient-Party
## 2678               0   No Deposit   273                    0 Transient-Party
## 2679               0   No Deposit   273                    0 Transient-Party
## 2680               0   No Deposit   273                    0 Transient-Party
## 2681               0   No Deposit   273                    0 Transient-Party
## 2682               0   No Deposit   273                    0 Transient-Party
## 2683               0   No Deposit   273                    0 Transient-Party
## 2684               0   No Deposit   273                    0 Transient-Party
## 2685               0   No Deposit   273                    0 Transient-Party
## 2686               0   No Deposit   273                    0 Transient-Party
## 2687               0   No Deposit   273                    0       Transient
## 2688               0   No Deposit   273                    0 Transient-Party
## 2689               0   No Deposit   273                    0 Transient-Party
## 2690               0   No Deposit   273                    0 Transient-Party
## 2691               0   No Deposit   273                    0 Transient-Party
## 2692               4   No Deposit   273                    0 Transient-Party
## 2693               6   No Deposit   273                    0 Transient-Party
## 2694               0   No Deposit   273                    0 Transient-Party
## 2695               0   No Deposit    14                    0       Transient
## 2696               0   No Deposit   240                    0       Transient
## 2697               0   No Deposit   240                    0       Transient
## 2698               1   No Deposit   240                    0       Transient
## 2699               0   No Deposit   240                    0       Transient
## 2700               1   No Deposit   250                    0       Transient
## 2701               1   No Deposit   298                    0 Transient-Party
## 2702               0   No Deposit   298                    0 Transient-Party
## 2703               1   No Deposit   298                    0 Transient-Party
## 2704               1   No Deposit   298                    0 Transient-Party
## 2705               0   No Deposit   298                    0 Transient-Party
## 2706               1   No Deposit   298                    0 Transient-Party
## 2707               1   No Deposit   298                    0 Transient-Party
## 2708               0   No Deposit   298                    0 Transient-Party
## 2709               1   No Deposit   298                    0 Transient-Party
## 2710               0   No Deposit   298                    0 Transient-Party
## 2711               0   No Deposit   298                    0 Transient-Party
## 2712               0   No Deposit   298                    0 Transient-Party
## 2713               0   No Deposit   298                    0 Transient-Party
## 2714               0   No Deposit   298                    0 Transient-Party
## 2715               0   No Deposit   298                    0 Transient-Party
## 2716               0   No Deposit   298                    0 Transient-Party
## 2717               1   No Deposit   298                    0 Transient-Party
## 2718               1   No Deposit   298                    0 Transient-Party
## 2719               0   No Deposit   298                    0 Transient-Party
## 2720               1   No Deposit   298                    0 Transient-Party
## 2721               1   No Deposit   298                    0 Transient-Party
## 2722               0   No Deposit   298                    0 Transient-Party
## 2723               1   No Deposit   298                    0 Transient-Party
## 2724               1   Non Refund   298                    0 Transient-Party
## 2725               1   No Deposit   298                    0 Transient-Party
## 2726               1   No Deposit   298                    0 Transient-Party
## 2727               1   No Deposit   298                    0 Transient-Party
## 2728               1   No Deposit   298                    0 Transient-Party
## 2729               2   No Deposit   298                    0 Transient-Party
## 2730               0   No Deposit   196                    0       Transient
## 2731               1   No Deposit   196                    0       Transient
## 2732               1   No Deposit    40                    0       Transient
## 2733               0   No Deposit   240                    0       Transient
## 2734               1   No Deposit   250                    0       Transient
## 2735               1   No Deposit   298                    0 Transient-Party
## 2736               1   No Deposit   298                    0 Transient-Party
## 2737               1   No Deposit   298                    0 Transient-Party
## 2738               0   No Deposit   298                    0 Transient-Party
## 2739               1   No Deposit   298                    0 Transient-Party
## 2740               0   No Deposit   298                    0 Transient-Party
## 2741               0   No Deposit   298                    0 Transient-Party
## 2742               0   No Deposit   298                    0 Transient-Party
## 2743               0   No Deposit   298                    0 Transient-Party
## 2744               0   No Deposit   298                    0 Transient-Party
## 2745               0   No Deposit   298                    0 Transient-Party
## 2746               0   No Deposit   298                    0 Transient-Party
## 2747               2   No Deposit   298                    0 Transient-Party
## 2748               0   No Deposit   298                    0 Transient-Party
## 2749               0   No Deposit   298                    0 Transient-Party
## 2750               0   No Deposit   298                    0 Transient-Party
## 2751               1   No Deposit   298                    0 Transient-Party
## 2752               1   No Deposit   298                    0 Transient-Party
## 2753               1   No Deposit   298                    0 Transient-Party
## 2754               0   No Deposit   298                    0 Transient-Party
## 2755               1   No Deposit   298                    0 Transient-Party
## 2756               0   No Deposit   298                    0 Transient-Party
## 2757               1   No Deposit   298                    0 Transient-Party
## 2758               0   No Deposit   298                    0 Transient-Party
## 2759               0   No Deposit   298                    0 Transient-Party
## 2760               0   No Deposit   298                    0 Transient-Party
## 2761               1   No Deposit   298                    0 Transient-Party
## 2762               1   No Deposit   298                    0 Transient-Party
## 2763               0   No Deposit   298                    0 Transient-Party
## 2764               0   No Deposit   115                    0 Transient-Party
## 2765               0   No Deposit   115                    0 Transient-Party
## 2766               0   No Deposit   115                    0       Transient
## 2767               0   No Deposit   115                    0 Transient-Party
## 2768               0   No Deposit   115                    0 Transient-Party
## 2769               0   No Deposit   147                    0 Transient-Party
## 2770               0   No Deposit   250                    0 Transient-Party
## 2771               0   No Deposit   250                    0 Transient-Party
## 2772               0   No Deposit   314                    0       Transient
## 2773               1   No Deposit   240                    0 Transient-Party
## 2774               1   No Deposit   240                    0 Transient-Party
## 2775               0   No Deposit    40                    0       Transient
## 2776               1   No Deposit    14                    0 Transient-Party
## 2777               1   No Deposit    14                    0 Transient-Party
## 2778               1   No Deposit    14                    0 Transient-Party
## 2779               1   No Deposit    14                    0 Transient-Party
## 2780               1   No Deposit    14                    0 Transient-Party
## 2781               1   No Deposit    14                    0 Transient-Party
## 2782               2   No Deposit    14                    0 Transient-Party
## 2783               1   No Deposit    14                    0 Transient-Party
## 2784               1   No Deposit    14                    0 Transient-Party
## 2785               1   No Deposit    14                    0 Transient-Party
## 2786               1   No Deposit    14                    0 Transient-Party
## 2787               1   No Deposit    14                    0 Transient-Party
## 2788               1   No Deposit    14                    0 Transient-Party
## 2789               1   No Deposit    14                    0       Transient
## 2790               1   No Deposit    14                    0 Transient-Party
## 2791               1   No Deposit    14                    0 Transient-Party
## 2792               1   No Deposit    14                    0 Transient-Party
## 2793               1   No Deposit    14                    0 Transient-Party
## 2794               2   No Deposit    14                    0 Transient-Party
## 2795               1   No Deposit    14                    0 Transient-Party
## 2796               1   No Deposit    14                    0 Transient-Party
## 2797               2   No Deposit    14                    0 Transient-Party
## 2798               1   No Deposit    14                    0 Transient-Party
## 2799               1   No Deposit    14                    0       Transient
## 2800               1   No Deposit    14                    0 Transient-Party
## 2801               1   No Deposit    14                    0 Transient-Party
## 2802               1   No Deposit    14                    0 Transient-Party
## 2803               1   No Deposit    14                    0       Transient
## 2804               0   No Deposit    14                    0       Transient
## 2805               0   No Deposit   156                    0       Transient
## 2806               2   No Deposit   156                    0       Transient
## 2807               0   No Deposit    40                    0       Transient
## 2808               0   No Deposit   248                    0       Transient
## 2809               0   No Deposit   248                    0       Transient
## 2810               0   No Deposit   248                    0 Transient-Party
## 2811               1   No Deposit   248                    0 Transient-Party
## 2812               1   No Deposit   248                    0 Transient-Party
## 2813               0   No Deposit    40                    0       Transient
## 2814               0   No Deposit   240                    0       Transient
## 2815               0   No Deposit   156                    0       Transient
## 2816               0   No Deposit   298                    0 Transient-Party
## 2817               0   No Deposit   298                    0 Transient-Party
## 2818               0   No Deposit   298                    0 Transient-Party
## 2819               0   No Deposit   298                    0 Transient-Party
## 2820               0   No Deposit   298                    0 Transient-Party
## 2821               0   No Deposit   298                    0 Transient-Party
## 2822               0   No Deposit   298                    0 Transient-Party
## 2823               1   No Deposit    40                    0        Contract
## 2824               0   No Deposit   240                    0       Transient
## 2825               1   No Deposit    69                    0       Transient
## 2826               0   No Deposit     8                    0       Transient
## 2827               0   No Deposit    40                    0        Contract
## 2828               0   No Deposit   314                    0       Transient
## 2829               0   No Deposit   298                    0       Transient
## 2830               0   No Deposit   298                    0 Transient-Party
## 2831               1   No Deposit   298                    0 Transient-Party
## 2832               0   No Deposit   298                    0 Transient-Party
## 2833               0   No Deposit   298                    0 Transient-Party
## 2834               0   No Deposit   298                    0 Transient-Party
## 2835               0   No Deposit   298                    0 Transient-Party
## 2836               0   No Deposit   298                    0 Transient-Party
## 2837               0   No Deposit   298                    0 Transient-Party
## 2838               0   No Deposit   298                    0 Transient-Party
## 2839               0   No Deposit   298                    0 Transient-Party
## 2840               0   No Deposit   298                    0 Transient-Party
## 2841               0   No Deposit   298                    0 Transient-Party
## 2842               1   No Deposit   298                    0 Transient-Party
## 2843               1   No Deposit   298                    0 Transient-Party
## 2844               0   No Deposit   298                    0 Transient-Party
## 2845               0   No Deposit   298                    0 Transient-Party
## 2846               1   No Deposit   298                    0 Transient-Party
## 2847               0   No Deposit   298                    0 Transient-Party
## 2848               0   No Deposit   298                    0 Transient-Party
## 2849               1   No Deposit   298                    0 Transient-Party
## 2850               0   No Deposit   298                    0       Transient
## 2851               0   No Deposit   298                    0 Transient-Party
## 2852               1   No Deposit   298                    0 Transient-Party
## 2853               0   No Deposit   298                    0       Transient
## 2854               1   No Deposit   298                    0 Transient-Party
## 2855               1   No Deposit   240                    0       Transient
## 2856               3   No Deposit   240                    0       Transient
## 2857               1   No Deposit    40                    0       Transient
## 2858               1   No Deposit    40                    0       Transient
## 2859               0   No Deposit    40                    0       Transient
## 2860               0   No Deposit    40                    0        Contract
## 2861               0   No Deposit    40                    0       Transient
## 2862               0   No Deposit    40                    0        Contract
## 2863               0   No Deposit   240                    0       Transient
## 2864               0   No Deposit   240                    0       Transient
## 2865               1   No Deposit   240                    0       Transient
## 2866               0   No Deposit   240                    0       Transient
## 2867               0   No Deposit   240                    0       Transient
## 2868               0   No Deposit    40                    0        Contract
## 2869               0   No Deposit    40                    0        Contract
## 2870               0   No Deposit    40                    0        Contract
## 2871               0   No Deposit    40                    0       Transient
## 2872               0   No Deposit   156                    0       Transient
## 2873               0   No Deposit   240                    0       Transient
## 2874               1   No Deposit    40                    0        Contract
## 2875               0   No Deposit   241                    0       Transient
## 2876               0   No Deposit   241                    0       Transient
## 2877               0   No Deposit    40                    0        Contract
## 2878               0   No Deposit     2                    0        Contract
## 2879               0   No Deposit    40                    0        Contract
## 2880               0   No Deposit     8                    0       Transient
## 2881               0   No Deposit   240                    0       Transient
## 2882               0   No Deposit   248                    0 Transient-Party
## 2883               0   No Deposit   248                    0 Transient-Party
## 2884               1   No Deposit   248                    0 Transient-Party
## 2885               1   No Deposit   248                    0       Transient
## 2886               0   No Deposit   248                    0 Transient-Party
## 2887               0   No Deposit   248                    0 Transient-Party
## 2888               0   No Deposit    14                    0       Transient
## 2889               0   No Deposit   314                    0       Transient
## 2890               2   No Deposit   315                    0 Transient-Party
## 2891               1   No Deposit   315                    0 Transient-Party
## 2892               0   No Deposit   315                    0 Transient-Party
## 2893               0   No Deposit   315                    0 Transient-Party
## 2894               1   No Deposit   315                    0 Transient-Party
## 2895               0   No Deposit   315                    0 Transient-Party
## 2896               0   No Deposit   315                    0 Transient-Party
## 2897               0   No Deposit   315                    0 Transient-Party
## 2898               0   No Deposit   315                    0 Transient-Party
## 2899               1   No Deposit   315                    0 Transient-Party
## 2900               1   No Deposit   315                    0 Transient-Party
## 2901               0   No Deposit   315                    0 Transient-Party
## 2902               0   No Deposit   315                    0 Transient-Party
## 2903               0   No Deposit   240                    0       Transient
## 2904               0   No Deposit   240                    0       Transient
## 2905               0   No Deposit    40                    0 Transient-Party
## 2906               0   No Deposit    40                    0 Transient-Party
## 2907               2   No Deposit   315                    0 Transient-Party
## 2908               2   No Deposit   315                    0 Transient-Party
## 2909               0   No Deposit   314                    0       Transient
## 2910               0   No Deposit   314                    0       Transient
## 2911               0   No Deposit   241                    0       Transient
## 2912               0   No Deposit   298                    0 Transient-Party
## 2913               1   No Deposit   298                    0 Transient-Party
## 2914               1   No Deposit   298                    0 Transient-Party
## 2915               1   No Deposit   298                    0 Transient-Party
## 2916               0   No Deposit   298                    0 Transient-Party
## 2917               0   No Deposit   298                    0 Transient-Party
## 2918               1   No Deposit   298                    0 Transient-Party
## 2919               1   No Deposit   298                    0 Transient-Party
## 2920               0   No Deposit   298                    0 Transient-Party
## 2921               0   No Deposit   298                    0 Transient-Party
## 2922               0   No Deposit   298                    0 Transient-Party
## 2923               0   No Deposit   298                    0 Transient-Party
## 2924               0   No Deposit   298                    0 Transient-Party
## 2925               1   No Deposit   298                    0 Transient-Party
## 2926               0   No Deposit   298                    0 Transient-Party
## 2927               0   No Deposit   298                    0 Transient-Party
## 2928               0   No Deposit   298                    0 Transient-Party
## 2929               1   No Deposit   298                    0 Transient-Party
## 2930               1   No Deposit   298                    0 Transient-Party
## 2931               0   No Deposit   298                    0 Transient-Party
## 2932               0   No Deposit   298                    0 Transient-Party
## 2933               0   No Deposit   298                    0 Transient-Party
## 2934               2   No Deposit   298                    0 Transient-Party
## 2935               0   No Deposit   298                    0 Transient-Party
## 2936               0   No Deposit   298                    0 Transient-Party
## 2937               0   No Deposit   298                    0 Transient-Party
## 2938               0   No Deposit   298                    0 Transient-Party
## 2939               0   No Deposit   298                    0 Transient-Party
## 2940               1   No Deposit   298                    0 Transient-Party
## 2941               0   No Deposit    14                    0 Transient-Party
## 2942               0   No Deposit   314                    0       Transient
## 2943               1   No Deposit   240                    0       Transient
## 2944               1   No Deposit   171                    0       Transient
## 2945               0   No Deposit   298                    0 Transient-Party
## 2946               0   No Deposit   298                    0 Transient-Party
## 2947               0   No Deposit   298                    0 Transient-Party
## 2948               1   No Deposit   298                    0 Transient-Party
## 2949               0   No Deposit   298                    0 Transient-Party
## 2950               0   No Deposit   298                    0 Transient-Party
## 2951               0   No Deposit   298                    0 Transient-Party
## 2952               1   No Deposit   298                    0 Transient-Party
## 2953               0   No Deposit   298                    0 Transient-Party
## 2954               0   No Deposit   298                    0 Transient-Party
## 2955               0   No Deposit   298                    0 Transient-Party
## 2956               0   No Deposit   298                    0 Transient-Party
## 2957               0   No Deposit   298                    0 Transient-Party
## 2958               0   No Deposit   298                    0 Transient-Party
## 2959               0   No Deposit   298                    0 Transient-Party
## 2960               0   No Deposit   298                    0 Transient-Party
## 2961               0   No Deposit   298                    0 Transient-Party
## 2962               1   No Deposit   298                    0 Transient-Party
## 2963               0   No Deposit   298                    0 Transient-Party
## 2964               0   No Deposit   298                    0 Transient-Party
## 2965               1   No Deposit   298                    0 Transient-Party
## 2966               1   No Deposit   298                    0 Transient-Party
## 2967               1   No Deposit   298                    0 Transient-Party
## 2968               0   No Deposit   298                    0       Transient
## 2969               0   No Deposit   298                    0 Transient-Party
## 2970               0   No Deposit   298                    0 Transient-Party
## 2971               1   No Deposit   298                    0 Transient-Party
## 2972               0   No Deposit   298                    0 Transient-Party
## 2973               0   No Deposit   298                    0 Transient-Party
## 2974               0   No Deposit   298                    0 Transient-Party
## 2975               0   No Deposit   115                    0       Transient
## 2976               0   No Deposit   115                    0       Transient
## 2977               1   No Deposit   315                    0 Transient-Party
## 2978               0   No Deposit    40                    0        Contract
## 2979               0   No Deposit    40                    0       Transient
## 2980               0   No Deposit    40                    0        Contract
## 2981               0   No Deposit   240                    0 Transient-Party
## 2982               0   No Deposit   240                    0 Transient-Party
## 2983               0   No Deposit   240                    0 Transient-Party
## 2984               0   No Deposit   240                    0       Transient
## 2985               0   No Deposit   240                    0 Transient-Party
## 2986               0   No Deposit    36                    0       Transient
## 2987               0   No Deposit   314                    0       Transient
## 2988               0   No Deposit   143                    0        Contract
## 2989               0   No Deposit   143                    0        Contract
## 2990               0   No Deposit   143                    0       Transient
## 2991               0   No Deposit   175                    0       Transient
## 2992               0   No Deposit   240                    0       Transient
## 2993               0   No Deposit    69                    0       Transient
## 2994               0   No Deposit    40                    0        Contract
## 2995               0   No Deposit    40                    0        Contract
## 2996               0   No Deposit   156                    0       Transient
## 2997               0   No Deposit    40                    0        Contract
## 2998               1   No Deposit   240                    0       Transient
## 2999               0   No Deposit    40                    0       Transient
## 3000               0   No Deposit    14                    0       Transient
## 3001               0   No Deposit   250                    0       Transient
## 3002               0   No Deposit   240                    0       Transient
## 3003               1   No Deposit    14                    0 Transient-Party
## 3004               1   No Deposit    40                    0        Contract
## 3005               0   No Deposit   241                    0       Transient
## 3006               0   No Deposit    40                    0       Transient
## 3007               0   No Deposit    40                    0        Contract
## 3008               2   No Deposit    14                    0 Transient-Party
## 3009               0   No Deposit   240                    0       Transient
## 3010               2   No Deposit    14                    0 Transient-Party
## 3011               0   No Deposit    14                    0       Transient
## 3012               0   No Deposit   250                    0       Transient
## 3013               0   No Deposit   240                    0       Transient
## 3014               1   No Deposit    14                    0 Transient-Party
## 3015               2   No Deposit    14                    0 Transient-Party
## 3016               2   No Deposit    14                    0 Transient-Party
## 3017               1   No Deposit    14                    0 Transient-Party
## 3018               1   No Deposit    14                    0 Transient-Party
## 3019               1   No Deposit    14                    0 Transient-Party
## 3020               1   No Deposit    14                    0 Transient-Party
## 3021               1   No Deposit    14                    0 Transient-Party
## 3022               1   No Deposit    14                    0 Transient-Party
## 3023               1   No Deposit    14                    0 Transient-Party
## 3024               1   No Deposit    14                    0 Transient-Party
## 3025               1   No Deposit    14                    0 Transient-Party
## 3026               1   No Deposit    14                    0 Transient-Party
## 3027               3   No Deposit    14                    0 Transient-Party
## 3028               2   No Deposit    14                    0 Transient-Party
## 3029               1   Refundable    14                    0 Transient-Party
## 3030               2   Refundable    14                    0 Transient-Party
## 3031               1   No Deposit    14                    0 Transient-Party
## 3032               1   No Deposit    14                    0 Transient-Party
## 3033               0   No Deposit   147                    0       Transient
## 3034               0   No Deposit   240                    0       Transient
## 3035               2   No Deposit    14                    0 Transient-Party
## 3036               0   No Deposit   175                    0       Transient
## 3037               0   No Deposit   175                    0       Transient
## 3038               0   No Deposit   240                    0       Transient
## 3039               1   No Deposit    14                    0 Transient-Party
## 3040               3   No Deposit    14                    0 Transient-Party
## 3041               0   No Deposit    14                    0 Transient-Party
## 3042               3   No Deposit    14                    0 Transient-Party
## 3043               4   No Deposit    14                    0 Transient-Party
## 3044               1   No Deposit    14                    0 Transient-Party
## 3045               2   No Deposit    14                    0 Transient-Party
## 3046               4   No Deposit    14                    0 Transient-Party
## 3047               4   No Deposit    14                    0 Transient-Party
## 3048               5   No Deposit    14                    0 Transient-Party
## 3049               0   No Deposit   240                    0       Transient
## 3050               2   No Deposit    14                    0 Transient-Party
## 3051               2   No Deposit    14                    0 Transient-Party
## 3052               2   No Deposit    14                    0 Transient-Party
## 3053               2   No Deposit    14                    0 Transient-Party
## 3054               0   No Deposit    14                    0 Transient-Party
## 3055               1   No Deposit    14                    0 Transient-Party
## 3056               2   No Deposit    14                    0 Transient-Party
## 3057               2   No Deposit    14                    0 Transient-Party
## 3058               2   No Deposit    14                    0 Transient-Party
## 3059               2   No Deposit    14                    0 Transient-Party
## 3060               2   No Deposit    14                    0 Transient-Party
## 3061               2   No Deposit    14                    0 Transient-Party
## 3062               2   No Deposit    14                    0 Transient-Party
## 3063               2   No Deposit    14                    0 Transient-Party
## 3064               2   No Deposit    14                    0 Transient-Party
## 3065               2   No Deposit    14                    0 Transient-Party
## 3066               2   No Deposit    14                    0 Transient-Party
## 3067               2   No Deposit    14                    0 Transient-Party
## 3068               2   No Deposit    14                    0 Transient-Party
## 3069               2   No Deposit    14                    0 Transient-Party
## 3070               2   No Deposit    14                    0 Transient-Party
## 3071               2   No Deposit    14                    0 Transient-Party
## 3072               2   No Deposit    14                    0 Transient-Party
## 3073               2   No Deposit    14                    0 Transient-Party
## 3074               2   No Deposit    14                    0 Transient-Party
## 3075               2   No Deposit    14                    0 Transient-Party
## 3076               2   No Deposit    14                    0 Transient-Party
## 3077               3   No Deposit    14                    0 Transient-Party
## 3078               2   No Deposit    14                    0 Transient-Party
## 3079               2   No Deposit    14                    0 Transient-Party
## 3080               3   No Deposit    14                    0 Transient-Party
## 3081               2   Refundable    14                    0 Transient-Party
## 3082               2   Non Refund    14                    0 Transient-Party
## 3083               2   No Deposit    14                    0 Transient-Party
## 3084               2   No Deposit    14                    0 Transient-Party
## 3085               2   No Deposit    14                    0 Transient-Party
## 3086               2   No Deposit    14                    0 Transient-Party
## 3087               0   No Deposit   156                    0 Transient-Party
## 3088               1   No Deposit    40                    0        Contract
## 3089               2   No Deposit   156                    0 Transient-Party
## 3090               0   No Deposit   156                    0 Transient-Party
## 3091               3   Non Refund    14                    0 Transient-Party
## 3092               0   No Deposit   240                    0       Transient
## 3093               0   No Deposit    40                    0        Contract
## 3094               0   No Deposit   240                    0       Transient
## 3095               1   No Deposit   240                    0       Transient
## 3096               0   No Deposit    40                    0        Contract
## 3097               1   No Deposit   298                    0 Transient-Party
## 3098               0   No Deposit   298                    0 Transient-Party
## 3099               0   No Deposit   298                    0 Transient-Party
## 3100               0   No Deposit   298                    0 Transient-Party
## 3101               1   No Deposit   298                    0 Transient-Party
## 3102               1   No Deposit   298                    0 Transient-Party
## 3103               1   No Deposit   298                    0 Transient-Party
## 3104               1   No Deposit   298                    0 Transient-Party
## 3105               0   No Deposit   298                    0       Transient
## 3106               0   No Deposit   298                    0 Transient-Party
## 3107               1   No Deposit   298                    0 Transient-Party
## 3108               0   No Deposit   298                    0 Transient-Party
## 3109               1   No Deposit   298                    0 Transient-Party
## 3110               1   No Deposit   298                    0 Transient-Party
## 3111               0   No Deposit   298                    0 Transient-Party
## 3112               0   No Deposit   314                    0       Transient
## 3113               0   No Deposit   298                    0 Transient-Party
## 3114               0   No Deposit   298                    0 Transient-Party
## 3115               0   No Deposit   298                    0 Transient-Party
## 3116               0   No Deposit    40                    0       Transient
## 3117               3   No Deposit    40                    0        Contract
## 3118               0   No Deposit    14                    0 Transient-Party
## 3119               0   No Deposit    14                    0 Transient-Party
## 3120               5   No Deposit    14                    0 Transient-Party
## 3121               0   No Deposit   242                    0       Transient
## 3122               0   No Deposit   242                    0       Transient
## 3123               0   No Deposit   242                    0       Transient
## 3124               0   No Deposit    75                    0        Contract
##         adr required_car_parking_spaces total_of_special_requests
## 1      0.00                        none                         0
## 2      0.00                        none                         0
## 3     75.00                        none                         0
## 4     75.00                        none                         0
## 5     98.00                        none                         1
## 6     98.00                        none                         1
## 7    107.00                        none                         0
## 8    103.00                        none                         1
## 9    145.00                        none                         0
## 10    97.00                        none                         3
## 11   154.77                        none                         1
## 12    94.71                        none                         0
## 13    97.00                        none                         3
## 14    97.50                        none                         0
## 15    88.20                        none                         0
## 16   107.42                        none                         0
## 17   153.00                        none                         1
## 18    97.29                        none                         1
## 19    84.67                        none                         1
## 20    84.67                        none                         1
## 21    99.67                        none                         1
## 22    94.95                        none                         1
## 23    63.60                     parking                         0
## 24    79.50                        none                         0
## 25    94.00                        none                         0
## 26    87.30                     parking                         1
## 27    62.00                        none                         2
## 28    63.86                        none                         0
## 29    65.50                        none                         0
## 30    98.00                        none                         0
## 31   108.80                        none                         1
## 32   137.00                        none                         1
## 33    79.50                        none                         0
## 34   123.00                        none                         0
## 35   137.00                        none                         1
## 36   110.70                        none                         2
## 37    58.95                        none                         1
## 38    82.88                        none                         2
## 39    82.35                        none                         0
## 40   119.35                        none                         1
## 41    67.58                        none                         2
## 42    56.01                        none                         0
## 43   110.70                        none                         0
## 44    88.20                     parking                         0
## 45   147.00                     parking                         0
## 46   107.00                     parking                         2
## 47   147.00                        none                         0
## 48   117.90                        none                         2
## 49   123.00                        none                         0
## 50    98.00                        none                         1
## 51   117.81                        none                         0
## 52   135.00                     parking                         2
## 53   133.00                        none                         1
## 54    58.95                        none                         0
## 55   153.00                     parking                         0
## 56   110.50                        none                         0
## 57    97.00                        none                         0
## 58    91.50                        none                         0
## 59   114.50                        none                         0
## 60    90.90                     parking                         0
## 61   122.00                        none                         0
## 62   110.70                     parking                         0
## 63    85.86                        none                         0
## 64    58.95                        none                         0
## 65    55.68                        none                         0
## 66   111.15                        none                         0
## 67   134.73                        none                         0
## 68    92.45                        none                         1
## 69    73.80                        none                         0
## 70    98.00                     parking                         2
## 71   131.00                        none                         1
## 72   123.00                        none                         0
## 73    94.71                        none                         0
## 74   123.00                        none                         2
## 75   196.54                        none                         1
## 76    99.30                     parking                         2
## 77    90.95                        none                         0
## 78    92.67                        none                         1
## 79    71.55                     parking                         0
## 80    96.49                        none                         2
## 81    85.80                     parking                         2
## 82    96.30                        none                         1
## 83    58.95                        none                         1
## 84    73.80                        none                         2
## 85    97.00                        none                         2
## 86   139.00                        none                         2
## 87    67.24                        none                         0
## 88   116.50                        none                         1
## 89   123.00                        none                         1
## 90    71.55                        none                         1
## 91    71.55                        none                         1
## 92   149.00                        none                         1
## 93   163.00                     parking                         0
## 94    79.50                        none                         0
## 95     0.00                        none                         1
## 96   123.00                        none                         0
## 97    73.80                     parking                         1
## 98   114.50                        none                         0
## 99    73.80                        none                         2
## 100   73.80                        none                         1
## 101   88.20                        none                         1
## 102   85.10                        none                         0
## 103   89.00                        none                         0
## 104   80.10                        none                         0
## 105   98.00                        none                         0
## 106  101.00                     parking                         0
## 107  167.00                        none                         1
## 108  225.00                     parking                         0
## 109   97.00                     parking                         0
## 110   87.30                        none                         2
## 111   85.59                     parking                         2
## 112  123.00                        none                         0
## 113  107.00                        none                         0
## 114  163.00                        none                         0
## 115   82.00                        none                         0
## 116  164.20                     parking                         1
## 117   97.29                        none                         1
## 118   98.40                        none                         0
## 119  175.00                     parking                         1
## 120   63.60                     parking                         2
## 121  124.45                     parking                         1
## 122  110.70                        none                         0
## 123   74.07                        none                         0
## 124  134.10                        none                         0
## 125  167.00                        none                         0
## 126  123.00                        none                         2
## 127  117.81                     parking                         2
## 128  171.32                        none                         1
## 129  210.00                     parking                         0
## 130   97.00                        none                         2
## 131  117.81                        none                         2
## 132    0.00                        none                         2
## 133    0.00                        none                         0
## 134  131.00                        none                         0
## 135   98.00                        none                         2
## 136   87.30                     parking                         1
## 137   97.00                        none                         1
## 138   91.50                        none                         0
## 139   73.80                        none                         1
## 140  123.00                        none                         0
## 141  175.00                     parking                         0
## 142  117.80                     parking                         1
## 143  117.63                        none                         0
## 144  185.00                        none                         0
## 145   47.25                        none                         0
## 146  151.00                        none                         1
## 147  120.60                        none                         1
## 148   63.86                        none                         1
## 149  157.10                        none                         1
## 150   91.37                        none                         2
## 151   73.00                        none                         0
## 152  110.70                        none                         0
## 153   93.60                        none                         0
## 154   83.50                        none                         0
## 155   82.00                     parking                         2
## 156  185.50                        none                         1
## 157    0.00                        none                         1
## 158    0.00                        none                         1
## 159  109.80                        none                         3
## 160  195.00                     parking                         0
## 161  109.80                        none                         3
## 162  193.00                        none                         1
## 163   97.00                        none                         2
## 164  150.00                        none                         1
## 165   98.00                        none                         0
## 166   79.50                        none                         0
## 167  126.65                        none                         1
## 168  107.00                        none                         1
## 169  131.00                     parking                         2
## 170  131.00                     parking                         1
## 171  146.00                        none                         1
## 172  110.70                        none                         1
## 173   61.00                        none                         0
## 174  104.72                     parking                         1
## 175   77.96                     parking                         1
## 176  107.00                        none                         1
## 177   89.68                        none                         0
## 178  155.00                        none                         0
## 179  112.00                        none                         1
## 180  130.10                        none                         3
## 181  100.10                        none                         2
## 182  123.00                        none                         3
## 183  124.00                     parking                         1
## 184  146.00                     parking                         0
## 185   82.00                        none                         2
## 186   98.00                        none                         1
## 187   75.46                     parking                         1
## 188   65.50                        none                         0
## 189   90.95                        none                         0
## 190   93.60                        none                         0
## 191  119.25                        none                         0
## 192  134.73                        none                         0
## 193  112.00                        none                         1
## 194  131.00                        none                         0
## 195   88.20                        none                         0
## 196   73.80                        none                         1
## 197   98.00                        none                         0
## 198  110.50                        none                         1
## 199  131.00                        none                         1
## 200  185.00                     parking                         1
## 201   87.30                        none                         2
## 202   73.80                        none                         1
## 203  120.00                        none                         1
## 204   98.00                        none                         1
## 205   96.30                        none                         2
## 206  197.00                        none                         1
## 207  197.00                        none                         1
## 208   82.00                        none                         2
## 209  165.00                     parking                         3
## 210  149.40                        none                         0
## 211  106.84                     parking                         2
## 212  161.00                     parking                         1
## 213  134.43                        none                         2
## 214  144.43                     parking                         2
## 215  152.00                        none                         0
## 216  125.54                        none                         3
## 217  133.83                        none                         2
## 218  159.75                     parking                         0
## 219  120.60                        none                         2
## 220  112.20                        none                         0
## 221  110.60                        none                         0
## 222  105.90                        none                         0
## 223   95.27                        none                         3
## 224  108.83                        none                         1
## 225  120.60                        none                         0
## 226   90.67                        none                         1
## 227  144.40                        none                         1
## 228   99.50                     parking                         2
## 229  139.40                        none                         1
## 230   89.97                        none                         1
## 231  123.00                        none                         0
## 232  123.00                        none                         0
## 233  123.00                        none                         0
## 234  144.90                        none                         1
## 235  153.00                        none                         0
## 236  131.00                        none                         1
## 237  100.00                     parking                         0
## 238   65.50                        none                         0
## 239  123.00                        none                         1
## 240  123.00                        none                         0
## 241  131.00                        none                         0
## 242  104.68                     parking                         0
## 243  166.00                        none                         0
## 244  213.75                        none                         0
## 245  178.00                     parking                         0
## 246  113.90                        none                         1
## 247  129.29                     parking                         0
## 248  153.00                     parking                         0
## 249   98.00                     parking                         2
## 250  169.00                     parking                         2
## 251  132.29                        none                         0
## 252  123.00                        none                         1
## 253  117.22                        none                         1
## 254  149.00                        none                         1
## 255  107.00                        none                         0
## 256  117.22                     parking                         2
## 257  119.25                        none                         0
## 258  123.00                        none                         0
## 259  123.00                        none                         1
## 260  144.43                     parking                         2
## 261  148.30                     parking                         2
## 262  125.22                        none                         1
## 263  123.00                        none                         0
## 264  130.00                     parking                         1
## 265   78.84                        none                         0
## 266   80.10                        none                         0
## 267  193.00                        none                         1
## 268   88.20                        none                         0
## 269   90.71                        none                         0
## 270  114.50                        none                         1
## 271  120.20                        none                         1
## 272   79.50                        none                         0
## 273  117.90                        none                         3
## 274   90.95                        none                         0
## 275  107.00                        none                         2
## 276  130.05                     parking                         1
## 277  123.00                        none                         0
## 278  196.00                        none                         1
## 279  149.40                     parking                         0
## 280  175.71                        none                         0
## 281  119.70                        none                         2
## 282  100.86                        none                         0
## 283   82.00                        none                         3
## 284   73.80                        none                         1
## 285  117.90                     parking                         0
## 286   82.00                        none                         3
## 287  150.00                        none                         0
## 288  161.00                     parking                         2
## 289   64.00                        none                         2
## 290  110.00                     parking                         0
## 291   88.20                     parking                         1
## 292  130.00                     parking                         0
## 293   88.20                        none                         1
## 294  165.00                     parking                         1
## 295  114.00                        none                         0
## 296  120.00                        none                         2
## 297  120.00                        none                         0
## 298  107.20                        none                         0
## 299  120.00                        none                         2
## 300  163.80                        none                         1
## 301  153.00                        none                         0
## 302   98.50                        none                         2
## 303  119.70                        none                         2
## 304  184.60                        none                         1
## 305  181.22                        none                         2
## 306  100.20                     parking                         3
## 307  134.25                     parking                         0
## 308   96.30                        none                         0
## 309   83.09                        none                         2
## 310  134.00                        none                         0
## 311    8.00                        none                         1
## 312  146.00                     parking                         1
## 313  111.15                        none                         1
## 314  136.20                        none                         2
## 315  101.80                        none                         0
## 316  127.00                        none                         1
## 317  161.50                        none                         2
## 318  230.67                     parking                         2
## 319  180.00                     parking                         2
## 320  168.57                        none                         1
## 321  107.00                        none                         1
## 322   73.41                        none                         0
## 323  109.90                        none                         2
## 324  109.90                        none                         2
## 325  187.50                     parking                         3
## 326  134.00                        none                         0
## 327  106.90                        none                         0
## 328  216.13                     parking                         0
## 329  107.00                        none                         0
## 330  107.00                        none                         0
## 331  107.00                        none                         0
## 332  107.00                        none                         0
## 333  107.00                        none                         0
## 334  190.33                        none                         1
## 335  107.00                        none                         0
## 336   94.00                        none                         0
## 337   98.75                        none                         0
## 338  148.23                        none                         0
## 339   94.00                        none                         0
## 340  107.00                        none                         0
## 341  107.00                        none                         0
## 342  148.23                        none                         0
## 343    0.00                        none                         0
## 344  107.00                        none                         0
## 345  107.00                        none                         0
## 346  107.00                        none                         0
## 347  107.00                        none                         0
## 348   98.75                        none                         0
## 349  120.60                        none                         1
## 350  123.20                        none                         0
## 351  169.00                     parking                         1
## 352  198.00                     parking                         0
## 353  135.60                        none                         1
## 354  103.50                        none                         1
## 355  184.00                     parking                         0
## 356  121.33                        none                         1
## 357  150.20                        none                         1
## 358  150.20                        none                         1
## 359   75.44                        none                         1
## 360  166.00                        none                         1
## 361  130.00                        none                         0
## 362   96.30                        none                         0
## 363  160.00                        none                         0
## 364    0.00                        none                         1
## 365  127.25                        none                         1
## 366  164.00                        none                         2
## 367  144.50                        none                         0
## 368  112.00                        none                         0
## 369  155.50                     parking                         0
## 370  144.50                        none                         0
## 371  144.50                        none                         0
## 372  123.00                        none                         0
## 373  120.60                        none                         1
## 374  107.00                        none                         0
## 375  133.75                     parking                         0
## 376  103.50                        none                         0
## 377   84.80                        none                         1
## 378  107.00                        none                         0
## 379  107.00                     parking                         0
## 380   84.80                        none                         1
## 381  107.00                     parking                         0
## 382  195.00                        none                         1
## 383  164.00                        none                         0
## 384  195.00                        none                         0
## 385  125.00                        none                         2
## 386  132.30                        none                         3
## 387  145.00                        none                         2
## 388   92.00                        none                         0
## 389  132.30                        none                         3
## 390  147.00                        none                         2
## 391  167.00                     parking                         2
## 392  210.00                        none                         1
## 393  194.90                        none                         2
## 394  103.50                     parking                         3
## 395  118.50                        none                         3
## 396  192.00                        none                         1
## 397  128.27                        none                         0
## 398  135.00                        none                         0
## 399  126.30                        none                         2
## 400   96.30                        none                         0
## 401  126.30                        none                         2
## 402  118.50                        none                         3
## 403  116.33                     parking                         1
## 404  164.00                        none                         1
## 405  147.67                        none                         2
## 406  145.00                        none                         0
## 407  147.00                     parking                         2
## 408  167.00                        none                         0
## 409  137.75                     parking                         1
## 410  145.00                        none                         0
## 411  132.60                     parking                         0
## 412  132.50                        none                         0
## 413   98.02                        none                         1
## 414  126.00                        none                         2
## 415  173.00                        none                         1
## 416  249.00                        none                         0
## 417  186.50                        none                         0
## 418   95.00                        none                         1
## 419  241.50                        none                         2
## 420  177.00                     parking                         0
## 421  153.73                     parking                         0
## 422  115.00                        none                         1
## 423  128.25                        none                         1
## 424  128.25                        none                         1
## 425  115.00                        none                         1
## 426  135.00                        none                         1
## 427  135.00                        none                         1
## 428  124.50                        none                         0
## 429   98.00                        none                         0
## 430   98.00                     parking                         0
## 431  135.00                        none                         0
## 432   88.20                        none                         0
## 433  120.60                     parking                         1
## 434  154.50                     parking                         2
## 435   92.00                        none                         0
## 436  115.00                        none                         1
## 437  131.37                        none                         1
## 438  123.00                        none                         1
## 439  117.84                        none                         2
## 440  116.85                        none                         0
## 441  129.16                        none                         1
## 442  123.00                        none                         1
## 443  123.00                        none                         0
## 444  135.20                        none                         0
## 445  123.00                        none                         2
## 446  130.50                        none                         1
## 447  123.00                        none                         0
## 448    0.00                        none                         0
## 449    0.00                        none                         1
## 450  115.00                        none                         3
## 451  115.00                        none                         0
## 452  103.50                     parking                         2
## 453  157.00                     parking                         0
## 454  111.65                        none                         0
## 455  104.00                        none                         0
## 456  133.17                        none                         0
## 457  121.01                        none                         1
## 458  167.50                        none                         0
## 459  152.43                        none                         3
## 460  148.34                        none                         0
## 461  167.00                        none                         1
## 462  192.50                        none                         1
## 463  141.60                        none                         1
## 464  141.60                        none                         1
## 465  141.60                        none                         1
## 466   99.50                        none                         0
## 467  103.50                        none                         0
## 468  207.00                     parking                         0
## 469  163.33                     parking                         1
## 470  151.86                        none                         0
## 471   95.57                        none                         1
## 472  112.05                        none                         1
## 473  160.00                        none                         1
## 474  103.18                        none                         1
## 475  153.00                     parking                         0
## 476  167.69                        none                         1
## 477    0.00                        none                         0
## 478    0.00                        none                         1
## 479  154.00                     parking                         1
## 480  134.00                        none                         0
## 481  194.00                     parking                         1
## 482  184.00                        none                         1
## 483  101.46                     parking                         0
## 484  217.05                     parking                         1
## 485  164.00                        none                         2
## 486  173.00                        none                         2
## 487  153.00                        none                         2
## 488  173.00                        none                         2
## 489  153.00                        none                         2
## 490  134.00                        none                         0
## 491  153.00                        none                         2
## 492  154.00                        none                         0
## 493  173.00                        none                         2
## 494  222.67                        none                         0
## 495  107.00                        none                         0
## 496  149.70                     parking                         1
## 497  107.00                        none                         0
## 498   75.44                        none                         1
## 499   75.44                        none                         1
## 500  115.00                        none                         0
## 501  154.00                        none                         2
## 502  166.00                        none                         0
## 503  132.50                        none                         0
## 504    0.00                        none                         0
## 505  133.00                        none                         0
## 506  107.00                        none                         0
## 507  117.81                        none                         0
## 508  107.00                        none                         0
## 509  147.00                        none                         0
## 510  153.00                        none                         1
## 511  118.00                        none                         0
## 512  134.00                        none                         1
## 513  135.00                        none                         2
## 514  158.77                        none                         2
## 515  134.00                     parking                         1
## 516  142.03                        none                         1
## 517  240.00                        none                         0
## 518  134.00                        none                         0
## 519  147.00                        none                         0
## 520  176.00                     parking                         0
## 521  147.00                        none                         0
## 522  167.00                        none                         1
## 523  107.20                     parking                         0
## 524  233.05                     parking                         0
## 525   90.12                        none                         1
## 526  120.60                        none                         2
## 527  114.25                        none                         1
## 528   88.55                        none                         0
## 529  195.00                     parking                         0
## 530  103.50                        none                         0
## 531  115.00                        none                         3
## 532  209.00                        none                         1
## 533  180.00                        none                         0
## 534  103.18                        none                         0
## 535  174.01                        none                         1
## 536  107.20                        none                         0
## 537    0.00                        none                         0
## 538  145.00                     parking                         0
## 539  145.00                     parking                         0
## 540  166.00                        none                         2
## 541  115.00                        none                         0
## 542  166.00                     parking                         2
## 543  162.00                        none                         2
## 544  153.00                        none                         0
## 545  133.20                        none                         0
## 546  134.00                        none                         1
## 547  107.00                     parking                         2
## 548  145.00                        none                         2
## 549  145.00                        none                         0
## 550  167.20                        none                         0
## 551  130.00                        none                         0
## 552  149.00                        none                         0
## 553  154.00                     parking                         0
## 554  195.00                        none                         1
## 555  107.20                        none                         0
## 556  159.60                     parking                         1
## 557  120.60                        none                         0
## 558  107.20                        none                         0
## 559  102.72                        none                         1
## 560  114.85                        none                         1
## 561  114.85                        none                         1
## 562  135.00                     parking                         1
## 563  107.00                        none                         1
## 564  107.00                        none                         1
## 565  164.00                        none                         2
## 566  138.80                        none                         1
## 567  135.00                        none                         0
## 568  103.18                        none                         1
## 569   90.95                        none                         1
## 570    0.00                        none                         0
## 571  146.00                     parking                         2
## 572  134.00                        none                         0
## 573  157.00                        none                         1
## 574  188.00                        none                         0
## 575  145.00                        none                         1
## 576  134.00                        none                         2
## 577   90.95                        none                         1
## 578  108.06                        none                         1
## 579  107.00                        none                         0
## 580  153.00                        none                         1
## 581  250.33                        none                         2
## 582  280.74                     parking                         0
## 583  193.00                        none                         1
## 584  160.00                     parking                         3
## 585  125.89                        none                         1
## 586  125.89                        none                         1
## 587    0.00                        none                         0
## 588    0.00                     parking                         0
## 589  188.00                        none                         0
## 590  120.00                        none                         1
## 591  192.00                        none                         2
## 592  192.00                     parking                         2
## 593  219.50                        none                         0
## 594  192.50                        none                         1
## 595   57.60                        none                         0
## 596  214.00                     parking                         0
## 597  157.80                        none                         0
## 598  170.33                     parking                         1
## 599  119.25                        none                         0
## 600   96.30                        none                         0
## 601  211.00                        none                         2
## 602  188.29                        none                         2
## 603  185.00                     parking                         4
## 604  193.13                        none                         0
## 605  172.00                        none                         0
## 606  195.50                     parking                         1
## 607  186.00                     parking                         4
## 608  163.50                        none                         1
## 609  180.28                        none                         0
## 610  174.76                     parking                         1
## 611  116.85                        none                         0
## 612  159.00                        none                         0
## 613    0.00                        none                         0
## 614  144.76                        none                         0
## 615  162.14                        none                         1
## 616   77.54                        none                         0
## 617    0.00                        none                         1
## 618    0.00                        none                         2
## 619  172.00                        none                         0
## 620  230.50                        none                         2
## 621  230.50                     parking                         2
## 622  241.00                        none                         2
## 623   90.95                     parking                         0
## 624  188.29                        none                         2
## 625   90.95                        none                         0
## 626  187.80                        none                         1
## 627    0.00                        none                         2
## 628    0.00                        none                         0
## 629  171.90                        none                         0
## 630  200.00                        none                         0
## 631  148.25                     parking                         0
## 632  172.00                        none                         1
## 633  172.00                        none                         2
## 634  168.71                        none                         3
## 635  172.00                        none                         0
## 636  126.00                        none                         1
## 637  268.00                     parking                         1
## 638  173.00                        none                         0
## 639  149.20                        none                         0
## 640  217.20                     parking                         4
## 641  181.50                        none                         3
## 642  154.00                        none                         2
## 643  173.00                        none                         0
## 644  181.90                        none                         3
## 645    0.00                        none                         2
## 646  114.00                        none                         0
## 647  226.00                        none                         4
## 648  211.00                        none                         1
## 649  191.00                        none                         3
## 650  173.00                        none                         1
## 651  134.00                        none                         2
## 652  107.20                        none                         2
## 653  221.00                        none                         2
## 654  133.50                     parking                         2
## 655  205.00                        none                         2
## 656  121.39                     parking                         1
## 657  171.90                     parking                         0
## 658  250.00                        none                         1
## 659  208.00                     parking                         1
## 660  172.00                        none                         3
## 661  157.59                        none                         1
## 662  211.75                     parking                         3
## 663  246.00                        none                         1
## 664  252.00                     parking                         1
## 665  276.43                     parking                         3
## 666  133.00                     parking                         2
## 667   90.95                        none                         1
## 668  138.00                        none                         0
## 669  165.69                     parking                         0
## 670  195.00                        none                         0
## 671  127.31                        none                         0
## 672  134.00                        none                         1
## 673  210.33                     parking                         2
## 674  211.00                        none                         1
## 675  154.00                        none                         0
## 676  179.38                        none                         0
## 677  277.00                     parking                         1
## 678  104.00                        none                         0
## 679  133.00                        none                         1
## 680  130.00                        none                         0
## 681  106.40                        none                         0
## 682    0.00                        none                         2
## 683  254.00                     parking                         1
## 684  221.00                        none                         2
## 685  211.00                        none                         0
## 686  129.00                        none                         0
## 687  147.07                        none                         1
## 688  179.10                     parking                         1
## 689  164.65                        none                         1
## 690  233.00                        none                         0
## 691  169.00                        none                         1
## 692    0.00                        none                         2
## 693    0.00                        none                         2
## 694  154.00                        none                         0
## 695  154.00                        none                         0
## 696  156.73                        none                         0
## 697  211.00                        none                         1
## 698  200.70                     parking                         2
## 699  142.26                        none                         1
## 700  129.41                        none                         1
## 701  252.00                        none                         1
## 702  157.08                        none                         2
## 703   90.95                        none                         1
## 704   90.95                        none                         1
## 705  134.00                        none                         0
## 706  172.00                        none                         1
## 707  184.45                     parking                         0
## 708  158.00                     parking                         1
## 709  168.80                        none                         0
## 710  255.00                        none                         2
## 711  196.00                        none                         1
## 712   87.91                        none                         1
## 713  154.00                        none                         2
## 714  243.00                        none                         1
## 715  222.20                        none                         2
## 716  243.00                        none                         2
## 717    0.00                        none                         2
## 718  203.00                        none                         0
## 719  173.00                        none                         0
## 720  172.00                        none                         2
## 721  120.60                        none                         0
## 722  172.00                        none                         2
## 723  266.40                        none                         2
## 724  236.00                        none                         1
## 725  223.00                        none                         1
## 726  178.67                        none                         2
## 727  167.25                        none                         0
## 728  166.00                     parking                         0
## 729  195.80                     parking                         1
## 730  160.00                     parking                         0
## 731   96.30                        none                         1
## 732  107.00                        none                         0
## 733  182.50                        none                         1
## 734  157.00                        none                         1
## 735  234.00                     parking                         0
## 736  242.50                        none                         0
## 737  157.00                        none                         1
## 738  131.20                        none                         1
## 739  135.00                        none                         1
## 740  248.00                        none                         1
## 741  107.00                        none                         0
## 742  299.33                     parking                         1
## 743  156.45                        none                         1
## 744  107.00                        none                         0
## 745  145.75                     parking                         1
## 746  200.71                     parking                         0
## 747  101.65                        none                         0
## 748  107.00                        none                         1
## 749  172.00                        none                         0
## 750  172.00                        none                         0
## 751  172.00                        none                         0
## 752  172.00                        none                         0
## 753  195.00                        none                         0
## 754  172.00                        none                         0
## 755  172.00                        none                         0
## 756  153.00                        none                         1
## 757  214.00                        none                         0
## 758  183.00                        none                         0
## 759  134.00                        none                         3
## 760  225.90                        none                         2
## 761  131.10                        none                         0
## 762  101.65                        none                         0
## 763  133.00                        none                         0
## 764  133.00                        none                         0
## 765  172.00                        none                         0
## 766  172.00                        none                         1
## 767  229.67                        none                         1
## 768  135.20                        none                         0
## 769  121.50                        none                         3
## 770   96.30                        none                         1
## 771   96.30                        none                         1
## 772  176.64                        none                         2
## 773  179.86                        none                         1
## 774  187.00                        none                         2
## 775  134.00                        none                         1
## 776  239.50                        none                         1
## 777    0.00                        none                         1
## 778  153.00                        none                         2
## 779  166.00                        none                         0
## 780  192.00                        none                         2
## 781  120.60                     parking                         0
## 782  220.40                        none                         2
## 783    8.00                        none                         0
## 784  196.00                        none                         1
## 785    0.00                        none                         2
## 786    0.00                        none                         2
## 787  200.00                        none                         0
## 788  107.00                        none                         1
## 789  163.23                        none                         0
## 790  164.00                        none                         2
## 791  176.80                     parking                         1
## 792  134.00                        none                         1
## 793  163.35                        none                         1
## 794  171.90                        none                         2
## 795  171.90                        none                         2
## 796  176.75                        none                         1
## 797  123.00                        none                         2
## 798  134.00                        none                         0
## 799  146.00                     parking                         2
## 800  192.00                        none                         0
## 801  183.00                        none                         1
## 802  236.00                        none                         0
## 803  178.33                        none                         2
## 804  248.00                        none                         1
## 805  188.71                        none                         0
## 806  260.71                     parking                         1
## 807  222.00                        none                         0
## 808  174.71                        none                         1
## 809  116.85                        none                         3
## 810  129.55                        none                         1
## 811  172.00                        none                         0
## 812  179.83                        none                         0
## 813  160.43                     parking                         2
## 814  149.00                        none                         1
## 815  146.30                        none                         1
## 816  161.26                        none                         0
## 817  195.45                     parking                         0
## 818  186.25                        none                         3
## 819  162.29                        none                         0
## 820  221.43                     parking                         1
## 821  133.00                        none                         2
## 822  146.30                        none                         1
## 823  218.50                     parking                         1
## 824   96.30                        none                         1
## 825   96.30                     parking                         1
## 826  149.00                        none                         2
## 827  191.67                     parking                         1
## 828  211.00                     parking                         0
## 829  149.40                        none                         1
## 830  201.00                        none                         0
## 831  134.00                        none                         0
## 832  199.00                        none                         0
## 833  112.50                        none                         1
## 834  155.77                        none                         0
## 835  131.70                     parking                         2
## 836  101.65                        none                         0
## 837  113.47                        none                         1
## 838   99.50                        none                         0
## 839  153.00                        none                         0
## 840  233.00                     parking                         1
## 841  153.00                        none                         0
## 842  132.60                     parking                         1
## 843  154.00                        none                         2
## 844  164.00                        none                         1
## 845  261.40                     parking                         0
## 846  199.40                        none                         3
## 847  199.40                        none                         2
## 848  133.76                        none                         0
## 849  164.00                        none                         2
## 850  206.60                        none                         0
## 851    0.00                        none                         0
## 852  193.00                     parking                         0
## 853   96.30                        none                         1
## 854  112.00                        none                         0
## 855  116.85                        none                         3
## 856  111.27                        none                         0
## 857  153.00                     parking                         2
## 858  154.00                     parking                         2
## 859  134.00                        none                         1
## 860  107.00                        none                         0
## 861   79.50                        none                         0
## 862  120.27                        none                         1
## 863   75.53                        none                         0
## 864   90.39                        none                         0
## 865  155.86                        none                         2
## 866  115.00                        none                         3
## 867  195.00                        none                         0
## 868  176.00                     parking                         1
## 869  120.60                     parking                         3
## 870  180.55                        none                         2
## 871  179.00                        none                         1
## 872  181.00                     parking                         2
## 873  122.00                        none                         1
## 874  184.00                        none                         0
## 875  127.67                        none                         1
## 876  127.67                        none                         1
## 877  114.13                        none                         1
## 878  113.70                        none                         2
## 879  120.60                        none                         2
## 880  165.00                     parking                         1
## 881  120.60                        none                         3
## 882  208.00                        none                         2
## 883  166.50                     parking                         1
## 884  101.16                        none                         2
## 885  109.83                        none                         0
## 886  175.00                        none                         1
## 887   98.63                        none                         0
## 888  166.14                        none                         0
## 889  150.71                        none                         0
## 890   97.74                        none                         1
## 891   97.50                        none                         0
## 892  104.80                     parking                         0
## 893  134.00                        none                         1
## 894  146.00                     parking                         2
## 895  103.18                        none                         1
## 896  103.18                        none                         1
## 897  164.00                        none                         0
## 898  142.50                        none                         1
## 899   77.50                     parking                         0
## 900  140.40                     parking                         2
## 901  112.00                        none                         2
## 902  173.25                        none                         0
## 903  146.00                     parking                         2
## 904  154.00                     parking                         0
## 905  103.50                     parking                         4
## 906  103.50                     parking                         3
## 907  115.20                     parking                         0
## 908   71.72                        none                         0
## 909  106.80                        none                         0
## 910   71.69                        none                         1
## 911  136.20                        none                         2
## 912  112.33                     parking                         1
## 913  112.33                        none                         1
## 914  167.86                     parking                         0
## 915  103.07                        none                         1
## 916   92.86                        none                         1
## 917  128.00                     parking                         1
## 918  115.20                        none                         1
## 919   80.55                        none                         0
## 920  120.33                        none                         1
## 921  126.67                        none                         2
## 922   75.46                        none                         1
## 923  120.33                        none                         1
## 924   98.00                        none                         2
## 925  155.50                        none                         0
## 926  122.60                        none                         0
## 927  105.50                        none                         2
## 928  126.29                        none                         2
## 929   87.75                        none                         0
## 930  113.55                        none                         3
## 931  151.00                        none                         0
## 932  134.67                        none                         1
## 933  153.00                        none                         2
## 934  119.00                        none                         0
## 935  155.00                        none                         2
## 936  109.00                        none                         2
## 937  158.00                        none                         0
## 938  128.00                        none                         0
## 939  113.00                        none                         0
## 940  128.00                        none                         0
## 941  110.70                        none                         0
## 942  101.03                        none                         0
## 943   82.72                        none                         1
## 944  110.71                        none                         0
## 945  186.00                        none                         1
## 946  114.19                        none                         1
## 947   86.95                     parking                         0
## 948  113.00                        none                         2
## 949   82.88                        none                         0
## 950  134.00                        none                         0
## 951  154.25                        none                         0
## 952   71.69                        none                         0
## 953   71.69                        none                         0
## 954  150.71                     parking                         0
## 955  131.40                        none                         0
## 956   90.40                     parking                         0
## 957   88.20                        none                         0
## 958   88.20                        none                         0
## 959   65.50                     parking                         0
## 960   88.20                        none                         0
## 961  211.00                        none                         2
## 962   80.00                        none                         0
## 963   88.20                        none                         0
## 964   88.20                        none                         0
## 965   88.20                        none                         0
## 966  109.50                        none                         1
## 967  144.90                        none                         2
## 968   79.50                        none                         0
## 969  124.50                     parking                         2
## 970  123.00                        none                         2
## 971  113.00                     parking                         2
## 972  123.00                     parking                         0
## 973  166.00                        none                         3
## 974   79.50                        none                         1
## 975   79.50                        none                         0
## 976   79.50                        none                         1
## 977   91.46                        none                         1
## 978   62.48                        none                         1
## 979  124.10                     parking                         0
## 980  143.00                     parking                         2
## 981  131.00                        none                         0
## 982  128.00                     parking                         0
## 983  167.00                     parking                         0
## 984  172.00                        none                         1
## 985  146.00                        none                         1
## 986  116.80                        none                         0
## 987   79.50                     parking                         0
## 988  135.00                     parking                         2
## 989  176.00                        none                         0
## 990  151.25                        none                         2
## 991  168.00                     parking                         1
## 992  123.00                        none                         1
## 993  153.00                        none                         0
## 994  104.80                     parking                         0
## 995  183.00                     parking                         0
## 996  120.00                        none                         2
## 997   97.50                        none                         0
## 998  123.00                        none                         2
## 999  171.00                        none                         1
## 1000 171.00                        none                         2
## 1001 156.00                        none                         0
## 1002 139.50                     parking                         1
## 1003 113.00                        none                         0
## 1004  98.00                        none                         2
## 1005 107.50                        none                         0
## 1006 124.80                        none                         0
## 1007 111.50                     parking                         0
## 1008  98.00                        none                         1
## 1009  87.75                        none                         2
## 1010  83.70                     parking                         1
## 1011  91.77                        none                         0
## 1012   0.00                        none                         0
## 1013 128.00                        none                         1
## 1014  71.69                        none                         1
## 1015 114.50                        none                         1
## 1016  98.00                     parking                         0
## 1017 128.00                        none                         0
## 1018  98.00                        none                         0
## 1019 161.00                        none                         3
## 1020  79.50                        none                         0
## 1021 126.29                     parking                         2
## 1022 105.50                        none                         0
## 1023 208.14                     parking                         1
## 1024  79.50                        none                         0
## 1025 113.00                     parking                         3
## 1026 163.00                     parking                         0
## 1027 107.50                        none                         0
## 1028  97.50                        none                         0
## 1029  66.15                        none                         1
## 1030 111.96                        none                         0
## 1031 139.18                        none                         0
## 1032  83.15                        none                         1
## 1033  77.60                        none                         0
## 1034 144.90                        none                         2
## 1035 161.00                        none                         0
## 1036 131.00                        none                         0
## 1037 188.00                        none                         2
## 1038  64.29                        none                         0
## 1039   0.00                        none                         1
## 1040  83.50                        none                         1
## 1041 131.00                        none                         0
## 1042  98.00                        none                         1
## 1043 101.53                        none                         0
## 1044  97.54                        none                         0
## 1045  91.50                        none                         0
## 1046 113.00                        none                         0
## 1047 133.00                     parking                         0
## 1048  76.50                        none                         0
## 1049 146.00                     parking                         0
## 1050  80.00                        none                         0
## 1051  68.50                        none                         0
## 1052 131.00                        none                         2
## 1053 146.00                     parking                         0
## 1054 134.00                        none                         0
## 1055  86.69                     parking                         2
## 1056  65.70                        none                         2
## 1057  77.70                     parking                         2
## 1058  59.00                        none                         1
## 1059  76.50                        none                         0
## 1060 115.40                        none                         2
## 1061 158.40                        none                         0
## 1062 108.00                        none                         1
## 1063  70.98                        none                         0
## 1064  73.80                        none                         2
## 1065  82.44                        none                         1
## 1066 153.00                        none                         1
## 1067  57.54                        none                         0
## 1068 131.00                     parking                         2
## 1069   0.00                        none                         0
## 1070  75.46                        none                         1
## 1071  75.46                        none                         2
## 1072 106.25                        none                         1
## 1073  85.00                        none                         0
## 1074  83.50                        none                         0
## 1075  48.88                        none                         0
## 1076  73.50                        none                         1
## 1077 101.50                        none                         0
## 1078 118.20                     parking                         1
## 1079  66.15                        none                         1
## 1080  50.15                        none                         2
## 1081 112.42                        none                         1
## 1082 131.00                     parking                         0
## 1083  68.50                        none                         0
## 1084 104.80                        none                         0
## 1085 117.90                        none                         3
## 1086 134.00                        none                         0
## 1087 113.00                        none                         0
## 1088 138.50                        none                         0
## 1089 146.00                     parking                         0
## 1090 133.00                     parking                         0
## 1091 153.00                        none                         1
## 1092 131.00                     parking                         0
## 1093 135.00                     parking                         1
## 1094 111.20                        none                         2
## 1095  57.50                        none                         0
## 1096  77.11                        none                         0
## 1097  51.75                        none                         0
## 1098 141.50                     parking                         2
## 1099  66.60                        none                         1
## 1100  58.05                        none                         0
## 1101  95.86                        none                         0
## 1102  68.45                        none                         1
## 1103 131.14                        none                         0
## 1104  72.25                        none                         0
## 1105  53.10                        none                         0
## 1106 123.00                        none                         0
## 1107 127.75                        none                         1
## 1108 122.75                     parking                         1
## 1109 132.60                     parking                         2
## 1110 124.00                     parking                         0
## 1111  66.15                        none                         1
## 1112  93.21                        none                         0
## 1113  53.10                        none                         1
## 1114  53.10                        none                         2
## 1115 105.00                        none                         1
## 1116  66.15                        none                         0
## 1117  73.50                        none                         0
## 1118  58.50                     parking                         0
## 1119 132.00                     parking                         2
## 1120  73.50                     parking                         1
## 1121 212.83                     parking                         2
## 1122 120.08                        none                         2
## 1123 160.80                        none                         2
## 1124  76.67                        none                         1
## 1125 100.50                        none                         1
## 1126  95.00                        none                         1
## 1127 103.51                     parking                         0
## 1128  82.00                        none                         0
## 1129 160.00                        none                         0
## 1130 146.00                        none                         0
## 1131  55.79                        none                         0
## 1132  99.00                        none                         0
## 1133  73.50                        none                         1
## 1134  68.88                        none                         0
## 1135  71.66                        none                         0
## 1136  74.00                        none                         1
## 1137  74.00                        none                         1
## 1138  66.60                     parking                         2
## 1139   8.00                     parking                         0
## 1140  62.00                        none                         0
## 1141  79.00                     parking                         1
## 1142  65.00                        none                         0
## 1143  58.50                        none                         1
## 1144  55.00                        none                         0
## 1145  74.00                        none                         2
## 1146  86.00                     parking                         1
## 1147 129.00                        none                         2
## 1148 129.00                     parking                         1
## 1149  83.00                        none                         0
## 1150  74.00                        none                         0
## 1151  66.60                        none                         0
## 1152 150.25                        none                         0
## 1153  92.00                     parking                         2
## 1154  85.50                        none                         0
## 1155  71.20                        none                         1
## 1156  71.20                        none                         1
## 1157  71.20                     parking                         0
## 1158  66.60                     parking                         2
## 1159   0.00                        none                         2
## 1160 111.00                     parking                         2
## 1161 106.20                     parking                         0
## 1162  65.00                        none                         0
## 1163  65.00                        none                         0
## 1164  65.00                        none                         0
## 1165  65.00                        none                         0
## 1166  65.00                        none                         0
## 1167  74.00                        none                         2
## 1168  65.00                        none                         0
## 1169  74.00                        none                         0
## 1170  59.20                        none                         0
## 1171  73.50                        none                         0
## 1172 109.71                        none                         2
## 1173  90.43                        none                         0
## 1174  80.63                        none                         0
## 1175  45.90                        none                         1
## 1176 120.00                     parking                         1
## 1177 114.00                        none                         1
## 1178  81.60                     parking                         1
## 1179 113.00                     parking                         0
## 1180  81.20                        none                         0
## 1181  99.50                        none                         2
## 1182  73.50                        none                         0
## 1183  85.00                        none                         0
## 1184  75.10                        none                         0
## 1185  59.00                        none                         0
## 1186 122.00                     parking                         2
## 1187 120.00                     parking                         2
## 1188 152.00                     parking                         1
## 1189 127.00                     parking                         0
## 1190  69.83                        none                         0
## 1191 102.93                        none                         0
## 1192  65.10                        none                         0
## 1193  96.26                        none                         1
## 1194 124.74                        none                         2
## 1195 104.00                        none                         1
## 1196  59.20                        none                         2
## 1197 138.29                        none                         2
## 1198  59.20                        none                         2
## 1199 116.00                        none                         0
## 1200 100.93                        none                         0
## 1201  74.93                        none                         0
## 1202  58.98                        none                         0
## 1203  58.93                        none                         2
## 1204  42.50                        none                         0
## 1205  68.50                        none                         0
## 1206  55.64                        none                         1
## 1207  74.00                        none                         1
## 1208  99.00                        none                         2
## 1209  90.00                        none                         1
## 1210  79.00                        none                         1
## 1211  89.00                        none                         1
## 1212  59.02                        none                         0
## 1213  79.50                     parking                         1
## 1214  74.93                        none                         0
## 1215  89.14                        none                         1
## 1216  53.69                     parking                         0
## 1217 114.48                        none                         0
## 1218  73.98                        none                         0
## 1219  99.50                        none                         1
## 1220  99.50                        none                         1
## 1221  59.20                        none                         0
## 1222  65.64                        none                         0
## 1223  89.00                     parking                         1
## 1224  75.43                        none                         3
## 1225  77.73                     parking                         0
## 1226  74.00                     parking                         3
## 1227  80.63                        none                         0
## 1228 140.63                     parking                         1
## 1229 108.65                        none                         0
## 1230  75.65                        none                         0
## 1231 108.85                        none                         0
## 1232 114.00                     parking                         1
## 1233  56.98                        none                         1
## 1234  74.80                     parking                         0
## 1235  87.86                        none                         1
## 1236 130.50                        none                         1
## 1237  64.00                        none                         0
## 1238 112.00                     parking                         0
## 1239  75.50                        none                         0
## 1240  89.00                        none                         3
## 1241  80.10                        none                         2
## 1242  97.20                        none                         0
## 1243  76.30                        none                         1
## 1244  74.70                        none                         0
## 1245  55.43                        none                         1
## 1246  48.54                        none                         0
## 1247  83.80                        none                         1
## 1248  43.93                        none                         0
## 1249  80.10                        none                         0
## 1250  80.00                        none                         1
## 1251 173.00                     parking                         0
## 1252  80.00                        none                         1
## 1253  89.00                        none                         0
## 1254 108.50                     parking                         1
## 1255 136.50                        none                         1
## 1256  96.50                        none                         1
## 1257 142.50                     parking                         1
## 1258  89.00                        none                         1
## 1259  89.00                        none                         1
## 1260  72.14                        none                         0
## 1261  90.49                        none                         1
## 1262  53.68                        none                         1
## 1263  85.50                     parking                         1
## 1264  80.08                        none                         1
## 1265  89.00                        none                         1
## 1266 104.72                        none                         0
## 1267 116.00                        none                         1
## 1268  82.80                        none                         1
## 1269  73.50                        none                         1
## 1270 128.42                     parking                         0
## 1271  55.09                        none                         0
## 1272  93.86                        none                         0
## 1273 122.00                     parking                         1
## 1274  88.40                        none                         0
## 1275  94.50                        none                         0
## 1276  85.08                        none                         2
## 1277  55.43                        none                         0
## 1278  93.43                        none                         0
## 1279  36.13                        none                         0
## 1280  55.43                        none                         1
## 1281  90.74                        none                         0
## 1282  38.25                        none                         0
## 1283 106.31                        none                         2
## 1284  93.20                        none                         0
## 1285  83.67                        none                         1
## 1286  42.23                        none                         0
## 1287  68.53                     parking                         1
## 1288  86.10                     parking                         2
## 1289  60.50                        none                         2
## 1290  44.50                        none                         0
## 1291  68.00                        none                         1
## 1292  78.10                        none                         2
## 1293  70.50                        none                         0
## 1294  76.50                     parking                         2
## 1295  39.24                        none                         0
## 1296  56.59                        none                         0
## 1297  59.03                        none                         2
## 1298  62.00                        none                         0
## 1299  44.50                        none                         0
## 1300  44.50                        none                         1
## 1301  81.75                        none                         3
## 1302  48.80                        none                         2
## 1303  80.10                        none                         2
## 1304 106.00                        none                         1
## 1305 104.00                        none                         0
## 1306  90.10                        none                         0
## 1307  55.50                        none                         1
## 1308  58.50                        none                         0
## 1309  58.50                        none                         0
## 1310  73.00                        none                         0
## 1311  55.80                        none                         2
## 1312  58.50                        none                         0
## 1313  58.50                        none                         0
## 1314  73.00                        none                         0
## 1315  73.00                        none                         0
## 1316  64.33                        none                         1
## 1317 100.33                     parking                         2
## 1318  44.50                        none                         0
## 1319  71.93                        none                         0
## 1320  52.73                        none                         0
## 1321  48.00                        none                         1
## 1322  62.43                     parking                         2
## 1323  52.73                        none                         0
## 1324  44.27                        none                         1
## 1325  54.40                        none                         0
## 1326 120.00                        none                         2
## 1327 118.50                        none                         2
## 1328  87.00                        none                         1
## 1329  48.30                     parking                         2
## 1330  93.00                     parking                         2
## 1331  65.00                        none                         1
## 1332  56.00                        none                         3
## 1333  65.00                        none                         1
## 1334  66.00                        none                         0
## 1335  86.00                        none                         1
## 1336  74.40                        none                         0
## 1337  74.23                        none                         0
## 1338 103.00                     parking                         1
## 1339  82.00                        none                         0
## 1340  69.93                        none                         1
## 1341  43.93                        none                         0
## 1342  57.43                        none                         2
## 1343  36.74                        none                         1
## 1344  63.08                        none                         2
## 1345  47.00                        none                         2
## 1346  55.43                        none                         0
## 1347  76.00                     parking                         0
## 1348  56.00                     parking                         0
## 1349  78.00                        none                         0
## 1350   0.00                        none                         2
## 1351  47.00                        none                         0
## 1352  56.00                        none                         1
## 1353 106.00                        none                         1
## 1354  44.50                        none                         1
## 1355  77.00                        none                         0
## 1356  50.40                        none                         2
## 1357  44.50                        none                         0
## 1358  59.40                        none                         1
## 1359  55.43                        none                         0
## 1360  42.23                        none                         0
## 1361  72.00                        none                         0
## 1362  60.90                     parking                         3
## 1363  67.25                        none                         2
## 1364  63.90                        none                         3
## 1365  74.00                     parking                         0
## 1366  42.30                        none                         0
## 1367  90.00                        none                         0
## 1368  67.00                        none                         0
## 1369 110.00                     parking                         0
## 1370  38.07                        none                         0
## 1371  40.07                        none                         0
## 1372  38.07                        none                         0
## 1373  81.60                        none                         0
## 1374  59.29                        none                         1
## 1375  40.07                        none                         0
## 1376  59.40                        none                         1
## 1377  74.14                        none                         1
## 1378 116.00                     parking                         1
## 1379  86.00                        none                         1
## 1380  40.96                        none                         0
## 1381  44.80                     parking                         0
## 1382  93.43                     parking                         0
## 1383  47.33                        none                         0
## 1384  83.05                        none                         2
## 1385  87.43                        none                         0
## 1386  68.16                        none                         1
## 1387  56.00                        none                         2
## 1388 136.71                        none                         0
## 1389  51.30                        none                         1
## 1390  92.60                        none                         0
## 1391  47.00                        none                         0
## 1392  56.00                        none                         0
## 1393  56.00                        none                         0
## 1394  63.66                        none                         0
## 1395  68.43                        none                         1
## 1396  60.40                        none                         1
## 1397  78.20                        none                         0
## 1398  41.25                        none                         1
## 1399  40.05                        none                         1
## 1400 107.43                        none                         0
## 1401  57.67                        none                         0
## 1402  63.47                        none                         1
## 1403  60.30                     parking                         1
## 1404  61.50                        none                         1
## 1405  88.00                        none                         1
## 1406  67.00                        none                         1
## 1407  54.50                        none                         0
## 1408  67.00                        none                         2
## 1409  54.72                        none                         0
## 1410  83.60                        none                         2
## 1411  73.00                     parking                         1
## 1412  65.45                        none                         0
## 1413   0.00                        none                         0
## 1414  43.12                        none                         1
## 1415  66.00                     parking                         0
## 1416  62.80                        none                         1
## 1417  87.00                        none                         0
## 1418  96.67                     parking                         0
## 1419 118.00                        none                         1
## 1420  98.40                        none                         1
## 1421  43.30                        none                         1
## 1422  58.00                        none                         0
## 1423  66.30                     parking                         2
## 1424   0.00                        none                         2
## 1425  47.00                        none                         1
## 1426   0.00                        none                         0
## 1427  67.00                        none                         1
## 1428  49.01                        none                         0
## 1429  64.29                     parking                         0
## 1430  47.00                        none                         1
## 1431  41.60                     parking                         0
## 1432  55.43                        none                         1
## 1433  48.74                        none                         0
## 1434  55.43                        none                         1
## 1435  67.00                        none                         1
## 1436  68.43                        none                         1
## 1437  40.00                        none                         0
## 1438  67.00                        none                         1
## 1439  67.00                     parking                         1
## 1440  87.00                     parking                         1
## 1441  67.50                        none                         0
## 1442  73.67                        none                         0
## 1443  50.00                        none                         0
## 1444  50.00                        none                         1
## 1445  73.66                        none                         2
## 1446  50.00                        none                         0
## 1447  56.00                     parking                         1
## 1448  48.00                     parking                         1
## 1449  45.00                        none                         0
## 1450  50.00                        none                         0
## 1451  67.00                        none                         0
## 1452  71.00                     parking                         2
## 1453  45.00                        none                         0
## 1454  50.00                        none                         0
## 1455  45.00                        none                         0
## 1456  71.00                     parking                         2
## 1457  85.00                     parking                         1
## 1458  41.37                        none                         1
## 1459  53.37                        none                         1
## 1460  44.50                        none                         0
## 1461  48.57                        none                         1
## 1462  77.43                        none                         0
## 1463  62.47                        none                         0
## 1464  58.00                        none                         0
## 1465  48.00                        none                         0
## 1466  67.00                        none                         1
## 1467  56.00                     parking                         2
## 1468  42.00                        none                         1
## 1469  67.50                        none                         1
## 1470  89.00                        none                         2
## 1471  56.00                     parking                         1
## 1472  43.12                        none                         2
## 1473 104.67                     parking                         1
## 1474 113.33                        none                         1
## 1475  50.00                     parking                         2
## 1476  50.00                        none                         2
## 1477  67.00                        none                         1
## 1478  72.80                        none                         1
## 1479  54.02                        none                         3
## 1480  63.33                        none                         1
## 1481  83.33                        none                         2
## 1482  43.12                        none                         2
## 1483  78.80                     parking                         0
## 1484  55.73                        none                         0
## 1485  44.50                        none                         0
## 1486  83.00                     parking                         2
## 1487  67.00                        none                         0
## 1488  77.00                        none                         2
## 1489  71.50                        none                         2
## 1490  70.40                        none                         1
## 1491  73.68                     parking                         0
## 1492  82.00                        none                         0
## 1493  45.00                        none                         0
## 1494  45.00                        none                         0
## 1495  60.30                        none                         1
## 1496  61.50                        none                         0
## 1497 107.50                     parking                         1
## 1498 101.50                        none                         2
## 1499  76.35                     parking                         2
## 1500  82.35                        none                         0
## 1501 111.50                        none                         0
## 1502  67.50                     parking                         2
## 1503 117.00                        none                         3
## 1504  77.50                     parking                         1
## 1505 102.50                     parking                         3
## 1506 101.50                        none                         1
## 1507 101.50                        none                         2
## 1508  61.35                     parking                         1
## 1509  61.35                     parking                         2
## 1510  90.00                        none                         1
## 1511  79.22                        none                         1
## 1512 106.00                        none                         1
## 1513  50.40                        none                         1
## 1514  66.00                        none                         1
## 1515  50.40                        none                         1
## 1516  46.50                        none                         0
## 1517  66.00                        none                         1
## 1518  56.00                        none                         0
## 1519  82.00                     parking                         1
## 1520  50.40                        none                         2
## 1521  37.60                        none                         0
## 1522  56.40                     parking                         0
## 1523  56.40                     parking                         0
## 1524  56.00                        none                         1
## 1525  56.52                        none                         2
## 1526  58.24                        none                         0
## 1527  69.85                        none                         1
## 1528  92.71                        none                         0
## 1529   0.00                        none                         0
## 1530   0.00                        none                         2
## 1531  48.00                        none                         0
## 1532  53.00                        none                         1
## 1533  48.00                        none                         0
## 1534  37.00                        none                         0
## 1535  56.00                        none                         1
## 1536  48.00                        none                         0
## 1537  61.28                        none                         1
## 1538  79.00                        none                         0
## 1539  74.28                        none                         0
## 1540  47.00                        none                         1
## 1541  50.40                        none                         0
## 1542  56.00                        none                         0
## 1543   8.00                        none                         1
## 1544  56.00                     parking                         0
## 1545  47.00                        none                         1
## 1546 107.43                        none                         0
## 1547  73.38                        none                         2
## 1548 117.00                     parking                         0
## 1549  37.60                     parking                         1
## 1550  42.30                     parking                         1
## 1551  56.00                        none                         0
## 1552  37.60                        none                         1
## 1553  56.00                        none                         2
## 1554  42.30                        none                         1
## 1555  64.50                        none                         1
## 1556   0.00                        none                         0
## 1557  43.00                     parking                         0
## 1558 111.50                        none                         1
## 1559  33.30                        none                         0
## 1560   0.00                        none                         3
## 1561   0.00                        none                         3
## 1562   0.00                        none                         3
## 1563  73.00                     parking                         0
## 1564  44.50                        none                         0
## 1565   0.00                        none                         3
## 1566  44.50                        none                         1
## 1567  98.40                     parking                         0
## 1568  70.00                     parking                         2
## 1569  75.00                        none                         2
## 1570  57.83                     parking                         0
## 1571  68.57                        none                         0
## 1572  67.00                        none                         0
## 1573  54.77                        none                         0
## 1574  45.56                        none                         2
## 1575 108.00                        none                         1
## 1576  42.50                        none                         0
## 1577  50.05                        none                         0
## 1578  67.92                        none                         1
## 1579  43.93                        none                         0
## 1580  38.25                        none                         0
## 1581  55.00                        none                         2
## 1582  81.34                        none                         0
## 1583  37.00                        none                         0
## 1584  56.00                     parking                         1
## 1585  37.00                        none                         0
## 1586  37.00                        none                         0
## 1587  68.40                        none                         0
## 1588  39.00                        none                         0
## 1589  86.00                        none                         1
## 1590  62.00                     parking                         1
## 1591  92.00                     parking                         1
## 1592  40.23                        none                         1
## 1593  76.80                        none                         0
## 1594  76.80                        none                         0
## 1595  76.80                        none                         0
## 1596  58.40                        none                         0
## 1597  76.80                        none                         0
## 1598  76.80                        none                         0
## 1599  76.80                        none                         0
## 1600  76.80                        none                         0
## 1601  76.80                        none                         0
## 1602  76.80                        none                         0
## 1603  76.80                        none                         0
## 1604  76.80                        none                         0
## 1605  76.80                        none                         0
## 1606  76.80                        none                         0
## 1607  76.80                        none                         0
## 1608  76.80                        none                         0
## 1609  76.80                        none                         0
## 1610  76.80                        none                         0
## 1611  57.00                        none                         0
## 1612  76.80                        none                         0
## 1613  76.80                        none                         0
## 1614  76.80                        none                         0
## 1615  58.40                        none                         0
## 1616  76.80                        none                         0
## 1617  79.63                        none                         0
## 1618  37.56                        none                         0
## 1619  36.90                        none                         1
## 1620  70.00                        none                         1
## 1621  67.56                        none                         0
## 1622  56.00                     parking                         0
## 1623  56.00                        none                         0
## 1624  66.00                        none                         0
## 1625  75.00                        none                         1
## 1626  47.00                        none                         0
## 1627  67.15                        none                         1
## 1628  88.67                        none                         0
## 1629 113.33                        none                         1
## 1630  36.00                        none                         1
## 1631  54.40                        none                         0
## 1632  36.00                        none                         1
## 1633   0.00                        none                         2
## 1634   0.00                        none                         2
## 1635  70.00                        none                         0
## 1636  70.00                        none                         0
## 1637  34.65                        none                         2
## 1638  56.00                     parking                         3
## 1639  41.98                     parking                         2
## 1640  40.05                        none                         0
## 1641  61.00                     parking                         2
## 1642  59.40                        none                         0
## 1643  86.00                        none                         3
## 1644  66.43                        none                         1
## 1645  47.00                        none                         0
## 1646 112.29                        none                         1
## 1647  70.00                     parking                         2
## 1648  40.50                        none                         2
## 1649  61.60                        none                         2
## 1650  42.50                        none                         0
## 1651  82.00                     parking                         2
## 1652  81.00                        none                         0
## 1653  60.00                     parking                         2
## 1654  43.93                        none                         0
## 1655  42.50                        none                         1
## 1656  60.00                     parking                         1
## 1657  55.00                     parking                         2
## 1658  40.50                        none                         2
## 1659  40.50                        none                         0
## 1660  55.00                        none                         2
## 1661  36.00                        none                         2
## 1662  55.00                        none                         2
## 1663  55.00                        none                         2
## 1664  81.50                        none                         1
## 1665  56.40                     parking                         1
## 1666  42.50                        none                         2
## 1667  55.43                        none                         0
## 1668  70.31                        none                         0
## 1669 104.67                        none                         0
## 1670  76.00                        none                         2
## 1671  76.00                        none                         2
## 1672  76.00                        none                         2
## 1673  82.00                     parking                         2
## 1674  56.00                        none                         0
## 1675  77.00                        none                         1
## 1676  50.40                        none                         2
## 1677  73.00                     parking                         1
## 1678  72.00                     parking                         1
## 1679  56.00                        none                         0
## 1680  56.00                        none                         2
## 1681   0.00                        none                         1
## 1682  56.00                        none                         2
## 1683  64.00                     parking                         0
## 1684  66.00                        none                         1
## 1685  56.00                        none                         1
## 1686  70.00                     parking                         0
## 1687  34.65                        none                         1
## 1688  58.00                        none                         0
## 1689  34.65                        none                         1
## 1690  44.50                        none                         1
## 1691  44.50                        none                         1
## 1692  38.92                     parking                         1
## 1693 119.43                     parking                         0
## 1694  56.00                        none                         0
## 1695  99.50                        none                         0
## 1696  52.51                        none                         0
## 1697  49.80                        none                         0
## 1698  73.00                     parking                         0
## 1699  96.00                        none                         0
## 1700  47.00                        none                         1
## 1701  56.00                        none                         0
## 1702  66.30                     parking                         1
## 1703  39.00                     parking                         0
## 1704  76.00                        none                         1
## 1705  66.00                        none                         1
## 1706  42.05                        none                         0
## 1707  47.00                        none                         0
## 1708  52.00                        none                         0
## 1709  96.67                        none                         3
## 1710  42.50                        none                         1
## 1711  34.56                        none                         0
## 1712  63.82                        none                         2
## 1713  66.00                     parking                         0
## 1714  67.00                        none                         3
## 1715  36.00                        none                         2
## 1716  44.80                        none                         0
## 1717  69.93                        none                         0
## 1718  47.00                        none                         2
## 1719  75.00                        none                         0
## 1720   0.00                        none                         0
## 1721  54.00                     parking                         0
## 1722  66.00                        none                         2
## 1723  52.20                        none                         0
## 1724  43.20                        none                         1
## 1725  45.00                        none                         0
## 1726  66.00                     parking                         0
## 1727  48.00                     parking                         1
## 1728  45.00                        none                         0
## 1729  49.20                     parking                         1
## 1730  72.50                        none                         2
## 1731  48.00                        none                         1
## 1732  58.00                        none                         2
## 1733  72.50                        none                         2
## 1734  39.00                        none                         1
## 1735  56.00                        none                         1
## 1736  77.00                     parking                         2
## 1737  70.20                        none                         3
## 1738  49.01                        none                         1
## 1739  48.00                     parking                         0
## 1740  48.00                        none                         0
## 1741  77.40                        none                         0
## 1742  48.00                        none                         0
## 1743  63.76                        none                         1
## 1744  69.76                     parking                         1
## 1745  63.76                        none                         1
## 1746  65.19                        none                         1
## 1747  48.00                        none                         0
## 1748  39.00                        none                         0
## 1749  48.00                     parking                         0
## 1750  39.00                     parking                         0
## 1751  35.10                        none                         1
## 1752  41.10                     parking                         1
## 1753  48.00                        none                         1
## 1754  48.00                        none                         2
## 1755  42.00                     parking                         0
## 1756  48.00                        none                         2
## 1757  36.00                        none                         0
## 1758  36.00                        none                         0
## 1759  36.00                        none                         0
## 1760  76.00                     parking                         1
## 1761  48.00                        none                         2
## 1762  56.00                        none                         0
## 1763  48.00                        none                         0
## 1764  36.00                        none                         0
## 1765  36.00                        none                         0
## 1766  56.00                        none                         0
## 1767  42.00                     parking                         1
## 1768  42.00                     parking                         0
## 1769  76.00                        none                         3
## 1770  54.00                     parking                         0
## 1771   0.00                        none                         0
## 1772  36.00                        none                         1
## 1773  72.00                     parking                         1
## 1774  48.00                        none                         1
## 1775  41.45                        none                         1
## 1776  47.45                     parking                         1
## 1777  36.00                        none                         0
## 1778  47.12                        none                         0
## 1779  54.00                        none                         1
## 1780  45.66                        none                         1
## 1781  36.00                        none                         0
## 1782  37.40                        none                         1
## 1783  49.74                        none                         0
## 1784   0.00                        none                         0
## 1785  50.40                        none                         1
## 1786  36.00                        none                         0
## 1787  36.00                        none                         0
## 1788  36.00                        none                         1
## 1789  72.00                     parking                         0
## 1790  44.50                        none                         0
## 1791  49.00                        none                         0
## 1792  36.00                     parking                         0
## 1793  48.00                        none                         1
## 1794  49.00                        none                         0
## 1795  58.00                        none                         1
## 1796  42.00                     parking                         0
## 1797  36.00                     parking                         0
## 1798  36.00                        none                         0
## 1799  44.50                        none                         0
## 1800  36.00                        none                         0
## 1801  37.00                     parking                         0
## 1802  38.81                     parking                         1
## 1803  36.00                        none                         0
## 1804  39.20                        none                         0
## 1805  36.00                        none                         0
## 1806  36.00                        none                         0
## 1807  36.00                     parking                         0
## 1808  49.00                        none                         0
## 1809  36.00                     parking                         1
## 1810  36.00                     parking                         0
## 1811  36.00                     parking                         0
## 1812  88.00                        none                         1
## 1813 114.00                     parking                         1
## 1814  36.00                        none                         1
## 1815  36.00                        none                         0
## 1816  48.00                        none                         0
## 1817  36.00                        none                         1
## 1818  69.00                        none                         1
## 1819  46.65                     parking                         1
## 1820  47.60                        none                         0
## 1821  46.76                        none                         2
## 1822  39.00                        none                         0
## 1823  55.00                        none                         0
## 1824  44.10                        none                         1
## 1825  55.04                        none                         0
## 1826  56.16                        none                         0
## 1827  61.87                        none                         0
## 1828  24.80                        none                         1
## 1829  46.00                        none                         1
## 1830  48.00                        none                         2
## 1831  50.50                        none                         1
## 1832  29.00                        none                         1
## 1833  29.00                        none                         1
## 1834  69.43                        none                         0
## 1835   0.00                        none                         1
## 1836  46.00                     parking                         0
## 1837  58.00                        none                         0
## 1838  42.00                     parking                         1
## 1839  46.00                     parking                         0
## 1840  48.00                     parking                         1
## 1841  40.00                     parking                         1
## 1842  48.00                        none                         0
## 1843  43.20                        none                         2
## 1844  33.30                        none                         0
## 1845  41.40                        none                         0
## 1846  35.00                        none                         0
## 1847  47.60                        none                         0
## 1848  48.90                        none                         1
## 1849  43.20                     parking                         1
## 1850  40.00                        none                         0
## 1851  48.00                        none                         0
## 1852  48.00                        none                         0
## 1853  48.00                        none                         0
## 1854  40.00                        none                         0
## 1855  48.00                        none                         0
## 1856  40.00                        none                         0
## 1857  40.00                        none                         0
## 1858  35.00                        none                         0
## 1859  59.00                        none                         0
## 1860  36.00                        none                         1
## 1861  44.10                        none                         1
## 1862  42.55                        none                         0
## 1863  35.00                        none                         0
## 1864  40.00                        none                         0
## 1865  40.00                        none                         0
## 1866 105.50                        none                         2
## 1867 111.50                     parking                         2
## 1868  36.00                        none                         0
## 1869  54.99                        none                         0
## 1870  43.20                        none                         0
## 1871  44.10                        none                         1
## 1872  36.00                        none                         1
## 1873  70.00                        none                         0
## 1874  93.00                        none                         0
## 1875  26.10                        none                         0
## 1876  54.40                        none                         1
## 1877  57.00                        none                         1
## 1878  77.30                     parking                         0
## 1879  24.80                        none                         2
## 1880  40.00                        none                         0
## 1881  52.20                        none                         0
## 1882  36.00                        none                         0
## 1883  36.00                        none                         0
## 1884  36.00                        none                         0
## 1885  40.00                        none                         0
## 1886  52.20                     parking                         0
## 1887   0.00                        none                         3
## 1888  52.40                     parking                         1
## 1889  30.00                     parking                         1
## 1890  49.00                        none                         0
## 1891  78.00                        none                         1
## 1892 104.00                     parking                         1
## 1893  94.00                     parking                         3
## 1894  62.16                     parking                         0
## 1895  56.16                        none                         0
## 1896  60.30                        none                         2
## 1897  38.47                        none                         0
## 1898  36.00                        none                         0
## 1899  32.40                        none                         0
## 1900  36.00                        none                         0
## 1901  36.00                        none                         0
## 1902  42.00                        none                         0
## 1903  36.00                        none                         0
## 1904  36.00                        none                         0
## 1905  36.00                        none                         0
## 1906  36.75                     parking                         0
## 1907  54.88                        none                         1
## 1908  94.00                     parking                         1
## 1909  74.00                     parking                         0
## 1910  71.33                        none                         0
## 1911  48.00                        none                         0
## 1912  43.20                        none                         0
## 1913  36.00                        none                         0
## 1914  48.00                        none                         0
## 1915  72.29                        none                         0
## 1916  36.00                        none                         0
## 1917  43.20                        none                         0
## 1918   0.00                        none                         1
## 1919  49.00                        none                         2
## 1920  55.00                     parking                         2
## 1921  40.00                        none                         0
## 1922 108.00                     parking                         0
## 1923  48.00                        none                         0
## 1924  88.00                        none                         1
## 1925  35.00                        none                         0
## 1926  77.23                     parking                         1
## 1927  56.16                        none                         1
## 1928  56.16                        none                         1
## 1929  52.20                        none                         2
## 1930  61.20                     parking                         0
## 1931  55.04                        none                         0
## 1932  58.00                        none                         0
## 1933  73.20                     parking                         0
## 1934  79.00                     parking                         0
## 1935  37.00                     parking                         0
## 1936  40.50                     parking                         0
## 1937  53.00                        none                         1
## 1938  27.90                        none                         1
## 1939  73.00                        none                         0
## 1940  85.50                     parking                         1
## 1941  53.00                        none                         1
## 1942  48.00                        none                         0
## 1943  36.00                        none                         0
## 1944  53.00                        none                         1
## 1945  43.20                        none                         0
## 1946  27.90                        none                         1
## 1947  53.00                        none                         1
## 1948  59.00                     parking                         1
## 1949  66.64                        none                         0
## 1950  49.59                        none                         2
## 1951  36.00                        none                         0
## 1952  68.00                        none                         2
## 1953  36.00                        none                         0
## 1954  52.20                        none                         0
## 1955  40.00                        none                         0
## 1956  66.00                     parking                         0
## 1957  40.00                        none                         0
## 1958  40.00                        none                         0
## 1959  40.00                        none                         0
## 1960  40.00                        none                         0
## 1961  40.00                        none                         0
## 1962  68.00                        none                         2
## 1963  78.00                        none                         1
## 1964  40.00                        none                         0
## 1965 104.00                     parking                         0
## 1966  78.00                        none                         1
## 1967  48.00                        none                         0
## 1968  40.00                     parking                         0
## 1969  77.10                     parking                         1
## 1970  36.00                        none                         0
## 1971   0.00                        none                         2
## 1972   0.00                        none                         2
## 1973  43.20                        none                         0
## 1974  78.00                        none                         1
## 1975  78.00                        none                         0
## 1976  78.00                        none                         1
## 1977  51.00                        none                         0
## 1978  58.20                     parking                         0
## 1979  67.99                     parking                         1
## 1980  55.10                        none                         2
## 1981  58.00                        none                         1
## 1982  72.50                     parking                         0
## 1983   0.00                        none                         0
## 1984   0.00                        none                         1
## 1985   0.00                        none                         1
## 1986   0.00                     parking                         1
## 1987  54.00                     parking                         0
## 1988  28.10                        none                         0
## 1989  36.00                     parking                         0
## 1990   4.00                        none                         1
## 1991  69.00                        none                         0
## 1992  69.00                        none                         0
## 1993  69.00                        none                         0
## 1994  69.00                        none                         0
## 1995  69.00                        none                         0
## 1996  69.00                        none                         0
## 1997  69.00                        none                         0
## 1998  49.00                        none                         0
## 1999  69.00                        none                         0
## 2000  69.00                        none                         0
## 2001  69.00                        none                         0
## 2002  71.00                        none                         0
## 2003  69.00                        none                         0
## 2004  18.50                        none                         0
## 2005  69.00                        none                         0
## 2006  69.00                        none                         0
## 2007  69.00                        none                         0
## 2008  69.00                        none                         0
## 2009  69.00                        none                         0
## 2010  69.00                        none                         0
## 2011  69.00                        none                         0
## 2012  69.00                        none                         0
## 2013  69.00                        none                         0
## 2014  69.00                        none                         0
## 2015  69.00                        none                         0
## 2016  26.33                        none                         1
## 2017  47.12                        none                         1
## 2018  26.10                        none                         0
## 2019  86.00                        none                         2
## 2020  98.00                     parking                         0
## 2021  77.60                        none                         1
## 2022  77.60                        none                         1
## 2023  64.00                        none                         0
## 2024  64.00                        none                         0
## 2025  64.00                        none                         0
## 2026  64.00                        none                         0
## 2027  64.00                        none                         0
## 2028  48.00                        none                         0
## 2029  36.45                        none                         1
## 2030  64.00                        none                         0
## 2031  64.00                        none                         0
## 2032  64.00                        none                         0
## 2033  37.00                     parking                         2
## 2034  64.00                        none                         0
## 2035  64.00                        none                         0
## 2036  64.00                        none                         0
## 2037  64.00                        none                         0
## 2038  48.00                        none                         0
## 2039  32.00                        none                         0
## 2040  32.00                        none                         0
## 2041  32.00                        none                         1
## 2042  32.00                        none                         0
## 2043  32.00                        none                         0
## 2044  32.00                        none                         0
## 2045  32.00                        none                         0
## 2046  32.00                        none                         0
## 2047  32.00                        none                         0
## 2048  32.00                        none                         0
## 2049  44.00                        none                         0
## 2050  32.00                        none                         0
## 2051  32.00                        none                         0
## 2052  56.00                        none                         0
## 2053  32.00                        none                         0
## 2054  32.00                        none                         0
## 2055  32.00                        none                         0
## 2056  32.00                        none                         0
## 2057  32.00                        none                         0
## 2058  32.00                        none                         0
## 2059  32.00                        none                         0
## 2060  32.00                        none                         0
## 2061  73.50                     parking                         3
## 2062  56.00                        none                         0
## 2063  54.05                        none                         1
## 2064  73.50                     parking                         3
## 2065  32.00                        none                         0
## 2066  32.00                        none                         0
## 2067  32.00                        none                         0
## 2068  32.00                        none                         0
## 2069  32.00                        none                         0
## 2070  32.00                        none                         0
## 2071  32.00                        none                         0
## 2072  32.00                        none                         0
## 2073  44.00                        none                         0
## 2074  32.00                        none                         0
## 2075  32.00                        none                         0
## 2076  32.00                        none                         0
## 2077  76.00                        none                         1
## 2078  56.00                        none                         0
## 2079  32.00                        none                         0
## 2080  32.00                        none                         0
## 2081  67.50                        none                         2
## 2082  32.00                        none                         0
## 2083  32.00                        none                         0
## 2084  32.00                        none                         0
## 2085  44.00                        none                         0
## 2086  26.00                        none                         0
## 2087   0.00                        none                         1
## 2088   0.00                        none                         1
## 2089  68.53                     parking                         1
## 2090  38.40                        none                         2
## 2091  41.40                     parking                         2
## 2092  49.40                        none                         0
## 2093  32.40                        none                         2
## 2094  46.40                        none                         2
## 2095  36.00                        none                         1
## 2096  36.00                        none                         1
## 2097  36.00                        none                         1
## 2098  36.00                        none                         1
## 2099  36.00                        none                         1
## 2100  36.00                        none                         1
## 2101  46.40                        none                         0
## 2102  64.00                     parking                         1
## 2103  36.00                        none                         1
## 2104  46.50                     parking                         0
## 2105  26.10                        none                         0
## 2106   0.00                        none                         0
## 2107   0.00                        none                         1
## 2108 108.15                        none                         0
## 2109  32.10                     parking                         0
## 2110  83.60                     parking                         1
## 2111   0.00                        none                         0
## 2112  32.40                        none                         1
## 2113  29.16                        none                         1
## 2114   0.00                        none                         2
## 2115  61.20                     parking                         2
## 2116  61.20                        none                         2
## 2117  61.20                        none                         2
## 2118  61.20                        none                         2
## 2119  68.20                        none                         0
## 2120  61.20                        none                         1
## 2121  55.95                     parking                         1
## 2122  33.30                        none                         0
## 2123  87.53                        none                         0
## 2124  49.50                        none                         0
## 2125  30.00                        none                         0
## 2126  41.40                        none                         0
## 2127  52.40                        none                         2
## 2128  49.40                        none                         0
## 2129  52.40                        none                         2
## 2130  35.70                     parking                         0
## 2131   0.00                        none                         0
## 2132  64.00                        none                         0
## 2133  64.00                        none                         0
## 2134  64.00                        none                         0
## 2135  64.00                        none                         0
## 2136  64.00                        none                         0
## 2137  26.00                        none                         0
## 2138  64.00                        none                         0
## 2139  64.00                        none                         0
## 2140  86.40                        none                         0
## 2141  52.00                        none                         0
## 2142  64.00                        none                         0
## 2143  64.00                        none                         0
## 2144  52.00                        none                         0
## 2145  64.00                        none                         0
## 2146  64.00                        none                         0
## 2147  64.00                        none                         0
## 2148   0.00                        none                         0
## 2149  48.40                        none                         2
## 2150  68.45                        none                         2
## 2151  68.45                        none                         2
## 2152  68.00                        none                         0
## 2153  68.00                        none                         0
## 2154  68.00                        none                         0
## 2155  68.00                        none                         0
## 2156  72.50                        none                         2
## 2157  68.00                        none                         0
## 2158  68.00                        none                         0
## 2159  55.92                        none                         1
## 2160  68.45                        none                         2
## 2161  68.45                        none                         2
## 2162  68.00                        none                         0
## 2163  68.00                        none                         0
## 2164 109.00                     parking                         2
## 2165  68.00                        none                         0
## 2166  68.00                        none                         0
## 2167  68.00                        none                         0
## 2168  91.80                        none                         0
## 2169  63.72                        none                         0
## 2170  65.70                        none                         2
## 2171  45.00                        none                         0
## 2172  44.50                        none                         1
## 2173   0.00                        none                         1
## 2174  32.40                        none                         2
## 2175  26.10                        none                         1
## 2176  26.10                        none                         0
## 2177  26.10                        none                         1
## 2178  50.93                        none                         0
## 2179  26.10                        none                         0
## 2180  26.10                        none                         1
## 2181  24.95                        none                         1
## 2182  58.70                        none                         1
## 2183  56.70                        none                         0
## 2184  28.33                        none                         0
## 2185  21.37                        none                         0
## 2186  26.95                        none                         1
## 2187   0.00                        none                         0
## 2188  25.00                        none                         0
## 2189  29.00                     parking                         0
## 2190  38.70                        none                         2
## 2191  37.30                        none                         1
## 2192  45.33                        none                         0
## 2193   0.00                        none                         2
## 2194  56.70                     parking                         2
## 2195  47.00                     parking                         1
## 2196  56.40                     parking                         0
## 2197  46.40                        none                         1
## 2198  40.50                        none                         0
## 2199  48.00                        none                         0
## 2200  58.52                        none                         0
## 2201  58.50                        none                         0
## 2202  46.27                        none                         1
## 2203  24.95                        none                         1
## 2204  85.00                     parking                         1
## 2205  36.00                        none                         0
## 2206  64.14                        none                         1
## 2207  25.11                        none                         1
## 2208  65.57                        none                         1
## 2209  64.14                        none                         1
## 2210  64.14                        none                         1
## 2211  34.79                        none                         0
## 2212  64.14                        none                         1
## 2213  65.57                        none                         1
## 2214  75.57                        none                         1
## 2215  81.29                        none                         1
## 2216  42.57                        none                         0
## 2217  72.14                        none                         1
## 2218  72.14                        none                         1
## 2219  43.57                        none                         2
## 2220  85.20                     parking                         1
## 2221   0.00                        none                         0
## 2222   0.00                        none                         1
## 2223  75.20                        none                         2
## 2224  38.29                        none                         1
## 2225  31.64                        none                         0
## 2226  73.40                        none                         0
## 2227  37.67                        none                         1
## 2228  56.00                     parking                         0
## 2229  82.17                        none                         1
## 2230  31.00                        none                         0
## 2231  27.00                        none                         0
## 2232  44.00                        none                         1
## 2233  43.20                        none                         1
## 2234  45.00                        none                         1
## 2235  47.60                        none                         3
## 2236  51.00                     parking                         0
## 2237  73.10                        none                         2
## 2238  58.00                        none                         1
## 2239  34.33                        none                         1
## 2240  94.36                        none                         1
## 2241  90.07                        none                         0
## 2242  29.96                        none                         0
## 2243  37.29                        none                         1
## 2244  57.29                        none                         2
## 2245  68.55                     parking                         0
## 2246  29.16                        none                         0
## 2247  89.25                        none                         0
## 2248  26.10                        none                         3
## 2249  22.50                        none                         3
## 2250  26.10                        none                         3
## 2251  30.00                        none                         0
## 2252  48.42                        none                         1
## 2253  92.55                        none                         1
## 2254  41.33                        none                         1
## 2255  71.88                     parking                         0
## 2256  33.26                        none                         0
## 2257  39.26                     parking                         1
## 2258 125.51                     parking                         0
## 2259  49.92                        none                         0
## 2260  51.92                        none                         0
## 2261  99.51                        none                         1
## 2262  72.63                        none                         1
## 2263  89.50                     parking                         2
## 2264  81.90                        none                         1
## 2265  73.70                        none                         1
## 2266 204.33                     parking                         1
## 2267 136.50                        none                         0
## 2268 136.50                        none                         0
## 2269 136.50                        none                         0
## 2270 136.50                        none                         0
## 2271 102.60                        none                         2
## 2272 136.50                        none                         0
## 2273 136.50                        none                         0
## 2274  84.50                        none                         0
## 2275   0.00                        none                         0
## 2276 136.50                        none                         0
## 2277 136.50                        none                         0
## 2278 136.50                        none                         0
## 2279 136.50                        none                         0
## 2280 136.50                        none                         0
## 2281 136.50                        none                         0
## 2282   0.00                        none                         0
## 2283 136.50                        none                         0
## 2284 136.50                        none                         0
## 2285 136.50                        none                         0
## 2286 136.50                        none                         0
## 2287 136.50                        none                         0
## 2288   0.00                        none                         0
## 2289 136.50                        none                         0
## 2290  84.50                        none                         0
## 2291  84.50                        none                         0
## 2292   0.00                        none                         0
## 2293 138.50                        none                         0
## 2294 136.50                        none                         0
## 2295 136.50                        none                         0
## 2296 136.50                        none                         0
## 2297 192.25                        none                         0
## 2298 136.50                        none                         0
## 2299 102.60                        none                         2
## 2300 221.20                     parking                         0
## 2301 136.50                        none                         0
## 2302 136.50                        none                         0
## 2303 136.50                        none                         0
## 2304 136.50                        none                         0
## 2305 136.50                        none                         0
## 2306 136.50                        none                         0
## 2307 136.50                        none                         0
## 2308   0.00                        none                         0
## 2309 136.50                        none                         0
## 2310 136.50                        none                         0
## 2311 136.50                        none                         0
## 2312 136.50                        none                         0
## 2313 136.50                        none                         0
## 2314  94.25                        none                         0
## 2315   0.00                        none                         0
## 2316 136.50                        none                         0
## 2317 136.50                        none                         0
## 2318  84.50                        none                         0
## 2319  84.50                        none                         0
## 2320 332.00                     parking                         1
## 2321  73.35                        none                         1
## 2322  66.02                        none                         0
## 2323 136.10                        none                         0
## 2324 103.35                        none                         2
## 2325 154.98                        none                         2
## 2326  92.43                        none                         1
## 2327  95.07                        none                         1
## 2328 160.98                        none                         2
## 2329 169.48                     parking                         0
## 2330 199.73                        none                         3
## 2331 154.98                        none                         0
## 2332  59.18                        none                         2
## 2333  59.18                        none                         2
## 2334  59.18                        none                         2
## 2335  59.94                        none                         1
## 2336 116.10                     parking                         1
## 2337  73.46                        none                         2
## 2338  90.17                        none                         2
## 2339  46.93                        none                         3
## 2340  79.50                     parking                         1
## 2341  41.40                        none                         1
## 2342  47.40                     parking                         1
## 2343  29.00                        none                         0
## 2344  33.30                        none                         0
## 2345  50.40                        none                         1
## 2346  26.10                        none                         0
## 2347  25.92                        none                         1
## 2348   0.00                        none                         1
## 2349  48.00                        none                         0
## 2350  66.98                     parking                         0
## 2351  36.86                        none                         1
## 2352  35.16                     parking                         2
## 2353  31.45                        none                         0
## 2354  29.16                        none                         2
## 2355  75.00                     parking                         0
## 2356  39.00                        none                         1
## 2357  43.20                        none                         1
## 2358  56.10                        none                         1
## 2359  50.54                        none                         0
## 2360  26.00                     parking                         0
## 2361  26.00                        none                         0
## 2362  72.55                        none                         0
## 2363  28.10                        none                         2
## 2364  28.10                        none                         1
## 2365  36.86                        none                         1
## 2366  41.40                        none                         1
## 2367  41.40                        none                         1
## 2368  43.40                        none                         2
## 2369  67.88                     parking                         2
## 2370  50.00                        none                         1
## 2371  50.00                        none                         0
## 2372  50.00                        none                         0
## 2373  50.00                        none                         0
## 2374  50.00                        none                         0
## 2375  50.00                        none                         1
## 2376  50.00                        none                         0
## 2377  50.00                        none                         0
## 2378  50.00                        none                         0
## 2379  52.00                        none                         1
## 2380  30.00                        none                         2
## 2381  61.20                     parking                         0
## 2382  67.20                     parking                         1
## 2383  35.10                        none                         0
## 2384  46.80                        none                         0
## 2385  70.00                        none                         0
## 2386  94.50                        none                         0
## 2387  55.00                        none                         0
## 2388  70.00                        none                         0
## 2389  70.00                        none                         0
## 2390  70.00                        none                         0
## 2391  70.00                        none                         0
## 2392  70.00                        none                         0
## 2393  70.00                        none                         0
## 2394  70.00                        none                         0
## 2395  70.00                        none                         0
## 2396   0.00                        none                         0
## 2397  70.00                        none                         0
## 2398  70.00                        none                         0
## 2399  70.00                        none                         0
## 2400  94.50                        none                         0
## 2401  55.00                        none                         0
## 2402  70.00                        none                         0
## 2403  70.00                        none                         0
## 2404  70.00                        none                         0
## 2405  70.00                        none                         0
## 2406  94.50                        none                         0
## 2407   0.00                        none                         0
## 2408  31.88                        none                         3
## 2409  23.70                        none                         1
## 2410  26.00                        none                         0
## 2411  45.00                     parking                         1
## 2412  61.50                     parking                         2
## 2413  26.10                        none                         1
## 2414  26.10                     parking                         1
## 2415  50.40                        none                         2
## 2416  59.60                        none                         3
## 2417  38.81                        none                         1
## 2418  33.30                        none                         0
## 2419  56.40                     parking                         1
## 2420  23.93                        none                         0
## 2421  83.90                        none                         0
## 2422  22.50                        none                         0
## 2423  38.32                        none                         1
## 2424  63.90                        none                         1
## 2425  63.90                        none                         1
## 2426  65.90                        none                         0
## 2427  24.50                        none                         1
## 2428  22.50                        none                         1
## 2429  68.00                        none                         0
## 2430  25.11                        none                         2
## 2431  64.00                        none                         0
## 2432  64.00                        none                         0
## 2433  64.00                        none                         0
## 2434  64.00                        none                         0
## 2435  64.00                        none                         0
## 2436  64.00                        none                         0
## 2437  64.00                        none                         0
## 2438  64.00                        none                         0
## 2439  64.00                        none                         0
## 2440  64.00                        none                         0
## 2441  64.00                        none                         0
## 2442  64.00                        none                         0
## 2443  64.00                        none                         0
## 2444  64.00                        none                         0
## 2445  64.00                        none                         0
## 2446  64.00                        none                         0
## 2447  64.00                        none                         0
## 2448  64.00                        none                         0
## 2449  64.00                        none                         0
## 2450  64.00                        none                         0
## 2451  64.00                        none                         0
## 2452  64.00                        none                         0
## 2453  31.45                        none                         1
## 2454  30.00                        none                         0
## 2455  26.00                        none                         0
## 2456  63.90                        none                         0
## 2457  40.00                        none                         0
## 2458  41.40                        none                         2
## 2459  41.40                     parking                         2
## 2460  26.10                        none                         0
## 2461  27.81                        none                         0
## 2462  30.00                        none                         0
## 2463  49.40                        none                         0
## 2464  42.45                     parking                         1
## 2465  60.74                        none                         1
## 2466  40.00                        none                         0
## 2467  40.50                        none                         0
## 2468  32.00                     parking                         0
## 2469  40.68                        none                         2
## 2470  33.30                        none                         0
## 2471  61.20                        none                         1
## 2472  25.65                        none                         0
## 2473  42.50                        none                         0
## 2474  67.40                        none                         0
## 2475  73.40                     parking                         0
## 2476  43.25                        none                         1
## 2477  70.91                        none                         0
## 2478  39.27                        none                         2
## 2479  52.68                     parking                         0
## 2480  54.90                        none                         1
## 2481  85.72                        none                         1
## 2482  42.67                        none                         0
## 2483   0.00                        none                         1
## 2484  84.00                        none                         0
## 2485  84.00                        none                         0
## 2486  84.00                        none                         0
## 2487 113.40                        none                         0
## 2488  56.00                        none                         2
## 2489  84.00                        none                         0
## 2490  84.00                        none                         0
## 2491  84.00                        none                         0
## 2492  62.00                        none                         0
## 2493   0.00                        none                         0
## 2494  84.00                        none                         0
## 2495  84.00                        none                         0
## 2496  84.00                        none                         0
## 2497  84.00                        none                         0
## 2498  84.00                        none                         0
## 2499  42.00                        none                         0
## 2500 113.40                        none                         0
## 2501  84.00                        none                         0
## 2502  84.00                        none                         0
## 2503  84.00                        none                         0
## 2504  84.00                        none                         0
## 2505  84.00                        none                         0
## 2506  84.00                        none                         0
## 2507  84.00                        none                         0
## 2508  84.00                        none                         0
## 2509  84.00                        none                         0
## 2510  84.00                        none                         0
## 2511  84.00                        none                         0
## 2512  84.00                        none                         0
## 2513  84.00                        none                         0
## 2514  84.00                        none                         0
## 2515  84.00                        none                         0
## 2516  84.00                        none                         0
## 2517  84.00                        none                         0
## 2518  84.00                        none                         0
## 2519  42.00                        none                         0
## 2520 113.40                        none                         0
## 2521   0.00                        none                         0
## 2522  84.00                        none                         0
## 2523  84.00                        none                         0
## 2524  84.00                        none                         0
## 2525  84.00                        none                         0
## 2526  84.00                        none                         0
## 2527  56.00                        none                         2
## 2528  84.00                        none                         0
## 2529  84.00                        none                         0
## 2530  84.00                        none                         0
## 2531  84.00                        none                         0
## 2532 113.40                        none                         0
## 2533  84.00                        none                         0
## 2534  84.00                        none                         0
## 2535  42.00                        none                         0
## 2536 113.40                        none                         0
## 2537  84.00                        none                         0
## 2538  84.00                        none                         0
## 2539   0.00                        none                         0
## 2540  63.00                        none                         0
## 2541  50.40                        none                         2
## 2542  50.40                        none                         2
## 2543  43.70                        none                         0
## 2544  47.97                        none                         0
## 2545  73.00                        none                         0
## 2546  73.00                        none                         0
## 2547  73.00                        none                         0
## 2548  73.00                        none                         0
## 2549  73.00                        none                         0
## 2550  73.00                        none                         0
## 2551  73.00                        none                         0
## 2552  60.00                        none                         0
## 2553  66.00                        none                         0
## 2554  66.00                        none                         0
## 2555  60.00                        none                         0
## 2556 101.00                        none                         0
## 2557  66.00                     parking                         0
## 2558  83.50                        none                         0
## 2559  66.00                        none                         1
## 2560  88.00                        none                         0
## 2561  66.00                        none                         0
## 2562  53.94                     parking                         0
## 2563  66.00                        none                         0
## 2564  68.00                        none                         0
## 2565  66.00                        none                         1
## 2566  66.00                        none                         1
## 2567   0.00                        none                         0
## 2568  66.00                        none                         0
## 2569  66.00                        none                         0
## 2570  66.00                        none                         0
## 2571  66.00                        none                         0
## 2572  66.00                        none                         0
## 2573  66.00                        none                         0
## 2574  66.00                        none                         0
## 2575  72.00                     parking                         0
## 2576  66.00                        none                         0
## 2577  66.00                        none                         0
## 2578  66.00                        none                         0
## 2579  72.00                     parking                         0
## 2580  66.00                        none                         0
## 2581  66.00                        none                         0
## 2582  66.00                     parking                         0
## 2583  72.00                     parking                         0
## 2584  66.00                        none                         0
## 2585  66.00                        none                         0
## 2586  66.00                        none                         0
## 2587  66.00                        none                         0
## 2588  66.00                        none                         0
## 2589  66.00                        none                         0
## 2590  60.00                        none                         0
## 2591  66.00                        none                         0
## 2592 101.00                        none                         0
## 2593  68.00                     parking                         0
## 2594  83.50                        none                         0
## 2595  72.00                     parking                         0
## 2596  66.00                        none                         0
## 2597  60.00                        none                         0
## 2598  60.00                        none                         0
## 2599  66.00                        none                         0
## 2600  66.00                        none                         0
## 2601 101.00                        none                         0
## 2602  66.00                        none                         0
## 2603  66.00                        none                         0
## 2604  66.00                        none                         0
## 2605  66.00                        none                         0
## 2606  66.00                        none                         0
## 2607  60.00                        none                         0
## 2608  60.00                        none                         0
## 2609  67.50                        none                         0
## 2610  66.00                        none                         0
## 2611  66.00                        none                         0
## 2612  66.00                        none                         0
## 2613  60.00                        none                         0
## 2614  60.00                        none                         0
## 2615  66.00                        none                         0
## 2616  66.00                        none                         0
## 2617  66.00                        none                         0
## 2618  66.00                        none                         0
## 2619  66.00                        none                         0
## 2620  66.00                        none                         0
## 2621  60.00                        none                         0
## 2622  41.40                        none                         0
## 2623  41.40                        none                         0
## 2624  41.40                        none                         0
## 2625  60.20                     parking                         2
## 2626  52.20                        none                         1
## 2627  42.19                        none                         2
## 2628  42.19                        none                         2
## 2629  58.00                        none                         0
## 2630  75.00                        none                         1
## 2631   0.00                        none                         1
## 2632   0.00                        none                         0
## 2633  54.50                        none                         0
## 2634  85.00                        none                         0
## 2635  85.00                        none                         0
## 2636  85.00                        none                         0
## 2637  54.50                        none                         0
## 2638  54.50                        none                         0
## 2639  54.50                        none                         0
## 2640  85.00                        none                         0
## 2641  85.00                        none                         0
## 2642  85.00                        none                         0
## 2643  85.00                        none                         0
## 2644  85.00                        none                         0
## 2645  54.50                        none                         0
## 2646  54.50                        none                         0
## 2647  54.50                        none                         0
## 2648  85.00                        none                         0
## 2649  85.00                        none                         0
## 2650  54.50                        none                         0
## 2651  85.00                        none                         0
## 2652  85.00                        none                         0
## 2653  54.50                        none                         0
## 2654  54.50                        none                         0
## 2655  85.00                        none                         0
## 2656  85.00                        none                         0
## 2657  85.00                        none                         0
## 2658  54.50                        none                         0
## 2659  85.00                        none                         0
## 2660  54.50                        none                         0
## 2661  42.50                        none                         1
## 2662  85.00                        none                         0
## 2663  85.00                        none                         0
## 2664  54.50                        none                         0
## 2665  54.50                        none                         0
## 2666  54.50                        none                         0
## 2667  54.50                        none                         0
## 2668  85.00                        none                         0
## 2669  85.00                        none                         0
## 2670  85.00                        none                         0
## 2671   0.00                        none                         0
## 2672  52.20                        none                         1
## 2673  70.40                        none                         1
## 2674  71.83                        none                         1
## 2675   0.00                        none                         1
## 2676 118.00                        none                         0
## 2677  47.90                        none                         0
## 2678  47.90                        none                         0
## 2679  74.45                        none                         0
## 2680  45.90                        none                         0
## 2681  74.45                        none                         0
## 2682  74.45                        none                         0
## 2683  74.45                        none                         0
## 2684  74.45                        none                         0
## 2685  45.90                        none                         0
## 2686  72.45                        none                         0
## 2687  74.45                        none                         0
## 2688  74.45                        none                         0
## 2689  74.45                        none                         0
## 2690  47.90                        none                         0
## 2691  47.90                        none                         0
## 2692  72.45                        none                         0
## 2693  11.53                        none                         0
## 2694  72.45                        none                         0
## 2695  42.00                     parking                         0
## 2696  52.20                        none                         2
## 2697  52.20                        none                         2
## 2698 108.00                        none                         2
## 2699  52.20                        none                         0
## 2700  62.05                        none                         0
## 2701  85.00                        none                         0
## 2702  85.00                        none                         0
## 2703  54.50                        none                         0
## 2704  42.50                        none                         0
## 2705  85.00                        none                         0
## 2706  54.50                        none                         0
## 2707  54.50                        none                         0
## 2708  85.00                        none                         0
## 2709  54.50                        none                         0
## 2710  85.00                        none                         0
## 2711  85.00                        none                         0
## 2712  85.00                        none                         0
## 2713  85.00                        none                         0
## 2714  85.00                        none                         0
## 2715  85.00                        none                         0
## 2716  85.00                        none                         0
## 2717  54.50                        none                         0
## 2718  54.50                        none                         0
## 2719  85.00                        none                         0
## 2720  54.50                        none                         0
## 2721  54.50                        none                         0
## 2722  85.00                        none                         0
## 2723  54.50                        none                         0
## 2724 102.50                        none                         0
## 2725  85.00                        none                         0
## 2726  54.50                        none                         0
## 2727  54.50                        none                         0
## 2728  54.50                        none                         0
## 2729   0.00                        none                         0
## 2730  67.50                        none                         1
## 2731  80.10                        none                         1
## 2732  37.40                        none                         0
## 2733  58.20                     parking                         1
## 2734  83.00                        none                         1
## 2735  42.50                        none                         1
## 2736  54.50                        none                         0
## 2737  54.50                        none                         0
## 2738  85.00                        none                         0
## 2739  54.50                        none                         0
## 2740  85.00                        none                         0
## 2741  85.00                        none                         0
## 2742  85.00                        none                         0
## 2743  85.00                        none                         0
## 2744  87.00                        none                         0
## 2745  85.00                        none                         0
## 2746  85.00                        none                         0
## 2747   0.00                        none                         0
## 2748  85.00                        none                         0
## 2749  85.00                        none                         0
## 2750  87.00                        none                         0
## 2751  54.50                        none                         0
## 2752  54.50                        none                         0
## 2753  54.50                        none                         0
## 2754  85.00                        none                         0
## 2755  54.50                        none                         0
## 2756  85.00                        none                         0
## 2757  54.50                        none                         0
## 2758  85.00                        none                         0
## 2759  85.00                        none                         0
## 2760  87.00                        none                         0
## 2761  54.50                        none                         0
## 2762  54.50                        none                         0
## 2763  85.00                        none                         0
## 2764  48.80                        none                         1
## 2765  46.80                        none                         1
## 2766  41.40                        none                         0
## 2767  48.80                        none                         1
## 2768  48.80                        none                         1
## 2769  68.42                        none                         1
## 2770  62.05                        none                         2
## 2771  62.05                        none                         2
## 2772  78.56                        none                         0
## 2773  52.98                     parking                         2
## 2774  46.98                        none                         2
## 2775  58.95                        none                         0
## 2776  85.33                        none                         0
## 2777  85.33                        none                         0
## 2778  85.33                        none                         0
## 2779  85.33                        none                         0
## 2780  85.33                        none                         0
## 2781  85.33                        none                         0
## 2782  85.33                        none                         1
## 2783  85.33                        none                         1
## 2784  85.33                        none                         1
## 2785  85.33                        none                         1
## 2786  85.33                        none                         0
## 2787  85.33                        none                         0
## 2788  85.33                        none                         0
## 2789  85.33                        none                         0
## 2790  85.33                        none                         1
## 2791  85.33                        none                         0
## 2792  85.33                        none                         0
## 2793  85.33                        none                         0
## 2794  85.33                        none                         0
## 2795  85.33                        none                         0
## 2796  85.33                        none                         0
## 2797   0.00                        none                         0
## 2798  85.33                        none                         0
## 2799  85.33                        none                         0
## 2800  85.33                        none                         1
## 2801  85.33                        none                         0
## 2802  85.33                        none                         0
## 2803 122.00                        none                         1
## 2804  49.30                        none                         0
## 2805  40.76                        none                         0
## 2806  41.33                        none                         2
## 2807  56.95                        none                         0
## 2808  30.00                        none                         0
## 2809  46.00                        none                         0
## 2810  46.00                        none                         0
## 2811  30.00                        none                         0
## 2812  30.00                        none                         0
## 2813  82.95                        none                         1
## 2814  79.20                        none                         2
## 2815  39.33                        none                         1
## 2816  85.00                        none                         0
## 2817  85.00                        none                         0
## 2818  85.00                        none                         0
## 2819  85.00                        none                         0
## 2820  85.00                        none                         0
## 2821  85.00                        none                         0
## 2822  85.00                        none                         0
## 2823  64.83                        none                         0
## 2824  46.98                        none                         2
## 2825  37.40                        none                         0
## 2826  42.30                        none                         0
## 2827  63.40                        none                         1
## 2828  70.40                        none                         1
## 2829  85.00                        none                         0
## 2830  85.00                        none                         0
## 2831  54.50                        none                         0
## 2832  85.00                        none                         0
## 2833  85.00                        none                         0
## 2834  85.00                        none                         0
## 2835  85.00                        none                         0
## 2836  85.00                        none                         0
## 2837  85.00                        none                         0
## 2838  85.00                        none                         0
## 2839  85.00                        none                         0
## 2840  85.00                        none                         0
## 2841  85.00                        none                         0
## 2842  54.50                        none                         0
## 2843  54.50                        none                         0
## 2844  85.00                        none                         0
## 2845  85.00                        none                         0
## 2846  42.50                        none                         0
## 2847  85.00                        none                         0
## 2848  85.00                        none                         0
## 2849  54.50                        none                         1
## 2850  85.00                        none                         0
## 2851  85.00                        none                         0
## 2852  54.50                        none                         0
## 2853  85.00                        none                         0
## 2854  54.50                        none                         1
## 2855  52.20                        none                         1
## 2856  46.98                        none                         1
## 2857  84.96                        none                         0
## 2858  46.75                        none                         0
## 2859  74.76                        none                         1
## 2860  55.83                        none                         0
## 2861  74.76                        none                         1
## 2862  56.11                        none                         0
## 2863  71.70                     parking                         0
## 2864  48.98                        none                         2
## 2865  64.00                     parking                         2
## 2866  46.98                        none                         2
## 2867  48.98                        none                         2
## 2868  31.45                        none                         0
## 2869  37.40                        none                         0
## 2870   0.00                        none                         0
## 2871  37.56                        none                         0
## 2872  40.76                        none                         1
## 2873  79.20                        none                         1
## 2874  65.40                        none                         0
## 2875  50.59                        none                         1
## 2876  41.62                        none                         1
## 2877  48.75                        none                         0
## 2878  58.95                        none                         0
## 2879  82.96                        none                         1
## 2880  39.95                        none                         0
## 2881  65.70                        none                         2
## 2882  46.00                        none                         0
## 2883  46.00                        none                         0
## 2884  30.00                        none                         0
## 2885  30.00                        none                         0
## 2886  46.00                        none                         0
## 2887  46.00                        none                         0
## 2888  52.20                        none                         0
## 2889  80.16                        none                         0
## 2890  58.00                        none                         0
## 2891  48.00                        none                         0
## 2892  48.00                        none                         0
## 2893  50.00                     parking                         0
## 2894  48.00                        none                         0
## 2895  54.00                     parking                         0
## 2896  48.00                        none                         0
## 2897  48.00                        none                         0
## 2898  48.00                        none                         1
## 2899  48.00                        none                         0
## 2900  50.00                        none                         0
## 2901  48.00                        none                         0
## 2902   0.00                        none                         0
## 2903 118.00                     parking                         2
## 2904 124.00                        none                         2
## 2905  58.95                        none                         2
## 2906  58.95                        none                         2
## 2907   0.00                        none                         0
## 2908  42.00                        none                         0
## 2909  43.19                        none                         2
## 2910  43.76                        none                         2
## 2911  59.93                        none                         0
## 2912  85.00                        none                         0
## 2913  42.50                        none                         1
## 2914  54.50                        none                         0
## 2915  54.50                        none                         0
## 2916  85.00                        none                         1
## 2917  85.00                        none                         0
## 2918  54.50                        none                         0
## 2919  54.50                        none                         0
## 2920  85.00                        none                         0
## 2921  85.00                        none                         0
## 2922  85.00                        none                         0
## 2923  85.00                        none                         0
## 2924  85.00                        none                         0
## 2925  54.50                        none                         0
## 2926  85.00                        none                         0
## 2927  85.00                        none                         0
## 2928  85.00                        none                         0
## 2929  54.50                        none                         1
## 2930  54.50                        none                         0
## 2931  85.00                        none                         0
## 2932  85.00                        none                         0
## 2933  85.00                        none                         0
## 2934  85.00                        none                         0
## 2935  85.00                        none                         0
## 2936  85.00                        none                         0
## 2937  85.00                        none                         0
## 2938  85.00                        none                         0
## 2939  85.00                        none                         0
## 2940  54.50                        none                         0
## 2941   0.00                        none                         0
## 2942  46.40                        none                         0
## 2943  54.00                        none                         1
## 2944  41.40                        none                         2
## 2945  87.00                        none                         0
## 2946  85.00                        none                         0
## 2947  85.00                        none                         0
## 2948  54.50                        none                         0
## 2949  85.00                        none                         0
## 2950  87.00                        none                         0
## 2951  85.00                        none                         0
## 2952  54.50                        none                         0
## 2953  87.00                        none                         0
## 2954  85.00                        none                         0
## 2955  85.00                        none                         0
## 2956   0.00                        none                         0
## 2957  87.00                        none                         0
## 2958  85.00                        none                         0
## 2959  85.00                        none                         0
## 2960  85.00                        none                         0
## 2961  85.00                        none                         0
## 2962  56.50                        none                         0
## 2963  85.00                        none                         0
## 2964  85.00                        none                         0
## 2965  54.50                        none                         0
## 2966  54.50                        none                         0
## 2967  54.50                        none                         0
## 2968  85.00                        none                         0
## 2969  85.00                        none                         0
## 2970  85.00                        none                         0
## 2971  54.50                        none                         0
## 2972  85.00                        none                         0
## 2973  85.00                        none                         0
## 2974  85.00                        none                         0
## 2975  52.20                        none                         2
## 2976  52.20                        none                         2
## 2977  44.45                        none                         0
## 2978  46.75                        none                         1
## 2979  74.76                        none                         0
## 2980  46.75                        none                         1
## 2981  46.98                        none                         2
## 2982  48.08                        none                         1
## 2983  46.98                        none                         2
## 2984  46.98                        none                         2
## 2985  46.98                        none                         2
## 2986  41.75                        none                         0
## 2987  46.40                        none                         1
## 2988  37.40                        none                         2
## 2989  37.40                        none                         2
## 2990   5.25                        none                         0
## 2991  63.36                        none                         0
## 2992  46.98                        none                         1
## 2993   0.00                        none                         2
## 2994  39.83                        none                         0
## 2995  39.83                        none                         0
## 2996  41.33                        none                         2
## 2997  58.95                        none                         0
## 2998  50.02                        none                         1
## 2999  84.96                        none                         0
## 3000 135.60                     parking                         0
## 3001  89.30                     parking                         0
## 3002  65.00                        none                         2
## 3003  66.00                        none                         0
## 3004  76.76                        none                         1
## 3005 113.57                        none                         2
## 3006  74.76                        none                         1
## 3007  50.88                        none                         0
## 3008  72.00                     parking                         0
## 3009  85.20                     parking                         1
## 3010  66.00                        none                         0
## 3011 107.00                        none                         0
## 3012  79.30                        none                         2
## 3013  52.98                     parking                         1
## 3014  68.00                     parking                         0
## 3015  67.60                        none                         0
## 3016  67.67                        none                         0
## 3017  67.67                        none                         1
## 3018  66.00                        none                         0
## 3019  66.00                        none                         0
## 3020  45.00                        none                         0
## 3021  66.00                        none                         1
## 3022  66.00                        none                         0
## 3023  66.00                        none                         0
## 3024  66.00                        none                         0
## 3025  60.00                        none                         0
## 3026  69.00                     parking                         0
## 3027  66.00                        none                         0
## 3028  66.00                        none                         0
## 3029  70.29                     parking                         0
## 3030  71.14                     parking                         0
## 3031  66.75                     parking                         0
## 3032  66.00                        none                         0
## 3033  53.87                        none                         2
## 3034  52.20                        none                         1
## 3035  60.00                        none                         0
## 3036  79.13                        none                         1
## 3037  79.13                        none                         1
## 3038 101.70                        none                         0
## 3039  46.00                        none                         0
## 3040  66.00                        none                         0
## 3041  66.00                        none                         0
## 3042  65.00                        none                         0
## 3043  52.00                     parking                         1
## 3044  66.00                        none                         0
## 3045  66.00                        none                         0
## 3046  46.00                        none                         0
## 3047  65.00                        none                         0
## 3048  40.00                        none                         0
## 3049  71.96                     parking                         1
## 3050  66.00                     parking                         0
## 3051  60.00                        none                         0
## 3052  64.00                     parking                         0
## 3053  60.00                        none                         0
## 3054  96.00                        none                         0
## 3055  72.00                     parking                         0
## 3056  60.00                        none                         0
## 3057  60.00                        none                         0
## 3058 101.00                        none                         0
## 3059  60.00                        none                         0
## 3060  66.00                     parking                         0
## 3061  64.00                        none                         0
## 3062  62.00                        none                         0
## 3063  66.00                        none                         0
## 3064  72.00                     parking                         0
## 3065  66.00                        none                         0
## 3066  66.00                        none                         0
## 3067  60.00                        none                         0
## 3068  66.00                        none                         0
## 3069  68.00                        none                         0
## 3070  60.00                        none                         0
## 3071  60.00                        none                         0
## 3072  66.00                     parking                         0
## 3073  66.00                        none                         0
## 3074  60.00                     parking                         0
## 3075  60.00                        none                         0
## 3076  46.00                        none                         0
## 3077  60.00                        none                         0
## 3078  60.00                     parking                         0
## 3079  72.00                     parking                         0
## 3080  46.50                        none                         0
## 3081  80.00                     parking                         0
## 3082   6.00                     parking                         0
## 3083  60.00                        none                         0
## 3084  60.00                        none                         0
## 3085  60.00                        none                         0
## 3086  60.00                        none                         0
## 3087 115.00                        none                         3
## 3088  43.78                        none                         0
## 3089  87.46                        none                         4
## 3090  87.46                        none                         3
## 3091  60.00                        none                         0
## 3092  59.28                        none                         2
## 3093  62.48                        none                         1
## 3094  57.28                        none                         2
## 3095  57.28                        none                         2
## 3096  62.48                        none                         1
## 3097  42.50                        none                         0
## 3098  85.00                        none                         0
## 3099  85.00                        none                         0
## 3100  85.00                        none                         0
## 3101  54.50                        none                         0
## 3102  54.50                        none                         0
## 3103  54.50                        none                         0
## 3104  54.50                        none                         0
## 3105  85.00                        none                         0
## 3106  85.00                        none                         0
## 3107  54.50                        none                         0
## 3108  85.00                        none                         0
## 3109  54.50                        none                         0
## 3110  54.50                        none                         0
## 3111  87.00                        none                         0
## 3112  46.93                        none                         1
## 3113  85.00                        none                         0
## 3114  85.00                        none                         0
## 3115  85.00                        none                         0
## 3116  82.83                        none                         0
## 3117  52.58                        none                         0
## 3118   0.00                        none                         0
## 3119   0.00                        none                         0
## 3120   0.00                        none                         0
## 3121  66.34                        none                         1
## 3122  68.06                        none                         1
## 3123  66.34                        none                         1
## 3124  58.95                        none                         1
##      reservation_status reservation_status_date arrival_date month_year
## 1             Check-Out              2015-07-01   2015-07-01    2015-07
## 2             Check-Out              2015-07-01   2015-07-01    2015-07
## 3             Check-Out              2015-07-02   2015-07-01    2015-07
## 4             Check-Out              2015-07-02   2015-07-01    2015-07
## 5             Check-Out              2015-07-03   2015-07-01    2015-07
## 6             Check-Out              2015-07-03   2015-07-01    2015-07
## 7             Check-Out              2015-07-03   2015-07-01    2015-07
## 8             Check-Out              2015-07-03   2015-07-01    2015-07
## 9             Check-Out              2015-07-05   2015-07-01    2015-07
## 10            Check-Out              2015-07-05   2015-07-01    2015-07
## 11            Check-Out              2015-07-05   2015-07-01    2015-07
## 12            Check-Out              2015-07-05   2015-07-01    2015-07
## 13            Check-Out              2015-07-05   2015-07-01    2015-07
## 14            Check-Out              2015-07-05   2015-07-01    2015-07
## 15            Check-Out              2015-07-02   2015-07-01    2015-07
## 16            Check-Out              2015-07-02   2015-07-01    2015-07
## 17            Check-Out              2015-07-05   2015-07-01    2015-07
## 18            Check-Out              2015-07-06   2015-07-01    2015-07
## 19            Check-Out              2015-07-07   2015-07-01    2015-07
## 20            Check-Out              2015-07-07   2015-07-01    2015-07
## 21            Check-Out              2015-07-07   2015-07-01    2015-07
## 22            Check-Out              2015-07-01   2015-07-01    2015-07
## 23            Check-Out              2015-07-08   2015-07-01    2015-07
## 24            Check-Out              2015-07-08   2015-07-01    2015-07
## 25            Check-Out              2015-07-08   2015-07-01    2015-07
## 26            Check-Out              2015-07-08   2015-07-01    2015-07
## 27            Check-Out              2015-07-15   2015-07-01    2015-07
## 28            Check-Out              2015-07-16   2015-07-01    2015-07
## 29            Check-Out              2015-07-08   2015-07-02    2015-07
## 30            Check-Out              2015-07-06   2015-07-02    2015-07
## 31            Check-Out              2015-07-06   2015-07-02    2015-07
## 32            Check-Out              2015-07-07   2015-07-02    2015-07
## 33            Check-Out              2015-07-07   2015-07-02    2015-07
## 34            Check-Out              2015-07-07   2015-07-02    2015-07
## 35            Check-Out              2015-07-07   2015-07-02    2015-07
## 36            Check-Out              2015-07-09   2015-07-02    2015-07
## 37            Check-Out              2015-07-09   2015-07-02    2015-07
## 38            Check-Out              2015-07-09   2015-07-02    2015-07
## 39            Check-Out              2015-07-09   2015-07-02    2015-07
## 40            Check-Out              2015-07-09   2015-07-02    2015-07
## 41            Check-Out              2015-07-09   2015-07-02    2015-07
## 42            Check-Out              2015-07-13   2015-07-02    2015-07
## 43            Check-Out              2015-07-16   2015-07-02    2015-07
## 44            Check-Out              2015-07-03   2015-07-02    2015-07
## 45            Check-Out              2015-07-03   2015-07-02    2015-07
## 46            Check-Out              2015-07-03   2015-07-02    2015-07
## 47            Check-Out              2015-07-03   2015-07-02    2015-07
## 48            Check-Out              2015-07-03   2015-07-02    2015-07
## 49            Check-Out              2015-07-03   2015-07-02    2015-07
## 50            Check-Out              2015-07-04   2015-07-02    2015-07
## 51            Check-Out              2015-07-04   2015-07-02    2015-07
## 52            Check-Out              2015-07-04   2015-07-02    2015-07
## 53            Check-Out              2015-07-05   2015-07-02    2015-07
## 54            Check-Out              2015-07-05   2015-07-02    2015-07
## 55            Check-Out              2015-07-05   2015-07-03    2015-07
## 56            Check-Out              2015-07-05   2015-07-03    2015-07
## 57            Check-Out              2015-07-05   2015-07-03    2015-07
## 58            Check-Out              2015-07-05   2015-07-03    2015-07
## 59            Check-Out              2015-07-05   2015-07-03    2015-07
## 60            Check-Out              2015-07-06   2015-07-03    2015-07
## 61            Check-Out              2015-07-07   2015-07-03    2015-07
## 62            Check-Out              2015-07-07   2015-07-03    2015-07
## 63            Check-Out              2015-07-11   2015-07-03    2015-07
## 64            Check-Out              2015-07-12   2015-07-03    2015-07
## 65            Check-Out              2015-07-13   2015-07-03    2015-07
## 66            Check-Out              2015-07-13   2015-07-03    2015-07
## 67            Check-Out              2015-07-17   2015-07-03    2015-07
## 68            Check-Out              2015-07-17   2015-07-03    2015-07
## 69            Check-Out              2015-07-04   2015-07-03    2015-07
## 70            Check-Out              2015-07-04   2015-07-03    2015-07
## 71            Check-Out              2015-07-04   2015-07-03    2015-07
## 72            Check-Out              2015-07-04   2015-07-03    2015-07
## 73            Check-Out              2015-07-04   2015-07-03    2015-07
## 74            Check-Out              2015-07-04   2015-07-03    2015-07
## 75            Check-Out              2015-07-10   2015-07-03    2015-07
## 76            Check-Out              2015-07-10   2015-07-03    2015-07
## 77            Check-Out              2015-07-10   2015-07-03    2015-07
## 78            Check-Out              2015-07-07   2015-07-04    2015-07
## 79            Check-Out              2015-07-07   2015-07-04    2015-07
## 80            Check-Out              2015-07-10   2015-07-04    2015-07
## 81            Check-Out              2015-07-10   2015-07-04    2015-07
## 82            Check-Out              2015-07-11   2015-07-04    2015-07
## 83            Check-Out              2015-07-11   2015-07-04    2015-07
## 84            Check-Out              2015-07-11   2015-07-04    2015-07
## 85            Check-Out              2015-07-11   2015-07-04    2015-07
## 86            Check-Out              2015-07-11   2015-07-04    2015-07
## 87            Check-Out              2015-07-11   2015-07-04    2015-07
## 88            Check-Out              2015-07-12   2015-07-04    2015-07
## 89            Check-Out              2015-07-12   2015-07-04    2015-07
## 90            Check-Out              2015-07-14   2015-07-04    2015-07
## 91            Check-Out              2015-07-14   2015-07-04    2015-07
## 92            Check-Out              2015-07-14   2015-07-04    2015-07
## 93            Check-Out              2015-07-05   2015-07-04    2015-07
## 94            Check-Out              2015-07-05   2015-07-04    2015-07
## 95            Check-Out              2015-07-05   2015-07-04    2015-07
## 96            Check-Out              2015-07-05   2015-07-04    2015-07
## 97            Check-Out              2015-07-06   2015-07-04    2015-07
## 98            Check-Out              2015-07-06   2015-07-04    2015-07
## 99            Check-Out              2015-07-06   2015-07-04    2015-07
## 100           Check-Out              2015-07-06   2015-07-04    2015-07
## 101           Check-Out              2015-07-06   2015-07-05    2015-07
## 102           Check-Out              2015-07-06   2015-07-05    2015-07
## 103           Check-Out              2015-07-06   2015-07-05    2015-07
## 104           Check-Out              2015-07-06   2015-07-05    2015-07
## 105           Check-Out              2015-07-06   2015-07-05    2015-07
## 106           Check-Out              2015-07-06   2015-07-05    2015-07
## 107           Check-Out              2015-07-06   2015-07-05    2015-07
## 108           Check-Out              2015-07-07   2015-07-05    2015-07
## 109           Check-Out              2015-07-07   2015-07-05    2015-07
## 110           Check-Out              2015-07-09   2015-07-05    2015-07
## 111           Check-Out              2015-07-10   2015-07-05    2015-07
## 112           Check-Out              2015-07-10   2015-07-05    2015-07
## 113           Check-Out              2015-07-10   2015-07-05    2015-07
## 114           Check-Out              2015-07-11   2015-07-05    2015-07
## 115           Check-Out              2015-07-11   2015-07-05    2015-07
## 116           Check-Out              2015-07-12   2015-07-05    2015-07
## 117           Check-Out              2015-07-12   2015-07-05    2015-07
## 118           Check-Out              2015-07-12   2015-07-05    2015-07
## 119           Check-Out              2015-07-14   2015-07-05    2015-07
## 120           Check-Out              2015-07-15   2015-07-05    2015-07
## 121           Check-Out              2015-07-15   2015-07-05    2015-07
## 122           Check-Out              2015-07-16   2015-07-05    2015-07
## 123           Check-Out              2015-07-19   2015-07-05    2015-07
## 124           Check-Out              2015-07-19   2015-07-05    2015-07
## 125           Check-Out              2015-07-11   2015-07-06    2015-07
## 126           Check-Out              2015-07-10   2015-07-06    2015-07
## 127           Check-Out              2015-07-10   2015-07-06    2015-07
## 128           Check-Out              2015-07-10   2015-07-06    2015-07
## 129           Check-Out              2015-07-10   2015-07-06    2015-07
## 130           Check-Out              2015-07-10   2015-07-06    2015-07
## 131           Check-Out              2015-07-10   2015-07-06    2015-07
## 132           Check-Out              2015-07-06   2015-07-06    2015-07
## 133           Check-Out              2015-07-06   2015-07-06    2015-07
## 134           Check-Out              2015-07-07   2015-07-06    2015-07
## 135           Check-Out              2015-07-08   2015-07-06    2015-07
## 136           Check-Out              2015-07-08   2015-07-06    2015-07
## 137           Check-Out              2015-07-09   2015-07-06    2015-07
## 138           Check-Out              2015-07-10   2015-07-06    2015-07
## 139           Check-Out              2015-07-10   2015-07-06    2015-07
## 140           Check-Out              2015-07-11   2015-07-06    2015-07
## 141           Check-Out              2015-07-11   2015-07-06    2015-07
## 142           Check-Out              2015-07-12   2015-07-06    2015-07
## 143           Check-Out              2015-07-12   2015-07-06    2015-07
## 144           Check-Out              2015-07-13   2015-07-06    2015-07
## 145           Check-Out              2015-07-13   2015-07-06    2015-07
## 146           Check-Out              2015-07-14   2015-07-06    2015-07
## 147           Check-Out              2015-07-16   2015-07-06    2015-07
## 148           Check-Out              2015-07-16   2015-07-06    2015-07
## 149           Check-Out              2015-07-16   2015-07-06    2015-07
## 150           Check-Out              2015-07-16   2015-07-06    2015-07
## 151           Check-Out              2015-07-17   2015-07-06    2015-07
## 152           Check-Out              2015-07-20   2015-07-06    2015-07
## 153           Check-Out              2015-07-20   2015-07-06    2015-07
## 154           Check-Out              2015-07-13   2015-07-06    2015-07
## 155           Check-Out              2015-07-10   2015-07-07    2015-07
## 156           Check-Out              2015-07-10   2015-07-07    2015-07
## 157           Check-Out              2015-07-07   2015-07-07    2015-07
## 158           Check-Out              2015-07-07   2015-07-07    2015-07
## 159           Check-Out              2015-07-08   2015-07-07    2015-07
## 160           Check-Out              2015-07-08   2015-07-07    2015-07
## 161           Check-Out              2015-07-08   2015-07-07    2015-07
## 162           Check-Out              2015-07-11   2015-07-07    2015-07
## 163           Check-Out              2015-07-11   2015-07-07    2015-07
## 164           Check-Out              2015-07-11   2015-07-07    2015-07
## 165           Check-Out              2015-07-11   2015-07-07    2015-07
## 166           Check-Out              2015-07-14   2015-07-07    2015-07
## 167           Check-Out              2015-07-21   2015-07-07    2015-07
## 168           Check-Out              2015-07-11   2015-07-08    2015-07
## 169           Check-Out              2015-07-12   2015-07-08    2015-07
## 170           Check-Out              2015-07-12   2015-07-08    2015-07
## 171           Check-Out              2015-07-12   2015-07-08    2015-07
## 172           Check-Out              2015-07-12   2015-07-08    2015-07
## 173           Check-Out              2015-07-09   2015-07-08    2015-07
## 174           Check-Out              2015-07-10   2015-07-08    2015-07
## 175           Check-Out              2015-07-14   2015-07-08    2015-07
## 176           Check-Out              2015-07-15   2015-07-08    2015-07
## 177           Check-Out              2015-07-15   2015-07-08    2015-07
## 178           Check-Out              2015-07-15   2015-07-08    2015-07
## 179           Check-Out              2015-07-16   2015-07-08    2015-07
## 180           Check-Out              2015-07-17   2015-07-08    2015-07
## 181           Check-Out              2015-07-17   2015-07-08    2015-07
## 182           Check-Out              2015-07-10   2015-07-09    2015-07
## 183           Check-Out              2015-07-11   2015-07-09    2015-07
## 184           Check-Out              2015-07-11   2015-07-09    2015-07
## 185           Check-Out              2015-07-12   2015-07-09    2015-07
## 186           Check-Out              2015-07-13   2015-07-09    2015-07
## 187           Check-Out              2015-07-14   2015-07-09    2015-07
## 188           Check-Out              2015-07-14   2015-07-09    2015-07
## 189           Check-Out              2015-07-16   2015-07-09    2015-07
## 190           Check-Out              2015-07-16   2015-07-09    2015-07
## 191           Check-Out              2015-07-16   2015-07-09    2015-07
## 192           Check-Out              2015-07-16   2015-07-09    2015-07
## 193           Check-Out              2015-07-16   2015-07-09    2015-07
## 194           Check-Out              2015-07-11   2015-07-10    2015-07
## 195           Check-Out              2015-07-12   2015-07-10    2015-07
## 196           Check-Out              2015-07-12   2015-07-10    2015-07
## 197           Check-Out              2015-07-12   2015-07-10    2015-07
## 198           Check-Out              2015-07-12   2015-07-10    2015-07
## 199           Check-Out              2015-07-12   2015-07-10    2015-07
## 200           Check-Out              2015-07-12   2015-07-10    2015-07
## 201           Check-Out              2015-07-12   2015-07-10    2015-07
## 202           Check-Out              2015-07-12   2015-07-10    2015-07
## 203           Check-Out              2015-07-13   2015-07-10    2015-07
## 204           Check-Out              2015-07-13   2015-07-10    2015-07
## 205           Check-Out              2015-07-13   2015-07-10    2015-07
## 206           Check-Out              2015-07-14   2015-07-10    2015-07
## 207           Check-Out              2015-07-14   2015-07-10    2015-07
## 208           Check-Out              2015-07-15   2015-07-10    2015-07
## 209           Check-Out              2015-07-15   2015-07-10    2015-07
## 210           Check-Out              2015-07-15   2015-07-10    2015-07
## 211           Check-Out              2015-07-17   2015-07-10    2015-07
## 212           Check-Out              2015-07-17   2015-07-10    2015-07
## 213           Check-Out              2015-07-17   2015-07-10    2015-07
## 214           Check-Out              2015-07-17   2015-07-10    2015-07
## 215           Check-Out              2015-07-17   2015-07-10    2015-07
## 216           Check-Out              2015-07-17   2015-07-10    2015-07
## 217           Check-Out              2015-07-17   2015-07-10    2015-07
## 218           Check-Out              2015-07-18   2015-07-10    2015-07
## 219           Check-Out              2015-07-19   2015-07-10    2015-07
## 220           Check-Out              2015-07-20   2015-07-10    2015-07
## 221           Check-Out              2015-07-21   2015-07-10    2015-07
## 222           Check-Out              2015-07-23   2015-07-10    2015-07
## 223           Check-Out              2015-07-17   2015-07-10    2015-07
## 224           Check-Out              2015-07-17   2015-07-10    2015-07
## 225           Check-Out              2015-07-16   2015-07-11    2015-07
## 226           Check-Out              2015-07-17   2015-07-11    2015-07
## 227           Check-Out              2015-07-17   2015-07-11    2015-07
## 228           Check-Out              2015-07-17   2015-07-11    2015-07
## 229           Check-Out              2015-07-18   2015-07-11    2015-07
## 230           Check-Out              2015-07-15   2015-07-11    2015-07
## 231           Check-Out              2015-07-15   2015-07-11    2015-07
## 232           Check-Out              2015-07-15   2015-07-11    2015-07
## 233           Check-Out              2015-07-12   2015-07-11    2015-07
## 234           Check-Out              2015-07-12   2015-07-11    2015-07
## 235           Check-Out              2015-07-12   2015-07-11    2015-07
## 236           Check-Out              2015-07-12   2015-07-11    2015-07
## 237           Check-Out              2015-07-13   2015-07-11    2015-07
## 238           Check-Out              2015-07-13   2015-07-11    2015-07
## 239           Check-Out              2015-07-13   2015-07-11    2015-07
## 240           Check-Out              2015-07-14   2015-07-11    2015-07
## 241           Check-Out              2015-07-14   2015-07-11    2015-07
## 242           Check-Out              2015-07-18   2015-07-11    2015-07
## 243           Check-Out              2015-07-18   2015-07-11    2015-07
## 244           Check-Out              2015-07-19   2015-07-11    2015-07
## 245           Check-Out              2015-07-21   2015-07-11    2015-07
## 246           Check-Out              2015-07-18   2015-07-11    2015-07
## 247           Check-Out              2015-07-18   2015-07-11    2015-07
## 248           Check-Out              2015-07-13   2015-07-12    2015-07
## 249           Check-Out              2015-07-13   2015-07-12    2015-07
## 250           Check-Out              2015-07-18   2015-07-12    2015-07
## 251           Check-Out              2015-07-19   2015-07-12    2015-07
## 252           Check-Out              2015-07-19   2015-07-12    2015-07
## 253           Check-Out              2015-07-12   2015-07-12    2015-07
## 254           Check-Out              2015-07-19   2015-07-12    2015-07
## 255           Check-Out              2015-07-19   2015-07-12    2015-07
## 256           Check-Out              2015-07-19   2015-07-12    2015-07
## 257           Check-Out              2015-07-19   2015-07-12    2015-07
## 258           Check-Out              2015-07-19   2015-07-12    2015-07
## 259           Check-Out              2015-07-19   2015-07-12    2015-07
## 260           Check-Out              2015-07-19   2015-07-12    2015-07
## 261           Check-Out              2015-07-21   2015-07-12    2015-07
## 262           Check-Out              2015-07-21   2015-07-12    2015-07
## 263           Check-Out              2015-07-23   2015-07-12    2015-07
## 264           Check-Out              2015-07-23   2015-07-12    2015-07
## 265           Check-Out              2015-07-19   2015-07-12    2015-07
## 266           Check-Out              2015-07-13   2015-07-12    2015-07
## 267           Check-Out              2015-07-14   2015-07-12    2015-07
## 268           Check-Out              2015-07-14   2015-07-12    2015-07
## 269           Check-Out              2015-07-14   2015-07-12    2015-07
## 270           Check-Out              2015-07-14   2015-07-12    2015-07
## 271           Check-Out              2015-07-14   2015-07-12    2015-07
## 272           Check-Out              2015-07-15   2015-07-12    2015-07
## 273           Check-Out              2015-07-15   2015-07-12    2015-07
## 274           Check-Out              2015-07-16   2015-07-12    2015-07
## 275           Check-Out              2015-07-16   2015-07-12    2015-07
## 276           Check-Out              2015-07-16   2015-07-12    2015-07
## 277           Check-Out              2015-07-17   2015-07-12    2015-07
## 278           Check-Out              2015-07-17   2015-07-12    2015-07
## 279           Check-Out              2015-07-17   2015-07-12    2015-07
## 280           Check-Out              2015-07-20   2015-07-13    2015-07
## 281           Check-Out              2015-07-20   2015-07-13    2015-07
## 282           Check-Out              2015-07-20   2015-07-13    2015-07
## 283           Check-Out              2015-07-15   2015-07-13    2015-07
## 284           Check-Out              2015-07-15   2015-07-13    2015-07
## 285           Check-Out              2015-07-15   2015-07-13    2015-07
## 286           Check-Out              2015-07-15   2015-07-13    2015-07
## 287           Check-Out              2015-07-15   2015-07-13    2015-07
## 288           Check-Out              2015-07-15   2015-07-13    2015-07
## 289           Check-Out              2015-07-15   2015-07-13    2015-07
## 290           Check-Out              2015-07-16   2015-07-13    2015-07
## 291           Check-Out              2015-07-16   2015-07-13    2015-07
## 292           Check-Out              2015-07-16   2015-07-13    2015-07
## 293           Check-Out              2015-07-16   2015-07-13    2015-07
## 294           Check-Out              2015-07-16   2015-07-13    2015-07
## 295           Check-Out              2015-07-17   2015-07-13    2015-07
## 296           Check-Out              2015-07-18   2015-07-13    2015-07
## 297           Check-Out              2015-07-18   2015-07-13    2015-07
## 298           Check-Out              2015-07-18   2015-07-13    2015-07
## 299           Check-Out              2015-07-18   2015-07-13    2015-07
## 300           Check-Out              2015-07-18   2015-07-13    2015-07
## 301           Check-Out              2015-07-19   2015-07-13    2015-07
## 302           Check-Out              2015-07-19   2015-07-13    2015-07
## 303           Check-Out              2015-07-20   2015-07-13    2015-07
## 304           Check-Out              2015-07-20   2015-07-13    2015-07
## 305           Check-Out              2015-07-20   2015-07-13    2015-07
## 306           Check-Out              2015-07-14   2015-07-13    2015-07
## 307           Check-Out              2015-07-17   2015-07-13    2015-07
## 308           Check-Out              2015-07-21   2015-07-13    2015-07
## 309           Check-Out              2015-07-22   2015-07-13    2015-07
## 310           Check-Out              2015-07-15   2015-07-14    2015-07
## 311           Check-Out              2015-07-15   2015-07-14    2015-07
## 312           Check-Out              2015-07-16   2015-07-14    2015-07
## 313           Check-Out              2015-07-18   2015-07-14    2015-07
## 314           Check-Out              2015-07-19   2015-07-14    2015-07
## 315           Check-Out              2015-07-19   2015-07-14    2015-07
## 316           Check-Out              2015-07-20   2015-07-14    2015-07
## 317           Check-Out              2015-07-20   2015-07-14    2015-07
## 318           Check-Out              2015-07-20   2015-07-14    2015-07
## 319           Check-Out              2015-07-21   2015-07-14    2015-07
## 320           Check-Out              2015-07-21   2015-07-14    2015-07
## 321           Check-Out              2015-07-23   2015-07-14    2015-07
## 322           Check-Out              2015-07-25   2015-07-14    2015-07
## 323           Check-Out              2015-07-28   2015-07-14    2015-07
## 324           Check-Out              2015-07-28   2015-07-14    2015-07
## 325           Check-Out              2015-07-29   2015-07-14    2015-07
## 326           Check-Out              2015-07-15   2015-07-14    2015-07
## 327           Check-Out              2015-07-21   2015-07-15    2015-07
## 328           Check-Out              2015-07-23   2015-07-15    2015-07
## 329           Check-Out              2015-07-17   2015-07-15    2015-07
## 330           Check-Out              2015-07-17   2015-07-15    2015-07
## 331           Check-Out              2015-07-17   2015-07-15    2015-07
## 332           Check-Out              2015-07-17   2015-07-15    2015-07
## 333           Check-Out              2015-07-17   2015-07-15    2015-07
## 334           Check-Out              2015-07-24   2015-07-15    2015-07
## 335           Check-Out              2015-07-17   2015-07-15    2015-07
## 336           Check-Out              2015-07-17   2015-07-15    2015-07
## 337           Check-Out              2015-07-17   2015-07-15    2015-07
## 338           Check-Out              2015-07-17   2015-07-15    2015-07
## 339           Check-Out              2015-07-17   2015-07-15    2015-07
## 340           Check-Out              2015-07-17   2015-07-15    2015-07
## 341           Check-Out              2015-07-17   2015-07-15    2015-07
## 342           Check-Out              2015-07-17   2015-07-15    2015-07
## 343           Check-Out              2015-07-17   2015-07-15    2015-07
## 344           Check-Out              2015-07-17   2015-07-15    2015-07
## 345           Check-Out              2015-07-17   2015-07-15    2015-07
## 346           Check-Out              2015-07-17   2015-07-15    2015-07
## 347           Check-Out              2015-07-17   2015-07-15    2015-07
## 348           Check-Out              2015-07-17   2015-07-15    2015-07
## 349           Check-Out              2015-07-18   2015-07-16    2015-07
## 350           Check-Out              2015-07-17   2015-07-16    2015-07
## 351           Check-Out              2015-07-17   2015-07-16    2015-07
## 352           Check-Out              2015-07-18   2015-07-16    2015-07
## 353           Check-Out              2015-07-18   2015-07-16    2015-07
## 354           Check-Out              2015-07-18   2015-07-16    2015-07
## 355           Check-Out              2015-07-19   2015-07-16    2015-07
## 356           Check-Out              2015-07-19   2015-07-16    2015-07
## 357           Check-Out              2015-07-21   2015-07-16    2015-07
## 358           Check-Out              2015-07-21   2015-07-16    2015-07
## 359           Check-Out              2015-07-20   2015-07-16    2015-07
## 360           Check-Out              2015-07-22   2015-07-16    2015-07
## 361           Check-Out              2015-07-23   2015-07-16    2015-07
## 362           Check-Out              2015-07-24   2015-07-16    2015-07
## 363           Check-Out              2015-07-30   2015-07-16    2015-07
## 364           Check-Out              2015-07-17   2015-07-17    2015-07
## 365           Check-Out              2015-07-19   2015-07-17    2015-07
## 366           Check-Out              2015-07-19   2015-07-17    2015-07
## 367           Check-Out              2015-07-19   2015-07-17    2015-07
## 368           Check-Out              2015-07-19   2015-07-17    2015-07
## 369           Check-Out              2015-07-19   2015-07-17    2015-07
## 370           Check-Out              2015-07-19   2015-07-17    2015-07
## 371           Check-Out              2015-07-19   2015-07-17    2015-07
## 372           Check-Out              2015-07-19   2015-07-17    2015-07
## 373           Check-Out              2015-07-19   2015-07-17    2015-07
## 374           Check-Out              2015-07-22   2015-07-17    2015-07
## 375           Check-Out              2015-07-22   2015-07-17    2015-07
## 376           Check-Out              2015-07-22   2015-07-17    2015-07
## 377           Check-Out              2015-07-22   2015-07-17    2015-07
## 378           Check-Out              2015-07-22   2015-07-17    2015-07
## 379           Check-Out              2015-07-22   2015-07-17    2015-07
## 380           Check-Out              2015-07-22   2015-07-17    2015-07
## 381           Check-Out              2015-07-22   2015-07-17    2015-07
## 382           Check-Out              2015-07-22   2015-07-17    2015-07
## 383           Check-Out              2015-07-23   2015-07-17    2015-07
## 384           Check-Out              2015-07-24   2015-07-17    2015-07
## 385           Check-Out              2015-07-24   2015-07-17    2015-07
## 386           Check-Out              2015-07-24   2015-07-17    2015-07
## 387           Check-Out              2015-07-24   2015-07-17    2015-07
## 388           Check-Out              2015-07-24   2015-07-17    2015-07
## 389           Check-Out              2015-07-24   2015-07-17    2015-07
## 390           Check-Out              2015-07-25   2015-07-17    2015-07
## 391           Check-Out              2015-07-25   2015-07-17    2015-07
## 392           Check-Out              2015-07-25   2015-07-17    2015-07
## 393           Check-Out              2015-07-27   2015-07-17    2015-07
## 394           Check-Out              2015-07-20   2015-07-17    2015-07
## 395           Check-Out              2015-07-20   2015-07-17    2015-07
## 396           Check-Out              2015-07-20   2015-07-17    2015-07
## 397           Check-Out              2015-07-20   2015-07-17    2015-07
## 398           Check-Out              2015-07-20   2015-07-17    2015-07
## 399           Check-Out              2015-07-20   2015-07-17    2015-07
## 400           Check-Out              2015-07-20   2015-07-17    2015-07
## 401           Check-Out              2015-07-20   2015-07-17    2015-07
## 402           Check-Out              2015-07-20   2015-07-17    2015-07
## 403           Check-Out              2015-07-20   2015-07-17    2015-07
## 404           Check-Out              2015-07-21   2015-07-17    2015-07
## 405           Check-Out              2015-07-21   2015-07-18    2015-07
## 406           Check-Out              2015-07-24   2015-07-18    2015-07
## 407           Check-Out              2015-07-24   2015-07-18    2015-07
## 408           Check-Out              2015-07-25   2015-07-18    2015-07
## 409           Check-Out              2015-07-25   2015-07-18    2015-07
## 410           Check-Out              2015-07-22   2015-07-18    2015-07
## 411           Check-Out              2015-07-22   2015-07-18    2015-07
## 412           Check-Out              2015-07-23   2015-07-18    2015-07
## 413           Check-Out              2015-07-23   2015-07-18    2015-07
## 414           Check-Out              2015-07-23   2015-07-18    2015-07
## 415           Check-Out              2015-07-19   2015-07-18    2015-07
## 416           Check-Out              2015-07-19   2015-07-18    2015-07
## 417           Check-Out              2015-07-20   2015-07-18    2015-07
## 418           Check-Out              2015-07-21   2015-07-18    2015-07
## 419           Check-Out              2015-07-25   2015-07-18    2015-07
## 420           Check-Out              2015-07-25   2015-07-18    2015-07
## 421           Check-Out              2015-07-25   2015-07-18    2015-07
## 422           Check-Out              2015-07-25   2015-07-18    2015-07
## 423           Check-Out              2015-07-25   2015-07-18    2015-07
## 424           Check-Out              2015-07-25   2015-07-18    2015-07
## 425           Check-Out              2015-07-25   2015-07-18    2015-07
## 426           Check-Out              2015-07-26   2015-07-18    2015-07
## 427           Check-Out              2015-07-26   2015-07-18    2015-07
## 428           Check-Out              2015-08-01   2015-07-18    2015-07
## 429           Check-Out              2015-07-20   2015-07-19    2015-07
## 430           Check-Out              2015-07-20   2015-07-19    2015-07
## 431           Check-Out              2015-07-20   2015-07-19    2015-07
## 432           Check-Out              2015-07-20   2015-07-19    2015-07
## 433           Check-Out              2015-07-20   2015-07-19    2015-07
## 434           Check-Out              2015-07-21   2015-07-19    2015-07
## 435           Check-Out              2015-07-23   2015-07-19    2015-07
## 436           Check-Out              2015-07-24   2015-07-19    2015-07
## 437           Check-Out              2015-07-26   2015-07-19    2015-07
## 438           Check-Out              2015-07-26   2015-07-19    2015-07
## 439           Check-Out              2015-07-26   2015-07-19    2015-07
## 440           Check-Out              2015-07-26   2015-07-19    2015-07
## 441           Check-Out              2015-07-25   2015-07-19    2015-07
## 442           Check-Out              2015-07-26   2015-07-19    2015-07
## 443           Check-Out              2015-07-26   2015-07-19    2015-07
## 444           Check-Out              2015-07-29   2015-07-19    2015-07
## 445           Check-Out              2015-08-02   2015-07-19    2015-07
## 446           Check-Out              2015-07-25   2015-07-19    2015-07
## 447           Check-Out              2015-07-21   2015-07-20    2015-07
## 448           Check-Out              2015-07-20   2015-07-20    2015-07
## 449           Check-Out              2015-07-20   2015-07-20    2015-07
## 450           Check-Out              2015-07-24   2015-07-20    2015-07
## 451           Check-Out              2015-07-24   2015-07-20    2015-07
## 452           Check-Out              2015-07-24   2015-07-20    2015-07
## 453           Check-Out              2015-07-24   2015-07-20    2015-07
## 454           Check-Out              2015-07-24   2015-07-20    2015-07
## 455           Check-Out              2015-07-25   2015-07-20    2015-07
## 456           Check-Out              2015-07-26   2015-07-20    2015-07
## 457           Check-Out              2015-07-27   2015-07-20    2015-07
## 458           Check-Out              2015-07-27   2015-07-20    2015-07
## 459           Check-Out              2015-07-27   2015-07-20    2015-07
## 460           Check-Out              2015-07-27   2015-07-20    2015-07
## 461           Check-Out              2015-07-27   2015-07-20    2015-07
## 462           Check-Out              2015-07-27   2015-07-20    2015-07
## 463           Check-Out              2015-07-30   2015-07-20    2015-07
## 464           Check-Out              2015-07-30   2015-07-20    2015-07
## 465           Check-Out              2015-07-30   2015-07-20    2015-07
## 466           Check-Out              2015-07-23   2015-07-21    2015-07
## 467           Check-Out              2015-07-25   2015-07-21    2015-07
## 468           Check-Out              2015-07-26   2015-07-21    2015-07
## 469           Check-Out              2015-07-27   2015-07-21    2015-07
## 470           Check-Out              2015-07-28   2015-07-21    2015-07
## 471           Check-Out              2015-07-28   2015-07-21    2015-07
## 472           Check-Out              2015-07-29   2015-07-21    2015-07
## 473           Check-Out              2015-07-30   2015-07-21    2015-07
## 474           Check-Out              2015-07-31   2015-07-21    2015-07
## 475           Check-Out              2015-07-23   2015-07-22    2015-07
## 476           Check-Out              2015-07-26   2015-07-22    2015-07
## 477           Check-Out              2015-07-23   2015-07-23    2015-07
## 478           Check-Out              2015-07-23   2015-07-23    2015-07
## 479           Check-Out              2015-07-24   2015-07-23    2015-07
## 480           Check-Out              2015-07-24   2015-07-23    2015-07
## 481           Check-Out              2015-07-26   2015-07-23    2015-07
## 482           Check-Out              2015-07-26   2015-07-23    2015-07
## 483           Check-Out              2015-07-28   2015-07-23    2015-07
## 484           Check-Out              2015-07-31   2015-07-23    2015-07
## 485           Check-Out              2015-07-26   2015-07-24    2015-07
## 486           Check-Out              2015-07-26   2015-07-24    2015-07
## 487           Check-Out              2015-07-26   2015-07-24    2015-07
## 488           Check-Out              2015-07-26   2015-07-24    2015-07
## 489           Check-Out              2015-07-26   2015-07-24    2015-07
## 490           Check-Out              2015-07-26   2015-07-24    2015-07
## 491           Check-Out              2015-07-26   2015-07-24    2015-07
## 492           Check-Out              2015-07-26   2015-07-24    2015-07
## 493           Check-Out              2015-07-26   2015-07-24    2015-07
## 494           Check-Out              2015-07-27   2015-07-24    2015-07
## 495           Check-Out              2015-07-26   2015-07-24    2015-07
## 496           Check-Out              2015-07-28   2015-07-24    2015-07
## 497           Check-Out              2015-07-28   2015-07-24    2015-07
## 498           Check-Out              2015-07-29   2015-07-24    2015-07
## 499           Check-Out              2015-07-29   2015-07-24    2015-07
## 500           Check-Out              2015-07-31   2015-07-24    2015-07
## 501           Check-Out              2015-08-01   2015-07-24    2015-07
## 502           Check-Out              2015-08-02   2015-07-24    2015-07
## 503           Check-Out              2015-08-03   2015-07-24    2015-07
## 504           Check-Out              2015-07-25   2015-07-25    2015-07
## 505           Check-Out              2015-07-28   2015-07-25    2015-07
## 506           Check-Out              2015-07-26   2015-07-25    2015-07
## 507           Check-Out              2015-07-26   2015-07-25    2015-07
## 508           Check-Out              2015-07-26   2015-07-25    2015-07
## 509           Check-Out              2015-07-27   2015-07-25    2015-07
## 510           Check-Out              2015-07-27   2015-07-25    2015-07
## 511           Check-Out              2015-07-28   2015-07-25    2015-07
## 512           Check-Out              2015-07-29   2015-07-25    2015-07
## 513           Check-Out              2015-07-30   2015-07-25    2015-07
## 514           Check-Out              2015-07-30   2015-07-25    2015-07
## 515           Check-Out              2015-07-30   2015-07-25    2015-07
## 516           Check-Out              2015-07-30   2015-07-25    2015-07
## 517           Check-Out              2015-07-30   2015-07-25    2015-07
## 518           Check-Out              2015-07-31   2015-07-25    2015-07
## 519           Check-Out              2015-08-01   2015-07-25    2015-07
## 520           Check-Out              2015-08-01   2015-07-25    2015-07
## 521           Check-Out              2015-08-01   2015-07-25    2015-07
## 522           Check-Out              2015-08-01   2015-07-25    2015-07
## 523           Check-Out              2015-08-01   2015-07-25    2015-07
## 524           Check-Out              2015-08-02   2015-07-25    2015-07
## 525           Check-Out              2015-08-02   2015-07-25    2015-07
## 526           Check-Out              2015-08-04   2015-07-25    2015-07
## 527           Check-Out              2015-08-06   2015-07-25    2015-07
## 528           Check-Out              2015-08-01   2015-07-25    2015-07
## 529           Check-Out              2015-08-01   2015-07-25    2015-07
## 530           Check-Out              2015-07-29   2015-07-26    2015-07
## 531           Check-Out              2015-07-29   2015-07-26    2015-07
## 532           Check-Out              2015-07-31   2015-07-26    2015-07
## 533           Check-Out              2015-08-02   2015-07-26    2015-07
## 534           Check-Out              2015-07-28   2015-07-26    2015-07
## 535           Check-Out              2015-08-02   2015-07-26    2015-07
## 536           Check-Out              2015-08-02   2015-07-26    2015-07
## 537           Check-Out              2015-07-27   2015-07-27    2015-07
## 538           Check-Out              2015-07-29   2015-07-27    2015-07
## 539           Check-Out              2015-07-30   2015-07-27    2015-07
## 540           Check-Out              2015-07-30   2015-07-27    2015-07
## 541           Check-Out              2015-07-30   2015-07-27    2015-07
## 542           Check-Out              2015-07-30   2015-07-27    2015-07
## 543           Check-Out              2015-07-31   2015-07-27    2015-07
## 544           Check-Out              2015-07-31   2015-07-27    2015-07
## 545           Check-Out              2015-07-31   2015-07-27    2015-07
## 546           Check-Out              2015-07-31   2015-07-27    2015-07
## 547           Check-Out              2015-07-31   2015-07-27    2015-07
## 548           Check-Out              2015-07-31   2015-07-27    2015-07
## 549           Check-Out              2015-07-31   2015-07-27    2015-07
## 550           Check-Out              2015-07-31   2015-07-27    2015-07
## 551           Check-Out              2015-07-31   2015-07-27    2015-07
## 552           Check-Out              2015-07-31   2015-07-27    2015-07
## 553           Check-Out              2015-08-01   2015-07-27    2015-07
## 554           Check-Out              2015-08-01   2015-07-27    2015-07
## 555           Check-Out              2015-08-01   2015-07-27    2015-07
## 556           Check-Out              2015-08-02   2015-07-27    2015-07
## 557           Check-Out              2015-08-02   2015-07-27    2015-07
## 558           Check-Out              2015-08-03   2015-07-27    2015-07
## 559           Check-Out              2015-08-03   2015-07-27    2015-07
## 560           Check-Out              2015-07-29   2015-07-28    2015-07
## 561           Check-Out              2015-07-29   2015-07-28    2015-07
## 562           Check-Out              2015-07-30   2015-07-28    2015-07
## 563           Check-Out              2015-08-01   2015-07-28    2015-07
## 564           Check-Out              2015-08-01   2015-07-28    2015-07
## 565           Check-Out              2015-08-01   2015-07-28    2015-07
## 566           Check-Out              2015-08-02   2015-07-28    2015-07
## 567           Check-Out              2015-08-02   2015-07-28    2015-07
## 568           Check-Out              2015-08-03   2015-07-28    2015-07
## 569           Check-Out              2015-08-07   2015-07-28    2015-07
## 570           Check-Out              2015-07-29   2015-07-29    2015-07
## 571           Check-Out              2015-08-02   2015-07-29    2015-07
## 572           Check-Out              2015-08-03   2015-07-29    2015-07
## 573           Check-Out              2015-08-03   2015-07-29    2015-07
## 574           Check-Out              2015-07-30   2015-07-29    2015-07
## 575           Check-Out              2015-08-03   2015-07-29    2015-07
## 576           Check-Out              2015-08-03   2015-07-29    2015-07
## 577           Check-Out              2015-08-05   2015-07-29    2015-07
## 578           Check-Out              2015-08-04   2015-07-29    2015-07
## 579           Check-Out              2015-07-31   2015-07-30    2015-07
## 580           Check-Out              2015-08-01   2015-07-30    2015-07
## 581           Check-Out              2015-08-02   2015-07-30    2015-07
## 582           Check-Out              2015-07-30   2015-07-30    2015-07
## 583           Check-Out              2015-08-03   2015-07-30    2015-07
## 584           Check-Out              2015-08-08   2015-07-30    2015-07
## 585           Check-Out              2015-08-08   2015-07-30    2015-07
## 586           Check-Out              2015-08-08   2015-07-30    2015-07
## 587           Check-Out              2015-07-31   2015-07-31    2015-07
## 588           Check-Out              2015-07-31   2015-07-31    2015-07
## 589           Check-Out              2015-08-01   2015-07-31    2015-07
## 590           Check-Out              2015-08-02   2015-07-31    2015-07
## 591           Check-Out              2015-08-02   2015-07-31    2015-07
## 592           Check-Out              2015-08-02   2015-07-31    2015-07
## 593           Check-Out              2015-08-02   2015-07-31    2015-07
## 594           Check-Out              2015-08-02   2015-07-31    2015-07
## 595           Check-Out              2015-08-04   2015-07-31    2015-07
## 596           Check-Out              2015-08-04   2015-07-31    2015-07
## 597           Check-Out              2015-08-05   2015-07-31    2015-07
## 598           Check-Out              2015-08-06   2015-07-31    2015-07
## 599           Check-Out              2015-08-10   2015-07-31    2015-07
## 600           Check-Out              2015-08-03   2015-08-01    2015-08
## 601           Check-Out              2015-08-02   2015-08-01    2015-08
## 602           Check-Out              2015-08-08   2015-08-01    2015-08
## 603           Check-Out              2015-08-08   2015-08-01    2015-08
## 604           Check-Out              2015-08-09   2015-08-01    2015-08
## 605           Check-Out              2015-08-15   2015-08-01    2015-08
## 606           Check-Out              2015-08-09   2015-08-02    2015-08
## 607           Check-Out              2015-08-08   2015-08-02    2015-08
## 608           Check-Out              2015-08-08   2015-08-02    2015-08
## 609           Check-Out              2015-08-09   2015-08-02    2015-08
## 610           Check-Out              2015-08-09   2015-08-02    2015-08
## 611           Check-Out              2015-08-11   2015-08-02    2015-08
## 612           Check-Out              2015-08-09   2015-08-02    2015-08
## 613           Check-Out              2015-08-03   2015-08-03    2015-08
## 614           Check-Out              2015-08-04   2015-08-03    2015-08
## 615           Check-Out              2015-08-10   2015-08-03    2015-08
## 616           Check-Out              2015-08-10   2015-08-03    2015-08
## 617           Check-Out              2015-08-04   2015-08-04    2015-08
## 618           Check-Out              2015-08-04   2015-08-04    2015-08
## 619           Check-Out              2015-08-05   2015-08-04    2015-08
## 620           Check-Out              2015-08-08   2015-08-04    2015-08
## 621           Check-Out              2015-08-08   2015-08-04    2015-08
## 622           Check-Out              2015-08-09   2015-08-04    2015-08
## 623           Check-Out              2015-08-11   2015-08-04    2015-08
## 624           Check-Out              2015-08-11   2015-08-04    2015-08
## 625           Check-Out              2015-08-11   2015-08-04    2015-08
## 626           Check-Out              2015-08-14   2015-08-04    2015-08
## 627           Check-Out              2015-08-05   2015-08-05    2015-08
## 628           Check-Out              2015-08-05   2015-08-05    2015-08
## 629           Check-Out              2015-08-06   2015-08-05    2015-08
## 630           Check-Out              2015-08-06   2015-08-05    2015-08
## 631           Check-Out              2015-08-09   2015-08-05    2015-08
## 632           Check-Out              2015-08-09   2015-08-05    2015-08
## 633           Check-Out              2015-08-09   2015-08-05    2015-08
## 634           Check-Out              2015-08-12   2015-08-05    2015-08
## 635           Check-Out              2015-08-07   2015-08-06    2015-08
## 636           Check-Out              2015-08-09   2015-08-06    2015-08
## 637           Check-Out              2015-08-09   2015-08-06    2015-08
## 638           Check-Out              2015-08-10   2015-08-06    2015-08
## 639           Check-Out              2015-08-11   2015-08-06    2015-08
## 640           Check-Out              2015-08-11   2015-08-06    2015-08
## 641           Check-Out              2015-08-12   2015-08-06    2015-08
## 642           Check-Out              2015-08-14   2015-08-06    2015-08
## 643           Check-Out              2015-08-14   2015-08-06    2015-08
## 644           Check-Out              2015-08-16   2015-08-06    2015-08
## 645           Check-Out              2015-08-07   2015-08-07    2015-08
## 646           Check-Out              2015-08-08   2015-08-07    2015-08
## 647           Check-Out              2015-08-09   2015-08-07    2015-08
## 648           Check-Out              2015-08-09   2015-08-07    2015-08
## 649           Check-Out              2015-08-09   2015-08-07    2015-08
## 650           Check-Out              2015-08-10   2015-08-07    2015-08
## 651           Check-Out              2015-08-11   2015-08-07    2015-08
## 652           Check-Out              2015-08-11   2015-08-07    2015-08
## 653           Check-Out              2015-08-12   2015-08-07    2015-08
## 654           Check-Out              2015-08-14   2015-08-07    2015-08
## 655           Check-Out              2015-08-14   2015-08-07    2015-08
## 656           Check-Out              2015-08-16   2015-08-07    2015-08
## 657           Check-Out              2015-08-09   2015-08-08    2015-08
## 658           Check-Out              2015-08-10   2015-08-08    2015-08
## 659           Check-Out              2015-08-10   2015-08-08    2015-08
## 660           Check-Out              2015-08-11   2015-08-08    2015-08
## 661           Check-Out              2015-08-11   2015-08-08    2015-08
## 662           Check-Out              2015-08-12   2015-08-08    2015-08
## 663           Check-Out              2015-08-12   2015-08-08    2015-08
## 664           Check-Out              2015-08-15   2015-08-08    2015-08
## 665           Check-Out              2015-08-15   2015-08-08    2015-08
## 666           Check-Out              2015-08-15   2015-08-08    2015-08
## 667           Check-Out              2015-08-15   2015-08-08    2015-08
## 668           Check-Out              2015-08-15   2015-08-08    2015-08
## 669           Check-Out              2015-08-21   2015-08-08    2015-08
## 670           Check-Out              2015-08-10   2015-08-09    2015-08
## 671           Check-Out              2015-08-10   2015-08-09    2015-08
## 672           Check-Out              2015-08-10   2015-08-09    2015-08
## 673           Check-Out              2015-08-12   2015-08-09    2015-08
## 674           Check-Out              2015-08-13   2015-08-09    2015-08
## 675           Check-Out              2015-08-13   2015-08-09    2015-08
## 676           Check-Out              2015-08-15   2015-08-09    2015-08
## 677           Check-Out              2015-08-15   2015-08-09    2015-08
## 678           Check-Out              2015-08-16   2015-08-09    2015-08
## 679           Check-Out              2015-08-16   2015-08-09    2015-08
## 680           Check-Out              2015-08-16   2015-08-09    2015-08
## 681           Check-Out              2015-08-16   2015-08-09    2015-08
## 682           Check-Out              2015-08-10   2015-08-10    2015-08
## 683           Check-Out              2015-08-13   2015-08-10    2015-08
## 684           Check-Out              2015-08-13   2015-08-10    2015-08
## 685           Check-Out              2015-08-13   2015-08-10    2015-08
## 686           Check-Out              2015-08-15   2015-08-10    2015-08
## 687           Check-Out              2015-08-16   2015-08-10    2015-08
## 688           Check-Out              2015-08-16   2015-08-10    2015-08
## 689           Check-Out              2015-08-16   2015-08-10    2015-08
## 690           Check-Out              2015-08-17   2015-08-10    2015-08
## 691           Check-Out              2015-08-21   2015-08-10    2015-08
## 692           Check-Out              2015-08-11   2015-08-11    2015-08
## 693           Check-Out              2015-08-11   2015-08-11    2015-08
## 694           Check-Out              2015-08-15   2015-08-11    2015-08
## 695           Check-Out              2015-08-16   2015-08-11    2015-08
## 696           Check-Out              2015-08-18   2015-08-11    2015-08
## 697           Check-Out              2015-08-18   2015-08-11    2015-08
## 698           Check-Out              2015-08-21   2015-08-11    2015-08
## 699           Check-Out              2015-08-21   2015-08-11    2015-08
## 700           Check-Out              2015-08-23   2015-08-11    2015-08
## 701           Check-Out              2015-08-13   2015-08-12    2015-08
## 702           Check-Out              2015-08-15   2015-08-12    2015-08
## 703           Check-Out              2015-08-22   2015-08-12    2015-08
## 704           Check-Out              2015-08-22   2015-08-12    2015-08
## 705           Check-Out              2015-08-17   2015-08-12    2015-08
## 706           Check-Out              2015-08-14   2015-08-13    2015-08
## 707           Check-Out              2015-08-14   2015-08-13    2015-08
## 708           Check-Out              2015-08-14   2015-08-13    2015-08
## 709           Check-Out              2015-08-16   2015-08-13    2015-08
## 710           Check-Out              2015-08-16   2015-08-13    2015-08
## 711           Check-Out              2015-08-17   2015-08-13    2015-08
## 712           Check-Out              2015-08-17   2015-08-13    2015-08
## 713           Check-Out              2015-08-18   2015-08-13    2015-08
## 714           Check-Out              2015-08-18   2015-08-13    2015-08
## 715           Check-Out              2015-08-18   2015-08-13    2015-08
## 716           Check-Out              2015-08-18   2015-08-13    2015-08
## 717           Check-Out              2015-08-14   2015-08-14    2015-08
## 718           Check-Out              2015-08-15   2015-08-14    2015-08
## 719           Check-Out              2015-08-15   2015-08-14    2015-08
## 720           Check-Out              2015-08-15   2015-08-14    2015-08
## 721           Check-Out              2015-08-15   2015-08-14    2015-08
## 722           Check-Out              2015-08-15   2015-08-14    2015-08
## 723           Check-Out              2015-08-16   2015-08-14    2015-08
## 724           Check-Out              2015-08-16   2015-08-14    2015-08
## 725           Check-Out              2015-08-16   2015-08-14    2015-08
## 726           Check-Out              2015-08-17   2015-08-14    2015-08
## 727           Check-Out              2015-08-18   2015-08-14    2015-08
## 728           Check-Out              2015-08-19   2015-08-14    2015-08
## 729           Check-Out              2015-08-19   2015-08-14    2015-08
## 730           Check-Out              2015-08-21   2015-08-14    2015-08
## 731           Check-Out              2015-08-21   2015-08-14    2015-08
## 732           Check-Out              2015-08-21   2015-08-14    2015-08
## 733           Check-Out              2015-08-17   2015-08-15    2015-08
## 734           Check-Out              2015-08-19   2015-08-15    2015-08
## 735           Check-Out              2015-08-19   2015-08-15    2015-08
## 736           Check-Out              2015-08-19   2015-08-15    2015-08
## 737           Check-Out              2015-08-19   2015-08-15    2015-08
## 738           Check-Out              2015-08-20   2015-08-15    2015-08
## 739           Check-Out              2015-08-20   2015-08-15    2015-08
## 740           Check-Out              2015-08-21   2015-08-15    2015-08
## 741           Check-Out              2015-08-21   2015-08-15    2015-08
## 742           Check-Out              2015-08-21   2015-08-15    2015-08
## 743           Check-Out              2015-08-22   2015-08-15    2015-08
## 744           Check-Out              2015-08-22   2015-08-15    2015-08
## 745           Check-Out              2015-08-22   2015-08-15    2015-08
## 746           Check-Out              2015-08-22   2015-08-15    2015-08
## 747           Check-Out              2015-08-22   2015-08-15    2015-08
## 748           Check-Out              2015-08-29   2015-08-15    2015-08
## 749           Check-Out              2015-08-17   2015-08-16    2015-08
## 750           Check-Out              2015-08-17   2015-08-16    2015-08
## 751           Check-Out              2015-08-17   2015-08-16    2015-08
## 752           Check-Out              2015-08-17   2015-08-16    2015-08
## 753           Check-Out              2015-08-17   2015-08-16    2015-08
## 754           Check-Out              2015-08-17   2015-08-16    2015-08
## 755           Check-Out              2015-08-17   2015-08-16    2015-08
## 756           Check-Out              2015-08-17   2015-08-16    2015-08
## 757           Check-Out              2015-08-25   2015-08-16    2015-08
## 758           Check-Out              2015-08-22   2015-08-17    2015-08
## 759           Check-Out              2015-08-23   2015-08-17    2015-08
## 760           Check-Out              2015-08-24   2015-08-17    2015-08
## 761           Check-Out              2015-08-24   2015-08-17    2015-08
## 762           Check-Out              2015-08-24   2015-08-17    2015-08
## 763           Check-Out              2015-08-24   2015-08-17    2015-08
## 764           Check-Out              2015-08-24   2015-08-17    2015-08
## 765           Check-Out              2015-08-19   2015-08-18    2015-08
## 766           Check-Out              2015-08-21   2015-08-18    2015-08
## 767           Check-Out              2015-08-24   2015-08-18    2015-08
## 768           Check-Out              2015-08-24   2015-08-18    2015-08
## 769           Check-Out              2015-08-24   2015-08-18    2015-08
## 770           Check-Out              2015-08-24   2015-08-18    2015-08
## 771           Check-Out              2015-08-24   2015-08-18    2015-08
## 772           Check-Out              2015-08-25   2015-08-18    2015-08
## 773           Check-Out              2015-08-25   2015-08-18    2015-08
## 774           Check-Out              2015-08-25   2015-08-18    2015-08
## 775           Check-Out              2015-08-28   2015-08-18    2015-08
## 776           Check-Out              2015-08-28   2015-08-18    2015-08
## 777           Check-Out              2015-08-19   2015-08-19    2015-08
## 778           Check-Out              2015-08-20   2015-08-19    2015-08
## 779           Check-Out              2015-08-23   2015-08-19    2015-08
## 780           Check-Out              2015-08-23   2015-08-19    2015-08
## 781           Check-Out              2015-08-24   2015-08-19    2015-08
## 782           Check-Out              2015-08-24   2015-08-19    2015-08
## 783           Check-Out              2015-08-28   2015-08-19    2015-08
## 784           Check-Out              2015-08-28   2015-08-19    2015-08
## 785           Check-Out              2015-08-20   2015-08-20    2015-08
## 786           Check-Out              2015-08-20   2015-08-20    2015-08
## 787           Check-Out              2015-08-21   2015-08-20    2015-08
## 788           Check-Out              2015-08-23   2015-08-20    2015-08
## 789           Check-Out              2015-08-26   2015-08-20    2015-08
## 790           Check-Out              2015-08-29   2015-08-20    2015-08
## 791           Check-Out              2015-08-25   2015-08-20    2015-08
## 792           Check-Out              2015-08-23   2015-08-21    2015-08
## 793           Check-Out              2015-08-23   2015-08-21    2015-08
## 794           Check-Out              2015-08-23   2015-08-21    2015-08
## 795           Check-Out              2015-08-23   2015-08-21    2015-08
## 796           Check-Out              2015-08-25   2015-08-21    2015-08
## 797           Check-Out              2015-08-26   2015-08-21    2015-08
## 798           Check-Out              2015-08-26   2015-08-21    2015-08
## 799           Check-Out              2015-08-26   2015-08-21    2015-08
## 800           Check-Out              2015-08-26   2015-08-21    2015-08
## 801           Check-Out              2015-08-27   2015-08-21    2015-08
## 802           Check-Out              2015-08-27   2015-08-21    2015-08
## 803           Check-Out              2015-08-27   2015-08-21    2015-08
## 804           Check-Out              2015-08-27   2015-08-21    2015-08
## 805           Check-Out              2015-08-28   2015-08-21    2015-08
## 806           Check-Out              2015-08-28   2015-08-21    2015-08
## 807           Check-Out              2015-08-28   2015-08-21    2015-08
## 808           Check-Out              2015-08-28   2015-08-21    2015-08
## 809           Check-Out              2015-08-30   2015-08-21    2015-08
## 810           Check-Out              2015-08-31   2015-08-21    2015-08
## 811           Check-Out              2015-08-23   2015-08-22    2015-08
## 812           Check-Out              2015-08-28   2015-08-22    2015-08
## 813           Check-Out              2015-08-29   2015-08-22    2015-08
## 814           Check-Out              2015-08-29   2015-08-22    2015-08
## 815           Check-Out              2015-08-29   2015-08-22    2015-08
## 816           Check-Out              2015-08-29   2015-08-22    2015-08
## 817           Check-Out              2015-08-29   2015-08-22    2015-08
## 818           Check-Out              2015-08-29   2015-08-22    2015-08
## 819           Check-Out              2015-08-29   2015-08-22    2015-08
## 820           Check-Out              2015-08-29   2015-08-22    2015-08
## 821           Check-Out              2015-08-29   2015-08-22    2015-08
## 822           Check-Out              2015-08-29   2015-08-22    2015-08
## 823           Check-Out              2015-08-30   2015-08-22    2015-08
## 824           Check-Out              2015-08-26   2015-08-22    2015-08
## 825           Check-Out              2015-08-27   2015-08-22    2015-08
## 826           Check-Out              2015-08-27   2015-08-22    2015-08
## 827           Check-Out              2015-08-28   2015-08-22    2015-08
## 828           Check-Out              2015-08-28   2015-08-22    2015-08
## 829           Check-Out              2015-08-26   2015-08-23    2015-08
## 830           Check-Out              2015-08-27   2015-08-23    2015-08
## 831           Check-Out              2015-08-28   2015-08-23    2015-08
## 832           Check-Out              2015-08-28   2015-08-23    2015-08
## 833           Check-Out              2015-08-28   2015-08-23    2015-08
## 834           Check-Out              2015-08-30   2015-08-23    2015-08
## 835           Check-Out              2015-08-30   2015-08-23    2015-08
## 836           Check-Out              2015-08-30   2015-08-23    2015-08
## 837           Check-Out              2015-09-06   2015-08-23    2015-08
## 838           Check-Out              2015-08-25   2015-08-24    2015-08
## 839           Check-Out              2015-08-25   2015-08-24    2015-08
## 840           Check-Out              2015-08-25   2015-08-24    2015-08
## 841           Check-Out              2015-08-25   2015-08-24    2015-08
## 842           Check-Out              2015-08-26   2015-08-24    2015-08
## 843           Check-Out              2015-08-26   2015-08-24    2015-08
## 844           Check-Out              2015-08-28   2015-08-24    2015-08
## 845           Check-Out              2015-08-29   2015-08-24    2015-08
## 846           Check-Out              2015-08-29   2015-08-24    2015-08
## 847           Check-Out              2015-08-29   2015-08-24    2015-08
## 848           Check-Out              2015-09-03   2015-08-24    2015-08
## 849           Check-Out              2015-08-28   2015-08-25    2015-08
## 850           Check-Out              2015-09-04   2015-08-25    2015-08
## 851           Check-Out              2015-08-26   2015-08-26    2015-08
## 852           Check-Out              2015-08-27   2015-08-26    2015-08
## 853           Check-Out              2015-08-27   2015-08-26    2015-08
## 854           Check-Out              2015-08-27   2015-08-26    2015-08
## 855           Check-Out              2015-08-30   2015-08-26    2015-08
## 856           Check-Out              2015-09-06   2015-08-26    2015-08
## 857           Check-Out              2015-08-28   2015-08-27    2015-08
## 858           Check-Out              2015-08-29   2015-08-27    2015-08
## 859           Check-Out              2015-08-30   2015-08-27    2015-08
## 860           Check-Out              2015-08-31   2015-08-27    2015-08
## 861           Check-Out              2015-09-02   2015-08-27    2015-08
## 862           Check-Out              2015-09-02   2015-08-27    2015-08
## 863           Check-Out              2015-09-03   2015-08-27    2015-08
## 864           Check-Out              2015-09-03   2015-08-27    2015-08
## 865           Check-Out              2015-09-03   2015-08-27    2015-08
## 866           Check-Out              2015-08-29   2015-08-28    2015-08
## 867           Check-Out              2015-08-30   2015-08-28    2015-08
## 868           Check-Out              2015-08-30   2015-08-28    2015-08
## 869           Check-Out              2015-08-30   2015-08-28    2015-08
## 870           Check-Out              2015-08-30   2015-08-28    2015-08
## 871           Check-Out              2015-08-30   2015-08-28    2015-08
## 872           Check-Out              2015-08-30   2015-08-28    2015-08
## 873           Check-Out              2015-08-31   2015-08-28    2015-08
## 874           Check-Out              2015-08-31   2015-08-28    2015-08
## 875           Check-Out              2015-08-31   2015-08-28    2015-08
## 876           Check-Out              2015-08-31   2015-08-28    2015-08
## 877           Check-Out              2015-08-31   2015-08-28    2015-08
## 878           Check-Out              2015-08-31   2015-08-28    2015-08
## 879           Check-Out              2015-08-31   2015-08-28    2015-08
## 880           Check-Out              2015-08-29   2015-08-28    2015-08
## 881           Check-Out              2015-08-30   2015-08-28    2015-08
## 882           Check-Out              2015-09-01   2015-08-28    2015-08
## 883           Check-Out              2015-09-01   2015-08-28    2015-08
## 884           Check-Out              2015-09-02   2015-08-28    2015-08
## 885           Check-Out              2015-09-03   2015-08-28    2015-08
## 886           Check-Out              2015-09-03   2015-08-28    2015-08
## 887           Check-Out              2015-09-04   2015-08-28    2015-08
## 888           Check-Out              2015-09-04   2015-08-28    2015-08
## 889           Check-Out              2015-09-04   2015-08-28    2015-08
## 890           Check-Out              2015-09-02   2015-08-28    2015-08
## 891           Check-Out              2015-09-04   2015-08-28    2015-08
## 892           Check-Out              2015-09-02   2015-08-28    2015-08
## 893           Check-Out              2015-08-31   2015-08-29    2015-08
## 894           Check-Out              2015-08-31   2015-08-29    2015-08
## 895           Check-Out              2015-09-01   2015-08-29    2015-08
## 896           Check-Out              2015-09-01   2015-08-29    2015-08
## 897           Check-Out              2015-08-30   2015-08-29    2015-08
## 898           Check-Out              2015-09-02   2015-08-29    2015-08
## 899           Check-Out              2015-09-02   2015-08-29    2015-08
## 900           Check-Out              2015-09-03   2015-08-29    2015-08
## 901           Check-Out              2015-09-03   2015-08-29    2015-08
## 902           Check-Out              2015-09-04   2015-08-29    2015-08
## 903           Check-Out              2015-09-05   2015-08-29    2015-08
## 904           Check-Out              2015-08-31   2015-08-30    2015-08
## 905           Check-Out              2015-09-01   2015-08-30    2015-08
## 906           Check-Out              2015-09-01   2015-08-30    2015-08
## 907           Check-Out              2015-09-02   2015-08-30    2015-08
## 908           Check-Out              2015-09-02   2015-08-30    2015-08
## 909           Check-Out              2015-09-03   2015-08-30    2015-08
## 910           Check-Out              2015-09-03   2015-08-30    2015-08
## 911           Check-Out              2015-09-04   2015-08-30    2015-08
## 912           Check-Out              2015-09-05   2015-08-30    2015-08
## 913           Check-Out              2015-09-05   2015-08-30    2015-08
## 914           Check-Out              2015-09-06   2015-08-30    2015-08
## 915           Check-Out              2015-09-06   2015-08-30    2015-08
## 916           Check-Out              2015-09-01   2015-08-31    2015-08
## 917           Check-Out              2015-09-02   2015-08-31    2015-08
## 918           Check-Out              2015-09-02   2015-08-31    2015-08
## 919           Check-Out              2015-09-02   2015-08-31    2015-08
## 920           Check-Out              2015-09-03   2015-08-31    2015-08
## 921           Check-Out              2015-09-03   2015-08-31    2015-08
## 922           Check-Out              2015-09-03   2015-08-31    2015-08
## 923           Check-Out              2015-09-03   2015-08-31    2015-08
## 924           Check-Out              2015-09-03   2015-08-31    2015-08
## 925           Check-Out              2015-09-04   2015-08-31    2015-08
## 926           Check-Out              2015-09-04   2015-08-31    2015-08
## 927           Check-Out              2015-09-04   2015-08-31    2015-08
## 928           Check-Out              2015-09-07   2015-08-31    2015-08
## 929           Check-Out              2015-09-10   2015-08-31    2015-08
## 930           Check-Out              2015-09-11   2015-08-31    2015-08
## 931           Check-Out              2015-09-04   2015-09-01    2015-09
## 932           Check-Out              2015-09-04   2015-09-01    2015-09
## 933           Check-Out              2015-09-04   2015-09-01    2015-09
## 934           Check-Out              2015-09-05   2015-09-01    2015-09
## 935           Check-Out              2015-09-05   2015-09-01    2015-09
## 936           Check-Out              2015-09-05   2015-09-01    2015-09
## 937           Check-Out              2015-09-05   2015-09-01    2015-09
## 938           Check-Out              2015-09-06   2015-09-01    2015-09
## 939           Check-Out              2015-09-03   2015-09-01    2015-09
## 940           Check-Out              2015-09-06   2015-09-01    2015-09
## 941           Check-Out              2015-09-07   2015-09-01    2015-09
## 942           Check-Out              2015-09-08   2015-09-01    2015-09
## 943           Check-Out              2015-09-08   2015-09-01    2015-09
## 944           Check-Out              2015-09-08   2015-09-01    2015-09
## 945           Check-Out              2015-09-09   2015-09-01    2015-09
## 946           Check-Out              2015-09-09   2015-09-01    2015-09
## 947           Check-Out              2015-09-11   2015-09-01    2015-09
## 948           Check-Out              2015-09-13   2015-09-01    2015-09
## 949           Check-Out              2015-09-15   2015-09-01    2015-09
## 950           Check-Out              2015-09-03   2015-09-02    2015-09
## 951           Check-Out              2015-09-06   2015-09-02    2015-09
## 952           Check-Out              2015-09-07   2015-09-02    2015-09
## 953           Check-Out              2015-09-07   2015-09-02    2015-09
## 954           Check-Out              2015-09-09   2015-09-02    2015-09
## 955           Check-Out              2015-09-05   2015-09-03    2015-09
## 956           Check-Out              2015-09-06   2015-09-03    2015-09
## 957           Check-Out              2015-09-06   2015-09-03    2015-09
## 958           Check-Out              2015-09-06   2015-09-03    2015-09
## 959           Check-Out              2015-09-04   2015-09-03    2015-09
## 960           Check-Out              2015-09-06   2015-09-03    2015-09
## 961           Check-Out              2015-09-06   2015-09-03    2015-09
## 962           Check-Out              2015-09-06   2015-09-03    2015-09
## 963           Check-Out              2015-09-06   2015-09-03    2015-09
## 964           Check-Out              2015-09-06   2015-09-03    2015-09
## 965           Check-Out              2015-09-06   2015-09-03    2015-09
## 966           Check-Out              2015-09-07   2015-09-03    2015-09
## 967           Check-Out              2015-09-07   2015-09-03    2015-09
## 968           Check-Out              2015-09-07   2015-09-03    2015-09
## 969           Check-Out              2015-09-07   2015-09-03    2015-09
## 970           Check-Out              2015-09-07   2015-09-03    2015-09
## 971           Check-Out              2015-09-12   2015-09-03    2015-09
## 972           Check-Out              2015-09-12   2015-09-03    2015-09
## 973           Check-Out              2015-09-12   2015-09-03    2015-09
## 974           Check-Out              2015-09-13   2015-09-03    2015-09
## 975           Check-Out              2015-09-13   2015-09-03    2015-09
## 976           Check-Out              2015-09-10   2015-09-03    2015-09
## 977           Check-Out              2015-09-10   2015-09-03    2015-09
## 978           Check-Out              2015-09-17   2015-09-03    2015-09
## 979           Check-Out              2015-09-05   2015-09-04    2015-09
## 980           Check-Out              2015-09-05   2015-09-04    2015-09
## 981           Check-Out              2015-09-05   2015-09-04    2015-09
## 982           Check-Out              2015-09-06   2015-09-04    2015-09
## 983           Check-Out              2015-09-06   2015-09-04    2015-09
## 984           Check-Out              2015-09-06   2015-09-04    2015-09
## 985           Check-Out              2015-09-06   2015-09-04    2015-09
## 986           Check-Out              2015-09-07   2015-09-04    2015-09
## 987           Check-Out              2015-09-07   2015-09-04    2015-09
## 988           Check-Out              2015-09-07   2015-09-04    2015-09
## 989           Check-Out              2015-09-08   2015-09-04    2015-09
## 990           Check-Out              2015-09-08   2015-09-04    2015-09
## 991           Check-Out              2015-09-09   2015-09-04    2015-09
## 992           Check-Out              2015-09-09   2015-09-04    2015-09
## 993           Check-Out              2015-09-13   2015-09-04    2015-09
## 994           Check-Out              2015-09-14   2015-09-04    2015-09
## 995           Check-Out              2015-09-14   2015-09-04    2015-09
## 996           Check-Out              2015-09-10   2015-09-04    2015-09
## 997           Check-Out              2015-09-11   2015-09-04    2015-09
## 998           Check-Out              2015-09-11   2015-09-05    2015-09
## 999           Check-Out              2015-09-11   2015-09-05    2015-09
## 1000          Check-Out              2015-09-11   2015-09-05    2015-09
## 1001          Check-Out              2015-09-12   2015-09-05    2015-09
## 1002          Check-Out              2015-09-07   2015-09-05    2015-09
## 1003          Check-Out              2015-09-09   2015-09-05    2015-09
## 1004          Check-Out              2015-09-12   2015-09-05    2015-09
## 1005          Check-Out              2015-09-12   2015-09-05    2015-09
## 1006          Check-Out              2015-09-12   2015-09-05    2015-09
## 1007          Check-Out              2015-09-12   2015-09-05    2015-09
## 1008          Check-Out              2015-09-12   2015-09-05    2015-09
## 1009          Check-Out              2015-09-15   2015-09-05    2015-09
## 1010          Check-Out              2015-09-19   2015-09-05    2015-09
## 1011          Check-Out              2015-09-19   2015-09-05    2015-09
## 1012          Check-Out              2015-09-06   2015-09-06    2015-09
## 1013          Check-Out              2015-09-08   2015-09-06    2015-09
## 1014          Check-Out              2015-09-09   2015-09-06    2015-09
## 1015          Check-Out              2015-09-10   2015-09-06    2015-09
## 1016          Check-Out              2015-09-11   2015-09-06    2015-09
## 1017          Check-Out              2015-09-12   2015-09-06    2015-09
## 1018          Check-Out              2015-09-12   2015-09-06    2015-09
## 1019          Check-Out              2015-09-12   2015-09-06    2015-09
## 1020          Check-Out              2015-09-12   2015-09-06    2015-09
## 1021          Check-Out              2015-09-13   2015-09-06    2015-09
## 1022          Check-Out              2015-09-13   2015-09-06    2015-09
## 1023          Check-Out              2015-09-13   2015-09-06    2015-09
## 1024          Check-Out              2015-09-13   2015-09-06    2015-09
## 1025          Check-Out              2015-09-13   2015-09-06    2015-09
## 1026          Check-Out              2015-09-13   2015-09-06    2015-09
## 1027          Check-Out              2015-09-13   2015-09-06    2015-09
## 1028          Check-Out              2015-09-13   2015-09-06    2015-09
## 1029          Check-Out              2015-09-16   2015-09-06    2015-09
## 1030          Check-Out              2015-09-16   2015-09-06    2015-09
## 1031          Check-Out              2015-09-17   2015-09-06    2015-09
## 1032          Check-Out              2015-09-20   2015-09-06    2015-09
## 1033          Check-Out              2015-09-11   2015-09-07    2015-09
## 1034          Check-Out              2015-09-11   2015-09-07    2015-09
## 1035          Check-Out              2015-09-12   2015-09-07    2015-09
## 1036          Check-Out              2015-09-12   2015-09-07    2015-09
## 1037          Check-Out              2015-09-12   2015-09-07    2015-09
## 1038          Check-Out              2015-09-13   2015-09-07    2015-09
## 1039          Check-Out              2015-10-23   2015-09-07    2015-09
## 1040          Check-Out              2015-09-07   2015-09-07    2015-09
## 1041          Check-Out              2015-09-10   2015-09-08    2015-09
## 1042          Check-Out              2015-09-12   2015-09-08    2015-09
## 1043          Check-Out              2015-09-15   2015-09-08    2015-09
## 1044          Check-Out              2015-09-15   2015-09-08    2015-09
## 1045          Check-Out              2015-09-15   2015-09-08    2015-09
## 1046          Check-Out              2015-09-16   2015-09-08    2015-09
## 1047          Check-Out              2015-09-15   2015-09-08    2015-09
## 1048          Check-Out              2015-09-22   2015-09-08    2015-09
## 1049          Check-Out              2015-09-10   2015-09-09    2015-09
## 1050          Check-Out              2015-09-10   2015-09-09    2015-09
## 1051          Check-Out              2015-09-10   2015-09-09    2015-09
## 1052          Check-Out              2015-09-11   2015-09-09    2015-09
## 1053          Check-Out              2015-09-12   2015-09-09    2015-09
## 1054          Check-Out              2015-09-10   2015-09-09    2015-09
## 1055          Check-Out              2015-09-12   2015-09-09    2015-09
## 1056          Check-Out              2015-09-15   2015-09-09    2015-09
## 1057          Check-Out              2015-09-15   2015-09-09    2015-09
## 1058          Check-Out              2015-09-16   2015-09-09    2015-09
## 1059          Check-Out              2015-09-16   2015-09-09    2015-09
## 1060          Check-Out              2015-09-14   2015-09-09    2015-09
## 1061          Check-Out              2015-09-14   2015-09-09    2015-09
## 1062          Check-Out              2015-09-13   2015-09-10    2015-09
## 1063          Check-Out              2015-09-14   2015-09-10    2015-09
## 1064          Check-Out              2015-09-14   2015-09-10    2015-09
## 1065          Check-Out              2015-09-15   2015-09-10    2015-09
## 1066          Check-Out              2015-09-15   2015-09-10    2015-09
## 1067          Check-Out              2015-09-17   2015-09-10    2015-09
## 1068          Check-Out              2015-09-11   2015-09-10    2015-09
## 1069          Check-Out              2015-09-11   2015-09-10    2015-09
## 1070          Check-Out              2015-09-12   2015-09-10    2015-09
## 1071          Check-Out              2015-09-12   2015-09-10    2015-09
## 1072          Check-Out              2015-09-17   2015-09-10    2015-09
## 1073          Check-Out              2015-09-17   2015-09-10    2015-09
## 1074          Check-Out              2015-09-17   2015-09-10    2015-09
## 1075          Check-Out              2015-09-17   2015-09-10    2015-09
## 1076          Check-Out              2015-09-17   2015-09-10    2015-09
## 1077          Check-Out              2015-09-19   2015-09-10    2015-09
## 1078          Check-Out              2015-09-20   2015-09-10    2015-09
## 1079          Check-Out              2015-09-20   2015-09-10    2015-09
## 1080          Check-Out              2015-09-24   2015-09-10    2015-09
## 1081          Check-Out              2015-09-12   2015-09-11    2015-09
## 1082          Check-Out              2015-09-12   2015-09-11    2015-09
## 1083          Check-Out              2015-09-12   2015-09-11    2015-09
## 1084          Check-Out              2015-09-12   2015-09-11    2015-09
## 1085          Check-Out              2015-09-12   2015-09-11    2015-09
## 1086          Check-Out              2015-09-12   2015-09-11    2015-09
## 1087          Check-Out              2015-09-13   2015-09-11    2015-09
## 1088          Check-Out              2015-09-13   2015-09-11    2015-09
## 1089          Check-Out              2015-09-13   2015-09-11    2015-09
## 1090          Check-Out              2015-09-13   2015-09-11    2015-09
## 1091          Check-Out              2015-09-14   2015-09-11    2015-09
## 1092          Check-Out              2015-09-14   2015-09-11    2015-09
## 1093          Check-Out              2015-09-14   2015-09-11    2015-09
## 1094          Check-Out              2015-09-16   2015-09-11    2015-09
## 1095          Check-Out              2015-09-18   2015-09-11    2015-09
## 1096          Check-Out              2015-09-18   2015-09-11    2015-09
## 1097          Check-Out              2015-09-21   2015-09-11    2015-09
## 1098          Check-Out              2015-09-16   2015-09-12    2015-09
## 1099          Check-Out              2015-09-18   2015-09-12    2015-09
## 1100          Check-Out              2015-09-19   2015-09-12    2015-09
## 1101          Check-Out              2015-09-19   2015-09-12    2015-09
## 1102          Check-Out              2015-09-19   2015-09-12    2015-09
## 1103          Check-Out              2015-09-19   2015-09-12    2015-09
## 1104          Check-Out              2015-09-30   2015-09-12    2015-09
## 1105          Check-Out              2015-09-19   2015-09-12    2015-09
## 1106          Check-Out              2015-09-14   2015-09-13    2015-09
## 1107          Check-Out              2015-09-17   2015-09-13    2015-09
## 1108          Check-Out              2015-09-17   2015-09-13    2015-09
## 1109          Check-Out              2015-09-18   2015-09-13    2015-09
## 1110          Check-Out              2015-09-18   2015-09-13    2015-09
## 1111          Check-Out              2015-09-20   2015-09-13    2015-09
## 1112          Check-Out              2015-09-20   2015-09-13    2015-09
## 1113          Check-Out              2015-09-21   2015-09-13    2015-09
## 1114          Check-Out              2015-09-24   2015-09-13    2015-09
## 1115          Check-Out              2015-09-25   2015-09-13    2015-09
## 1116          Check-Out              2015-09-25   2015-09-13    2015-09
## 1117          Check-Out              2015-09-27   2015-09-13    2015-09
## 1118          Check-Out              2015-09-16   2015-09-14    2015-09
## 1119          Check-Out              2015-09-17   2015-09-14    2015-09
## 1120          Check-Out              2015-09-19   2015-09-14    2015-09
## 1121          Check-Out              2015-09-19   2015-09-14    2015-09
## 1122          Check-Out              2015-09-19   2015-09-14    2015-09
## 1123          Check-Out              2015-09-19   2015-09-14    2015-09
## 1124          Check-Out              2015-09-20   2015-09-14    2015-09
## 1125          Check-Out              2015-09-20   2015-09-14    2015-09
## 1126          Check-Out              2015-09-22   2015-09-14    2015-09
## 1127          Check-Out              2015-09-28   2015-09-14    2015-09
## 1128          Check-Out              2015-10-12   2015-09-14    2015-09
## 1129          Check-Out              2015-09-17   2015-09-14    2015-09
## 1130          Check-Out              2015-09-16   2015-09-15    2015-09
## 1131          Check-Out              2015-09-20   2015-09-15    2015-09
## 1132          Check-Out              2015-09-21   2015-09-15    2015-09
## 1133          Check-Out              2015-09-24   2015-09-15    2015-09
## 1134          Check-Out              2015-09-29   2015-09-15    2015-09
## 1135          Check-Out              2015-09-29   2015-09-15    2015-09
## 1136          Check-Out              2015-09-17   2015-09-16    2015-09
## 1137          Check-Out              2015-09-17   2015-09-16    2015-09
## 1138          Check-Out              2015-09-17   2015-09-16    2015-09
## 1139          Check-Out              2015-09-17   2015-09-16    2015-09
## 1140          Check-Out              2015-09-17   2015-09-16    2015-09
## 1141          Check-Out              2015-09-17   2015-09-16    2015-09
## 1142          Check-Out              2015-09-17   2015-09-16    2015-09
## 1143          Check-Out              2015-09-17   2015-09-16    2015-09
## 1144          Check-Out              2015-09-18   2015-09-16    2015-09
## 1145          Check-Out              2015-09-18   2015-09-16    2015-09
## 1146          Check-Out              2015-09-19   2015-09-16    2015-09
## 1147          Check-Out              2015-09-19   2015-09-16    2015-09
## 1148          Check-Out              2015-09-19   2015-09-16    2015-09
## 1149          Check-Out              2015-09-19   2015-09-16    2015-09
## 1150          Check-Out              2015-09-19   2015-09-16    2015-09
## 1151          Check-Out              2015-09-21   2015-09-16    2015-09
## 1152          Check-Out              2015-09-20   2015-09-16    2015-09
## 1153          Check-Out              2015-09-21   2015-09-16    2015-09
## 1154          Check-Out              2015-09-23   2015-09-16    2015-09
## 1155          Check-Out              2015-09-23   2015-09-16    2015-09
## 1156          Check-Out              2015-09-23   2015-09-16    2015-09
## 1157          Check-Out              2015-09-18   2015-09-17    2015-09
## 1158          Check-Out              2015-09-19   2015-09-17    2015-09
## 1159          Check-Out              2015-09-17   2015-09-17    2015-09
## 1160          Check-Out              2015-09-18   2015-09-17    2015-09
## 1161          Check-Out              2015-09-18   2015-09-17    2015-09
## 1162          Check-Out              2015-09-21   2015-09-17    2015-09
## 1163          Check-Out              2015-09-21   2015-09-17    2015-09
## 1164          Check-Out              2015-09-21   2015-09-17    2015-09
## 1165          Check-Out              2015-09-21   2015-09-17    2015-09
## 1166          Check-Out              2015-09-21   2015-09-17    2015-09
## 1167          Check-Out              2015-09-22   2015-09-17    2015-09
## 1168          Check-Out              2015-09-21   2015-09-17    2015-09
## 1169          Check-Out              2015-09-21   2015-09-17    2015-09
## 1170          Check-Out              2015-09-24   2015-09-17    2015-09
## 1171          Check-Out              2015-09-24   2015-09-17    2015-09
## 1172          Check-Out              2015-09-24   2015-09-17    2015-09
## 1173          Check-Out              2015-09-24   2015-09-17    2015-09
## 1174          Check-Out              2015-10-01   2015-09-17    2015-09
## 1175          Check-Out              2015-10-01   2015-09-17    2015-09
## 1176          Check-Out              2015-09-20   2015-09-18    2015-09
## 1177          Check-Out              2015-09-20   2015-09-18    2015-09
## 1178          Check-Out              2015-09-21   2015-09-18    2015-09
## 1179          Check-Out              2015-09-21   2015-09-18    2015-09
## 1180          Check-Out              2015-09-21   2015-09-18    2015-09
## 1181          Check-Out              2015-09-23   2015-09-18    2015-09
## 1182          Check-Out              2015-09-25   2015-09-18    2015-09
## 1183          Check-Out              2015-09-25   2015-09-18    2015-09
## 1184          Check-Out              2015-09-28   2015-09-18    2015-09
## 1185          Check-Out              2015-09-21   2015-09-19    2015-09
## 1186          Check-Out              2015-09-23   2015-09-19    2015-09
## 1187          Check-Out              2015-09-23   2015-09-19    2015-09
## 1188          Check-Out              2015-09-24   2015-09-19    2015-09
## 1189          Check-Out              2015-09-24   2015-09-19    2015-09
## 1190          Check-Out              2015-09-26   2015-09-19    2015-09
## 1191          Check-Out              2015-09-26   2015-09-19    2015-09
## 1192          Check-Out              2015-09-26   2015-09-19    2015-09
## 1193          Check-Out              2015-09-26   2015-09-19    2015-09
## 1194          Check-Out              2015-09-26   2015-09-19    2015-09
## 1195          Check-Out              2015-09-26   2015-09-19    2015-09
## 1196          Check-Out              2015-09-29   2015-09-19    2015-09
## 1197          Check-Out              2015-09-29   2015-09-19    2015-09
## 1198          Check-Out              2015-09-29   2015-09-19    2015-09
## 1199          Check-Out              2015-09-24   2015-09-20    2015-09
## 1200          Check-Out              2015-09-27   2015-09-20    2015-09
## 1201          Check-Out              2015-09-27   2015-09-20    2015-09
## 1202          Check-Out              2015-09-27   2015-09-20    2015-09
## 1203          Check-Out              2015-09-27   2015-09-20    2015-09
## 1204          Check-Out              2015-10-01   2015-09-20    2015-09
## 1205          Check-Out              2015-10-01   2015-09-20    2015-09
## 1206          Check-Out              2015-10-01   2015-09-20    2015-09
## 1207          Check-Out              2015-09-23   2015-09-21    2015-09
## 1208          Check-Out              2015-09-23   2015-09-21    2015-09
## 1209          Check-Out              2015-09-23   2015-09-21    2015-09
## 1210          Check-Out              2015-09-24   2015-09-21    2015-09
## 1211          Check-Out              2015-09-24   2015-09-21    2015-09
## 1212          Check-Out              2015-09-28   2015-09-21    2015-09
## 1213          Check-Out              2015-09-28   2015-09-21    2015-09
## 1214          Check-Out              2015-09-28   2015-09-21    2015-09
## 1215          Check-Out              2015-09-28   2015-09-21    2015-09
## 1216          Check-Out              2015-09-28   2015-09-21    2015-09
## 1217          Check-Out              2015-09-28   2015-09-21    2015-09
## 1218          Check-Out              2015-09-30   2015-09-21    2015-09
## 1219          Check-Out              2015-10-01   2015-09-21    2015-09
## 1220          Check-Out              2015-10-01   2015-09-21    2015-09
## 1221          Check-Out              2015-10-01   2015-09-21    2015-09
## 1222          Check-Out              2015-10-02   2015-09-21    2015-09
## 1223          Check-Out              2015-09-24   2015-09-22    2015-09
## 1224          Check-Out              2015-09-29   2015-09-22    2015-09
## 1225          Check-Out              2015-09-29   2015-09-22    2015-09
## 1226          Check-Out              2015-09-29   2015-09-22    2015-09
## 1227          Check-Out              2015-09-29   2015-09-22    2015-09
## 1228          Check-Out              2015-09-30   2015-09-22    2015-09
## 1229          Check-Out              2015-09-24   2015-09-23    2015-09
## 1230          Check-Out              2015-09-24   2015-09-23    2015-09
## 1231          Check-Out              2015-09-24   2015-09-23    2015-09
## 1232          Check-Out              2015-09-25   2015-09-23    2015-09
## 1233          Check-Out              2015-09-25   2015-09-23    2015-09
## 1234          Check-Out              2015-09-28   2015-09-23    2015-09
## 1235          Check-Out              2015-09-30   2015-09-23    2015-09
## 1236          Check-Out              2015-10-01   2015-09-23    2015-09
## 1237          Check-Out              2015-10-02   2015-09-23    2015-09
## 1238          Check-Out              2015-09-27   2015-09-24    2015-09
## 1239          Check-Out              2015-09-26   2015-09-24    2015-09
## 1240          Check-Out              2015-09-26   2015-09-24    2015-09
## 1241          Check-Out              2015-09-27   2015-09-24    2015-09
## 1242          Check-Out              2015-09-25   2015-09-24    2015-09
## 1243          Check-Out              2015-09-29   2015-09-24    2015-09
## 1244          Check-Out              2015-09-29   2015-09-24    2015-09
## 1245          Check-Out              2015-10-01   2015-09-24    2015-09
## 1246          Check-Out              2015-10-01   2015-09-24    2015-09
## 1247          Check-Out              2015-10-04   2015-09-24    2015-09
## 1248          Check-Out              2015-10-08   2015-09-24    2015-09
## 1249          Check-Out              2015-09-26   2015-09-25    2015-09
## 1250          Check-Out              2015-09-26   2015-09-25    2015-09
## 1251          Check-Out              2015-09-26   2015-09-25    2015-09
## 1252          Check-Out              2015-09-26   2015-09-25    2015-09
## 1253          Check-Out              2015-09-26   2015-09-25    2015-09
## 1254          Check-Out              2015-09-27   2015-09-25    2015-09
## 1255          Check-Out              2015-09-27   2015-09-25    2015-09
## 1256          Check-Out              2015-09-27   2015-09-25    2015-09
## 1257          Check-Out              2015-09-27   2015-09-25    2015-09
## 1258          Check-Out              2015-09-30   2015-09-25    2015-09
## 1259          Check-Out              2015-09-30   2015-09-25    2015-09
## 1260          Check-Out              2015-10-02   2015-09-25    2015-09
## 1261          Check-Out              2015-10-02   2015-09-25    2015-09
## 1262          Check-Out              2015-10-02   2015-09-25    2015-09
## 1263          Check-Out              2015-10-03   2015-09-25    2015-09
## 1264          Check-Out              2015-09-27   2015-09-26    2015-09
## 1265          Check-Out              2015-09-28   2015-09-26    2015-09
## 1266          Check-Out              2015-09-28   2015-09-26    2015-09
## 1267          Check-Out              2015-09-29   2015-09-26    2015-09
## 1268          Check-Out              2015-10-01   2015-09-26    2015-09
## 1269          Check-Out              2015-10-02   2015-09-26    2015-09
## 1270          Check-Out              2015-10-03   2015-09-26    2015-09
## 1271          Check-Out              2015-10-03   2015-09-26    2015-09
## 1272          Check-Out              2015-10-03   2015-09-26    2015-09
## 1273          Check-Out              2015-10-01   2015-09-27    2015-09
## 1274          Check-Out              2015-09-28   2015-09-27    2015-09
## 1275          Check-Out              2015-09-28   2015-09-27    2015-09
## 1276          Check-Out              2015-10-02   2015-09-27    2015-09
## 1277          Check-Out              2015-10-04   2015-09-27    2015-09
## 1278          Check-Out              2015-10-04   2015-09-27    2015-09
## 1279          Check-Out              2015-10-04   2015-09-27    2015-09
## 1280          Check-Out              2015-10-04   2015-09-27    2015-09
## 1281          Check-Out              2015-10-04   2015-09-27    2015-09
## 1282          Check-Out              2015-10-04   2015-09-27    2015-09
## 1283          Check-Out              2015-10-04   2015-09-27    2015-09
## 1284          Check-Out              2015-10-07   2015-09-27    2015-09
## 1285          Check-Out              2015-10-09   2015-09-27    2015-09
## 1286          Check-Out              2015-10-11   2015-09-27    2015-09
## 1287          Check-Out              2015-09-29   2015-09-28    2015-09
## 1288          Check-Out              2015-09-30   2015-09-28    2015-09
## 1289          Check-Out              2015-10-02   2015-09-28    2015-09
## 1290          Check-Out              2015-10-02   2015-09-28    2015-09
## 1291          Check-Out              2015-10-05   2015-09-28    2015-09
## 1292          Check-Out              2015-10-05   2015-09-28    2015-09
## 1293          Check-Out              2015-10-05   2015-09-28    2015-09
## 1294          Check-Out              2015-10-06   2015-09-28    2015-09
## 1295          Check-Out              2015-10-10   2015-09-28    2015-09
## 1296          Check-Out              2015-10-06   2015-09-29    2015-09
## 1297          Check-Out              2015-10-06   2015-09-29    2015-09
## 1298          Check-Out              2015-10-03   2015-09-29    2015-09
## 1299          Check-Out              2015-10-06   2015-09-29    2015-09
## 1300          Check-Out              2015-10-06   2015-09-29    2015-09
## 1301          Check-Out              2015-10-07   2015-09-29    2015-09
## 1302          Check-Out              2015-10-08   2015-09-29    2015-09
## 1303          Check-Out              2015-10-11   2015-09-29    2015-09
## 1304          Check-Out              2015-10-01   2015-09-30    2015-09
## 1305          Check-Out              2015-10-01   2015-09-30    2015-09
## 1306          Check-Out              2015-10-01   2015-09-30    2015-09
## 1307          Check-Out              2015-10-02   2015-09-30    2015-09
## 1308          Check-Out              2015-10-03   2015-09-30    2015-09
## 1309          Check-Out              2015-10-03   2015-09-30    2015-09
## 1310          Check-Out              2015-10-03   2015-09-30    2015-09
## 1311          Check-Out              2015-10-03   2015-09-30    2015-09
## 1312          Check-Out              2015-10-03   2015-09-30    2015-09
## 1313          Check-Out              2015-10-03   2015-09-30    2015-09
## 1314          Check-Out              2015-10-03   2015-09-30    2015-09
## 1315          Check-Out              2015-10-03   2015-09-30    2015-09
## 1316          Check-Out              2015-10-06   2015-09-30    2015-09
## 1317          Check-Out              2015-10-06   2015-09-30    2015-09
## 1318          Check-Out              2015-10-07   2015-09-30    2015-09
## 1319          Check-Out              2015-10-07   2015-09-30    2015-09
## 1320          Check-Out              2015-10-07   2015-09-30    2015-09
## 1321          Check-Out              2015-10-07   2015-09-30    2015-09
## 1322          Check-Out              2015-10-07   2015-09-30    2015-09
## 1323          Check-Out              2015-10-07   2015-09-30    2015-09
## 1324          Check-Out              2015-10-07   2015-09-30    2015-09
## 1325          Check-Out              2015-10-14   2015-09-30    2015-09
## 1326          Check-Out              2015-10-02   2015-10-01    2015-10
## 1327          Check-Out              2015-10-04   2015-10-01    2015-10
## 1328          Check-Out              2015-10-04   2015-10-01    2015-10
## 1329          Check-Out              2015-10-04   2015-10-01    2015-10
## 1330          Check-Out              2015-10-04   2015-10-01    2015-10
## 1331          Check-Out              2015-10-05   2015-10-01    2015-10
## 1332          Check-Out              2015-10-05   2015-10-01    2015-10
## 1333          Check-Out              2015-10-05   2015-10-01    2015-10
## 1334          Check-Out              2015-10-06   2015-10-01    2015-10
## 1335          Check-Out              2015-10-06   2015-10-01    2015-10
## 1336          Check-Out              2015-10-06   2015-10-01    2015-10
## 1337          Check-Out              2015-10-08   2015-10-01    2015-10
## 1338          Check-Out              2015-10-08   2015-10-01    2015-10
## 1339          Check-Out              2015-10-08   2015-10-01    2015-10
## 1340          Check-Out              2015-10-08   2015-10-01    2015-10
## 1341          Check-Out              2015-10-08   2015-10-01    2015-10
## 1342          Check-Out              2015-10-08   2015-10-01    2015-10
## 1343          Check-Out              2015-10-08   2015-10-01    2015-10
## 1344          Check-Out              2015-10-08   2015-10-01    2015-10
## 1345          Check-Out              2015-10-08   2015-10-01    2015-10
## 1346          Check-Out              2015-10-08   2015-10-01    2015-10
## 1347          Check-Out              2015-10-04   2015-10-02    2015-10
## 1348          Check-Out              2015-10-04   2015-10-02    2015-10
## 1349          Check-Out              2015-10-04   2015-10-02    2015-10
## 1350          Check-Out              2015-10-04   2015-10-02    2015-10
## 1351          Check-Out              2015-10-06   2015-10-02    2015-10
## 1352          Check-Out              2015-10-06   2015-10-02    2015-10
## 1353          Check-Out              2015-10-07   2015-10-02    2015-10
## 1354          Check-Out              2015-10-09   2015-10-02    2015-10
## 1355          Check-Out              2015-10-09   2015-10-02    2015-10
## 1356          Check-Out              2015-10-09   2015-10-02    2015-10
## 1357          Check-Out              2015-10-09   2015-10-02    2015-10
## 1358          Check-Out              2015-10-09   2015-10-02    2015-10
## 1359          Check-Out              2015-10-09   2015-10-02    2015-10
## 1360          Check-Out              2015-10-09   2015-10-02    2015-10
## 1361          Check-Out              2015-10-09   2015-10-02    2015-10
## 1362          Check-Out              2015-10-10   2015-10-02    2015-10
## 1363          Check-Out              2015-10-10   2015-10-02    2015-10
## 1364          Check-Out              2015-10-10   2015-10-02    2015-10
## 1365          Check-Out              2015-10-04   2015-10-03    2015-10
## 1366          Check-Out              2015-10-04   2015-10-03    2015-10
## 1367          Check-Out              2015-10-04   2015-10-03    2015-10
## 1368          Check-Out              2015-10-04   2015-10-03    2015-10
## 1369          Check-Out              2015-10-04   2015-10-03    2015-10
## 1370          Check-Out              2015-10-07   2015-10-03    2015-10
## 1371          Check-Out              2015-10-07   2015-10-03    2015-10
## 1372          Check-Out              2015-10-07   2015-10-03    2015-10
## 1373          Check-Out              2015-10-07   2015-10-03    2015-10
## 1374          Check-Out              2015-10-07   2015-10-03    2015-10
## 1375          Check-Out              2015-10-07   2015-10-03    2015-10
## 1376          Check-Out              2015-10-07   2015-10-03    2015-10
## 1377          Check-Out              2015-10-10   2015-10-03    2015-10
## 1378          Check-Out              2015-10-06   2015-10-03    2015-10
## 1379          Check-Out              2015-10-06   2015-10-03    2015-10
## 1380          Check-Out              2015-10-10   2015-10-03    2015-10
## 1381          Check-Out              2015-10-10   2015-10-03    2015-10
## 1382          Check-Out              2015-10-10   2015-10-03    2015-10
## 1383          Check-Out              2015-10-10   2015-10-03    2015-10
## 1384          Check-Out              2015-10-10   2015-10-03    2015-10
## 1385          Check-Out              2015-10-10   2015-10-03    2015-10
## 1386          Check-Out              2015-10-10   2015-10-03    2015-10
## 1387          Check-Out              2015-10-10   2015-10-03    2015-10
## 1388          Check-Out              2015-10-10   2015-10-03    2015-10
## 1389          Check-Out              2015-10-10   2015-10-03    2015-10
## 1390          Check-Out              2015-10-05   2015-10-04    2015-10
## 1391          Check-Out              2015-10-05   2015-10-04    2015-10
## 1392          Check-Out              2015-10-06   2015-10-04    2015-10
## 1393          Check-Out              2015-10-06   2015-10-04    2015-10
## 1394          Check-Out              2015-10-11   2015-10-04    2015-10
## 1395          Check-Out              2015-10-11   2015-10-04    2015-10
## 1396          Check-Out              2015-10-14   2015-10-04    2015-10
## 1397          Check-Out              2015-10-15   2015-10-04    2015-10
## 1398          Check-Out              2015-10-09   2015-10-04    2015-10
## 1399          Check-Out              2015-10-09   2015-10-04    2015-10
## 1400          Check-Out              2015-10-18   2015-10-04    2015-10
## 1401          Check-Out              2015-10-10   2015-10-04    2015-10
## 1402          Check-Out              2015-10-10   2015-10-04    2015-10
## 1403          Check-Out              2015-10-06   2015-10-05    2015-10
## 1404          Check-Out              2015-10-07   2015-10-05    2015-10
## 1405          Check-Out              2015-10-07   2015-10-05    2015-10
## 1406          Check-Out              2015-10-09   2015-10-05    2015-10
## 1407          Check-Out              2015-10-09   2015-10-05    2015-10
## 1408          Check-Out              2015-10-09   2015-10-05    2015-10
## 1409          Check-Out              2015-10-12   2015-10-05    2015-10
## 1410          Check-Out              2015-10-12   2015-10-05    2015-10
## 1411          Check-Out              2015-10-12   2015-10-05    2015-10
## 1412          Check-Out              2015-10-15   2015-10-05    2015-10
## 1413          Check-Out              2015-10-06   2015-10-06    2015-10
## 1414          Check-Out              2015-10-07   2015-10-06    2015-10
## 1415          Check-Out              2015-10-08   2015-10-06    2015-10
## 1416          Check-Out              2015-10-10   2015-10-06    2015-10
## 1417          Check-Out              2015-10-08   2015-10-06    2015-10
## 1418          Check-Out              2015-10-12   2015-10-06    2015-10
## 1419          Check-Out              2015-10-13   2015-10-06    2015-10
## 1420          Check-Out              2015-10-13   2015-10-06    2015-10
## 1421          Check-Out              2015-10-13   2015-10-06    2015-10
## 1422          Check-Out              2015-10-08   2015-10-07    2015-10
## 1423          Check-Out              2015-10-09   2015-10-07    2015-10
## 1424          Check-Out              2015-10-09   2015-10-07    2015-10
## 1425          Check-Out              2015-10-09   2015-10-07    2015-10
## 1426          Check-Out              2015-10-08   2015-10-07    2015-10
## 1427          Check-Out              2015-10-08   2015-10-07    2015-10
## 1428          Check-Out              2015-10-08   2015-10-07    2015-10
## 1429          Check-Out              2015-10-11   2015-10-07    2015-10
## 1430          Check-Out              2015-10-09   2015-10-07    2015-10
## 1431          Check-Out              2015-10-14   2015-10-07    2015-10
## 1432          Check-Out              2015-10-14   2015-10-07    2015-10
## 1433          Check-Out              2015-10-14   2015-10-07    2015-10
## 1434          Check-Out              2015-10-14   2015-10-07    2015-10
## 1435          Check-Out              2015-10-14   2015-10-07    2015-10
## 1436          Check-Out              2015-10-14   2015-10-07    2015-10
## 1437          Check-Out              2015-10-09   2015-10-08    2015-10
## 1438          Check-Out              2015-10-09   2015-10-08    2015-10
## 1439          Check-Out              2015-10-09   2015-10-08    2015-10
## 1440          Check-Out              2015-10-09   2015-10-08    2015-10
## 1441          Check-Out              2015-10-11   2015-10-08    2015-10
## 1442          Check-Out              2015-10-11   2015-10-08    2015-10
## 1443          Check-Out              2015-10-11   2015-10-08    2015-10
## 1444          Check-Out              2015-10-11   2015-10-08    2015-10
## 1445          Check-Out              2015-10-11   2015-10-08    2015-10
## 1446          Check-Out              2015-10-11   2015-10-08    2015-10
## 1447          Check-Out              2015-10-11   2015-10-08    2015-10
## 1448          Check-Out              2015-10-11   2015-10-08    2015-10
## 1449          Check-Out              2015-10-11   2015-10-08    2015-10
## 1450          Check-Out              2015-10-11   2015-10-08    2015-10
## 1451          Check-Out              2015-10-11   2015-10-08    2015-10
## 1452          Check-Out              2015-10-11   2015-10-08    2015-10
## 1453          Check-Out              2015-10-11   2015-10-08    2015-10
## 1454          Check-Out              2015-10-11   2015-10-08    2015-10
## 1455          Check-Out              2015-10-11   2015-10-08    2015-10
## 1456          Check-Out              2015-10-11   2015-10-08    2015-10
## 1457          Check-Out              2015-10-12   2015-10-08    2015-10
## 1458          Check-Out              2015-10-15   2015-10-08    2015-10
## 1459          Check-Out              2015-10-15   2015-10-08    2015-10
## 1460          Check-Out              2015-10-12   2015-10-08    2015-10
## 1461          Check-Out              2015-10-15   2015-10-08    2015-10
## 1462          Check-Out              2015-10-15   2015-10-08    2015-10
## 1463          Check-Out              2015-10-20   2015-10-08    2015-10
## 1464          Check-Out              2015-10-10   2015-10-09    2015-10
## 1465          Check-Out              2015-10-10   2015-10-09    2015-10
## 1466          Check-Out              2015-10-10   2015-10-09    2015-10
## 1467          Check-Out              2015-10-11   2015-10-09    2015-10
## 1468          Check-Out              2015-10-11   2015-10-09    2015-10
## 1469          Check-Out              2015-10-11   2015-10-09    2015-10
## 1470          Check-Out              2015-10-11   2015-10-09    2015-10
## 1471          Check-Out              2015-10-11   2015-10-09    2015-10
## 1472          Check-Out              2015-10-12   2015-10-09    2015-10
## 1473          Check-Out              2015-10-12   2015-10-09    2015-10
## 1474          Check-Out              2015-10-12   2015-10-09    2015-10
## 1475          Check-Out              2015-10-11   2015-10-09    2015-10
## 1476          Check-Out              2015-10-11   2015-10-09    2015-10
## 1477          Check-Out              2015-10-12   2015-10-09    2015-10
## 1478          Check-Out              2015-10-12   2015-10-09    2015-10
## 1479          Check-Out              2015-10-12   2015-10-09    2015-10
## 1480          Check-Out              2015-10-12   2015-10-09    2015-10
## 1481          Check-Out              2015-10-12   2015-10-09    2015-10
## 1482          Check-Out              2015-10-12   2015-10-09    2015-10
## 1483          Check-Out              2015-10-12   2015-10-09    2015-10
## 1484          Check-Out              2015-10-12   2015-10-09    2015-10
## 1485          Check-Out              2015-10-12   2015-10-09    2015-10
## 1486          Check-Out              2015-10-13   2015-10-09    2015-10
## 1487          Check-Out              2015-10-13   2015-10-09    2015-10
## 1488          Check-Out              2015-10-13   2015-10-09    2015-10
## 1489          Check-Out              2015-10-13   2015-10-09    2015-10
## 1490          Check-Out              2015-10-14   2015-10-09    2015-10
## 1491          Check-Out              2015-10-14   2015-10-09    2015-10
## 1492          Check-Out              2015-10-09   2015-10-09    2015-10
## 1493          Check-Out              2015-10-11   2015-10-10    2015-10
## 1494          Check-Out              2015-10-11   2015-10-10    2015-10
## 1495          Check-Out              2015-10-11   2015-10-10    2015-10
## 1496          Check-Out              2015-10-12   2015-10-10    2015-10
## 1497          Check-Out              2015-10-12   2015-10-10    2015-10
## 1498          Check-Out              2015-10-12   2015-10-10    2015-10
## 1499          Check-Out              2015-10-12   2015-10-10    2015-10
## 1500          Check-Out              2015-10-12   2015-10-10    2015-10
## 1501          Check-Out              2015-10-12   2015-10-10    2015-10
## 1502          Check-Out              2015-10-12   2015-10-10    2015-10
## 1503          Check-Out              2015-10-12   2015-10-10    2015-10
## 1504          Check-Out              2015-10-12   2015-10-10    2015-10
## 1505          Check-Out              2015-10-12   2015-10-10    2015-10
## 1506          Check-Out              2015-10-12   2015-10-10    2015-10
## 1507          Check-Out              2015-10-12   2015-10-10    2015-10
## 1508          Check-Out              2015-10-12   2015-10-10    2015-10
## 1509          Check-Out              2015-10-12   2015-10-10    2015-10
## 1510          Check-Out              2015-10-12   2015-10-10    2015-10
## 1511          Check-Out              2015-10-19   2015-10-10    2015-10
## 1512          Check-Out              2015-10-31   2015-10-10    2015-10
## 1513          Check-Out              2015-10-12   2015-10-11    2015-10
## 1514          Check-Out              2015-10-12   2015-10-11    2015-10
## 1515          Check-Out              2015-10-12   2015-10-11    2015-10
## 1516          Check-Out              2015-10-12   2015-10-11    2015-10
## 1517          Check-Out              2015-10-12   2015-10-11    2015-10
## 1518          Check-Out              2015-10-12   2015-10-11    2015-10
## 1519          Check-Out              2015-10-13   2015-10-11    2015-10
## 1520          Check-Out              2015-10-13   2015-10-11    2015-10
## 1521          Check-Out              2015-10-13   2015-10-11    2015-10
## 1522          Check-Out              2015-10-13   2015-10-11    2015-10
## 1523          Check-Out              2015-10-12   2015-10-11    2015-10
## 1524          Check-Out              2015-10-15   2015-10-11    2015-10
## 1525          Check-Out              2015-10-16   2015-10-11    2015-10
## 1526          Check-Out              2015-10-16   2015-10-11    2015-10
## 1527          Check-Out              2015-10-18   2015-10-11    2015-10
## 1528          Check-Out              2015-10-18   2015-10-11    2015-10
## 1529          Check-Out              2015-10-11   2015-10-11    2015-10
## 1530          Check-Out              2015-10-12   2015-10-12    2015-10
## 1531          Check-Out              2015-10-13   2015-10-12    2015-10
## 1532          Check-Out              2015-10-13   2015-10-12    2015-10
## 1533          Check-Out              2015-10-13   2015-10-12    2015-10
## 1534          Check-Out              2015-10-14   2015-10-12    2015-10
## 1535          Check-Out              2015-10-14   2015-10-12    2015-10
## 1536          Check-Out              2015-10-14   2015-10-12    2015-10
## 1537          Check-Out              2015-10-18   2015-10-12    2015-10
## 1538          Check-Out              2015-10-12   2015-10-12    2015-10
## 1539          Check-Out              2015-10-20   2015-10-12    2015-10
## 1540          Check-Out              2015-10-14   2015-10-13    2015-10
## 1541          Check-Out              2015-10-14   2015-10-13    2015-10
## 1542          Check-Out              2015-10-14   2015-10-13    2015-10
## 1543          Check-Out              2015-10-14   2015-10-13    2015-10
## 1544          Check-Out              2015-10-14   2015-10-13    2015-10
## 1545          Check-Out              2015-10-15   2015-10-13    2015-10
## 1546          Check-Out              2015-10-20   2015-10-13    2015-10
## 1547          Check-Out              2015-10-21   2015-10-13    2015-10
## 1548          Check-Out              2015-10-15   2015-10-14    2015-10
## 1549          Check-Out              2015-10-15   2015-10-14    2015-10
## 1550          Check-Out              2015-10-15   2015-10-14    2015-10
## 1551          Check-Out              2015-10-15   2015-10-14    2015-10
## 1552          Check-Out              2015-10-15   2015-10-14    2015-10
## 1553          Check-Out              2015-10-15   2015-10-14    2015-10
## 1554          Check-Out              2015-10-15   2015-10-14    2015-10
## 1555          Check-Out              2015-10-22   2015-10-14    2015-10
## 1556          Check-Out              2015-10-15   2015-10-15    2015-10
## 1557          Check-Out              2015-10-18   2015-10-15    2015-10
## 1558          Check-Out              2015-10-19   2015-10-15    2015-10
## 1559          Check-Out              2015-10-21   2015-10-15    2015-10
## 1560          Check-Out              2015-10-16   2015-10-16    2015-10
## 1561          Check-Out              2015-10-16   2015-10-16    2015-10
## 1562          Check-Out              2015-10-16   2015-10-16    2015-10
## 1563          Check-Out              2015-10-17   2015-10-16    2015-10
## 1564          Check-Out              2015-10-17   2015-10-16    2015-10
## 1565          Check-Out              2015-10-17   2015-10-16    2015-10
## 1566          Check-Out              2015-10-18   2015-10-16    2015-10
## 1567          Check-Out              2015-10-18   2015-10-16    2015-10
## 1568          Check-Out              2015-10-19   2015-10-16    2015-10
## 1569          Check-Out              2015-10-19   2015-10-16    2015-10
## 1570          Check-Out              2015-10-20   2015-10-16    2015-10
## 1571          Check-Out              2015-10-23   2015-10-16    2015-10
## 1572          Check-Out              2015-10-18   2015-10-17    2015-10
## 1573          Check-Out              2015-10-24   2015-10-17    2015-10
## 1574          Check-Out              2015-10-25   2015-10-17    2015-10
## 1575          Check-Out              2015-10-22   2015-10-18    2015-10
## 1576          Check-Out              2015-10-25   2015-10-18    2015-10
## 1577          Check-Out              2015-10-25   2015-10-18    2015-10
## 1578          Check-Out              2015-10-25   2015-10-18    2015-10
## 1579          Check-Out              2015-10-25   2015-10-18    2015-10
## 1580          Check-Out              2015-10-25   2015-10-18    2015-10
## 1581          Check-Out              2015-10-28   2015-10-18    2015-10
## 1582          Check-Out              2015-10-27   2015-10-18    2015-10
## 1583          Check-Out              2015-10-20   2015-10-19    2015-10
## 1584          Check-Out              2015-10-21   2015-10-19    2015-10
## 1585          Check-Out              2015-10-21   2015-10-19    2015-10
## 1586          Check-Out              2015-10-21   2015-10-19    2015-10
## 1587          Check-Out              2015-10-20   2015-10-19    2015-10
## 1588          Check-Out              2015-10-21   2015-10-19    2015-10
## 1589          Check-Out              2015-10-22   2015-10-19    2015-10
## 1590          Check-Out              2015-10-22   2015-10-19    2015-10
## 1591          Check-Out              2015-10-22   2015-10-19    2015-10
## 1592          Check-Out              2015-10-23   2015-10-19    2015-10
## 1593          Check-Out              2015-10-24   2015-10-19    2015-10
## 1594          Check-Out              2015-10-24   2015-10-19    2015-10
## 1595          Check-Out              2015-10-24   2015-10-19    2015-10
## 1596          Check-Out              2015-10-24   2015-10-19    2015-10
## 1597          Check-Out              2015-10-24   2015-10-19    2015-10
## 1598          Check-Out              2015-10-24   2015-10-19    2015-10
## 1599          Check-Out              2015-10-24   2015-10-19    2015-10
## 1600          Check-Out              2015-10-24   2015-10-19    2015-10
## 1601          Check-Out              2015-10-24   2015-10-19    2015-10
## 1602          Check-Out              2015-10-24   2015-10-19    2015-10
## 1603          Check-Out              2015-10-24   2015-10-19    2015-10
## 1604          Check-Out              2015-10-24   2015-10-19    2015-10
## 1605          Check-Out              2015-10-24   2015-10-19    2015-10
## 1606          Check-Out              2015-10-24   2015-10-19    2015-10
## 1607          Check-Out              2015-10-24   2015-10-19    2015-10
## 1608          Check-Out              2015-10-24   2015-10-19    2015-10
## 1609          Check-Out              2015-10-24   2015-10-19    2015-10
## 1610          Check-Out              2015-10-24   2015-10-19    2015-10
## 1611          Check-Out              2015-10-24   2015-10-19    2015-10
## 1612          Check-Out              2015-10-24   2015-10-19    2015-10
## 1613          Check-Out              2015-10-24   2015-10-19    2015-10
## 1614          Check-Out              2015-10-24   2015-10-19    2015-10
## 1615          Check-Out              2015-10-24   2015-10-19    2015-10
## 1616          Check-Out              2015-10-24   2015-10-19    2015-10
## 1617          Check-Out              2015-10-26   2015-10-19    2015-10
## 1618          Check-Out              2015-10-26   2015-10-19    2015-10
## 1619          Check-Out              2015-10-27   2015-10-19    2015-10
## 1620          Check-Out              2015-10-30   2015-10-19    2015-10
## 1621          Check-Out              2015-11-05   2015-10-19    2015-10
## 1622          Check-Out              2015-10-21   2015-10-20    2015-10
## 1623          Check-Out              2015-10-21   2015-10-20    2015-10
## 1624          Check-Out              2015-10-21   2015-10-20    2015-10
## 1625          Check-Out              2015-10-22   2015-10-20    2015-10
## 1626          Check-Out              2015-10-22   2015-10-20    2015-10
## 1627          Check-Out              2015-10-25   2015-10-20    2015-10
## 1628          Check-Out              2015-10-25   2015-10-20    2015-10
## 1629          Check-Out              2015-10-27   2015-10-20    2015-10
## 1630          Check-Out              2015-10-27   2015-10-20    2015-10
## 1631          Check-Out              2015-10-29   2015-10-20    2015-10
## 1632          Check-Out              2015-10-30   2015-10-20    2015-10
## 1633          Check-Out              2015-10-21   2015-10-21    2015-10
## 1634          Check-Out              2015-10-21   2015-10-21    2015-10
## 1635          Check-Out              2015-10-23   2015-10-21    2015-10
## 1636          Check-Out              2015-10-23   2015-10-21    2015-10
## 1637          Check-Out              2015-10-24   2015-10-21    2015-10
## 1638          Check-Out              2015-10-24   2015-10-21    2015-10
## 1639          Check-Out              2015-10-24   2015-10-21    2015-10
## 1640          Check-Out              2015-10-25   2015-10-21    2015-10
## 1641          Check-Out              2015-10-25   2015-10-21    2015-10
## 1642          Check-Out              2015-10-28   2015-10-21    2015-10
## 1643          Check-Out              2015-10-28   2015-10-21    2015-10
## 1644          Check-Out              2015-10-28   2015-10-21    2015-10
## 1645          Check-Out              2015-10-28   2015-10-21    2015-10
## 1646          Check-Out              2015-10-28   2015-10-21    2015-10
## 1647          Check-Out              2015-10-28   2015-10-21    2015-10
## 1648          Check-Out              2015-10-26   2015-10-22    2015-10
## 1649          Check-Out              2015-10-26   2015-10-22    2015-10
## 1650          Check-Out              2015-10-26   2015-10-22    2015-10
## 1651          Check-Out              2015-10-27   2015-10-22    2015-10
## 1652          Check-Out              2015-10-29   2015-10-22    2015-10
## 1653          Check-Out              2015-10-29   2015-10-22    2015-10
## 1654          Check-Out              2015-10-29   2015-10-22    2015-10
## 1655          Check-Out              2015-10-29   2015-10-22    2015-10
## 1656          Check-Out              2015-10-29   2015-10-22    2015-10
## 1657          Check-Out              2015-10-26   2015-10-22    2015-10
## 1658          Check-Out              2015-10-26   2015-10-22    2015-10
## 1659          Check-Out              2015-10-26   2015-10-22    2015-10
## 1660          Check-Out              2015-10-26   2015-10-22    2015-10
## 1661          Check-Out              2015-10-26   2015-10-22    2015-10
## 1662          Check-Out              2015-10-26   2015-10-22    2015-10
## 1663          Check-Out              2015-10-26   2015-10-22    2015-10
## 1664          Check-Out              2015-10-26   2015-10-22    2015-10
## 1665          Check-Out              2015-10-26   2015-10-22    2015-10
## 1666          Check-Out              2015-10-29   2015-10-22    2015-10
## 1667          Check-Out              2015-10-29   2015-10-22    2015-10
## 1668          Check-Out              2015-10-29   2015-10-22    2015-10
## 1669          Check-Out              2015-10-25   2015-10-22    2015-10
## 1670          Check-Out              2015-10-25   2015-10-22    2015-10
## 1671          Check-Out              2015-10-25   2015-10-22    2015-10
## 1672          Check-Out              2015-10-25   2015-10-22    2015-10
## 1673          Check-Out              2015-10-25   2015-10-22    2015-10
## 1674          Check-Out              2015-10-26   2015-10-22    2015-10
## 1675          Check-Out              2015-10-24   2015-10-23    2015-10
## 1676          Check-Out              2015-10-24   2015-10-23    2015-10
## 1677          Check-Out              2015-10-24   2015-10-23    2015-10
## 1678          Check-Out              2015-10-25   2015-10-23    2015-10
## 1679          Check-Out              2015-10-25   2015-10-23    2015-10
## 1680          Check-Out              2015-10-25   2015-10-23    2015-10
## 1681          Check-Out              2015-10-25   2015-10-23    2015-10
## 1682          Check-Out              2015-10-25   2015-10-23    2015-10
## 1683          Check-Out              2015-10-25   2015-10-23    2015-10
## 1684          Check-Out              2015-10-25   2015-10-23    2015-10
## 1685          Check-Out              2015-10-25   2015-10-23    2015-10
## 1686          Check-Out              2015-10-26   2015-10-23    2015-10
## 1687          Check-Out              2015-10-27   2015-10-23    2015-10
## 1688          Check-Out              2015-10-27   2015-10-23    2015-10
## 1689          Check-Out              2015-10-27   2015-10-23    2015-10
## 1690          Check-Out              2015-10-28   2015-10-23    2015-10
## 1691          Check-Out              2015-10-28   2015-10-23    2015-10
## 1692          Check-Out              2015-10-29   2015-10-23    2015-10
## 1693          Check-Out              2015-10-30   2015-10-23    2015-10
## 1694          Check-Out              2015-10-30   2015-10-23    2015-10
## 1695          Check-Out              2015-10-30   2015-10-23    2015-10
## 1696          Check-Out              2015-11-03   2015-10-23    2015-10
## 1697          Check-Out              2015-11-07   2015-10-23    2015-10
## 1698          Check-Out              2015-10-25   2015-10-23    2015-10
## 1699          Check-Out              2015-10-25   2015-10-23    2015-10
## 1700          Check-Out              2015-10-26   2015-10-23    2015-10
## 1701          Check-Out              2015-10-26   2015-10-23    2015-10
## 1702          Check-Out              2015-10-25   2015-10-23    2015-10
## 1703          Check-Out              2015-10-25   2015-10-24    2015-10
## 1704          Check-Out              2015-10-26   2015-10-24    2015-10
## 1705          Check-Out              2015-10-27   2015-10-24    2015-10
## 1706          Check-Out              2015-10-28   2015-10-24    2015-10
## 1707          Check-Out              2015-10-28   2015-10-24    2015-10
## 1708          Check-Out              2015-10-29   2015-10-24    2015-10
## 1709          Check-Out              2015-10-30   2015-10-24    2015-10
## 1710          Check-Out              2015-10-31   2015-10-24    2015-10
## 1711          Check-Out              2015-11-03   2015-10-24    2015-10
## 1712          Check-Out              2015-11-04   2015-10-24    2015-10
## 1713          Check-Out              2015-10-25   2015-10-24    2015-10
## 1714          Check-Out              2015-10-25   2015-10-24    2015-10
## 1715          Check-Out              2015-10-31   2015-10-25    2015-10
## 1716          Check-Out              2015-10-31   2015-10-25    2015-10
## 1717          Check-Out              2015-11-01   2015-10-25    2015-10
## 1718          Check-Out              2015-11-01   2015-10-25    2015-10
## 1719          Check-Out              2015-11-02   2015-10-25    2015-10
## 1720          Check-Out              2015-10-26   2015-10-26    2015-10
## 1721          Check-Out              2015-10-27   2015-10-26    2015-10
## 1722          Check-Out              2015-10-31   2015-10-26    2015-10
## 1723          Check-Out              2015-11-17   2015-10-26    2015-10
## 1724          Check-Out              2015-10-28   2015-10-27    2015-10
## 1725          Check-Out              2015-10-28   2015-10-27    2015-10
## 1726          Check-Out              2015-10-28   2015-10-27    2015-10
## 1727          Check-Out              2015-10-28   2015-10-27    2015-10
## 1728          Check-Out              2015-10-28   2015-10-27    2015-10
## 1729          Check-Out              2015-10-29   2015-10-27    2015-10
## 1730          Check-Out              2015-10-29   2015-10-27    2015-10
## 1731          Check-Out              2015-10-29   2015-10-27    2015-10
## 1732          Check-Out              2015-10-29   2015-10-27    2015-10
## 1733          Check-Out              2015-10-29   2015-10-27    2015-10
## 1734          Check-Out              2015-10-30   2015-10-27    2015-10
## 1735          Check-Out              2015-10-31   2015-10-27    2015-10
## 1736          Check-Out              2015-10-31   2015-10-27    2015-10
## 1737          Check-Out              2015-11-03   2015-10-27    2015-10
## 1738          Check-Out              2015-11-03   2015-10-27    2015-10
## 1739          Check-Out              2015-10-29   2015-10-28    2015-10
## 1740          Check-Out              2015-10-29   2015-10-28    2015-10
## 1741          Check-Out              2015-10-29   2015-10-28    2015-10
## 1742          Check-Out              2015-10-29   2015-10-28    2015-10
## 1743          Check-Out              2015-11-04   2015-10-28    2015-10
## 1744          Check-Out              2015-11-04   2015-10-28    2015-10
## 1745          Check-Out              2015-11-04   2015-10-28    2015-10
## 1746          Check-Out              2015-11-04   2015-10-28    2015-10
## 1747          Check-Out              2015-10-29   2015-10-28    2015-10
## 1748          Check-Out              2015-10-30   2015-10-28    2015-10
## 1749          Check-Out              2015-10-30   2015-10-29    2015-10
## 1750          Check-Out              2015-10-30   2015-10-29    2015-10
## 1751          Check-Out              2015-10-31   2015-10-29    2015-10
## 1752          Check-Out              2015-10-31   2015-10-29    2015-10
## 1753          Check-Out              2015-10-30   2015-10-29    2015-10
## 1754          Check-Out              2015-11-01   2015-10-29    2015-10
## 1755          Check-Out              2015-11-01   2015-10-29    2015-10
## 1756          Check-Out              2015-11-01   2015-10-29    2015-10
## 1757          Check-Out              2015-11-01   2015-10-29    2015-10
## 1758          Check-Out              2015-11-02   2015-10-29    2015-10
## 1759          Check-Out              2015-11-03   2015-10-29    2015-10
## 1760          Check-Out              2015-10-31   2015-10-30    2015-10
## 1761          Check-Out              2015-10-31   2015-10-30    2015-10
## 1762          Check-Out              2015-10-31   2015-10-30    2015-10
## 1763          Check-Out              2015-11-01   2015-10-30    2015-10
## 1764          Check-Out              2015-11-01   2015-10-30    2015-10
## 1765          Check-Out              2015-11-01   2015-10-30    2015-10
## 1766          Check-Out              2015-11-01   2015-10-30    2015-10
## 1767          Check-Out              2015-11-01   2015-10-30    2015-10
## 1768          Check-Out              2015-11-01   2015-10-30    2015-10
## 1769          Check-Out              2015-11-01   2015-10-30    2015-10
## 1770          Check-Out              2015-11-02   2015-10-30    2015-10
## 1771          Check-Out              2015-10-30   2015-10-30    2015-10
## 1772          Check-Out              2015-11-01   2015-10-30    2015-10
## 1773          Check-Out              2015-11-01   2015-10-30    2015-10
## 1774          Check-Out              2015-11-02   2015-10-30    2015-10
## 1775          Check-Out              2015-11-02   2015-10-30    2015-10
## 1776          Check-Out              2015-11-02   2015-10-30    2015-10
## 1777          Check-Out              2015-11-02   2015-10-30    2015-10
## 1778          Check-Out              2015-11-02   2015-10-30    2015-10
## 1779          Check-Out              2015-11-02   2015-10-30    2015-10
## 1780          Check-Out              2015-11-02   2015-10-30    2015-10
## 1781          Check-Out              2015-11-03   2015-10-30    2015-10
## 1782          Check-Out              2015-11-06   2015-10-30    2015-10
## 1783          Check-Out              2015-11-07   2015-10-30    2015-10
## 1784          Check-Out              2015-10-31   2015-10-31    2015-10
## 1785          Check-Out              2015-11-01   2015-10-31    2015-10
## 1786          Check-Out              2015-11-01   2015-10-31    2015-10
## 1787          Check-Out              2015-11-01   2015-10-31    2015-10
## 1788          Check-Out              2015-11-01   2015-10-31    2015-10
## 1789          Check-Out              2015-11-01   2015-10-31    2015-10
## 1790          Check-Out              2015-11-01   2015-10-31    2015-10
## 1791          Check-Out              2015-11-01   2015-10-31    2015-10
## 1792          Check-Out              2015-11-01   2015-10-31    2015-10
## 1793          Check-Out              2015-11-01   2015-10-31    2015-10
## 1794          Check-Out              2015-11-01   2015-10-31    2015-10
## 1795          Check-Out              2015-11-01   2015-10-31    2015-10
## 1796          Check-Out              2015-11-01   2015-10-31    2015-10
## 1797          Check-Out              2015-11-01   2015-10-31    2015-10
## 1798          Check-Out              2015-11-01   2015-10-31    2015-10
## 1799          Check-Out              2015-11-01   2015-10-31    2015-10
## 1800          Check-Out              2015-11-01   2015-10-31    2015-10
## 1801          Check-Out              2015-11-01   2015-10-31    2015-10
## 1802          Check-Out              2015-11-01   2015-10-31    2015-10
## 1803          Check-Out              2015-11-01   2015-10-31    2015-10
## 1804          Check-Out              2015-11-01   2015-10-31    2015-10
## 1805          Check-Out              2015-11-01   2015-10-31    2015-10
## 1806          Check-Out              2015-11-01   2015-10-31    2015-10
## 1807          Check-Out              2015-11-01   2015-10-31    2015-10
## 1808          Check-Out              2015-11-01   2015-10-31    2015-10
## 1809          Check-Out              2015-11-01   2015-10-31    2015-10
## 1810          Check-Out              2015-11-01   2015-10-31    2015-10
## 1811          Check-Out              2015-11-01   2015-10-31    2015-10
## 1812          Check-Out              2015-11-01   2015-10-31    2015-10
## 1813          Check-Out              2015-11-02   2015-10-31    2015-10
## 1814          Check-Out              2015-11-02   2015-10-31    2015-10
## 1815          Check-Out              2015-11-02   2015-10-31    2015-10
## 1816          Check-Out              2015-11-02   2015-10-31    2015-10
## 1817          Check-Out              2015-11-02   2015-10-31    2015-10
## 1818          Check-Out              2015-11-03   2015-10-31    2015-10
## 1819          Check-Out              2015-11-06   2015-10-31    2015-10
## 1820          Check-Out              2015-11-07   2015-10-31    2015-10
## 1821          Check-Out              2015-11-07   2015-10-31    2015-10
## 1822          Check-Out              2015-11-02   2015-11-01    2015-11
## 1823          Check-Out              2015-11-02   2015-11-01    2015-11
## 1824          Check-Out              2015-11-02   2015-11-01    2015-11
## 1825          Check-Out              2015-11-06   2015-11-01    2015-11
## 1826          Check-Out              2015-11-10   2015-11-01    2015-11
## 1827          Check-Out              2015-11-07   2015-11-02    2015-11
## 1828          Check-Out              2015-11-07   2015-11-02    2015-11
## 1829          Check-Out              2015-11-07   2015-11-02    2015-11
## 1830          Check-Out              2015-11-05   2015-11-02    2015-11
## 1831          Check-Out              2015-11-08   2015-11-02    2015-11
## 1832          Check-Out              2015-11-09   2015-11-02    2015-11
## 1833          Check-Out              2015-11-09   2015-11-02    2015-11
## 1834          Check-Out              2015-11-09   2015-11-02    2015-11
## 1835          Check-Out              2015-11-03   2015-11-03    2015-11
## 1836          Check-Out              2015-11-04   2015-11-03    2015-11
## 1837          Check-Out              2015-11-04   2015-11-03    2015-11
## 1838          Check-Out              2015-11-04   2015-11-03    2015-11
## 1839          Check-Out              2015-11-04   2015-11-03    2015-11
## 1840          Check-Out              2015-11-04   2015-11-03    2015-11
## 1841          Check-Out              2015-11-05   2015-11-03    2015-11
## 1842          Check-Out              2015-11-06   2015-11-03    2015-11
## 1843          Check-Out              2015-11-06   2015-11-03    2015-11
## 1844          Check-Out              2015-11-07   2015-11-03    2015-11
## 1845          Check-Out              2015-11-07   2015-11-03    2015-11
## 1846          Check-Out              2015-11-07   2015-11-03    2015-11
## 1847          Check-Out              2015-11-07   2015-11-03    2015-11
## 1848          Check-Out              2015-11-10   2015-11-03    2015-11
## 1849          Check-Out              2015-11-05   2015-11-03    2015-11
## 1850          Check-Out              2015-11-15   2015-11-03    2015-11
## 1851          Check-Out              2015-11-16   2015-11-03    2015-11
## 1852          Check-Out              2015-11-16   2015-11-03    2015-11
## 1853          Check-Out              2015-11-16   2015-11-03    2015-11
## 1854          Check-Out              2015-11-16   2015-11-03    2015-11
## 1855          Check-Out              2015-11-16   2015-11-03    2015-11
## 1856          Check-Out              2015-11-16   2015-11-03    2015-11
## 1857          Check-Out              2015-11-16   2015-11-03    2015-11
## 1858          Check-Out              2015-11-05   2015-11-04    2015-11
## 1859          Check-Out              2015-11-05   2015-11-04    2015-11
## 1860          Check-Out              2015-11-06   2015-11-04    2015-11
## 1861          Check-Out              2015-11-06   2015-11-04    2015-11
## 1862          Check-Out              2015-11-15   2015-11-04    2015-11
## 1863          Check-Out              2015-11-06   2015-11-05    2015-11
## 1864          Check-Out              2015-11-06   2015-11-05    2015-11
## 1865          Check-Out              2015-11-06   2015-11-05    2015-11
## 1866          Check-Out              2015-11-11   2015-11-05    2015-11
## 1867          Check-Out              2015-11-11   2015-11-05    2015-11
## 1868          Check-Out              2015-11-15   2015-11-05    2015-11
## 1869          Check-Out              2015-11-15   2015-11-05    2015-11
## 1870          Check-Out              2015-11-15   2015-11-05    2015-11
## 1871          Check-Out              2015-11-07   2015-11-06    2015-11
## 1872          Check-Out              2015-11-07   2015-11-06    2015-11
## 1873          Check-Out              2015-11-07   2015-11-06    2015-11
## 1874          Check-Out              2015-11-07   2015-11-06    2015-11
## 1875          Check-Out              2015-11-08   2015-11-06    2015-11
## 1876          Check-Out              2015-11-08   2015-11-06    2015-11
## 1877          Check-Out              2015-11-08   2015-11-06    2015-11
## 1878          Check-Out              2015-11-08   2015-11-06    2015-11
## 1879          Check-Out              2015-11-10   2015-11-06    2015-11
## 1880          Check-Out              2015-11-15   2015-11-06    2015-11
## 1881          Check-Out              2015-11-17   2015-11-06    2015-11
## 1882          Check-Out              2015-11-17   2015-11-06    2015-11
## 1883          Check-Out              2015-11-17   2015-11-06    2015-11
## 1884          Check-Out              2015-11-17   2015-11-06    2015-11
## 1885          Check-Out              2015-11-15   2015-11-06    2015-11
## 1886          Check-Out              2015-11-15   2015-11-06    2015-11
## 1887          Check-Out              2015-11-07   2015-11-07    2015-11
## 1888          Check-Out              2015-11-08   2015-11-07    2015-11
## 1889          Check-Out              2015-11-08   2015-11-07    2015-11
## 1890          Check-Out              2015-11-08   2015-11-07    2015-11
## 1891          Check-Out              2015-11-08   2015-11-07    2015-11
## 1892          Check-Out              2015-11-09   2015-11-07    2015-11
## 1893          Check-Out              2015-11-10   2015-11-07    2015-11
## 1894          Check-Out              2015-11-12   2015-11-07    2015-11
## 1895          Check-Out              2015-11-12   2015-11-07    2015-11
## 1896          Check-Out              2015-11-14   2015-11-07    2015-11
## 1897          Check-Out              2015-11-14   2015-11-07    2015-11
## 1898          Check-Out              2015-11-15   2015-11-07    2015-11
## 1899          Check-Out              2015-11-15   2015-11-07    2015-11
## 1900          Check-Out              2015-11-15   2015-11-07    2015-11
## 1901          Check-Out              2015-11-15   2015-11-07    2015-11
## 1902          Check-Out              2015-11-15   2015-11-07    2015-11
## 1903          Check-Out              2015-11-15   2015-11-07    2015-11
## 1904          Check-Out              2015-11-15   2015-11-07    2015-11
## 1905          Check-Out              2015-11-15   2015-11-07    2015-11
## 1906          Check-Out              2015-11-15   2015-11-07    2015-11
## 1907          Check-Out              2015-11-17   2015-11-07    2015-11
## 1908          Check-Out              2015-11-10   2015-11-08    2015-11
## 1909          Check-Out              2015-11-14   2015-11-08    2015-11
## 1910          Check-Out              2015-11-14   2015-11-08    2015-11
## 1911          Check-Out              2015-11-15   2015-11-08    2015-11
## 1912          Check-Out              2015-11-15   2015-11-08    2015-11
## 1913          Check-Out              2015-11-15   2015-11-08    2015-11
## 1914          Check-Out              2015-11-15   2015-11-08    2015-11
## 1915          Check-Out              2015-11-15   2015-11-08    2015-11
## 1916          Check-Out              2015-11-15   2015-11-08    2015-11
## 1917          Check-Out              2015-11-15   2015-11-08    2015-11
## 1918          Check-Out              2015-11-09   2015-11-09    2015-11
## 1919          Check-Out              2015-11-10   2015-11-09    2015-11
## 1920          Check-Out              2015-11-10   2015-11-09    2015-11
## 1921          Check-Out              2015-11-10   2015-11-09    2015-11
## 1922          Check-Out              2015-11-11   2015-11-09    2015-11
## 1923          Check-Out              2015-11-10   2015-11-09    2015-11
## 1924          Check-Out              2015-11-12   2015-11-09    2015-11
## 1925          Check-Out              2015-11-13   2015-11-09    2015-11
## 1926          Check-Out              2015-11-13   2015-11-09    2015-11
## 1927          Check-Out              2015-11-15   2015-11-09    2015-11
## 1928          Check-Out              2015-11-15   2015-11-09    2015-11
## 1929          Check-Out              2015-11-13   2015-11-09    2015-11
## 1930          Check-Out              2015-11-16   2015-11-09    2015-11
## 1931          Check-Out              2015-11-12   2015-11-10    2015-11
## 1932          Check-Out              2015-11-12   2015-11-10    2015-11
## 1933          Check-Out              2015-11-15   2015-11-10    2015-11
## 1934          Check-Out              2015-11-12   2015-11-11    2015-11
## 1935          Check-Out              2015-11-12   2015-11-11    2015-11
## 1936          Check-Out              2015-11-15   2015-11-11    2015-11
## 1937          Check-Out              2015-11-15   2015-11-11    2015-11
## 1938          Check-Out              2015-11-15   2015-11-11    2015-11
## 1939          Check-Out              2015-11-15   2015-11-11    2015-11
## 1940          Check-Out              2015-11-15   2015-11-11    2015-11
## 1941          Check-Out              2015-11-15   2015-11-11    2015-11
## 1942          Check-Out              2015-11-15   2015-11-11    2015-11
## 1943          Check-Out              2015-11-15   2015-11-11    2015-11
## 1944          Check-Out              2015-11-15   2015-11-11    2015-11
## 1945          Check-Out              2015-11-15   2015-11-11    2015-11
## 1946          Check-Out              2015-11-15   2015-11-11    2015-11
## 1947          Check-Out              2015-11-15   2015-11-11    2015-11
## 1948          Check-Out              2015-11-15   2015-11-11    2015-11
## 1949          Check-Out              2015-11-16   2015-11-11    2015-11
## 1950          Check-Out              2015-11-16   2015-11-11    2015-11
## 1951          Check-Out              2015-11-14   2015-11-11    2015-11
## 1952          Check-Out              2015-11-14   2015-11-12    2015-11
## 1953          Check-Out              2015-11-14   2015-11-12    2015-11
## 1954          Check-Out              2015-11-15   2015-11-12    2015-11
## 1955          Check-Out              2015-11-15   2015-11-12    2015-11
## 1956          Check-Out              2015-11-15   2015-11-12    2015-11
## 1957          Check-Out              2015-11-15   2015-11-12    2015-11
## 1958          Check-Out              2015-11-15   2015-11-12    2015-11
## 1959          Check-Out              2015-11-15   2015-11-12    2015-11
## 1960          Check-Out              2015-11-15   2015-11-12    2015-11
## 1961          Check-Out              2015-11-15   2015-11-12    2015-11
## 1962          Check-Out              2015-11-14   2015-11-12    2015-11
## 1963          Check-Out              2015-11-15   2015-11-12    2015-11
## 1964          Check-Out              2015-11-15   2015-11-12    2015-11
## 1965          Check-Out              2015-11-15   2015-11-12    2015-11
## 1966          Check-Out              2015-11-15   2015-11-12    2015-11
## 1967          Check-Out              2015-11-15   2015-11-12    2015-11
## 1968          Check-Out              2015-11-15   2015-11-12    2015-11
## 1969          Check-Out              2015-11-16   2015-11-12    2015-11
## 1970          Check-Out              2015-11-14   2015-11-12    2015-11
## 1971          Check-Out              2015-11-13   2015-11-13    2015-11
## 1972          Check-Out              2015-11-13   2015-11-13    2015-11
## 1973          Check-Out              2015-11-14   2015-11-13    2015-11
## 1974          Check-Out              2015-11-14   2015-11-13    2015-11
## 1975          Check-Out              2015-11-15   2015-11-13    2015-11
## 1976          Check-Out              2015-11-14   2015-11-13    2015-11
## 1977          Check-Out              2015-11-15   2015-11-13    2015-11
## 1978          Check-Out              2015-11-15   2015-11-13    2015-11
## 1979          Check-Out              2015-11-18   2015-11-14    2015-11
## 1980          Check-Out              2015-11-22   2015-11-14    2015-11
## 1981          Check-Out              2015-11-17   2015-11-15    2015-11
## 1982          Check-Out              2015-11-22   2015-11-15    2015-11
## 1983          Check-Out              2015-11-16   2015-11-16    2015-11
## 1984          Check-Out              2015-11-16   2015-11-16    2015-11
## 1985          Check-Out              2015-11-16   2015-11-16    2015-11
## 1986          Check-Out              2015-11-17   2015-11-17    2015-11
## 1987          Check-Out              2015-11-19   2015-11-17    2015-11
## 1988          Check-Out              2015-11-21   2015-11-17    2015-11
## 1989          Check-Out              2015-11-20   2015-11-18    2015-11
## 1990          Check-Out              2015-11-21   2015-11-18    2015-11
## 1991          Check-Out              2015-11-24   2015-11-18    2015-11
## 1992          Check-Out              2015-11-24   2015-11-18    2015-11
## 1993          Check-Out              2015-11-24   2015-11-18    2015-11
## 1994          Check-Out              2015-11-24   2015-11-18    2015-11
## 1995          Check-Out              2015-11-24   2015-11-18    2015-11
## 1996          Check-Out              2015-11-24   2015-11-18    2015-11
## 1997          Check-Out              2015-11-24   2015-11-18    2015-11
## 1998          Check-Out              2015-11-24   2015-11-18    2015-11
## 1999          Check-Out              2015-11-24   2015-11-18    2015-11
## 2000          Check-Out              2015-11-24   2015-11-18    2015-11
## 2001          Check-Out              2015-11-24   2015-11-18    2015-11
## 2002          Check-Out              2015-11-24   2015-11-18    2015-11
## 2003          Check-Out              2015-11-24   2015-11-18    2015-11
## 2004          Check-Out              2015-11-24   2015-11-18    2015-11
## 2005          Check-Out              2015-11-24   2015-11-18    2015-11
## 2006          Check-Out              2015-11-24   2015-11-18    2015-11
## 2007          Check-Out              2015-11-24   2015-11-18    2015-11
## 2008          Check-Out              2015-11-24   2015-11-18    2015-11
## 2009          Check-Out              2015-11-24   2015-11-18    2015-11
## 2010          Check-Out              2015-11-24   2015-11-18    2015-11
## 2011          Check-Out              2015-11-24   2015-11-18    2015-11
## 2012          Check-Out              2015-11-24   2015-11-18    2015-11
## 2013          Check-Out              2015-11-24   2015-11-18    2015-11
## 2014          Check-Out              2015-11-24   2015-11-18    2015-11
## 2015          Check-Out              2015-11-24   2015-11-18    2015-11
## 2016          Check-Out              2015-11-25   2015-11-18    2015-11
## 2017          Check-Out              2015-11-21   2015-11-19    2015-11
## 2018          Check-Out              2015-11-22   2015-11-19    2015-11
## 2019          Check-Out              2015-11-22   2015-11-19    2015-11
## 2020          Check-Out              2015-11-23   2015-11-19    2015-11
## 2021          Check-Out              2015-11-23   2015-11-19    2015-11
## 2022          Check-Out              2015-11-23   2015-11-19    2015-11
## 2023          Check-Out              2015-11-22   2015-11-20    2015-11
## 2024          Check-Out              2015-11-22   2015-11-20    2015-11
## 2025          Check-Out              2015-11-22   2015-11-20    2015-11
## 2026          Check-Out              2015-11-22   2015-11-20    2015-11
## 2027          Check-Out              2015-11-22   2015-11-20    2015-11
## 2028          Check-Out              2015-11-22   2015-11-20    2015-11
## 2029          Check-Out              2015-11-22   2015-11-20    2015-11
## 2030          Check-Out              2015-11-22   2015-11-20    2015-11
## 2031          Check-Out              2015-11-22   2015-11-20    2015-11
## 2032          Check-Out              2015-11-22   2015-11-20    2015-11
## 2033          Check-Out              2015-11-22   2015-11-20    2015-11
## 2034          Check-Out              2015-11-22   2015-11-20    2015-11
## 2035          Check-Out              2015-11-22   2015-11-20    2015-11
## 2036          Check-Out              2015-11-22   2015-11-20    2015-11
## 2037          Check-Out              2015-11-22   2015-11-20    2015-11
## 2038          Check-Out              2015-11-22   2015-11-20    2015-11
## 2039          Check-Out              2015-11-22   2015-11-21    2015-11
## 2040          Check-Out              2015-11-22   2015-11-21    2015-11
## 2041          Check-Out              2015-11-22   2015-11-21    2015-11
## 2042          Check-Out              2015-11-22   2015-11-21    2015-11
## 2043          Check-Out              2015-11-22   2015-11-21    2015-11
## 2044          Check-Out              2015-11-22   2015-11-21    2015-11
## 2045          Check-Out              2015-11-22   2015-11-21    2015-11
## 2046          Check-Out              2015-11-22   2015-11-21    2015-11
## 2047          Check-Out              2015-11-22   2015-11-21    2015-11
## 2048          Check-Out              2015-11-22   2015-11-21    2015-11
## 2049          Check-Out              2015-11-22   2015-11-21    2015-11
## 2050          Check-Out              2015-11-22   2015-11-21    2015-11
## 2051          Check-Out              2015-11-22   2015-11-21    2015-11
## 2052          Check-Out              2015-11-22   2015-11-21    2015-11
## 2053          Check-Out              2015-11-22   2015-11-21    2015-11
## 2054          Check-Out              2015-11-22   2015-11-21    2015-11
## 2055          Check-Out              2015-11-22   2015-11-21    2015-11
## 2056          Check-Out              2015-11-22   2015-11-21    2015-11
## 2057          Check-Out              2015-11-22   2015-11-21    2015-11
## 2058          Check-Out              2015-11-22   2015-11-21    2015-11
## 2059          Check-Out              2015-11-22   2015-11-21    2015-11
## 2060          Check-Out              2015-11-22   2015-11-21    2015-11
## 2061          Check-Out              2015-11-22   2015-11-21    2015-11
## 2062          Check-Out              2015-11-22   2015-11-21    2015-11
## 2063          Check-Out              2015-11-22   2015-11-21    2015-11
## 2064          Check-Out              2015-11-22   2015-11-21    2015-11
## 2065          Check-Out              2015-11-22   2015-11-21    2015-11
## 2066          Check-Out              2015-11-22   2015-11-21    2015-11
## 2067          Check-Out              2015-11-22   2015-11-21    2015-11
## 2068          Check-Out              2015-11-22   2015-11-21    2015-11
## 2069          Check-Out              2015-11-22   2015-11-21    2015-11
## 2070          Check-Out              2015-11-22   2015-11-21    2015-11
## 2071          Check-Out              2015-11-22   2015-11-21    2015-11
## 2072          Check-Out              2015-11-22   2015-11-21    2015-11
## 2073          Check-Out              2015-11-22   2015-11-21    2015-11
## 2074          Check-Out              2015-11-22   2015-11-21    2015-11
## 2075          Check-Out              2015-11-22   2015-11-21    2015-11
## 2076          Check-Out              2015-11-22   2015-11-21    2015-11
## 2077          Check-Out              2015-11-22   2015-11-21    2015-11
## 2078          Check-Out              2015-11-22   2015-11-21    2015-11
## 2079          Check-Out              2015-11-22   2015-11-21    2015-11
## 2080          Check-Out              2015-11-22   2015-11-21    2015-11
## 2081          Check-Out              2015-11-22   2015-11-21    2015-11
## 2082          Check-Out              2015-11-22   2015-11-21    2015-11
## 2083          Check-Out              2015-11-22   2015-11-21    2015-11
## 2084          Check-Out              2015-11-22   2015-11-21    2015-11
## 2085          Check-Out              2015-11-22   2015-11-21    2015-11
## 2086          Check-Out              2015-11-28   2015-11-21    2015-11
## 2087          Check-Out              2015-11-23   2015-11-23    2015-11
## 2088          Check-Out              2015-11-23   2015-11-23    2015-11
## 2089          Check-Out              2015-11-26   2015-11-23    2015-11
## 2090          Check-Out              2015-11-25   2015-11-24    2015-11
## 2091          Check-Out              2015-11-27   2015-11-24    2015-11
## 2092          Check-Out              2015-11-29   2015-11-24    2015-11
## 2093          Check-Out              2015-11-29   2015-11-25    2015-11
## 2094          Check-Out              2015-11-29   2015-11-26    2015-11
## 2095          Check-Out              2015-11-29   2015-11-26    2015-11
## 2096          Check-Out              2015-11-29   2015-11-26    2015-11
## 2097          Check-Out              2015-11-29   2015-11-26    2015-11
## 2098          Check-Out              2015-11-29   2015-11-26    2015-11
## 2099          Check-Out              2015-11-29   2015-11-26    2015-11
## 2100          Check-Out              2015-11-29   2015-11-26    2015-11
## 2101          Check-Out              2015-11-29   2015-11-26    2015-11
## 2102          Check-Out              2015-11-29   2015-11-26    2015-11
## 2103          Check-Out              2015-11-29   2015-11-26    2015-11
## 2104          Check-Out              2015-12-04   2015-11-26    2015-11
## 2105          Check-Out              2015-11-29   2015-11-27    2015-11
## 2106          Check-Out              2015-11-29   2015-11-27    2015-11
## 2107          Check-Out              2015-11-28   2015-11-28    2015-11
## 2108          Check-Out              2015-11-29   2015-11-28    2015-11
## 2109          Check-Out              2015-12-04   2015-11-28    2015-11
## 2110          Check-Out              2015-12-04   2015-11-30    2015-11
## 2111          Check-Out              2015-12-01   2015-12-01    2015-12
## 2112          Check-Out              2015-12-06   2015-12-01    2015-12
## 2113          Check-Out              2015-12-08   2015-12-01    2015-12
## 2114          Check-Out              2015-12-02   2015-12-02    2015-12
## 2115          Check-Out              2015-12-03   2015-12-02    2015-12
## 2116          Check-Out              2015-12-03   2015-12-02    2015-12
## 2117          Check-Out              2015-12-03   2015-12-02    2015-12
## 2118          Check-Out              2015-12-03   2015-12-02    2015-12
## 2119          Check-Out              2015-12-31   2015-12-02    2015-12
## 2120          Check-Out              2015-12-04   2015-12-03    2015-12
## 2121          Check-Out              2015-12-05   2015-12-03    2015-12
## 2122          Check-Out              2015-12-10   2015-12-03    2015-12
## 2123          Check-Out              2015-12-10   2015-12-03    2015-12
## 2124          Check-Out              2015-12-10   2015-12-03    2015-12
## 2125          Check-Out              2015-12-17   2015-12-03    2015-12
## 2126          Check-Out              2015-12-06   2015-12-04    2015-12
## 2127          Check-Out              2015-12-08   2015-12-04    2015-12
## 2128          Check-Out              2015-12-08   2015-12-04    2015-12
## 2129          Check-Out              2015-12-08   2015-12-04    2015-12
## 2130          Check-Out              2015-12-12   2015-12-04    2015-12
## 2131          Check-Out              2015-12-05   2015-12-05    2015-12
## 2132          Check-Out              2015-12-07   2015-12-05    2015-12
## 2133          Check-Out              2015-12-07   2015-12-05    2015-12
## 2134          Check-Out              2015-12-07   2015-12-05    2015-12
## 2135          Check-Out              2015-12-07   2015-12-05    2015-12
## 2136          Check-Out              2015-12-07   2015-12-05    2015-12
## 2137          Check-Out              2015-12-07   2015-12-05    2015-12
## 2138          Check-Out              2015-12-07   2015-12-05    2015-12
## 2139          Check-Out              2015-12-07   2015-12-05    2015-12
## 2140          Check-Out              2015-12-07   2015-12-05    2015-12
## 2141          Check-Out              2015-12-07   2015-12-05    2015-12
## 2142          Check-Out              2015-12-07   2015-12-05    2015-12
## 2143          Check-Out              2015-12-07   2015-12-05    2015-12
## 2144          Check-Out              2015-12-07   2015-12-05    2015-12
## 2145          Check-Out              2015-12-07   2015-12-05    2015-12
## 2146          Check-Out              2015-12-07   2015-12-05    2015-12
## 2147          Check-Out              2015-12-07   2015-12-05    2015-12
## 2148          Check-Out              2015-12-07   2015-12-05    2015-12
## 2149          Check-Out              2015-12-08   2015-12-05    2015-12
## 2150          Check-Out              2015-12-08   2015-12-05    2015-12
## 2151          Check-Out              2015-12-08   2015-12-05    2015-12
## 2152          Check-Out              2015-12-08   2015-12-05    2015-12
## 2153          Check-Out              2015-12-08   2015-12-05    2015-12
## 2154          Check-Out              2015-12-08   2015-12-05    2015-12
## 2155          Check-Out              2015-12-08   2015-12-05    2015-12
## 2156          Check-Out              2015-12-08   2015-12-05    2015-12
## 2157          Check-Out              2015-12-08   2015-12-05    2015-12
## 2158          Check-Out              2015-12-08   2015-12-05    2015-12
## 2159          Check-Out              2015-12-08   2015-12-05    2015-12
## 2160          Check-Out              2015-12-08   2015-12-05    2015-12
## 2161          Check-Out              2015-12-08   2015-12-05    2015-12
## 2162          Check-Out              2015-12-08   2015-12-05    2015-12
## 2163          Check-Out              2015-12-08   2015-12-05    2015-12
## 2164          Check-Out              2015-12-08   2015-12-05    2015-12
## 2165          Check-Out              2015-12-08   2015-12-05    2015-12
## 2166          Check-Out              2015-12-08   2015-12-05    2015-12
## 2167          Check-Out              2015-12-08   2015-12-05    2015-12
## 2168          Check-Out              2015-12-08   2015-12-05    2015-12
## 2169          Check-Out              2015-12-08   2015-12-06    2015-12
## 2170          Check-Out              2015-12-10   2015-12-06    2015-12
## 2171          Check-Out              2015-12-08   2015-12-07    2015-12
## 2172          Check-Out              2016-01-05   2015-12-08    2015-12
## 2173          Check-Out              2015-12-10   2015-12-10    2015-12
## 2174          Check-Out              2015-12-11   2015-12-10    2015-12
## 2175          Check-Out              2015-12-13   2015-12-10    2015-12
## 2176          Check-Out              2015-12-13   2015-12-10    2015-12
## 2177          Check-Out              2015-12-13   2015-12-10    2015-12
## 2178          Check-Out              2015-12-17   2015-12-10    2015-12
## 2179          Check-Out              2015-12-13   2015-12-10    2015-12
## 2180          Check-Out              2015-12-13   2015-12-10    2015-12
## 2181          Check-Out              2015-12-15   2015-12-11    2015-12
## 2182          Check-Out              2015-12-16   2015-12-11    2015-12
## 2183          Check-Out              2015-12-19   2015-12-12    2015-12
## 2184          Check-Out              2015-12-19   2015-12-12    2015-12
## 2185          Check-Out              2015-12-17   2015-12-14    2015-12
## 2186          Check-Out              2015-12-19   2015-12-14    2015-12
## 2187          Check-Out              2015-12-15   2015-12-15    2015-12
## 2188          Check-Out              2015-12-18   2015-12-17    2015-12
## 2189          Check-Out              2015-12-18   2015-12-17    2015-12
## 2190          Check-Out              2015-12-26   2015-12-17    2015-12
## 2191          Check-Out              2015-12-27   2015-12-17    2015-12
## 2192          Check-Out              2016-01-05   2015-12-17    2015-12
## 2193          Check-Out              2015-12-18   2015-12-18    2015-12
## 2194          Check-Out              2015-12-19   2015-12-18    2015-12
## 2195          Check-Out              2015-12-22   2015-12-18    2015-12
## 2196          Check-Out              2015-12-23   2015-12-18    2015-12
## 2197          Check-Out              2015-12-22   2015-12-19    2015-12
## 2198          Check-Out              2015-12-23   2015-12-19    2015-12
## 2199          Check-Out              2015-12-24   2015-12-20    2015-12
## 2200          Check-Out              2015-12-27   2015-12-21    2015-12
## 2201          Check-Out              2015-12-27   2015-12-21    2015-12
## 2202          Check-Out              2015-12-29   2015-12-21    2015-12
## 2203          Check-Out              2015-12-28   2015-12-21    2015-12
## 2204          Check-Out              2015-12-27   2015-12-22    2015-12
## 2205          Check-Out              2015-12-29   2015-12-22    2015-12
## 2206          Check-Out              2015-12-29   2015-12-22    2015-12
## 2207          Check-Out              2015-12-26   2015-12-22    2015-12
## 2208          Check-Out              2015-12-29   2015-12-22    2015-12
## 2209          Check-Out              2015-12-29   2015-12-22    2015-12
## 2210          Check-Out              2015-12-29   2015-12-22    2015-12
## 2211          Check-Out              2015-12-29   2015-12-22    2015-12
## 2212          Check-Out              2015-12-29   2015-12-22    2015-12
## 2213          Check-Out              2015-12-29   2015-12-22    2015-12
## 2214          Check-Out              2015-12-29   2015-12-22    2015-12
## 2215          Check-Out              2015-12-29   2015-12-22    2015-12
## 2216          Check-Out              2015-12-29   2015-12-22    2015-12
## 2217          Check-Out              2015-12-29   2015-12-22    2015-12
## 2218          Check-Out              2015-12-29   2015-12-22    2015-12
## 2219          Check-Out              2015-12-26   2015-12-23    2015-12
## 2220          Check-Out              2015-12-27   2015-12-23    2015-12
## 2221          Check-Out              2015-12-23   2015-12-23    2015-12
## 2222          Check-Out              2015-12-23   2015-12-23    2015-12
## 2223          Check-Out              2015-12-28   2015-12-23    2015-12
## 2224          Check-Out              2015-12-29   2015-12-23    2015-12
## 2225          Check-Out              2015-12-29   2015-12-23    2015-12
## 2226          Check-Out              2015-12-30   2015-12-23    2015-12
## 2227          Check-Out              2015-12-29   2015-12-23    2015-12
## 2228          Check-Out              2015-12-30   2015-12-23    2015-12
## 2229          Check-Out              2016-01-02   2015-12-23    2015-12
## 2230          Check-Out              2015-12-26   2015-12-24    2015-12
## 2231          Check-Out              2015-12-26   2015-12-24    2015-12
## 2232          Check-Out              2015-12-26   2015-12-24    2015-12
## 2233          Check-Out              2015-12-26   2015-12-24    2015-12
## 2234          Check-Out              2015-12-27   2015-12-24    2015-12
## 2235          Check-Out              2015-12-27   2015-12-24    2015-12
## 2236          Check-Out              2015-12-27   2015-12-24    2015-12
## 2237          Check-Out              2015-12-27   2015-12-24    2015-12
## 2238          Check-Out              2015-12-27   2015-12-24    2015-12
## 2239          Check-Out              2015-12-31   2015-12-24    2015-12
## 2240          Check-Out              2015-12-31   2015-12-24    2015-12
## 2241          Check-Out              2015-12-31   2015-12-24    2015-12
## 2242          Check-Out              2015-12-31   2015-12-24    2015-12
## 2243          Check-Out              2015-12-31   2015-12-24    2015-12
## 2244          Check-Out              2015-12-31   2015-12-24    2015-12
## 2245          Check-Out              2016-01-01   2015-12-24    2015-12
## 2246          Check-Out              2015-12-27   2015-12-24    2015-12
## 2247          Check-Out              2015-12-28   2015-12-24    2015-12
## 2248          Check-Out              2015-12-28   2015-12-25    2015-12
## 2249          Check-Out              2015-12-28   2015-12-25    2015-12
## 2250          Check-Out              2015-12-28   2015-12-25    2015-12
## 2251          Check-Out              2015-12-30   2015-12-25    2015-12
## 2252          Check-Out              2015-12-31   2015-12-26    2015-12
## 2253          Check-Out              2016-01-01   2015-12-26    2015-12
## 2254          Check-Out              2016-01-01   2015-12-26    2015-12
## 2255          Check-Out              2016-01-05   2015-12-26    2015-12
## 2256          Check-Out              2015-12-29   2015-12-27    2015-12
## 2257          Check-Out              2015-12-29   2015-12-27    2015-12
## 2258          Check-Out              2016-01-02   2015-12-28    2015-12
## 2259          Check-Out              2016-01-03   2015-12-28    2015-12
## 2260          Check-Out              2016-01-03   2015-12-28    2015-12
## 2261          Check-Out              2016-01-04   2015-12-28    2015-12
## 2262          Check-Out              2016-01-11   2015-12-28    2015-12
## 2263          Check-Out              2016-01-01   2015-12-28    2015-12
## 2264          Check-Out              2016-01-01   2015-12-28    2015-12
## 2265          Check-Out              2016-01-07   2015-12-29    2015-12
## 2266          Check-Out              2016-01-02   2015-12-30    2015-12
## 2267          Check-Out              2016-01-03   2015-12-30    2015-12
## 2268          Check-Out              2016-01-03   2015-12-30    2015-12
## 2269          Check-Out              2016-01-03   2015-12-30    2015-12
## 2270          Check-Out              2016-01-03   2015-12-30    2015-12
## 2271          Check-Out              2016-01-03   2015-12-30    2015-12
## 2272          Check-Out              2016-01-03   2015-12-30    2015-12
## 2273          Check-Out              2016-01-03   2015-12-30    2015-12
## 2274          Check-Out              2016-01-03   2015-12-30    2015-12
## 2275          Check-Out              2016-01-03   2015-12-30    2015-12
## 2276          Check-Out              2016-01-03   2015-12-30    2015-12
## 2277          Check-Out              2016-01-03   2015-12-30    2015-12
## 2278          Check-Out              2016-01-03   2015-12-30    2015-12
## 2279          Check-Out              2016-01-03   2015-12-30    2015-12
## 2280          Check-Out              2016-01-03   2015-12-30    2015-12
## 2281          Check-Out              2016-01-03   2015-12-30    2015-12
## 2282          Check-Out              2016-01-03   2015-12-30    2015-12
## 2283          Check-Out              2016-01-03   2015-12-30    2015-12
## 2284          Check-Out              2016-01-03   2015-12-30    2015-12
## 2285          Check-Out              2016-01-03   2015-12-30    2015-12
## 2286          Check-Out              2016-01-03   2015-12-30    2015-12
## 2287          Check-Out              2016-01-03   2015-12-30    2015-12
## 2288          Check-Out              2016-01-03   2015-12-30    2015-12
## 2289          Check-Out              2016-01-03   2015-12-30    2015-12
## 2290          Check-Out              2016-01-03   2015-12-30    2015-12
## 2291          Check-Out              2016-01-03   2015-12-30    2015-12
## 2292          Check-Out              2016-01-03   2015-12-30    2015-12
## 2293          Check-Out              2016-01-03   2015-12-30    2015-12
## 2294          Check-Out              2016-01-03   2015-12-30    2015-12
## 2295          Check-Out              2016-01-03   2015-12-30    2015-12
## 2296          Check-Out              2016-01-03   2015-12-30    2015-12
## 2297          Check-Out              2016-01-03   2015-12-30    2015-12
## 2298          Check-Out              2016-01-03   2015-12-30    2015-12
## 2299          Check-Out              2016-01-03   2015-12-30    2015-12
## 2300          Check-Out              2016-01-02   2015-12-30    2015-12
## 2301          Check-Out              2016-01-03   2015-12-30    2015-12
## 2302          Check-Out              2016-01-03   2015-12-30    2015-12
## 2303          Check-Out              2016-01-03   2015-12-30    2015-12
## 2304          Check-Out              2016-01-03   2015-12-30    2015-12
## 2305          Check-Out              2016-01-03   2015-12-30    2015-12
## 2306          Check-Out              2016-01-03   2015-12-30    2015-12
## 2307          Check-Out              2016-01-03   2015-12-30    2015-12
## 2308          Check-Out              2016-01-03   2015-12-30    2015-12
## 2309          Check-Out              2016-01-03   2015-12-30    2015-12
## 2310          Check-Out              2016-01-03   2015-12-30    2015-12
## 2311          Check-Out              2016-01-03   2015-12-30    2015-12
## 2312          Check-Out              2016-01-03   2015-12-30    2015-12
## 2313          Check-Out              2016-01-03   2015-12-30    2015-12
## 2314          Check-Out              2016-01-03   2015-12-30    2015-12
## 2315          Check-Out              2016-01-03   2015-12-30    2015-12
## 2316          Check-Out              2016-01-03   2015-12-30    2015-12
## 2317          Check-Out              2016-01-03   2015-12-30    2015-12
## 2318          Check-Out              2016-01-03   2015-12-30    2015-12
## 2319          Check-Out              2016-01-03   2015-12-30    2015-12
## 2320          Check-Out              2016-01-01   2015-12-31    2015-12
## 2321          Check-Out              2016-01-02   2015-12-31    2015-12
## 2322          Check-Out              2016-01-02   2015-12-31    2015-12
## 2323          Check-Out              2016-01-02   2015-12-31    2015-12
## 2324          Check-Out              2016-01-02   2015-12-31    2015-12
## 2325          Check-Out              2016-01-03   2015-12-31    2015-12
## 2326          Check-Out              2016-01-03   2015-12-31    2015-12
## 2327          Check-Out              2016-01-03   2015-12-31    2015-12
## 2328          Check-Out              2016-01-03   2015-12-31    2015-12
## 2329          Check-Out              2016-01-03   2015-12-31    2015-12
## 2330          Check-Out              2016-01-03   2015-12-31    2015-12
## 2331          Check-Out              2016-01-03   2015-12-31    2015-12
## 2332          Check-Out              2016-01-07   2015-12-31    2015-12
## 2333          Check-Out              2016-01-07   2015-12-31    2015-12
## 2334          Check-Out              2016-01-07   2015-12-31    2015-12
## 2335          Check-Out              2016-01-02   2016-01-01    2016-01
## 2336          Check-Out              2016-01-02   2016-01-01    2016-01
## 2337          Check-Out              2016-01-03   2016-01-01    2016-01
## 2338          Check-Out              2016-01-03   2016-01-01    2016-01
## 2339          Check-Out              2016-01-09   2016-01-02    2016-01
## 2340          Check-Out              2016-01-07   2016-01-06    2016-01
## 2341          Check-Out              2016-01-10   2016-01-06    2016-01
## 2342          Check-Out              2016-01-10   2016-01-06    2016-01
## 2343          Check-Out              2016-01-10   2016-01-08    2016-01
## 2344          Check-Out              2016-01-12   2016-01-08    2016-01
## 2345          Check-Out              2016-01-13   2016-01-08    2016-01
## 2346          Check-Out              2016-01-23   2016-01-09    2016-01
## 2347          Check-Out              2016-02-09   2016-01-12    2016-01
## 2348          Check-Out              2016-01-13   2016-01-13    2016-01
## 2349          Check-Out              2016-01-15   2016-01-14    2016-01
## 2350          Check-Out              2016-01-24   2016-01-22    2016-01
## 2351          Check-Out              2016-01-29   2016-01-25    2016-01
## 2352          Check-Out              2016-01-27   2016-01-26    2016-01
## 2353          Check-Out              2016-03-08   2016-01-26    2016-01
## 2354          Check-Out              2016-01-27   2016-01-26    2016-01
## 2355          Check-Out              2016-01-30   2016-01-29    2016-01
## 2356          Check-Out              2016-02-02   2016-02-01    2016-02
## 2357          Check-Out              2016-02-08   2016-02-01    2016-02
## 2358          Check-Out              2016-02-07   2016-02-03    2016-02
## 2359          Check-Out              2016-02-07   2016-02-03    2016-02
## 2360          Check-Out              2016-02-09   2016-02-05    2016-02
## 2361          Check-Out              2016-02-09   2016-02-05    2016-02
## 2362          Check-Out              2016-02-13   2016-02-05    2016-02
## 2363          Check-Out              2016-02-10   2016-02-06    2016-02
## 2364          Check-Out              2016-02-10   2016-02-06    2016-02
## 2365          Check-Out              2016-02-13   2016-02-06    2016-02
## 2366          Check-Out              2016-02-10   2016-02-08    2016-02
## 2367          Check-Out              2016-02-10   2016-02-08    2016-02
## 2368          Check-Out              2016-02-12   2016-02-08    2016-02
## 2369          Check-Out              2016-02-12   2016-02-08    2016-02
## 2370          Check-Out              2016-02-11   2016-02-09    2016-02
## 2371          Check-Out              2016-02-11   2016-02-09    2016-02
## 2372          Check-Out              2016-02-11   2016-02-09    2016-02
## 2373          Check-Out              2016-02-11   2016-02-09    2016-02
## 2374          Check-Out              2016-02-11   2016-02-09    2016-02
## 2375          Check-Out              2016-02-11   2016-02-09    2016-02
## 2376          Check-Out              2016-02-11   2016-02-09    2016-02
## 2377          Check-Out              2016-02-11   2016-02-09    2016-02
## 2378          Check-Out              2016-02-11   2016-02-09    2016-02
## 2379          Check-Out              2016-02-11   2016-02-09    2016-02
## 2380          Check-Out              2016-02-11   2016-02-10    2016-02
## 2381          Check-Out              2016-02-12   2016-02-10    2016-02
## 2382          Check-Out              2016-02-13   2016-02-10    2016-02
## 2383          Check-Out              2016-02-16   2016-02-10    2016-02
## 2384          Check-Out              2016-02-16   2016-02-11    2016-02
## 2385          Check-Out              2016-02-14   2016-02-12    2016-02
## 2386          Check-Out              2016-02-14   2016-02-12    2016-02
## 2387          Check-Out              2016-02-14   2016-02-12    2016-02
## 2388          Check-Out              2016-02-14   2016-02-12    2016-02
## 2389          Check-Out              2016-02-14   2016-02-12    2016-02
## 2390          Check-Out              2016-02-14   2016-02-12    2016-02
## 2391          Check-Out              2016-02-14   2016-02-12    2016-02
## 2392          Check-Out              2016-02-14   2016-02-12    2016-02
## 2393          Check-Out              2016-02-14   2016-02-12    2016-02
## 2394          Check-Out              2016-02-14   2016-02-12    2016-02
## 2395          Check-Out              2016-02-14   2016-02-12    2016-02
## 2396          Check-Out              2016-02-14   2016-02-12    2016-02
## 2397          Check-Out              2016-02-14   2016-02-12    2016-02
## 2398          Check-Out              2016-02-14   2016-02-12    2016-02
## 2399          Check-Out              2016-02-14   2016-02-12    2016-02
## 2400          Check-Out              2016-02-14   2016-02-12    2016-02
## 2401          Check-Out              2016-02-14   2016-02-12    2016-02
## 2402          Check-Out              2016-02-14   2016-02-12    2016-02
## 2403          Check-Out              2016-02-14   2016-02-12    2016-02
## 2404          Check-Out              2016-02-14   2016-02-12    2016-02
## 2405          Check-Out              2016-02-14   2016-02-12    2016-02
## 2406          Check-Out              2016-02-14   2016-02-12    2016-02
## 2407          Check-Out              2016-02-14   2016-02-12    2016-02
## 2408          Check-Out              2016-02-15   2016-02-12    2016-02
## 2409          Check-Out              2016-02-20   2016-02-13    2016-02
## 2410          Check-Out              2016-02-20   2016-02-13    2016-02
## 2411          Check-Out              2016-02-15   2016-02-14    2016-02
## 2412          Check-Out              2016-02-20   2016-02-14    2016-02
## 2413          Check-Out              2016-02-17   2016-02-15    2016-02
## 2414          Check-Out              2016-02-17   2016-02-15    2016-02
## 2415          Check-Out              2016-02-21   2016-02-15    2016-02
## 2416          Check-Out              2016-02-21   2016-02-15    2016-02
## 2417          Check-Out              2016-02-24   2016-02-16    2016-02
## 2418          Check-Out              2016-02-25   2016-02-16    2016-02
## 2419          Check-Out              2016-02-19   2016-02-17    2016-02
## 2420          Check-Out              2016-02-26   2016-02-19    2016-02
## 2421          Check-Out              2016-02-26   2016-02-19    2016-02
## 2422          Check-Out              2016-02-26   2016-02-19    2016-02
## 2423          Check-Out              2016-02-23   2016-02-20    2016-02
## 2424          Check-Out              2016-03-05   2016-02-20    2016-02
## 2425          Check-Out              2016-03-05   2016-02-20    2016-02
## 2426          Check-Out              2016-02-27   2016-02-22    2016-02
## 2427          Check-Out              2016-03-03   2016-02-22    2016-02
## 2428          Check-Out              2016-03-03   2016-02-22    2016-02
## 2429          Check-Out              2016-03-24   2016-02-25    2016-02
## 2430          Check-Out              2016-03-04   2016-02-26    2016-02
## 2431          Check-Out              2016-02-29   2016-02-27    2016-02
## 2432          Check-Out              2016-02-29   2016-02-27    2016-02
## 2433          Check-Out              2016-02-29   2016-02-27    2016-02
## 2434          Check-Out              2016-02-29   2016-02-27    2016-02
## 2435          Check-Out              2016-02-29   2016-02-27    2016-02
## 2436          Check-Out              2016-02-29   2016-02-27    2016-02
## 2437          Check-Out              2016-02-29   2016-02-27    2016-02
## 2438          Check-Out              2016-02-29   2016-02-27    2016-02
## 2439          Check-Out              2016-02-29   2016-02-27    2016-02
## 2440          Check-Out              2016-02-29   2016-02-27    2016-02
## 2441          Check-Out              2016-02-29   2016-02-27    2016-02
## 2442          Check-Out              2016-02-29   2016-02-27    2016-02
## 2443          Check-Out              2016-02-29   2016-02-27    2016-02
## 2444          Check-Out              2016-02-29   2016-02-27    2016-02
## 2445          Check-Out              2016-02-29   2016-02-27    2016-02
## 2446          Check-Out              2016-02-29   2016-02-27    2016-02
## 2447          Check-Out              2016-02-29   2016-02-27    2016-02
## 2448          Check-Out              2016-02-29   2016-02-27    2016-02
## 2449          Check-Out              2016-02-29   2016-02-27    2016-02
## 2450          Check-Out              2016-02-29   2016-02-27    2016-02
## 2451          Check-Out              2016-02-29   2016-02-27    2016-02
## 2452          Check-Out              2016-02-29   2016-02-27    2016-02
## 2453          Check-Out              2016-03-30   2016-03-02    2016-03
## 2454          Check-Out              2016-03-04   2016-03-03    2016-03
## 2455          Check-Out              2016-03-14   2016-03-07    2016-03
## 2456          Check-Out              2016-03-21   2016-03-07    2016-03
## 2457          Check-Out              2016-03-09   2016-03-08    2016-03
## 2458          Check-Out              2016-03-12   2016-03-08    2016-03
## 2459          Check-Out              2016-03-12   2016-03-08    2016-03
## 2460          Check-Out              2016-03-22   2016-03-08    2016-03
## 2461          Check-Out              2016-03-20   2016-03-13    2016-03
## 2462          Check-Out              2016-03-17   2016-03-15    2016-03
## 2463          Check-Out              2016-03-22   2016-03-15    2016-03
## 2464          Check-Out              2016-03-19   2016-03-16    2016-03
## 2465          Check-Out              2016-03-27   2016-03-16    2016-03
## 2466          Check-Out              2016-03-18   2016-03-17    2016-03
## 2467          Check-Out              2016-03-24   2016-03-17    2016-03
## 2468          Check-Out              2016-03-22   2016-03-18    2016-03
## 2469          Check-Out              2016-03-26   2016-03-18    2016-03
## 2470          Check-Out              2016-03-31   2016-03-18    2016-03
## 2471          Check-Out              2016-03-20   2016-03-19    2016-03
## 2472          Check-Out              2016-03-26   2016-03-19    2016-03
## 2473          Check-Out              2016-03-26   2016-03-19    2016-03
## 2474          Check-Out              2016-03-24   2016-03-20    2016-03
## 2475          Check-Out              2016-03-24   2016-03-20    2016-03
## 2476          Check-Out              2016-03-26   2016-03-20    2016-03
## 2477          Check-Out              2016-03-27   2016-03-20    2016-03
## 2478          Check-Out              2016-03-28   2016-03-21    2016-03
## 2479          Check-Out              2016-03-29   2016-03-22    2016-03
## 2480          Check-Out              2016-03-30   2016-03-22    2016-03
## 2481          Check-Out              2016-04-01   2016-03-22    2016-03
## 2482          Check-Out              2016-03-26   2016-03-23    2016-03
## 2483          Check-Out              2016-03-24   2016-03-24    2016-03
## 2484          Check-Out              2016-03-27   2016-03-24    2016-03
## 2485          Check-Out              2016-03-27   2016-03-24    2016-03
## 2486          Check-Out              2016-03-27   2016-03-24    2016-03
## 2487          Check-Out              2016-03-27   2016-03-24    2016-03
## 2488          Check-Out              2016-03-27   2016-03-24    2016-03
## 2489          Check-Out              2016-03-27   2016-03-24    2016-03
## 2490          Check-Out              2016-03-27   2016-03-24    2016-03
## 2491          Check-Out              2016-03-27   2016-03-24    2016-03
## 2492          Check-Out              2016-03-27   2016-03-24    2016-03
## 2493          Check-Out              2016-03-27   2016-03-24    2016-03
## 2494          Check-Out              2016-03-27   2016-03-24    2016-03
## 2495          Check-Out              2016-03-27   2016-03-24    2016-03
## 2496          Check-Out              2016-03-27   2016-03-24    2016-03
## 2497          Check-Out              2016-03-27   2016-03-24    2016-03
## 2498          Check-Out              2016-03-27   2016-03-24    2016-03
## 2499          Check-Out              2016-03-27   2016-03-24    2016-03
## 2500          Check-Out              2016-03-27   2016-03-24    2016-03
## 2501          Check-Out              2016-03-27   2016-03-24    2016-03
## 2502          Check-Out              2016-03-27   2016-03-24    2016-03
## 2503          Check-Out              2016-03-27   2016-03-24    2016-03
## 2504          Check-Out              2016-03-27   2016-03-24    2016-03
## 2505          Check-Out              2016-03-27   2016-03-24    2016-03
## 2506          Check-Out              2016-03-27   2016-03-24    2016-03
## 2507          Check-Out              2016-03-27   2016-03-24    2016-03
## 2508          Check-Out              2016-03-27   2016-03-24    2016-03
## 2509          Check-Out              2016-03-27   2016-03-24    2016-03
## 2510          Check-Out              2016-03-27   2016-03-24    2016-03
## 2511          Check-Out              2016-03-27   2016-03-24    2016-03
## 2512          Check-Out              2016-03-27   2016-03-24    2016-03
## 2513          Check-Out              2016-03-27   2016-03-24    2016-03
## 2514          Check-Out              2016-03-27   2016-03-24    2016-03
## 2515          Check-Out              2016-03-27   2016-03-24    2016-03
## 2516          Check-Out              2016-03-27   2016-03-24    2016-03
## 2517          Check-Out              2016-03-27   2016-03-24    2016-03
## 2518          Check-Out              2016-03-27   2016-03-24    2016-03
## 2519          Check-Out              2016-03-27   2016-03-24    2016-03
## 2520          Check-Out              2016-03-27   2016-03-24    2016-03
## 2521          Check-Out              2016-03-27   2016-03-24    2016-03
## 2522          Check-Out              2016-03-27   2016-03-24    2016-03
## 2523          Check-Out              2016-03-27   2016-03-24    2016-03
## 2524          Check-Out              2016-03-27   2016-03-24    2016-03
## 2525          Check-Out              2016-03-27   2016-03-24    2016-03
## 2526          Check-Out              2016-03-27   2016-03-24    2016-03
## 2527          Check-Out              2016-03-27   2016-03-24    2016-03
## 2528          Check-Out              2016-03-27   2016-03-24    2016-03
## 2529          Check-Out              2016-03-27   2016-03-24    2016-03
## 2530          Check-Out              2016-03-27   2016-03-24    2016-03
## 2531          Check-Out              2016-03-27   2016-03-24    2016-03
## 2532          Check-Out              2016-03-27   2016-03-24    2016-03
## 2533          Check-Out              2016-03-27   2016-03-24    2016-03
## 2534          Check-Out              2016-03-27   2016-03-24    2016-03
## 2535          Check-Out              2016-03-27   2016-03-24    2016-03
## 2536          Check-Out              2016-03-27   2016-03-24    2016-03
## 2537          Check-Out              2016-03-27   2016-03-24    2016-03
## 2538          Check-Out              2016-03-27   2016-03-24    2016-03
## 2539          Check-Out              2016-03-28   2016-03-24    2016-03
## 2540          Check-Out              2016-03-28   2016-03-24    2016-03
## 2541          Check-Out              2016-03-28   2016-03-25    2016-03
## 2542          Check-Out              2016-03-28   2016-03-25    2016-03
## 2543          Check-Out              2016-04-01   2016-03-25    2016-03
## 2544          Check-Out              2016-04-02   2016-03-25    2016-03
## 2545          Check-Out              2016-04-04   2016-03-28    2016-03
## 2546          Check-Out              2016-04-04   2016-03-28    2016-03
## 2547          Check-Out              2016-04-04   2016-03-28    2016-03
## 2548          Check-Out              2016-04-04   2016-03-28    2016-03
## 2549          Check-Out              2016-04-04   2016-03-28    2016-03
## 2550          Check-Out              2016-04-04   2016-03-28    2016-03
## 2551          Check-Out              2016-04-04   2016-03-28    2016-03
## 2552          Check-Out              2016-04-04   2016-03-29    2016-03
## 2553          Check-Out              2016-04-03   2016-03-30    2016-03
## 2554          Check-Out              2016-04-03   2016-03-30    2016-03
## 2555          Check-Out              2016-04-03   2016-03-30    2016-03
## 2556          Check-Out              2016-04-04   2016-03-30    2016-03
## 2557          Check-Out              2016-04-04   2016-03-30    2016-03
## 2558          Check-Out              2016-04-04   2016-03-30    2016-03
## 2559          Check-Out              2016-04-04   2016-03-30    2016-03
## 2560          Check-Out              2016-04-04   2016-03-30    2016-03
## 2561          Check-Out              2016-04-04   2016-03-30    2016-03
## 2562          Check-Out              2016-04-04   2016-03-30    2016-03
## 2563          Check-Out              2016-04-04   2016-03-30    2016-03
## 2564          Check-Out              2016-04-04   2016-03-30    2016-03
## 2565          Check-Out              2016-04-04   2016-03-30    2016-03
## 2566          Check-Out              2016-04-04   2016-03-30    2016-03
## 2567          Check-Out              2016-03-31   2016-03-31    2016-03
## 2568          Check-Out              2016-04-03   2016-03-31    2016-03
## 2569          Check-Out              2016-04-03   2016-03-31    2016-03
## 2570          Check-Out              2016-04-03   2016-03-31    2016-03
## 2571          Check-Out              2016-04-03   2016-03-31    2016-03
## 2572          Check-Out              2016-04-03   2016-03-31    2016-03
## 2573          Check-Out              2016-04-03   2016-03-31    2016-03
## 2574          Check-Out              2016-04-03   2016-03-31    2016-03
## 2575          Check-Out              2016-04-03   2016-03-31    2016-03
## 2576          Check-Out              2016-04-03   2016-03-31    2016-03
## 2577          Check-Out              2016-04-03   2016-03-31    2016-03
## 2578          Check-Out              2016-04-03   2016-03-31    2016-03
## 2579          Check-Out              2016-04-03   2016-03-31    2016-03
## 2580          Check-Out              2016-04-03   2016-03-31    2016-03
## 2581          Check-Out              2016-04-03   2016-03-31    2016-03
## 2582          Check-Out              2016-04-03   2016-03-31    2016-03
## 2583          Check-Out              2016-04-03   2016-03-31    2016-03
## 2584          Check-Out              2016-04-03   2016-03-31    2016-03
## 2585          Check-Out              2016-04-03   2016-03-31    2016-03
## 2586          Check-Out              2016-04-03   2016-03-31    2016-03
## 2587          Check-Out              2016-04-03   2016-03-31    2016-03
## 2588          Check-Out              2016-04-03   2016-03-31    2016-03
## 2589          Check-Out              2016-04-03   2016-03-31    2016-03
## 2590          Check-Out              2016-04-04   2016-03-31    2016-03
## 2591          Check-Out              2016-04-04   2016-03-31    2016-03
## 2592          Check-Out              2016-04-04   2016-03-31    2016-03
## 2593          Check-Out              2016-04-03   2016-03-31    2016-03
## 2594          Check-Out              2016-04-03   2016-03-31    2016-03
## 2595          Check-Out              2016-04-03   2016-03-31    2016-03
## 2596          Check-Out              2016-04-03   2016-03-31    2016-03
## 2597          Check-Out              2016-04-03   2016-03-31    2016-03
## 2598          Check-Out              2016-04-03   2016-03-31    2016-03
## 2599          Check-Out              2016-04-04   2016-03-31    2016-03
## 2600          Check-Out              2016-04-04   2016-03-31    2016-03
## 2601          Check-Out              2016-04-04   2016-03-31    2016-03
## 2602          Check-Out              2016-04-04   2016-03-31    2016-03
## 2603          Check-Out              2016-04-04   2016-03-31    2016-03
## 2604          Check-Out              2016-04-04   2016-03-31    2016-03
## 2605          Check-Out              2016-04-04   2016-03-31    2016-03
## 2606          Check-Out              2016-04-04   2016-03-31    2016-03
## 2607          Check-Out              2016-04-04   2016-03-31    2016-03
## 2608          Check-Out              2016-04-04   2016-03-31    2016-03
## 2609          Check-Out              2016-04-04   2016-03-31    2016-03
## 2610          Check-Out              2016-04-04   2016-03-31    2016-03
## 2611          Check-Out              2016-04-04   2016-03-31    2016-03
## 2612          Check-Out              2016-04-04   2016-03-31    2016-03
## 2613          Check-Out              2016-04-04   2016-03-31    2016-03
## 2614          Check-Out              2016-04-04   2016-03-31    2016-03
## 2615          Check-Out              2016-04-04   2016-03-31    2016-03
## 2616          Check-Out              2016-04-04   2016-03-31    2016-03
## 2617          Check-Out              2016-04-05   2016-03-31    2016-03
## 2618          Check-Out              2016-04-04   2016-03-31    2016-03
## 2619          Check-Out              2016-04-04   2016-03-31    2016-03
## 2620          Check-Out              2016-04-05   2016-03-31    2016-03
## 2621          Check-Out              2016-04-03   2016-04-01    2016-04
## 2622          Check-Out              2016-04-05   2016-04-01    2016-04
## 2623          Check-Out              2016-04-05   2016-04-01    2016-04
## 2624          Check-Out              2016-04-05   2016-04-01    2016-04
## 2625          Check-Out              2016-04-08   2016-04-01    2016-04
## 2626          Check-Out              2016-04-06   2016-04-02    2016-04
## 2627          Check-Out              2016-04-09   2016-04-02    2016-04
## 2628          Check-Out              2016-04-09   2016-04-02    2016-04
## 2629          Check-Out              2016-04-05   2016-04-03    2016-04
## 2630          Check-Out              2016-04-06   2016-04-03    2016-04
## 2631          Check-Out              2016-04-04   2016-04-04    2016-04
## 2632          Check-Out              2016-04-06   2016-04-04    2016-04
## 2633          Check-Out              2016-04-06   2016-04-04    2016-04
## 2634          Check-Out              2016-04-06   2016-04-04    2016-04
## 2635          Check-Out              2016-04-06   2016-04-04    2016-04
## 2636          Check-Out              2016-04-06   2016-04-04    2016-04
## 2637          Check-Out              2016-04-06   2016-04-04    2016-04
## 2638          Check-Out              2016-04-06   2016-04-04    2016-04
## 2639          Check-Out              2016-04-06   2016-04-04    2016-04
## 2640          Check-Out              2016-04-06   2016-04-04    2016-04
## 2641          Check-Out              2016-04-06   2016-04-04    2016-04
## 2642          Check-Out              2016-04-06   2016-04-04    2016-04
## 2643          Check-Out              2016-04-06   2016-04-04    2016-04
## 2644          Check-Out              2016-04-06   2016-04-04    2016-04
## 2645          Check-Out              2016-04-06   2016-04-04    2016-04
## 2646          Check-Out              2016-04-06   2016-04-04    2016-04
## 2647          Check-Out              2016-04-06   2016-04-04    2016-04
## 2648          Check-Out              2016-04-06   2016-04-04    2016-04
## 2649          Check-Out              2016-04-06   2016-04-04    2016-04
## 2650          Check-Out              2016-04-06   2016-04-04    2016-04
## 2651          Check-Out              2016-04-06   2016-04-04    2016-04
## 2652          Check-Out              2016-04-06   2016-04-04    2016-04
## 2653          Check-Out              2016-04-06   2016-04-04    2016-04
## 2654          Check-Out              2016-04-06   2016-04-04    2016-04
## 2655          Check-Out              2016-04-06   2016-04-04    2016-04
## 2656          Check-Out              2016-04-06   2016-04-04    2016-04
## 2657          Check-Out              2016-04-06   2016-04-04    2016-04
## 2658          Check-Out              2016-04-06   2016-04-04    2016-04
## 2659          Check-Out              2016-04-06   2016-04-04    2016-04
## 2660          Check-Out              2016-04-06   2016-04-04    2016-04
## 2661          Check-Out              2016-04-06   2016-04-04    2016-04
## 2662          Check-Out              2016-04-06   2016-04-04    2016-04
## 2663          Check-Out              2016-04-06   2016-04-04    2016-04
## 2664          Check-Out              2016-04-06   2016-04-04    2016-04
## 2665          Check-Out              2016-04-06   2016-04-04    2016-04
## 2666          Check-Out              2016-04-06   2016-04-04    2016-04
## 2667          Check-Out              2016-04-06   2016-04-04    2016-04
## 2668          Check-Out              2016-04-06   2016-04-04    2016-04
## 2669          Check-Out              2016-04-06   2016-04-04    2016-04
## 2670          Check-Out              2016-04-06   2016-04-04    2016-04
## 2671          Check-Out              2016-04-08   2016-04-04    2016-04
## 2672          Check-Out              2016-04-09   2016-04-05    2016-04
## 2673          Check-Out              2016-04-12   2016-04-05    2016-04
## 2674          Check-Out              2016-04-12   2016-04-05    2016-04
## 2675          Check-Out              2016-04-08   2016-04-08    2016-04
## 2676          Check-Out              2016-04-16   2016-04-08    2016-04
## 2677          Check-Out              2016-04-17   2016-04-10    2016-04
## 2678          Check-Out              2016-04-17   2016-04-10    2016-04
## 2679          Check-Out              2016-04-17   2016-04-10    2016-04
## 2680          Check-Out              2016-04-17   2016-04-10    2016-04
## 2681          Check-Out              2016-04-17   2016-04-10    2016-04
## 2682          Check-Out              2016-04-17   2016-04-10    2016-04
## 2683          Check-Out              2016-04-17   2016-04-10    2016-04
## 2684          Check-Out              2016-04-17   2016-04-10    2016-04
## 2685          Check-Out              2016-04-17   2016-04-10    2016-04
## 2686          Check-Out              2016-04-17   2016-04-10    2016-04
## 2687          Check-Out              2016-04-17   2016-04-10    2016-04
## 2688          Check-Out              2016-04-17   2016-04-10    2016-04
## 2689          Check-Out              2016-04-17   2016-04-10    2016-04
## 2690          Check-Out              2016-04-17   2016-04-10    2016-04
## 2691          Check-Out              2016-04-17   2016-04-10    2016-04
## 2692          Check-Out              2016-04-17   2016-04-10    2016-04
## 2693          Check-Out              2016-04-27   2016-04-10    2016-04
## 2694          Check-Out              2016-04-17   2016-04-10    2016-04
## 2695          Check-Out              2016-04-14   2016-04-11    2016-04
## 2696          Check-Out              2016-04-18   2016-04-11    2016-04
## 2697          Check-Out              2016-04-18   2016-04-11    2016-04
## 2698          Check-Out              2016-04-21   2016-04-11    2016-04
## 2699          Check-Out              2016-04-19   2016-04-12    2016-04
## 2700          Check-Out              2016-04-20   2016-04-12    2016-04
## 2701          Check-Out              2016-04-18   2016-04-16    2016-04
## 2702          Check-Out              2016-04-18   2016-04-16    2016-04
## 2703          Check-Out              2016-04-18   2016-04-16    2016-04
## 2704          Check-Out              2016-04-18   2016-04-16    2016-04
## 2705          Check-Out              2016-04-18   2016-04-16    2016-04
## 2706          Check-Out              2016-04-18   2016-04-16    2016-04
## 2707          Check-Out              2016-04-18   2016-04-16    2016-04
## 2708          Check-Out              2016-04-18   2016-04-16    2016-04
## 2709          Check-Out              2016-04-18   2016-04-16    2016-04
## 2710          Check-Out              2016-04-18   2016-04-16    2016-04
## 2711          Check-Out              2016-04-18   2016-04-16    2016-04
## 2712          Check-Out              2016-04-18   2016-04-16    2016-04
## 2713          Check-Out              2016-04-18   2016-04-16    2016-04
## 2714          Check-Out              2016-04-18   2016-04-16    2016-04
## 2715          Check-Out              2016-04-18   2016-04-16    2016-04
## 2716          Check-Out              2016-04-18   2016-04-16    2016-04
## 2717          Check-Out              2016-04-18   2016-04-16    2016-04
## 2718          Check-Out              2016-04-18   2016-04-16    2016-04
## 2719          Check-Out              2016-04-18   2016-04-16    2016-04
## 2720          Check-Out              2016-04-18   2016-04-16    2016-04
## 2721          Check-Out              2016-04-18   2016-04-16    2016-04
## 2722          Check-Out              2016-04-18   2016-04-16    2016-04
## 2723          Check-Out              2016-04-18   2016-04-16    2016-04
## 2724          Check-Out              2016-04-18   2016-04-16    2016-04
## 2725          Check-Out              2016-04-18   2016-04-16    2016-04
## 2726          Check-Out              2016-04-18   2016-04-16    2016-04
## 2727          Check-Out              2016-04-18   2016-04-16    2016-04
## 2728          Check-Out              2016-04-18   2016-04-16    2016-04
## 2729          Check-Out              2016-04-20   2016-04-16    2016-04
## 2730          Check-Out              2016-04-22   2016-04-16    2016-04
## 2731          Check-Out              2016-04-22   2016-04-16    2016-04
## 2732          Check-Out              2016-04-23   2016-04-16    2016-04
## 2733          Check-Out              2016-04-21   2016-04-17    2016-04
## 2734          Check-Out              2016-04-20   2016-04-17    2016-04
## 2735          Check-Out              2016-04-20   2016-04-18    2016-04
## 2736          Check-Out              2016-04-20   2016-04-18    2016-04
## 2737          Check-Out              2016-04-20   2016-04-18    2016-04
## 2738          Check-Out              2016-04-20   2016-04-18    2016-04
## 2739          Check-Out              2016-04-20   2016-04-18    2016-04
## 2740          Check-Out              2016-04-20   2016-04-18    2016-04
## 2741          Check-Out              2016-04-20   2016-04-18    2016-04
## 2742          Check-Out              2016-04-20   2016-04-18    2016-04
## 2743          Check-Out              2016-04-20   2016-04-18    2016-04
## 2744          Check-Out              2016-04-20   2016-04-18    2016-04
## 2745          Check-Out              2016-04-20   2016-04-18    2016-04
## 2746          Check-Out              2016-04-20   2016-04-18    2016-04
## 2747          Check-Out              2016-04-20   2016-04-18    2016-04
## 2748          Check-Out              2016-04-20   2016-04-18    2016-04
## 2749          Check-Out              2016-04-20   2016-04-18    2016-04
## 2750          Check-Out              2016-04-20   2016-04-18    2016-04
## 2751          Check-Out              2016-04-20   2016-04-18    2016-04
## 2752          Check-Out              2016-04-20   2016-04-18    2016-04
## 2753          Check-Out              2016-04-20   2016-04-18    2016-04
## 2754          Check-Out              2016-04-20   2016-04-18    2016-04
## 2755          Check-Out              2016-04-20   2016-04-18    2016-04
## 2756          Check-Out              2016-04-20   2016-04-18    2016-04
## 2757          Check-Out              2016-04-20   2016-04-18    2016-04
## 2758          Check-Out              2016-04-20   2016-04-18    2016-04
## 2759          Check-Out              2016-04-20   2016-04-18    2016-04
## 2760          Check-Out              2016-04-20   2016-04-18    2016-04
## 2761          Check-Out              2016-04-20   2016-04-18    2016-04
## 2762          Check-Out              2016-04-20   2016-04-18    2016-04
## 2763          Check-Out              2016-04-20   2016-04-18    2016-04
## 2764          Check-Out              2016-04-26   2016-04-18    2016-04
## 2765          Check-Out              2016-04-26   2016-04-18    2016-04
## 2766          Check-Out              2016-04-26   2016-04-18    2016-04
## 2767          Check-Out              2016-04-26   2016-04-18    2016-04
## 2768          Check-Out              2016-04-26   2016-04-18    2016-04
## 2769          Check-Out              2016-04-26   2016-04-18    2016-04
## 2770          Check-Out              2016-04-28   2016-04-18    2016-04
## 2771          Check-Out              2016-04-28   2016-04-18    2016-04
## 2772          Check-Out              2016-04-22   2016-04-19    2016-04
## 2773          Check-Out              2016-04-24   2016-04-21    2016-04
## 2774          Check-Out              2016-04-24   2016-04-21    2016-04
## 2775          Check-Out              2016-04-28   2016-04-21    2016-04
## 2776          Check-Out              2016-04-25   2016-04-22    2016-04
## 2777          Check-Out              2016-04-25   2016-04-22    2016-04
## 2778          Check-Out              2016-04-25   2016-04-22    2016-04
## 2779          Check-Out              2016-04-25   2016-04-22    2016-04
## 2780          Check-Out              2016-04-25   2016-04-22    2016-04
## 2781          Check-Out              2016-04-25   2016-04-22    2016-04
## 2782          Check-Out              2016-04-25   2016-04-22    2016-04
## 2783          Check-Out              2016-04-25   2016-04-22    2016-04
## 2784          Check-Out              2016-04-25   2016-04-22    2016-04
## 2785          Check-Out              2016-04-25   2016-04-22    2016-04
## 2786          Check-Out              2016-04-25   2016-04-22    2016-04
## 2787          Check-Out              2016-04-25   2016-04-22    2016-04
## 2788          Check-Out              2016-04-25   2016-04-22    2016-04
## 2789          Check-Out              2016-04-25   2016-04-22    2016-04
## 2790          Check-Out              2016-04-25   2016-04-22    2016-04
## 2791          Check-Out              2016-04-25   2016-04-22    2016-04
## 2792          Check-Out              2016-04-25   2016-04-22    2016-04
## 2793          Check-Out              2016-04-25   2016-04-22    2016-04
## 2794          Check-Out              2016-04-25   2016-04-22    2016-04
## 2795          Check-Out              2016-04-25   2016-04-22    2016-04
## 2796          Check-Out              2016-04-25   2016-04-22    2016-04
## 2797          Check-Out              2016-04-25   2016-04-22    2016-04
## 2798          Check-Out              2016-04-25   2016-04-22    2016-04
## 2799          Check-Out              2016-04-25   2016-04-22    2016-04
## 2800          Check-Out              2016-04-25   2016-04-22    2016-04
## 2801          Check-Out              2016-04-25   2016-04-22    2016-04
## 2802          Check-Out              2016-04-25   2016-04-22    2016-04
## 2803          Check-Out              2016-04-29   2016-04-22    2016-04
## 2804          Check-Out              2016-04-25   2016-04-23    2016-04
## 2805          Check-Out              2016-04-30   2016-04-23    2016-04
## 2806          Check-Out              2016-04-30   2016-04-23    2016-04
## 2807          Check-Out              2016-05-01   2016-04-24    2016-04
## 2808          Check-Out              2016-04-28   2016-04-26    2016-04
## 2809          Check-Out              2016-04-28   2016-04-26    2016-04
## 2810          Check-Out              2016-04-28   2016-04-26    2016-04
## 2811          Check-Out              2016-04-28   2016-04-26    2016-04
## 2812          Check-Out              2016-04-28   2016-04-26    2016-04
## 2813          Check-Out              2016-05-10   2016-04-26    2016-04
## 2814          Check-Out              2016-05-02   2016-04-27    2016-04
## 2815          Check-Out              2016-05-02   2016-04-28    2016-04
## 2816          Check-Out              2016-05-02   2016-04-30    2016-04
## 2817          Check-Out              2016-05-02   2016-04-30    2016-04
## 2818          Check-Out              2016-05-02   2016-04-30    2016-04
## 2819          Check-Out              2016-05-02   2016-04-30    2016-04
## 2820          Check-Out              2016-05-02   2016-04-30    2016-04
## 2821          Check-Out              2016-05-02   2016-04-30    2016-04
## 2822          Check-Out              2016-05-02   2016-04-30    2016-04
## 2823          Check-Out              2016-05-07   2016-04-30    2016-04
## 2824          Check-Out              2016-05-07   2016-04-30    2016-04
## 2825          Check-Out              2016-05-08   2016-04-30    2016-04
## 2826          Check-Out              2016-05-12   2016-04-30    2016-04
## 2827          Check-Out              2016-05-07   2016-04-30    2016-04
## 2828          Check-Out              2016-05-07   2016-05-01    2016-05
## 2829          Check-Out              2016-05-04   2016-05-02    2016-05
## 2830          Check-Out              2016-05-04   2016-05-02    2016-05
## 2831          Check-Out              2016-05-04   2016-05-02    2016-05
## 2832          Check-Out              2016-05-04   2016-05-02    2016-05
## 2833          Check-Out              2016-05-04   2016-05-02    2016-05
## 2834          Check-Out              2016-05-04   2016-05-02    2016-05
## 2835          Check-Out              2016-05-04   2016-05-02    2016-05
## 2836          Check-Out              2016-05-04   2016-05-02    2016-05
## 2837          Check-Out              2016-05-04   2016-05-02    2016-05
## 2838          Check-Out              2016-05-04   2016-05-02    2016-05
## 2839          Check-Out              2016-05-04   2016-05-02    2016-05
## 2840          Check-Out              2016-05-04   2016-05-02    2016-05
## 2841          Check-Out              2016-05-04   2016-05-02    2016-05
## 2842          Check-Out              2016-05-04   2016-05-02    2016-05
## 2843          Check-Out              2016-05-04   2016-05-02    2016-05
## 2844          Check-Out              2016-05-04   2016-05-02    2016-05
## 2845          Check-Out              2016-05-04   2016-05-02    2016-05
## 2846          Check-Out              2016-05-04   2016-05-02    2016-05
## 2847          Check-Out              2016-05-04   2016-05-02    2016-05
## 2848          Check-Out              2016-05-04   2016-05-02    2016-05
## 2849          Check-Out              2016-05-04   2016-05-02    2016-05
## 2850          Check-Out              2016-05-04   2016-05-02    2016-05
## 2851          Check-Out              2016-05-04   2016-05-02    2016-05
## 2852          Check-Out              2016-05-04   2016-05-02    2016-05
## 2853          Check-Out              2016-05-04   2016-05-02    2016-05
## 2854          Check-Out              2016-05-04   2016-05-02    2016-05
## 2855          Check-Out              2016-05-06   2016-05-02    2016-05
## 2856          Check-Out              2016-05-08   2016-05-02    2016-05
## 2857          Check-Out              2016-05-12   2016-05-02    2016-05
## 2858          Check-Out              2016-05-12   2016-05-02    2016-05
## 2859          Check-Out              2016-05-10   2016-05-03    2016-05
## 2860          Check-Out              2016-05-10   2016-05-03    2016-05
## 2861          Check-Out              2016-05-10   2016-05-03    2016-05
## 2862          Check-Out              2016-05-10   2016-05-03    2016-05
## 2863          Check-Out              2016-05-08   2016-05-04    2016-05
## 2864          Check-Out              2016-05-09   2016-05-05    2016-05
## 2865          Check-Out              2016-05-09   2016-05-05    2016-05
## 2866          Check-Out              2016-05-09   2016-05-05    2016-05
## 2867          Check-Out              2016-05-09   2016-05-05    2016-05
## 2868          Check-Out              2016-05-12   2016-05-05    2016-05
## 2869          Check-Out              2016-05-12   2016-05-05    2016-05
## 2870          Check-Out              2016-05-06   2016-05-06    2016-05
## 2871          Check-Out              2016-05-13   2016-05-06    2016-05
## 2872          Check-Out              2016-05-13   2016-05-06    2016-05
## 2873          Check-Out              2016-05-14   2016-05-06    2016-05
## 2874          Check-Out              2016-05-14   2016-05-07    2016-05
## 2875          Check-Out              2016-05-14   2016-05-07    2016-05
## 2876          Check-Out              2016-05-14   2016-05-07    2016-05
## 2877          Check-Out              2016-05-14   2016-05-07    2016-05
## 2878          Check-Out              2016-05-18   2016-05-08    2016-05
## 2879          Check-Out              2016-05-19   2016-05-08    2016-05
## 2880          Check-Out              2016-05-15   2016-05-09    2016-05
## 2881          Check-Out              2016-05-16   2016-05-09    2016-05
## 2882          Check-Out              2016-05-12   2016-05-10    2016-05
## 2883          Check-Out              2016-05-12   2016-05-10    2016-05
## 2884          Check-Out              2016-05-12   2016-05-10    2016-05
## 2885          Check-Out              2016-05-12   2016-05-10    2016-05
## 2886          Check-Out              2016-05-12   2016-05-10    2016-05
## 2887          Check-Out              2016-05-12   2016-05-10    2016-05
## 2888          Check-Out              2016-05-15   2016-05-10    2016-05
## 2889          Check-Out              2016-05-21   2016-05-11    2016-05
## 2890          Check-Out              2016-05-15   2016-05-12    2016-05
## 2891          Check-Out              2016-05-15   2016-05-12    2016-05
## 2892          Check-Out              2016-05-15   2016-05-12    2016-05
## 2893          Check-Out              2016-05-15   2016-05-12    2016-05
## 2894          Check-Out              2016-05-15   2016-05-12    2016-05
## 2895          Check-Out              2016-05-15   2016-05-12    2016-05
## 2896          Check-Out              2016-05-15   2016-05-12    2016-05
## 2897          Check-Out              2016-05-15   2016-05-12    2016-05
## 2898          Check-Out              2016-05-15   2016-05-12    2016-05
## 2899          Check-Out              2016-05-15   2016-05-12    2016-05
## 2900          Check-Out              2016-05-15   2016-05-12    2016-05
## 2901          Check-Out              2016-05-15   2016-05-12    2016-05
## 2902          Check-Out              2016-05-16   2016-05-12    2016-05
## 2903          Check-Out              2016-05-19   2016-05-12    2016-05
## 2904          Check-Out              2016-05-19   2016-05-12    2016-05
## 2905          Check-Out              2016-05-22   2016-05-12    2016-05
## 2906          Check-Out              2016-05-22   2016-05-12    2016-05
## 2907          Check-Out              2016-05-13   2016-05-13    2016-05
## 2908          Check-Out              2016-05-15   2016-05-13    2016-05
## 2909          Check-Out              2016-05-20   2016-05-13    2016-05
## 2910          Check-Out              2016-05-20   2016-05-13    2016-05
## 2911          Check-Out              2016-05-24   2016-05-14    2016-05
## 2912          Check-Out              2016-05-16   2016-05-14    2016-05
## 2913          Check-Out              2016-05-16   2016-05-14    2016-05
## 2914          Check-Out              2016-05-16   2016-05-14    2016-05
## 2915          Check-Out              2016-05-16   2016-05-14    2016-05
## 2916          Check-Out              2016-05-16   2016-05-14    2016-05
## 2917          Check-Out              2016-05-16   2016-05-14    2016-05
## 2918          Check-Out              2016-05-16   2016-05-14    2016-05
## 2919          Check-Out              2016-05-16   2016-05-14    2016-05
## 2920          Check-Out              2016-05-16   2016-05-14    2016-05
## 2921          Check-Out              2016-05-16   2016-05-14    2016-05
## 2922          Check-Out              2016-05-16   2016-05-14    2016-05
## 2923          Check-Out              2016-05-16   2016-05-14    2016-05
## 2924          Check-Out              2016-05-16   2016-05-14    2016-05
## 2925          Check-Out              2016-05-16   2016-05-14    2016-05
## 2926          Check-Out              2016-05-16   2016-05-14    2016-05
## 2927          Check-Out              2016-05-16   2016-05-14    2016-05
## 2928          Check-Out              2016-05-16   2016-05-14    2016-05
## 2929          Check-Out              2016-05-16   2016-05-14    2016-05
## 2930          Check-Out              2016-05-16   2016-05-14    2016-05
## 2931          Check-Out              2016-05-16   2016-05-14    2016-05
## 2932          Check-Out              2016-05-16   2016-05-14    2016-05
## 2933          Check-Out              2016-05-16   2016-05-14    2016-05
## 2934          Check-Out              2016-05-16   2016-05-14    2016-05
## 2935          Check-Out              2016-05-16   2016-05-14    2016-05
## 2936          Check-Out              2016-05-16   2016-05-14    2016-05
## 2937          Check-Out              2016-05-16   2016-05-14    2016-05
## 2938          Check-Out              2016-05-16   2016-05-14    2016-05
## 2939          Check-Out              2016-05-16   2016-05-14    2016-05
## 2940          Check-Out              2016-05-16   2016-05-14    2016-05
## 2941          Check-Out              2016-05-15   2016-05-15    2016-05
## 2942          Check-Out              2016-05-22   2016-05-15    2016-05
## 2943          Check-Out              2016-05-25   2016-05-15    2016-05
## 2944          Check-Out              2016-05-26   2016-05-15    2016-05
## 2945          Check-Out              2016-05-18   2016-05-16    2016-05
## 2946          Check-Out              2016-05-18   2016-05-16    2016-05
## 2947          Check-Out              2016-05-18   2016-05-16    2016-05
## 2948          Check-Out              2016-05-18   2016-05-16    2016-05
## 2949          Check-Out              2016-05-18   2016-05-16    2016-05
## 2950          Check-Out              2016-05-18   2016-05-16    2016-05
## 2951          Check-Out              2016-05-18   2016-05-16    2016-05
## 2952          Check-Out              2016-05-18   2016-05-16    2016-05
## 2953          Check-Out              2016-05-18   2016-05-16    2016-05
## 2954          Check-Out              2016-05-18   2016-05-16    2016-05
## 2955          Check-Out              2016-05-18   2016-05-16    2016-05
## 2956          Check-Out              2016-05-18   2016-05-16    2016-05
## 2957          Check-Out              2016-05-18   2016-05-16    2016-05
## 2958          Check-Out              2016-05-18   2016-05-16    2016-05
## 2959          Check-Out              2016-05-18   2016-05-16    2016-05
## 2960          Check-Out              2016-05-18   2016-05-16    2016-05
## 2961          Check-Out              2016-05-18   2016-05-16    2016-05
## 2962          Check-Out              2016-05-18   2016-05-16    2016-05
## 2963          Check-Out              2016-05-18   2016-05-16    2016-05
## 2964          Check-Out              2016-05-18   2016-05-16    2016-05
## 2965          Check-Out              2016-05-18   2016-05-16    2016-05
## 2966          Check-Out              2016-05-18   2016-05-16    2016-05
## 2967          Check-Out              2016-05-18   2016-05-16    2016-05
## 2968          Check-Out              2016-05-18   2016-05-16    2016-05
## 2969          Check-Out              2016-05-18   2016-05-16    2016-05
## 2970          Check-Out              2016-05-18   2016-05-16    2016-05
## 2971          Check-Out              2016-05-18   2016-05-16    2016-05
## 2972          Check-Out              2016-05-18   2016-05-16    2016-05
## 2973          Check-Out              2016-05-18   2016-05-16    2016-05
## 2974          Check-Out              2016-05-18   2016-05-16    2016-05
## 2975          Check-Out              2016-05-22   2016-05-16    2016-05
## 2976          Check-Out              2016-05-22   2016-05-16    2016-05
## 2977          Check-Out              2016-05-23   2016-05-16    2016-05
## 2978          Check-Out              2016-05-26   2016-05-16    2016-05
## 2979          Check-Out              2016-05-26   2016-05-16    2016-05
## 2980          Check-Out              2016-05-26   2016-05-16    2016-05
## 2981          Check-Out              2016-05-27   2016-05-16    2016-05
## 2982          Check-Out              2016-05-27   2016-05-16    2016-05
## 2983          Check-Out              2016-05-27   2016-05-16    2016-05
## 2984          Check-Out              2016-05-27   2016-05-16    2016-05
## 2985          Check-Out              2016-05-27   2016-05-16    2016-05
## 2986          Check-Out              2016-05-23   2016-05-16    2016-05
## 2987          Check-Out              2016-05-24   2016-05-17    2016-05
## 2988          Check-Out              2016-05-24   2016-05-17    2016-05
## 2989          Check-Out              2016-05-24   2016-05-17    2016-05
## 2990          Check-Out              2016-05-17   2016-05-17    2016-05
## 2991          Check-Out              2016-05-27   2016-05-17    2016-05
## 2992          Check-Out              2016-05-25   2016-05-18    2016-05
## 2993          Check-Out              2016-05-21   2016-05-19    2016-05
## 2994          Check-Out              2016-05-26   2016-05-19    2016-05
## 2995          Check-Out              2016-05-26   2016-05-19    2016-05
## 2996          Check-Out              2016-05-27   2016-05-19    2016-05
## 2997          Check-Out              2016-05-29   2016-05-19    2016-05
## 2998          Check-Out              2016-05-28   2016-05-20    2016-05
## 2999          Check-Out              2016-05-28   2016-05-20    2016-05
## 3000          Check-Out              2016-05-23   2016-05-21    2016-05
## 3001          Check-Out              2016-05-23   2016-05-21    2016-05
## 3002          Check-Out              2016-05-28   2016-05-21    2016-05
## 3003          Check-Out              2016-05-30   2016-05-21    2016-05
## 3004          Check-Out              2016-05-31   2016-05-21    2016-05
## 3005          Check-Out              2016-05-31   2016-05-21    2016-05
## 3006          Check-Out              2016-05-28   2016-05-21    2016-05
## 3007          Check-Out              2016-06-01   2016-05-22    2016-05
## 3008          Check-Out              2016-06-01   2016-05-22    2016-05
## 3009          Check-Out              2016-05-29   2016-05-23    2016-05
## 3010          Check-Out              2016-05-30   2016-05-23    2016-05
## 3011          Check-Out              2016-06-03   2016-05-23    2016-05
## 3012          Check-Out              2016-05-30   2016-05-23    2016-05
## 3013          Check-Out              2016-05-28   2016-05-24    2016-05
## 3014          Check-Out              2016-05-29   2016-05-24    2016-05
## 3015          Check-Out              2016-05-29   2016-05-24    2016-05
## 3016          Check-Out              2016-05-30   2016-05-24    2016-05
## 3017          Check-Out              2016-05-30   2016-05-24    2016-05
## 3018          Check-Out              2016-05-30   2016-05-24    2016-05
## 3019          Check-Out              2016-05-30   2016-05-24    2016-05
## 3020          Check-Out              2016-05-30   2016-05-24    2016-05
## 3021          Check-Out              2016-05-30   2016-05-24    2016-05
## 3022          Check-Out              2016-05-30   2016-05-24    2016-05
## 3023          Check-Out              2016-05-30   2016-05-24    2016-05
## 3024          Check-Out              2016-05-30   2016-05-24    2016-05
## 3025          Check-Out              2016-05-30   2016-05-24    2016-05
## 3026          Check-Out              2016-05-30   2016-05-24    2016-05
## 3027          Check-Out              2016-05-30   2016-05-24    2016-05
## 3028          Check-Out              2016-05-30   2016-05-24    2016-05
## 3029          Check-Out              2016-05-31   2016-05-24    2016-05
## 3030          Check-Out              2016-05-31   2016-05-24    2016-05
## 3031          Check-Out              2016-06-01   2016-05-24    2016-05
## 3032          Check-Out              2016-06-01   2016-05-24    2016-05
## 3033          Check-Out              2016-06-01   2016-05-24    2016-05
## 3034          Check-Out              2016-06-01   2016-05-24    2016-05
## 3035          Check-Out              2016-06-01   2016-05-24    2016-05
## 3036          Check-Out              2016-06-03   2016-05-24    2016-05
## 3037          Check-Out              2016-06-03   2016-05-24    2016-05
## 3038          Check-Out              2016-05-27   2016-05-25    2016-05
## 3039          Check-Out              2016-05-29   2016-05-25    2016-05
## 3040          Check-Out              2016-05-29   2016-05-25    2016-05
## 3041          Check-Out              2016-05-29   2016-05-25    2016-05
## 3042          Check-Out              2016-05-30   2016-05-25    2016-05
## 3043          Check-Out              2016-05-30   2016-05-25    2016-05
## 3044          Check-Out              2016-05-30   2016-05-25    2016-05
## 3045          Check-Out              2016-05-30   2016-05-25    2016-05
## 3046          Check-Out              2016-05-30   2016-05-25    2016-05
## 3047          Check-Out              2016-05-30   2016-05-25    2016-05
## 3048          Check-Out              2016-05-30   2016-05-25    2016-05
## 3049          Check-Out              2016-06-08   2016-05-25    2016-05
## 3050          Check-Out              2016-05-28   2016-05-26    2016-05
## 3051          Check-Out              2016-05-29   2016-05-26    2016-05
## 3052          Check-Out              2016-05-29   2016-05-26    2016-05
## 3053          Check-Out              2016-05-29   2016-05-26    2016-05
## 3054          Check-Out              2016-05-29   2016-05-26    2016-05
## 3055          Check-Out              2016-05-29   2016-05-26    2016-05
## 3056          Check-Out              2016-05-29   2016-05-26    2016-05
## 3057          Check-Out              2016-05-29   2016-05-26    2016-05
## 3058          Check-Out              2016-05-29   2016-05-26    2016-05
## 3059          Check-Out              2016-05-29   2016-05-26    2016-05
## 3060          Check-Out              2016-05-29   2016-05-26    2016-05
## 3061          Check-Out              2016-05-29   2016-05-26    2016-05
## 3062          Check-Out              2016-05-30   2016-05-26    2016-05
## 3063          Check-Out              2016-05-30   2016-05-26    2016-05
## 3064          Check-Out              2016-05-30   2016-05-26    2016-05
## 3065          Check-Out              2016-05-30   2016-05-26    2016-05
## 3066          Check-Out              2016-05-30   2016-05-26    2016-05
## 3067          Check-Out              2016-05-30   2016-05-26    2016-05
## 3068          Check-Out              2016-05-30   2016-05-26    2016-05
## 3069          Check-Out              2016-05-30   2016-05-26    2016-05
## 3070          Check-Out              2016-05-30   2016-05-26    2016-05
## 3071          Check-Out              2016-05-30   2016-05-26    2016-05
## 3072          Check-Out              2016-05-30   2016-05-26    2016-05
## 3073          Check-Out              2016-05-30   2016-05-26    2016-05
## 3074          Check-Out              2016-05-30   2016-05-26    2016-05
## 3075          Check-Out              2016-05-30   2016-05-26    2016-05
## 3076          Check-Out              2016-05-30   2016-05-26    2016-05
## 3077          Check-Out              2016-05-30   2016-05-26    2016-05
## 3078          Check-Out              2016-05-30   2016-05-26    2016-05
## 3079          Check-Out              2016-05-30   2016-05-26    2016-05
## 3080          Check-Out              2016-05-30   2016-05-26    2016-05
## 3081          Check-Out              2016-05-31   2016-05-26    2016-05
## 3082          Check-Out              2016-05-31   2016-05-26    2016-05
## 3083          Check-Out              2016-05-29   2016-05-26    2016-05
## 3084          Check-Out              2016-05-29   2016-05-26    2016-05
## 3085          Check-Out              2016-05-29   2016-05-26    2016-05
## 3086          Check-Out              2016-05-29   2016-05-26    2016-05
## 3087          Check-Out              2016-06-02   2016-05-26    2016-05
## 3088          Check-Out              2016-06-02   2016-05-26    2016-05
## 3089          Check-Out              2016-06-02   2016-05-26    2016-05
## 3090          Check-Out              2016-06-02   2016-05-26    2016-05
## 3091          Check-Out              2016-05-29   2016-05-27    2016-05
## 3092          Check-Out              2016-06-03   2016-05-27    2016-05
## 3093          Check-Out              2016-06-03   2016-05-27    2016-05
## 3094          Check-Out              2016-06-03   2016-05-27    2016-05
## 3095          Check-Out              2016-06-03   2016-05-27    2016-05
## 3096          Check-Out              2016-06-03   2016-05-27    2016-05
## 3097          Check-Out              2016-05-30   2016-05-28    2016-05
## 3098          Check-Out              2016-05-30   2016-05-28    2016-05
## 3099          Check-Out              2016-05-30   2016-05-28    2016-05
## 3100          Check-Out              2016-05-30   2016-05-28    2016-05
## 3101          Check-Out              2016-05-30   2016-05-28    2016-05
## 3102          Check-Out              2016-05-30   2016-05-28    2016-05
## 3103          Check-Out              2016-05-30   2016-05-28    2016-05
## 3104          Check-Out              2016-05-30   2016-05-28    2016-05
## 3105          Check-Out              2016-05-30   2016-05-28    2016-05
## 3106          Check-Out              2016-05-30   2016-05-28    2016-05
## 3107          Check-Out              2016-05-30   2016-05-28    2016-05
## 3108          Check-Out              2016-05-30   2016-05-28    2016-05
## 3109          Check-Out              2016-05-30   2016-05-28    2016-05
## 3110          Check-Out              2016-05-30   2016-05-28    2016-05
## 3111          Check-Out              2016-05-30   2016-05-28    2016-05
## 3112          Check-Out              2016-06-02   2016-05-28    2016-05
## 3113          Check-Out              2016-05-30   2016-05-28    2016-05
## 3114          Check-Out              2016-05-30   2016-05-28    2016-05
## 3115          Check-Out              2016-05-30   2016-05-28    2016-05
## 3116          Check-Out              2016-06-05   2016-05-28    2016-05
## 3117          Check-Out              2016-06-05   2016-05-29    2016-05
## 3118          Check-Out              2016-05-30   2016-05-30    2016-05
## 3119          Check-Out              2016-05-30   2016-05-30    2016-05
## 3120          Check-Out              2016-05-30   2016-05-30    2016-05
## 3121          Check-Out              2016-06-06   2016-05-30    2016-05
## 3122          Check-Out              2016-06-06   2016-05-30    2016-05
## 3123          Check-Out              2016-06-06   2016-05-30    2016-05
## 3124          Check-Out              2016-06-13   2016-05-30    2016-05
##  [ reached 'max' / getOption("max.print") -- omitted 71887 rows ]
hotel_stays %>%
  count(hotel, required_car_parking_spaces, children) %>%
  group_by(hotel, children) %>%
  mutate(proportion = n / sum(n)) %>%
  ggplot(aes(required_car_parking_spaces, proportion, fill = children)) +
  geom_col(position = "dodge") +
  scale_y_continuous(labels = scales::percent_format()) +
  facet_wrap(~hotel, nrow = 2) +
  labs(
    x = NULL,
    y = "Proportion of hotel stays",
    fill = NULL
  )

Q2. WHich customer type pay more in the hotels (this is for not cancelled one)?

library(GGally)
## Warning: package 'GGally' was built under R version 4.3.2
## Registered S3 method overwritten by 'GGally':
##   method from   
##   +.gg   ggplot2
hotel_stays %>%
  select(
    hotel, adr,
    customer_type,
    total_of_special_requests
  ) %>%
  ggpairs(mapping = aes(color = customer_type))
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

# 3.Which country the guest come from (for non cancelled)? Need to do some work not able to draw the map by plotly
country <- hotel_data %>%
                filter(is_canceled==0)%>%
                count(country)
                
country
##     country     n
## 1       ABW     2
## 2       AGO   157
## 3       AIA     1
## 4       ALB    10
## 5       AND     2
## 6       ARE     8
## 7       ARG   160
## 8       ARM     6
## 9       ASM     1
## 10      ATA     2
## 11      ATF     1
## 12      AUS   319
## 13      AUT  1033
## 14      AZE     8
## 15      BDI     1
## 16      BEL  1868
## 17      BFA     1
## 18      BGD     3
## 19      BGR    63
## 20      BHR     1
## 21      BHS     1
## 22      BIH    10
## 23      BLR    17
## 24      BOL    10
## 25      BRA  1392
## 26      BRB     4
## 27      BWA     1
## 28      CAF     5
## 29      CHE  1298
## 30      CHL    49
## 31      CHN   537
## 32      CIV     4
## 33      CMR    10
## 34       CN  1025
## 35      COL    48
## 36      COM     2
## 37      CPV    12
## 38      CRI    18
## 39      CUB     8
## 40      CYM     1
## 41      CYP    40
## 42      CZE   134
## 43      DEU  6067
## 44      DJI     1
## 45      DMA     1
## 46      DNK   326
## 47      DOM     6
## 48      DZA    82
## 49      ECU    19
## 50      EGY    21
## 51      ESP  6383
## 52      EST    65
## 53      ETH     2
## 54      FIN   377
## 55      FRA  8468
## 56      FRO     1
## 57      GAB     2
## 58      GBR  9668
## 59      GEO     7
## 60      GHA     2
## 61      GIB     7
## 62      GNB     8
## 63      GRC    93
## 64      GTM     4
## 65      GUY     1
## 66      HKG     3
## 67      HRV    75
## 68      HUN   153
## 69      IDN    11
## 70      IND   116
## 71      IRL  2542
## 72      IRN    59
## 73      IRQ    14
## 74      ISL    53
## 75      ISR   500
## 76      ITA  2428
## 77      JAM     6
## 78      JOR    18
## 79      JPN   169
## 80      KAZ    14
## 81      KEN     4
## 82      KIR     1
## 83      KNA     2
## 84      KOR    78
## 85      KWT    10
## 86      LAO     2
## 87      LBN    22
## 88      LBY     8
## 89      LCA     1
## 90      LIE     2
## 91      LKA     7
## 92      LTU    74
## 93      LUX   177
## 94      LVA    46
## 95      MAC     1
## 96      MAR   150
## 97      MCO     3
## 98      MDG     1
## 99      MDV     3
## 100     MEX    75
## 101     MKD     8
## 102     MLI     1
## 103     MLT    13
## 104     MMR     1
## 105     MNE     3
## 106     MOZ    48
## 107     MRT     1
## 108     MUS     6
## 109     MWI     2
## 110     MYS    25
## 111     NAM     1
## 112     NCL     1
## 113     NGA    13
## 114     NLD  1716
## 115     NOR   426
## 116     NPL     1
## 117    NULL   421
## 118     NZL    68
## 119     OMN    14
## 120     PAK     5
## 121     PAN     9
## 122     PER    23
## 123     PHL    15
## 124     PLW     1
## 125     POL   703
## 126     PRI    10
## 127     PRT 20977
## 128     PRY     4
## 129     PYF     1
## 130     QAT     4
## 131     ROU   366
## 132     RUS   391
## 133     RWA     2
## 134     SAU    15
## 135     SDN     1
## 136     SEN     3
## 137     SGP    22
## 138     SLE     1
## 139     SLV     2
## 140     SMR     1
## 141     SRB    98
## 142     STP     2
## 143     SUR     5
## 144     SVK    41
## 145     SVN    41
## 146     SWE   793
## 147     SYC     1
## 148     SYR     3
## 149     TGO     2
## 150     THA    41
## 151     TJK     1
## 152     TMP     2
## 153     TUN    20
## 154     TUR   146
## 155     TWN    37
## 156     TZA     2
## 157     UGA     2
## 158     UKR    48
## 159     URY    23
## 160     USA  1592
## 161     UZB     2
## 162     VEN    14
## 163     VNM     6
## 164     ZAF    49
## 165     ZMB     1
## 166     ZWE     2

MODEL SUMMARY

Based on the results from the performance metrics calculation of your logistic regression model, here are the interpretations:

Interpretation and Implications

  • Moderate Accuracy: While the model correctly predicts cancellations and non-cancellations with reasonable accuracy, there is still room for improvement. Factors contributing to incorrect predictions should be examined.

  • Higher Precision than Recall: The model is more reliable in its positive predictions (cancellations) than in identifying all actual cancellations. This might be preferable in scenarios where false positives (predicting a cancellation that doesn’t happen) are more costly or disruptive than false negatives (missing a cancellation).

  • Low Recall: The model misses a significant portion of actual cancellations. This could be critical if missing out on actual cancellations is undesirable. For example, if the hotel depends on these predictions for managing bookings and logistics, a low recall might lead to inefficiencies.

  • Moderate F1 Score: This score reflects a balance between precision and recall but indicates that there is a need for improvement in both metrics.

Future Steps

  • Feature Engineering: Review and potentially add new features that could improve the model’s performance, such as guest demographics, seasonal factors, or historical booking trends.

  • Model Tuning: Adjust the model’s parameters or try different modeling techniques to see if the performance can be improved.

  • Data Quality: Ensure the quality of the data used for training the model. Inaccurate or biased data can significantly impact the model’s performance.

  • Advanced Models: Consider exploring more complex models or machine learning techniques which might capture the nuances in the data better.

Summary: