The project comes from a North Carolina, US company that manages workers’ compensation claims for other clients (name & location protected for confidentiality). This company wants you to advise them on how data analytics can be used to identify major drivers of costs of claims and the time to process claims. The company is interested in using data analytics to become efficient and responsive to claimants. The gist of workers’ compensation is as follows: When a worker of a participating company is injured in performance of her/his job, she/he can file a claim for the medical expenses and loss of wages related to the injury. When a claim is filed for the first time, a unique claim identifier is created and the details of the claims are recorded. The claim details are updated as payments are made to settle the claim. Payments can be made for various activities related to a claim, such as doctor visit, pharmacy, etc.

#Llamar Librerías
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(ggplot2)
library(factoextra)
## Welcome! Want to learn more? See two factoextra-related books at https://goo.gl/ve3WBa
library(rpart)
library(rpart.plot)
library(lubridate)
## 
## Attaching package: 'lubridate'
## The following objects are masked from 'package:base':
## 
##     date, intersect, setdiff, union
library(cluster)

Limpiar Base de Datos

bd1 <- read.csv("/Users/araquezada/Documents/Tec/7mo Semestre/Analítica para Negocios/Modulo 4/Actividad Análisis /ClaimsData2018 (1).csv")
bd2 <- read.csv("/Users/araquezada/Documents/Tec/7mo Semestre/Analítica para Negocios/Modulo 4/Actividad Análisis /TransactionsSummary2018.csv")

Juntar Bases de Datos y Filtrar

bd <- merge(bd1, bd2, by="ClaimID" , all=TRUE)

#Eliminar columas X
bdlimpia <- bd%>% select (- (X: X.22)) 

bdcabeza <- filter(bdlimpia, BodyPartRegion %in% c("Head"))
count(bdcabeza, BodyPartRegion, sort=TRUE)
##   BodyPartRegion     n
## 1           Head 12832
summary(bdcabeza)
##     ClaimID           TotalPaid         TotalReserves     TotalRecovery     
##  Min.   :  777635   Min.   :      0.0   Min.   :      0   Min.   :    0.00  
##  1st Qu.:  808894   1st Qu.:     36.2   1st Qu.:      0   1st Qu.:    0.00  
##  Median :  842276   Median :    157.6   Median :      0   Median :    0.00  
##  Mean   :10578303   Mean   :   3238.6   Mean   :   1230   Mean   :   59.17  
##  3rd Qu.:22721561   3rd Qu.:    501.0   3rd Qu.:      0   3rd Qu.:    0.00  
##  Max.   :62203645   Max.   :1353862.0   Max.   :1303215   Max.   :90357.52  
##                                                                             
##  IndemnityPaid      OtherPaid         ClaimStatus        IncidentDate      
##  Min.   :     0   Min.   :      0.0   Length:12832       Length:12832      
##  1st Qu.:     0   1st Qu.:     36.2   Class :character   Class :character  
##  Median :     0   Median :    156.0   Mode  :character   Mode  :character  
##  Mean   :  1415   Mean   :   1823.8                                        
##  3rd Qu.:     0   3rd Qu.:    484.0                                        
##  Max.   :450680   Max.   :1156503.6                                        
##                                                                            
##  IncidentDescription ReturnToWorkDate   AverageWeeklyWage  ClaimantOpenedDate
##  Length:12832        Length:12832       Length:12832       Length:12832      
##  Class :character    Class :character   Class :character   Class :character  
##  Mode  :character    Mode  :character   Mode  :character   Mode  :character  
##                                                                              
##                                                                              
##                                                                              
##                                                                              
##  ClaimantClosedDate EmployerNotificationDate ReceivedDate      
##  Length:12832       Length:12832             Length:12832      
##  Class :character   Class :character         Class :character  
##  Mode  :character   Mode  :character         Mode  :character  
##                                                                
##                                                                
##                                                                
##                                                                
##     IsDenied      ClaimantAge_at_DOI    Gender          ClaimantType      
##  Min.   :0.0000   Length:12832       Length:12832       Length:12832      
##  1st Qu.:0.0000   Class :character   Class :character   Class :character  
##  Median :0.0000   Mode  :character   Mode  :character   Mode  :character  
##  Mean   :0.0272                                                           
##  3rd Qu.:0.0000                                                           
##  Max.   :1.0000                                                           
##                                                                           
##  InjuryNature       BodyPartRegion       BodyPart         BillReviewALE     
##  Length:12832       Length:12832       Length:12832       Min.   : -456.00  
##  Class :character   Class :character   Class :character   1st Qu.:   16.00  
##  Mode  :character   Mode  :character   Mode  :character   Median :   24.00  
##                                                           Mean   :  177.61  
##                                                           3rd Qu.:   68.47  
##                                                           Max.   :16208.91  
##                                                           NA's   :10458     
##     Hospital        PhysicianOutpatient       Rx           
##  Min.   :-12570.4   Min.   :  -549.5    Min.   :     0.00  
##  1st Qu.:   205.3   1st Qu.:   109.0    1st Qu.:    22.50  
##  Median :   569.6   Median :   215.7    Median :    58.95  
##  Mean   :  4007.1   Mean   :  1595.5    Mean   :  1605.50  
##  3rd Qu.:  2124.9   3rd Qu.:   681.9    3rd Qu.:   185.10  
##  Max.   :194966.4   Max.   :310220.3    Max.   :210564.39  
##  NA's   :10878      NA's   :8003        NA's   :11076
glimpse(bdcabeza)
## Rows: 12,832
## Columns: 26
## $ ClaimID                  <int> 777635, 777647, 777649, 777650, 777677, 77768…
## $ TotalPaid                <dbl> 66.68, 60.01, 439.71, 45.99, 682.68, 58.93, 3…
## $ TotalReserves            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ TotalRecovery            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ IndemnityPaid            <dbl> 0.00, 0.00, 0.00, 0.00, 0.00, 0.00, 0.00, 0.0…
## $ OtherPaid                <dbl> 66.68, 60.01, 439.71, 45.99, 682.68, 58.93, 3…
## $ ClaimStatus              <chr> "C", "C", "C", "C", "C", "C", "C", "C", "C", …
## $ IncidentDate             <chr> "01/07/99", "02/07/99", "02/07/99", "02/07/99…
## $ IncidentDescription      <chr> "EE. Alleges cleaning restroom in ninth floor…
## $ ReturnToWorkDate         <chr> "#VALUE!", "#VALUE!", "#VALUE!", "#VALUE!", "…
## $ AverageWeeklyWage        <chr> "NULL", "NULL", "NULL", "NULL", "NULL", "NULL…
## $ ClaimantOpenedDate       <chr> "16/07/99", "16/07/99", "19/07/99", "14/07/99…
## $ ClaimantClosedDate       <chr> "31/03/05", "31/03/05", "31/03/05", "31/03/05…
## $ EmployerNotificationDate <chr> "01/07/99", "02/07/99", "02/07/99", "02/07/99…
## $ ReceivedDate             <chr> "15/07/99", "15/07/99", "19/07/99", "14/07/99…
## $ IsDenied                 <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ ClaimantAge_at_DOI       <chr> "43", "NULL", "NULL", "NULL", "NULL", "NULL",…
## $ Gender                   <chr> "Female", "Male", "Male", "Female", "Female",…
## $ ClaimantType             <chr> "Medical Only", "Medical Only", "Medical Only…
## $ InjuryNature             <chr> "Poisoning?Chemical (Other Than Metals)", "Co…
## $ BodyPartRegion           <chr> "Head", "Head", "Head", "Head", "Head", "Head…
## $ BodyPart                 <chr> "Eyes", "Eyes", "Eyes", "Eyes", "Eyes", "Mult…
## $ BillReviewALE            <dbl> NA, NA, NA, 264, NA, NA, NA, NA, NA, NA, NA, …
## $ Hospital                 <dbl> NA, NA, NA, 730.14, NA, NA, 214.79, 189.05, N…
## $ PhysicianOutpatient      <dbl> NA, NA, NA, 3493.30, 0.00, 327.64, 361.98, 28…
## $ Rx                       <dbl> NA, NA, 15.16, 417.90, NA, NA, 19.99, NA, NA,…
Observaciones
  1. Total Paid, Indemity Paid, Other Paid, BillReviewALE, PhysicianOutPatient, Hospital, ClaimantAge_at_DOI tienen números negativos.
  2. Hay muchos NA’s.
  3. Las variables de fecha están en carácter

Cambiar a Fechas

bdcabeza$ClaimantOpenedDate <- as.Date(bdcabeza$ClaimantOpenedDate, format ="%d/%m/%y")
bdcabeza$ClaimantClosedDate <- as.Date(bdcabeza$ClaimantClosedDate, format ="%d/%m/%y")
bdcabeza$IncidentDate <- as.Date(bdcabeza$IncidentDate, format ="%d/%m/%y")
bdcabeza$EmployerNotificationDate <- as.Date(bdcabeza$EmployerNotificationDate, format ="%d/%m/%y")
bdcabeza$ReceivedDate <- as.Date(bdcabeza$ReceivedDate, format ="%d/%m/%y")
summary(bdcabeza)
##     ClaimID           TotalPaid         TotalReserves     TotalRecovery     
##  Min.   :  777635   Min.   :      0.0   Min.   :      0   Min.   :    0.00  
##  1st Qu.:  808894   1st Qu.:     36.2   1st Qu.:      0   1st Qu.:    0.00  
##  Median :  842276   Median :    157.6   Median :      0   Median :    0.00  
##  Mean   :10578303   Mean   :   3238.6   Mean   :   1230   Mean   :   59.17  
##  3rd Qu.:22721561   3rd Qu.:    501.0   3rd Qu.:      0   3rd Qu.:    0.00  
##  Max.   :62203645   Max.   :1353862.0   Max.   :1303215   Max.   :90357.52  
##                                                                             
##  IndemnityPaid      OtherPaid         ClaimStatus         IncidentDate       
##  Min.   :     0   Min.   :      0.0   Length:12832       Min.   :1976-10-29  
##  1st Qu.:     0   1st Qu.:     36.2   Class :character   1st Qu.:2000-06-20  
##  Median :     0   Median :    156.0   Mode  :character   Median :2005-01-19  
##  Mean   :  1415   Mean   :   1823.8                      Mean   :2005-03-21  
##  3rd Qu.:     0   3rd Qu.:    484.0                      3rd Qu.:2010-04-12  
##  Max.   :450680   Max.   :1156503.6                      Max.   :2014-06-26  
##                                                                              
##  IncidentDescription ReturnToWorkDate   AverageWeeklyWage  ClaimantOpenedDate  
##  Length:12832        Length:12832       Length:12832       Min.   :1986-09-03  
##  Class :character    Class :character   Class :character   1st Qu.:2000-07-20  
##  Mode  :character    Mode  :character   Mode  :character   Median :2005-02-25  
##                                                            Mean   :2005-04-28  
##                                                            3rd Qu.:2010-04-28  
##                                                            Max.   :2014-06-30  
##                                                                                
##  ClaimantClosedDate   EmployerNotificationDate  ReceivedDate       
##  Min.   :2000-03-08   Min.   :1976-10-30       Min.   :1986-09-03  
##  1st Qu.:2005-03-31   1st Qu.:2000-05-15       1st Qu.:2000-07-25  
##  Median :2007-04-12   Median :2005-03-31       Median :2005-02-22  
##  Mean   :2008-01-25   Mean   :2005-04-28       Mean   :2005-04-28  
##  3rd Qu.:2010-09-20   3rd Qu.:2010-09-18       3rd Qu.:2010-05-06  
##  Max.   :2014-06-30   Max.   :2014-06-26       Max.   :2033-09-18  
##  NA's   :369          NA's   :1184                                 
##     IsDenied      ClaimantAge_at_DOI    Gender          ClaimantType      
##  Min.   :0.0000   Length:12832       Length:12832       Length:12832      
##  1st Qu.:0.0000   Class :character   Class :character   Class :character  
##  Median :0.0000   Mode  :character   Mode  :character   Mode  :character  
##  Mean   :0.0272                                                           
##  3rd Qu.:0.0000                                                           
##  Max.   :1.0000                                                           
##                                                                           
##  InjuryNature       BodyPartRegion       BodyPart         BillReviewALE     
##  Length:12832       Length:12832       Length:12832       Min.   : -456.00  
##  Class :character   Class :character   Class :character   1st Qu.:   16.00  
##  Mode  :character   Mode  :character   Mode  :character   Median :   24.00  
##                                                           Mean   :  177.61  
##                                                           3rd Qu.:   68.47  
##                                                           Max.   :16208.91  
##                                                           NA's   :10458     
##     Hospital        PhysicianOutpatient       Rx           
##  Min.   :-12570.4   Min.   :  -549.5    Min.   :     0.00  
##  1st Qu.:   205.3   1st Qu.:   109.0    1st Qu.:    22.50  
##  Median :   569.6   Median :   215.7    Median :    58.95  
##  Mean   :  4007.1   Mean   :  1595.5    Mean   :  1605.50  
##  3rd Qu.:  2124.9   3rd Qu.:   681.9    3rd Qu.:   185.10  
##  Max.   :194966.4   Max.   :310220.3    Max.   :210564.39  
##  NA's   :10878      NA's   :8003        NA's   :11076

Cambiar a Numérico

bdcabeza$TotalPaid <- as.numeric(bdcabeza$TotalPaid)
bdcabeza$TotalReserves <- as.numeric(bdcabeza$TotalReserves)
bdcabeza$TotalRecovery <- as.numeric(bdcabeza$TotalRecovery)
bdcabeza$AverageWeeklyWage <- as.numeric(bdcabeza$AverageWeeklyWage)
## Warning: NAs introduced by coercion
bdcabeza$ClaimantAge_at_DOI <- as.numeric(bdcabeza$ClaimantAge_at_DOI)
## Warning: NAs introduced by coercion
glimpse(bdcabeza)
## Rows: 12,832
## Columns: 26
## $ ClaimID                  <int> 777635, 777647, 777649, 777650, 777677, 77768…
## $ TotalPaid                <dbl> 66.68, 60.01, 439.71, 45.99, 682.68, 58.93, 3…
## $ TotalReserves            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ TotalRecovery            <dbl> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ IndemnityPaid            <dbl> 0.00, 0.00, 0.00, 0.00, 0.00, 0.00, 0.00, 0.0…
## $ OtherPaid                <dbl> 66.68, 60.01, 439.71, 45.99, 682.68, 58.93, 3…
## $ ClaimStatus              <chr> "C", "C", "C", "C", "C", "C", "C", "C", "C", …
## $ IncidentDate             <date> 1999-07-01, 1999-07-02, 1999-07-02, 1999-07-…
## $ IncidentDescription      <chr> "EE. Alleges cleaning restroom in ninth floor…
## $ ReturnToWorkDate         <chr> "#VALUE!", "#VALUE!", "#VALUE!", "#VALUE!", "…
## $ AverageWeeklyWage        <dbl> NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, 752.3…
## $ ClaimantOpenedDate       <date> 1999-07-16, 1999-07-16, 1999-07-19, 1999-07-…
## $ ClaimantClosedDate       <date> 2005-03-31, 2005-03-31, 2005-03-31, 2005-03-…
## $ EmployerNotificationDate <date> 1999-07-01, 1999-07-02, 1999-07-02, 1999-07-…
## $ ReceivedDate             <date> 1999-07-15, 1999-07-15, 1999-07-19, 1999-07-…
## $ IsDenied                 <int> 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, 0, …
## $ ClaimantAge_at_DOI       <dbl> 43, NA, NA, NA, NA, NA, NA, NA, NA, NA, NA, N…
## $ Gender                   <chr> "Female", "Male", "Male", "Female", "Female",…
## $ ClaimantType             <chr> "Medical Only", "Medical Only", "Medical Only…
## $ InjuryNature             <chr> "Poisoning?Chemical (Other Than Metals)", "Co…
## $ BodyPartRegion           <chr> "Head", "Head", "Head", "Head", "Head", "Head…
## $ BodyPart                 <chr> "Eyes", "Eyes", "Eyes", "Eyes", "Eyes", "Mult…
## $ BillReviewALE            <dbl> NA, NA, NA, 264, NA, NA, NA, NA, NA, NA, NA, …
## $ Hospital                 <dbl> NA, NA, NA, 730.14, NA, NA, 214.79, 189.05, N…
## $ PhysicianOutpatient      <dbl> NA, NA, NA, 3493.30, 0.00, 327.64, 361.98, 28…
## $ Rx                       <dbl> NA, NA, 15.16, 417.90, NA, NA, 19.99, NA, NA,…
is.numeric(bdcabeza$AverageWeeklyWage)
## [1] TRUE

Costo Total & Tiempo De Procesamiento

bdcabeza$Total_Incurred_Cost <- bdcabeza$TotalReserves + bdcabeza$TotalPaid - bdcabeza$TotalRecovery
bdcabeza$TP <- difftime(bdcabeza$ClaimantClosedDate, bdcabeza$ClaimantOpenedDate, units ="days")
bdcabeza$TP <- as.numeric(bdcabeza$TP)
summary(bdcabeza)
##     ClaimID           TotalPaid         TotalReserves     TotalRecovery     
##  Min.   :  777635   Min.   :      0.0   Min.   :      0   Min.   :    0.00  
##  1st Qu.:  808894   1st Qu.:     36.2   1st Qu.:      0   1st Qu.:    0.00  
##  Median :  842276   Median :    157.6   Median :      0   Median :    0.00  
##  Mean   :10578303   Mean   :   3238.6   Mean   :   1230   Mean   :   59.17  
##  3rd Qu.:22721561   3rd Qu.:    501.0   3rd Qu.:      0   3rd Qu.:    0.00  
##  Max.   :62203645   Max.   :1353862.0   Max.   :1303215   Max.   :90357.52  
##                                                                             
##  IndemnityPaid      OtherPaid         ClaimStatus         IncidentDate       
##  Min.   :     0   Min.   :      0.0   Length:12832       Min.   :1976-10-29  
##  1st Qu.:     0   1st Qu.:     36.2   Class :character   1st Qu.:2000-06-20  
##  Median :     0   Median :    156.0   Mode  :character   Median :2005-01-19  
##  Mean   :  1415   Mean   :   1823.8                      Mean   :2005-03-21  
##  3rd Qu.:     0   3rd Qu.:    484.0                      3rd Qu.:2010-04-12  
##  Max.   :450680   Max.   :1156503.6                      Max.   :2014-06-26  
##                                                                              
##  IncidentDescription ReturnToWorkDate   AverageWeeklyWage  
##  Length:12832        Length:12832       Min.   :      0.1  
##  Class :character    Class :character   1st Qu.:    191.1  
##  Mode  :character    Mode  :character   Median :    478.0  
##                                         Mean   :   1069.6  
##                                         3rd Qu.:    647.9  
##                                         Max.   :2024000.0  
##                                         NA's   :8814       
##  ClaimantOpenedDate   ClaimantClosedDate   EmployerNotificationDate
##  Min.   :1986-09-03   Min.   :2000-03-08   Min.   :1976-10-30      
##  1st Qu.:2000-07-20   1st Qu.:2005-03-31   1st Qu.:2000-05-15      
##  Median :2005-02-25   Median :2007-04-12   Median :2005-03-31      
##  Mean   :2005-04-28   Mean   :2008-01-25   Mean   :2005-04-28      
##  3rd Qu.:2010-04-28   3rd Qu.:2010-09-20   3rd Qu.:2010-09-18      
##  Max.   :2014-06-30   Max.   :2014-06-30   Max.   :2014-06-26      
##                       NA's   :369          NA's   :1184            
##   ReceivedDate           IsDenied      ClaimantAge_at_DOI    Gender         
##  Min.   :1986-09-03   Min.   :0.0000   Min.   :-7951.00   Length:12832      
##  1st Qu.:2000-07-25   1st Qu.:0.0000   1st Qu.:   31.00   Class :character  
##  Median :2005-02-22   Median :0.0000   Median :   42.00   Mode  :character  
##  Mean   :2005-04-28   Mean   :0.0272   Mean   :   38.67                     
##  3rd Qu.:2010-05-06   3rd Qu.:0.0000   3rd Qu.:   51.00                     
##  Max.   :2033-09-18   Max.   :1.0000   Max.   :   87.00                     
##                                        NA's   :3651                         
##  ClaimantType       InjuryNature       BodyPartRegion       BodyPart        
##  Length:12832       Length:12832       Length:12832       Length:12832      
##  Class :character   Class :character   Class :character   Class :character  
##  Mode  :character   Mode  :character   Mode  :character   Mode  :character  
##                                                                             
##                                                                             
##                                                                             
##                                                                             
##  BillReviewALE         Hospital        PhysicianOutpatient       Rx           
##  Min.   : -456.00   Min.   :-12570.4   Min.   :  -549.5    Min.   :     0.00  
##  1st Qu.:   16.00   1st Qu.:   205.3   1st Qu.:   109.0    1st Qu.:    22.50  
##  Median :   24.00   Median :   569.6   Median :   215.7    Median :    58.95  
##  Mean   :  177.61   Mean   :  4007.1   Mean   :  1595.5    Mean   :  1605.50  
##  3rd Qu.:   68.47   3rd Qu.:  2124.9   3rd Qu.:   681.9    3rd Qu.:   185.10  
##  Max.   :16208.91   Max.   :194966.4   Max.   :310220.3    Max.   :210564.39  
##  NA's   :10458      NA's   :10878      NA's   :8003        NA's   :11076      
##  Total_Incurred_Cost       TP        
##  Min.   :  -1521.2   Min.   :   0.0  
##  1st Qu.:     38.0   1st Qu.: 114.5  
##  Median :    160.2   Median : 684.0  
##  Mean   :   4409.7   Mean   :1081.9  
##  3rd Qu.:    526.7   3rd Qu.:1811.0  
##  Max.   :1869254.9   Max.   :6544.0  
##                      NA's   :369

Árbol de Decisiones

Limpiar Base de Datos

bdarbol <- bdcabeza
bdarbol$Gender <- as.factor(bdarbol$Gender)
count(bdarbol, Gender, sort=TRUE)
##          Gender    n
## 1          Male 7540
## 2        Female 5199
## 3 Not Available   93
count(bdarbol, ClaimantAge_at_DOI, sort=TRUE)
##    ClaimantAge_at_DOI    n
## 1                  NA 3651
## 2                  48  268
## 3                  41  263
## 4                  46  262
## 5                  43  260
## 6                  28  259
## 7                  42  248
## 8                  44  248
## 9                  50  248
## 10                 33  238
## 11                 47  238
## 12                 53  237
## 13                 54  236
## 14                 38  234
## 15                 45  234
## 16                 37  232
## 17                 52  232
## 18                 34  230
## 19                 25  225
## 20                 36  223
## 21                 26  221
## 22                 35  217
## 23                 39  217
## 24                 51  214
## 25                 29  211
## 26                 55  210
## 27                 32  208
## 28                 27  205
## 29                 49  202
## 30                 40  198
## 31                 30  195
## 32                 31  195
## 33                 57  178
## 34                 23  173
## 35                 24  173
## 36                 56  170
## 37                 22  156
## 38                 58  152
## 39                 59  148
## 40                 60  132
## 41                 21  114
## 42                 61   99
## 43                 62   93
## 44                 20   77
## 45                 19   63
## 46                 63   61
## 47                 64   57
## 48                 65   34
## 49                 67   28
## 50                 66   19
## 51                 18   16
## 52                 68   14
## 53                 69   11
## 54                  0   10
## 55                 71    9
## 56                 73    9
## 57                 74    9
## 58                 72    8
## 59                 75    7
## 60                 17    5
## 61                 70    5
## 62                 76    5
## 63                 77    5
## 64                 -1    4
## 65                  6    4
## 66                 16    4
## 67                  1    2
## 68                  5    2
## 69                 78    2
## 70              -7951    1
## 71              -7161    1
## 72              -5973    1
## 73              -2956    1
## 74               -193    1
## 75                -45    1
## 76                 -5    1
## 77                  4    1
## 78                  7    1
## 79                 11    1
## 80                 12    1
## 81                 13    1
## 82                 79    1
## 83                 81    1
## 84                 87    1
count(bdarbol, AverageWeeklyWage, sort=TRUE)
##      AverageWeeklyWage    n
## 1                   NA 8814
## 2                 1.00  567
## 3                40.00  129
## 4               300.00   97
## 5                30.00   95
## 6               500.00   66
## 7               100.00   40
## 8               600.00   39
## 9               478.00   32
## 10              350.00   31
## 11              400.00   27
## 12               60.00   26
## 13               48.00   23
## 14                0.23   22
## 15              484.00   16
## 16              460.00   15
## 17              900.00   14
## 18              800.00   13
## 19              450.00   12
## 20              360.00   11
## 21              480.00   11
## 22              616.71   11
## 23              478.10   10
## 24              200.00    9
## 25              446.00    9
## 26              320.00    8
## 27              456.80    7
## 28              456.94    7
## 29              640.00    7
## 30                0.10    6
## 31                2.00    6
## 32              270.00    6
## 33              284.00    6
## 34              452.00    6
## 35              490.00    6
## 36              508.00    6
## 37              548.00    6
## 38              608.00    6
## 39              650.00    6
## 40               45.00    5
## 41              220.00    5
## 42              280.00    5
## 43              462.00    5
## 44              535.00    5
## 45              538.00    5
## 46              560.00    5
## 47              648.00    5
## 48              654.00    5
## 49              700.00    5
## 50              712.00    5
## 51             1000.00    5
## 52             1083.00    5
## 53              180.00    4
## 54              310.17    4
## 55              375.00    4
## 56              424.00    4
## 57              440.00    4
## 58              440.26    4
## 59              455.00    4
## 60              469.00    4
## 61              470.00    4
## 62              472.00    4
## 63              501.00    4
## 64              524.60    4
## 65              525.00    4
## 66              530.00    4
## 67              539.00    4
## 68              542.00    4
## 69              543.00    4
## 70              549.00    4
## 71              550.00    4
## 72              556.00    4
## 73              557.00    4
## 74              576.92    4
## 75              602.00    4
## 76              606.00    4
## 77              607.00    4
## 78              620.00    4
## 79              630.00    4
## 80              631.00    4
## 81              652.00    4
## 82              653.85    4
## 83              720.00    4
## 84              755.00    4
## 85              769.00    4
## 86              822.00    4
## 87              826.00    4
## 88              837.00    4
## 89              850.00    4
## 90              918.46    4
## 91              962.00    4
## 92               35.00    3
## 93               36.00    3
## 94              126.00    3
## 95              140.00    3
## 96              195.00    3
## 97              240.00    3
## 98              250.00    3
## 99              285.60    3
## 100             304.29    3
## 101             315.40    3
## 102             322.59    3
## 103             338.40    3
## 104             340.00    3
## 105             364.00    3
## 106             413.60    3
## 107             414.13    3
## 108             416.44    3
## 109             420.00    3
## 110             424.37    3
## 111             436.00    3
## 112             442.00    3
## 113             450.80    3
## 114             453.00    3
## 115             454.00    3
## 116             454.80    3
## 117             464.00    3
## 118             466.00    3
## 119             483.00    3
## 120             486.00    3
## 121             496.00    3
## 122             506.00    3
## 123             516.00    3
## 124             520.00    3
## 125             526.00    3
## 126             532.00    3
## 127             536.89    3
## 128             540.00    3
## 129             577.00    3
## 130             580.57    3
## 131             592.00    3
## 132             615.00    3
## 133             618.00    3
## 134             638.00    3
## 135             656.00    3
## 136             678.00    3
## 137             680.00    3
## 138             694.00    3
## 139             750.00    3
## 140             792.00    3
## 141             811.81    3
## 142             816.00    3
## 143             836.33    3
## 144             884.00    3
## 145             906.44    3
## 146             915.00    3
## 147             944.00    3
## 148            1058.00    3
## 149            1063.00    3
## 150            1083.27    3
## 151            1225.00    3
## 152               5.00    2
## 153              10.00    2
## 154              20.00    2
## 155              90.00    2
## 156             115.00    2
## 157             160.00    2
## 158             234.00    2
## 159             256.00    2
## 160             260.00    2
## 161             277.00    2
## 162             293.60    2
## 163             304.23    2
## 164             307.60    2
## 165             315.00    2
## 166             319.60    2
## 167             321.60    2
## 168             323.00    2
## 169             328.04    2
## 170             336.00    2
## 171             344.80    2
## 172             353.81    2
## 173             373.43    2
## 174             377.60    2
## 175             381.55    2
## 176             382.00    2
## 177             386.80    2
## 178             387.60    2
## 179             391.08    2
## 180             392.19    2
## 181             394.00    2
## 182             394.98    2
## 183             408.00    2
## 184             414.50    2
## 185             414.52    2
## 186             422.80    2
## 187             425.00    2
## 188             428.00    2
## 189             428.85    2
## 190             430.38    2
## 191             435.00    2
## 192             435.12    2
## 193             439.37    2
## 194             443.60    2
## 195             443.83    2
## 196             444.40    2
## 197             444.80    2
## 198             449.00    2
## 199             449.65    2
## 200             451.00    2
## 201             453.60    2
## 202             457.00    2
## 203             458.00    2
## 204             458.40    2
## 205             461.60    2
## 206             461.67    2
## 207             473.60    2
## 208             475.00    2
## 209             482.00    2
## 210             488.00    2
## 211             489.31    2
## 212             490.40    2
## 213             490.80    2
## 214             490.96    2
## 215             491.00    2
## 216             492.00    2
## 217             498.00    2
## 218             499.00    2
## 219             504.00    2
## 220             504.80    2
## 221             505.00    2
## 222             509.00    2
## 223             509.98    2
## 224             511.00    2
## 225             517.00    2
## 226             518.00    2
## 227             519.00    2
## 228             522.00    2
## 229             523.20    2
## 230             529.00    2
## 231             541.00    2
## 232             544.00    2
## 233             545.00    2
## 234             545.42    2
## 235             545.58    2
## 236             546.80    2
## 237             547.60    2
## 238             551.00    2
## 239             553.00    2
## 240             554.00    2
## 241             558.00    2
## 242             562.00    2
## 243             562.80    2
## 244             563.00    2
## 245             565.50    2
## 246             566.00    2
## 247             566.60    2
## 248             568.40    2
## 249             575.00    2
## 250             576.40    2
## 251             576.80    2
## 252             579.00    2
## 253             583.00    2
## 254             588.00    2
## 255             591.00    2
## 256             593.00    2
## 257             593.20    2
## 258             594.00    2
## 259             596.00    2
## 260             597.60    2
## 261             598.00    2
## 262             604.00    2
## 263             604.80    2
## 264             610.00    2
## 265             614.00    2
## 266             622.80    2
## 267             624.00    2
## 268             625.00    2
## 269             627.00    2
## 270             634.00    2
## 271             642.00    2
## 272             644.00    2
## 273             645.00    2
## 274             646.00    2
## 275             651.00    2
## 276             653.00    2
## 277             660.32    2
## 278             666.00    2
## 279             668.00    2
## 280             669.00    2
## 281             670.42    2
## 282             675.00    2
## 283             683.00    2
## 284             684.40    2
## 285             687.00    2
## 286             689.21    2
## 287             692.00    2
## 288             696.00    2
## 289             699.00    2
## 290             703.00    2
## 291             710.00    2
## 292             714.00    2
## 293             715.00    2
## 294             718.00    2
## 295             721.00    2
## 296             722.00    2
## 297             723.00    2
## 298             727.00    2
## 299             729.00    2
## 300             731.00    2
## 301             740.00    2
## 302             742.00    2
## 303             743.00    2
## 304             745.00    2
## 305             747.00    2
## 306             749.00    2
## 307             756.00    2
## 308             776.00    2
## 309             781.20    2
## 310             785.00    2
## 311             798.00    2
## 312             799.00    2
## 313             808.00    2
## 314             815.00    2
## 315             818.40    2
## 316             828.00    2
## 317             828.04    2
## 318             836.00    2
## 319             838.00    2
## 320             839.00    2
## 321             840.00    2
## 322             846.00    2
## 323             849.00    2
## 324             860.00    2
## 325             865.00    2
## 326             871.00    2
## 327             874.00    2
## 328             880.00    2
## 329             918.00    2
## 330             941.42    2
## 331             950.00    2
## 332             958.28    2
## 333             974.00    2
## 334            1013.71    2
## 335            1017.00    2
## 336            1032.00    2
## 337            1034.40    2
## 338            1046.00    2
## 339            1066.00    2
## 340            1161.00    2
## 341            1180.00    2
## 342            1200.00    2
## 343            1213.00    2
## 344            1239.00    2
## 345            1260.00    2
## 346            1326.00    2
## 347            1350.00    2
## 348            1414.00    2
## 349               2.14    1
## 350               2.30    1
## 351               3.00    1
## 352               3.36    1
## 353               7.00    1
## 354               8.00    1
## 355              16.84    1
## 356              21.00    1
## 357              24.00    1
## 358              24.07    1
## 359              32.00    1
## 360              37.00    1
## 361              37.50    1
## 362              41.42    1
## 363              44.98    1
## 364              46.94    1
## 365              50.00    1
## 366              50.26    1
## 367              53.21    1
## 368              55.55    1
## 369              59.82    1
## 370              64.80    1
## 371              70.50    1
## 372              71.70    1
## 373              81.00    1
## 374              82.46    1
## 375              87.50    1
## 376              97.50    1
## 377              99.00    1
## 378             101.92    1
## 379             105.00    1
## 380             106.00    1
## 381             107.00    1
## 382             110.00    1
## 383             120.00    1
## 384             121.87    1
## 385             125.00    1
## 386             129.00    1
## 387             130.00    1
## 388             133.45    1
## 389             136.00    1
## 390             141.80    1
## 391             145.00    1
## 392             146.40    1
## 393             148.00    1
## 394             150.00    1
## 395             152.00    1
## 396             162.00    1
## 397             164.80    1
## 398             168.00    1
## 399             170.14    1
## 400             173.07    1
## 401             174.50    1
## 402             175.00    1
## 403             177.00    1
## 404             181.76    1
## 405             189.98    1
## 406             190.38    1
## 407             193.07    1
## 408             194.40    1
## 409             199.26    1
## 410             204.65    1
## 411             206.00    1
## 412             215.60    1
## 413             216.00    1
## 414             216.78    1
## 415             218.00    1
## 416             218.40    1
## 417             224.61    1
## 418             228.30    1
## 419             229.50    1
## 420             230.77    1
## 421             236.11    1
## 422             241.90    1
## 423             243.60    1
## 424             245.00    1
## 425             246.27    1
## 426             247.49    1
## 427             252.00    1
## 428             253.32    1
## 429             253.80    1
## 430             255.00    1
## 431             255.20    1
## 432             257.00    1
## 433             263.00    1
## 434             267.46    1
## 435             268.12    1
## 436             268.40    1
## 437             269.00    1
## 438             274.50    1
## 439             275.20    1
## 440             279.79    1
## 441             282.45    1
## 442             282.64    1
## 443             285.20    1
## 444             285.89    1
## 445             287.76    1
## 446             289.48    1
## 447             290.80    1
## 448             291.20    1
## 449             291.46    1
## 450             294.40    1
## 451             294.80    1
## 452             296.00    1
## 453             296.80    1
## 454             296.81    1
## 455             298.82    1
## 456             301.20    1
## 457             301.56    1
## 458             302.38    1
## 459             302.64    1
## 460             302.80    1
## 461             304.22    1
## 462             304.40    1
## 463             304.56    1
## 464             306.06    1
## 465             307.69    1
## 466             307.71    1
## 467             308.65    1
## 468             308.80    1
## 469             309.38    1
## 470             310.00    1
## 471             310.14    1
## 472             310.80    1
## 473             311.20    1
## 474             311.60    1
## 475             312.40    1
## 476             313.32    1
## 477             314.09    1
## 478             314.71    1
## 479             315.81    1
## 480             316.12    1
## 481             317.00    1
## 482             317.33    1
## 483             317.40    1
## 484             318.06    1
## 485             318.17    1
## 486             320.19    1
## 487             321.05    1
## 488             321.20    1
## 489             321.35    1
## 490             321.38    1
## 491             321.54    1
## 492             321.62    1
## 493             321.71    1
## 494             321.77    1
## 495             322.54    1
## 496             322.60    1
## 497             322.80    1
## 498             322.81    1
## 499             323.01    1
## 500             323.20    1
## 501             323.27    1
## 502             323.60    1
## 503             324.00    1
## 504             325.58    1
## 505             325.60    1
## 506             326.10    1
## 507             328.00    1
## 508             328.10    1
## 509             329.11    1
## 510             329.19    1
## 511             329.20    1
## 512             329.93    1
## 513             330.00    1
## 514             330.03    1
## 515             330.31    1
## 516             330.54    1
## 517             331.20    1
## 518             331.68    1
## 519             332.63    1
## 520             333.52    1
## 521             334.40    1
## 522             334.77    1
## 523             334.80    1
## 524             336.60    1
## 525             336.98    1
## 526             337.60    1
## 527             337.65    1
## 528             339.60    1
## 529             340.34    1
## 530             340.35    1
## 531             341.00    1
## 532             341.90    1
## 533             342.03    1
## 534             342.40    1
## 535             344.10    1
## 536             345.16    1
## 537             345.17    1
## 538             346.00    1
## 539             346.72    1
## 540             346.87    1
## 541             347.35    1
## 542             348.40    1
## 543             348.71    1
## 544             348.80    1
## 545             349.09    1
## 546             350.67    1
## 547             350.92    1
## 548             351.20    1
## 549             351.22    1
## 550             352.15    1
## 551             352.30    1
## 552             352.51    1
## 553             353.07    1
## 554             353.60    1
## 555             353.87    1
## 556             354.00    1
## 557             354.33    1
## 558             355.58    1
## 559             355.94    1
## 560             356.69    1
## 561             357.00    1
## 562             357.31    1
## 563             357.32    1
## 564             357.84    1
## 565             359.20    1
## 566             359.98    1
## 567             360.66    1
## 568             360.80    1
## 569             361.55    1
## 570             361.83    1
## 571             362.00    1
## 572             362.14    1
## 573             362.45    1
## 574             362.86    1
## 575             362.92    1
## 576             363.87    1
## 577             364.12    1
## 578             364.39    1
## 579             364.40    1
## 580             364.52    1
## 581             365.00    1
## 582             365.16    1
## 583             366.11    1
## 584             366.55    1
## 585             366.87    1
## 586             366.92    1
## 587             367.50    1
## 588             368.00    1
## 589             368.16    1
## 590             368.48    1
## 591             368.57    1
## 592             369.07    1
## 593             369.30    1
## 594             369.42    1
## 595             370.49    1
## 596             370.68    1
## 597             371.20    1
## 598             371.38    1
## 599             371.53    1
## 600             372.00    1
## 601             372.06    1
## 602             372.20    1
## 603             372.80    1
## 604             372.90    1
## 605             373.11    1
## 606             373.42    1
## 607             374.96    1
## 608             375.28    1
## 609             375.80    1
## 610             376.17    1
## 611             377.27    1
## 612             377.75    1
## 613             378.00    1
## 614             378.15    1
## 615             378.24    1
## 616             379.09    1
## 617             379.60    1
## 618             379.71    1
## 619             379.86    1
## 620             380.00    1
## 621             380.88    1
## 622             381.47    1
## 623             381.58    1
## 624             381.60    1
## 625             382.56    1
## 626             382.78    1
## 627             383.20    1
## 628             383.55    1
## 629             384.00    1
## 630             384.10    1
## 631             384.30    1
## 632             384.80    1
## 633             384.92    1
## 634             385.00    1
## 635             385.15    1
## 636             385.66    1
## 637             385.75    1
## 638             386.76    1
## 639             387.20    1
## 640             387.22    1
## 641             387.23    1
## 642             387.98    1
## 643             387.99    1
## 644             388.00    1
## 645             388.10    1
## 646             388.40    1
## 647             389.03    1
## 648             389.19    1
## 649             389.33    1
## 650             389.59    1
## 651             389.60    1
## 652             390.84    1
## 653             390.92    1
## 654             391.11    1
## 655             392.00    1
## 656             392.17    1
## 657             392.25    1
## 658             392.42    1
## 659             392.62    1
## 660             393.37    1
## 661             393.75    1
## 662             393.92    1
## 663             394.20    1
## 664             394.44    1
## 665             394.75    1
## 666             394.96    1
## 667             395.00    1
## 668             395.01    1
## 669             396.40    1
## 670             396.83    1
## 671             397.28    1
## 672             397.60    1
## 673             397.69    1
## 674             397.92    1
## 675             398.00    1
## 676             398.81    1
## 677             398.92    1
## 678             399.00    1
## 679             399.60    1
## 680             399.77    1
## 681             400.12    1
## 682             400.40    1
## 683             400.54    1
## 684             400.79    1
## 685             400.80    1
## 686             401.65    1
## 687             402.02    1
## 688             402.33    1
## 689             402.77    1
## 690             402.90    1
## 691             403.62    1
## 692             404.00    1
## 693             404.36    1
## 694             404.58    1
## 695             405.00    1
## 696             405.75    1
## 697             406.10    1
## 698             406.21    1
## 699             406.31    1
## 700             407.00    1
## 701             407.22    1
## 702             407.33    1
## 703             408.40    1
## 704             409.06    1
## 705             409.08    1
## 706             409.20    1
## 707             409.39    1
## 708             409.82    1
## 709             409.96    1
## 710             410.07    1
## 711             410.37    1
## 712             411.40    1
## 713             412.00    1
## 714             412.29    1
## 715             412.57    1
## 716             412.82    1
## 717             412.97    1
## 718             413.04    1
## 719             413.35    1
## 720             414.00    1
## 721             414.27    1
## 722             414.71    1
## 723             414.80    1
## 724             415.19    1
## 725             415.54    1
## 726             416.40    1
## 727             416.42    1
## 728             416.46    1
## 729             416.76    1
## 730             416.77    1
## 731             416.80    1
## 732             416.93    1
## 733             417.12    1
## 734             417.60    1
## 735             418.40    1
## 736             420.92    1
## 737             422.40    1
## 738             423.00    1
## 739             423.05    1
## 740             424.40    1
## 741             424.63    1
## 742             425.42    1
## 743             425.63    1
## 744             426.77    1
## 745             426.82    1
## 746             426.83    1
## 747             427.19    1
## 748             427.34    1
## 749             427.56    1
## 750             428.17    1
## 751             428.21    1
## 752             428.84    1
## 753             428.89    1
## 754             429.00    1
## 755             429.36    1
## 756             430.09    1
## 757             430.40    1
## 758             430.71    1
## 759             430.80    1
## 760             431.07    1
## 761             431.09    1
## 762             431.14    1
## 763             431.60    1
## 764             432.00    1
## 765             432.13    1
## 766             432.36    1
## 767             432.42    1
## 768             432.60    1
## 769             432.94    1
## 770             433.82    1
## 771             434.00    1
## 772             434.49    1
## 773             435.19    1
## 774             435.39    1
## 775             435.58    1
## 776             435.97    1
## 777             436.06    1
## 778             436.72    1
## 779             436.80    1
## 780             436.98    1
## 781             437.17    1
## 782             437.54    1
## 783             437.67    1
## 784             437.73    1
## 785             438.00    1
## 786             438.06    1
## 787             438.32    1
## 788             438.40    1
## 789             438.49    1
## 790             438.80    1
## 791             438.88    1
## 792             439.31    1
## 793             439.58    1
## 794             439.96    1
## 795             440.15    1
## 796             440.40    1
## 797             440.85    1
## 798             441.13    1
## 799             441.20    1
## 800             441.34    1
## 801             441.72    1
## 802             442.28    1
## 803             442.31    1
## 804             442.41    1
## 805             442.64    1
## 806             443.00    1
## 807             443.85    1
## 808             444.00    1
## 809             444.01    1
## 810             444.71    1
## 811             444.76    1
## 812             445.17    1
## 813             445.19    1
## 814             445.60    1
## 815             445.75    1
## 816             447.00    1
## 817             447.12    1
## 818             447.16    1
## 819             447.54    1
## 820             447.98    1
## 821             448.00    1
## 822             448.17    1
## 823             448.19    1
## 824             448.40    1
## 825             448.42    1
## 826             448.86    1
## 827             449.57    1
## 828             450.17    1
## 829             450.69    1
## 830             450.85    1
## 831             451.54    1
## 832             451.97    1
## 833             452.11    1
## 834             452.29    1
## 835             452.33    1
## 836             452.39    1
## 837             452.53    1
## 838             452.80    1
## 839             452.84    1
## 840             453.41    1
## 841             453.46    1
## 842             453.82    1
## 843             454.38    1
## 844             454.60    1
## 845             454.81    1
## 846             455.26    1
## 847             456.36    1
## 848             456.52    1
## 849             456.84    1
## 850             457.60    1
## 851             457.61    1
## 852             457.87    1
## 853             457.90    1
## 854             458.27    1
## 855             459.00    1
## 856             459.26    1
## 857             459.50    1
## 858             460.11    1
## 859             460.21    1
## 860             460.38    1
## 861             460.40    1
## 862             460.46    1
## 863             460.63    1
## 864             460.77    1
## 865             460.91    1
## 866             461.78    1
## 867             462.40    1
## 868             462.50    1
## 869             462.75    1
## 870             462.80    1
## 871             462.93    1
## 872             463.00    1
## 873             463.35    1
## 874             463.60    1
## 875             463.63    1
## 876             463.69    1
## 877             464.02    1
## 878             464.40    1
## 879             464.96    1
## 880             465.38    1
## 881             465.56    1
## 882             465.58    1
## 883             467.01    1
## 884             467.15    1
## 885             467.23    1
## 886             467.60    1
## 887             467.80    1
## 888             468.03    1
## 889             468.13    1
## 890             468.53    1
## 891             468.99    1
## 892             469.08    1
## 893             469.11    1
## 894             469.29    1
## 895             469.77    1
## 896             470.05    1
## 897             470.42    1
## 898             470.73    1
## 899             471.00    1
## 900             471.15    1
## 901             471.20    1
## 902             471.48    1
## 903             471.50    1
## 904             471.89    1
## 905             472.25    1
## 906             472.40    1
## 907             472.57    1
## 908             472.67    1
## 909             472.73    1
## 910             472.79    1
## 911             472.80    1
## 912             473.00    1
## 913             473.38    1
## 914             474.69    1
## 915             474.71    1
## 916             475.15    1
## 917             475.44    1
## 918             475.61    1
## 919             475.72    1
## 920             476.00    1
## 921             476.49    1
## 922             476.60    1
## 923             476.63    1
## 924             477.05    1
## 925             477.12    1
## 926             477.13    1
## 927             477.20    1
## 928             477.85    1
## 929             477.96    1
## 930             478.05    1
## 931             478.07    1
## 932             478.20    1
## 933             478.27    1
## 934             478.40    1
## 935             478.52    1
## 936             478.80    1
## 937             479.33    1
## 938             479.63    1
## 939             479.97    1
## 940             480.07    1
## 941             480.96    1
## 942             481.00    1
## 943             481.20    1
## 944             481.46    1
## 945             482.02    1
## 946             482.57    1
## 947             482.73    1
## 948             482.81    1
## 949             483.31    1
## 950             483.32    1
## 951             483.83    1
## 952             484.28    1
## 953             484.40    1
## 954             484.61    1
## 955             484.80    1
## 956             485.20    1
## 957             485.47    1
## 958             486.23    1
## 959             486.40    1
## 960             486.52    1
## 961             486.69    1
## 962             487.21    1
## 963             487.60    1
## 964             487.62    1
## 965             487.63    1
## 966             488.57    1
## 967             488.73    1
## 968             488.79    1
## 969             488.90    1
## 970             489.00    1
## 971             489.60    1
## 972             489.63    1
## 973             490.28    1
## 974             490.33    1
## 975             490.63    1
## 976             491.37    1
## 977             491.58    1
## 978             492.14    1
## 979             492.25    1
## 980             492.42    1
## 981             492.77    1
## 982             492.88    1
## 983             492.92    1
## 984             493.00    1
## 985             493.54    1
## 986             494.13    1
## 987             495.00    1
## 988             495.20    1
## 989             495.26    1
## 990             495.42    1
## 991             495.52    1
## 992             495.67    1
## 993             495.73    1
## 994             496.23    1
## 995             496.30    1
## 996             496.46    1
## 997             496.62    1
## 998             497.00    1
## 999             497.02    1
## 1000            497.20    1
## 1001            497.25    1
## 1002            497.31    1
## 1003            497.40    1
## 1004            497.68    1
## 1005            498.06    1
## 1006            498.40    1
## 1007            499.15    1
## 1008            499.87    1
## 1009            500.03    1
## 1010            500.34    1
## 1011            500.40    1
## 1012            500.60    1
## 1013            500.75    1
## 1014            500.96    1
## 1015            501.20    1
## 1016            501.37    1
## 1017            501.53    1
## 1018            501.69    1
## 1019            502.25    1
## 1020            502.80    1
## 1021            502.83    1
## 1022            502.96    1
## 1023            503.02    1
## 1024            503.85    1
## 1025            504.13    1
## 1026            504.81    1
## 1027            505.01    1
## 1028            505.05    1
## 1029            505.47    1
## 1030            505.60    1
## 1031            506.03    1
## 1032            506.10    1
## 1033            506.35    1
## 1034            506.37    1
## 1035            506.40    1
## 1036            506.42    1
## 1037            506.53    1
## 1038            506.57    1
## 1039            506.77    1
## 1040            506.85    1
## 1041            507.00    1
## 1042            507.20    1
## 1043            508.35    1
## 1044            508.40    1
## 1045            508.48    1
## 1046            508.58    1
## 1047            508.90    1
## 1048            509.20    1
## 1049            509.34    1
## 1050            509.97    1
## 1051            510.00    1
## 1052            510.24    1
## 1053            511.20    1
## 1054            511.23    1
## 1055            511.57    1
## 1056            511.60    1
## 1057            511.86    1
## 1058            512.00    1
## 1059            512.02    1
## 1060            512.07    1
## 1061            512.75    1
## 1062            513.29    1
## 1063            513.54    1
## 1064            513.64    1
## 1065            513.85    1
## 1066            513.95    1
## 1067            514.00    1
## 1068            514.06    1
## 1069            514.29    1
## 1070            514.80    1
## 1071            515.00    1
## 1072            515.20    1
## 1073            515.35    1
## 1074            515.72    1
## 1075            515.98    1
## 1076            516.45    1
## 1077            516.73    1
## 1078            516.80    1
## 1079            517.20    1
## 1080            517.60    1
## 1081            517.77    1
## 1082            518.56    1
## 1083            518.60    1
## 1084            518.80    1
## 1085            519.23    1
## 1086            519.31    1
## 1087            519.60    1
## 1088            519.79    1
## 1089            519.80    1
## 1090            520.40    1
## 1091            521.00    1
## 1092            521.20    1
## 1093            521.83    1
## 1094            522.40    1
## 1095            522.80    1
## 1096            523.41    1
## 1097            523.79    1
## 1098            524.00    1
## 1099            524.06    1
## 1100            525.16    1
## 1101            525.60    1
## 1102            525.85    1
## 1103            526.06    1
## 1104            526.64    1
## 1105            526.92    1
## 1106            527.73    1
## 1107            527.76    1
## 1108            527.90    1
## 1109            527.96    1
## 1110            528.00    1
## 1111            528.18    1
## 1112            528.40    1
## 1113            528.90    1
## 1114            528.98    1
## 1115            529.20    1
## 1116            529.60    1
## 1117            529.96    1
## 1118            530.40    1
## 1119            530.48    1
## 1120            530.50    1
## 1121            530.71    1
## 1122            530.80    1
## 1123            531.00    1
## 1124            531.32    1
## 1125            531.50    1
## 1126            531.93    1
## 1127            532.15    1
## 1128            532.60    1
## 1129            532.68    1
## 1130            532.80    1
## 1131            533.03    1
## 1132            533.20    1
## 1133            533.60    1
## 1134            533.68    1
## 1135            534.00    1
## 1136            534.22    1
## 1137            534.40    1
## 1138            534.52    1
## 1139            534.62    1
## 1140            534.70    1
## 1141            534.73    1
## 1142            534.75    1
## 1143            534.80    1
## 1144            535.51    1
## 1145            535.60    1
## 1146            535.84    1
## 1147            536.00    1
## 1148            537.36    1
## 1149            537.39    1
## 1150            537.92    1
## 1151            537.96    1
## 1152            538.05    1
## 1153            538.38    1
## 1154            538.40    1
## 1155            538.48    1
## 1156            539.41    1
## 1157            539.73    1
## 1158            539.80    1
## 1159            540.67    1
## 1160            541.09    1
## 1161            541.14    1
## 1162            541.46    1
## 1163            542.80    1
## 1164            542.87    1
## 1165            543.32    1
## 1166            543.69    1
## 1167            543.75    1
## 1168            544.04    1
## 1169            544.60    1
## 1170            545.57    1
## 1171            545.71    1
## 1172            546.00    1
## 1173            546.53    1
## 1174            546.88    1
## 1175            546.98    1
## 1176            547.66    1
## 1177            548.38    1
## 1178            548.43    1
## 1179            548.65    1
## 1180            548.80    1
## 1181            548.85    1
## 1182            549.11    1
## 1183            549.46    1
## 1184            549.62    1
## 1185            550.20    1
## 1186            550.80    1
## 1187            551.44    1
## 1188            551.84    1
## 1189            552.00    1
## 1190            552.30    1
## 1191            553.28    1
## 1192            553.72    1
## 1193            553.73    1
## 1194            554.44    1
## 1195            554.57    1
## 1196            554.61    1
## 1197            554.73    1
## 1198            554.80    1
## 1199            554.90    1
## 1200            554.91    1
## 1201            554.94    1
## 1202            555.00    1
## 1203            555.31    1
## 1204            556.16    1
## 1205            556.27    1
## 1206            556.40    1
## 1207            556.79    1
## 1208            557.46    1
## 1209            558.28    1
## 1210            558.57    1
## 1211            559.00    1
## 1212            559.02    1
## 1213            559.60    1
## 1214            559.64    1
## 1215            559.71    1
## 1216            559.92    1
## 1217            560.19    1
## 1218            561.65    1
## 1219            561.67    1
## 1220            562.64    1
## 1221            563.20    1
## 1222            563.58    1
## 1223            563.86    1
## 1224            563.90    1
## 1225            564.00    1
## 1226            564.19    1
## 1227            564.27    1
## 1228            564.37    1
## 1229            565.79    1
## 1230            566.15    1
## 1231            566.35    1
## 1232            566.72    1
## 1233            566.73    1
## 1234            566.80    1
## 1235            566.81    1
## 1236            566.99    1
## 1237            567.23    1
## 1238            567.30    1
## 1239            568.00    1
## 1240            568.17    1
## 1241            568.75    1
## 1242            568.80    1
## 1243            568.94    1
## 1244            569.45    1
## 1245            569.93    1
## 1246            570.00    1
## 1247            570.37    1
## 1248            570.50    1
## 1249            570.65    1
## 1250            570.77    1
## 1251            571.00    1
## 1252            571.30    1
## 1253            571.46    1
## 1254            572.45    1
## 1255            572.50    1
## 1256            573.00    1
## 1257            573.47    1
## 1258            573.65    1
## 1259            574.00    1
## 1260            574.19    1
## 1261            574.37    1
## 1262            574.38    1
## 1263            575.11    1
## 1264            575.25    1
## 1265            575.35    1
## 1266            575.42    1
## 1267            575.87    1
## 1268            576.82    1
## 1269            577.20    1
## 1270            577.37    1
## 1271            577.50    1
## 1272            577.72    1
## 1273            578.42    1
## 1274            579.55    1
## 1275            579.96    1
## 1276            581.00    1
## 1277            581.20    1
## 1278            581.84    1
## 1279            582.03    1
## 1280            582.13    1
## 1281            582.24    1
## 1282            583.17    1
## 1283            583.20    1
## 1284            583.60    1
## 1285            583.65    1
## 1286            583.68    1
## 1287            583.77    1
## 1288            584.36    1
## 1289            584.40    1
## 1290            584.80    1
## 1291            585.00    1
## 1292            585.20    1
## 1293            585.23    1
## 1294            585.30    1
## 1295            585.60    1
## 1296            586.00    1
## 1297            587.01    1
## 1298            587.20    1
## 1299            587.23    1
## 1300            587.67    1
## 1301            587.85    1
## 1302            588.29    1
## 1303            588.30    1
## 1304            588.60    1
## 1305            589.20    1
## 1306            589.32    1
## 1307            590.00    1
## 1308            590.23    1
## 1309            590.76    1
## 1310            590.81    1
## 1311            591.79    1
## 1312            591.84    1
## 1313            592.82    1
## 1314            593.60    1
## 1315            593.69    1
## 1316            593.76    1
## 1317            593.93    1
## 1318            594.71    1
## 1319            595.00    1
## 1320            595.60    1
## 1321            595.98    1
## 1322            596.05    1
## 1323            596.44    1
## 1324            596.81    1
## 1325            597.16    1
## 1326            598.39    1
## 1327            598.46    1
## 1328            598.50    1
## 1329            598.55    1
## 1330            599.48    1
## 1331            599.82    1
## 1332            599.86    1
## 1333            600.69    1
## 1334            600.80    1
## 1335            601.00    1
## 1336            602.20    1
## 1337            602.30    1
## 1338            603.00    1
## 1339            603.29    1
## 1340            603.46    1
## 1341            603.88    1
## 1342            604.38    1
## 1343            604.40    1
## 1344            604.50    1
## 1345            604.73    1
## 1346            605.00    1
## 1347            606.01    1
## 1348            606.90    1
## 1349            606.92    1
## 1350            607.52    1
## 1351            607.60    1
## 1352            607.73    1
## 1353            607.78    1
## 1354            607.86    1
## 1355            608.55    1
## 1356            609.00    1
## 1357            609.07    1
## 1358            609.20    1
## 1359            609.45    1
## 1360            609.46    1
## 1361            609.62    1
## 1362            609.76    1
## 1363            609.89    1
## 1364            610.17    1
## 1365            610.45    1
## 1366            611.00    1
## 1367            611.29    1
## 1368            611.41    1
## 1369            611.52    1
## 1370            611.60    1
## 1371            611.79    1
## 1372            612.00    1
## 1373            613.04    1
## 1374            613.94    1
## 1375            613.96    1
## 1376            614.46    1
## 1377            614.54    1
## 1378            614.76    1
## 1379            614.80    1
## 1380            615.20    1
## 1381            615.35    1
## 1382            615.38    1
## 1383            615.60    1
## 1384            615.91    1
## 1385            615.95    1
## 1386            616.00    1
## 1387            617.00    1
## 1388            617.20    1
## 1389            618.19    1
## 1390            618.85    1
## 1391            619.38    1
## 1392            619.50    1
## 1393            619.80    1
## 1394            620.16    1
## 1395            620.18    1
## 1396            620.40    1
## 1397            620.55    1
## 1398            620.80    1
## 1399            620.94    1
## 1400            621.00    1
## 1401            621.20    1
## 1402            621.58    1
## 1403            621.69    1
## 1404            621.72    1
## 1405            621.82    1
## 1406            622.23    1
## 1407            623.65    1
## 1408            624.40    1
## 1409            625.44    1
## 1410            626.59    1
## 1411            626.83    1
## 1412            627.20    1
## 1413            627.55    1
## 1414            628.00    1
## 1415            628.50    1
## 1416            629.00    1
## 1417            629.09    1
## 1418            629.20    1
## 1419            630.40    1
## 1420            631.95    1
## 1421            632.00    1
## 1422            632.40    1
## 1423            633.94    1
## 1424            634.69    1
## 1425            634.92    1
## 1426            635.00    1
## 1427            636.00    1
## 1428            636.26    1
## 1429            636.38    1
## 1430            636.48    1
## 1431            636.80    1
## 1432            637.76    1
## 1433            638.41    1
## 1434            638.87    1
## 1435            638.99    1
## 1436            639.20    1
## 1437            639.46    1
## 1438            639.92    1
## 1439            640.01    1
## 1440            640.20    1
## 1441            640.24    1
## 1442            640.43    1
## 1443            641.43    1
## 1444            641.60    1
## 1445            642.98    1
## 1446            643.29    1
## 1447            643.85    1
## 1448            644.22    1
## 1449            644.81    1
## 1450            644.94    1
## 1451            645.20    1
## 1452            646.69    1
## 1453            646.80    1
## 1454            647.17    1
## 1455            647.27    1
## 1456            647.30    1
## 1457            647.39    1
## 1458            647.54    1
## 1459            648.36    1
## 1460            648.46    1
## 1461            648.98    1
## 1462            649.01    1
## 1463            649.13    1
## 1464            649.20    1
## 1465            650.70    1
## 1466            650.80    1
## 1467            651.03    1
## 1468            651.54    1
## 1469            652.85    1
## 1470            653.40    1
## 1471            653.71    1
## 1472            655.32    1
## 1473            655.50    1
## 1474            655.92    1
## 1475            656.24    1
## 1476            656.36    1
## 1477            656.40    1
## 1478            657.12    1
## 1479            657.23    1
## 1480            658.00    1
## 1481            659.00    1
## 1482            660.00    1
## 1483            660.40    1
## 1484            661.00    1
## 1485            661.58    1
## 1486            662.00    1
## 1487            662.20    1
## 1488            662.67    1
## 1489            662.80    1
## 1490            662.96    1
## 1491            663.40    1
## 1492            663.46    1
## 1493            663.69    1
## 1494            664.00    1
## 1495            664.14    1
## 1496            665.00    1
## 1497            665.28    1
## 1498            665.56    1
## 1499            666.24    1
## 1500            667.60    1
## 1501            667.83    1
## 1502            667.88    1
## 1503            668.32    1
## 1504            668.77    1
## 1505            669.20    1
## 1506            669.61    1
## 1507            669.75    1
## 1508            670.00    1
## 1509            670.01    1
## 1510            670.40    1
## 1511            671.00    1
## 1512            671.20    1
## 1513            672.00    1
## 1514            672.20    1
## 1515            673.00    1
## 1516            673.40    1
## 1517            674.00    1
## 1518            674.60    1
## 1519            674.83    1
## 1520            675.20    1
## 1521            676.80    1
## 1522            677.00    1
## 1523            677.11    1
## 1524            679.02    1
## 1525            679.60    1
## 1526            679.62    1
## 1527            681.00    1
## 1528            682.00    1
## 1529            682.15    1
## 1530            682.45    1
## 1531            683.48    1
## 1532            684.00    1
## 1533            684.29    1
## 1534            684.80    1
## 1535            684.81    1
## 1536            685.00    1
## 1537            685.71    1
## 1538            686.00    1
## 1539            686.70    1
## 1540            687.71    1
## 1541            688.94    1
## 1542            689.00    1
## 1543            689.20    1
## 1544            690.80    1
## 1545            690.89    1
## 1546            691.00    1
## 1547            691.28    1
## 1548            691.42    1
## 1549            693.45    1
## 1550            693.48    1
## 1551            693.92    1
## 1552            694.23    1
## 1553            695.00    1
## 1554            695.38    1
## 1555            696.32    1
## 1556            696.35    1
## 1557            696.72    1
## 1558            697.00    1
## 1559            697.26    1
## 1560            697.60    1
## 1561            697.68    1
## 1562            698.00    1
## 1563            698.35    1
## 1564            699.93    1
## 1565            700.70    1
## 1566            701.44    1
## 1567            702.00    1
## 1568            703.15    1
## 1569            703.23    1
## 1570            704.00    1
## 1571            704.83    1
## 1572            705.20    1
## 1573            705.33    1
## 1574            705.96    1
## 1575            706.00    1
## 1576            707.00    1
## 1577            707.12    1
## 1578            707.84    1
## 1579            708.00    1
## 1580            708.80    1
## 1581            709.20    1
## 1582            709.40    1
## 1583            710.23    1
## 1584            710.50    1
## 1585            711.60    1
## 1586            711.70    1
## 1587            712.46    1
## 1588            713.25    1
## 1589            713.28    1
## 1590            714.40    1
## 1591            715.04    1
## 1592            715.25    1
## 1593            715.96    1
## 1594            717.00    1
## 1595            717.15    1
## 1596            719.00    1
## 1597            720.64    1
## 1598            720.80    1
## 1599            722.76    1
## 1600            723.24    1
## 1601            723.31    1
## 1602            727.95    1
## 1603            728.00    1
## 1604            728.03    1
## 1605            728.06    1
## 1606            728.80    1
## 1607            729.52    1
## 1608            732.00    1
## 1609            732.80    1
## 1610            733.00    1
## 1611            734.40    1
## 1612            734.55    1
## 1613            735.39    1
## 1614            736.00    1
## 1615            736.48    1
## 1616            737.00    1
## 1617            738.00    1
## 1618            738.82    1
## 1619            739.54    1
## 1620            740.15    1
## 1621            740.80    1
## 1622            741.00    1
## 1623            741.14    1
## 1624            741.20    1
## 1625            741.75    1
## 1626            743.52    1
## 1627            744.00    1
## 1628            744.12    1
## 1629            744.33    1
## 1630            744.80    1
## 1631            745.75    1
## 1632            746.08    1
## 1633            746.74    1
## 1634            746.93    1
## 1635            747.66    1
## 1636            747.88    1
## 1637            748.00    1
## 1638            748.18    1
## 1639            750.38    1
## 1640            752.37    1
## 1641            752.75    1
## 1642            753.02    1
## 1643            755.20    1
## 1644            755.26    1
## 1645            756.21    1
## 1646            756.48    1
## 1647            756.75    1
## 1648            757.00    1
## 1649            759.17    1
## 1650            759.60    1
## 1651            760.32    1
## 1652            760.40    1
## 1653            760.90    1
## 1654            761.75    1
## 1655            761.86    1
## 1656            763.21    1
## 1657            764.40    1
## 1658            764.51    1
## 1659            764.55    1
## 1660            764.71    1
## 1661            765.27    1
## 1662            765.71    1
## 1663            766.80    1
## 1664            767.00    1
## 1665            769.23    1
## 1666            769.26    1
## 1667            769.44    1
## 1668            769.50    1
## 1669            771.20    1
## 1670            772.00    1
## 1671            772.20    1
## 1672            772.67    1
## 1673            772.73    1
## 1674            772.80    1
## 1675            773.48    1
## 1676            773.61    1
## 1677            775.00    1
## 1678            778.75    1
## 1679            779.60    1
## 1680            780.00    1
## 1681            782.00    1
## 1682            782.08    1
## 1683            782.91    1
## 1684            783.00    1
## 1685            783.33    1
## 1686            784.80    1
## 1687            785.60    1
## 1688            786.00    1
## 1689            787.77    1
## 1690            788.00    1
## 1691            788.46    1
## 1692            789.04    1
## 1693            790.00    1
## 1694            790.80    1
## 1695            792.29    1
## 1696            793.00    1
## 1697            794.00    1
## 1698            795.13    1
## 1699            796.00    1
## 1700            797.00    1
## 1701            797.96    1
## 1702            798.46    1
## 1703            798.49    1
## 1704            798.61    1
## 1705            801.17    1
## 1706            802.00    1
## 1707            802.80    1
## 1708            803.00    1
## 1709            803.36    1
## 1710            803.60    1
## 1711            803.84    1
## 1712            804.00    1
## 1713            805.07    1
## 1714            805.12    1
## 1715            806.00    1
## 1716            807.00    1
## 1717            807.60    1
## 1718            808.88    1
## 1719            809.25    1
## 1720            809.45    1
## 1721            809.98    1
## 1722            810.00    1
## 1723            810.40    1
## 1724            811.59    1
## 1725            812.11    1
## 1726            812.35    1
## 1727            812.94    1
## 1728            813.00    1
## 1729            813.20    1
## 1730            814.00    1
## 1731            815.15    1
## 1732            817.00    1
## 1733            817.08    1
## 1734            817.15    1
## 1735            817.23    1
## 1736            817.30    1
## 1737            819.00    1
## 1738            819.23    1
## 1739            820.18    1
## 1740            820.48    1
## 1741            822.40    1
## 1742            824.89    1
## 1743            827.00    1
## 1744            827.64    1
## 1745            829.00    1
## 1746            830.00    1
## 1747            831.20    1
## 1748            832.00    1
## 1749            832.09    1
## 1750            833.28    1
## 1751            834.00    1
## 1752            834.40    1
## 1753            834.96    1
## 1754            836.20    1
## 1755            836.32    1
## 1756            836.83    1
## 1757            837.44    1
## 1758            838.70    1
## 1759            839.86    1
## 1760            841.00    1
## 1761            842.27    1
## 1762            844.06    1
## 1763            844.69    1
## 1764            845.00    1
## 1765            846.48    1
## 1766            847.47    1
## 1767            848.00    1
## 1768            848.40    1
## 1769            850.29    1
## 1770            851.21    1
## 1771            851.40    1
## 1772            852.00    1
## 1773            853.00    1
## 1774            855.00    1
## 1775            856.04    1
## 1776            856.82    1
## 1777            858.44    1
## 1778            860.35    1
## 1779            860.63    1
## 1780            861.89    1
## 1781            862.87    1
## 1782            863.20    1
## 1783            863.49    1
## 1784            864.69    1
## 1785            865.20    1
## 1786            865.38    1
## 1787            865.60    1
## 1788            865.85    1
## 1789            866.04    1
## 1790            866.76    1
## 1791            867.00    1
## 1792            868.72    1
## 1793            869.00    1
## 1794            871.80    1
## 1795            872.80    1
## 1796            873.85    1
## 1797            874.80    1
## 1798            876.33    1
## 1799            876.63    1
## 1800            882.00    1
## 1801            882.40    1
## 1802            883.36    1
## 1803            884.35    1
## 1804            885.00    1
## 1805            885.20    1
## 1806            885.48    1
## 1807            886.00    1
## 1808            887.00    1
## 1809            890.00    1
## 1810            891.01    1
## 1811            891.96    1
## 1812            892.32    1
## 1813            893.30    1
## 1814            895.60    1
## 1815            898.40    1
## 1816            900.90    1
## 1817            901.00    1
## 1818            901.04    1
## 1819            902.00    1
## 1820            902.30    1
## 1821            902.80    1
## 1822            905.29    1
## 1823            905.30    1
## 1824            906.40    1
## 1825            907.00    1
## 1826            909.00    1
## 1827            910.00    1
## 1828            910.07    1
## 1829            912.00    1
## 1830            913.44    1
## 1831            915.17    1
## 1832            916.00    1
## 1833            917.74    1
## 1834            919.24    1
## 1835            919.39    1
## 1836            920.00    1
## 1837            920.77    1
## 1838            922.88    1
## 1839            923.00    1
## 1840            924.00    1
## 1841            925.60    1
## 1842            926.37    1
## 1843            928.45    1
## 1844            929.00    1
## 1845            930.21    1
## 1846            931.35    1
## 1847            933.00    1
## 1848            935.94    1
## 1849            936.11    1
## 1850            936.80    1
## 1851            937.00    1
## 1852            939.13    1
## 1853            939.73    1
## 1854            940.00    1
## 1855            940.50    1
## 1856            940.80    1
## 1857            947.70    1
## 1858            948.43    1
## 1859            949.26    1
## 1860            952.97    1
## 1861            953.05    1
## 1862            953.60    1
## 1863            954.00    1
## 1864            956.40    1
## 1865            956.60    1
## 1866            956.80    1
## 1867            958.00    1
## 1868            958.41    1
## 1869            959.00    1
## 1870            959.93    1
## 1871            960.00    1
## 1872            960.25    1
## 1873            961.00    1
## 1874            961.50    1
## 1875            961.54    1
## 1876            962.13    1
## 1877            962.19    1
## 1878            963.42    1
## 1879            963.60    1
## 1880            968.48    1
## 1881            969.00    1
## 1882            972.65    1
## 1883            972.83    1
## 1884            973.00    1
## 1885            973.56    1
## 1886            973.84    1
## 1887            974.81    1
## 1888            975.39    1
## 1889            976.00    1
## 1890            980.77    1
## 1891            981.60    1
## 1892            981.92    1
## 1893            982.02    1
## 1894            983.00    1
## 1895            984.00    1
## 1896            984.12    1
## 1897            985.00    1
## 1898            988.40    1
## 1899            988.59    1
## 1900            990.40    1
## 1901            992.08    1
## 1902            992.31    1
## 1903            994.00    1
## 1904            997.00    1
## 1905            999.19    1
## 1906            999.43    1
## 1907           1002.00    1
## 1908           1003.97    1
## 1909           1006.32    1
## 1910           1007.19    1
## 1911           1010.20    1
## 1912           1012.00    1
## 1913           1014.00    1
## 1914           1014.71    1
## 1915           1016.68    1
## 1916           1017.69    1
## 1917           1019.23    1
## 1918           1020.00    1
## 1919           1022.00    1
## 1920           1023.00    1
## 1921           1025.00    1
## 1922           1027.60    1
## 1923           1029.48    1
## 1924           1031.60    1
## 1925           1032.79    1
## 1926           1036.60    1
## 1927           1039.15    1
## 1928           1040.00    1
## 1929           1041.00    1
## 1930           1042.78    1
## 1931           1042.80    1
## 1932           1046.08    1
## 1933           1046.54    1
## 1934           1046.80    1
## 1935           1048.00    1
## 1936           1049.85    1
## 1937           1050.89    1
## 1938           1051.00    1
## 1939           1054.00    1
## 1940           1054.27    1
## 1941           1054.28    1
## 1942           1054.40    1
## 1943           1056.00    1
## 1944           1059.00    1
## 1945           1062.32    1
## 1946           1064.63    1
## 1947           1065.00    1
## 1948           1065.61    1
## 1949           1066.42    1
## 1950           1066.46    1
## 1951           1067.85    1
## 1952           1068.40    1
## 1953           1068.46    1
## 1954           1070.00    1
## 1955           1071.00    1
## 1956           1073.00    1
## 1957           1073.23    1
## 1958           1073.58    1
## 1959           1082.00    1
## 1960           1082.80    1
## 1961           1083.60    1
## 1962           1083.69    1
## 1963           1087.46    1
## 1964           1090.11    1
## 1965           1091.76    1
## 1966           1093.27    1
## 1967           1094.44    1
## 1968           1095.48    1
## 1969           1096.00    1
## 1970           1096.80    1
## 1971           1097.00    1
## 1972           1100.00    1
## 1973           1102.00    1
## 1974           1103.30    1
## 1975           1105.15    1
## 1976           1105.77    1
## 1977           1106.00    1
## 1978           1106.23    1
## 1979           1107.71    1
## 1980           1108.00    1
## 1981           1109.00    1
## 1982           1110.57    1
## 1983           1110.78    1
## 1984           1112.00    1
## 1985           1113.46    1
## 1986           1115.00    1
## 1987           1116.00    1
## 1988           1116.97    1
## 1989           1120.40    1
## 1990           1128.00    1
## 1991           1129.89    1
## 1992           1130.05    1
## 1993           1132.22    1
## 1994           1132.40    1
## 1995           1134.08    1
## 1996           1134.59    1
## 1997           1135.13    1
## 1998           1138.67    1
## 1999           1139.00    1
## 2000           1139.60    1
## 2001           1140.00    1
## 2002           1141.00    1
## 2003           1141.15    1
## 2004           1144.40    1
## 2005           1149.81    1
## 2006           1150.00    1
## 2007           1152.00    1
## 2008           1153.28    1
## 2009           1159.52    1
## 2010           1161.10    1
## 2011           1161.44    1
## 2012           1166.54    1
## 2013           1170.00    1
## 2014           1171.00    1
## 2015           1171.33    1
## 2016           1173.00    1
## 2017           1174.00    1
## 2018           1174.42    1
## 2019           1176.00    1
## 2020           1180.39    1
## 2021           1182.00    1
## 2022           1183.00    1
## 2023           1183.28    1
## 2024           1185.95    1
## 2025           1188.00    1
## 2026           1193.00    1
## 2027           1195.00    1
## 2028           1198.06    1
## 2029           1201.60    1
## 2030           1202.00    1
## 2031           1203.00    1
## 2032           1207.20    1
## 2033           1210.00    1
## 2034           1211.60    1
## 2035           1212.40    1
## 2036           1219.60    1
## 2037           1220.00    1
## 2038           1220.16    1
## 2039           1221.64    1
## 2040           1222.13    1
## 2041           1222.19    1
## 2042           1233.32    1
## 2043           1234.00    1
## 2044           1238.75    1
## 2045           1239.69    1
## 2046           1240.26    1
## 2047           1241.53    1
## 2048           1242.00    1
## 2049           1244.00    1
## 2050           1245.61    1
## 2051           1246.83    1
## 2052           1249.60    1
## 2053           1252.00    1
## 2054           1262.00    1
## 2055           1267.00    1
## 2056           1272.00    1
## 2057           1273.20    1
## 2058           1275.00    1
## 2059           1284.59    1
## 2060           1286.00    1
## 2061           1288.00    1
## 2062           1300.00    1
## 2063           1306.13    1
## 2064           1307.60    1
## 2065           1312.00    1
## 2066           1314.00    1
## 2067           1316.00    1
## 2068           1318.55    1
## 2069           1322.00    1
## 2070           1322.33    1
## 2071           1322.65    1
## 2072           1323.20    1
## 2073           1334.08    1
## 2074           1341.60    1
## 2075           1347.00    1
## 2076           1352.00    1
## 2077           1363.00    1
## 2078           1367.00    1
## 2079           1370.00    1
## 2080           1371.09    1
## 2081           1372.00    1
## 2082           1373.20    1
## 2083           1378.33    1
## 2084           1383.69    1
## 2085           1384.99    1
## 2086           1385.00    1
## 2087           1387.15    1
## 2088           1400.00    1
## 2089           1401.60    1
## 2090           1412.00    1
## 2091           1415.40    1
## 2092           1419.00    1
## 2093           1419.30    1
## 2094           1430.00    1
## 2095           1461.51    1
## 2096           1472.00    1
## 2097           1481.93    1
## 2098           1482.36    1
## 2099           1494.00    1
## 2100           1498.56    1
## 2101           1500.00    1
## 2102           1502.77    1
## 2103           1515.00    1
## 2104           1527.99    1
## 2105           1535.00    1
## 2106           1551.25    1
## 2107           1564.64    1
## 2108           1575.60    1
## 2109           1578.48    1
## 2110           1599.89    1
## 2111           1601.00    1
## 2112           1615.38    1
## 2113           1633.00    1
## 2114           1651.00    1
## 2115           1671.12    1
## 2116           1679.65    1
## 2117           1695.92    1
## 2118           1712.00    1
## 2119           1721.43    1
## 2120           1727.10    1
## 2121           1731.00    1
## 2122           1759.15    1
## 2123           1764.40    1
## 2124           1808.00    1
## 2125           1875.00    1
## 2126           1879.00    1
## 2127           1910.00    1
## 2128           1937.53    1
## 2129           1961.00    1
## 2130           1974.91    1
## 2131           1998.00    1
## 2132           2021.00    1
## 2133           2027.00    1
## 2134           2069.25    1
## 2135           2120.00    1
## 2136           2146.09    1
## 2137           2151.00    1
## 2138           2201.00    1
## 2139           2285.00    1
## 2140           2361.74    1
## 2141           2406.04    1
## 2142           2500.00    1
## 2143           2804.40    1
## 2144           2846.00    1
## 2145           2938.78    1
## 2146           2997.75    1
## 2147           3281.18    1
## 2148           3323.04    1
## 2149           3552.00    1
## 2150           3970.47    1
## 2151           8220.92    1
## 2152          43000.00    1
## 2153          47809.62    1
## 2154          56140.00    1
## 2155          87040.00    1
## 2156         131160.00    1
## 2157        2024000.00    1
bdarbol<- na.omit(bdarbol, cols = c("Gender", "ClaimantAge_at_DOI", "AverageWeeklyWage"))
bdarbol <- bdarbol[bdarbol$ClaimantAge_at_DOI > 0,]
count(bdarbol, Gender, sort=TRUE)
##          Gender  n
## 1        Female 45
## 2          Male 44
## 3 Not Available  2
count(bdarbol, ClaimantAge_at_DOI, sort=TRUE)
##    ClaimantAge_at_DOI n
## 1                  39 7
## 2                  41 6
## 3                  27 5
## 4                  36 5
## 5                  51 5
## 6                  20 4
## 7                  32 4
## 8                  38 4
## 9                  48 4
## 10                 54 4
## 11                 28 3
## 12                 45 3
## 13                 19 2
## 14                 23 2
## 15                 24 2
## 16                 26 2
## 17                 29 2
## 18                 35 2
## 19                 40 2
## 20                 43 2
## 21                 46 2
## 22                 52 2
## 23                 53 2
## 24                 21 1
## 25                 22 1
## 26                 25 1
## 27                 33 1
## 28                 34 1
## 29                 37 1
## 30                 42 1
## 31                 44 1
## 32                 49 1
## 33                 50 1
## 34                 58 1
## 35                 60 1
## 36                 62 1
## 37                 65 1
## 38                 68 1
count(bdarbol, AverageWeeklyWage, sort=TRUE)
##    AverageWeeklyWage  n
## 1               1.00 15
## 2             100.00  3
## 3             350.00  2
## 4               0.23  1
## 5              55.55  1
## 6             148.00  1
## 7             175.00  1
## 8             180.00  1
## 9             181.76  1
## 10            234.00  1
## 11            260.00  1
## 12            280.00  1
## 13            300.00  1
## 14            320.00  1
## 15            326.10  1
## 16            352.15  1
## 17            352.30  1
## 18            373.42  1
## 19            387.60  1
## 20            400.00  1
## 21            413.60  1
## 22            428.85  1
## 23            430.40  1
## 24            438.49  1
## 25            440.40  1
## 26            448.00  1
## 27            450.00  1
## 28            458.27  1
## 29            459.50  1
## 30            460.11  1
## 31            479.97  1
## 32            491.58  1
## 33            496.62  1
## 34            505.01  1
## 35            509.97  1
## 36            509.98  1
## 37            510.24  1
## 38            511.60  1
## 39            512.02  1
## 40            513.64  1
## 41            515.72  1
## 42            528.40  1
## 43            546.98  1
## 44            554.94  1
## 45            556.79  1
## 46            562.64  1
## 47            570.77  1
## 48            571.30  1
## 49            576.80  1
## 50            581.84  1
## 51            590.23  1
## 52            598.55  1
## 53            599.86  1
## 54            610.00  1
## 55            619.80  1
## 56            620.00  1
## 57            620.16  1
## 58            647.54  1
## 59            655.32  1
## 60            674.00  1
## 61            697.68  1
## 62            700.00  1
## 63            728.80  1
## 64            755.20  1
## 65            756.75  1
## 66            832.09  1
## 67            874.00  1
## 68            918.46  1
## 69            956.60  1
## 70            981.60  1
## 71            984.12  1
## 72           1149.81  1
## 73           1211.60  1
## 74           1401.60  1
sapply(bdarbol, function(x) sum(is.na(x)))
##                  ClaimID                TotalPaid            TotalReserves 
##                        0                        0                        0 
##            TotalRecovery            IndemnityPaid                OtherPaid 
##                        0                        0                        0 
##              ClaimStatus             IncidentDate      IncidentDescription 
##                        0                        0                        0 
##         ReturnToWorkDate        AverageWeeklyWage       ClaimantOpenedDate 
##                        0                        0                        0 
##       ClaimantClosedDate EmployerNotificationDate             ReceivedDate 
##                        0                        0                        0 
##                 IsDenied       ClaimantAge_at_DOI                   Gender 
##                        0                        0                        0 
##             ClaimantType             InjuryNature           BodyPartRegion 
##                        0                        0                        0 
##                 BodyPart            BillReviewALE                 Hospital 
##                        0                        0                        0 
##      PhysicianOutpatient                       Rx      Total_Incurred_Cost 
##                        0                        0                        0 
##                       TP 
##                        0
boxplot(bdarbol$Total_Incurred_Cost, horizontal = TRUE)

boxplot(bdarbol$TP, horizontal = TRUE)

boxplot(bdarbol$AverageWeeklyWage, horizontal = TRUE)

bdarbol <- bdarbol[bdarbol$Total_Incurred_Cost < 130000,]
summary(bdarbol$Total_Incurred_Cost)
##     Min.  1st Qu.   Median     Mean  3rd Qu.     Max. 
##     0.00    94.47   267.74  4264.87  2742.86 78488.36
bdarbol <- bdarbol[bdarbol$AverageWeeklyWage < 1200,]
summary(bdarbol$AverageWeeklyWage)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    0.23  178.75  454.75  414.63  583.94 1149.81
bdarbol <- bdarbol[bdarbol$TP < 2700,]
summary(bdarbol$TP)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    22.0   130.8   510.0   666.2  1095.2  2214.0

Hacer Árbol de Decisiones

Costo Total

arbol<- rpart(formula = Total_Incurred_Cost ~ ClaimantAge_at_DOI+ Gender, data=bdarbol)
arbol
## n= 86 
## 
## node), split, n, deviance, yval
##       * denotes terminal node
## 
##  1) root 86 11162630000  4451.986  
##    2) ClaimantAge_at_DOI>=32.5 57  2211073000  3419.439  
##      4) ClaimantAge_at_DOI< 38.5 14    98758720  1600.548 *
##      5) ClaimantAge_at_DOI>=38.5 43  2050917000  4011.637  
##       10) ClaimantAge_at_DOI>=39.5 36  1014353000  2853.721 *
##       11) ClaimantAge_at_DOI< 39.5 7   740062900  9966.629 *
##    3) ClaimantAge_at_DOI< 32.5 29  8771341000  6481.476  
##      6) ClaimantAge_at_DOI< 27.5 20  1125675000  2771.558 *
##      7) ClaimantAge_at_DOI>=27.5 9  6758686000 14725.740 *
rpart.plot(arbol)

prp(arbol)

Tiempo De Procesamiento

arbol<- rpart(formula = TP ~ AverageWeeklyWage + ClaimantAge_at_DOI, data=bdarbol)
arbol
## n= 86 
## 
## node), split, n, deviance, yval
##       * denotes terminal node
## 
##  1) root 86 27369620  666.2093  
##    2) ClaimantAge_at_DOI< 27.5 20  4985931  414.2000  
##      4) AverageWeeklyWage>=161.5 13  1526929  328.3077 *
##      5) AverageWeeklyWage< 161.5 7  3184981  573.7143 *
##    3) ClaimantAge_at_DOI>=27.5 66 20728610  742.5758  
##      6) AverageWeeklyWage< 313.05 17  3640316  591.5882 *
##      7) AverageWeeklyWage>=313.05 49 16566290  794.9592  
##       14) AverageWeeklyWage>=599.205 16  4232281  614.9375 *
##       15) AverageWeeklyWage< 599.205 33 11564080  882.2424  
##         30) ClaimantAge_at_DOI< 37 11  2328833  622.4545 *
##         31) ClaimantAge_at_DOI>=37 22  8121663 1012.1360  
##           62) AverageWeeklyWage< 433.67 8  2011242  803.2500 *
##           63) AverageWeeklyWage>=433.67 14  5561886 1131.5000 *
rpart.plot(arbol)

prp(arbol)

Regresión Lineal

Limpiar Base de Datos

sum(is.na(bdcabeza$Total_Incurred_Cost))
## [1] 0
sum(is.na(bdcabeza$TP))
## [1] 369
bdregresion <-bdcabeza
bdregresion <- bdregresion[bdregresion$Total_Incurred_Cost > 0,]

Eliminar outliers

boxplot(bdregresion$TP, horizontal = TRUE)

boxplot(bdregresion$Total_Incurred_Cost, horizontal = TRUE)

bdregresion <- bdregresion[bdregresion$TP < 4000,]
bdregresion <- bdregresion[bdregresion$Total_Incurred_Cost < 500000,]
summary(bdregresion$Total_Incurred_Cost)
##     Min.  1st Qu.   Median     Mean  3rd Qu.     Max.     NA's 
##      1.8    111.7    234.0   2351.4    695.4 386860.2      351
count(bdregresion, Gender, sort=TRUE)
##          Gender    n
## 1          Male 5879
## 2        Female 3639
## 3          <NA>  351
## 4 Not Available   70
bdregresion$Gender <- as.factor(bdregresion$Gender)

Regresión Lineal Costo Total

regresion <- lm(Total_Incurred_Cost ~TP + Gender + BodyPart+ AverageWeeklyWage + ClaimantAge_at_DOI, data=bdregresion)

summary(regresion)
## 
## Call:
## lm(formula = Total_Incurred_Cost ~ TP + Gender + BodyPart + AverageWeeklyWage + 
##     ClaimantAge_at_DOI, data = bdregresion)
## 
## Residuals:
##    Min     1Q Median     3Q    Max 
## -35575  -5948  -1964   1309 353067 
## 
## Coefficients:
##                                Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                   1.783e+04  5.876e+03   3.035 0.002431 ** 
## TP                            7.762e+00  6.701e-01  11.582  < 2e-16 ***
## GenderMale                    1.008e+03  9.808e+02   1.028 0.304092    
## GenderNot Available           6.557e+03  5.375e+03   1.220 0.222634    
## BodyPartEar(S)               -2.506e+04  6.037e+03  -4.152 3.41e-05 ***
## BodyPartEyes                 -2.661e+04  5.675e+03  -4.689 2.90e-06 ***
## BodyPartFacial Bones         -2.454e+04  5.899e+03  -4.159 3.30e-05 ***
## BodyPartMouth                -2.563e+04  6.025e+03  -4.254 2.18e-05 ***
## BodyPartMultiple Head Injury -1.961e+04  5.686e+03  -3.448 0.000574 ***
## BodyPartNose                 -1.982e+04  6.022e+03  -3.291 0.001013 ** 
## BodyPartSkull                -2.032e+04  5.935e+03  -3.424 0.000627 ***
## BodyPartSoft Tissue-Head     -2.250e+04  5.842e+03  -3.852 0.000120 ***
## BodyPartTeeth                -2.628e+04  6.139e+03  -4.281 1.93e-05 ***
## AverageWeeklyWage             2.520e-03  1.182e-02   0.213 0.831154    
## ClaimantAge_at_DOI            1.547e+02  3.872e+01   3.994 6.69e-05 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 23800 on 2466 degrees of freedom
##   (7458 observations deleted due to missingness)
## Multiple R-squared:  0.07955,    Adjusted R-squared:  0.07432 
## F-statistic: 15.22 on 14 and 2466 DF,  p-value: < 2.2e-16

Modelo Predictivo

datos <- data.frame(TP= 103, Gender="Female", BodyPart= "Nose",ClaimantAge_at_DOI=34, AverageWeeklyWage=0.10)
predict(regresion, datos)
##        1 
## 4072.688

Regresión Lineal Tiempo de Procesamiento

regresion <- lm(TP ~Total_Incurred_Cost+ Gender + BodyPart + AverageWeeklyWage+ ClaimantAge_at_DOI, data=bdregresion)

summary(regresion)
## 
## Call:
## lm(formula = TP ~ Total_Incurred_Cost + Gender + BodyPart + AverageWeeklyWage + 
##     ClaimantAge_at_DOI, data = bdregresion)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -1525.1  -375.4  -250.5    20.5  3494.1 
## 
## Coefficients:
##                                Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                   4.313e+02  1.720e+02   2.507   0.0122 *  
## Total_Incurred_Cost           6.647e-03  5.739e-04  11.582   <2e-16 ***
## GenderMale                    5.285e-01  2.871e+01   0.018   0.9853    
## GenderNot Available          -1.114e+02  1.573e+02  -0.708   0.4792    
## BodyPartEar(S)                1.122e+02  1.773e+02   0.633   0.5270    
## BodyPartEyes                  1.613e+02  1.668e+02   0.967   0.3334    
## BodyPartFacial Bones          2.919e+02  1.732e+02   1.686   0.0919 .  
## BodyPartMouth                 3.281e+02  1.768e+02   1.855   0.0637 .  
## BodyPartMultiple Head Injury  2.168e+02  1.667e+02   1.300   0.1936    
## BodyPartNose                  1.872e+02  1.766e+02   1.060   0.2892    
## BodyPartSkull                -9.121e+01  1.741e+02  -0.524   0.6003    
## BodyPartSoft Tissue-Head     -1.248e+02  1.715e+02  -0.728   0.4668    
## BodyPartTeeth                 2.020e+02  1.803e+02   1.121   0.2626    
## AverageWeeklyWage            -2.601e-04  3.457e-04  -0.752   0.4520    
## ClaimantAge_at_DOI           -3.243e+00  1.135e+00  -2.858   0.0043 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 696.4 on 2466 degrees of freedom
##   (7458 observations deleted due to missingness)
## Multiple R-squared:  0.08293,    Adjusted R-squared:  0.07772 
## F-statistic: 15.93 on 14 and 2466 DF,  p-value: < 2.2e-16
regresion <- lm(TP ~ Total_Incurred_Cost+ AverageWeeklyWage+ClaimantAge_at_DOI+ BodyPart, data=bdregresion)

summary(regresion)
## 
## Call:
## lm(formula = TP ~ Total_Incurred_Cost + AverageWeeklyWage + ClaimantAge_at_DOI + 
##     BodyPart, data = bdregresion)
## 
## Residuals:
##     Min      1Q  Median      3Q     Max 
## -1521.9  -374.8  -253.3    20.7  3495.5 
## 
## Coefficients:
##                                Estimate Std. Error t value Pr(>|t|)    
## (Intercept)                   4.311e+02  1.715e+02   2.514   0.0120 *  
## Total_Incurred_Cost           6.639e-03  5.735e-04  11.577   <2e-16 ***
## AverageWeeklyWage            -2.592e-04  3.456e-04  -0.750   0.4534    
## ClaimantAge_at_DOI           -3.229e+00  1.133e+00  -2.850   0.0044 ** 
## BodyPartEar(S)                1.112e+02  1.768e+02   0.629   0.5295    
## BodyPartEyes                  1.606e+02  1.666e+02   0.964   0.3351    
## BodyPartFacial Bones          2.905e+02  1.730e+02   1.679   0.0932 .  
## BodyPartMouth                 3.280e+02  1.767e+02   1.856   0.0635 .  
## BodyPartMultiple Head Injury  2.154e+02  1.667e+02   1.292   0.1964    
## BodyPartNose                  1.861e+02  1.765e+02   1.055   0.2917    
## BodyPartSkull                -9.134e+01  1.740e+02  -0.525   0.5996    
## BodyPartSoft Tissue-Head     -1.260e+02  1.714e+02  -0.735   0.4623    
## BodyPartTeeth                 2.008e+02  1.800e+02   1.115   0.2649    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 696.2 on 2468 degrees of freedom
##   (7458 observations deleted due to missingness)
## Multiple R-squared:  0.08274,    Adjusted R-squared:  0.07828 
## F-statistic: 18.55 on 12 and 2468 DF,  p-value: < 2.2e-16

Modelo Predictivo

datos <- data.frame(Total_Incurred_Cost= 148.37, BodyPart= "Nose", AverageWeeklyWage=0.10, ClaimantAge_at_DOI=32)
predict(regresion, datos)
##        1 
## 514.9416

Shiny

Link

LS0tCnRpdGxlOiAiQWN0aXZpZGFkIC0gTGVzaW9uZXMgZW4gbGEgQ2FiZXphIgphdXRob3I6ICJBcmFjZWx5IFF1ZXphZGEgQTAxMjM1OTMxIgpkYXRlOiAiMjAyMy0wOS0zMCIKb3V0cHV0OiAKICBodG1sX2RvY3VtZW50OgogICAgdG9jOiBUUlVFCiAgICB0b2NfZmxvYXQ6IFRydWUKICAgIGNvZGVfZG93bmxvYWQ6IFRydWUKICAgIHRoZW1lOiAic2ltcGxleCIKICAgIGhpZ2hsaWdodDogIm1vbm9jaHJvbWUiCi0tLQogIVtdKC9Vc2Vycy9hcmFxdWV6YWRhL0RvY3VtZW50cy9UZWMvN21vIFNlbWVzdHJlL0FuYWxpzIF0aWNhIHBhcmEgTmVnb2Npb3MvTW9kdWxvIDQvY2FiZXphLmpwZWcpCgoKCgoKCgoKVGhlIHByb2plY3QgY29tZXMgZnJvbSBhIE5vcnRoIENhcm9saW5hLCBVUyBjb21wYW55IHRoYXQgbWFuYWdlcyB3b3JrZXJz4oCZIGNvbXBlbnNhdGlvbiBjbGFpbXMgZm9yIG90aGVyIGNsaWVudHMgKG5hbWUgJiBsb2NhdGlvbiBwcm90ZWN0ZWQgZm9yIGNvbmZpZGVudGlhbGl0eSkuIFRoaXMgY29tcGFueSB3YW50cyB5b3UgdG8gYWR2aXNlIHRoZW0gb24gaG93IGRhdGEgYW5hbHl0aWNzIGNhbiBiZSB1c2VkIHRvIGlkZW50aWZ5IG1ham9yIGRyaXZlcnMgb2YgY29zdHMgb2YgY2xhaW1zIGFuZCB0aGUgdGltZSB0byBwcm9jZXNzIGNsYWltcy4gVGhlIGNvbXBhbnkgaXMgaW50ZXJlc3RlZCBpbiB1c2luZyBkYXRhIGFuYWx5dGljcyB0byBiZWNvbWUgZWZmaWNpZW50IGFuZCByZXNwb25zaXZlIHRvIGNsYWltYW50cy4gVGhlIGdpc3Qgb2Ygd29ya2Vyc+KAmSBjb21wZW5zYXRpb24gaXMgYXMgZm9sbG93czogV2hlbiBhIHdvcmtlciBvZiBhIHBhcnRpY2lwYXRpbmcgY29tcGFueSBpcyBpbmp1cmVkIGluIHBlcmZvcm1hbmNlIG9mIGhlci9oaXMgam9iLCBzaGUvaGUgY2FuIGZpbGUgYSBjbGFpbSBmb3IgdGhlIG1lZGljYWwgZXhwZW5zZXMgYW5kIGxvc3Mgb2Ygd2FnZXMgcmVsYXRlZCB0byB0aGUgaW5qdXJ5LiBXaGVuIGEgY2xhaW0gaXMgZmlsZWQgZm9yIHRoZSBmaXJzdCB0aW1lLCBhIHVuaXF1ZSBjbGFpbSBpZGVudGlmaWVyIGlzIGNyZWF0ZWQgYW5kIHRoZSBkZXRhaWxzIG9mIHRoZSBjbGFpbXMgYXJlIHJlY29yZGVkLiBUaGUgY2xhaW0gZGV0YWlscyBhcmUgdXBkYXRlZCBhcyBwYXltZW50cyBhcmUgbWFkZSB0byBzZXR0bGUgdGhlIGNsYWltLiBQYXltZW50cyBjYW4gYmUgbWFkZSBmb3IgdmFyaW91cyBhY3Rpdml0aWVzIHJlbGF0ZWQgdG8gYSBjbGFpbSwgc3VjaCBhcyBkb2N0b3IgdmlzaXQsIHBoYXJtYWN5LCBldGMuCgoKYGBge3J9CiNMbGFtYXIgTGlicmVyw61hcwpsaWJyYXJ5KGRwbHlyKQpsaWJyYXJ5KGdncGxvdDIpCmxpYnJhcnkoZmFjdG9leHRyYSkKbGlicmFyeShycGFydCkKbGlicmFyeShycGFydC5wbG90KQpsaWJyYXJ5KGx1YnJpZGF0ZSkKbGlicmFyeShjbHVzdGVyKQpgYGAKCiMjIDxzcGFuIHN0eWxlPSJjb2xvcjogb3JhbmdlOyI+TGltcGlhciBCYXNlIGRlIERhdG9zPC9zcGFuPgpgYGB7cn0KYmQxIDwtIHJlYWQuY3N2KCIvVXNlcnMvYXJhcXVlemFkYS9Eb2N1bWVudHMvVGVjLzdtbyBTZW1lc3RyZS9BbmFsacyBdGljYSBwYXJhIE5lZ29jaW9zL01vZHVsbyA0L0FjdGl2aWRhZCBBbmHMgWxpc2lzIC9DbGFpbXNEYXRhMjAxOCAoMSkuY3N2IikKYmQyIDwtIHJlYWQuY3N2KCIvVXNlcnMvYXJhcXVlemFkYS9Eb2N1bWVudHMvVGVjLzdtbyBTZW1lc3RyZS9BbmFsacyBdGljYSBwYXJhIE5lZ29jaW9zL01vZHVsbyA0L0FjdGl2aWRhZCBBbmHMgWxpc2lzIC9UcmFuc2FjdGlvbnNTdW1tYXJ5MjAxOC5jc3YiKQpgYGAKCiMjIyBKdW50YXIgQmFzZXMgZGUgRGF0b3MgeSBGaWx0cmFyCmBgYHtyfQpiZCA8LSBtZXJnZShiZDEsIGJkMiwgYnk9IkNsYWltSUQiICwgYWxsPVRSVUUpCgojRWxpbWluYXIgY29sdW1hcyBYCmJkbGltcGlhIDwtIGJkJT4lIHNlbGVjdCAoLSAoWDogWC4yMikpIAoKYmRjYWJlemEgPC0gZmlsdGVyKGJkbGltcGlhLCBCb2R5UGFydFJlZ2lvbiAlaW4lIGMoIkhlYWQiKSkKY291bnQoYmRjYWJlemEsIEJvZHlQYXJ0UmVnaW9uLCBzb3J0PVRSVUUpCnN1bW1hcnkoYmRjYWJlemEpCmdsaW1wc2UoYmRjYWJlemEpCmBgYAoKIyMjIyMgT2JzZXJ2YWNpb25lcwoxLiBUb3RhbCBQYWlkLCBJbmRlbWl0eSBQYWlkLCBPdGhlciBQYWlkLCBCaWxsUmV2aWV3QUxFLCBQaHlzaWNpYW5PdXRQYXRpZW50LCBIb3NwaXRhbCwgQ2xhaW1hbnRBZ2VfYXRfRE9JIHRpZW5lbiBuw7ptZXJvcyBuZWdhdGl2b3MuIAoyLiBIYXkgbXVjaG9zIE5BJ3MuIAozLiBMYXMgdmFyaWFibGVzIGRlIGZlY2hhIGVzdMOhbiBlbiBjYXLDoWN0ZXIgCgoKIyMjIENhbWJpYXIgYSBGZWNoYXMKYGBge3J9CmJkY2FiZXphJENsYWltYW50T3BlbmVkRGF0ZSA8LSBhcy5EYXRlKGJkY2FiZXphJENsYWltYW50T3BlbmVkRGF0ZSwgZm9ybWF0ID0iJWQvJW0vJXkiKQpiZGNhYmV6YSRDbGFpbWFudENsb3NlZERhdGUgPC0gYXMuRGF0ZShiZGNhYmV6YSRDbGFpbWFudENsb3NlZERhdGUsIGZvcm1hdCA9IiVkLyVtLyV5IikKYmRjYWJlemEkSW5jaWRlbnREYXRlIDwtIGFzLkRhdGUoYmRjYWJlemEkSW5jaWRlbnREYXRlLCBmb3JtYXQgPSIlZC8lbS8leSIpCmJkY2FiZXphJEVtcGxveWVyTm90aWZpY2F0aW9uRGF0ZSA8LSBhcy5EYXRlKGJkY2FiZXphJEVtcGxveWVyTm90aWZpY2F0aW9uRGF0ZSwgZm9ybWF0ID0iJWQvJW0vJXkiKQpiZGNhYmV6YSRSZWNlaXZlZERhdGUgPC0gYXMuRGF0ZShiZGNhYmV6YSRSZWNlaXZlZERhdGUsIGZvcm1hdCA9IiVkLyVtLyV5IikKc3VtbWFyeShiZGNhYmV6YSkKYGBgCgojIyMgQ2FtYmlhciBhIE51bcOpcmljbwpgYGB7cn0KYmRjYWJlemEkVG90YWxQYWlkIDwtIGFzLm51bWVyaWMoYmRjYWJlemEkVG90YWxQYWlkKQpiZGNhYmV6YSRUb3RhbFJlc2VydmVzIDwtIGFzLm51bWVyaWMoYmRjYWJlemEkVG90YWxSZXNlcnZlcykKYmRjYWJlemEkVG90YWxSZWNvdmVyeSA8LSBhcy5udW1lcmljKGJkY2FiZXphJFRvdGFsUmVjb3ZlcnkpCmJkY2FiZXphJEF2ZXJhZ2VXZWVrbHlXYWdlIDwtIGFzLm51bWVyaWMoYmRjYWJlemEkQXZlcmFnZVdlZWtseVdhZ2UpCmJkY2FiZXphJENsYWltYW50QWdlX2F0X0RPSSA8LSBhcy5udW1lcmljKGJkY2FiZXphJENsYWltYW50QWdlX2F0X0RPSSkKZ2xpbXBzZShiZGNhYmV6YSkKYGBgCgpgYGB7cn0KaXMubnVtZXJpYyhiZGNhYmV6YSRBdmVyYWdlV2Vla2x5V2FnZSkKYGBgCgojIyMgQ29zdG8gVG90YWwgJiBUaWVtcG8gRGUgUHJvY2VzYW1pZW50byAKYGBge3J9CmJkY2FiZXphJFRvdGFsX0luY3VycmVkX0Nvc3QgPC0gYmRjYWJlemEkVG90YWxSZXNlcnZlcyArIGJkY2FiZXphJFRvdGFsUGFpZCAtIGJkY2FiZXphJFRvdGFsUmVjb3ZlcnkKYmRjYWJlemEkVFAgPC0gZGlmZnRpbWUoYmRjYWJlemEkQ2xhaW1hbnRDbG9zZWREYXRlLCBiZGNhYmV6YSRDbGFpbWFudE9wZW5lZERhdGUsIHVuaXRzID0iZGF5cyIpCmBgYApgYGB7cn0KYmRjYWJlemEkVFAgPC0gYXMubnVtZXJpYyhiZGNhYmV6YSRUUCkKc3VtbWFyeShiZGNhYmV6YSkKYGBgCgojIyA8c3BhbiBzdHlsZT0iY29sb3I6IG9yYW5nZTsiPsOBcmJvbCBkZSBEZWNpc2lvbmVzPC9zcGFuPgojIyMgTGltcGlhciBCYXNlIGRlIERhdG9zCmBgYHtyfQpiZGFyYm9sIDwtIGJkY2FiZXphCmJkYXJib2wkR2VuZGVyIDwtIGFzLmZhY3RvcihiZGFyYm9sJEdlbmRlcikKYGBgCgpgYGB7cn0KY291bnQoYmRhcmJvbCwgR2VuZGVyLCBzb3J0PVRSVUUpCmNvdW50KGJkYXJib2wsIENsYWltYW50QWdlX2F0X0RPSSwgc29ydD1UUlVFKQpjb3VudChiZGFyYm9sLCBBdmVyYWdlV2Vla2x5V2FnZSwgc29ydD1UUlVFKQpiZGFyYm9sPC0gbmEub21pdChiZGFyYm9sLCBjb2xzID0gYygiR2VuZGVyIiwgIkNsYWltYW50QWdlX2F0X0RPSSIsICJBdmVyYWdlV2Vla2x5V2FnZSIpKQpiZGFyYm9sIDwtIGJkYXJib2xbYmRhcmJvbCRDbGFpbWFudEFnZV9hdF9ET0kgPiAwLF0KY291bnQoYmRhcmJvbCwgR2VuZGVyLCBzb3J0PVRSVUUpCmNvdW50KGJkYXJib2wsIENsYWltYW50QWdlX2F0X0RPSSwgc29ydD1UUlVFKQpjb3VudChiZGFyYm9sLCBBdmVyYWdlV2Vla2x5V2FnZSwgc29ydD1UUlVFKQpzYXBwbHkoYmRhcmJvbCwgZnVuY3Rpb24oeCkgc3VtKGlzLm5hKHgpKSkKYGBgCgpgYGB7cn0KYm94cGxvdChiZGFyYm9sJFRvdGFsX0luY3VycmVkX0Nvc3QsIGhvcml6b250YWwgPSBUUlVFKQpib3hwbG90KGJkYXJib2wkVFAsIGhvcml6b250YWwgPSBUUlVFKQpib3hwbG90KGJkYXJib2wkQXZlcmFnZVdlZWtseVdhZ2UsIGhvcml6b250YWwgPSBUUlVFKQpgYGAKCmBgYHtyfQpiZGFyYm9sIDwtIGJkYXJib2xbYmRhcmJvbCRUb3RhbF9JbmN1cnJlZF9Db3N0IDwgMTMwMDAwLF0Kc3VtbWFyeShiZGFyYm9sJFRvdGFsX0luY3VycmVkX0Nvc3QpCgpiZGFyYm9sIDwtIGJkYXJib2xbYmRhcmJvbCRBdmVyYWdlV2Vla2x5V2FnZSA8IDEyMDAsXQpzdW1tYXJ5KGJkYXJib2wkQXZlcmFnZVdlZWtseVdhZ2UpCgpiZGFyYm9sIDwtIGJkYXJib2xbYmRhcmJvbCRUUCA8IDI3MDAsXQpzdW1tYXJ5KGJkYXJib2wkVFApCmBgYAoKCiMjIyBIYWNlciDDgXJib2wgZGUgRGVjaXNpb25lcwojIyMjIENvc3RvIFRvdGFsCmBgYHtyLCBmaWcud2lkdGg9MTQsIGZpZy5oZWlnaHQ9NX0KYXJib2w8LSBycGFydChmb3JtdWxhID0gVG90YWxfSW5jdXJyZWRfQ29zdCB+IENsYWltYW50QWdlX2F0X0RPSSsgR2VuZGVyLCBkYXRhPWJkYXJib2wpCmFyYm9sCnJwYXJ0LnBsb3QoYXJib2wpCnBycChhcmJvbCkKYGBgCgojIyMjIFRpZW1wbyBEZSBQcm9jZXNhbWllbnRvCmBgYHtyLCBmaWcud2lkdGg9MTQsIGZpZy5oZWlnaHQ9NX0KYXJib2w8LSBycGFydChmb3JtdWxhID0gVFAgfiBBdmVyYWdlV2Vla2x5V2FnZSArIENsYWltYW50QWdlX2F0X0RPSSwgZGF0YT1iZGFyYm9sKQphcmJvbApycGFydC5wbG90KGFyYm9sKQpwcnAoYXJib2wpCmBgYAoKIyMgPHNwYW4gc3R5bGU9ImNvbG9yOiBvcmFuZ2U7Ij5SZWdyZXNpw7NuIExpbmVhbDwvc3Bhbj4KIyMjIExpbXBpYXIgQmFzZSBkZSBEYXRvcwpgYGB7cn0Kc3VtKGlzLm5hKGJkY2FiZXphJFRvdGFsX0luY3VycmVkX0Nvc3QpKQpzdW0oaXMubmEoYmRjYWJlemEkVFApKQpgYGAKYGBge3J9CmJkcmVncmVzaW9uIDwtYmRjYWJlemEKYGBgCmBgYHtyfQpiZHJlZ3Jlc2lvbiA8LSBiZHJlZ3Jlc2lvbltiZHJlZ3Jlc2lvbiRUb3RhbF9JbmN1cnJlZF9Db3N0ID4gMCxdCmBgYAoKIyMjIEVsaW1pbmFyIG91dGxpZXJzCmBgYHtyfQpib3hwbG90KGJkcmVncmVzaW9uJFRQLCBob3Jpem9udGFsID0gVFJVRSkKYm94cGxvdChiZHJlZ3Jlc2lvbiRUb3RhbF9JbmN1cnJlZF9Db3N0LCBob3Jpem9udGFsID0gVFJVRSkKYmRyZWdyZXNpb24gPC0gYmRyZWdyZXNpb25bYmRyZWdyZXNpb24kVFAgPCA0MDAwLF0KYmRyZWdyZXNpb24gPC0gYmRyZWdyZXNpb25bYmRyZWdyZXNpb24kVG90YWxfSW5jdXJyZWRfQ29zdCA8IDUwMDAwMCxdCnN1bW1hcnkoYmRyZWdyZXNpb24kVG90YWxfSW5jdXJyZWRfQ29zdCkKYGBgCmBgYHtyfQpjb3VudChiZHJlZ3Jlc2lvbiwgR2VuZGVyLCBzb3J0PVRSVUUpCmJkcmVncmVzaW9uJEdlbmRlciA8LSBhcy5mYWN0b3IoYmRyZWdyZXNpb24kR2VuZGVyKQpgYGAKCiMjIyBSZWdyZXNpw7NuIExpbmVhbCBDb3N0byBUb3RhbApgYGB7cn0KcmVncmVzaW9uIDwtIGxtKFRvdGFsX0luY3VycmVkX0Nvc3QgflRQICsgR2VuZGVyICsgQm9keVBhcnQrIEF2ZXJhZ2VXZWVrbHlXYWdlICsgQ2xhaW1hbnRBZ2VfYXRfRE9JLCBkYXRhPWJkcmVncmVzaW9uKQoKc3VtbWFyeShyZWdyZXNpb24pCmBgYAoKIyMjIE1vZGVsbyBQcmVkaWN0aXZvIApgYGB7cn0KZGF0b3MgPC0gZGF0YS5mcmFtZShUUD0gMTAzLCBHZW5kZXI9IkZlbWFsZSIsIEJvZHlQYXJ0PSAiTm9zZSIsQ2xhaW1hbnRBZ2VfYXRfRE9JPTM0LCBBdmVyYWdlV2Vla2x5V2FnZT0wLjEwKQpgYGAKYGBge3J9CnByZWRpY3QocmVncmVzaW9uLCBkYXRvcykKYGBgCgojIyMgUmVncmVzacOzbiBMaW5lYWwgVGllbXBvIGRlIFByb2Nlc2FtaWVudG8KYGBge3J9CnJlZ3Jlc2lvbiA8LSBsbShUUCB+VG90YWxfSW5jdXJyZWRfQ29zdCsgR2VuZGVyICsgQm9keVBhcnQgKyBBdmVyYWdlV2Vla2x5V2FnZSsgQ2xhaW1hbnRBZ2VfYXRfRE9JLCBkYXRhPWJkcmVncmVzaW9uKQoKc3VtbWFyeShyZWdyZXNpb24pCmBgYAoKYGBge3J9CnJlZ3Jlc2lvbiA8LSBsbShUUCB+IFRvdGFsX0luY3VycmVkX0Nvc3QrIEF2ZXJhZ2VXZWVrbHlXYWdlK0NsYWltYW50QWdlX2F0X0RPSSsgQm9keVBhcnQsIGRhdGE9YmRyZWdyZXNpb24pCgpzdW1tYXJ5KHJlZ3Jlc2lvbikKYGBgCgojIyMgTW9kZWxvIFByZWRpY3Rpdm8KYGBge3J9CmRhdG9zIDwtIGRhdGEuZnJhbWUoVG90YWxfSW5jdXJyZWRfQ29zdD0gMTQ4LjM3LCBCb2R5UGFydD0gIk5vc2UiLCBBdmVyYWdlV2Vla2x5V2FnZT0wLjEwLCBDbGFpbWFudEFnZV9hdF9ET0k9MzIpCmBgYApgYGB7cn0KcHJlZGljdChyZWdyZXNpb24sIGRhdG9zKQpgYGAKCgojIyA8c3BhbiBzdHlsZT0iY29sb3I6IG9yYW5nZTsiPlNoaW55PC9zcGFuPgoKW0xpbmtdKGh0dHBzOi8vYXJhcXVlemFkYWEuc2hpbnlhcHBzLmlvL0FjdGl2aWRhZFF1ZWphcy8pCgoK