Set Working Directory and Packages

setwd("C:/Work Files/RDA/Consults/Ewa Golebiowska")

library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr     1.1.4     ✔ readr     2.1.5
## ✔ forcats   1.0.0     ✔ stringr   1.5.1
## ✔ ggplot2   3.5.1     ✔ tibble    3.2.1
## ✔ lubridate 1.9.3     ✔ tidyr     1.3.1
## ✔ purrr     1.0.2     
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag()    masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(haven)
library(cjoint)
## Loading required package: sandwich
## Loading required package: lmtest
## Loading required package: zoo
## 
## Attaching package: 'zoo'
## 
## The following objects are masked from 'package:base':
## 
##     as.Date, as.Date.numeric
## 
## Loading required package: survey
## Loading required package: grid
## Loading required package: Matrix
## 
## Attaching package: 'Matrix'
## 
## The following objects are masked from 'package:tidyr':
## 
##     expand, pack, unpack
## 
## Loading required package: survival
## 
## Attaching package: 'survey'
## 
## The following object is masked from 'package:graphics':
## 
##     dotchart
## 
## cjoint: AMCE Estimator for Conjoint Experiments
## Version: 2.1.1
## Authors: Soubhik Barari, Elissa Berwick, Jens Hainmueller, Daniel Hopkins, Sean Liu, Anton Strezhnev, Teppei Yamamoto
## 
## 
## Attaching package: 'cjoint'
## 
## The following object is masked from 'package:tibble':
## 
##     view
TESS_Data_Final_New_Vote <-read.csv("TESS_Data_Final_New_Voting.Choice.csv")

TESS_Data_Final_New_Vote$Religion_Att <-factor(TESS_Data_Final_New_Vote$Religion_Att,
                                                  levels = c(1,2,3,4,5),
                                                  labels = c("Atheist", "Is not sure there is a God", "Does not currently identify with a religion", "Attends religious services weekly", "Christian"))

table(TESS_Data_Final_New_Vote$Religion_Att)
## 
##                                     Atheist 
##                                        3839 
##                  Is not sure there is a God 
##                                        4149 
## Does not currently identify with a religion 
##                                        4091 
##           Attends religious services weekly 
##                                        4201 
##                                   Christian 
##                                        4104
TESS_Data_Final_New_Vote$Gender_Att <-factor(TESS_Data_Final_New_Vote$Gender_Att,
                                                  levels = c(1,2),
                                                  labels = c("Female", "Male"))
table(TESS_Data_Final_New_Vote$Gender_Att)
## 
## Female   Male 
##  10421   9963
TESS_Data_Final_New_Vote$Race_Att <-factor(TESS_Data_Final_New_Vote$Race_Att,
                                                  levels = c(1,2,3,4),
                                                  labels = c("White", "Black","Hispanic","Asian"))
table(TESS_Data_Final_New_Vote$Race_Att)
## 
##    White    Black Hispanic    Asian 
##     4997     5204     5309     4874
TESS_Data_Final_New_Vote$Education_Att <-factor(TESS_Data_Final_New_Vote$Education_Att,
                                                  levels = c(1,2,3,4),
                                                  labels = c("High School", "Some College","College Grad","Grad Degree"))
table(TESS_Data_Final_New_Vote$Education_Att)
## 
##  High School Some College College Grad  Grad Degree 
##         4898         5173         5124         5189
TESS_Data_Final_New_Vote$Age_Att <-factor(TESS_Data_Final_New_Vote$Age_Att,
                                                  levels = c(1,2,3,4),
                                                  labels = c("35", "47","59","71"))
table(TESS_Data_Final_New_Vote$Age_Att)
## 
##   35   47   59   71 
## 5122 5095 5427 4740
TESS_Data_Final_New_Vote$Experience_Att <-factor(TESS_Data_Final_New_Vote$Experience_Att,
                                                  levels = c(1,2,3,4),
                                                  labels = c("No Experience", "4 years","8 years","12 years"))
table(TESS_Data_Final_New_Vote$Experience_Att)
## 
## No Experience       4 years       8 years      12 years 
##          5156          5220          5003          5005
TESS_Data_Final_New_Vote$Party_Att <-factor(TESS_Data_Final_New_Vote$Party_Att,
                                                  levels = c(1,2),
                                                  labels = c("Democrat", "Republican"))
table(TESS_Data_Final_New_Vote$Party_Att)
## 
##   Democrat Republican 
##      10472       9912
TESS_Data_Final_New_Vote$Policy_Att <-factor(TESS_Data_Final_New_Vote$Policy_Att,
                                                  levels = c(1,2,3,4,5),
                                                  labels = c("Foreign", "Economic","Health Care","Education","Environmental"))


table(TESS_Data_Final_New_Vote$Policy_Att)
## 
##       Foreign      Economic   Health Care     Education Environmental 
##          3817          3976          4298          4187          4106
TESS_Data_Final_New_Vote$Partisan_Comp <-factor(TESS_Data_Final_New_Vote$Partisan_Comp,
                                                  levels = c(1,2,3),
                                                  labels = c("Democratic Primary", "Republican Primary","General Election"))


table(TESS_Data_Final_New_Vote$Partisan_Comp)
## 
## Democratic Primary Republican Primary   General Election 
##               5668               5108               9608
TESS_Data_Final_New_Vote$Office <-factor(TESS_Data_Final_New_Vote$Office,
                                                  levels = c(1,2),
                                                  labels = c("Mayor", "President"))
table(TESS_Data_Final_New_Vote$Office)
## 
##     Mayor President 
##     10192     10192

This block of code runs a test analysis to ensure the labels attach to the output. The first command in this block is the code to change the reference category for the religion attribute to Christian from the default of Atheist. The output for the sample analysis is provided following the code where you can see the columns for the coefficient table are labeled (e.g., for age the columns are: AgeAtt47, AgeAtt59, AgeAtt71)

###Change Reference Category for Religion as an example

TESS_Data_Final_New_Vote$Religion_Att <- relevel(TESS_Data_Final_New_Vote$Religion_Att, ref = "Christian")

###If this does not work try setting ref= 5 

test.results <- amce(Voting.Choice ~  Religion.Att + Gender.Att + Race.Att + 
                Education.Att + Age.Att + Experience.Att + Party.Att + 
                Policy.Att + Office + Partisan_Comp, data=TESS_Data_Final_New_Vote, 
                cluster=TRUE, weights = "WEIGHT", respondent.id="CaseId", 
                design = "uniform")

print(test.results)
## $estimates
## $estimates$AgeAtt
##              AgeAtt47     AgeAtt59    AgeAtt71
## AMCE       0.02042064 -0.008989418 -0.09034888
## Std. Error 0.01291736  0.014589062  0.01562561
## 
## $estimates$EducationAtt
##            EducationAttSomeCollege EducationAttCollegeGrad
## AMCE                    0.05959066              0.11845530
## Std. Error              0.01372163              0.01454218
##            EducationAttGradDegree
## AMCE                   0.12899887
## Std. Error             0.01411216
## 
## $estimates$ExperienceAtt
##            ExperienceAtt4years ExperienceAtt8years ExperienceAtt12years
## AMCE                0.11916137          0.16266337           0.18881660
## Std. Error          0.01392106          0.01371598           0.01353043
## 
## $estimates$GenderAtt
##            GenderAttMale
## AMCE        -0.019434487
## Std. Error   0.009296801
## 
## $estimates$Office
##            OfficePresident
## AMCE          -8.48978e-05
## Std. Error     2.26414e-03
## 
## $estimates$PartisanComp
##            PartisanCompRepublicanPrimary PartisanCompGeneralElection
## AMCE                          0.04088783                  0.02512526
## Std. Error                    0.02691494                  0.01349811
## 
## $estimates$PartyAtt
##            PartyAttRepublican
## AMCE              -0.03644713
## Std. Error         0.02705103
## 
## $estimates$PolicyAtt
##            PolicyAttEconomic PolicyAttHealthCare PolicyAttEducation
## AMCE              0.09839265          0.06250930         0.05956117
## Std. Error        0.01543932          0.01609959         0.01490509
##            PolicyAttEnvironmental
## AMCE                   0.03319679
## Std. Error             0.01479368
## 
## $estimates$RaceAtt
##            RaceAttBlack RaceAttHispanic RaceAttAsian
## AMCE         0.03753812      0.01483254  -0.02393762
## Std. Error   0.01470279      0.01499569   0.01425158
## 
## $estimates$ReligionAtt
##            ReligionAttAtheist ReligionAttIsnotsurethereisaGod
## AMCE              -0.14814458                     -0.08605575
## Std. Error         0.01760436                      0.01603739
##            ReligionAttDoesnotcurrentlyidentifywithareligion
## AMCE                                            -0.03361005
## Std. Error                                       0.01623497
##            ReligionAttAttendsreligiousservicesweekly
## AMCE                                     0.007042568
## Std. Error                               0.014277797
## 
## 
## $attributes
## $attributes$AgeAtt
## [1] "35" "47" "59" "71"
## 
## $attributes$EducationAtt
## [1] "HighSchool"  "SomeCollege" "CollegeGrad" "GradDegree" 
## 
## $attributes$ExperienceAtt
## [1] "NoExperience" "4years"       "8years"       "12years"     
## 
## $attributes$GenderAtt
## [1] "Female" "Male"  
## 
## $attributes$Office
## [1] "Mayor"     "President"
## 
## $attributes$PartisanComp
## [1] "DemocraticPrimary" "RepublicanPrimary" "GeneralElection"  
## 
## $attributes$PartyAtt
## [1] "Democrat"   "Republican"
## 
## $attributes$PolicyAtt
## [1] "Foreign"       "Economic"      "HealthCare"    "Education"    
## [5] "Environmental"
## 
## $attributes$RaceAtt
## [1] "White"    "Black"    "Hispanic" "Asian"   
## 
## $attributes$ReligionAtt
## [1] "Christian"                            
## [2] "Atheist"                              
## [3] "IsnotsurethereisaGod"                 
## [4] "Doesnotcurrentlyidentifywithareligion"
## [5] "Attendsreligiousservicesweekly"       
## 
## 
## $vcov.prof
##                                                    (Intercept)      AgeAtt47
## (Intercept)                                       5.780469e-04 -4.565141e-05
## AgeAtt47                                         -4.565141e-05  1.668582e-04
## AgeAtt59                                         -5.343588e-05  1.010852e-04
## AgeAtt71                                         -4.129246e-05  1.010108e-04
## EducationAttSomeCollege                          -1.057588e-04 -3.069327e-05
## EducationAttCollegeGrad                          -1.348500e-04 -2.311133e-05
## EducationAttGradDegree                           -1.575333e-04 -3.014498e-05
## ExperienceAtt4years                              -8.546372e-05 -1.123148e-05
## ExperienceAtt8years                              -1.108885e-04 -4.278626e-06
## ExperienceAtt12years                             -1.139440e-04  3.903415e-06
## GenderAttMale                                    -6.089017e-05  3.700269e-06
## OfficePresident                                  -7.168186e-06  7.310228e-07
## PartisanCompRepublicanPrimary                    -3.507314e-05  2.542855e-06
## PartisanCompGeneralElection                      -2.750332e-05 -3.894740e-06
## PartyAttRepublican                                1.458783e-05 -8.979621e-06
## PolicyAttEconomic                                -1.105444e-04  3.765618e-06
## PolicyAttHealthCare                              -1.480366e-04 -2.852174e-05
## PolicyAttEducation                               -8.995169e-05 -6.697060e-06
## PolicyAttEnvironmental                           -1.261572e-04 -2.430957e-05
## RaceAttBlack                                     -1.314327e-04 -8.352531e-06
## RaceAttHispanic                                  -1.595694e-04 -2.718995e-05
## RaceAttAsian                                     -1.072773e-04 -2.149976e-05
## ReligionAttAtheist                               -1.733793e-04  1.010977e-05
## ReligionAttIsnotsurethereisaGod                  -1.816539e-04  1.472669e-06
## ReligionAttDoesnotcurrentlyidentifywithareligion -1.467097e-04  1.315555e-05
## ReligionAttAttendsreligiousservicesweekly        -9.687629e-05 -4.851192e-07
##                                                       AgeAtt59      AgeAtt71
## (Intercept)                                      -5.343588e-05 -4.129246e-05
## AgeAtt47                                          1.010852e-04  1.010108e-04
## AgeAtt59                                          2.128407e-04  1.327739e-04
## AgeAtt71                                          1.327739e-04  2.441598e-04
## EducationAttSomeCollege                          -2.627218e-05  8.169395e-07
## EducationAttCollegeGrad                          -4.773785e-05 -9.008976e-06
## EducationAttGradDegree                           -4.101812e-05 -1.181533e-05
## ExperienceAtt4years                              -4.144148e-05 -3.814145e-05
## ExperienceAtt8years                              -1.424778e-05 -2.378219e-05
## ExperienceAtt12years                             -1.821762e-07 -5.897306e-06
## GenderAttMale                                     2.384124e-05  4.686418e-06
## OfficePresident                                   4.151934e-08  3.539784e-06
## PartisanCompRepublicanPrimary                    -4.205925e-06  2.449077e-05
## PartisanCompGeneralElection                      -7.138692e-06  4.398699e-06
## PartyAttRepublican                               -4.031739e-06 -2.204637e-05
## PolicyAttEconomic                                 5.660830e-06  1.250518e-05
## PolicyAttHealthCare                              -1.198161e-05 -9.419418e-06
## PolicyAttEducation                                1.249748e-05  6.383270e-06
## PolicyAttEnvironmental                           -2.925767e-06 -1.995764e-05
## RaceAttBlack                                     -1.760999e-06 -2.437128e-05
## RaceAttHispanic                                  -3.031537e-05 -4.111137e-05
## RaceAttAsian                                     -1.738910e-05 -4.430448e-05
## ReligionAttAtheist                               -2.918792e-05 -4.859791e-05
## ReligionAttIsnotsurethereisaGod                  -2.493771e-05 -2.175180e-05
## ReligionAttDoesnotcurrentlyidentifywithareligion -1.793798e-06 -4.702723e-05
## ReligionAttAttendsreligiousservicesweekly        -3.639466e-06 -1.983955e-05
##                                                  EducationAttSomeCollege
## (Intercept)                                                -1.057588e-04
## AgeAtt47                                                   -3.069327e-05
## AgeAtt59                                                   -2.627218e-05
## AgeAtt71                                                    8.169395e-07
## EducationAttSomeCollege                                     1.882832e-04
## EducationAttCollegeGrad                                     1.059589e-04
## EducationAttGradDegree                                      1.123375e-04
## ExperienceAtt4years                                        -4.413049e-06
## ExperienceAtt8years                                        -7.303023e-06
## ExperienceAtt12years                                       -1.185473e-06
## GenderAttMale                                               8.216712e-06
## OfficePresident                                            -4.020237e-07
## PartisanCompRepublicanPrimary                              -1.122249e-05
## PartisanCompGeneralElection                                -3.316229e-06
## PartyAttRepublican                                          1.213004e-05
## PolicyAttEconomic                                           5.063327e-06
## PolicyAttHealthCare                                         2.455728e-05
## PolicyAttEducation                                          4.200536e-07
## PolicyAttEnvironmental                                     -5.770522e-06
## RaceAttBlack                                                1.071985e-05
## RaceAttHispanic                                             1.803939e-05
## RaceAttAsian                                                1.654904e-05
## ReligionAttAtheist                                         -1.367437e-05
## ReligionAttIsnotsurethereisaGod                             3.456214e-05
## ReligionAttDoesnotcurrentlyidentifywithareligion           -2.100282e-05
## ReligionAttAttendsreligiousservicesweekly                  -2.997595e-06
##                                                  EducationAttCollegeGrad
## (Intercept)                                                -1.348500e-04
## AgeAtt47                                                   -2.311133e-05
## AgeAtt59                                                   -4.773785e-05
## AgeAtt71                                                   -9.008976e-06
## EducationAttSomeCollege                                     1.059589e-04
## EducationAttCollegeGrad                                     2.114749e-04
## EducationAttGradDegree                                      1.313306e-04
## ExperienceAtt4years                                         1.125407e-05
## ExperienceAtt8years                                        -6.461220e-06
## ExperienceAtt12years                                        1.520648e-05
## GenderAttMale                                              -7.782154e-06
## OfficePresident                                             2.215154e-06
## PartisanCompRepublicanPrimary                               3.201965e-05
## PartisanCompGeneralElection                                 1.700512e-05
## PartyAttRepublican                                         -2.921909e-05
## PolicyAttEconomic                                           3.578457e-05
## PolicyAttHealthCare                                         3.135824e-05
## PolicyAttEducation                                          1.692041e-05
## PolicyAttEnvironmental                                      1.787044e-05
## RaceAttBlack                                               -3.285456e-06
## RaceAttHispanic                                             2.697858e-05
## RaceAttAsian                                                3.029703e-05
## ReligionAttAtheist                                          5.203268e-06
## ReligionAttIsnotsurethereisaGod                             3.988114e-05
## ReligionAttDoesnotcurrentlyidentifywithareligion            2.305028e-06
## ReligionAttAttendsreligiousservicesweekly                  -2.310419e-05
##                                                  EducationAttGradDegree
## (Intercept)                                               -1.575333e-04
## AgeAtt47                                                  -3.014498e-05
## AgeAtt59                                                  -4.101812e-05
## AgeAtt71                                                  -1.181533e-05
## EducationAttSomeCollege                                    1.123375e-04
## EducationAttCollegeGrad                                    1.313306e-04
## EducationAttGradDegree                                     1.991529e-04
## ExperienceAtt4years                                        1.718222e-05
## ExperienceAtt8years                                        1.266060e-05
## ExperienceAtt12years                                       1.028749e-05
## GenderAttMale                                              3.120833e-06
## OfficePresident                                            6.583706e-07
## PartisanCompRepublicanPrimary                              6.876010e-08
## PartisanCompGeneralElection                                3.199721e-06
## PartyAttRepublican                                         5.981929e-06
## PolicyAttEconomic                                          1.559125e-05
## PolicyAttHealthCare                                        2.728812e-05
## PolicyAttEducation                                         2.449998e-06
## PolicyAttEnvironmental                                     1.987041e-05
## RaceAttBlack                                               1.971598e-05
## RaceAttHispanic                                            4.037035e-05
## RaceAttAsian                                               1.771154e-05
## ReligionAttAtheist                                         2.409906e-05
## ReligionAttIsnotsurethereisaGod                            4.975613e-05
## ReligionAttDoesnotcurrentlyidentifywithareligion           1.728540e-05
## ReligionAttAttendsreligiousservicesweekly                  5.414443e-06
##                                                  ExperienceAtt4years
## (Intercept)                                            -8.546372e-05
## AgeAtt47                                               -1.123148e-05
## AgeAtt59                                               -4.144148e-05
## AgeAtt71                                               -3.814145e-05
## EducationAttSomeCollege                                -4.413049e-06
## EducationAttCollegeGrad                                 1.125407e-05
## EducationAttGradDegree                                  1.718222e-05
## ExperienceAtt4years                                     1.937959e-04
## ExperienceAtt8years                                     1.033092e-04
## ExperienceAtt12years                                    9.036707e-05
## GenderAttMale                                          -1.237859e-05
## OfficePresident                                         3.062860e-06
## PartisanCompRepublicanPrimary                          -1.418869e-06
## PartisanCompGeneralElection                             2.801087e-06
## PartyAttRepublican                                      5.459454e-07
## PolicyAttEconomic                                       2.795636e-07
## PolicyAttHealthCare                                    -7.726564e-06
## PolicyAttEducation                                     -2.898732e-05
## PolicyAttEnvironmental                                 -5.255089e-07
## RaceAttBlack                                            1.822352e-05
## RaceAttHispanic                                         4.685160e-05
## RaceAttAsian                                            1.658835e-05
## ReligionAttAtheist                                      3.463745e-06
## ReligionAttIsnotsurethereisaGod                        -3.110940e-06
## ReligionAttDoesnotcurrentlyidentifywithareligion       -1.550041e-05
## ReligionAttAttendsreligiousservicesweekly              -1.089439e-06
##                                                  ExperienceAtt8years
## (Intercept)                                            -1.108885e-04
## AgeAtt47                                               -4.278626e-06
## AgeAtt59                                               -1.424778e-05
## AgeAtt71                                               -2.378219e-05
## EducationAttSomeCollege                                -7.303023e-06
## EducationAttCollegeGrad                                -6.461220e-06
## EducationAttGradDegree                                  1.266060e-05
## ExperienceAtt4years                                     1.033092e-04
## ExperienceAtt8years                                     1.881282e-04
## ExperienceAtt12years                                    1.021337e-04
## GenderAttMale                                          -1.580334e-05
## OfficePresident                                         1.591340e-06
## PartisanCompRepublicanPrimary                          -2.768849e-05
## PartisanCompGeneralElection                            -8.774572e-06
## PartyAttRepublican                                      4.308497e-05
## PolicyAttEconomic                                      -2.552596e-05
## PolicyAttHealthCare                                    -4.899848e-06
## PolicyAttEducation                                     -3.279646e-05
## PolicyAttEnvironmental                                  2.003588e-05
## RaceAttBlack                                            7.177262e-06
## RaceAttHispanic                                         3.410358e-05
## RaceAttAsian                                            1.475554e-06
## ReligionAttAtheist                                      3.917468e-05
## ReligionAttIsnotsurethereisaGod                         2.555277e-05
## ReligionAttDoesnotcurrentlyidentifywithareligion        2.667100e-05
## ReligionAttAttendsreligiousservicesweekly               7.100046e-06
##                                                  ExperienceAtt12years
## (Intercept)                                             -1.139440e-04
## AgeAtt47                                                 3.903415e-06
## AgeAtt59                                                -1.821762e-07
## AgeAtt71                                                -5.897306e-06
## EducationAttSomeCollege                                 -1.185473e-06
## EducationAttCollegeGrad                                  1.520648e-05
## EducationAttGradDegree                                   1.028749e-05
## ExperienceAtt4years                                      9.036707e-05
## ExperienceAtt8years                                      1.021337e-04
## ExperienceAtt12years                                     1.830725e-04
## GenderAttMale                                           -2.003122e-05
## OfficePresident                                          8.085376e-07
## PartisanCompRepublicanPrimary                            1.266829e-05
## PartisanCompGeneralElection                              9.389816e-06
## PartyAttRepublican                                      -1.075579e-05
## PolicyAttEconomic                                        1.332386e-05
## PolicyAttHealthCare                                     -1.443189e-06
## PolicyAttEducation                                      -2.377250e-05
## PolicyAttEnvironmental                                   1.066803e-05
## RaceAttBlack                                             1.606674e-05
## RaceAttHispanic                                          2.652226e-05
## RaceAttAsian                                             1.451001e-05
## ReligionAttAtheist                                       2.698098e-05
## ReligionAttIsnotsurethereisaGod                          8.244901e-06
## ReligionAttDoesnotcurrentlyidentifywithareligion         5.862774e-07
## ReligionAttAttendsreligiousservicesweekly                5.477741e-06
##                                                  GenderAttMale OfficePresident
## (Intercept)                                      -6.089017e-05   -7.168186e-06
## AgeAtt47                                          3.700269e-06    7.310228e-07
## AgeAtt59                                          2.384124e-05    4.151934e-08
## AgeAtt71                                          4.686418e-06    3.539784e-06
## EducationAttSomeCollege                           8.216712e-06   -4.020237e-07
## EducationAttCollegeGrad                          -7.782154e-06    2.215154e-06
## EducationAttGradDegree                            3.120833e-06    6.583706e-07
## ExperienceAtt4years                              -1.237859e-05    3.062860e-06
## ExperienceAtt8years                              -1.580334e-05    1.591340e-06
## ExperienceAtt12years                             -2.003122e-05    8.085376e-07
## GenderAttMale                                     8.643051e-05   -1.698278e-06
## OfficePresident                                  -1.698278e-06    5.126329e-06
## PartisanCompRepublicanPrimary                    -5.339481e-06   -4.232936e-07
## PartisanCompGeneralElection                      -7.162939e-07   -4.608939e-07
## PartyAttRepublican                                9.186552e-06    8.680137e-07
## PolicyAttEconomic                                 1.237757e-05    2.458560e-06
## PolicyAttHealthCare                               7.317235e-06    1.241535e-06
## PolicyAttEducation                                7.769175e-06    1.232379e-06
## PolicyAttEnvironmental                           -1.224567e-07   -1.172170e-06
## RaceAttBlack                                      2.115597e-05    2.868741e-06
## RaceAttHispanic                                   5.610792e-06    2.160913e-06
## RaceAttAsian                                      7.283958e-06    9.781670e-07
## ReligionAttAtheist                               -1.006125e-06    2.568601e-06
## ReligionAttIsnotsurethereisaGod                   2.660433e-06   -8.285771e-07
## ReligionAttDoesnotcurrentlyidentifywithareligion  7.336939e-06   -1.402563e-06
## ReligionAttAttendsreligiousservicesweekly         1.081383e-05    3.262495e-07
##                                                  PartisanCompRepublicanPrimary
## (Intercept)                                                      -3.507314e-05
## AgeAtt47                                                          2.542855e-06
## AgeAtt59                                                         -4.205925e-06
## AgeAtt71                                                          2.449077e-05
## EducationAttSomeCollege                                          -1.122249e-05
## EducationAttCollegeGrad                                           3.201965e-05
## EducationAttGradDegree                                            6.876010e-08
## ExperienceAtt4years                                              -1.418869e-06
## ExperienceAtt8years                                              -2.768849e-05
## ExperienceAtt12years                                              1.266829e-05
## GenderAttMale                                                    -5.339481e-06
## OfficePresident                                                  -4.232936e-07
## PartisanCompRepublicanPrimary                                     7.244138e-04
## PartisanCompGeneralElection                                       3.584689e-04
## PartyAttRepublican                                               -7.200304e-04
## PolicyAttEconomic                                                 3.967280e-05
## PolicyAttHealthCare                                               3.294529e-05
## PolicyAttEducation                                                2.801141e-05
## PolicyAttEnvironmental                                            3.770068e-05
## RaceAttBlack                                                     -1.480158e-05
## RaceAttHispanic                                                  -3.117512e-05
## RaceAttAsian                                                      1.053672e-05
## ReligionAttAtheist                                                3.935634e-05
## ReligionAttIsnotsurethereisaGod                                   4.081580e-05
## ReligionAttDoesnotcurrentlyidentifywithareligion                 -4.775767e-06
## ReligionAttAttendsreligiousservicesweekly                        -1.835400e-05
##                                                  PartisanCompGeneralElection
## (Intercept)                                                    -2.750332e-05
## AgeAtt47                                                       -3.894740e-06
## AgeAtt59                                                       -7.138692e-06
## AgeAtt71                                                        4.398699e-06
## EducationAttSomeCollege                                        -3.316229e-06
## EducationAttCollegeGrad                                         1.700512e-05
## EducationAttGradDegree                                          3.199721e-06
## ExperienceAtt4years                                             2.801087e-06
## ExperienceAtt8years                                            -8.774572e-06
## ExperienceAtt12years                                            9.389816e-06
## GenderAttMale                                                  -7.162939e-07
## OfficePresident                                                -4.608939e-07
## PartisanCompRepublicanPrimary                                   3.584689e-04
## PartisanCompGeneralElection                                     1.821990e-04
## PartyAttRepublican                                             -3.567343e-04
## PolicyAttEconomic                                               1.678156e-05
## PolicyAttHealthCare                                             1.822831e-05
## PolicyAttEducation                                              1.503099e-05
## PolicyAttEnvironmental                                          2.078009e-05
## RaceAttBlack                                                   -5.954715e-07
## RaceAttHispanic                                                -1.106682e-05
## RaceAttAsian                                                    7.883288e-06
## ReligionAttAtheist                                              2.285703e-05
## ReligionAttIsnotsurethereisaGod                                 2.699142e-05
## ReligionAttDoesnotcurrentlyidentifywithareligion                3.293223e-06
## ReligionAttAttendsreligiousservicesweekly                      -6.386345e-06
##                                                  PartyAttRepublican
## (Intercept)                                            1.458783e-05
## AgeAtt47                                              -8.979621e-06
## AgeAtt59                                              -4.031739e-06
## AgeAtt71                                              -2.204637e-05
## EducationAttSomeCollege                                1.213004e-05
## EducationAttCollegeGrad                               -2.921909e-05
## EducationAttGradDegree                                 5.981929e-06
## ExperienceAtt4years                                    5.459454e-07
## ExperienceAtt8years                                    4.308497e-05
## ExperienceAtt12years                                  -1.075579e-05
## GenderAttMale                                          9.186552e-06
## OfficePresident                                        8.680137e-07
## PartisanCompRepublicanPrimary                         -7.200304e-04
## PartisanCompGeneralElection                           -3.567343e-04
## PartyAttRepublican                                     7.317584e-04
## PolicyAttEconomic                                     -3.791798e-05
## PolicyAttHealthCare                                   -1.926374e-05
## PolicyAttEducation                                    -2.892581e-05
## PolicyAttEnvironmental                                -2.473377e-05
## RaceAttBlack                                           1.196717e-05
## RaceAttHispanic                                        2.933144e-05
## RaceAttAsian                                          -1.676021e-05
## ReligionAttAtheist                                    -3.162244e-05
## ReligionAttIsnotsurethereisaGod                       -2.962544e-05
## ReligionAttDoesnotcurrentlyidentifywithareligion       3.264530e-07
## ReligionAttAttendsreligiousservicesweekly              2.450191e-05
##                                                  PolicyAttEconomic
## (Intercept)                                          -1.105444e-04
## AgeAtt47                                              3.765618e-06
## AgeAtt59                                              5.660830e-06
## AgeAtt71                                              1.250518e-05
## EducationAttSomeCollege                               5.063327e-06
## EducationAttCollegeGrad                               3.578457e-05
## EducationAttGradDegree                                1.559125e-05
## ExperienceAtt4years                                   2.795636e-07
## ExperienceAtt8years                                  -2.552596e-05
## ExperienceAtt12years                                  1.332386e-05
## GenderAttMale                                         1.237757e-05
## OfficePresident                                       2.458560e-06
## PartisanCompRepublicanPrimary                         3.967280e-05
## PartisanCompGeneralElection                           1.678156e-05
## PartyAttRepublican                                   -3.791798e-05
## PolicyAttEconomic                                     2.383725e-04
## PolicyAttHealthCare                                   1.319439e-04
## PolicyAttEducation                                    1.327326e-04
## PolicyAttEnvironmental                                1.021560e-04
## RaceAttBlack                                         -2.706864e-05
## RaceAttHispanic                                      -2.126553e-05
## RaceAttAsian                                         -1.549454e-05
## ReligionAttAtheist                                   -2.610266e-05
## ReligionAttIsnotsurethereisaGod                      -1.201479e-05
## ReligionAttDoesnotcurrentlyidentifywithareligion     -9.699137e-06
## ReligionAttAttendsreligiousservicesweekly            -5.285600e-05
##                                                  PolicyAttHealthCare
## (Intercept)                                            -1.480366e-04
## AgeAtt47                                               -2.852174e-05
## AgeAtt59                                               -1.198161e-05
## AgeAtt71                                               -9.419418e-06
## EducationAttSomeCollege                                 2.455728e-05
## EducationAttCollegeGrad                                 3.135824e-05
## EducationAttGradDegree                                  2.728812e-05
## ExperienceAtt4years                                    -7.726564e-06
## ExperienceAtt8years                                    -4.899848e-06
## ExperienceAtt12years                                   -1.443189e-06
## GenderAttMale                                           7.317235e-06
## OfficePresident                                         1.241535e-06
## PartisanCompRepublicanPrimary                           3.294529e-05
## PartisanCompGeneralElection                             1.822831e-05
## PartyAttRepublican                                     -1.926374e-05
## PolicyAttEconomic                                       1.319439e-04
## PolicyAttHealthCare                                     2.591967e-04
## PolicyAttEducation                                      1.429104e-04
## PolicyAttEnvironmental                                  1.256149e-04
## RaceAttBlack                                           -3.351025e-07
## RaceAttHispanic                                        -1.390786e-05
## RaceAttAsian                                           -9.772560e-06
## ReligionAttAtheist                                      2.206119e-05
## ReligionAttIsnotsurethereisaGod                         9.465852e-06
## ReligionAttDoesnotcurrentlyidentifywithareligion        5.048468e-06
## ReligionAttAttendsreligiousservicesweekly              -2.418464e-05
##                                                  PolicyAttEducation
## (Intercept)                                           -8.995169e-05
## AgeAtt47                                              -6.697060e-06
## AgeAtt59                                               1.249748e-05
## AgeAtt71                                               6.383270e-06
## EducationAttSomeCollege                                4.200536e-07
## EducationAttCollegeGrad                                1.692041e-05
## EducationAttGradDegree                                 2.449998e-06
## ExperienceAtt4years                                   -2.898732e-05
## ExperienceAtt8years                                   -3.279646e-05
## ExperienceAtt12years                                  -2.377250e-05
## GenderAttMale                                          7.769175e-06
## OfficePresident                                        1.232379e-06
## PartisanCompRepublicanPrimary                          2.801141e-05
## PartisanCompGeneralElection                            1.503099e-05
## PartyAttRepublican                                    -2.892581e-05
## PolicyAttEconomic                                      1.327326e-04
## PolicyAttHealthCare                                    1.429104e-04
## PolicyAttEducation                                     2.221617e-04
## PolicyAttEnvironmental                                 1.061631e-04
## RaceAttBlack                                          -1.352769e-05
## RaceAttHispanic                                       -3.094956e-05
## RaceAttAsian                                          -2.202959e-05
## ReligionAttAtheist                                    -7.367105e-06
## ReligionAttIsnotsurethereisaGod                       -3.357194e-06
## ReligionAttDoesnotcurrentlyidentifywithareligion       2.994433e-08
## ReligionAttAttendsreligiousservicesweekly             -3.414571e-05
##                                                  PolicyAttEnvironmental
## (Intercept)                                               -1.261572e-04
## AgeAtt47                                                  -2.430957e-05
## AgeAtt59                                                  -2.925767e-06
## AgeAtt71                                                  -1.995764e-05
## EducationAttSomeCollege                                   -5.770522e-06
## EducationAttCollegeGrad                                    1.787044e-05
## EducationAttGradDegree                                     1.987041e-05
## ExperienceAtt4years                                       -5.255089e-07
## ExperienceAtt8years                                        2.003588e-05
## ExperienceAtt12years                                       1.066803e-05
## GenderAttMale                                             -1.224567e-07
## OfficePresident                                           -1.172170e-06
## PartisanCompRepublicanPrimary                              3.770068e-05
## PartisanCompGeneralElection                                2.078009e-05
## PartyAttRepublican                                        -2.473377e-05
## PolicyAttEconomic                                          1.021560e-04
## PolicyAttHealthCare                                        1.256149e-04
## PolicyAttEducation                                         1.061631e-04
## PolicyAttEnvironmental                                     2.188529e-04
## RaceAttBlack                                              -9.702760e-06
## RaceAttHispanic                                           -6.103642e-06
## RaceAttAsian                                              -6.477298e-06
## ReligionAttAtheist                                         1.575540e-05
## ReligionAttIsnotsurethereisaGod                            3.256005e-05
## ReligionAttDoesnotcurrentlyidentifywithareligion           1.907057e-05
## ReligionAttAttendsreligiousservicesweekly                 -1.803085e-05
##                                                   RaceAttBlack RaceAttHispanic
## (Intercept)                                      -1.314327e-04   -1.595694e-04
## AgeAtt47                                         -8.352531e-06   -2.718995e-05
## AgeAtt59                                         -1.760999e-06   -3.031537e-05
## AgeAtt71                                         -2.437128e-05   -4.111137e-05
## EducationAttSomeCollege                           1.071985e-05    1.803939e-05
## EducationAttCollegeGrad                          -3.285456e-06    2.697858e-05
## EducationAttGradDegree                            1.971598e-05    4.037035e-05
## ExperienceAtt4years                               1.822352e-05    4.685160e-05
## ExperienceAtt8years                               7.177262e-06    3.410358e-05
## ExperienceAtt12years                              1.606674e-05    2.652226e-05
## GenderAttMale                                     2.115597e-05    5.610792e-06
## OfficePresident                                   2.868741e-06    2.160913e-06
## PartisanCompRepublicanPrimary                    -1.480158e-05   -3.117512e-05
## PartisanCompGeneralElection                      -5.954715e-07   -1.106682e-05
## PartyAttRepublican                                1.196717e-05    2.933144e-05
## PolicyAttEconomic                                -2.706864e-05   -2.126553e-05
## PolicyAttHealthCare                              -3.351025e-07   -1.390786e-05
## PolicyAttEducation                               -1.352769e-05   -3.094956e-05
## PolicyAttEnvironmental                           -9.702760e-06   -6.103642e-06
## RaceAttBlack                                      2.161721e-04    1.313401e-04
## RaceAttHispanic                                   1.313401e-04    2.248707e-04
## RaceAttAsian                                      1.133851e-04    1.343388e-04
## ReligionAttAtheist                                4.017747e-06    3.626891e-05
## ReligionAttIsnotsurethereisaGod                   1.746485e-06    2.756247e-05
## ReligionAttDoesnotcurrentlyidentifywithareligion -2.061408e-06    2.629565e-05
## ReligionAttAttendsreligiousservicesweekly         1.272832e-05    2.516405e-05
##                                                   RaceAttAsian
## (Intercept)                                      -1.072773e-04
## AgeAtt47                                         -2.149976e-05
## AgeAtt59                                         -1.738910e-05
## AgeAtt71                                         -4.430448e-05
## EducationAttSomeCollege                           1.654904e-05
## EducationAttCollegeGrad                           3.029703e-05
## EducationAttGradDegree                            1.771154e-05
## ExperienceAtt4years                               1.658835e-05
## ExperienceAtt8years                               1.475554e-06
## ExperienceAtt12years                              1.451001e-05
## GenderAttMale                                     7.283958e-06
## OfficePresident                                   9.781670e-07
## PartisanCompRepublicanPrimary                     1.053672e-05
## PartisanCompGeneralElection                       7.883288e-06
## PartyAttRepublican                               -1.676021e-05
## PolicyAttEconomic                                -1.549454e-05
## PolicyAttHealthCare                              -9.772560e-06
## PolicyAttEducation                               -2.202959e-05
## PolicyAttEnvironmental                           -6.477298e-06
## RaceAttBlack                                      1.133851e-04
## RaceAttHispanic                                   1.343388e-04
## RaceAttAsian                                      2.031074e-04
## ReligionAttAtheist                               -2.404919e-06
## ReligionAttIsnotsurethereisaGod                   3.674892e-06
## ReligionAttDoesnotcurrentlyidentifywithareligion -6.297037e-06
## ReligionAttAttendsreligiousservicesweekly         5.296184e-06
##                                                  ReligionAttAtheist
## (Intercept)                                           -1.733793e-04
## AgeAtt47                                               1.010977e-05
## AgeAtt59                                              -2.918792e-05
## AgeAtt71                                              -4.859791e-05
## EducationAttSomeCollege                               -1.367437e-05
## EducationAttCollegeGrad                                5.203268e-06
## EducationAttGradDegree                                 2.409906e-05
## ExperienceAtt4years                                    3.463745e-06
## ExperienceAtt8years                                    3.917468e-05
## ExperienceAtt12years                                   2.698098e-05
## GenderAttMale                                         -1.006125e-06
## OfficePresident                                        2.568601e-06
## PartisanCompRepublicanPrimary                          3.935634e-05
## PartisanCompGeneralElection                            2.285703e-05
## PartyAttRepublican                                    -3.162244e-05
## PolicyAttEconomic                                     -2.610266e-05
## PolicyAttHealthCare                                    2.206119e-05
## PolicyAttEducation                                    -7.367105e-06
## PolicyAttEnvironmental                                 1.575540e-05
## RaceAttBlack                                           4.017747e-06
## RaceAttHispanic                                        3.626891e-05
## RaceAttAsian                                          -2.404919e-06
## ReligionAttAtheist                                     3.099136e-04
## ReligionAttIsnotsurethereisaGod                        1.528999e-04
## ReligionAttDoesnotcurrentlyidentifywithareligion       1.797879e-04
## ReligionAttAttendsreligiousservicesweekly              1.244480e-04
##                                                  ReligionAttIsnotsurethereisaGod
## (Intercept)                                                        -1.816539e-04
## AgeAtt47                                                            1.472669e-06
## AgeAtt59                                                           -2.493771e-05
## AgeAtt71                                                           -2.175180e-05
## EducationAttSomeCollege                                             3.456214e-05
## EducationAttCollegeGrad                                             3.988114e-05
## EducationAttGradDegree                                              4.975613e-05
## ExperienceAtt4years                                                -3.110940e-06
## ExperienceAtt8years                                                 2.555277e-05
## ExperienceAtt12years                                                8.244901e-06
## GenderAttMale                                                       2.660433e-06
## OfficePresident                                                    -8.285771e-07
## PartisanCompRepublicanPrimary                                       4.081580e-05
## PartisanCompGeneralElection                                         2.699142e-05
## PartyAttRepublican                                                 -2.962544e-05
## PolicyAttEconomic                                                  -1.201479e-05
## PolicyAttHealthCare                                                 9.465852e-06
## PolicyAttEducation                                                 -3.357194e-06
## PolicyAttEnvironmental                                              3.256005e-05
## RaceAttBlack                                                        1.746485e-06
## RaceAttHispanic                                                     2.756247e-05
## RaceAttAsian                                                        3.674892e-06
## ReligionAttAtheist                                                  1.528999e-04
## ReligionAttIsnotsurethereisaGod                                     2.571980e-04
## ReligionAttDoesnotcurrentlyidentifywithareligion                    1.520106e-04
## ReligionAttAttendsreligiousservicesweekly                           1.008257e-04
##                                                  ReligionAttDoesnotcurrentlyidentifywithareligion
## (Intercept)                                                                         -1.467097e-04
## AgeAtt47                                                                             1.315555e-05
## AgeAtt59                                                                            -1.793798e-06
## AgeAtt71                                                                            -4.702723e-05
## EducationAttSomeCollege                                                             -2.100282e-05
## EducationAttCollegeGrad                                                              2.305028e-06
## EducationAttGradDegree                                                               1.728540e-05
## ExperienceAtt4years                                                                 -1.550041e-05
## ExperienceAtt8years                                                                  2.667100e-05
## ExperienceAtt12years                                                                 5.862774e-07
## GenderAttMale                                                                        7.336939e-06
## OfficePresident                                                                     -1.402563e-06
## PartisanCompRepublicanPrimary                                                       -4.775767e-06
## PartisanCompGeneralElection                                                          3.293223e-06
## PartyAttRepublican                                                                   3.264530e-07
## PolicyAttEconomic                                                                   -9.699137e-06
## PolicyAttHealthCare                                                                  5.048468e-06
## PolicyAttEducation                                                                   2.994433e-08
## PolicyAttEnvironmental                                                               1.907057e-05
## RaceAttBlack                                                                        -2.061408e-06
## RaceAttHispanic                                                                      2.629565e-05
## RaceAttAsian                                                                        -6.297037e-06
## ReligionAttAtheist                                                                   1.797879e-04
## ReligionAttIsnotsurethereisaGod                                                      1.520106e-04
## ReligionAttDoesnotcurrentlyidentifywithareligion                                     2.635742e-04
## ReligionAttAttendsreligiousservicesweekly                                            1.206369e-04
##                                                  ReligionAttAttendsreligiousservicesweekly
## (Intercept)                                                                  -9.687629e-05
## AgeAtt47                                                                     -4.851192e-07
## AgeAtt59                                                                     -3.639466e-06
## AgeAtt71                                                                     -1.983955e-05
## EducationAttSomeCollege                                                      -2.997595e-06
## EducationAttCollegeGrad                                                      -2.310419e-05
## EducationAttGradDegree                                                        5.414443e-06
## ExperienceAtt4years                                                          -1.089439e-06
## ExperienceAtt8years                                                           7.100046e-06
## ExperienceAtt12years                                                          5.477741e-06
## GenderAttMale                                                                 1.081383e-05
## OfficePresident                                                               3.262495e-07
## PartisanCompRepublicanPrimary                                                -1.835400e-05
## PartisanCompGeneralElection                                                  -6.386345e-06
## PartyAttRepublican                                                            2.450191e-05
## PolicyAttEconomic                                                            -5.285600e-05
## PolicyAttHealthCare                                                          -2.418464e-05
## PolicyAttEducation                                                           -3.414571e-05
## PolicyAttEnvironmental                                                       -1.803085e-05
## RaceAttBlack                                                                  1.272832e-05
## RaceAttHispanic                                                               2.516405e-05
## RaceAttAsian                                                                  5.296184e-06
## ReligionAttAtheist                                                            1.244480e-04
## ReligionAttIsnotsurethereisaGod                                               1.008257e-04
## ReligionAttDoesnotcurrentlyidentifywithareligion                              1.206369e-04
## ReligionAttAttendsreligiousservicesweekly                                     2.038555e-04
## 
## $samplesize_prof
## [1] 20384
## 
## $formula
## VotingChoice ~ AgeAtt + EducationAtt + ExperienceAtt + GenderAtt + 
##     Office + PartisanComp + PartyAtt + PolicyAtt + RaceAtt + 
##     ReligionAtt
## <environment: 0x000002cea8d71780>
## 
## $baselines
## $baselines$AgeAtt
## [1] "35"
## 
## $baselines$EducationAtt
## [1] "HighSchool"
## 
## $baselines$ExperienceAtt
## [1] "NoExperience"
## 
## $baselines$GenderAtt
## [1] "Female"
## 
## $baselines$Office
## [1] "Mayor"
## 
## $baselines$PartisanComp
## [1] "DemocraticPrimary"
## 
## $baselines$PartyAtt
## [1] "Democrat"
## 
## $baselines$PolicyAtt
## [1] "Foreign"
## 
## $baselines$RaceAtt
## [1] "White"
## 
## $baselines$ReligionAtt
## [1] "Christian"
## 
## 
## $continuous
## list()
## 
## $numrespondents
## [1] 1274
## 
## $weights
##           WEIGHT
## 1     0.23430621
## 2     0.23430621
## 3     0.23430621
## 4     0.23430621
## 5     0.23430621
## 6     0.23430621
## 7     0.23430621
## 8     0.23430621
## 9     0.23430621
## 10    0.23430621
## 11    0.23430621
## 12    0.23430621
## 13    0.23430621
## 14    0.23430621
## 15    0.23430621
## 16    0.23430621
## 17    0.26824266
## 18    0.26824266
## 19    0.26824266
## 20    0.26824266
## 21    0.26824266
## 22    0.26824266
## 23    0.26824266
## 24    0.26824266
## 25    0.26824266
## 26    0.26824266
## 27    0.26824266
## 28    0.26824266
## 29    0.26824266
## 30    0.26824266
## 31    0.26824266
## 32    0.26824266
## 33    0.40630295
## 34    0.40630295
## 35    0.40630295
## 36    0.40630295
## 37    0.40630295
## 38    0.40630295
## 39    0.40630295
## 40    0.40630295
## 41    0.40630295
## 42    0.40630295
## 43    0.40630295
## 44    0.40630295
## 45    0.40630295
## 46    0.40630295
## 47    0.40630295
## 48    0.40630295
## 49    0.85697223
## 50    0.85697223
## 51    0.85697223
## 52    0.85697223
## 53    0.85697223
## 54    0.85697223
## 55    0.85697223
## 56    0.85697223
## 57    0.85697223
## 58    0.85697223
## 59    0.85697223
## 60    0.85697223
## 61    0.85697223
## 62    0.85697223
## 63    0.85697223
## 64    0.85697223
## 65    1.08346945
## 66    1.08346945
## 67    1.08346945
## 68    1.08346945
## 69    1.08346945
## 70    1.08346945
## 71    1.08346945
## 72    1.08346945
## 73    1.08346945
## 74    1.08346945
## 75    1.08346945
## 76    1.08346945
## 77    1.08346945
## 78    1.08346945
## 79    1.08346945
## 80    1.08346945
## 81    0.98012854
## 82    0.98012854
## 83    0.98012854
## 84    0.98012854
## 85    0.98012854
## 86    0.98012854
## 87    0.98012854
## 88    0.98012854
## 89    0.98012854
## 90    0.98012854
## 91    0.98012854
## 92    0.98012854
## 93    0.98012854
## 94    0.98012854
## 95    0.98012854
## 96    0.98012854
## 97    0.54538712
## 98    0.54538712
## 99    0.54538712
## 100   0.54538712
## 101   0.54538712
## 102   0.54538712
## 103   0.54538712
## 104   0.54538712
## 105   0.54538712
## 106   0.54538712
## 107   0.54538712
## 108   0.54538712
## 109   0.54538712
## 110   0.54538712
## 111   0.54538712
## 112   0.54538712
## 113   0.67821633
## 114   0.67821633
## 115   0.67821633
## 116   0.67821633
## 117   0.67821633
## 118   0.67821633
## 119   0.67821633
## 120   0.67821633
## 121   0.67821633
## 122   0.67821633
## 123   0.67821633
## 124   0.67821633
## 125   0.67821633
## 126   0.67821633
## 127   0.67821633
## 128   0.67821633
## 129   0.29653342
## 130   0.29653342
## 131   0.29653342
## 132   0.29653342
## 133   0.29653342
## 134   0.29653342
## 135   0.29653342
## 136   0.29653342
## 137   0.29653342
## 138   0.29653342
## 139   0.29653342
## 140   0.29653342
## 141   0.29653342
## 142   0.29653342
## 143   0.29653342
## 144   0.29653342
## 145   0.48190590
## 146   0.48190590
## 147   0.48190590
## 148   0.48190590
## 149   0.48190590
## 150   0.48190590
## 151   0.48190590
## 152   0.48190590
## 153   0.48190590
## 154   0.48190590
## 155   0.48190590
## 156   0.48190590
## 157   0.48190590
## 158   0.48190590
## 159   0.48190590
## 160   0.48190590
## 161   0.85522163
## 162   0.85522163
## 163   0.85522163
## 164   0.85522163
## 165   0.85522163
## 166   0.85522163
## 167   0.85522163
## 168   0.85522163
## 169   0.85522163
## 170   0.85522163
## 171   0.85522163
## 172   0.85522163
## 173   0.85522163
## 174   0.85522163
## 175   0.85522163
## 176   0.85522163
## 177   1.64536815
## 178   1.64536815
## 179   1.64536815
## 180   1.64536815
## 181   1.64536815
## 182   1.64536815
## 183   1.64536815
## 184   1.64536815
## 185   1.64536815
## 186   1.64536815
## 187   1.64536815
## 188   1.64536815
## 189   1.64536815
## 190   1.64536815
## 191   1.64536815
## 192   1.64536815
## 193   1.28500546
## 194   1.28500546
## 195   1.28500546
## 196   1.28500546
## 197   1.28500546
## 198   1.28500546
## 199   1.28500546
## 200   1.28500546
## 201   1.28500546
## 202   1.28500546
## 203   1.28500546
## 204   1.28500546
## 205   1.28500546
## 206   1.28500546
## 207   1.28500546
## 208   1.28500546
## 209   0.74644245
## 210   0.74644245
## 211   0.74644245
## 212   0.74644245
## 213   0.74644245
## 214   0.74644245
## 215   0.74644245
## 216   0.74644245
## 217   0.74644245
## 218   0.74644245
## 219   0.74644245
## 220   0.74644245
## 221   0.74644245
## 222   0.74644245
## 223   0.74644245
## 224   0.74644245
## 225   0.39834229
## 226   0.39834229
## 227   0.39834229
## 228   0.39834229
## 229   0.39834229
## 230   0.39834229
## 231   0.39834229
## 232   0.39834229
## 233   0.39834229
## 234   0.39834229
## 235   0.39834229
## 236   0.39834229
## 237   0.39834229
## 238   0.39834229
## 239   0.39834229
## 240   0.39834229
## 241   0.39806349
## 242   0.39806349
## 243   0.39806349
## 244   0.39806349
## 245   0.39806349
## 246   0.39806349
## 247   0.39806349
## 248   0.39806349
## 249   0.39806349
## 250   0.39806349
## 251   0.39806349
## 252   0.39806349
## 253   0.39806349
## 254   0.39806349
## 255   0.39806349
## 256   0.39806349
## 257   0.58543495
## 258   0.58543495
## 259   0.58543495
## 260   0.58543495
## 261   0.58543495
## 262   0.58543495
## 263   0.58543495
## 264   0.58543495
## 265   0.58543495
## 266   0.58543495
## 267   0.58543495
## 268   0.58543495
## 269   0.58543495
## 270   0.58543495
## 271   0.58543495
## 272   0.58543495
## 273   0.68033004
## 274   0.68033004
## 275   0.68033004
## 276   0.68033004
## 277   0.68033004
## 278   0.68033004
## 279   0.68033004
## 280   0.68033004
## 281   0.68033004
## 282   0.68033004
## 283   0.68033004
## 284   0.68033004
## 285   0.68033004
## 286   0.68033004
## 287   0.68033004
## 288   0.68033004
## 289   1.66287397
## 290   1.66287397
## 291   1.66287397
## 292   1.66287397
## 293   1.66287397
## 294   1.66287397
## 295   1.66287397
## 296   1.66287397
## 297   1.66287397
## 298   1.66287397
## 299   1.66287397
## 300   1.66287397
## 301   1.66287397
## 302   1.66287397
## 303   1.66287397
## 304   1.66287397
## 305   1.88844529
## 306   1.88844529
## 307   1.88844529
## 308   1.88844529
## 309   1.88844529
## 310   1.88844529
## 311   1.88844529
## 312   1.88844529
## 313   1.88844529
## 314   1.88844529
## 315   1.88844529
## 316   1.88844529
## 317   1.88844529
## 318   1.88844529
## 319   1.88844529
## 320   1.88844529
## 321   0.50927027
## 322   0.50927027
## 323   0.50927027
## 324   0.50927027
## 325   0.50927027
## 326   0.50927027
## 327   0.50927027
## 328   0.50927027
## 329   0.50927027
## 330   0.50927027
## 331   0.50927027
## 332   0.50927027
## 333   0.50927027
## 334   0.50927027
## 335   0.50927027
## 336   0.50927027
## 337   0.38958812
## 338   0.38958812
## 339   0.38958812
## 340   0.38958812
## 341   0.38958812
## 342   0.38958812
## 343   0.38958812
## 344   0.38958812
## 345   0.38958812
## 346   0.38958812
## 347   0.38958812
## 348   0.38958812
## 349   0.38958812
## 350   0.38958812
## 351   0.38958812
## 352   0.38958812
## 353   1.17750941
## 354   1.17750941
## 355   1.17750941
## 356   1.17750941
## 357   1.17750941
## 358   1.17750941
## 359   1.17750941
## 360   1.17750941
## 361   1.17750941
## 362   1.17750941
## 363   1.17750941
## 364   1.17750941
## 365   1.17750941
## 366   1.17750941
## 367   1.17750941
## 368   1.17750941
## 369   1.02719542
## 370   1.02719542
## 371   1.02719542
## 372   1.02719542
## 373   1.02719542
## 374   1.02719542
## 375   1.02719542
## 376   1.02719542
## 377   1.02719542
## 378   1.02719542
## 379   1.02719542
## 380   1.02719542
## 381   1.02719542
## 382   1.02719542
## 383   1.02719542
## 384   1.02719542
## 385   0.44782638
## 386   0.44782638
## 387   0.44782638
## 388   0.44782638
## 389   0.44782638
## 390   0.44782638
## 391   0.44782638
## 392   0.44782638
## 393   0.44782638
## 394   0.44782638
## 395   0.44782638
## 396   0.44782638
## 397   0.44782638
## 398   0.44782638
## 399   0.44782638
## 400   0.44782638
## 401   0.31780187
## 402   0.31780187
## 403   0.31780187
## 404   0.31780187
## 405   0.31780187
## 406   0.31780187
## 407   0.31780187
## 408   0.31780187
## 409   0.31780187
## 410   0.31780187
## 411   0.31780187
## 412   0.31780187
## 413   0.31780187
## 414   0.31780187
## 415   0.31780187
## 416   0.31780187
## 417   0.68608759
## 418   0.68608759
## 419   0.68608759
## 420   0.68608759
## 421   0.68608759
## 422   0.68608759
## 423   0.68608759
## 424   0.68608759
## 425   0.68608759
## 426   0.68608759
## 427   0.68608759
## 428   0.68608759
## 429   0.68608759
## 430   0.68608759
## 431   0.68608759
## 432   0.68608759
## 433   3.15501626
## 434   3.15501626
## 435   3.15501626
## 436   3.15501626
## 437   3.15501626
## 438   3.15501626
## 439   3.15501626
## 440   3.15501626
## 441   3.15501626
## 442   3.15501626
## 443   3.15501626
## 444   3.15501626
## 445   3.15501626
## 446   3.15501626
## 447   3.15501626
## 448   3.15501626
## 449   0.53392542
## 450   0.53392542
## 451   0.53392542
## 452   0.53392542
## 453   0.53392542
## 454   0.53392542
## 455   0.53392542
## 456   0.53392542
## 457   0.53392542
## 458   0.53392542
## 459   0.53392542
## 460   0.53392542
## 461   0.53392542
## 462   0.53392542
## 463   0.53392542
## 464   0.53392542
## 465   0.52217237
## 466   0.52217237
## 467   0.52217237
## 468   0.52217237
## 469   0.52217237
## 470   0.52217237
## 471   0.52217237
## 472   0.52217237
## 473   0.52217237
## 474   0.52217237
## 475   0.52217237
## 476   0.52217237
## 477   0.52217237
## 478   0.52217237
## 479   0.52217237
## 480   0.52217237
## 481   2.35661427
## 482   2.35661427
## 483   2.35661427
## 484   2.35661427
## 485   2.35661427
## 486   2.35661427
## 487   2.35661427
## 488   2.35661427
## 489   2.35661427
## 490   2.35661427
## 491   2.35661427
## 492   2.35661427
## 493   2.35661427
## 494   2.35661427
## 495   2.35661427
## 496   2.35661427
## 497   0.97667533
## 498   0.97667533
## 499   0.97667533
## 500   0.97667533
## 501   0.97667533
## 502   0.97667533
## 503   0.97667533
## 504   0.97667533
## 505   0.97667533
## 506   0.97667533
## 507   0.97667533
## 508   0.97667533
## 509   0.97667533
## 510   0.97667533
## 511   0.97667533
## 512   0.97667533
## 513   0.43841485
## 514   0.43841485
## 515   0.43841485
## 516   0.43841485
## 517   0.43841485
## 518   0.43841485
## 519   0.43841485
## 520   0.43841485
## 521   0.43841485
## 522   0.43841485
## 523   0.43841485
## 524   0.43841485
## 525   0.43841485
## 526   0.43841485
## 527   0.43841485
## 528   0.43841485
## 529   1.79591808
## 530   1.79591808
## 531   1.79591808
## 532   1.79591808
## 533   1.79591808
## 534   1.79591808
## 535   1.79591808
## 536   1.79591808
## 537   1.79591808
## 538   1.79591808
## 539   1.79591808
## 540   1.79591808
## 541   1.79591808
## 542   1.79591808
## 543   1.79591808
## 544   1.79591808
## 545   0.74009777
## 546   0.74009777
## 547   0.74009777
## 548   0.74009777
## 549   0.74009777
## 550   0.74009777
## 551   0.74009777
## 552   0.74009777
## 553   0.74009777
## 554   0.74009777
## 555   0.74009777
## 556   0.74009777
## 557   0.74009777
## 558   0.74009777
## 559   0.74009777
## 560   0.74009777
## 561   0.54741492
## 562   0.54741492
## 563   0.54741492
## 564   0.54741492
## 565   0.54741492
## 566   0.54741492
## 567   0.54741492
## 568   0.54741492
## 569   0.54741492
## 570   0.54741492
## 571   0.54741492
## 572   0.54741492
## 573   0.54741492
## 574   0.54741492
## 575   0.54741492
## 576   0.54741492
## 577   1.17128053
## 578   1.17128053
## 579   1.17128053
## 580   1.17128053
## 581   1.17128053
## 582   1.17128053
## 583   1.17128053
## 584   1.17128053
## 585   1.17128053
## 586   1.17128053
## 587   1.17128053
## 588   1.17128053
## 589   1.17128053
## 590   1.17128053
## 591   1.17128053
## 592   1.17128053
## 593   0.61000978
## 594   0.61000978
## 595   0.61000978
## 596   0.61000978
## 597   0.61000978
## 598   0.61000978
## 599   0.61000978
## 600   0.61000978
## 601   0.61000978
## 602   0.61000978
## 603   0.61000978
## 604   0.61000978
## 605   0.61000978
## 606   0.61000978
## 607   0.61000978
## 608   0.61000978
## 609   0.88317034
## 610   0.88317034
## 611   0.88317034
## 612   0.88317034
## 613   0.88317034
## 614   0.88317034
## 615   0.88317034
## 616   0.88317034
## 617   0.88317034
## 618   0.88317034
## 619   0.88317034
## 620   0.88317034
## 621   0.88317034
## 622   0.88317034
## 623   0.88317034
## 624   0.88317034
## 625   0.57520469
## 626   0.57520469
## 627   0.57520469
## 628   0.57520469
## 629   0.57520469
## 630   0.57520469
## 631   0.57520469
## 632   0.57520469
## 633   0.57520469
## 634   0.57520469
## 635   0.57520469
## 636   0.57520469
## 637   0.57520469
## 638   0.57520469
## 639   0.57520469
## 640   0.57520469
## 641   1.27596016
## 642   1.27596016
## 643   1.27596016
## 644   1.27596016
## 645   1.27596016
## 646   1.27596016
## 647   1.27596016
## 648   1.27596016
## 649   1.27596016
## 650   1.27596016
## 651   1.27596016
## 652   1.27596016
## 653   1.27596016
## 654   1.27596016
## 655   1.27596016
## 656   1.27596016
## 657   0.76044935
## 658   0.76044935
## 659   0.76044935
## 660   0.76044935
## 661   0.76044935
## 662   0.76044935
## 663   0.76044935
## 664   0.76044935
## 665   0.76044935
## 666   0.76044935
## 667   0.76044935
## 668   0.76044935
## 669   0.76044935
## 670   0.76044935
## 671   0.76044935
## 672   0.76044935
## 673   1.20795332
## 674   1.20795332
## 675   1.20795332
## 676   1.20795332
## 677   1.20795332
## 678   1.20795332
## 679   1.20795332
## 680   1.20795332
## 681   1.20795332
## 682   1.20795332
## 683   1.20795332
## 684   1.20795332
## 685   1.20795332
## 686   1.20795332
## 687   1.20795332
## 688   1.20795332
## 689   1.05956313
## 690   1.05956313
## 691   1.05956313
## 692   1.05956313
## 693   1.05956313
## 694   1.05956313
## 695   1.05956313
## 696   1.05956313
## 697   1.05956313
## 698   1.05956313
## 699   1.05956313
## 700   1.05956313
## 701   1.05956313
## 702   1.05956313
## 703   1.05956313
## 704   1.05956313
## 705   1.16349049
## 706   1.16349049
## 707   1.16349049
## 708   1.16349049
## 709   1.16349049
## 710   1.16349049
## 711   1.16349049
## 712   1.16349049
## 713   1.16349049
## 714   1.16349049
## 715   1.16349049
## 716   1.16349049
## 717   1.16349049
## 718   1.16349049
## 719   1.16349049
## 720   1.16349049
## 721   0.07370932
## 722   0.07370932
## 723   0.07370932
## 724   0.07370932
## 725   0.07370932
## 726   0.07370932
## 727   0.07370932
## 728   0.07370932
## 729   0.07370932
## 730   0.07370932
## 731   0.07370932
## 732   0.07370932
## 733   0.07370932
## 734   0.07370932
## 735   0.07370932
## 736   0.07370932
## 737   0.95643888
## 738   0.95643888
## 739   0.95643888
## 740   0.95643888
## 741   0.95643888
## 742   0.95643888
## 743   0.95643888
## 744   0.95643888
## 745   0.95643888
## 746   0.95643888
## 747   0.95643888
## 748   0.95643888
## 749   0.95643888
## 750   0.95643888
## 751   0.95643888
## 752   0.95643888
## 753   0.70270422
## 754   0.70270422
## 755   0.70270422
## 756   0.70270422
## 757   0.70270422
## 758   0.70270422
## 759   0.70270422
## 760   0.70270422
## 761   0.70270422
## 762   0.70270422
## 763   0.70270422
## 764   0.70270422
## 765   0.70270422
## 766   0.70270422
## 767   0.70270422
## 768   0.70270422
## 769   0.79998246
## 770   0.79998246
## 771   0.79998246
## 772   0.79998246
## 773   0.79998246
## 774   0.79998246
## 775   0.79998246
## 776   0.79998246
## 777   0.79998246
## 778   0.79998246
## 779   0.79998246
## 780   0.79998246
## 781   0.79998246
## 782   0.79998246
## 783   0.79998246
## 784   0.79998246
## 785   0.91542052
## 786   0.91542052
## 787   0.91542052
## 788   0.91542052
## 789   0.91542052
## 790   0.91542052
## 791   0.91542052
## 792   0.91542052
## 793   0.91542052
## 794   0.91542052
## 795   0.91542052
## 796   0.91542052
## 797   0.91542052
## 798   0.91542052
## 799   0.91542052
## 800   0.91542052
## 801   2.57686224
## 802   2.57686224
## 803   2.57686224
## 804   2.57686224
## 805   2.57686224
## 806   2.57686224
## 807   2.57686224
## 808   2.57686224
## 809   2.57686224
## 810   2.57686224
## 811   2.57686224
## 812   2.57686224
## 813   2.57686224
## 814   2.57686224
## 815   2.57686224
## 816   2.57686224
## 817   1.56417708
## 818   1.56417708
## 819   1.56417708
## 820   1.56417708
## 821   1.56417708
## 822   1.56417708
## 823   1.56417708
## 824   1.56417708
## 825   1.56417708
## 826   1.56417708
## 827   1.56417708
## 828   1.56417708
## 829   1.56417708
## 830   1.56417708
## 831   1.56417708
## 832   1.56417708
## 833   0.39623786
## 834   0.39623786
## 835   0.39623786
## 836   0.39623786
## 837   0.39623786
## 838   0.39623786
## 839   0.39623786
## 840   0.39623786
## 841   0.39623786
## 842   0.39623786
## 843   0.39623786
## 844   0.39623786
## 845   0.39623786
## 846   0.39623786
## 847   0.39623786
## 848   0.39623786
## 849   0.74300787
## 850   0.74300787
## 851   0.74300787
## 852   0.74300787
## 853   0.74300787
## 854   0.74300787
## 855   0.74300787
## 856   0.74300787
## 857   0.74300787
## 858   0.74300787
## 859   0.74300787
## 860   0.74300787
## 861   0.74300787
## 862   0.74300787
## 863   0.74300787
## 864   0.74300787
## 865   0.89953930
## 866   0.89953930
## 867   0.89953930
## 868   0.89953930
## 869   0.89953930
## 870   0.89953930
## 871   0.89953930
## 872   0.89953930
## 873   0.89953930
## 874   0.89953930
## 875   0.89953930
## 876   0.89953930
## 877   0.89953930
## 878   0.89953930
## 879   0.89953930
## 880   0.89953930
## 881   0.75531802
## 882   0.75531802
## 883   0.75531802
## 884   0.75531802
## 885   0.75531802
## 886   0.75531802
## 887   0.75531802
## 888   0.75531802
## 889   0.75531802
## 890   0.75531802
## 891   0.75531802
## 892   0.75531802
## 893   0.75531802
## 894   0.75531802
## 895   0.75531802
## 896   0.75531802
## 897   0.73830289
## 898   0.73830289
## 899   0.73830289
## 900   0.73830289
## 901   0.73830289
## 902   0.73830289
## 903   0.73830289
## 904   0.73830289
## 905   0.73830289
## 906   0.73830289
## 907   0.73830289
## 908   0.73830289
## 909   0.73830289
## 910   0.73830289
## 911   0.73830289
## 912   0.73830289
## 913   0.45948958
## 914   0.45948958
## 915   0.45948958
## 916   0.45948958
## 917   0.45948958
## 918   0.45948958
## 919   0.45948958
## 920   0.45948958
## 921   0.45948958
## 922   0.45948958
## 923   0.45948958
## 924   0.45948958
## 925   0.45948958
## 926   0.45948958
## 927   0.45948958
## 928   0.45948958
## 929   0.67218753
## 930   0.67218753
## 931   0.67218753
## 932   0.67218753
## 933   0.67218753
## 934   0.67218753
## 935   0.67218753
## 936   0.67218753
## 937   0.67218753
## 938   0.67218753
## 939   0.67218753
## 940   0.67218753
## 941   0.67218753
## 942   0.67218753
## 943   0.67218753
## 944   0.67218753
## 945   0.42993877
## 946   0.42993877
## 947   0.42993877
## 948   0.42993877
## 949   0.42993877
## 950   0.42993877
## 951   0.42993877
## 952   0.42993877
## 953   0.42993877
## 954   0.42993877
## 955   0.42993877
## 956   0.42993877
## 957   0.42993877
## 958   0.42993877
## 959   0.42993877
## 960   0.42993877
## 961   1.95852135
## 962   1.95852135
## 963   1.95852135
## 964   1.95852135
## 965   1.95852135
## 966   1.95852135
## 967   1.95852135
## 968   1.95852135
## 969   1.95852135
## 970   1.95852135
## 971   1.95852135
## 972   1.95852135
## 973   1.95852135
## 974   1.95852135
## 975   1.95852135
## 976   1.95852135
## 977   0.71538879
## 978   0.71538879
## 979   0.71538879
## 980   0.71538879
## 981   0.71538879
## 982   0.71538879
## 983   0.71538879
## 984   0.71538879
## 985   0.71538879
## 986   0.71538879
## 987   0.71538879
## 988   0.71538879
## 989   0.71538879
## 990   0.71538879
## 991   0.71538879
## 992   0.71538879
## 993   1.00950391
## 994   1.00950391
## 995   1.00950391
## 996   1.00950391
## 997   1.00950391
## 998   1.00950391
## 999   1.00950391
## 1000  1.00950391
## 1001  1.00950391
## 1002  1.00950391
## 1003  1.00950391
## 1004  1.00950391
## 1005  1.00950391
## 1006  1.00950391
## 1007  1.00950391
## 1008  1.00950391
## 1009  1.01207870
## 1010  1.01207870
## 1011  1.01207870
## 1012  1.01207870
## 1013  1.01207870
## 1014  1.01207870
## 1015  1.01207870
## 1016  1.01207870
## 1017  1.01207870
## 1018  1.01207870
## 1019  1.01207870
## 1020  1.01207870
## 1021  1.01207870
## 1022  1.01207870
## 1023  1.01207870
## 1024  1.01207870
## 1025  2.63109781
## 1026  2.63109781
## 1027  2.63109781
## 1028  2.63109781
## 1029  2.63109781
## 1030  2.63109781
## 1031  2.63109781
## 1032  2.63109781
## 1033  2.63109781
## 1034  2.63109781
## 1035  2.63109781
## 1036  2.63109781
## 1037  2.63109781
## 1038  2.63109781
## 1039  2.63109781
## 1040  2.63109781
## 1041  0.65213378
## 1042  0.65213378
## 1043  0.65213378
## 1044  0.65213378
## 1045  0.65213378
## 1046  0.65213378
## 1047  0.65213378
## 1048  0.65213378
## 1049  0.65213378
## 1050  0.65213378
## 1051  0.65213378
## 1052  0.65213378
## 1053  0.65213378
## 1054  0.65213378
## 1055  0.65213378
## 1056  0.65213378
## 1057  0.92856948
## 1058  0.92856948
## 1059  0.92856948
## 1060  0.92856948
## 1061  0.92856948
## 1062  0.92856948
## 1063  0.92856948
## 1064  0.92856948
## 1065  0.92856948
## 1066  0.92856948
## 1067  0.92856948
## 1068  0.92856948
## 1069  0.92856948
## 1070  0.92856948
## 1071  0.92856948
## 1072  0.92856948
## 1073  0.48962597
## 1074  0.48962597
## 1075  0.48962597
## 1076  0.48962597
## 1077  0.48962597
## 1078  0.48962597
## 1079  0.48962597
## 1080  0.48962597
## 1081  0.48962597
## 1082  0.48962597
## 1083  0.48962597
## 1084  0.48962597
## 1085  0.48962597
## 1086  0.48962597
## 1087  0.48962597
## 1088  0.48962597
## 1089  0.63504880
## 1090  0.63504880
## 1091  0.63504880
## 1092  0.63504880
## 1093  0.63504880
## 1094  0.63504880
## 1095  0.63504880
## 1096  0.63504880
## 1097  0.63504880
## 1098  0.63504880
## 1099  0.63504880
## 1100  0.63504880
## 1101  0.63504880
## 1102  0.63504880
## 1103  0.63504880
## 1104  0.63504880
## 1105  0.26334005
## 1106  0.26334005
## 1107  0.26334005
## 1108  0.26334005
## 1109  0.26334005
## 1110  0.26334005
## 1111  0.26334005
## 1112  0.26334005
## 1113  0.26334005
## 1114  0.26334005
## 1115  0.26334005
## 1116  0.26334005
## 1117  0.26334005
## 1118  0.26334005
## 1119  0.26334005
## 1120  0.26334005
## 1121  0.31604233
## 1122  0.31604233
## 1123  0.31604233
## 1124  0.31604233
## 1125  0.31604233
## 1126  0.31604233
## 1127  0.31604233
## 1128  0.31604233
## 1129  0.31604233
## 1130  0.31604233
## 1131  0.31604233
## 1132  0.31604233
## 1133  0.31604233
## 1134  0.31604233
## 1135  0.31604233
## 1136  0.31604233
## 1137  1.67138859
## 1138  1.67138859
## 1139  1.67138859
## 1140  1.67138859
## 1141  1.67138859
## 1142  1.67138859
## 1143  1.67138859
## 1144  1.67138859
## 1145  1.67138859
## 1146  1.67138859
## 1147  1.67138859
## 1148  1.67138859
## 1149  1.67138859
## 1150  1.67138859
## 1151  1.67138859
## 1152  1.67138859
## 1153  2.13073042
## 1154  2.13073042
## 1155  2.13073042
## 1156  2.13073042
## 1157  2.13073042
## 1158  2.13073042
## 1159  2.13073042
## 1160  2.13073042
## 1161  2.13073042
## 1162  2.13073042
## 1163  2.13073042
## 1164  2.13073042
## 1165  2.13073042
## 1166  2.13073042
## 1167  2.13073042
## 1168  2.13073042
## 1169  0.28531981
## 1170  0.28531981
## 1171  0.28531981
## 1172  0.28531981
## 1173  0.28531981
## 1174  0.28531981
## 1175  0.28531981
## 1176  0.28531981
## 1177  0.28531981
## 1178  0.28531981
## 1179  0.28531981
## 1180  0.28531981
## 1181  0.28531981
## 1182  0.28531981
## 1183  0.28531981
## 1184  0.28531981
## 1185  0.31482151
## 1186  0.31482151
## 1187  0.31482151
## 1188  0.31482151
## 1189  0.31482151
## 1190  0.31482151
## 1191  0.31482151
## 1192  0.31482151
## 1193  0.31482151
## 1194  0.31482151
## 1195  0.31482151
## 1196  0.31482151
## 1197  0.31482151
## 1198  0.31482151
## 1199  0.31482151
## 1200  0.31482151
## 1201  0.72892223
## 1202  0.72892223
## 1203  0.72892223
## 1204  0.72892223
## 1205  0.72892223
## 1206  0.72892223
## 1207  0.72892223
## 1208  0.72892223
## 1209  0.72892223
## 1210  0.72892223
## 1211  0.72892223
## 1212  0.72892223
## 1213  0.72892223
## 1214  0.72892223
## 1215  0.72892223
## 1216  0.72892223
## 1217  0.10237293
## 1218  0.10237293
## 1219  0.10237293
## 1220  0.10237293
## 1221  0.10237293
## 1222  0.10237293
## 1223  0.10237293
## 1224  0.10237293
## 1225  0.10237293
## 1226  0.10237293
## 1227  0.10237293
## 1228  0.10237293
## 1229  0.10237293
## 1230  0.10237293
## 1231  0.10237293
## 1232  0.10237293
## 1233  1.87702205
## 1234  1.87702205
## 1235  1.87702205
## 1236  1.87702205
## 1237  1.87702205
## 1238  1.87702205
## 1239  1.87702205
## 1240  1.87702205
## 1241  1.87702205
## 1242  1.87702205
## 1243  1.87702205
## 1244  1.87702205
## 1245  1.87702205
## 1246  1.87702205
## 1247  1.87702205
## 1248  1.87702205
## 1249  1.11126306
## 1250  1.11126306
## 1251  1.11126306
## 1252  1.11126306
## 1253  1.11126306
## 1254  1.11126306
## 1255  1.11126306
## 1256  1.11126306
## 1257  1.11126306
## 1258  1.11126306
## 1259  1.11126306
## 1260  1.11126306
## 1261  1.11126306
## 1262  1.11126306
## 1263  1.11126306
## 1264  1.11126306
## 1265  1.47427989
## 1266  1.47427989
## 1267  1.47427989
## 1268  1.47427989
## 1269  1.47427989
## 1270  1.47427989
## 1271  1.47427989
## 1272  1.47427989
## 1273  1.47427989
## 1274  1.47427989
## 1275  1.47427989
## 1276  1.47427989
## 1277  1.47427989
## 1278  1.47427989
## 1279  1.47427989
## 1280  1.47427989
## 1281  0.66746369
## 1282  0.66746369
## 1283  0.66746369
## 1284  0.66746369
## 1285  0.66746369
## 1286  0.66746369
## 1287  0.66746369
## 1288  0.66746369
## 1289  0.66746369
## 1290  0.66746369
## 1291  0.66746369
## 1292  0.66746369
## 1293  0.66746369
## 1294  0.66746369
## 1295  0.66746369
## 1296  0.66746369
## 1297  0.36866166
## 1298  0.36866166
## 1299  0.36866166
## 1300  0.36866166
## 1301  0.36866166
## 1302  0.36866166
## 1303  0.36866166
## 1304  0.36866166
## 1305  0.36866166
## 1306  0.36866166
## 1307  0.36866166
## 1308  0.36866166
## 1309  0.36866166
## 1310  0.36866166
## 1311  0.36866166
## 1312  0.36866166
## 1313  0.57363495
## 1314  0.57363495
## 1315  0.57363495
## 1316  0.57363495
## 1317  0.57363495
## 1318  0.57363495
## 1319  0.57363495
## 1320  0.57363495
## 1321  0.57363495
## 1322  0.57363495
## 1323  0.57363495
## 1324  0.57363495
## 1325  0.57363495
## 1326  0.57363495
## 1327  0.57363495
## 1328  0.57363495
## 1329  0.26037948
## 1330  0.26037948
## 1331  0.26037948
## 1332  0.26037948
## 1333  0.26037948
## 1334  0.26037948
## 1335  0.26037948
## 1336  0.26037948
## 1337  0.26037948
## 1338  0.26037948
## 1339  0.26037948
## 1340  0.26037948
## 1341  0.26037948
## 1342  0.26037948
## 1343  0.26037948
## 1344  0.26037948
## 1345  0.70443993
## 1346  0.70443993
## 1347  0.70443993
## 1348  0.70443993
## 1349  0.70443993
## 1350  0.70443993
## 1351  0.70443993
## 1352  0.70443993
## 1353  0.70443993
## 1354  0.70443993
## 1355  0.70443993
## 1356  0.70443993
## 1357  0.70443993
## 1358  0.70443993
## 1359  0.70443993
## 1360  0.70443993
## 1361  0.74389546
## 1362  0.74389546
## 1363  0.74389546
## 1364  0.74389546
## 1365  0.74389546
## 1366  0.74389546
## 1367  0.74389546
## 1368  0.74389546
## 1369  0.74389546
## 1370  0.74389546
## 1371  0.74389546
## 1372  0.74389546
## 1373  0.74389546
## 1374  0.74389546
## 1375  0.74389546
## 1376  0.74389546
## 1377  2.63467297
## 1378  2.63467297
## 1379  2.63467297
## 1380  2.63467297
## 1381  2.63467297
## 1382  2.63467297
## 1383  2.63467297
## 1384  2.63467297
## 1385  2.63467297
## 1386  2.63467297
## 1387  2.63467297
## 1388  2.63467297
## 1389  2.63467297
## 1390  2.63467297
## 1391  2.63467297
## 1392  2.63467297
## 1393  0.32462118
## 1394  0.32462118
## 1395  0.32462118
## 1396  0.32462118
## 1397  0.32462118
## 1398  0.32462118
## 1399  0.32462118
## 1400  0.32462118
## 1401  0.32462118
## 1402  0.32462118
## 1403  0.32462118
## 1404  0.32462118
## 1405  0.32462118
## 1406  0.32462118
## 1407  0.32462118
## 1408  0.32462118
## 1409  0.74182715
## 1410  0.74182715
## 1411  0.74182715
## 1412  0.74182715
## 1413  0.74182715
## 1414  0.74182715
## 1415  0.74182715
## 1416  0.74182715
## 1417  0.74182715
## 1418  0.74182715
## 1419  0.74182715
## 1420  0.74182715
## 1421  0.74182715
## 1422  0.74182715
## 1423  0.74182715
## 1424  0.74182715
## 1425  0.15499037
## 1426  0.15499037
## 1427  0.15499037
## 1428  0.15499037
## 1429  0.15499037
## 1430  0.15499037
## 1431  0.15499037
## 1432  0.15499037
## 1433  0.15499037
## 1434  0.15499037
## 1435  0.15499037
## 1436  0.15499037
## 1437  0.15499037
## 1438  0.15499037
## 1439  0.15499037
## 1440  0.15499037
## 1441  1.07349431
## 1442  1.07349431
## 1443  1.07349431
## 1444  1.07349431
## 1445  1.07349431
## 1446  1.07349431
## 1447  1.07349431
## 1448  1.07349431
## 1449  1.07349431
## 1450  1.07349431
## 1451  1.07349431
## 1452  1.07349431
## 1453  1.07349431
## 1454  1.07349431
## 1455  1.07349431
## 1456  1.07349431
## 1457  2.03806263
## 1458  2.03806263
## 1459  2.03806263
## 1460  2.03806263
## 1461  2.03806263
## 1462  2.03806263
## 1463  2.03806263
## 1464  2.03806263
## 1465  2.03806263
## 1466  2.03806263
## 1467  2.03806263
## 1468  2.03806263
## 1469  2.03806263
## 1470  2.03806263
## 1471  2.03806263
## 1472  2.03806263
## 1473  0.98441912
## 1474  0.98441912
## 1475  0.98441912
## 1476  0.98441912
## 1477  0.98441912
## 1478  0.98441912
## 1479  0.98441912
## 1480  0.98441912
## 1481  0.98441912
## 1482  0.98441912
## 1483  0.98441912
## 1484  0.98441912
## 1485  0.98441912
## 1486  0.98441912
## 1487  0.98441912
## 1488  0.98441912
## 1489  1.65935781
## 1490  1.65935781
## 1491  1.65935781
## 1492  1.65935781
## 1493  1.65935781
## 1494  1.65935781
## 1495  1.65935781
## 1496  1.65935781
## 1497  1.65935781
## 1498  1.65935781
## 1499  1.65935781
## 1500  1.65935781
## 1501  1.65935781
## 1502  1.65935781
## 1503  1.65935781
## 1504  1.65935781
## 1505  1.03271928
## 1506  1.03271928
## 1507  1.03271928
## 1508  1.03271928
## 1509  1.03271928
## 1510  1.03271928
## 1511  1.03271928
## 1512  1.03271928
## 1513  1.03271928
## 1514  1.03271928
## 1515  1.03271928
## 1516  1.03271928
## 1517  1.03271928
## 1518  1.03271928
## 1519  1.03271928
## 1520  1.03271928
## 1521  2.21953367
## 1522  2.21953367
## 1523  2.21953367
## 1524  2.21953367
## 1525  2.21953367
## 1526  2.21953367
## 1527  2.21953367
## 1528  2.21953367
## 1529  2.21953367
## 1530  2.21953367
## 1531  2.21953367
## 1532  2.21953367
## 1533  2.21953367
## 1534  2.21953367
## 1535  2.21953367
## 1536  2.21953367
## 1537  0.85278950
## 1538  0.85278950
## 1539  0.85278950
## 1540  0.85278950
## 1541  0.85278950
## 1542  0.85278950
## 1543  0.85278950
## 1544  0.85278950
## 1545  0.85278950
## 1546  0.85278950
## 1547  0.85278950
## 1548  0.85278950
## 1549  0.85278950
## 1550  0.85278950
## 1551  0.85278950
## 1552  0.85278950
## 1553  0.56920170
## 1554  0.56920170
## 1555  0.56920170
## 1556  0.56920170
## 1557  0.56920170
## 1558  0.56920170
## 1559  0.56920170
## 1560  0.56920170
## 1561  0.56920170
## 1562  0.56920170
## 1563  0.56920170
## 1564  0.56920170
## 1565  0.56920170
## 1566  0.56920170
## 1567  0.56920170
## 1568  0.56920170
## 1569  0.72828775
## 1570  0.72828775
## 1571  0.72828775
## 1572  0.72828775
## 1573  0.72828775
## 1574  0.72828775
## 1575  0.72828775
## 1576  0.72828775
## 1577  0.72828775
## 1578  0.72828775
## 1579  0.72828775
## 1580  0.72828775
## 1581  0.72828775
## 1582  0.72828775
## 1583  0.72828775
## 1584  0.72828775
## 1585  0.27174891
## 1586  0.27174891
## 1587  0.27174891
## 1588  0.27174891
## 1589  0.27174891
## 1590  0.27174891
## 1591  0.27174891
## 1592  0.27174891
## 1593  0.27174891
## 1594  0.27174891
## 1595  0.27174891
## 1596  0.27174891
## 1597  0.27174891
## 1598  0.27174891
## 1599  0.27174891
## 1600  0.27174891
## 1601  2.56739318
## 1602  2.56739318
## 1603  2.56739318
## 1604  2.56739318
## 1605  2.56739318
## 1606  2.56739318
## 1607  2.56739318
## 1608  2.56739318
## 1609  2.56739318
## 1610  2.56739318
## 1611  2.56739318
## 1612  2.56739318
## 1613  2.56739318
## 1614  2.56739318
## 1615  2.56739318
## 1616  2.56739318
## 1617  1.44178734
## 1618  1.44178734
## 1619  1.44178734
## 1620  1.44178734
## 1621  1.44178734
## 1622  1.44178734
## 1623  1.44178734
## 1624  1.44178734
## 1625  1.44178734
## 1626  1.44178734
## 1627  1.44178734
## 1628  1.44178734
## 1629  1.44178734
## 1630  1.44178734
## 1631  1.44178734
## 1632  1.44178734
## 1633  3.89558086
## 1634  3.89558086
## 1635  3.89558086
## 1636  3.89558086
## 1637  3.89558086
## 1638  3.89558086
## 1639  3.89558086
## 1640  3.89558086
## 1641  3.89558086
## 1642  3.89558086
## 1643  3.89558086
## 1644  3.89558086
## 1645  3.89558086
## 1646  3.89558086
## 1647  3.89558086
## 1648  3.89558086
## 1649  0.64114810
## 1650  0.64114810
## 1651  0.64114810
## 1652  0.64114810
## 1653  0.64114810
## 1654  0.64114810
## 1655  0.64114810
## 1656  0.64114810
## 1657  0.64114810
## 1658  0.64114810
## 1659  0.64114810
## 1660  0.64114810
## 1661  0.64114810
## 1662  0.64114810
## 1663  0.64114810
## 1664  0.64114810
## 1665  0.46523061
## 1666  0.46523061
## 1667  0.46523061
## 1668  0.46523061
## 1669  0.46523061
## 1670  0.46523061
## 1671  0.46523061
## 1672  0.46523061
## 1673  0.46523061
## 1674  0.46523061
## 1675  0.46523061
## 1676  0.46523061
## 1677  0.46523061
## 1678  0.46523061
## 1679  0.46523061
## 1680  0.46523061
## 1681  0.65322240
## 1682  0.65322240
## 1683  0.65322240
## 1684  0.65322240
## 1685  0.65322240
## 1686  0.65322240
## 1687  0.65322240
## 1688  0.65322240
## 1689  0.65322240
## 1690  0.65322240
## 1691  0.65322240
## 1692  0.65322240
## 1693  0.65322240
## 1694  0.65322240
## 1695  0.65322240
## 1696  0.65322240
## 1697  0.81200620
## 1698  0.81200620
## 1699  0.81200620
## 1700  0.81200620
## 1701  0.81200620
## 1702  0.81200620
## 1703  0.81200620
## 1704  0.81200620
## 1705  0.81200620
## 1706  0.81200620
## 1707  0.81200620
## 1708  0.81200620
## 1709  0.81200620
## 1710  0.81200620
## 1711  0.81200620
## 1712  0.81200620
## 1713  0.52252209
## 1714  0.52252209
## 1715  0.52252209
## 1716  0.52252209
## 1717  0.52252209
## 1718  0.52252209
## 1719  0.52252209
## 1720  0.52252209
## 1721  0.52252209
## 1722  0.52252209
## 1723  0.52252209
## 1724  0.52252209
## 1725  0.52252209
## 1726  0.52252209
## 1727  0.52252209
## 1728  0.52252209
## 1729  1.64093646
## 1730  1.64093646
## 1731  1.64093646
## 1732  1.64093646
## 1733  1.64093646
## 1734  1.64093646
## 1735  1.64093646
## 1736  1.64093646
## 1737  1.64093646
## 1738  1.64093646
## 1739  1.64093646
## 1740  1.64093646
## 1741  1.64093646
## 1742  1.64093646
## 1743  1.64093646
## 1744  1.64093646
## 1745  0.37884219
## 1746  0.37884219
## 1747  0.37884219
## 1748  0.37884219
## 1749  0.37884219
## 1750  0.37884219
## 1751  0.37884219
## 1752  0.37884219
## 1753  0.37884219
## 1754  0.37884219
## 1755  0.37884219
## 1756  0.37884219
## 1757  0.37884219
## 1758  0.37884219
## 1759  0.37884219
## 1760  0.37884219
## 1761  0.37612347
## 1762  0.37612347
## 1763  0.37612347
## 1764  0.37612347
## 1765  0.37612347
## 1766  0.37612347
## 1767  0.37612347
## 1768  0.37612347
## 1769  0.37612347
## 1770  0.37612347
## 1771  0.37612347
## 1772  0.37612347
## 1773  0.37612347
## 1774  0.37612347
## 1775  0.37612347
## 1776  0.37612347
## 1777  0.64676267
## 1778  0.64676267
## 1779  0.64676267
## 1780  0.64676267
## 1781  0.64676267
## 1782  0.64676267
## 1783  0.64676267
## 1784  0.64676267
## 1785  0.64676267
## 1786  0.64676267
## 1787  0.64676267
## 1788  0.64676267
## 1789  0.64676267
## 1790  0.64676267
## 1791  0.64676267
## 1792  0.64676267
## 1793  1.17047722
## 1794  1.17047722
## 1795  1.17047722
## 1796  1.17047722
## 1797  1.17047722
## 1798  1.17047722
## 1799  1.17047722
## 1800  1.17047722
## 1801  1.17047722
## 1802  1.17047722
## 1803  1.17047722
## 1804  1.17047722
## 1805  1.17047722
## 1806  1.17047722
## 1807  1.17047722
## 1808  1.17047722
## 1809  1.71821453
## 1810  1.71821453
## 1811  1.71821453
## 1812  1.71821453
## 1813  1.71821453
## 1814  1.71821453
## 1815  1.71821453
## 1816  1.71821453
## 1817  1.71821453
## 1818  1.71821453
## 1819  1.71821453
## 1820  1.71821453
## 1821  1.71821453
## 1822  1.71821453
## 1823  1.71821453
## 1824  1.71821453
## 1825  0.70064785
## 1826  0.70064785
## 1827  0.70064785
## 1828  0.70064785
## 1829  0.70064785
## 1830  0.70064785
## 1831  0.70064785
## 1832  0.70064785
## 1833  0.70064785
## 1834  0.70064785
## 1835  0.70064785
## 1836  0.70064785
## 1837  0.70064785
## 1838  0.70064785
## 1839  0.70064785
## 1840  0.70064785
## 1841  1.26208761
## 1842  1.26208761
## 1843  1.26208761
## 1844  1.26208761
## 1845  1.26208761
## 1846  1.26208761
## 1847  1.26208761
## 1848  1.26208761
## 1849  1.26208761
## 1850  1.26208761
## 1851  1.26208761
## 1852  1.26208761
## 1853  1.26208761
## 1854  1.26208761
## 1855  1.26208761
## 1856  1.26208761
## 1857  4.68538689
## 1858  4.68538689
## 1859  4.68538689
## 1860  4.68538689
## 1861  4.68538689
## 1862  4.68538689
## 1863  4.68538689
## 1864  4.68538689
## 1865  4.68538689
## 1866  4.68538689
## 1867  4.68538689
## 1868  4.68538689
## 1869  4.68538689
## 1870  4.68538689
## 1871  4.68538689
## 1872  4.68538689
## 1873  0.66846383
## 1874  0.66846383
## 1875  0.66846383
## 1876  0.66846383
## 1877  0.66846383
## 1878  0.66846383
## 1879  0.66846383
## 1880  0.66846383
## 1881  0.66846383
## 1882  0.66846383
## 1883  0.66846383
## 1884  0.66846383
## 1885  0.66846383
## 1886  0.66846383
## 1887  0.66846383
## 1888  0.66846383
## 1889  1.88978308
## 1890  1.88978308
## 1891  1.88978308
## 1892  1.88978308
## 1893  1.88978308
## 1894  1.88978308
## 1895  1.88978308
## 1896  1.88978308
## 1897  1.88978308
## 1898  1.88978308
## 1899  1.88978308
## 1900  1.88978308
## 1901  1.88978308
## 1902  1.88978308
## 1903  1.88978308
## 1904  1.88978308
## 1905  0.64749961
## 1906  0.64749961
## 1907  0.64749961
## 1908  0.64749961
## 1909  0.64749961
## 1910  0.64749961
## 1911  0.64749961
## 1912  0.64749961
## 1913  0.64749961
## 1914  0.64749961
## 1915  0.64749961
## 1916  0.64749961
## 1917  0.64749961
## 1918  0.64749961
## 1919  0.64749961
## 1920  0.64749961
## 1921  0.09633689
## 1922  0.09633689
## 1923  0.09633689
## 1924  0.09633689
## 1925  0.09633689
## 1926  0.09633689
## 1927  0.09633689
## 1928  0.09633689
## 1929  0.09633689
## 1930  0.09633689
## 1931  0.09633689
## 1932  0.09633689
## 1933  0.09633689
## 1934  0.09633689
## 1935  0.09633689
## 1936  0.09633689
## 1937  0.64790893
## 1938  0.64790893
## 1939  0.64790893
## 1940  0.64790893
## 1941  0.64790893
## 1942  0.64790893
## 1943  0.64790893
## 1944  0.64790893
## 1945  0.64790893
## 1946  0.64790893
## 1947  0.64790893
## 1948  0.64790893
## 1949  0.64790893
## 1950  0.64790893
## 1951  0.64790893
## 1952  0.64790893
## 1953  1.24892709
## 1954  1.24892709
## 1955  1.24892709
## 1956  1.24892709
## 1957  1.24892709
## 1958  1.24892709
## 1959  1.24892709
## 1960  1.24892709
## 1961  1.24892709
## 1962  1.24892709
## 1963  1.24892709
## 1964  1.24892709
## 1965  1.24892709
## 1966  1.24892709
## 1967  1.24892709
## 1968  1.24892709
## 1969  1.88673039
## 1970  1.88673039
## 1971  1.88673039
## 1972  1.88673039
## 1973  1.88673039
## 1974  1.88673039
## 1975  1.88673039
## 1976  1.88673039
## 1977  1.88673039
## 1978  1.88673039
## 1979  1.88673039
## 1980  1.88673039
## 1981  1.88673039
## 1982  1.88673039
## 1983  1.88673039
## 1984  1.88673039
## 1985  3.01368466
## 1986  3.01368466
## 1987  3.01368466
## 1988  3.01368466
## 1989  3.01368466
## 1990  3.01368466
## 1991  3.01368466
## 1992  3.01368466
## 1993  3.01368466
## 1994  3.01368466
## 1995  3.01368466
## 1996  3.01368466
## 1997  3.01368466
## 1998  3.01368466
## 1999  3.01368466
## 2000  3.01368466
## 2001  0.19337435
## 2002  0.19337435
## 2003  0.19337435
## 2004  0.19337435
## 2005  0.19337435
## 2006  0.19337435
## 2007  0.19337435
## 2008  0.19337435
## 2009  0.19337435
## 2010  0.19337435
## 2011  0.19337435
## 2012  0.19337435
## 2013  0.19337435
## 2014  0.19337435
## 2015  0.19337435
## 2016  0.19337435
## 2017  0.70147209
## 2018  0.70147209
## 2019  0.70147209
## 2020  0.70147209
## 2021  0.70147209
## 2022  0.70147209
## 2023  0.70147209
## 2024  0.70147209
## 2025  0.70147209
## 2026  0.70147209
## 2027  0.70147209
## 2028  0.70147209
## 2029  0.70147209
## 2030  0.70147209
## 2031  0.70147209
## 2032  0.70147209
## 2033  0.10445845
## 2034  0.10445845
## 2035  0.10445845
## 2036  0.10445845
## 2037  0.10445845
## 2038  0.10445845
## 2039  0.10445845
## 2040  0.10445845
## 2041  0.10445845
## 2042  0.10445845
## 2043  0.10445845
## 2044  0.10445845
## 2045  0.10445845
## 2046  0.10445845
## 2047  0.10445845
## 2048  0.10445845
## 2049  0.11838519
## 2050  0.11838519
## 2051  0.11838519
## 2052  0.11838519
## 2053  0.11838519
## 2054  0.11838519
## 2055  0.11838519
## 2056  0.11838519
## 2057  0.11838519
## 2058  0.11838519
## 2059  0.11838519
## 2060  0.11838519
## 2061  0.11838519
## 2062  0.11838519
## 2063  0.11838519
## 2064  0.11838519
## 2065  0.14067700
## 2066  0.14067700
## 2067  0.14067700
## 2068  0.14067700
## 2069  0.14067700
## 2070  0.14067700
## 2071  0.14067700
## 2072  0.14067700
## 2073  0.14067700
## 2074  0.14067700
## 2075  0.14067700
## 2076  0.14067700
## 2077  0.14067700
## 2078  0.14067700
## 2079  0.14067700
## 2080  0.14067700
## 2081  1.03805982
## 2082  1.03805982
## 2083  1.03805982
## 2084  1.03805982
## 2085  1.03805982
## 2086  1.03805982
## 2087  1.03805982
## 2088  1.03805982
## 2089  1.03805982
## 2090  1.03805982
## 2091  1.03805982
## 2092  1.03805982
## 2093  1.03805982
## 2094  1.03805982
## 2095  1.03805982
## 2096  1.03805982
## 2097  1.86744818
## 2098  1.86744818
## 2099  1.86744818
## 2100  1.86744818
## 2101  1.86744818
## 2102  1.86744818
## 2103  1.86744818
## 2104  1.86744818
## 2105  1.86744818
## 2106  1.86744818
## 2107  1.86744818
## 2108  1.86744818
## 2109  1.86744818
## 2110  1.86744818
## 2111  1.86744818
## 2112  1.86744818
## 2113  1.12800227
## 2114  1.12800227
## 2115  1.12800227
## 2116  1.12800227
## 2117  1.12800227
## 2118  1.12800227
## 2119  1.12800227
## 2120  1.12800227
## 2121  1.12800227
## 2122  1.12800227
## 2123  1.12800227
## 2124  1.12800227
## 2125  1.12800227
## 2126  1.12800227
## 2127  1.12800227
## 2128  1.12800227
## 2129  2.24267236
## 2130  2.24267236
## 2131  2.24267236
## 2132  2.24267236
## 2133  2.24267236
## 2134  2.24267236
## 2135  2.24267236
## 2136  2.24267236
## 2137  2.24267236
## 2138  2.24267236
## 2139  2.24267236
## 2140  2.24267236
## 2141  2.24267236
## 2142  2.24267236
## 2143  2.24267236
## 2144  2.24267236
## 2145  0.10574024
## 2146  0.10574024
## 2147  0.10574024
## 2148  0.10574024
## 2149  0.10574024
## 2150  0.10574024
## 2151  0.10574024
## 2152  0.10574024
## 2153  0.10574024
## 2154  0.10574024
## 2155  0.10574024
## 2156  0.10574024
## 2157  0.10574024
## 2158  0.10574024
## 2159  0.10574024
## 2160  0.10574024
## 2161  0.58616002
## 2162  0.58616002
## 2163  0.58616002
## 2164  0.58616002
## 2165  0.58616002
## 2166  0.58616002
## 2167  0.58616002
## 2168  0.58616002
## 2169  0.58616002
## 2170  0.58616002
## 2171  0.58616002
## 2172  0.58616002
## 2173  0.58616002
## 2174  0.58616002
## 2175  0.58616002
## 2176  0.58616002
## 2177  0.74702563
## 2178  0.74702563
## 2179  0.74702563
## 2180  0.74702563
## 2181  0.74702563
## 2182  0.74702563
## 2183  0.74702563
## 2184  0.74702563
## 2185  0.74702563
## 2186  0.74702563
## 2187  0.74702563
## 2188  0.74702563
## 2189  0.74702563
## 2190  0.74702563
## 2191  0.74702563
## 2192  0.74702563
## 2193  0.20370313
## 2194  0.20370313
## 2195  0.20370313
## 2196  0.20370313
## 2197  0.20370313
## 2198  0.20370313
## 2199  0.20370313
## 2200  0.20370313
## 2201  0.20370313
## 2202  0.20370313
## 2203  0.20370313
## 2204  0.20370313
## 2205  0.20370313
## 2206  0.20370313
## 2207  0.20370313
## 2208  0.20370313
## 2209  1.26924016
## 2210  1.26924016
## 2211  1.26924016
## 2212  1.26924016
## 2213  1.26924016
## 2214  1.26924016
## 2215  1.26924016
## 2216  1.26924016
## 2217  1.26924016
## 2218  1.26924016
## 2219  1.26924016
## 2220  1.26924016
## 2221  1.26924016
## 2222  1.26924016
## 2223  1.26924016
## 2224  1.26924016
## 2225  0.11796891
## 2226  0.11796891
## 2227  0.11796891
## 2228  0.11796891
## 2229  0.11796891
## 2230  0.11796891
## 2231  0.11796891
## 2232  0.11796891
## 2233  0.11796891
## 2234  0.11796891
## 2235  0.11796891
## 2236  0.11796891
## 2237  0.11796891
## 2238  0.11796891
## 2239  0.11796891
## 2240  0.11796891
## 2241  1.23185919
## 2242  1.23185919
## 2243  1.23185919
## 2244  1.23185919
## 2245  1.23185919
## 2246  1.23185919
## 2247  1.23185919
## 2248  1.23185919
## 2249  1.23185919
## 2250  1.23185919
## 2251  1.23185919
## 2252  1.23185919
## 2253  1.23185919
## 2254  1.23185919
## 2255  1.23185919
## 2256  1.23185919
## 2257  0.84803332
## 2258  0.84803332
## 2259  0.84803332
## 2260  0.84803332
## 2261  0.84803332
## 2262  0.84803332
## 2263  0.84803332
## 2264  0.84803332
## 2265  0.84803332
## 2266  0.84803332
## 2267  0.84803332
## 2268  0.84803332
## 2269  0.84803332
## 2270  0.84803332
## 2271  0.84803332
## 2272  0.84803332
## 2273  0.30066601
## 2274  0.30066601
## 2275  0.30066601
## 2276  0.30066601
## 2277  0.30066601
## 2278  0.30066601
## 2279  0.30066601
## 2280  0.30066601
## 2281  0.30066601
## 2282  0.30066601
## 2283  0.30066601
## 2284  0.30066601
## 2285  0.30066601
## 2286  0.30066601
## 2287  0.30066601
## 2288  0.30066601
## 2289  0.83988505
## 2290  0.83988505
## 2291  0.83988505
## 2292  0.83988505
## 2293  0.83988505
## 2294  0.83988505
## 2295  0.83988505
## 2296  0.83988505
## 2297  0.83988505
## 2298  0.83988505
## 2299  0.83988505
## 2300  0.83988505
## 2301  0.83988505
## 2302  0.83988505
## 2303  0.83988505
## 2304  0.83988505
## 2305  3.06516466
## 2306  3.06516466
## 2307  3.06516466
## 2308  3.06516466
## 2309  3.06516466
## 2310  3.06516466
## 2311  3.06516466
## 2312  3.06516466
## 2313  3.06516466
## 2314  3.06516466
## 2315  3.06516466
## 2316  3.06516466
## 2317  3.06516466
## 2318  3.06516466
## 2319  3.06516466
## 2320  3.06516466
## 2321  0.68193842
## 2322  0.68193842
## 2323  0.68193842
## 2324  0.68193842
## 2325  0.68193842
## 2326  0.68193842
## 2327  0.68193842
## 2328  0.68193842
## 2329  0.68193842
## 2330  0.68193842
## 2331  0.68193842
## 2332  0.68193842
## 2333  0.68193842
## 2334  0.68193842
## 2335  0.68193842
## 2336  0.68193842
## 2337  1.03279351
## 2338  1.03279351
## 2339  1.03279351
## 2340  1.03279351
## 2341  1.03279351
## 2342  1.03279351
## 2343  1.03279351
## 2344  1.03279351
## 2345  1.03279351
## 2346  1.03279351
## 2347  1.03279351
## 2348  1.03279351
## 2349  1.03279351
## 2350  1.03279351
## 2351  1.03279351
## 2352  1.03279351
## 2353  0.30751062
## 2354  0.30751062
## 2355  0.30751062
## 2356  0.30751062
## 2357  0.30751062
## 2358  0.30751062
## 2359  0.30751062
## 2360  0.30751062
## 2361  0.30751062
## 2362  0.30751062
## 2363  0.30751062
## 2364  0.30751062
## 2365  0.30751062
## 2366  0.30751062
## 2367  0.30751062
## 2368  0.30751062
## 2369  1.72242329
## 2370  1.72242329
## 2371  1.72242329
## 2372  1.72242329
## 2373  1.72242329
## 2374  1.72242329
## 2375  1.72242329
## 2376  1.72242329
## 2377  1.72242329
## 2378  1.72242329
## 2379  1.72242329
## 2380  1.72242329
## 2381  1.72242329
## 2382  1.72242329
## 2383  1.72242329
## 2384  1.72242329
## 2385  1.47863269
## 2386  1.47863269
## 2387  1.47863269
## 2388  1.47863269
## 2389  1.47863269
## 2390  1.47863269
## 2391  1.47863269
## 2392  1.47863269
## 2393  1.47863269
## 2394  1.47863269
## 2395  1.47863269
## 2396  1.47863269
## 2397  1.47863269
## 2398  1.47863269
## 2399  1.47863269
## 2400  1.47863269
## 2401  1.30725469
## 2402  1.30725469
## 2403  1.30725469
## 2404  1.30725469
## 2405  1.30725469
## 2406  1.30725469
## 2407  1.30725469
## 2408  1.30725469
## 2409  1.30725469
## 2410  1.30725469
## 2411  1.30725469
## 2412  1.30725469
## 2413  1.30725469
## 2414  1.30725469
## 2415  1.30725469
## 2416  1.30725469
## 2417  2.55928360
## 2418  2.55928360
## 2419  2.55928360
## 2420  2.55928360
## 2421  2.55928360
## 2422  2.55928360
## 2423  2.55928360
## 2424  2.55928360
## 2425  2.55928360
## 2426  2.55928360
## 2427  2.55928360
## 2428  2.55928360
## 2429  2.55928360
## 2430  2.55928360
## 2431  2.55928360
## 2432  2.55928360
## 2433  0.40365935
## 2434  0.40365935
## 2435  0.40365935
## 2436  0.40365935
## 2437  0.40365935
## 2438  0.40365935
## 2439  0.40365935
## 2440  0.40365935
## 2441  0.40365935
## 2442  0.40365935
## 2443  0.40365935
## 2444  0.40365935
## 2445  0.40365935
## 2446  0.40365935
## 2447  0.40365935
## 2448  0.40365935
## 2449  0.36746765
## 2450  0.36746765
## 2451  0.36746765
## 2452  0.36746765
## 2453  0.36746765
## 2454  0.36746765
## 2455  0.36746765
## 2456  0.36746765
## 2457  0.36746765
## 2458  0.36746765
## 2459  0.36746765
## 2460  0.36746765
## 2461  0.36746765
## 2462  0.36746765
## 2463  0.36746765
## 2464  0.36746765
## 2465  0.49561426
## 2466  0.49561426
## 2467  0.49561426
## 2468  0.49561426
## 2469  0.49561426
## 2470  0.49561426
## 2471  0.49561426
## 2472  0.49561426
## 2473  0.49561426
## 2474  0.49561426
## 2475  0.49561426
## 2476  0.49561426
## 2477  0.49561426
## 2478  0.49561426
## 2479  0.49561426
## 2480  0.49561426
## 2481  1.06155230
## 2482  1.06155230
## 2483  1.06155230
## 2484  1.06155230
## 2485  1.06155230
## 2486  1.06155230
## 2487  1.06155230
## 2488  1.06155230
## 2489  1.06155230
## 2490  1.06155230
## 2491  1.06155230
## 2492  1.06155230
## 2493  1.06155230
## 2494  1.06155230
## 2495  1.06155230
## 2496  1.06155230
## 2497  2.34112109
## 2498  2.34112109
## 2499  2.34112109
## 2500  2.34112109
## 2501  2.34112109
## 2502  2.34112109
## 2503  2.34112109
## 2504  2.34112109
## 2505  2.34112109
## 2506  2.34112109
## 2507  2.34112109
## 2508  2.34112109
## 2509  2.34112109
## 2510  2.34112109
## 2511  2.34112109
## 2512  2.34112109
## 2513  0.76028862
## 2514  0.76028862
## 2515  0.76028862
## 2516  0.76028862
## 2517  0.76028862
## 2518  0.76028862
## 2519  0.76028862
## 2520  0.76028862
## 2521  0.76028862
## 2522  0.76028862
## 2523  0.76028862
## 2524  0.76028862
## 2525  0.76028862
## 2526  0.76028862
## 2527  0.76028862
## 2528  0.76028862
## 2529  0.70690944
## 2530  0.70690944
## 2531  0.70690944
## 2532  0.70690944
## 2533  0.70690944
## 2534  0.70690944
## 2535  0.70690944
## 2536  0.70690944
## 2537  0.70690944
## 2538  0.70690944
## 2539  0.70690944
## 2540  0.70690944
## 2541  0.70690944
## 2542  0.70690944
## 2543  0.70690944
## 2544  0.70690944
## 2545  3.73238347
## 2546  3.73238347
## 2547  3.73238347
## 2548  3.73238347
## 2549  3.73238347
## 2550  3.73238347
## 2551  3.73238347
## 2552  3.73238347
## 2553  3.73238347
## 2554  3.73238347
## 2555  3.73238347
## 2556  3.73238347
## 2557  3.73238347
## 2558  3.73238347
## 2559  3.73238347
## 2560  3.73238347
## 2561  0.61869411
## 2562  0.61869411
## 2563  0.61869411
## 2564  0.61869411
## 2565  0.61869411
## 2566  0.61869411
## 2567  0.61869411
## 2568  0.61869411
## 2569  0.61869411
## 2570  0.61869411
## 2571  0.61869411
## 2572  0.61869411
## 2573  0.61869411
## 2574  0.61869411
## 2575  0.61869411
## 2576  0.61869411
## 2577  0.38631384
## 2578  0.38631384
## 2579  0.38631384
## 2580  0.38631384
## 2581  0.38631384
## 2582  0.38631384
## 2583  0.38631384
## 2584  0.38631384
## 2585  0.38631384
## 2586  0.38631384
## 2587  0.38631384
## 2588  0.38631384
## 2589  0.38631384
## 2590  0.38631384
## 2591  0.38631384
## 2592  0.38631384
## 2593  2.19674147
## 2594  2.19674147
## 2595  2.19674147
## 2596  2.19674147
## 2597  2.19674147
## 2598  2.19674147
## 2599  2.19674147
## 2600  2.19674147
## 2601  2.19674147
## 2602  2.19674147
## 2603  2.19674147
## 2604  2.19674147
## 2605  2.19674147
## 2606  2.19674147
## 2607  2.19674147
## 2608  2.19674147
## 2609  1.00972985
## 2610  1.00972985
## 2611  1.00972985
## 2612  1.00972985
## 2613  1.00972985
## 2614  1.00972985
## 2615  1.00972985
## 2616  1.00972985
## 2617  1.00972985
## 2618  1.00972985
## 2619  1.00972985
## 2620  1.00972985
## 2621  1.00972985
## 2622  1.00972985
## 2623  1.00972985
## 2624  1.00972985
## 2625  0.57678939
## 2626  0.57678939
## 2627  0.57678939
## 2628  0.57678939
## 2629  0.57678939
## 2630  0.57678939
## 2631  0.57678939
## 2632  0.57678939
## 2633  0.57678939
## 2634  0.57678939
## 2635  0.57678939
## 2636  0.57678939
## 2637  0.57678939
## 2638  0.57678939
## 2639  0.57678939
## 2640  0.57678939
## 2641  0.33079352
## 2642  0.33079352
## 2643  0.33079352
## 2644  0.33079352
## 2645  0.33079352
## 2646  0.33079352
## 2647  0.33079352
## 2648  0.33079352
## 2649  0.33079352
## 2650  0.33079352
## 2651  0.33079352
## 2652  0.33079352
## 2653  0.33079352
## 2654  0.33079352
## 2655  0.33079352
## 2656  0.33079352
## 2657  0.25115778
## 2658  0.25115778
## 2659  0.25115778
## 2660  0.25115778
## 2661  0.25115778
## 2662  0.25115778
## 2663  0.25115778
## 2664  0.25115778
## 2665  0.25115778
## 2666  0.25115778
## 2667  0.25115778
## 2668  0.25115778
## 2669  0.25115778
## 2670  0.25115778
## 2671  0.25115778
## 2672  0.25115778
## 2673  1.82025177
## 2674  1.82025177
## 2675  1.82025177
## 2676  1.82025177
## 2677  1.82025177
## 2678  1.82025177
## 2679  1.82025177
## 2680  1.82025177
## 2681  1.82025177
## 2682  1.82025177
## 2683  1.82025177
## 2684  1.82025177
## 2685  1.82025177
## 2686  1.82025177
## 2687  1.82025177
## 2688  1.82025177
## 2689  1.08376374
## 2690  1.08376374
## 2691  1.08376374
## 2692  1.08376374
## 2693  1.08376374
## 2694  1.08376374
## 2695  1.08376374
## 2696  1.08376374
## 2697  1.08376374
## 2698  1.08376374
## 2699  1.08376374
## 2700  1.08376374
## 2701  1.08376374
## 2702  1.08376374
## 2703  1.08376374
## 2704  1.08376374
## 2705  1.59057774
## 2706  1.59057774
## 2707  1.59057774
## 2708  1.59057774
## 2709  1.59057774
## 2710  1.59057774
## 2711  1.59057774
## 2712  1.59057774
## 2713  1.59057774
## 2714  1.59057774
## 2715  1.59057774
## 2716  1.59057774
## 2717  1.59057774
## 2718  1.59057774
## 2719  1.59057774
## 2720  1.59057774
## 2721  0.79538149
## 2722  0.79538149
## 2723  0.79538149
## 2724  0.79538149
## 2725  0.79538149
## 2726  0.79538149
## 2727  0.79538149
## 2728  0.79538149
## 2729  0.79538149
## 2730  0.79538149
## 2731  0.79538149
## 2732  0.79538149
## 2733  0.79538149
## 2734  0.79538149
## 2735  0.79538149
## 2736  0.79538149
## 2737  1.13297947
## 2738  1.13297947
## 2739  1.13297947
## 2740  1.13297947
## 2741  1.13297947
## 2742  1.13297947
## 2743  1.13297947
## 2744  1.13297947
## 2745  1.13297947
## 2746  1.13297947
## 2747  1.13297947
## 2748  1.13297947
## 2749  1.13297947
## 2750  1.13297947
## 2751  1.13297947
## 2752  1.13297947
## 2753  0.58186178
## 2754  0.58186178
## 2755  0.58186178
## 2756  0.58186178
## 2757  0.58186178
## 2758  0.58186178
## 2759  0.58186178
## 2760  0.58186178
## 2761  0.58186178
## 2762  0.58186178
## 2763  0.58186178
## 2764  0.58186178
## 2765  0.58186178
## 2766  0.58186178
## 2767  0.58186178
## 2768  0.58186178
## 2769  0.70899011
## 2770  0.70899011
## 2771  0.70899011
## 2772  0.70899011
## 2773  0.70899011
## 2774  0.70899011
## 2775  0.70899011
## 2776  0.70899011
## 2777  0.70899011
## 2778  0.70899011
## 2779  0.70899011
## 2780  0.70899011
## 2781  0.70899011
## 2782  0.70899011
## 2783  0.70899011
## 2784  0.70899011
## 2785  0.15416565
## 2786  0.15416565
## 2787  0.15416565
## 2788  0.15416565
## 2789  0.15416565
## 2790  0.15416565
## 2791  0.15416565
## 2792  0.15416565
## 2793  0.15416565
## 2794  0.15416565
## 2795  0.15416565
## 2796  0.15416565
## 2797  0.15416565
## 2798  0.15416565
## 2799  0.15416565
## 2800  0.15416565
## 2801  0.88255115
## 2802  0.88255115
## 2803  0.88255115
## 2804  0.88255115
## 2805  0.88255115
## 2806  0.88255115
## 2807  0.88255115
## 2808  0.88255115
## 2809  0.88255115
## 2810  0.88255115
## 2811  0.88255115
## 2812  0.88255115
## 2813  0.88255115
## 2814  0.88255115
## 2815  0.88255115
## 2816  0.88255115
## 2817  0.33325530
## 2818  0.33325530
## 2819  0.33325530
## 2820  0.33325530
## 2821  0.33325530
## 2822  0.33325530
## 2823  0.33325530
## 2824  0.33325530
## 2825  0.33325530
## 2826  0.33325530
## 2827  0.33325530
## 2828  0.33325530
## 2829  0.33325530
## 2830  0.33325530
## 2831  0.33325530
## 2832  0.33325530
## 2833  1.02369080
## 2834  1.02369080
## 2835  1.02369080
## 2836  1.02369080
## 2837  1.02369080
## 2838  1.02369080
## 2839  1.02369080
## 2840  1.02369080
## 2841  1.02369080
## 2842  1.02369080
## 2843  1.02369080
## 2844  1.02369080
## 2845  1.02369080
## 2846  1.02369080
## 2847  1.02369080
## 2848  1.02369080
## 2849  1.09007383
## 2850  1.09007383
## 2851  1.09007383
## 2852  1.09007383
## 2853  1.09007383
## 2854  1.09007383
## 2855  1.09007383
## 2856  1.09007383
## 2857  1.09007383
## 2858  1.09007383
## 2859  1.09007383
## 2860  1.09007383
## 2861  1.09007383
## 2862  1.09007383
## 2863  1.09007383
## 2864  1.09007383
## 2865  0.45291347
## 2866  0.45291347
## 2867  0.45291347
## 2868  0.45291347
## 2869  0.45291347
## 2870  0.45291347
## 2871  0.45291347
## 2872  0.45291347
## 2873  0.45291347
## 2874  0.45291347
## 2875  0.45291347
## 2876  0.45291347
## 2877  0.45291347
## 2878  0.45291347
## 2879  0.45291347
## 2880  0.45291347
## 2881  0.32461049
## 2882  0.32461049
## 2883  0.32461049
## 2884  0.32461049
## 2885  0.32461049
## 2886  0.32461049
## 2887  0.32461049
## 2888  0.32461049
## 2889  0.32461049
## 2890  0.32461049
## 2891  0.32461049
## 2892  0.32461049
## 2893  0.32461049
## 2894  0.32461049
## 2895  0.32461049
## 2896  0.32461049
## 2897  1.34211549
## 2898  1.34211549
## 2899  1.34211549
## 2900  1.34211549
## 2901  1.34211549
## 2902  1.34211549
## 2903  1.34211549
## 2904  1.34211549
## 2905  1.34211549
## 2906  1.34211549
## 2907  1.34211549
## 2908  1.34211549
## 2909  1.34211549
## 2910  1.34211549
## 2911  1.34211549
## 2912  1.34211549
## 2913  1.87611273
## 2914  1.87611273
## 2915  1.87611273
## 2916  1.87611273
## 2917  1.87611273
## 2918  1.87611273
## 2919  1.87611273
## 2920  1.87611273
## 2921  1.87611273
## 2922  1.87611273
## 2923  1.87611273
## 2924  1.87611273
## 2925  1.87611273
## 2926  1.87611273
## 2927  1.87611273
## 2928  1.87611273
## 2929  2.95914509
## 2930  2.95914509
## 2931  2.95914509
## 2932  2.95914509
## 2933  2.95914509
## 2934  2.95914509
## 2935  2.95914509
## 2936  2.95914509
## 2937  2.95914509
## 2938  2.95914509
## 2939  2.95914509
## 2940  2.95914509
## 2941  2.95914509
## 2942  2.95914509
## 2943  2.95914509
## 2944  2.95914509
## 2945  0.38332712
## 2946  0.38332712
## 2947  0.38332712
## 2948  0.38332712
## 2949  0.38332712
## 2950  0.38332712
## 2951  0.38332712
## 2952  0.38332712
## 2953  0.38332712
## 2954  0.38332712
## 2955  0.38332712
## 2956  0.38332712
## 2957  0.38332712
## 2958  0.38332712
## 2959  0.38332712
## 2960  0.38332712
## 2961  0.77180029
## 2962  0.77180029
## 2963  0.77180029
## 2964  0.77180029
## 2965  0.77180029
## 2966  0.77180029
## 2967  0.77180029
## 2968  0.77180029
## 2969  0.77180029
## 2970  0.77180029
## 2971  0.77180029
## 2972  0.77180029
## 2973  0.77180029
## 2974  0.77180029
## 2975  0.77180029
## 2976  0.77180029
## 2977  0.18853321
## 2978  0.18853321
## 2979  0.18853321
## 2980  0.18853321
## 2981  0.18853321
## 2982  0.18853321
## 2983  0.18853321
## 2984  0.18853321
## 2985  0.18853321
## 2986  0.18853321
## 2987  0.18853321
## 2988  0.18853321
## 2989  0.18853321
## 2990  0.18853321
## 2991  0.18853321
## 2992  0.18853321
## 2993  0.44873354
## 2994  0.44873354
## 2995  0.44873354
## 2996  0.44873354
## 2997  0.44873354
## 2998  0.44873354
## 2999  0.44873354
## 3000  0.44873354
## 3001  0.44873354
## 3002  0.44873354
## 3003  0.44873354
## 3004  0.44873354
## 3005  0.44873354
## 3006  0.44873354
## 3007  0.44873354
## 3008  0.44873354
## 3009  0.61049491
## 3010  0.61049491
## 3011  0.61049491
## 3012  0.61049491
## 3013  0.61049491
## 3014  0.61049491
## 3015  0.61049491
## 3016  0.61049491
## 3017  0.61049491
## 3018  0.61049491
## 3019  0.61049491
## 3020  0.61049491
## 3021  0.61049491
## 3022  0.61049491
## 3023  0.61049491
## 3024  0.61049491
## 3025  1.95847074
## 3026  1.95847074
## 3027  1.95847074
## 3028  1.95847074
## 3029  1.95847074
## 3030  1.95847074
## 3031  1.95847074
## 3032  1.95847074
## 3033  1.95847074
## 3034  1.95847074
## 3035  1.95847074
## 3036  1.95847074
## 3037  1.95847074
## 3038  1.95847074
## 3039  1.95847074
## 3040  1.95847074
## 3041  2.28030572
## 3042  2.28030572
## 3043  2.28030572
## 3044  2.28030572
## 3045  2.28030572
## 3046  2.28030572
## 3047  2.28030572
## 3048  2.28030572
## 3049  2.28030572
## 3050  2.28030572
## 3051  2.28030572
## 3052  2.28030572
## 3053  2.28030572
## 3054  2.28030572
## 3055  2.28030572
## 3056  2.28030572
## 3057  0.31397019
## 3058  0.31397019
## 3059  0.31397019
## 3060  0.31397019
## 3061  0.31397019
## 3062  0.31397019
## 3063  0.31397019
## 3064  0.31397019
## 3065  0.31397019
## 3066  0.31397019
## 3067  0.31397019
## 3068  0.31397019
## 3069  0.31397019
## 3070  0.31397019
## 3071  0.31397019
## 3072  0.31397019
## 3073  1.23992397
## 3074  1.23992397
## 3075  1.23992397
## 3076  1.23992397
## 3077  1.23992397
## 3078  1.23992397
## 3079  1.23992397
## 3080  1.23992397
## 3081  1.23992397
## 3082  1.23992397
## 3083  1.23992397
## 3084  1.23992397
## 3085  1.23992397
## 3086  1.23992397
## 3087  1.23992397
## 3088  1.23992397
## 3089  0.46638512
## 3090  0.46638512
## 3091  0.46638512
## 3092  0.46638512
## 3093  0.46638512
## 3094  0.46638512
## 3095  0.46638512
## 3096  0.46638512
## 3097  0.46638512
## 3098  0.46638512
## 3099  0.46638512
## 3100  0.46638512
## 3101  0.46638512
## 3102  0.46638512
## 3103  0.46638512
## 3104  0.46638512
## 3105  0.27081991
## 3106  0.27081991
## 3107  0.27081991
## 3108  0.27081991
## 3109  0.27081991
## 3110  0.27081991
## 3111  0.27081991
## 3112  0.27081991
## 3113  0.27081991
## 3114  0.27081991
## 3115  0.27081991
## 3116  0.27081991
## 3117  0.27081991
## 3118  0.27081991
## 3119  0.27081991
## 3120  0.27081991
## 3121  0.75301971
## 3122  0.75301971
## 3123  0.75301971
## 3124  0.75301971
## 3125  0.75301971
## 3126  0.75301971
## 3127  0.75301971
## 3128  0.75301971
## 3129  0.75301971
## 3130  0.75301971
## 3131  0.75301971
## 3132  0.75301971
## 3133  0.75301971
## 3134  0.75301971
## 3135  0.75301971
## 3136  0.75301971
## 3137  2.51356379
## 3138  2.51356379
## 3139  2.51356379
## 3140  2.51356379
## 3141  2.51356379
## 3142  2.51356379
## 3143  2.51356379
## 3144  2.51356379
## 3145  2.51356379
## 3146  2.51356379
## 3147  2.51356379
## 3148  2.51356379
## 3149  2.51356379
## 3150  2.51356379
## 3151  2.51356379
## 3152  2.51356379
## 3153  0.41644354
## 3154  0.41644354
## 3155  0.41644354
## 3156  0.41644354
## 3157  0.41644354
## 3158  0.41644354
## 3159  0.41644354
## 3160  0.41644354
## 3161  0.41644354
## 3162  0.41644354
## 3163  0.41644354
## 3164  0.41644354
## 3165  0.41644354
## 3166  0.41644354
## 3167  0.41644354
## 3168  0.41644354
## 3169  0.36216776
## 3170  0.36216776
## 3171  0.36216776
## 3172  0.36216776
## 3173  0.36216776
## 3174  0.36216776
## 3175  0.36216776
## 3176  0.36216776
## 3177  0.36216776
## 3178  0.36216776
## 3179  0.36216776
## 3180  0.36216776
## 3181  0.36216776
## 3182  0.36216776
## 3183  0.36216776
## 3184  0.36216776
## 3185  0.36227054
## 3186  0.36227054
## 3187  0.36227054
## 3188  0.36227054
## 3189  0.36227054
## 3190  0.36227054
## 3191  0.36227054
## 3192  0.36227054
## 3193  0.36227054
## 3194  0.36227054
## 3195  0.36227054
## 3196  0.36227054
## 3197  0.36227054
## 3198  0.36227054
## 3199  0.36227054
## 3200  0.36227054
## 3201  0.70341079
## 3202  0.70341079
## 3203  0.70341079
## 3204  0.70341079
## 3205  0.70341079
## 3206  0.70341079
## 3207  0.70341079
## 3208  0.70341079
## 3209  0.70341079
## 3210  0.70341079
## 3211  0.70341079
## 3212  0.70341079
## 3213  0.70341079
## 3214  0.70341079
## 3215  0.70341079
## 3216  0.70341079
## 3217  0.49908983
## 3218  0.49908983
## 3219  0.49908983
## 3220  0.49908983
## 3221  0.49908983
## 3222  0.49908983
## 3223  0.49908983
## 3224  0.49908983
## 3225  0.49908983
## 3226  0.49908983
## 3227  0.49908983
## 3228  0.49908983
## 3229  0.49908983
## 3230  0.49908983
## 3231  0.49908983
## 3232  0.49908983
## 3233  1.19853850
## 3234  1.19853850
## 3235  1.19853850
## 3236  1.19853850
## 3237  1.19853850
## 3238  1.19853850
## 3239  1.19853850
## 3240  1.19853850
## 3241  1.19853850
## 3242  1.19853850
## 3243  1.19853850
## 3244  1.19853850
## 3245  1.19853850
## 3246  1.19853850
## 3247  1.19853850
## 3248  1.19853850
## 3249  0.93078698
## 3250  0.93078698
## 3251  0.93078698
## 3252  0.93078698
## 3253  0.93078698
## 3254  0.93078698
## 3255  0.93078698
## 3256  0.93078698
## 3257  0.93078698
## 3258  0.93078698
## 3259  0.93078698
## 3260  0.93078698
## 3261  0.93078698
## 3262  0.93078698
## 3263  0.93078698
## 3264  0.93078698
## 3265  3.87778277
## 3266  3.87778277
## 3267  3.87778277
## 3268  3.87778277
## 3269  3.87778277
## 3270  3.87778277
## 3271  3.87778277
## 3272  3.87778277
## 3273  3.87778277
## 3274  3.87778277
## 3275  3.87778277
## 3276  3.87778277
## 3277  3.87778277
## 3278  3.87778277
## 3279  3.87778277
## 3280  3.87778277
## 3281  1.09162473
## 3282  1.09162473
## 3283  1.09162473
## 3284  1.09162473
## 3285  1.09162473
## 3286  1.09162473
## 3287  1.09162473
## 3288  1.09162473
## 3289  1.09162473
## 3290  1.09162473
## 3291  1.09162473
## 3292  1.09162473
## 3293  1.09162473
## 3294  1.09162473
## 3295  1.09162473
## 3296  1.09162473
## 3297  0.40764934
## 3298  0.40764934
## 3299  0.40764934
## 3300  0.40764934
## 3301  0.40764934
## 3302  0.40764934
## 3303  0.40764934
## 3304  0.40764934
## 3305  0.40764934
## 3306  0.40764934
## 3307  0.40764934
## 3308  0.40764934
## 3309  0.40764934
## 3310  0.40764934
## 3311  0.40764934
## 3312  0.40764934
## 3313  0.67893904
## 3314  0.67893904
## 3315  0.67893904
## 3316  0.67893904
## 3317  0.67893904
## 3318  0.67893904
## 3319  0.67893904
## 3320  0.67893904
## 3321  0.67893904
## 3322  0.67893904
## 3323  0.67893904
## 3324  0.67893904
## 3325  0.67893904
## 3326  0.67893904
## 3327  0.67893904
## 3328  0.67893904
## 3329  0.52634002
## 3330  0.52634002
## 3331  0.52634002
## 3332  0.52634002
## 3333  0.52634002
## 3334  0.52634002
## 3335  0.52634002
## 3336  0.52634002
## 3337  0.52634002
## 3338  0.52634002
## 3339  0.52634002
## 3340  0.52634002
## 3341  0.52634002
## 3342  0.52634002
## 3343  0.52634002
## 3344  0.52634002
## 3345  0.78428212
## 3346  0.78428212
## 3347  0.78428212
## 3348  0.78428212
## 3349  0.78428212
## 3350  0.78428212
## 3351  0.78428212
## 3352  0.78428212
## 3353  0.78428212
## 3354  0.78428212
## 3355  0.78428212
## 3356  0.78428212
## 3357  0.78428212
## 3358  0.78428212
## 3359  0.78428212
## 3360  0.78428212
## 3361  0.89916842
## 3362  0.89916842
## 3363  0.89916842
## 3364  0.89916842
## 3365  0.89916842
## 3366  0.89916842
## 3367  0.89916842
## 3368  0.89916842
## 3369  0.89916842
## 3370  0.89916842
## 3371  0.89916842
## 3372  0.89916842
## 3373  0.89916842
## 3374  0.89916842
## 3375  0.89916842
## 3376  0.89916842
## 3377  2.07202150
## 3378  2.07202150
## 3379  2.07202150
## 3380  2.07202150
## 3381  2.07202150
## 3382  2.07202150
## 3383  2.07202150
## 3384  2.07202150
## 3385  2.07202150
## 3386  2.07202150
## 3387  2.07202150
## 3388  2.07202150
## 3389  2.07202150
## 3390  2.07202150
## 3391  2.07202150
## 3392  2.07202150
## 3393  0.46756993
## 3394  0.46756993
## 3395  0.46756993
## 3396  0.46756993
## 3397  0.46756993
## 3398  0.46756993
## 3399  0.46756993
## 3400  0.46756993
## 3401  0.46756993
## 3402  0.46756993
## 3403  0.46756993
## 3404  0.46756993
## 3405  0.46756993
## 3406  0.46756993
## 3407  0.46756993
## 3408  0.46756993
## 3409  1.13527775
## 3410  1.13527775
## 3411  1.13527775
## 3412  1.13527775
## 3413  1.13527775
## 3414  1.13527775
## 3415  1.13527775
## 3416  1.13527775
## 3417  1.13527775
## 3418  1.13527775
## 3419  1.13527775
## 3420  1.13527775
## 3421  1.13527775
## 3422  1.13527775
## 3423  1.13527775
## 3424  1.13527775
## 3425  0.44025057
## 3426  0.44025057
## 3427  0.44025057
## 3428  0.44025057
## 3429  0.44025057
## 3430  0.44025057
## 3431  0.44025057
## 3432  0.44025057
## 3433  0.44025057
## 3434  0.44025057
## 3435  0.44025057
## 3436  0.44025057
## 3437  0.44025057
## 3438  0.44025057
## 3439  0.44025057
## 3440  0.44025057
## 3441  1.65932704
## 3442  1.65932704
## 3443  1.65932704
## 3444  1.65932704
## 3445  1.65932704
## 3446  1.65932704
## 3447  1.65932704
## 3448  1.65932704
## 3449  1.65932704
## 3450  1.65932704
## 3451  1.65932704
## 3452  1.65932704
## 3453  1.65932704
## 3454  1.65932704
## 3455  1.65932704
## 3456  1.65932704
## 3457  2.13556198
## 3458  2.13556198
## 3459  2.13556198
## 3460  2.13556198
## 3461  2.13556198
## 3462  2.13556198
## 3463  2.13556198
## 3464  2.13556198
## 3465  2.13556198
## 3466  2.13556198
## 3467  2.13556198
## 3468  2.13556198
## 3469  2.13556198
## 3470  2.13556198
## 3471  2.13556198
## 3472  2.13556198
## 3473  0.15803107
## 3474  0.15803107
## 3475  0.15803107
## 3476  0.15803107
## 3477  0.15803107
## 3478  0.15803107
## 3479  0.15803107
## 3480  0.15803107
## 3481  0.15803107
## 3482  0.15803107
## 3483  0.15803107
## 3484  0.15803107
## 3485  0.15803107
## 3486  0.15803107
## 3487  0.15803107
## 3488  0.15803107
## 3489  0.94936536
## 3490  0.94936536
## 3491  0.94936536
## 3492  0.94936536
## 3493  0.94936536
## 3494  0.94936536
## 3495  0.94936536
## 3496  0.94936536
## 3497  0.94936536
## 3498  0.94936536
## 3499  0.94936536
## 3500  0.94936536
## 3501  0.94936536
## 3502  0.94936536
## 3503  0.94936536
## 3504  0.94936536
## 3505  0.41152906
## 3506  0.41152906
## 3507  0.41152906
## 3508  0.41152906
## 3509  0.41152906
## 3510  0.41152906
## 3511  0.41152906
## 3512  0.41152906
## 3513  0.41152906
## 3514  0.41152906
## 3515  0.41152906
## 3516  0.41152906
## 3517  0.41152906
## 3518  0.41152906
## 3519  0.41152906
## 3520  0.41152906
## 3521  5.29629572
## 3522  5.29629572
## 3523  5.29629572
## 3524  5.29629572
## 3525  5.29629572
## 3526  5.29629572
## 3527  5.29629572
## 3528  5.29629572
## 3529  5.29629572
## 3530  5.29629572
## 3531  5.29629572
## 3532  5.29629572
## 3533  5.29629572
## 3534  5.29629572
## 3535  5.29629572
## 3536  5.29629572
## 3537  1.04281790
## 3538  1.04281790
## 3539  1.04281790
## 3540  1.04281790
## 3541  1.04281790
## 3542  1.04281790
## 3543  1.04281790
## 3544  1.04281790
## 3545  1.04281790
## 3546  1.04281790
## 3547  1.04281790
## 3548  1.04281790
## 3549  1.04281790
## 3550  1.04281790
## 3551  1.04281790
## 3552  1.04281790
## 3553  0.49498044
## 3554  0.49498044
## 3555  0.49498044
## 3556  0.49498044
## 3557  0.49498044
## 3558  0.49498044
## 3559  0.49498044
## 3560  0.49498044
## 3561  0.49498044
## 3562  0.49498044
## 3563  0.49498044
## 3564  0.49498044
## 3565  0.49498044
## 3566  0.49498044
## 3567  0.49498044
## 3568  0.49498044
## 3569  0.97676005
## 3570  0.97676005
## 3571  0.97676005
## 3572  0.97676005
## 3573  0.97676005
## 3574  0.97676005
## 3575  0.97676005
## 3576  0.97676005
## 3577  0.97676005
## 3578  0.97676005
## 3579  0.97676005
## 3580  0.97676005
## 3581  0.97676005
## 3582  0.97676005
## 3583  0.97676005
## 3584  0.97676005
## 3585  0.30921140
## 3586  0.30921140
## 3587  0.30921140
## 3588  0.30921140
## 3589  0.30921140
## 3590  0.30921140
## 3591  0.30921140
## 3592  0.30921140
## 3593  0.30921140
## 3594  0.30921140
## 3595  0.30921140
## 3596  0.30921140
## 3597  0.30921140
## 3598  0.30921140
## 3599  0.30921140
## 3600  0.30921140
## 3601  0.56942424
## 3602  0.56942424
## 3603  0.56942424
## 3604  0.56942424
## 3605  0.56942424
## 3606  0.56942424
## 3607  0.56942424
## 3608  0.56942424
## 3609  0.56942424
## 3610  0.56942424
## 3611  0.56942424
## 3612  0.56942424
## 3613  0.56942424
## 3614  0.56942424
## 3615  0.56942424
## 3616  0.56942424
## 3617  0.46652791
## 3618  0.46652791
## 3619  0.46652791
## 3620  0.46652791
## 3621  0.46652791
## 3622  0.46652791
## 3623  0.46652791
## 3624  0.46652791
## 3625  0.46652791
## 3626  0.46652791
## 3627  0.46652791
## 3628  0.46652791
## 3629  0.46652791
## 3630  0.46652791
## 3631  0.46652791
## 3632  0.46652791
## 3633  0.55230982
## 3634  0.55230982
## 3635  0.55230982
## 3636  0.55230982
## 3637  0.55230982
## 3638  0.55230982
## 3639  0.55230982
## 3640  0.55230982
## 3641  0.55230982
## 3642  0.55230982
## 3643  0.55230982
## 3644  0.55230982
## 3645  0.55230982
## 3646  0.55230982
## 3647  0.55230982
## 3648  0.55230982
## 3649  0.19173186
## 3650  0.19173186
## 3651  0.19173186
## 3652  0.19173186
## 3653  0.19173186
## 3654  0.19173186
## 3655  0.19173186
## 3656  0.19173186
## 3657  0.19173186
## 3658  0.19173186
## 3659  0.19173186
## 3660  0.19173186
## 3661  0.19173186
## 3662  0.19173186
## 3663  0.19173186
## 3664  0.19173186
## 3665  0.31192902
## 3666  0.31192902
## 3667  0.31192902
## 3668  0.31192902
## 3669  0.31192902
## 3670  0.31192902
## 3671  0.31192902
## 3672  0.31192902
## 3673  0.31192902
## 3674  0.31192902
## 3675  0.31192902
## 3676  0.31192902
## 3677  0.31192902
## 3678  0.31192902
## 3679  0.31192902
## 3680  0.31192902
## 3681  0.17472984
## 3682  0.17472984
## 3683  0.17472984
## 3684  0.17472984
## 3685  0.17472984
## 3686  0.17472984
## 3687  0.17472984
## 3688  0.17472984
## 3689  0.17472984
## 3690  0.17472984
## 3691  0.17472984
## 3692  0.17472984
## 3693  0.17472984
## 3694  0.17472984
## 3695  0.17472984
## 3696  0.17472984
## 3697  3.04843245
## 3698  3.04843245
## 3699  3.04843245
## 3700  3.04843245
## 3701  3.04843245
## 3702  3.04843245
## 3703  3.04843245
## 3704  3.04843245
## 3705  3.04843245
## 3706  3.04843245
## 3707  3.04843245
## 3708  3.04843245
## 3709  3.04843245
## 3710  3.04843245
## 3711  3.04843245
## 3712  3.04843245
## 3713  1.46459361
## 3714  1.46459361
## 3715  1.46459361
## 3716  1.46459361
## 3717  1.46459361
## 3718  1.46459361
## 3719  1.46459361
## 3720  1.46459361
## 3721  1.46459361
## 3722  1.46459361
## 3723  1.46459361
## 3724  1.46459361
## 3725  1.46459361
## 3726  1.46459361
## 3727  1.46459361
## 3728  1.46459361
## 3729  2.93511308
## 3730  2.93511308
## 3731  2.93511308
## 3732  2.93511308
## 3733  2.93511308
## 3734  2.93511308
## 3735  2.93511308
## 3736  2.93511308
## 3737  2.93511308
## 3738  2.93511308
## 3739  2.93511308
## 3740  2.93511308
## 3741  2.93511308
## 3742  2.93511308
## 3743  2.93511308
## 3744  2.93511308
## 3745  1.14248562
## 3746  1.14248562
## 3747  1.14248562
## 3748  1.14248562
## 3749  1.14248562
## 3750  1.14248562
## 3751  1.14248562
## 3752  1.14248562
## 3753  1.14248562
## 3754  1.14248562
## 3755  1.14248562
## 3756  1.14248562
## 3757  1.14248562
## 3758  1.14248562
## 3759  1.14248562
## 3760  1.14248562
## 3761  0.44296206
## 3762  0.44296206
## 3763  0.44296206
## 3764  0.44296206
## 3765  0.44296206
## 3766  0.44296206
## 3767  0.44296206
## 3768  0.44296206
## 3769  0.44296206
## 3770  0.44296206
## 3771  0.44296206
## 3772  0.44296206
## 3773  0.44296206
## 3774  0.44296206
## 3775  0.44296206
## 3776  0.44296206
## 3777  0.07324215
## 3778  0.07324215
## 3779  0.07324215
## 3780  0.07324215
## 3781  0.07324215
## 3782  0.07324215
## 3783  0.07324215
## 3784  0.07324215
## 3785  0.07324215
## 3786  0.07324215
## 3787  0.07324215
## 3788  0.07324215
## 3789  0.07324215
## 3790  0.07324215
## 3791  0.07324215
## 3792  0.07324215
## 3793  1.11569082
## 3794  1.11569082
## 3795  1.11569082
## 3796  1.11569082
## 3797  1.11569082
## 3798  1.11569082
## 3799  1.11569082
## 3800  1.11569082
## 3801  1.11569082
## 3802  1.11569082
## 3803  1.11569082
## 3804  1.11569082
## 3805  1.11569082
## 3806  1.11569082
## 3807  1.11569082
## 3808  1.11569082
## 3809  2.22105146
## 3810  2.22105146
## 3811  2.22105146
## 3812  2.22105146
## 3813  2.22105146
## 3814  2.22105146
## 3815  2.22105146
## 3816  2.22105146
## 3817  2.22105146
## 3818  2.22105146
## 3819  2.22105146
## 3820  2.22105146
## 3821  2.22105146
## 3822  2.22105146
## 3823  2.22105146
## 3824  2.22105146
## 3825  0.07032873
## 3826  0.07032873
## 3827  0.07032873
## 3828  0.07032873
## 3829  0.07032873
## 3830  0.07032873
## 3831  0.07032873
## 3832  0.07032873
## 3833  0.07032873
## 3834  0.07032873
## 3835  0.07032873
## 3836  0.07032873
## 3837  0.07032873
## 3838  0.07032873
## 3839  0.07032873
## 3840  0.07032873
## 3841  0.80921018
## 3842  0.80921018
## 3843  0.80921018
## 3844  0.80921018
## 3845  0.80921018
## 3846  0.80921018
## 3847  0.80921018
## 3848  0.80921018
## 3849  0.80921018
## 3850  0.80921018
## 3851  0.80921018
## 3852  0.80921018
## 3853  0.80921018
## 3854  0.80921018
## 3855  0.80921018
## 3856  0.80921018
## 3857  0.93008205
## 3858  0.93008205
## 3859  0.93008205
## 3860  0.93008205
## 3861  0.93008205
## 3862  0.93008205
## 3863  0.93008205
## 3864  0.93008205
## 3865  0.93008205
## 3866  0.93008205
## 3867  0.93008205
## 3868  0.93008205
## 3869  0.93008205
## 3870  0.93008205
## 3871  0.93008205
## 3872  0.93008205
## 3873  0.74671943
## 3874  0.74671943
## 3875  0.74671943
## 3876  0.74671943
## 3877  0.74671943
## 3878  0.74671943
## 3879  0.74671943
## 3880  0.74671943
## 3881  0.74671943
## 3882  0.74671943
## 3883  0.74671943
## 3884  0.74671943
## 3885  0.74671943
## 3886  0.74671943
## 3887  0.74671943
## 3888  0.74671943
## 3889  0.34280188
## 3890  0.34280188
## 3891  0.34280188
## 3892  0.34280188
## 3893  0.34280188
## 3894  0.34280188
## 3895  0.34280188
## 3896  0.34280188
## 3897  0.34280188
## 3898  0.34280188
## 3899  0.34280188
## 3900  0.34280188
## 3901  0.34280188
## 3902  0.34280188
## 3903  0.34280188
## 3904  0.34280188
## 3905  0.94478149
## 3906  0.94478149
## 3907  0.94478149
## 3908  0.94478149
## 3909  0.94478149
## 3910  0.94478149
## 3911  0.94478149
## 3912  0.94478149
## 3913  0.94478149
## 3914  0.94478149
## 3915  0.94478149
## 3916  0.94478149
## 3917  0.94478149
## 3918  0.94478149
## 3919  0.94478149
## 3920  0.94478149
## 3921  1.25569826
## 3922  1.25569826
## 3923  1.25569826
## 3924  1.25569826
## 3925  1.25569826
## 3926  1.25569826
## 3927  1.25569826
## 3928  1.25569826
## 3929  1.25569826
## 3930  1.25569826
## 3931  1.25569826
## 3932  1.25569826
## 3933  1.25569826
## 3934  1.25569826
## 3935  1.25569826
## 3936  1.25569826
## 3937  0.49438324
## 3938  0.49438324
## 3939  0.49438324
## 3940  0.49438324
## 3941  0.49438324
## 3942  0.49438324
## 3943  0.49438324
## 3944  0.49438324
## 3945  0.49438324
## 3946  0.49438324
## 3947  0.49438324
## 3948  0.49438324
## 3949  0.49438324
## 3950  0.49438324
## 3951  0.49438324
## 3952  0.49438324
## 3953  0.38482868
## 3954  0.38482868
## 3955  0.38482868
## 3956  0.38482868
## 3957  0.38482868
## 3958  0.38482868
## 3959  0.38482868
## 3960  0.38482868
## 3961  0.38482868
## 3962  0.38482868
## 3963  0.38482868
## 3964  0.38482868
## 3965  0.38482868
## 3966  0.38482868
## 3967  0.38482868
## 3968  0.38482868
## 3969  0.46352981
## 3970  0.46352981
## 3971  0.46352981
## 3972  0.46352981
## 3973  0.46352981
## 3974  0.46352981
## 3975  0.46352981
## 3976  0.46352981
## 3977  0.46352981
## 3978  0.46352981
## 3979  0.46352981
## 3980  0.46352981
## 3981  0.46352981
## 3982  0.46352981
## 3983  0.46352981
## 3984  0.46352981
## 3985  0.76025281
## 3986  0.76025281
## 3987  0.76025281
## 3988  0.76025281
## 3989  0.76025281
## 3990  0.76025281
## 3991  0.76025281
## 3992  0.76025281
## 3993  0.76025281
## 3994  0.76025281
## 3995  0.76025281
## 3996  0.76025281
## 3997  0.76025281
## 3998  0.76025281
## 3999  0.76025281
## 4000  0.76025281
## 4001  0.86301822
## 4002  0.86301822
## 4003  0.86301822
## 4004  0.86301822
## 4005  0.86301822
## 4006  0.86301822
## 4007  0.86301822
## 4008  0.86301822
## 4009  0.86301822
## 4010  0.86301822
## 4011  0.86301822
## 4012  0.86301822
## 4013  0.86301822
## 4014  0.86301822
## 4015  0.86301822
## 4016  0.86301822
## 4017  0.42056999
## 4018  0.42056999
## 4019  0.42056999
## 4020  0.42056999
## 4021  0.42056999
## 4022  0.42056999
## 4023  0.42056999
## 4024  0.42056999
## 4025  0.42056999
## 4026  0.42056999
## 4027  0.42056999
## 4028  0.42056999
## 4029  0.42056999
## 4030  0.42056999
## 4031  0.42056999
## 4032  0.42056999
## 4033  0.13162013
## 4034  0.13162013
## 4035  0.13162013
## 4036  0.13162013
## 4037  0.13162013
## 4038  0.13162013
## 4039  0.13162013
## 4040  0.13162013
## 4041  0.13162013
## 4042  0.13162013
## 4043  0.13162013
## 4044  0.13162013
## 4045  0.13162013
## 4046  0.13162013
## 4047  0.13162013
## 4048  0.13162013
## 4049  1.02757877
## 4050  1.02757877
## 4051  1.02757877
## 4052  1.02757877
## 4053  1.02757877
## 4054  1.02757877
## 4055  1.02757877
## 4056  1.02757877
## 4057  1.02757877
## 4058  1.02757877
## 4059  1.02757877
## 4060  1.02757877
## 4061  1.02757877
## 4062  1.02757877
## 4063  1.02757877
## 4064  1.02757877
## 4065  0.23182348
## 4066  0.23182348
## 4067  0.23182348
## 4068  0.23182348
## 4069  0.23182348
## 4070  0.23182348
## 4071  0.23182348
## 4072  0.23182348
## 4073  0.23182348
## 4074  0.23182348
## 4075  0.23182348
## 4076  0.23182348
## 4077  0.23182348
## 4078  0.23182348
## 4079  0.23182348
## 4080  0.23182348
## 4081  0.66502695
## 4082  0.66502695
## 4083  0.66502695
## 4084  0.66502695
## 4085  0.66502695
## 4086  0.66502695
## 4087  0.66502695
## 4088  0.66502695
## 4089  0.66502695
## 4090  0.66502695
## 4091  0.66502695
## 4092  0.66502695
## 4093  0.66502695
## 4094  0.66502695
## 4095  0.66502695
## 4096  0.66502695
## 4097  0.39945146
## 4098  0.39945146
## 4099  0.39945146
## 4100  0.39945146
## 4101  0.39945146
## 4102  0.39945146
## 4103  0.39945146
## 4104  0.39945146
## 4105  0.39945146
## 4106  0.39945146
## 4107  0.39945146
## 4108  0.39945146
## 4109  0.39945146
## 4110  0.39945146
## 4111  0.39945146
## 4112  0.39945146
## 4113  0.93590259
## 4114  0.93590259
## 4115  0.93590259
## 4116  0.93590259
## 4117  0.93590259
## 4118  0.93590259
## 4119  0.93590259
## 4120  0.93590259
## 4121  0.93590259
## 4122  0.93590259
## 4123  0.93590259
## 4124  0.93590259
## 4125  0.93590259
## 4126  0.93590259
## 4127  0.93590259
## 4128  0.93590259
## 4129  0.27607087
## 4130  0.27607087
## 4131  0.27607087
## 4132  0.27607087
## 4133  0.27607087
## 4134  0.27607087
## 4135  0.27607087
## 4136  0.27607087
## 4137  0.27607087
## 4138  0.27607087
## 4139  0.27607087
## 4140  0.27607087
## 4141  0.27607087
## 4142  0.27607087
## 4143  0.27607087
## 4144  0.27607087
## 4145  2.34222653
## 4146  2.34222653
## 4147  2.34222653
## 4148  2.34222653
## 4149  2.34222653
## 4150  2.34222653
## 4151  2.34222653
## 4152  2.34222653
## 4153  2.34222653
## 4154  2.34222653
## 4155  2.34222653
## 4156  2.34222653
## 4157  2.34222653
## 4158  2.34222653
## 4159  2.34222653
## 4160  2.34222653
## 4161  2.21143722
## 4162  2.21143722
## 4163  2.21143722
## 4164  2.21143722
## 4165  2.21143722
## 4166  2.21143722
## 4167  2.21143722
## 4168  2.21143722
## 4169  2.21143722
## 4170  2.21143722
## 4171  2.21143722
## 4172  2.21143722
## 4173  2.21143722
## 4174  2.21143722
## 4175  2.21143722
## 4176  2.21143722
## 4177  1.69299822
## 4178  1.69299822
## 4179  1.69299822
## 4180  1.69299822
## 4181  1.69299822
## 4182  1.69299822
## 4183  1.69299822
## 4184  1.69299822
## 4185  1.69299822
## 4186  1.69299822
## 4187  1.69299822
## 4188  1.69299822
## 4189  1.69299822
## 4190  1.69299822
## 4191  1.69299822
## 4192  1.69299822
## 4193  0.38561419
## 4194  0.38561419
## 4195  0.38561419
## 4196  0.38561419
## 4197  0.38561419
## 4198  0.38561419
## 4199  0.38561419
## 4200  0.38561419
## 4201  0.38561419
## 4202  0.38561419
## 4203  0.38561419
## 4204  0.38561419
## 4205  0.38561419
## 4206  0.38561419
## 4207  0.38561419
## 4208  0.38561419
## 4209  1.08723398
## 4210  1.08723398
## 4211  1.08723398
## 4212  1.08723398
## 4213  1.08723398
## 4214  1.08723398
## 4215  1.08723398
## 4216  1.08723398
## 4217  1.08723398
## 4218  1.08723398
## 4219  1.08723398
## 4220  1.08723398
## 4221  1.08723398
## 4222  1.08723398
## 4223  1.08723398
## 4224  1.08723398
## 4225  2.36911217
## 4226  2.36911217
## 4227  2.36911217
## 4228  2.36911217
## 4229  2.36911217
## 4230  2.36911217
## 4231  2.36911217
## 4232  2.36911217
## 4233  2.36911217
## 4234  2.36911217
## 4235  2.36911217
## 4236  2.36911217
## 4237  2.36911217
## 4238  2.36911217
## 4239  2.36911217
## 4240  2.36911217
## 4241  0.28471243
## 4242  0.28471243
## 4243  0.28471243
## 4244  0.28471243
## 4245  0.28471243
## 4246  0.28471243
## 4247  0.28471243
## 4248  0.28471243
## 4249  0.28471243
## 4250  0.28471243
## 4251  0.28471243
## 4252  0.28471243
## 4253  0.28471243
## 4254  0.28471243
## 4255  0.28471243
## 4256  0.28471243
## 4257  0.72829526
## 4258  0.72829526
## 4259  0.72829526
## 4260  0.72829526
## 4261  0.72829526
## 4262  0.72829526
## 4263  0.72829526
## 4264  0.72829526
## 4265  0.72829526
## 4266  0.72829526
## 4267  0.72829526
## 4268  0.72829526
## 4269  0.72829526
## 4270  0.72829526
## 4271  0.72829526
## 4272  0.72829526
## 4273  3.15853013
## 4274  3.15853013
## 4275  3.15853013
## 4276  3.15853013
## 4277  3.15853013
## 4278  3.15853013
## 4279  3.15853013
## 4280  3.15853013
## 4281  3.15853013
## 4282  3.15853013
## 4283  3.15853013
## 4284  3.15853013
## 4285  3.15853013
## 4286  3.15853013
## 4287  3.15853013
## 4288  3.15853013
## 4289  1.24654815
## 4290  1.24654815
## 4291  1.24654815
## 4292  1.24654815
## 4293  1.24654815
## 4294  1.24654815
## 4295  1.24654815
## 4296  1.24654815
## 4297  1.24654815
## 4298  1.24654815
## 4299  1.24654815
## 4300  1.24654815
## 4301  1.24654815
## 4302  1.24654815
## 4303  1.24654815
## 4304  1.24654815
## 4305  1.71971900
## 4306  1.71971900
## 4307  1.71971900
## 4308  1.71971900
## 4309  1.71971900
## 4310  1.71971900
## 4311  1.71971900
## 4312  1.71971900
## 4313  1.71971900
## 4314  1.71971900
## 4315  1.71971900
## 4316  1.71971900
## 4317  1.71971900
## 4318  1.71971900
## 4319  1.71971900
## 4320  1.71971900
## 4321  0.65428415
## 4322  0.65428415
## 4323  0.65428415
## 4324  0.65428415
## 4325  0.65428415
## 4326  0.65428415
## 4327  0.65428415
## 4328  0.65428415
## 4329  0.65428415
## 4330  0.65428415
## 4331  0.65428415
## 4332  0.65428415
## 4333  0.65428415
## 4334  0.65428415
## 4335  0.65428415
## 4336  0.65428415
## 4337  0.79412866
## 4338  0.79412866
## 4339  0.79412866
## 4340  0.79412866
## 4341  0.79412866
## 4342  0.79412866
## 4343  0.79412866
## 4344  0.79412866
## 4345  0.79412866
## 4346  0.79412866
## 4347  0.79412866
## 4348  0.79412866
## 4349  0.79412866
## 4350  0.79412866
## 4351  0.79412866
## 4352  0.79412866
## 4353  0.36807651
## 4354  0.36807651
## 4355  0.36807651
## 4356  0.36807651
## 4357  0.36807651
## 4358  0.36807651
## 4359  0.36807651
## 4360  0.36807651
## 4361  0.36807651
## 4362  0.36807651
## 4363  0.36807651
## 4364  0.36807651
## 4365  0.36807651
## 4366  0.36807651
## 4367  0.36807651
## 4368  0.36807651
## 4369  0.87851817
## 4370  0.87851817
## 4371  0.87851817
## 4372  0.87851817
## 4373  0.87851817
## 4374  0.87851817
## 4375  0.87851817
## 4376  0.87851817
## 4377  0.87851817
## 4378  0.87851817
## 4379  0.87851817
## 4380  0.87851817
## 4381  0.87851817
## 4382  0.87851817
## 4383  0.87851817
## 4384  0.87851817
## 4385  1.35554597
## 4386  1.35554597
## 4387  1.35554597
## 4388  1.35554597
## 4389  1.35554597
## 4390  1.35554597
## 4391  1.35554597
## 4392  1.35554597
## 4393  1.35554597
## 4394  1.35554597
## 4395  1.35554597
## 4396  1.35554597
## 4397  1.35554597
## 4398  1.35554597
## 4399  1.35554597
## 4400  1.35554597
## 4401  0.85139445
## 4402  0.85139445
## 4403  0.85139445
## 4404  0.85139445
## 4405  0.85139445
## 4406  0.85139445
## 4407  0.85139445
## 4408  0.85139445
## 4409  0.85139445
## 4410  0.85139445
## 4411  0.85139445
## 4412  0.85139445
## 4413  0.85139445
## 4414  0.85139445
## 4415  0.85139445
## 4416  0.85139445
## 4417  0.54737902
## 4418  0.54737902
## 4419  0.54737902
## 4420  0.54737902
## 4421  0.54737902
## 4422  0.54737902
## 4423  0.54737902
## 4424  0.54737902
## 4425  0.54737902
## 4426  0.54737902
## 4427  0.54737902
## 4428  0.54737902
## 4429  0.54737902
## 4430  0.54737902
## 4431  0.54737902
## 4432  0.54737902
## 4433  0.06056731
## 4434  0.06056731
## 4435  0.06056731
## 4436  0.06056731
## 4437  0.06056731
## 4438  0.06056731
## 4439  0.06056731
## 4440  0.06056731
## 4441  0.06056731
## 4442  0.06056731
## 4443  0.06056731
## 4444  0.06056731
## 4445  0.06056731
## 4446  0.06056731
## 4447  0.06056731
## 4448  0.06056731
## 4449  0.80078545
## 4450  0.80078545
## 4451  0.80078545
## 4452  0.80078545
## 4453  0.80078545
## 4454  0.80078545
## 4455  0.80078545
## 4456  0.80078545
## 4457  0.80078545
## 4458  0.80078545
## 4459  0.80078545
## 4460  0.80078545
## 4461  0.80078545
## 4462  0.80078545
## 4463  0.80078545
## 4464  0.80078545
## 4465  0.48591382
## 4466  0.48591382
## 4467  0.48591382
## 4468  0.48591382
## 4469  0.48591382
## 4470  0.48591382
## 4471  0.48591382
## 4472  0.48591382
## 4473  0.48591382
## 4474  0.48591382
## 4475  0.48591382
## 4476  0.48591382
## 4477  0.48591382
## 4478  0.48591382
## 4479  0.48591382
## 4480  0.48591382
## 4481  0.46116616
## 4482  0.46116616
## 4483  0.46116616
## 4484  0.46116616
## 4485  0.46116616
## 4486  0.46116616
## 4487  0.46116616
## 4488  0.46116616
## 4489  0.46116616
## 4490  0.46116616
## 4491  0.46116616
## 4492  0.46116616
## 4493  0.46116616
## 4494  0.46116616
## 4495  0.46116616
## 4496  0.46116616
## 4497  1.35934826
## 4498  1.35934826
## 4499  1.35934826
## 4500  1.35934826
## 4501  1.35934826
## 4502  1.35934826
## 4503  1.35934826
## 4504  1.35934826
## 4505  1.35934826
## 4506  1.35934826
## 4507  1.35934826
## 4508  1.35934826
## 4509  1.35934826
## 4510  1.35934826
## 4511  1.35934826
## 4512  1.35934826
## 4513  1.42735705
## 4514  1.42735705
## 4515  1.42735705
## 4516  1.42735705
## 4517  1.42735705
## 4518  1.42735705
## 4519  1.42735705
## 4520  1.42735705
## 4521  1.42735705
## 4522  1.42735705
## 4523  1.42735705
## 4524  1.42735705
## 4525  1.42735705
## 4526  1.42735705
## 4527  1.42735705
## 4528  1.42735705
## 4529  0.39575722
## 4530  0.39575722
## 4531  0.39575722
## 4532  0.39575722
## 4533  0.39575722
## 4534  0.39575722
## 4535  0.39575722
## 4536  0.39575722
## 4537  0.39575722
## 4538  0.39575722
## 4539  0.39575722
## 4540  0.39575722
## 4541  0.39575722
## 4542  0.39575722
## 4543  0.39575722
## 4544  0.39575722
## 4545  0.36017053
## 4546  0.36017053
## 4547  0.36017053
## 4548  0.36017053
## 4549  0.36017053
## 4550  0.36017053
## 4551  0.36017053
## 4552  0.36017053
## 4553  0.36017053
## 4554  0.36017053
## 4555  0.36017053
## 4556  0.36017053
## 4557  0.36017053
## 4558  0.36017053
## 4559  0.36017053
## 4560  0.36017053
## 4561  0.62645535
## 4562  0.62645535
## 4563  0.62645535
## 4564  0.62645535
## 4565  0.62645535
## 4566  0.62645535
## 4567  0.62645535
## 4568  0.62645535
## 4569  0.62645535
## 4570  0.62645535
## 4571  0.62645535
## 4572  0.62645535
## 4573  0.62645535
## 4574  0.62645535
## 4575  0.62645535
## 4576  0.62645535
## 4577  0.59654558
## 4578  0.59654558
## 4579  0.59654558
## 4580  0.59654558
## 4581  0.59654558
## 4582  0.59654558
## 4583  0.59654558
## 4584  0.59654558
## 4585  0.59654558
## 4586  0.59654558
## 4587  0.59654558
## 4588  0.59654558
## 4589  0.59654558
## 4590  0.59654558
## 4591  0.59654558
## 4592  0.59654558
## 4593  0.29758425
## 4594  0.29758425
## 4595  0.29758425
## 4596  0.29758425
## 4597  0.29758425
## 4598  0.29758425
## 4599  0.29758425
## 4600  0.29758425
## 4601  0.29758425
## 4602  0.29758425
## 4603  0.29758425
## 4604  0.29758425
## 4605  0.29758425
## 4606  0.29758425
## 4607  0.29758425
## 4608  0.29758425
## 4609  0.25395166
## 4610  0.25395166
## 4611  0.25395166
## 4612  0.25395166
## 4613  0.25395166
## 4614  0.25395166
## 4615  0.25395166
## 4616  0.25395166
## 4617  0.25395166
## 4618  0.25395166
## 4619  0.25395166
## 4620  0.25395166
## 4621  0.25395166
## 4622  0.25395166
## 4623  0.25395166
## 4624  0.25395166
## 4625  0.82453933
## 4626  0.82453933
## 4627  0.82453933
## 4628  0.82453933
## 4629  0.82453933
## 4630  0.82453933
## 4631  0.82453933
## 4632  0.82453933
## 4633  0.82453933
## 4634  0.82453933
## 4635  0.82453933
## 4636  0.82453933
## 4637  0.82453933
## 4638  0.82453933
## 4639  0.82453933
## 4640  0.82453933
## 4641  1.69102278
## 4642  1.69102278
## 4643  1.69102278
## 4644  1.69102278
## 4645  1.69102278
## 4646  1.69102278
## 4647  1.69102278
## 4648  1.69102278
## 4649  1.69102278
## 4650  1.69102278
## 4651  1.69102278
## 4652  1.69102278
## 4653  1.69102278
## 4654  1.69102278
## 4655  1.69102278
## 4656  1.69102278
## 4657  0.55183095
## 4658  0.55183095
## 4659  0.55183095
## 4660  0.55183095
## 4661  0.55183095
## 4662  0.55183095
## 4663  0.55183095
## 4664  0.55183095
## 4665  0.55183095
## 4666  0.55183095
## 4667  0.55183095
## 4668  0.55183095
## 4669  0.55183095
## 4670  0.55183095
## 4671  0.55183095
## 4672  0.55183095
## 4673  0.84533919
## 4674  0.84533919
## 4675  0.84533919
## 4676  0.84533919
## 4677  0.84533919
## 4678  0.84533919
## 4679  0.84533919
## 4680  0.84533919
## 4681  0.84533919
## 4682  0.84533919
## 4683  0.84533919
## 4684  0.84533919
## 4685  0.84533919
## 4686  0.84533919
## 4687  0.84533919
## 4688  0.84533919
## 4689  0.66784294
## 4690  0.66784294
## 4691  0.66784294
## 4692  0.66784294
## 4693  0.66784294
## 4694  0.66784294
## 4695  0.66784294
## 4696  0.66784294
## 4697  0.66784294
## 4698  0.66784294
## 4699  0.66784294
## 4700  0.66784294
## 4701  0.66784294
## 4702  0.66784294
## 4703  0.66784294
## 4704  0.66784294
## 4705  0.42561130
## 4706  0.42561130
## 4707  0.42561130
## 4708  0.42561130
## 4709  0.42561130
## 4710  0.42561130
## 4711  0.42561130
## 4712  0.42561130
## 4713  0.42561130
## 4714  0.42561130
## 4715  0.42561130
## 4716  0.42561130
## 4717  0.42561130
## 4718  0.42561130
## 4719  0.42561130
## 4720  0.42561130
## 4721  0.79389295
## 4722  0.79389295
## 4723  0.79389295
## 4724  0.79389295
## 4725  0.79389295
## 4726  0.79389295
## 4727  0.79389295
## 4728  0.79389295
## 4729  0.79389295
## 4730  0.79389295
## 4731  0.79389295
## 4732  0.79389295
## 4733  0.79389295
## 4734  0.79389295
## 4735  0.79389295
## 4736  0.79389295
## 4737  1.84691364
## 4738  1.84691364
## 4739  1.84691364
## 4740  1.84691364
## 4741  1.84691364
## 4742  1.84691364
## 4743  1.84691364
## 4744  1.84691364
## 4745  1.84691364
## 4746  1.84691364
## 4747  1.84691364
## 4748  1.84691364
## 4749  1.84691364
## 4750  1.84691364
## 4751  1.84691364
## 4752  1.84691364
## 4753  1.01105641
## 4754  1.01105641
## 4755  1.01105641
## 4756  1.01105641
## 4757  1.01105641
## 4758  1.01105641
## 4759  1.01105641
## 4760  1.01105641
## 4761  1.01105641
## 4762  1.01105641
## 4763  1.01105641
## 4764  1.01105641
## 4765  1.01105641
## 4766  1.01105641
## 4767  1.01105641
## 4768  1.01105641
## 4769  0.81023171
## 4770  0.81023171
## 4771  0.81023171
## 4772  0.81023171
## 4773  0.81023171
## 4774  0.81023171
## 4775  0.81023171
## 4776  0.81023171
## 4777  0.81023171
## 4778  0.81023171
## 4779  0.81023171
## 4780  0.81023171
## 4781  0.81023171
## 4782  0.81023171
## 4783  0.81023171
## 4784  0.81023171
## 4785  1.18554419
## 4786  1.18554419
## 4787  1.18554419
## 4788  1.18554419
## 4789  1.18554419
## 4790  1.18554419
## 4791  1.18554419
## 4792  1.18554419
## 4793  1.18554419
## 4794  1.18554419
## 4795  1.18554419
## 4796  1.18554419
## 4797  1.18554419
## 4798  1.18554419
## 4799  1.18554419
## 4800  1.18554419
## 4801  1.59391968
## 4802  1.59391968
## 4803  1.59391968
## 4804  1.59391968
## 4805  1.59391968
## 4806  1.59391968
## 4807  1.59391968
## 4808  1.59391968
## 4809  1.59391968
## 4810  1.59391968
## 4811  1.59391968
## 4812  1.59391968
## 4813  1.59391968
## 4814  1.59391968
## 4815  1.59391968
## 4816  1.59391968
## 4817  0.26765445
## 4818  0.26765445
## 4819  0.26765445
## 4820  0.26765445
## 4821  0.26765445
## 4822  0.26765445
## 4823  0.26765445
## 4824  0.26765445
## 4825  0.26765445
## 4826  0.26765445
## 4827  0.26765445
## 4828  0.26765445
## 4829  0.26765445
## 4830  0.26765445
## 4831  0.26765445
## 4832  0.26765445
## 4833  2.25485448
## 4834  2.25485448
## 4835  2.25485448
## 4836  2.25485448
## 4837  2.25485448
## 4838  2.25485448
## 4839  2.25485448
## 4840  2.25485448
## 4841  2.25485448
## 4842  2.25485448
## 4843  2.25485448
## 4844  2.25485448
## 4845  2.25485448
## 4846  2.25485448
## 4847  2.25485448
## 4848  2.25485448
## 4849  0.84547018
## 4850  0.84547018
## 4851  0.84547018
## 4852  0.84547018
## 4853  0.84547018
## 4854  0.84547018
## 4855  0.84547018
## 4856  0.84547018
## 4857  0.84547018
## 4858  0.84547018
## 4859  0.84547018
## 4860  0.84547018
## 4861  0.84547018
## 4862  0.84547018
## 4863  0.84547018
## 4864  0.84547018
## 4865  2.11487916
## 4866  2.11487916
## 4867  2.11487916
## 4868  2.11487916
## 4869  2.11487916
## 4870  2.11487916
## 4871  2.11487916
## 4872  2.11487916
## 4873  2.11487916
## 4874  2.11487916
## 4875  2.11487916
## 4876  2.11487916
## 4877  2.11487916
## 4878  2.11487916
## 4879  2.11487916
## 4880  2.11487916
## 4881  0.46759183
## 4882  0.46759183
## 4883  0.46759183
## 4884  0.46759183
## 4885  0.46759183
## 4886  0.46759183
## 4887  0.46759183
## 4888  0.46759183
## 4889  0.46759183
## 4890  0.46759183
## 4891  0.46759183
## 4892  0.46759183
## 4893  0.46759183
## 4894  0.46759183
## 4895  0.46759183
## 4896  0.46759183
## 4897  0.20125788
## 4898  0.20125788
## 4899  0.20125788
## 4900  0.20125788
## 4901  0.20125788
## 4902  0.20125788
## 4903  0.20125788
## 4904  0.20125788
## 4905  0.20125788
## 4906  0.20125788
## 4907  0.20125788
## 4908  0.20125788
## 4909  0.20125788
## 4910  0.20125788
## 4911  0.20125788
## 4912  0.20125788
## 4913  0.34379229
## 4914  0.34379229
## 4915  0.34379229
## 4916  0.34379229
## 4917  0.34379229
## 4918  0.34379229
## 4919  0.34379229
## 4920  0.34379229
## 4921  0.34379229
## 4922  0.34379229
## 4923  0.34379229
## 4924  0.34379229
## 4925  0.34379229
## 4926  0.34379229
## 4927  0.34379229
## 4928  0.34379229
## 4929  0.52290124
## 4930  0.52290124
## 4931  0.52290124
## 4932  0.52290124
## 4933  0.52290124
## 4934  0.52290124
## 4935  0.52290124
## 4936  0.52290124
## 4937  0.52290124
## 4938  0.52290124
## 4939  0.52290124
## 4940  0.52290124
## 4941  0.52290124
## 4942  0.52290124
## 4943  0.52290124
## 4944  0.52290124
## 4945  0.33489509
## 4946  0.33489509
## 4947  0.33489509
## 4948  0.33489509
## 4949  0.33489509
## 4950  0.33489509
## 4951  0.33489509
## 4952  0.33489509
## 4953  0.33489509
## 4954  0.33489509
## 4955  0.33489509
## 4956  0.33489509
## 4957  0.33489509
## 4958  0.33489509
## 4959  0.33489509
## 4960  0.33489509
## 4961  0.77637228
## 4962  0.77637228
## 4963  0.77637228
## 4964  0.77637228
## 4965  0.77637228
## 4966  0.77637228
## 4967  0.77637228
## 4968  0.77637228
## 4969  0.77637228
## 4970  0.77637228
## 4971  0.77637228
## 4972  0.77637228
## 4973  0.77637228
## 4974  0.77637228
## 4975  0.77637228
## 4976  0.77637228
## 4977  0.83675535
## 4978  0.83675535
## 4979  0.83675535
## 4980  0.83675535
## 4981  0.83675535
## 4982  0.83675535
## 4983  0.83675535
## 4984  0.83675535
## 4985  0.83675535
## 4986  0.83675535
## 4987  0.83675535
## 4988  0.83675535
## 4989  0.83675535
## 4990  0.83675535
## 4991  0.83675535
## 4992  0.83675535
## 4993  0.20370927
## 4994  0.20370927
## 4995  0.20370927
## 4996  0.20370927
## 4997  0.20370927
## 4998  0.20370927
## 4999  0.20370927
## 5000  0.20370927
## 5001  0.20370927
## 5002  0.20370927
## 5003  0.20370927
## 5004  0.20370927
## 5005  0.20370927
## 5006  0.20370927
## 5007  0.20370927
## 5008  0.20370927
## 5009  0.61642300
## 5010  0.61642300
## 5011  0.61642300
## 5012  0.61642300
## 5013  0.61642300
## 5014  0.61642300
## 5015  0.61642300
## 5016  0.61642300
## 5017  0.61642300
## 5018  0.61642300
## 5019  0.61642300
## 5020  0.61642300
## 5021  0.61642300
## 5022  0.61642300
## 5023  0.61642300
## 5024  0.61642300
## 5025  1.44058918
## 5026  1.44058918
## 5027  1.44058918
## 5028  1.44058918
## 5029  1.44058918
## 5030  1.44058918
## 5031  1.44058918
## 5032  1.44058918
## 5033  1.44058918
## 5034  1.44058918
## 5035  1.44058918
## 5036  1.44058918
## 5037  1.44058918
## 5038  1.44058918
## 5039  1.44058918
## 5040  1.44058918
## 5041  0.40251673
## 5042  0.40251673
## 5043  0.40251673
## 5044  0.40251673
## 5045  0.40251673
## 5046  0.40251673
## 5047  0.40251673
## 5048  0.40251673
## 5049  0.40251673
## 5050  0.40251673
## 5051  0.40251673
## 5052  0.40251673
## 5053  0.40251673
## 5054  0.40251673
## 5055  0.40251673
## 5056  0.40251673
## 5057  0.17514505
## 5058  0.17514505
## 5059  0.17514505
## 5060  0.17514505
## 5061  0.17514505
## 5062  0.17514505
## 5063  0.17514505
## 5064  0.17514505
## 5065  0.17514505
## 5066  0.17514505
## 5067  0.17514505
## 5068  0.17514505
## 5069  0.17514505
## 5070  0.17514505
## 5071  0.17514505
## 5072  0.17514505
## 5073  1.46613958
## 5074  1.46613958
## 5075  1.46613958
## 5076  1.46613958
## 5077  1.46613958
## 5078  1.46613958
## 5079  1.46613958
## 5080  1.46613958
## 5081  1.46613958
## 5082  1.46613958
## 5083  1.46613958
## 5084  1.46613958
## 5085  1.46613958
## 5086  1.46613958
## 5087  1.46613958
## 5088  1.46613958
## 5089  1.13110788
## 5090  1.13110788
## 5091  1.13110788
## 5092  1.13110788
## 5093  1.13110788
## 5094  1.13110788
## 5095  1.13110788
## 5096  1.13110788
## 5097  1.13110788
## 5098  1.13110788
## 5099  1.13110788
## 5100  1.13110788
## 5101  1.13110788
## 5102  1.13110788
## 5103  1.13110788
## 5104  1.13110788
## 5105  0.68965507
## 5106  0.68965507
## 5107  0.68965507
## 5108  0.68965507
## 5109  0.68965507
## 5110  0.68965507
## 5111  0.68965507
## 5112  0.68965507
## 5113  0.68965507
## 5114  0.68965507
## 5115  0.68965507
## 5116  0.68965507
## 5117  0.68965507
## 5118  0.68965507
## 5119  0.68965507
## 5120  0.68965507
## 5121  0.71294727
## 5122  0.71294727
## 5123  0.71294727
## 5124  0.71294727
## 5125  0.71294727
## 5126  0.71294727
## 5127  0.71294727
## 5128  0.71294727
## 5129  0.71294727
## 5130  0.71294727
## 5131  0.71294727
## 5132  0.71294727
## 5133  0.71294727
## 5134  0.71294727
## 5135  0.71294727
## 5136  0.71294727
## 5137  0.25470894
## 5138  0.25470894
## 5139  0.25470894
## 5140  0.25470894
## 5141  0.25470894
## 5142  0.25470894
## 5143  0.25470894
## 5144  0.25470894
## 5145  0.25470894
## 5146  0.25470894
## 5147  0.25470894
## 5148  0.25470894
## 5149  0.25470894
## 5150  0.25470894
## 5151  0.25470894
## 5152  0.25470894
## 5153  3.41687130
## 5154  3.41687130
## 5155  3.41687130
## 5156  3.41687130
## 5157  3.41687130
## 5158  3.41687130
## 5159  3.41687130
## 5160  3.41687130
## 5161  3.41687130
## 5162  3.41687130
## 5163  3.41687130
## 5164  3.41687130
## 5165  3.41687130
## 5166  3.41687130
## 5167  3.41687130
## 5168  3.41687130
## 5169  0.87929132
## 5170  0.87929132
## 5171  0.87929132
## 5172  0.87929132
## 5173  0.87929132
## 5174  0.87929132
## 5175  0.87929132
## 5176  0.87929132
## 5177  0.87929132
## 5178  0.87929132
## 5179  0.87929132
## 5180  0.87929132
## 5181  0.87929132
## 5182  0.87929132
## 5183  0.87929132
## 5184  0.87929132
## 5185  2.68783277
## 5186  2.68783277
## 5187  2.68783277
## 5188  2.68783277
## 5189  2.68783277
## 5190  2.68783277
## 5191  2.68783277
## 5192  2.68783277
## 5193  2.68783277
## 5194  2.68783277
## 5195  2.68783277
## 5196  2.68783277
## 5197  2.68783277
## 5198  2.68783277
## 5199  2.68783277
## 5200  2.68783277
## 5201  1.43494991
## 5202  1.43494991
## 5203  1.43494991
## 5204  1.43494991
## 5205  1.43494991
## 5206  1.43494991
## 5207  1.43494991
## 5208  1.43494991
## 5209  1.43494991
## 5210  1.43494991
## 5211  1.43494991
## 5212  1.43494991
## 5213  1.43494991
## 5214  1.43494991
## 5215  1.43494991
## 5216  1.43494991
## 5217  0.54364555
## 5218  0.54364555
## 5219  0.54364555
## 5220  0.54364555
## 5221  0.54364555
## 5222  0.54364555
## 5223  0.54364555
## 5224  0.54364555
## 5225  0.54364555
## 5226  0.54364555
## 5227  0.54364555
## 5228  0.54364555
## 5229  0.54364555
## 5230  0.54364555
## 5231  0.54364555
## 5232  0.54364555
## 5233  1.10958076
## 5234  1.10958076
## 5235  1.10958076
## 5236  1.10958076
## 5237  1.10958076
## 5238  1.10958076
## 5239  1.10958076
## 5240  1.10958076
## 5241  1.10958076
## 5242  1.10958076
## 5243  1.10958076
## 5244  1.10958076
## 5245  1.10958076
## 5246  1.10958076
## 5247  1.10958076
## 5248  1.10958076
## 5249  0.74139829
## 5250  0.74139829
## 5251  0.74139829
## 5252  0.74139829
## 5253  0.74139829
## 5254  0.74139829
## 5255  0.74139829
## 5256  0.74139829
## 5257  0.74139829
## 5258  0.74139829
## 5259  0.74139829
## 5260  0.74139829
## 5261  0.74139829
## 5262  0.74139829
## 5263  0.74139829
## 5264  0.74139829
## 5265  1.37199720
## 5266  1.37199720
## 5267  1.37199720
## 5268  1.37199720
## 5269  1.37199720
## 5270  1.37199720
## 5271  1.37199720
## 5272  1.37199720
## 5273  1.37199720
## 5274  1.37199720
## 5275  1.37199720
## 5276  1.37199720
## 5277  1.37199720
## 5278  1.37199720
## 5279  1.37199720
## 5280  1.37199720
## 5281  0.41653533
## 5282  0.41653533
## 5283  0.41653533
## 5284  0.41653533
## 5285  0.41653533
## 5286  0.41653533
## 5287  0.41653533
## 5288  0.41653533
## 5289  0.41653533
## 5290  0.41653533
## 5291  0.41653533
## 5292  0.41653533
## 5293  0.41653533
## 5294  0.41653533
## 5295  0.41653533
## 5296  0.41653533
## 5297  0.67673111
## 5298  0.67673111
## 5299  0.67673111
## 5300  0.67673111
## 5301  0.67673111
## 5302  0.67673111
## 5303  0.67673111
## 5304  0.67673111
## 5305  0.67673111
## 5306  0.67673111
## 5307  0.67673111
## 5308  0.67673111
## 5309  0.67673111
## 5310  0.67673111
## 5311  0.67673111
## 5312  0.67673111
## 5313  1.76697742
## 5314  1.76697742
## 5315  1.76697742
## 5316  1.76697742
## 5317  1.76697742
## 5318  1.76697742
## 5319  1.76697742
## 5320  1.76697742
## 5321  1.76697742
## 5322  1.76697742
## 5323  1.76697742
## 5324  1.76697742
## 5325  1.76697742
## 5326  1.76697742
## 5327  1.76697742
## 5328  1.76697742
## 5329  0.57391639
## 5330  0.57391639
## 5331  0.57391639
## 5332  0.57391639
## 5333  0.57391639
## 5334  0.57391639
## 5335  0.57391639
## 5336  0.57391639
## 5337  0.57391639
## 5338  0.57391639
## 5339  0.57391639
## 5340  0.57391639
## 5341  0.57391639
## 5342  0.57391639
## 5343  0.57391639
## 5344  0.57391639
## 5345  1.09117496
## 5346  1.09117496
## 5347  1.09117496
## 5348  1.09117496
## 5349  1.09117496
## 5350  1.09117496
## 5351  1.09117496
## 5352  1.09117496
## 5353  1.09117496
## 5354  1.09117496
## 5355  1.09117496
## 5356  1.09117496
## 5357  1.09117496
## 5358  1.09117496
## 5359  1.09117496
## 5360  1.09117496
## 5361  0.47974230
## 5362  0.47974230
## 5363  0.47974230
## 5364  0.47974230
## 5365  0.47974230
## 5366  0.47974230
## 5367  0.47974230
## 5368  0.47974230
## 5369  0.47974230
## 5370  0.47974230
## 5371  0.47974230
## 5372  0.47974230
## 5373  0.47974230
## 5374  0.47974230
## 5375  0.47974230
## 5376  0.47974230
## 5377  0.68132082
## 5378  0.68132082
## 5379  0.68132082
## 5380  0.68132082
## 5381  0.68132082
## 5382  0.68132082
## 5383  0.68132082
## 5384  0.68132082
## 5385  0.68132082
## 5386  0.68132082
## 5387  0.68132082
## 5388  0.68132082
## 5389  0.68132082
## 5390  0.68132082
## 5391  0.68132082
## 5392  0.68132082
## 5393  0.86286539
## 5394  0.86286539
## 5395  0.86286539
## 5396  0.86286539
## 5397  0.86286539
## 5398  0.86286539
## 5399  0.86286539
## 5400  0.86286539
## 5401  0.86286539
## 5402  0.86286539
## 5403  0.86286539
## 5404  0.86286539
## 5405  0.86286539
## 5406  0.86286539
## 5407  0.86286539
## 5408  0.86286539
## 5409  0.71011144
## 5410  0.71011144
## 5411  0.71011144
## 5412  0.71011144
## 5413  0.71011144
## 5414  0.71011144
## 5415  0.71011144
## 5416  0.71011144
## 5417  0.71011144
## 5418  0.71011144
## 5419  0.71011144
## 5420  0.71011144
## 5421  0.71011144
## 5422  0.71011144
## 5423  0.71011144
## 5424  0.71011144
## 5425  0.82115487
## 5426  0.82115487
## 5427  0.82115487
## 5428  0.82115487
## 5429  0.82115487
## 5430  0.82115487
## 5431  0.82115487
## 5432  0.82115487
## 5433  0.82115487
## 5434  0.82115487
## 5435  0.82115487
## 5436  0.82115487
## 5437  0.82115487
## 5438  0.82115487
## 5439  0.82115487
## 5440  0.82115487
## 5441  1.12273223
## 5442  1.12273223
## 5443  1.12273223
## 5444  1.12273223
## 5445  1.12273223
## 5446  1.12273223
## 5447  1.12273223
## 5448  1.12273223
## 5449  1.12273223
## 5450  1.12273223
## 5451  1.12273223
## 5452  1.12273223
## 5453  1.12273223
## 5454  1.12273223
## 5455  1.12273223
## 5456  1.12273223
## 5457  0.93262809
## 5458  0.93262809
## 5459  0.93262809
## 5460  0.93262809
## 5461  0.93262809
## 5462  0.93262809
## 5463  0.93262809
## 5464  0.93262809
## 5465  0.93262809
## 5466  0.93262809
## 5467  0.93262809
## 5468  0.93262809
## 5469  0.93262809
## 5470  0.93262809
## 5471  0.93262809
## 5472  0.93262809
## 5473  1.28623300
## 5474  1.28623300
## 5475  1.28623300
## 5476  1.28623300
## 5477  1.28623300
## 5478  1.28623300
## 5479  1.28623300
## 5480  1.28623300
## 5481  1.28623300
## 5482  1.28623300
## 5483  1.28623300
## 5484  1.28623300
## 5485  1.28623300
## 5486  1.28623300
## 5487  1.28623300
## 5488  1.28623300
## 5489  0.15727613
## 5490  0.15727613
## 5491  0.15727613
## 5492  0.15727613
## 5493  0.15727613
## 5494  0.15727613
## 5495  0.15727613
## 5496  0.15727613
## 5497  0.15727613
## 5498  0.15727613
## 5499  0.15727613
## 5500  0.15727613
## 5501  0.15727613
## 5502  0.15727613
## 5503  0.15727613
## 5504  0.15727613
## 5505  0.41353050
## 5506  0.41353050
## 5507  0.41353050
## 5508  0.41353050
## 5509  0.41353050
## 5510  0.41353050
## 5511  0.41353050
## 5512  0.41353050
## 5513  0.41353050
## 5514  0.41353050
## 5515  0.41353050
## 5516  0.41353050
## 5517  0.41353050
## 5518  0.41353050
## 5519  0.41353050
## 5520  0.41353050
## 5521  0.46533690
## 5522  0.46533690
## 5523  0.46533690
## 5524  0.46533690
## 5525  0.46533690
## 5526  0.46533690
## 5527  0.46533690
## 5528  0.46533690
## 5529  0.46533690
## 5530  0.46533690
## 5531  0.46533690
## 5532  0.46533690
## 5533  0.46533690
## 5534  0.46533690
## 5535  0.46533690
## 5536  0.46533690
## 5537  0.84970938
## 5538  0.84970938
## 5539  0.84970938
## 5540  0.84970938
## 5541  0.84970938
## 5542  0.84970938
## 5543  0.84970938
## 5544  0.84970938
## 5545  0.84970938
## 5546  0.84970938
## 5547  0.84970938
## 5548  0.84970938
## 5549  0.84970938
## 5550  0.84970938
## 5551  0.84970938
## 5552  0.84970938
## 5553  0.80727912
## 5554  0.80727912
## 5555  0.80727912
## 5556  0.80727912
## 5557  0.80727912
## 5558  0.80727912
## 5559  0.80727912
## 5560  0.80727912
## 5561  0.80727912
## 5562  0.80727912
## 5563  0.80727912
## 5564  0.80727912
## 5565  0.80727912
## 5566  0.80727912
## 5567  0.80727912
## 5568  0.80727912
## 5569  0.57865549
## 5570  0.57865549
## 5571  0.57865549
## 5572  0.57865549
## 5573  0.57865549
## 5574  0.57865549
## 5575  0.57865549
## 5576  0.57865549
## 5577  0.57865549
## 5578  0.57865549
## 5579  0.57865549
## 5580  0.57865549
## 5581  0.57865549
## 5582  0.57865549
## 5583  0.57865549
## 5584  0.57865549
## 5585  1.20101575
## 5586  1.20101575
## 5587  1.20101575
## 5588  1.20101575
## 5589  1.20101575
## 5590  1.20101575
## 5591  1.20101575
## 5592  1.20101575
## 5593  1.20101575
## 5594  1.20101575
## 5595  1.20101575
## 5596  1.20101575
## 5597  1.20101575
## 5598  1.20101575
## 5599  1.20101575
## 5600  1.20101575
## 5601  0.67193003
## 5602  0.67193003
## 5603  0.67193003
## 5604  0.67193003
## 5605  0.67193003
## 5606  0.67193003
## 5607  0.67193003
## 5608  0.67193003
## 5609  0.67193003
## 5610  0.67193003
## 5611  0.67193003
## 5612  0.67193003
## 5613  0.67193003
## 5614  0.67193003
## 5615  0.67193003
## 5616  0.67193003
## 5617  0.45850557
## 5618  0.45850557
## 5619  0.45850557
## 5620  0.45850557
## 5621  0.45850557
## 5622  0.45850557
## 5623  0.45850557
## 5624  0.45850557
## 5625  0.45850557
## 5626  0.45850557
## 5627  0.45850557
## 5628  0.45850557
## 5629  0.45850557
## 5630  0.45850557
## 5631  0.45850557
## 5632  0.45850557
## 5633  0.96841487
## 5634  0.96841487
## 5635  0.96841487
## 5636  0.96841487
## 5637  0.96841487
## 5638  0.96841487
## 5639  0.96841487
## 5640  0.96841487
## 5641  0.96841487
## 5642  0.96841487
## 5643  0.96841487
## 5644  0.96841487
## 5645  0.96841487
## 5646  0.96841487
## 5647  0.96841487
## 5648  0.96841487
## 5649  0.97391833
## 5650  0.97391833
## 5651  0.97391833
## 5652  0.97391833
## 5653  0.97391833
## 5654  0.97391833
## 5655  0.97391833
## 5656  0.97391833
## 5657  0.97391833
## 5658  0.97391833
## 5659  0.97391833
## 5660  0.97391833
## 5661  0.97391833
## 5662  0.97391833
## 5663  0.97391833
## 5664  0.97391833
## 5665  0.34361356
## 5666  0.34361356
## 5667  0.34361356
## 5668  0.34361356
## 5669  0.34361356
## 5670  0.34361356
## 5671  0.34361356
## 5672  0.34361356
## 5673  0.34361356
## 5674  0.34361356
## 5675  0.34361356
## 5676  0.34361356
## 5677  0.34361356
## 5678  0.34361356
## 5679  0.34361356
## 5680  0.34361356
## 5681  0.42018104
## 5682  0.42018104
## 5683  0.42018104
## 5684  0.42018104
## 5685  0.42018104
## 5686  0.42018104
## 5687  0.42018104
## 5688  0.42018104
## 5689  0.42018104
## 5690  0.42018104
## 5691  0.42018104
## 5692  0.42018104
## 5693  0.42018104
## 5694  0.42018104
## 5695  0.42018104
## 5696  0.42018104
## 5697  0.82509922
## 5698  0.82509922
## 5699  0.82509922
## 5700  0.82509922
## 5701  0.82509922
## 5702  0.82509922
## 5703  0.82509922
## 5704  0.82509922
## 5705  0.82509922
## 5706  0.82509922
## 5707  0.82509922
## 5708  0.82509922
## 5709  0.82509922
## 5710  0.82509922
## 5711  0.82509922
## 5712  0.82509922
## 5713  0.66534099
## 5714  0.66534099
## 5715  0.66534099
## 5716  0.66534099
## 5717  0.66534099
## 5718  0.66534099
## 5719  0.66534099
## 5720  0.66534099
## 5721  0.66534099
## 5722  0.66534099
## 5723  0.66534099
## 5724  0.66534099
## 5725  0.66534099
## 5726  0.66534099
## 5727  0.66534099
## 5728  0.66534099
## 5729  0.24000800
## 5730  0.24000800
## 5731  0.24000800
## 5732  0.24000800
## 5733  0.24000800
## 5734  0.24000800
## 5735  0.24000800
## 5736  0.24000800
## 5737  0.24000800
## 5738  0.24000800
## 5739  0.24000800
## 5740  0.24000800
## 5741  0.24000800
## 5742  0.24000800
## 5743  0.24000800
## 5744  0.24000800
## 5745  0.45905369
## 5746  0.45905369
## 5747  0.45905369
## 5748  0.45905369
## 5749  0.45905369
## 5750  0.45905369
## 5751  0.45905369
## 5752  0.45905369
## 5753  0.45905369
## 5754  0.45905369
## 5755  0.45905369
## 5756  0.45905369
## 5757  0.45905369
## 5758  0.45905369
## 5759  0.45905369
## 5760  0.45905369
## 5761  1.30093171
## 5762  1.30093171
## 5763  1.30093171
## 5764  1.30093171
## 5765  1.30093171
## 5766  1.30093171
## 5767  1.30093171
## 5768  1.30093171
## 5769  1.30093171
## 5770  1.30093171
## 5771  1.30093171
## 5772  1.30093171
## 5773  1.30093171
## 5774  1.30093171
## 5775  1.30093171
## 5776  1.30093171
## 5777  0.27808618
## 5778  0.27808618
## 5779  0.27808618
## 5780  0.27808618
## 5781  0.27808618
## 5782  0.27808618
## 5783  0.27808618
## 5784  0.27808618
## 5785  0.27808618
## 5786  0.27808618
## 5787  0.27808618
## 5788  0.27808618
## 5789  0.27808618
## 5790  0.27808618
## 5791  0.27808618
## 5792  0.27808618
## 5793  0.05573970
## 5794  0.05573970
## 5795  0.05573970
## 5796  0.05573970
## 5797  0.05573970
## 5798  0.05573970
## 5799  0.05573970
## 5800  0.05573970
## 5801  0.05573970
## 5802  0.05573970
## 5803  0.05573970
## 5804  0.05573970
## 5805  0.05573970
## 5806  0.05573970
## 5807  0.05573970
## 5808  0.05573970
## 5809  0.63798022
## 5810  0.63798022
## 5811  0.63798022
## 5812  0.63798022
## 5813  0.63798022
## 5814  0.63798022
## 5815  0.63798022
## 5816  0.63798022
## 5817  0.63798022
## 5818  0.63798022
## 5819  0.63798022
## 5820  0.63798022
## 5821  0.63798022
## 5822  0.63798022
## 5823  0.63798022
## 5824  0.63798022
## 5825  0.35678920
## 5826  0.35678920
## 5827  0.35678920
## 5828  0.35678920
## 5829  0.35678920
## 5830  0.35678920
## 5831  0.35678920
## 5832  0.35678920
## 5833  0.35678920
## 5834  0.35678920
## 5835  0.35678920
## 5836  0.35678920
## 5837  0.35678920
## 5838  0.35678920
## 5839  0.35678920
## 5840  0.35678920
## 5841  0.38451856
## 5842  0.38451856
## 5843  0.38451856
## 5844  0.38451856
## 5845  0.38451856
## 5846  0.38451856
## 5847  0.38451856
## 5848  0.38451856
## 5849  0.38451856
## 5850  0.38451856
## 5851  0.38451856
## 5852  0.38451856
## 5853  0.38451856
## 5854  0.38451856
## 5855  0.38451856
## 5856  0.38451856
## 5857  0.15559718
## 5858  0.15559718
## 5859  0.15559718
## 5860  0.15559718
## 5861  0.15559718
## 5862  0.15559718
## 5863  0.15559718
## 5864  0.15559718
## 5865  0.15559718
## 5866  0.15559718
## 5867  0.15559718
## 5868  0.15559718
## 5869  0.15559718
## 5870  0.15559718
## 5871  0.15559718
## 5872  0.15559718
## 5873  1.20879187
## 5874  1.20879187
## 5875  1.20879187
## 5876  1.20879187
## 5877  1.20879187
## 5878  1.20879187
## 5879  1.20879187
## 5880  1.20879187
## 5881  1.20879187
## 5882  1.20879187
## 5883  1.20879187
## 5884  1.20879187
## 5885  1.20879187
## 5886  1.20879187
## 5887  1.20879187
## 5888  1.20879187
## 5889  0.89021859
## 5890  0.89021859
## 5891  0.89021859
## 5892  0.89021859
## 5893  0.89021859
## 5894  0.89021859
## 5895  0.89021859
## 5896  0.89021859
## 5897  0.89021859
## 5898  0.89021859
## 5899  0.89021859
## 5900  0.89021859
## 5901  0.89021859
## 5902  0.89021859
## 5903  0.89021859
## 5904  0.89021859
## 5905  1.35548193
## 5906  1.35548193
## 5907  1.35548193
## 5908  1.35548193
## 5909  1.35548193
## 5910  1.35548193
## 5911  1.35548193
## 5912  1.35548193
## 5913  1.35548193
## 5914  1.35548193
## 5915  1.35548193
## 5916  1.35548193
## 5917  1.35548193
## 5918  1.35548193
## 5919  1.35548193
## 5920  1.35548193
## 5921  0.34184070
## 5922  0.34184070
## 5923  0.34184070
## 5924  0.34184070
## 5925  0.34184070
## 5926  0.34184070
## 5927  0.34184070
## 5928  0.34184070
## 5929  0.34184070
## 5930  0.34184070
## 5931  0.34184070
## 5932  0.34184070
## 5933  0.34184070
## 5934  0.34184070
## 5935  0.34184070
## 5936  0.34184070
## 5937  0.70244699
## 5938  0.70244699
## 5939  0.70244699
## 5940  0.70244699
## 5941  0.70244699
## 5942  0.70244699
## 5943  0.70244699
## 5944  0.70244699
## 5945  0.70244699
## 5946  0.70244699
## 5947  0.70244699
## 5948  0.70244699
## 5949  0.70244699
## 5950  0.70244699
## 5951  0.70244699
## 5952  0.70244699
## 5953  0.52446996
## 5954  0.52446996
## 5955  0.52446996
## 5956  0.52446996
## 5957  0.52446996
## 5958  0.52446996
## 5959  0.52446996
## 5960  0.52446996
## 5961  0.52446996
## 5962  0.52446996
## 5963  0.52446996
## 5964  0.52446996
## 5965  0.52446996
## 5966  0.52446996
## 5967  0.52446996
## 5968  0.52446996
## 5969  0.67878208
## 5970  0.67878208
## 5971  0.67878208
## 5972  0.67878208
## 5973  0.67878208
## 5974  0.67878208
## 5975  0.67878208
## 5976  0.67878208
## 5977  0.67878208
## 5978  0.67878208
## 5979  0.67878208
## 5980  0.67878208
## 5981  0.67878208
## 5982  0.67878208
## 5983  0.67878208
## 5984  0.67878208
## 5985  0.66383303
## 5986  0.66383303
## 5987  0.66383303
## 5988  0.66383303
## 5989  0.66383303
## 5990  0.66383303
## 5991  0.66383303
## 5992  0.66383303
## 5993  0.66383303
## 5994  0.66383303
## 5995  0.66383303
## 5996  0.66383303
## 5997  0.66383303
## 5998  0.66383303
## 5999  0.66383303
## 6000  0.66383303
## 6001  1.17473214
## 6002  1.17473214
## 6003  1.17473214
## 6004  1.17473214
## 6005  1.17473214
## 6006  1.17473214
## 6007  1.17473214
## 6008  1.17473214
## 6009  1.17473214
## 6010  1.17473214
## 6011  1.17473214
## 6012  1.17473214
## 6013  1.17473214
## 6014  1.17473214
## 6015  1.17473214
## 6016  1.17473214
## 6017  0.87245827
## 6018  0.87245827
## 6019  0.87245827
## 6020  0.87245827
## 6021  0.87245827
## 6022  0.87245827
## 6023  0.87245827
## 6024  0.87245827
## 6025  0.87245827
## 6026  0.87245827
## 6027  0.87245827
## 6028  0.87245827
## 6029  0.87245827
## 6030  0.87245827
## 6031  0.87245827
## 6032  0.87245827
## 6033  0.46526920
## 6034  0.46526920
## 6035  0.46526920
## 6036  0.46526920
## 6037  0.46526920
## 6038  0.46526920
## 6039  0.46526920
## 6040  0.46526920
## 6041  0.46526920
## 6042  0.46526920
## 6043  0.46526920
## 6044  0.46526920
## 6045  0.46526920
## 6046  0.46526920
## 6047  0.46526920
## 6048  0.46526920
## 6049  0.28391936
## 6050  0.28391936
## 6051  0.28391936
## 6052  0.28391936
## 6053  0.28391936
## 6054  0.28391936
## 6055  0.28391936
## 6056  0.28391936
## 6057  0.28391936
## 6058  0.28391936
## 6059  0.28391936
## 6060  0.28391936
## 6061  0.28391936
## 6062  0.28391936
## 6063  0.28391936
## 6064  0.28391936
## 6065  1.74562103
## 6066  1.74562103
## 6067  1.74562103
## 6068  1.74562103
## 6069  1.74562103
## 6070  1.74562103
## 6071  1.74562103
## 6072  1.74562103
## 6073  1.74562103
## 6074  1.74562103
## 6075  1.74562103
## 6076  1.74562103
## 6077  1.74562103
## 6078  1.74562103
## 6079  1.74562103
## 6080  1.74562103
## 6081  0.29499348
## 6082  0.29499348
## 6083  0.29499348
## 6084  0.29499348
## 6085  0.29499348
## 6086  0.29499348
## 6087  0.29499348
## 6088  0.29499348
## 6089  0.29499348
## 6090  0.29499348
## 6091  0.29499348
## 6092  0.29499348
## 6093  0.29499348
## 6094  0.29499348
## 6095  0.29499348
## 6096  0.29499348
## 6097  0.51003657
## 6098  0.51003657
## 6099  0.51003657
## 6100  0.51003657
## 6101  0.51003657
## 6102  0.51003657
## 6103  0.51003657
## 6104  0.51003657
## 6105  0.51003657
## 6106  0.51003657
## 6107  0.51003657
## 6108  0.51003657
## 6109  0.51003657
## 6110  0.51003657
## 6111  0.51003657
## 6112  0.51003657
## 6113  0.88537613
## 6114  0.88537613
## 6115  0.88537613
## 6116  0.88537613
## 6117  0.88537613
## 6118  0.88537613
## 6119  0.88537613
## 6120  0.88537613
## 6121  0.88537613
## 6122  0.88537613
## 6123  0.88537613
## 6124  0.88537613
## 6125  0.88537613
## 6126  0.88537613
## 6127  0.88537613
## 6128  0.88537613
## 6129  0.19632241
## 6130  0.19632241
## 6131  0.19632241
## 6132  0.19632241
## 6133  0.19632241
## 6134  0.19632241
## 6135  0.19632241
## 6136  0.19632241
## 6137  0.19632241
## 6138  0.19632241
## 6139  0.19632241
## 6140  0.19632241
## 6141  0.19632241
## 6142  0.19632241
## 6143  0.19632241
## 6144  0.19632241
## 6145  1.38963323
## 6146  1.38963323
## 6147  1.38963323
## 6148  1.38963323
## 6149  1.38963323
## 6150  1.38963323
## 6151  1.38963323
## 6152  1.38963323
## 6153  1.38963323
## 6154  1.38963323
## 6155  1.38963323
## 6156  1.38963323
## 6157  1.38963323
## 6158  1.38963323
## 6159  1.38963323
## 6160  1.38963323
## 6161  0.80588775
## 6162  0.80588775
## 6163  0.80588775
## 6164  0.80588775
## 6165  0.80588775
## 6166  0.80588775
## 6167  0.80588775
## 6168  0.80588775
## 6169  0.80588775
## 6170  0.80588775
## 6171  0.80588775
## 6172  0.80588775
## 6173  0.80588775
## 6174  0.80588775
## 6175  0.80588775
## 6176  0.80588775
## 6177  2.70840378
## 6178  2.70840378
## 6179  2.70840378
## 6180  2.70840378
## 6181  2.70840378
## 6182  2.70840378
## 6183  2.70840378
## 6184  2.70840378
## 6185  2.70840378
## 6186  2.70840378
## 6187  2.70840378
## 6188  2.70840378
## 6189  2.70840378
## 6190  2.70840378
## 6191  2.70840378
## 6192  2.70840378
## 6193  0.54695087
## 6194  0.54695087
## 6195  0.54695087
## 6196  0.54695087
## 6197  0.54695087
## 6198  0.54695087
## 6199  0.54695087
## 6200  0.54695087
## 6201  0.54695087
## 6202  0.54695087
## 6203  0.54695087
## 6204  0.54695087
## 6205  0.54695087
## 6206  0.54695087
## 6207  0.54695087
## 6208  0.54695087
## 6209  2.67564938
## 6210  2.67564938
## 6211  2.67564938
## 6212  2.67564938
## 6213  2.67564938
## 6214  2.67564938
## 6215  2.67564938
## 6216  2.67564938
## 6217  2.67564938
## 6218  2.67564938
## 6219  2.67564938
## 6220  2.67564938
## 6221  2.67564938
## 6222  2.67564938
## 6223  2.67564938
## 6224  2.67564938
## 6225  0.21034377
## 6226  0.21034377
## 6227  0.21034377
## 6228  0.21034377
## 6229  0.21034377
## 6230  0.21034377
## 6231  0.21034377
## 6232  0.21034377
## 6233  0.21034377
## 6234  0.21034377
## 6235  0.21034377
## 6236  0.21034377
## 6237  0.21034377
## 6238  0.21034377
## 6239  0.21034377
## 6240  0.21034377
## 6241  3.61792469
## 6242  3.61792469
## 6243  3.61792469
## 6244  3.61792469
## 6245  3.61792469
## 6246  3.61792469
## 6247  3.61792469
## 6248  3.61792469
## 6249  3.61792469
## 6250  3.61792469
## 6251  3.61792469
## 6252  3.61792469
## 6253  3.61792469
## 6254  3.61792469
## 6255  3.61792469
## 6256  3.61792469
## 6257  1.04283431
## 6258  1.04283431
## 6259  1.04283431
## 6260  1.04283431
## 6261  1.04283431
## 6262  1.04283431
## 6263  1.04283431
## 6264  1.04283431
## 6265  1.04283431
## 6266  1.04283431
## 6267  1.04283431
## 6268  1.04283431
## 6269  1.04283431
## 6270  1.04283431
## 6271  1.04283431
## 6272  1.04283431
## 6273  0.62717472
## 6274  0.62717472
## 6275  0.62717472
## 6276  0.62717472
## 6277  0.62717472
## 6278  0.62717472
## 6279  0.62717472
## 6280  0.62717472
## 6281  0.62717472
## 6282  0.62717472
## 6283  0.62717472
## 6284  0.62717472
## 6285  0.62717472
## 6286  0.62717472
## 6287  0.62717472
## 6288  0.62717472
## 6289  0.58521209
## 6290  0.58521209
## 6291  0.58521209
## 6292  0.58521209
## 6293  0.58521209
## 6294  0.58521209
## 6295  0.58521209
## 6296  0.58521209
## 6297  0.58521209
## 6298  0.58521209
## 6299  0.58521209
## 6300  0.58521209
## 6301  0.58521209
## 6302  0.58521209
## 6303  0.58521209
## 6304  0.58521209
## 6305  0.07514260
## 6306  0.07514260
## 6307  0.07514260
## 6308  0.07514260
## 6309  0.07514260
## 6310  0.07514260
## 6311  0.07514260
## 6312  0.07514260
## 6313  0.07514260
## 6314  0.07514260
## 6315  0.07514260
## 6316  0.07514260
## 6317  0.07514260
## 6318  0.07514260
## 6319  0.07514260
## 6320  0.07514260
## 6321  1.53058527
## 6322  1.53058527
## 6323  1.53058527
## 6324  1.53058527
## 6325  1.53058527
## 6326  1.53058527
## 6327  1.53058527
## 6328  1.53058527
## 6329  1.53058527
## 6330  1.53058527
## 6331  1.53058527
## 6332  1.53058527
## 6333  1.53058527
## 6334  1.53058527
## 6335  1.53058527
## 6336  1.53058527
## 6337  1.81869269
## 6338  1.81869269
## 6339  1.81869269
## 6340  1.81869269
## 6341  1.81869269
## 6342  1.81869269
## 6343  1.81869269
## 6344  1.81869269
## 6345  1.81869269
## 6346  1.81869269
## 6347  1.81869269
## 6348  1.81869269
## 6349  1.81869269
## 6350  1.81869269
## 6351  1.81869269
## 6352  1.81869269
## 6353  0.44478286
## 6354  0.44478286
## 6355  0.44478286
## 6356  0.44478286
## 6357  0.44478286
## 6358  0.44478286
## 6359  0.44478286
## 6360  0.44478286
## 6361  0.44478286
## 6362  0.44478286
## 6363  0.44478286
## 6364  0.44478286
## 6365  0.44478286
## 6366  0.44478286
## 6367  0.44478286
## 6368  0.44478286
## 6369  1.38715309
## 6370  1.38715309
## 6371  1.38715309
## 6372  1.38715309
## 6373  1.38715309
## 6374  1.38715309
## 6375  1.38715309
## 6376  1.38715309
## 6377  1.38715309
## 6378  1.38715309
## 6379  1.38715309
## 6380  1.38715309
## 6381  1.38715309
## 6382  1.38715309
## 6383  1.38715309
## 6384  1.38715309
## 6385  2.23650062
## 6386  2.23650062
## 6387  2.23650062
## 6388  2.23650062
## 6389  2.23650062
## 6390  2.23650062
## 6391  2.23650062
## 6392  2.23650062
## 6393  2.23650062
## 6394  2.23650062
## 6395  2.23650062
## 6396  2.23650062
## 6397  2.23650062
## 6398  2.23650062
## 6399  2.23650062
## 6400  2.23650062
## 6401  2.55695390
## 6402  2.55695390
## 6403  2.55695390
## 6404  2.55695390
## 6405  2.55695390
## 6406  2.55695390
## 6407  2.55695390
## 6408  2.55695390
## 6409  2.55695390
## 6410  2.55695390
## 6411  2.55695390
## 6412  2.55695390
## 6413  2.55695390
## 6414  2.55695390
## 6415  2.55695390
## 6416  2.55695390
## 6417  0.44366602
## 6418  0.44366602
## 6419  0.44366602
## 6420  0.44366602
## 6421  0.44366602
## 6422  0.44366602
## 6423  0.44366602
## 6424  0.44366602
## 6425  0.44366602
## 6426  0.44366602
## 6427  0.44366602
## 6428  0.44366602
## 6429  0.44366602
## 6430  0.44366602
## 6431  0.44366602
## 6432  0.44366602
## 6433  2.95448442
## 6434  2.95448442
## 6435  2.95448442
## 6436  2.95448442
## 6437  2.95448442
## 6438  2.95448442
## 6439  2.95448442
## 6440  2.95448442
## 6441  2.95448442
## 6442  2.95448442
## 6443  2.95448442
## 6444  2.95448442
## 6445  2.95448442
## 6446  2.95448442
## 6447  2.95448442
## 6448  2.95448442
## 6449  0.42839231
## 6450  0.42839231
## 6451  0.42839231
## 6452  0.42839231
## 6453  0.42839231
## 6454  0.42839231
## 6455  0.42839231
## 6456  0.42839231
## 6457  0.42839231
## 6458  0.42839231
## 6459  0.42839231
## 6460  0.42839231
## 6461  0.42839231
## 6462  0.42839231
## 6463  0.42839231
## 6464  0.42839231
## 6465  0.32929819
## 6466  0.32929819
## 6467  0.32929819
## 6468  0.32929819
## 6469  0.32929819
## 6470  0.32929819
## 6471  0.32929819
## 6472  0.32929819
## 6473  0.32929819
## 6474  0.32929819
## 6475  0.32929819
## 6476  0.32929819
## 6477  0.32929819
## 6478  0.32929819
## 6479  0.32929819
## 6480  0.32929819
## 6481  0.56756071
## 6482  0.56756071
## 6483  0.56756071
## 6484  0.56756071
## 6485  0.56756071
## 6486  0.56756071
## 6487  0.56756071
## 6488  0.56756071
## 6489  0.56756071
## 6490  0.56756071
## 6491  0.56756071
## 6492  0.56756071
## 6493  0.56756071
## 6494  0.56756071
## 6495  0.56756071
## 6496  0.56756071
## 6497  0.67336581
## 6498  0.67336581
## 6499  0.67336581
## 6500  0.67336581
## 6501  0.67336581
## 6502  0.67336581
## 6503  0.67336581
## 6504  0.67336581
## 6505  0.67336581
## 6506  0.67336581
## 6507  0.67336581
## 6508  0.67336581
## 6509  0.67336581
## 6510  0.67336581
## 6511  0.67336581
## 6512  0.67336581
## 6513  1.18374113
## 6514  1.18374113
## 6515  1.18374113
## 6516  1.18374113
## 6517  1.18374113
## 6518  1.18374113
## 6519  1.18374113
## 6520  1.18374113
## 6521  1.18374113
## 6522  1.18374113
## 6523  1.18374113
## 6524  1.18374113
## 6525  1.18374113
## 6526  1.18374113
## 6527  1.18374113
## 6528  1.18374113
## 6529  0.35900079
## 6530  0.35900079
## 6531  0.35900079
## 6532  0.35900079
## 6533  0.35900079
## 6534  0.35900079
## 6535  0.35900079
## 6536  0.35900079
## 6537  0.35900079
## 6538  0.35900079
## 6539  0.35900079
## 6540  0.35900079
## 6541  0.35900079
## 6542  0.35900079
## 6543  0.35900079
## 6544  0.35900079
## 6545  0.14540939
## 6546  0.14540939
## 6547  0.14540939
## 6548  0.14540939
## 6549  0.14540939
## 6550  0.14540939
## 6551  0.14540939
## 6552  0.14540939
## 6553  0.14540939
## 6554  0.14540939
## 6555  0.14540939
## 6556  0.14540939
## 6557  0.14540939
## 6558  0.14540939
## 6559  0.14540939
## 6560  0.14540939
## 6561  1.40894621
## 6562  1.40894621
## 6563  1.40894621
## 6564  1.40894621
## 6565  1.40894621
## 6566  1.40894621
## 6567  1.40894621
## 6568  1.40894621
## 6569  1.40894621
## 6570  1.40894621
## 6571  1.40894621
## 6572  1.40894621
## 6573  1.40894621
## 6574  1.40894621
## 6575  1.40894621
## 6576  1.40894621
## 6577  0.71644374
## 6578  0.71644374
## 6579  0.71644374
## 6580  0.71644374
## 6581  0.71644374
## 6582  0.71644374
## 6583  0.71644374
## 6584  0.71644374
## 6585  0.71644374
## 6586  0.71644374
## 6587  0.71644374
## 6588  0.71644374
## 6589  0.71644374
## 6590  0.71644374
## 6591  0.71644374
## 6592  0.71644374
## 6593  0.94546867
## 6594  0.94546867
## 6595  0.94546867
## 6596  0.94546867
## 6597  0.94546867
## 6598  0.94546867
## 6599  0.94546867
## 6600  0.94546867
## 6601  0.94546867
## 6602  0.94546867
## 6603  0.94546867
## 6604  0.94546867
## 6605  0.94546867
## 6606  0.94546867
## 6607  0.94546867
## 6608  0.94546867
## 6609  1.54298470
## 6610  1.54298470
## 6611  1.54298470
## 6612  1.54298470
## 6613  1.54298470
## 6614  1.54298470
## 6615  1.54298470
## 6616  1.54298470
## 6617  1.54298470
## 6618  1.54298470
## 6619  1.54298470
## 6620  1.54298470
## 6621  1.54298470
## 6622  1.54298470
## 6623  1.54298470
## 6624  1.54298470
## 6625  0.49963587
## 6626  0.49963587
## 6627  0.49963587
## 6628  0.49963587
## 6629  0.49963587
## 6630  0.49963587
## 6631  0.49963587
## 6632  0.49963587
## 6633  0.49963587
## 6634  0.49963587
## 6635  0.49963587
## 6636  0.49963587
## 6637  0.49963587
## 6638  0.49963587
## 6639  0.49963587
## 6640  0.49963587
## 6641  0.63235193
## 6642  0.63235193
## 6643  0.63235193
## 6644  0.63235193
## 6645  0.63235193
## 6646  0.63235193
## 6647  0.63235193
## 6648  0.63235193
## 6649  0.63235193
## 6650  0.63235193
## 6651  0.63235193
## 6652  0.63235193
## 6653  0.63235193
## 6654  0.63235193
## 6655  0.63235193
## 6656  0.63235193
## 6657  0.80916205
## 6658  0.80916205
## 6659  0.80916205
## 6660  0.80916205
## 6661  0.80916205
## 6662  0.80916205
## 6663  0.80916205
## 6664  0.80916205
## 6665  0.80916205
## 6666  0.80916205
## 6667  0.80916205
## 6668  0.80916205
## 6669  0.80916205
## 6670  0.80916205
## 6671  0.80916205
## 6672  0.80916205
## 6673  0.15196760
## 6674  0.15196760
## 6675  0.15196760
## 6676  0.15196760
## 6677  0.15196760
## 6678  0.15196760
## 6679  0.15196760
## 6680  0.15196760
## 6681  0.15196760
## 6682  0.15196760
## 6683  0.15196760
## 6684  0.15196760
## 6685  0.15196760
## 6686  0.15196760
## 6687  0.15196760
## 6688  0.15196760
## 6689  0.40976163
## 6690  0.40976163
## 6691  0.40976163
## 6692  0.40976163
## 6693  0.40976163
## 6694  0.40976163
## 6695  0.40976163
## 6696  0.40976163
## 6697  0.40976163
## 6698  0.40976163
## 6699  0.40976163
## 6700  0.40976163
## 6701  0.40976163
## 6702  0.40976163
## 6703  0.40976163
## 6704  0.40976163
## 6705  0.81358635
## 6706  0.81358635
## 6707  0.81358635
## 6708  0.81358635
## 6709  0.81358635
## 6710  0.81358635
## 6711  0.81358635
## 6712  0.81358635
## 6713  0.81358635
## 6714  0.81358635
## 6715  0.81358635
## 6716  0.81358635
## 6717  0.81358635
## 6718  0.81358635
## 6719  0.81358635
## 6720  0.81358635
## 6721  0.39170176
## 6722  0.39170176
## 6723  0.39170176
## 6724  0.39170176
## 6725  0.39170176
## 6726  0.39170176
## 6727  0.39170176
## 6728  0.39170176
## 6729  0.39170176
## 6730  0.39170176
## 6731  0.39170176
## 6732  0.39170176
## 6733  0.39170176
## 6734  0.39170176
## 6735  0.39170176
## 6736  0.39170176
## 6737  0.49939239
## 6738  0.49939239
## 6739  0.49939239
## 6740  0.49939239
## 6741  0.49939239
## 6742  0.49939239
## 6743  0.49939239
## 6744  0.49939239
## 6745  0.49939239
## 6746  0.49939239
## 6747  0.49939239
## 6748  0.49939239
## 6749  0.49939239
## 6750  0.49939239
## 6751  0.49939239
## 6752  0.49939239
## 6753  1.93107722
## 6754  1.93107722
## 6755  1.93107722
## 6756  1.93107722
## 6757  1.93107722
## 6758  1.93107722
## 6759  1.93107722
## 6760  1.93107722
## 6761  1.93107722
## 6762  1.93107722
## 6763  1.93107722
## 6764  1.93107722
## 6765  1.93107722
## 6766  1.93107722
## 6767  1.93107722
## 6768  1.93107722
## 6769  0.96884316
## 6770  0.96884316
## 6771  0.96884316
## 6772  0.96884316
## 6773  0.96884316
## 6774  0.96884316
## 6775  0.96884316
## 6776  0.96884316
## 6777  0.96884316
## 6778  0.96884316
## 6779  0.96884316
## 6780  0.96884316
## 6781  0.96884316
## 6782  0.96884316
## 6783  0.96884316
## 6784  0.96884316
## 6785  0.11543056
## 6786  0.11543056
## 6787  0.11543056
## 6788  0.11543056
## 6789  0.11543056
## 6790  0.11543056
## 6791  0.11543056
## 6792  0.11543056
## 6793  0.11543056
## 6794  0.11543056
## 6795  0.11543056
## 6796  0.11543056
## 6797  0.11543056
## 6798  0.11543056
## 6799  0.11543056
## 6800  0.11543056
## 6801  0.43263246
## 6802  0.43263246
## 6803  0.43263246
## 6804  0.43263246
## 6805  0.43263246
## 6806  0.43263246
## 6807  0.43263246
## 6808  0.43263246
## 6809  0.43263246
## 6810  0.43263246
## 6811  0.43263246
## 6812  0.43263246
## 6813  0.43263246
## 6814  0.43263246
## 6815  0.43263246
## 6816  0.43263246
## 6817  0.65618778
## 6818  0.65618778
## 6819  0.65618778
## 6820  0.65618778
## 6821  0.65618778
## 6822  0.65618778
## 6823  0.65618778
## 6824  0.65618778
## 6825  0.65618778
## 6826  0.65618778
## 6827  0.65618778
## 6828  0.65618778
## 6829  0.65618778
## 6830  0.65618778
## 6831  0.65618778
## 6832  0.65618778
## 6833  0.77732255
## 6834  0.77732255
## 6835  0.77732255
## 6836  0.77732255
## 6837  0.77732255
## 6838  0.77732255
## 6839  0.77732255
## 6840  0.77732255
## 6841  0.77732255
## 6842  0.77732255
## 6843  0.77732255
## 6844  0.77732255
## 6845  0.77732255
## 6846  0.77732255
## 6847  0.77732255
## 6848  0.77732255
## 6849  1.10493119
## 6850  1.10493119
## 6851  1.10493119
## 6852  1.10493119
## 6853  1.10493119
## 6854  1.10493119
## 6855  1.10493119
## 6856  1.10493119
## 6857  1.10493119
## 6858  1.10493119
## 6859  1.10493119
## 6860  1.10493119
## 6861  1.10493119
## 6862  1.10493119
## 6863  1.10493119
## 6864  1.10493119
## 6865  0.70642214
## 6866  0.70642214
## 6867  0.70642214
## 6868  0.70642214
## 6869  0.70642214
## 6870  0.70642214
## 6871  0.70642214
## 6872  0.70642214
## 6873  0.70642214
## 6874  0.70642214
## 6875  0.70642214
## 6876  0.70642214
## 6877  0.70642214
## 6878  0.70642214
## 6879  0.70642214
## 6880  0.70642214
## 6881  2.27097723
## 6882  2.27097723
## 6883  2.27097723
## 6884  2.27097723
## 6885  2.27097723
## 6886  2.27097723
## 6887  2.27097723
## 6888  2.27097723
## 6889  2.27097723
## 6890  2.27097723
## 6891  2.27097723
## 6892  2.27097723
## 6893  2.27097723
## 6894  2.27097723
## 6895  2.27097723
## 6896  2.27097723
## 6897  0.75930334
## 6898  0.75930334
## 6899  0.75930334
## 6900  0.75930334
## 6901  0.75930334
## 6902  0.75930334
## 6903  0.75930334
## 6904  0.75930334
## 6905  0.75930334
## 6906  0.75930334
## 6907  0.75930334
## 6908  0.75930334
## 6909  0.75930334
## 6910  0.75930334
## 6911  0.75930334
## 6912  0.75930334
## 6913  1.28949691
## 6914  1.28949691
## 6915  1.28949691
## 6916  1.28949691
## 6917  1.28949691
## 6918  1.28949691
## 6919  1.28949691
## 6920  1.28949691
## 6921  1.28949691
## 6922  1.28949691
## 6923  1.28949691
## 6924  1.28949691
## 6925  1.28949691
## 6926  1.28949691
## 6927  1.28949691
## 6928  1.28949691
## 6929  2.21448264
## 6930  2.21448264
## 6931  2.21448264
## 6932  2.21448264
## 6933  2.21448264
## 6934  2.21448264
## 6935  2.21448264
## 6936  2.21448264
## 6937  2.21448264
## 6938  2.21448264
## 6939  2.21448264
## 6940  2.21448264
## 6941  2.21448264
## 6942  2.21448264
## 6943  2.21448264
## 6944  2.21448264
## 6945  9.05438935
## 6946  9.05438935
## 6947  9.05438935
## 6948  9.05438935
## 6949  9.05438935
## 6950  9.05438935
## 6951  9.05438935
## 6952  9.05438935
## 6953  9.05438935
## 6954  9.05438935
## 6955  9.05438935
## 6956  9.05438935
## 6957  9.05438935
## 6958  9.05438935
## 6959  9.05438935
## 6960  9.05438935
## 6961  2.50716180
## 6962  2.50716180
## 6963  2.50716180
## 6964  2.50716180
## 6965  2.50716180
## 6966  2.50716180
## 6967  2.50716180
## 6968  2.50716180
## 6969  2.50716180
## 6970  2.50716180
## 6971  2.50716180
## 6972  2.50716180
## 6973  2.50716180
## 6974  2.50716180
## 6975  2.50716180
## 6976  2.50716180
## 6977  0.46218120
## 6978  0.46218120
## 6979  0.46218120
## 6980  0.46218120
## 6981  0.46218120
## 6982  0.46218120
## 6983  0.46218120
## 6984  0.46218120
## 6985  0.46218120
## 6986  0.46218120
## 6987  0.46218120
## 6988  0.46218120
## 6989  0.46218120
## 6990  0.46218120
## 6991  0.46218120
## 6992  0.46218120
## 6993  0.07298271
## 6994  0.07298271
## 6995  0.07298271
## 6996  0.07298271
## 6997  0.07298271
## 6998  0.07298271
## 6999  0.07298271
## 7000  0.07298271
## 7001  0.07298271
## 7002  0.07298271
## 7003  0.07298271
## 7004  0.07298271
## 7005  0.07298271
## 7006  0.07298271
## 7007  0.07298271
## 7008  0.07298271
## 7009  1.16715285
## 7010  1.16715285
## 7011  1.16715285
## 7012  1.16715285
## 7013  1.16715285
## 7014  1.16715285
## 7015  1.16715285
## 7016  1.16715285
## 7017  1.16715285
## 7018  1.16715285
## 7019  1.16715285
## 7020  1.16715285
## 7021  1.16715285
## 7022  1.16715285
## 7023  1.16715285
## 7024  1.16715285
## 7025  0.53252466
## 7026  0.53252466
## 7027  0.53252466
## 7028  0.53252466
## 7029  0.53252466
## 7030  0.53252466
## 7031  0.53252466
## 7032  0.53252466
## 7033  0.53252466
## 7034  0.53252466
## 7035  0.53252466
## 7036  0.53252466
## 7037  0.53252466
## 7038  0.53252466
## 7039  0.53252466
## 7040  0.53252466
## 7041  5.80239354
## 7042  5.80239354
## 7043  5.80239354
## 7044  5.80239354
## 7045  5.80239354
## 7046  5.80239354
## 7047  5.80239354
## 7048  5.80239354
## 7049  5.80239354
## 7050  5.80239354
## 7051  5.80239354
## 7052  5.80239354
## 7053  5.80239354
## 7054  5.80239354
## 7055  5.80239354
## 7056  5.80239354
## 7057  1.94125972
## 7058  1.94125972
## 7059  1.94125972
## 7060  1.94125972
## 7061  1.94125972
## 7062  1.94125972
## 7063  1.94125972
## 7064  1.94125972
## 7065  1.94125972
## 7066  1.94125972
## 7067  1.94125972
## 7068  1.94125972
## 7069  1.94125972
## 7070  1.94125972
## 7071  1.94125972
## 7072  1.94125972
## 7073  0.72798821
## 7074  0.72798821
## 7075  0.72798821
## 7076  0.72798821
## 7077  0.72798821
## 7078  0.72798821
## 7079  0.72798821
## 7080  0.72798821
## 7081  0.72798821
## 7082  0.72798821
## 7083  0.72798821
## 7084  0.72798821
## 7085  0.72798821
## 7086  0.72798821
## 7087  0.72798821
## 7088  0.72798821
## 7089  0.63355850
## 7090  0.63355850
## 7091  0.63355850
## 7092  0.63355850
## 7093  0.63355850
## 7094  0.63355850
## 7095  0.63355850
## 7096  0.63355850
## 7097  0.63355850
## 7098  0.63355850
## 7099  0.63355850
## 7100  0.63355850
## 7101  0.63355850
## 7102  0.63355850
## 7103  0.63355850
## 7104  0.63355850
## 7105  0.51293163
## 7106  0.51293163
## 7107  0.51293163
## 7108  0.51293163
## 7109  0.51293163
## 7110  0.51293163
## 7111  0.51293163
## 7112  0.51293163
## 7113  0.51293163
## 7114  0.51293163
## 7115  0.51293163
## 7116  0.51293163
## 7117  0.51293163
## 7118  0.51293163
## 7119  0.51293163
## 7120  0.51293163
## 7121  0.62987700
## 7122  0.62987700
## 7123  0.62987700
## 7124  0.62987700
## 7125  0.62987700
## 7126  0.62987700
## 7127  0.62987700
## 7128  0.62987700
## 7129  0.62987700
## 7130  0.62987700
## 7131  0.62987700
## 7132  0.62987700
## 7133  0.62987700
## 7134  0.62987700
## 7135  0.62987700
## 7136  0.62987700
## 7137  2.04577256
## 7138  2.04577256
## 7139  2.04577256
## 7140  2.04577256
## 7141  2.04577256
## 7142  2.04577256
## 7143  2.04577256
## 7144  2.04577256
## 7145  2.04577256
## 7146  2.04577256
## 7147  2.04577256
## 7148  2.04577256
## 7149  2.04577256
## 7150  2.04577256
## 7151  2.04577256
## 7152  2.04577256
## 7153  1.26846982
## 7154  1.26846982
## 7155  1.26846982
## 7156  1.26846982
## 7157  1.26846982
## 7158  1.26846982
## 7159  1.26846982
## 7160  1.26846982
## 7161  1.26846982
## 7162  1.26846982
## 7163  1.26846982
## 7164  1.26846982
## 7165  1.26846982
## 7166  1.26846982
## 7167  1.26846982
## 7168  1.26846982
## 7169  0.61139633
## 7170  0.61139633
## 7171  0.61139633
## 7172  0.61139633
## 7173  0.61139633
## 7174  0.61139633
## 7175  0.61139633
## 7176  0.61139633
## 7177  0.61139633
## 7178  0.61139633
## 7179  0.61139633
## 7180  0.61139633
## 7181  0.61139633
## 7182  0.61139633
## 7183  0.61139633
## 7184  0.61139633
## 7185  0.50174444
## 7186  0.50174444
## 7187  0.50174444
## 7188  0.50174444
## 7189  0.50174444
## 7190  0.50174444
## 7191  0.50174444
## 7192  0.50174444
## 7193  0.50174444
## 7194  0.50174444
## 7195  0.50174444
## 7196  0.50174444
## 7197  0.50174444
## 7198  0.50174444
## 7199  0.50174444
## 7200  0.50174444
## 7201  0.49262626
## 7202  0.49262626
## 7203  0.49262626
## 7204  0.49262626
## 7205  0.49262626
## 7206  0.49262626
## 7207  0.49262626
## 7208  0.49262626
## 7209  0.49262626
## 7210  0.49262626
## 7211  0.49262626
## 7212  0.49262626
## 7213  0.49262626
## 7214  0.49262626
## 7215  0.49262626
## 7216  0.49262626
## 7217  0.29269968
## 7218  0.29269968
## 7219  0.29269968
## 7220  0.29269968
## 7221  0.29269968
## 7222  0.29269968
## 7223  0.29269968
## 7224  0.29269968
## 7225  0.29269968
## 7226  0.29269968
## 7227  0.29269968
## 7228  0.29269968
## 7229  0.29269968
## 7230  0.29269968
## 7231  0.29269968
## 7232  0.29269968
## 7233  0.83592156
## 7234  0.83592156
## 7235  0.83592156
## 7236  0.83592156
## 7237  0.83592156
## 7238  0.83592156
## 7239  0.83592156
## 7240  0.83592156
## 7241  0.83592156
## 7242  0.83592156
## 7243  0.83592156
## 7244  0.83592156
## 7245  0.83592156
## 7246  0.83592156
## 7247  0.83592156
## 7248  0.83592156
## 7249  0.56761739
## 7250  0.56761739
## 7251  0.56761739
## 7252  0.56761739
## 7253  0.56761739
## 7254  0.56761739
## 7255  0.56761739
## 7256  0.56761739
## 7257  0.56761739
## 7258  0.56761739
## 7259  0.56761739
## 7260  0.56761739
## 7261  0.56761739
## 7262  0.56761739
## 7263  0.56761739
## 7264  0.56761739
## 7265  0.24517157
## 7266  0.24517157
## 7267  0.24517157
## 7268  0.24517157
## 7269  0.24517157
## 7270  0.24517157
## 7271  0.24517157
## 7272  0.24517157
## 7273  0.24517157
## 7274  0.24517157
## 7275  0.24517157
## 7276  0.24517157
## 7277  0.24517157
## 7278  0.24517157
## 7279  0.24517157
## 7280  0.24517157
## 7281  0.88715560
## 7282  0.88715560
## 7283  0.88715560
## 7284  0.88715560
## 7285  0.88715560
## 7286  0.88715560
## 7287  0.88715560
## 7288  0.88715560
## 7289  0.88715560
## 7290  0.88715560
## 7291  0.88715560
## 7292  0.88715560
## 7293  0.88715560
## 7294  0.88715560
## 7295  0.88715560
## 7296  0.88715560
## 7297  0.50396997
## 7298  0.50396997
## 7299  0.50396997
## 7300  0.50396997
## 7301  0.50396997
## 7302  0.50396997
## 7303  0.50396997
## 7304  0.50396997
## 7305  0.50396997
## 7306  0.50396997
## 7307  0.50396997
## 7308  0.50396997
## 7309  0.50396997
## 7310  0.50396997
## 7311  0.50396997
## 7312  0.50396997
## 7313  0.61988661
## 7314  0.61988661
## 7315  0.61988661
## 7316  0.61988661
## 7317  0.61988661
## 7318  0.61988661
## 7319  0.61988661
## 7320  0.61988661
## 7321  0.61988661
## 7322  0.61988661
## 7323  0.61988661
## 7324  0.61988661
## 7325  0.61988661
## 7326  0.61988661
## 7327  0.61988661
## 7328  0.61988661
## 7329  1.89437627
## 7330  1.89437627
## 7331  1.89437627
## 7332  1.89437627
## 7333  1.89437627
## 7334  1.89437627
## 7335  1.89437627
## 7336  1.89437627
## 7337  1.89437627
## 7338  1.89437627
## 7339  1.89437627
## 7340  1.89437627
## 7341  1.89437627
## 7342  1.89437627
## 7343  1.89437627
## 7344  1.89437627
## 7345  0.08112884
## 7346  0.08112884
## 7347  0.08112884
## 7348  0.08112884
## 7349  0.08112884
## 7350  0.08112884
## 7351  0.08112884
## 7352  0.08112884
## 7353  0.08112884
## 7354  0.08112884
## 7355  0.08112884
## 7356  0.08112884
## 7357  0.08112884
## 7358  0.08112884
## 7359  0.08112884
## 7360  0.08112884
## 7361  1.31457887
## 7362  1.31457887
## 7363  1.31457887
## 7364  1.31457887
## 7365  1.31457887
## 7366  1.31457887
## 7367  1.31457887
## 7368  1.31457887
## 7369  1.31457887
## 7370  1.31457887
## 7371  1.31457887
## 7372  1.31457887
## 7373  1.31457887
## 7374  1.31457887
## 7375  1.31457887
## 7376  1.31457887
## 7377  0.48216967
## 7378  0.48216967
## 7379  0.48216967
## 7380  0.48216967
## 7381  0.48216967
## 7382  0.48216967
## 7383  0.48216967
## 7384  0.48216967
## 7385  0.48216967
## 7386  0.48216967
## 7387  0.48216967
## 7388  0.48216967
## 7389  0.48216967
## 7390  0.48216967
## 7391  0.48216967
## 7392  0.48216967
## 7393  1.73880000
## 7394  1.73880000
## 7395  1.73880000
## 7396  1.73880000
## 7397  1.73880000
## 7398  1.73880000
## 7399  1.73880000
## 7400  1.73880000
## 7401  1.73880000
## 7402  1.73880000
## 7403  1.73880000
## 7404  1.73880000
## 7405  1.73880000
## 7406  1.73880000
## 7407  1.73880000
## 7408  1.73880000
## 7409  1.31890790
## 7410  1.31890790
## 7411  1.31890790
## 7412  1.31890790
## 7413  1.31890790
## 7414  1.31890790
## 7415  1.31890790
## 7416  1.31890790
## 7417  1.31890790
## 7418  1.31890790
## 7419  1.31890790
## 7420  1.31890790
## 7421  1.31890790
## 7422  1.31890790
## 7423  1.31890790
## 7424  1.31890790
## 7425  0.47446730
## 7426  0.47446730
## 7427  0.47446730
## 7428  0.47446730
## 7429  0.47446730
## 7430  0.47446730
## 7431  0.47446730
## 7432  0.47446730
## 7433  0.47446730
## 7434  0.47446730
## 7435  0.47446730
## 7436  0.47446730
## 7437  0.47446730
## 7438  0.47446730
## 7439  0.47446730
## 7440  0.47446730
## 7441  1.69506073
## 7442  1.69506073
## 7443  1.69506073
## 7444  1.69506073
## 7445  1.69506073
## 7446  1.69506073
## 7447  1.69506073
## 7448  1.69506073
## 7449  1.69506073
## 7450  1.69506073
## 7451  1.69506073
## 7452  1.69506073
## 7453  1.69506073
## 7454  1.69506073
## 7455  1.69506073
## 7456  1.69506073
## 7457  0.16177133
## 7458  0.16177133
## 7459  0.16177133
## 7460  0.16177133
## 7461  0.16177133
## 7462  0.16177133
## 7463  0.16177133
## 7464  0.16177133
## 7465  0.16177133
## 7466  0.16177133
## 7467  0.16177133
## 7468  0.16177133
## 7469  0.16177133
## 7470  0.16177133
## 7471  0.16177133
## 7472  0.16177133
## 7473  0.66996007
## 7474  0.66996007
## 7475  0.66996007
## 7476  0.66996007
## 7477  0.66996007
## 7478  0.66996007
## 7479  0.66996007
## 7480  0.66996007
## 7481  0.66996007
## 7482  0.66996007
## 7483  0.66996007
## 7484  0.66996007
## 7485  0.66996007
## 7486  0.66996007
## 7487  0.66996007
## 7488  0.66996007
## 7489  0.76019426
## 7490  0.76019426
## 7491  0.76019426
## 7492  0.76019426
## 7493  0.76019426
## 7494  0.76019426
## 7495  0.76019426
## 7496  0.76019426
## 7497  0.76019426
## 7498  0.76019426
## 7499  0.76019426
## 7500  0.76019426
## 7501  0.76019426
## 7502  0.76019426
## 7503  0.76019426
## 7504  0.76019426
## 7505  1.92460581
## 7506  1.92460581
## 7507  1.92460581
## 7508  1.92460581
## 7509  1.92460581
## 7510  1.92460581
## 7511  1.92460581
## 7512  1.92460581
## 7513  1.92460581
## 7514  1.92460581
## 7515  1.92460581
## 7516  1.92460581
## 7517  1.92460581
## 7518  1.92460581
## 7519  1.92460581
## 7520  1.92460581
## 7521  2.06397295
## 7522  2.06397295
## 7523  2.06397295
## 7524  2.06397295
## 7525  2.06397295
## 7526  2.06397295
## 7527  2.06397295
## 7528  2.06397295
## 7529  2.06397295
## 7530  2.06397295
## 7531  2.06397295
## 7532  2.06397295
## 7533  2.06397295
## 7534  2.06397295
## 7535  2.06397295
## 7536  2.06397295
## 7537  0.85600229
## 7538  0.85600229
## 7539  0.85600229
## 7540  0.85600229
## 7541  0.85600229
## 7542  0.85600229
## 7543  0.85600229
## 7544  0.85600229
## 7545  0.85600229
## 7546  0.85600229
## 7547  0.85600229
## 7548  0.85600229
## 7549  0.85600229
## 7550  0.85600229
## 7551  0.85600229
## 7552  0.85600229
## 7553  2.38894479
## 7554  2.38894479
## 7555  2.38894479
## 7556  2.38894479
## 7557  2.38894479
## 7558  2.38894479
## 7559  2.38894479
## 7560  2.38894479
## 7561  2.38894479
## 7562  2.38894479
## 7563  2.38894479
## 7564  2.38894479
## 7565  2.38894479
## 7566  2.38894479
## 7567  2.38894479
## 7568  2.38894479
## 7569  0.53824995
## 7570  0.53824995
## 7571  0.53824995
## 7572  0.53824995
## 7573  0.53824995
## 7574  0.53824995
## 7575  0.53824995
## 7576  0.53824995
## 7577  0.53824995
## 7578  0.53824995
## 7579  0.53824995
## 7580  0.53824995
## 7581  0.53824995
## 7582  0.53824995
## 7583  0.53824995
## 7584  0.53824995
## 7585  0.46180871
## 7586  0.46180871
## 7587  0.46180871
## 7588  0.46180871
## 7589  0.46180871
## 7590  0.46180871
## 7591  0.46180871
## 7592  0.46180871
## 7593  0.46180871
## 7594  0.46180871
## 7595  0.46180871
## 7596  0.46180871
## 7597  0.46180871
## 7598  0.46180871
## 7599  0.46180871
## 7600  0.46180871
## 7601  2.64112352
## 7602  2.64112352
## 7603  2.64112352
## 7604  2.64112352
## 7605  2.64112352
## 7606  2.64112352
## 7607  2.64112352
## 7608  2.64112352
## 7609  2.64112352
## 7610  2.64112352
## 7611  2.64112352
## 7612  2.64112352
## 7613  2.64112352
## 7614  2.64112352
## 7615  2.64112352
## 7616  2.64112352
## 7617  0.73461307
## 7618  0.73461307
## 7619  0.73461307
## 7620  0.73461307
## 7621  0.73461307
## 7622  0.73461307
## 7623  0.73461307
## 7624  0.73461307
## 7625  0.73461307
## 7626  0.73461307
## 7627  0.73461307
## 7628  0.73461307
## 7629  0.73461307
## 7630  0.73461307
## 7631  0.73461307
## 7632  0.73461307
## 7633  1.19540349
## 7634  1.19540349
## 7635  1.19540349
## 7636  1.19540349
## 7637  1.19540349
## 7638  1.19540349
## 7639  1.19540349
## 7640  1.19540349
## 7641  1.19540349
## 7642  1.19540349
## 7643  1.19540349
## 7644  1.19540349
## 7645  1.19540349
## 7646  1.19540349
## 7647  1.19540349
## 7648  1.19540349
## 7649  0.73098259
## 7650  0.73098259
## 7651  0.73098259
## 7652  0.73098259
## 7653  0.73098259
## 7654  0.73098259
## 7655  0.73098259
## 7656  0.73098259
## 7657  0.73098259
## 7658  0.73098259
## 7659  0.73098259
## 7660  0.73098259
## 7661  0.73098259
## 7662  0.73098259
## 7663  0.73098259
## 7664  0.73098259
## 7665  2.83885766
## 7666  2.83885766
## 7667  2.83885766
## 7668  2.83885766
## 7669  2.83885766
## 7670  2.83885766
## 7671  2.83885766
## 7672  2.83885766
## 7673  2.83885766
## 7674  2.83885766
## 7675  2.83885766
## 7676  2.83885766
## 7677  2.83885766
## 7678  2.83885766
## 7679  2.83885766
## 7680  2.83885766
## 7681  3.06946158
## 7682  3.06946158
## 7683  3.06946158
## 7684  3.06946158
## 7685  3.06946158
## 7686  3.06946158
## 7687  3.06946158
## 7688  3.06946158
## 7689  3.06946158
## 7690  3.06946158
## 7691  3.06946158
## 7692  3.06946158
## 7693  3.06946158
## 7694  3.06946158
## 7695  3.06946158
## 7696  3.06946158
## 7697  0.45487461
## 7698  0.45487461
## 7699  0.45487461
## 7700  0.45487461
## 7701  0.45487461
## 7702  0.45487461
## 7703  0.45487461
## 7704  0.45487461
## 7705  0.45487461
## 7706  0.45487461
## 7707  0.45487461
## 7708  0.45487461
## 7709  0.45487461
## 7710  0.45487461
## 7711  0.45487461
## 7712  0.45487461
## 7713  0.79860623
## 7714  0.79860623
## 7715  0.79860623
## 7716  0.79860623
## 7717  0.79860623
## 7718  0.79860623
## 7719  0.79860623
## 7720  0.79860623
## 7721  0.79860623
## 7722  0.79860623
## 7723  0.79860623
## 7724  0.79860623
## 7725  0.79860623
## 7726  0.79860623
## 7727  0.79860623
## 7728  0.79860623
## 7729  0.77215862
## 7730  0.77215862
## 7731  0.77215862
## 7732  0.77215862
## 7733  0.77215862
## 7734  0.77215862
## 7735  0.77215862
## 7736  0.77215862
## 7737  0.77215862
## 7738  0.77215862
## 7739  0.77215862
## 7740  0.77215862
## 7741  0.77215862
## 7742  0.77215862
## 7743  0.77215862
## 7744  0.77215862
## 7745  0.26136432
## 7746  0.26136432
## 7747  0.26136432
## 7748  0.26136432
## 7749  0.26136432
## 7750  0.26136432
## 7751  0.26136432
## 7752  0.26136432
## 7753  0.26136432
## 7754  0.26136432
## 7755  0.26136432
## 7756  0.26136432
## 7757  0.26136432
## 7758  0.26136432
## 7759  0.26136432
## 7760  0.26136432
## 7761  0.56588925
## 7762  0.56588925
## 7763  0.56588925
## 7764  0.56588925
## 7765  0.56588925
## 7766  0.56588925
## 7767  0.56588925
## 7768  0.56588925
## 7769  0.56588925
## 7770  0.56588925
## 7771  0.56588925
## 7772  0.56588925
## 7773  0.56588925
## 7774  0.56588925
## 7775  0.56588925
## 7776  0.56588925
## 7777  1.09785202
## 7778  1.09785202
## 7779  1.09785202
## 7780  1.09785202
## 7781  1.09785202
## 7782  1.09785202
## 7783  1.09785202
## 7784  1.09785202
## 7785  1.09785202
## 7786  1.09785202
## 7787  1.09785202
## 7788  1.09785202
## 7789  1.09785202
## 7790  1.09785202
## 7791  1.09785202
## 7792  1.09785202
## 7793  0.01423511
## 7794  0.01423511
## 7795  0.01423511
## 7796  0.01423511
## 7797  0.01423511
## 7798  0.01423511
## 7799  0.01423511
## 7800  0.01423511
## 7801  0.01423511
## 7802  0.01423511
## 7803  0.01423511
## 7804  0.01423511
## 7805  0.01423511
## 7806  0.01423511
## 7807  0.01423511
## 7808  0.01423511
## 7809  0.44762870
## 7810  0.44762870
## 7811  0.44762870
## 7812  0.44762870
## 7813  0.44762870
## 7814  0.44762870
## 7815  0.44762870
## 7816  0.44762870
## 7817  0.44762870
## 7818  0.44762870
## 7819  0.44762870
## 7820  0.44762870
## 7821  0.44762870
## 7822  0.44762870
## 7823  0.44762870
## 7824  0.44762870
## 7825  0.37161086
## 7826  0.37161086
## 7827  0.37161086
## 7828  0.37161086
## 7829  0.37161086
## 7830  0.37161086
## 7831  0.37161086
## 7832  0.37161086
## 7833  0.37161086
## 7834  0.37161086
## 7835  0.37161086
## 7836  0.37161086
## 7837  0.37161086
## 7838  0.37161086
## 7839  0.37161086
## 7840  0.37161086
## 7841  0.59753812
## 7842  0.59753812
## 7843  0.59753812
## 7844  0.59753812
## 7845  0.59753812
## 7846  0.59753812
## 7847  0.59753812
## 7848  0.59753812
## 7849  0.59753812
## 7850  0.59753812
## 7851  0.59753812
## 7852  0.59753812
## 7853  0.59753812
## 7854  0.59753812
## 7855  0.59753812
## 7856  0.59753812
## 7857  1.64386405
## 7858  1.64386405
## 7859  1.64386405
## 7860  1.64386405
## 7861  1.64386405
## 7862  1.64386405
## 7863  1.64386405
## 7864  1.64386405
## 7865  1.64386405
## 7866  1.64386405
## 7867  1.64386405
## 7868  1.64386405
## 7869  1.64386405
## 7870  1.64386405
## 7871  1.64386405
## 7872  1.64386405
## 7873  0.55173534
## 7874  0.55173534
## 7875  0.55173534
## 7876  0.55173534
## 7877  0.55173534
## 7878  0.55173534
## 7879  0.55173534
## 7880  0.55173534
## 7881  0.55173534
## 7882  0.55173534
## 7883  0.55173534
## 7884  0.55173534
## 7885  0.55173534
## 7886  0.55173534
## 7887  0.55173534
## 7888  0.55173534
## 7889  0.82252689
## 7890  0.82252689
## 7891  0.82252689
## 7892  0.82252689
## 7893  0.82252689
## 7894  0.82252689
## 7895  0.82252689
## 7896  0.82252689
## 7897  0.82252689
## 7898  0.82252689
## 7899  0.82252689
## 7900  0.82252689
## 7901  0.82252689
## 7902  0.82252689
## 7903  0.82252689
## 7904  0.82252689
## 7905  0.41312392
## 7906  0.41312392
## 7907  0.41312392
## 7908  0.41312392
## 7909  0.41312392
## 7910  0.41312392
## 7911  0.41312392
## 7912  0.41312392
## 7913  0.41312392
## 7914  0.41312392
## 7915  0.41312392
## 7916  0.41312392
## 7917  0.41312392
## 7918  0.41312392
## 7919  0.41312392
## 7920  0.41312392
## 7921  3.05501230
## 7922  3.05501230
## 7923  3.05501230
## 7924  3.05501230
## 7925  3.05501230
## 7926  3.05501230
## 7927  3.05501230
## 7928  3.05501230
## 7929  3.05501230
## 7930  3.05501230
## 7931  3.05501230
## 7932  3.05501230
## 7933  3.05501230
## 7934  3.05501230
## 7935  3.05501230
## 7936  3.05501230
## 7937  1.05630373
## 7938  1.05630373
## 7939  1.05630373
## 7940  1.05630373
## 7941  1.05630373
## 7942  1.05630373
## 7943  1.05630373
## 7944  1.05630373
## 7945  1.05630373
## 7946  1.05630373
## 7947  1.05630373
## 7948  1.05630373
## 7949  1.05630373
## 7950  1.05630373
## 7951  1.05630373
## 7952  1.05630373
## 7953  2.19055215
## 7954  2.19055215
## 7955  2.19055215
## 7956  2.19055215
## 7957  2.19055215
## 7958  2.19055215
## 7959  2.19055215
## 7960  2.19055215
## 7961  2.19055215
## 7962  2.19055215
## 7963  2.19055215
## 7964  2.19055215
## 7965  2.19055215
## 7966  2.19055215
## 7967  2.19055215
## 7968  2.19055215
## 7969  2.02387016
## 7970  2.02387016
## 7971  2.02387016
## 7972  2.02387016
## 7973  2.02387016
## 7974  2.02387016
## 7975  2.02387016
## 7976  2.02387016
## 7977  2.02387016
## 7978  2.02387016
## 7979  2.02387016
## 7980  2.02387016
## 7981  2.02387016
## 7982  2.02387016
## 7983  2.02387016
## 7984  2.02387016
## 7985  3.86727730
## 7986  3.86727730
## 7987  3.86727730
## 7988  3.86727730
## 7989  3.86727730
## 7990  3.86727730
## 7991  3.86727730
## 7992  3.86727730
## 7993  3.86727730
## 7994  3.86727730
## 7995  3.86727730
## 7996  3.86727730
## 7997  3.86727730
## 7998  3.86727730
## 7999  3.86727730
## 8000  3.86727730
## 8001  2.36548472
## 8002  2.36548472
## 8003  2.36548472
## 8004  2.36548472
## 8005  2.36548472
## 8006  2.36548472
## 8007  2.36548472
## 8008  2.36548472
## 8009  2.36548472
## 8010  2.36548472
## 8011  2.36548472
## 8012  2.36548472
## 8013  2.36548472
## 8014  2.36548472
## 8015  2.36548472
## 8016  2.36548472
## 8017  0.57057669
## 8018  0.57057669
## 8019  0.57057669
## 8020  0.57057669
## 8021  0.57057669
## 8022  0.57057669
## 8023  0.57057669
## 8024  0.57057669
## 8025  0.57057669
## 8026  0.57057669
## 8027  0.57057669
## 8028  0.57057669
## 8029  0.57057669
## 8030  0.57057669
## 8031  0.57057669
## 8032  0.57057669
## 8033  0.66410122
## 8034  0.66410122
## 8035  0.66410122
## 8036  0.66410122
## 8037  0.66410122
## 8038  0.66410122
## 8039  0.66410122
## 8040  0.66410122
## 8041  0.66410122
## 8042  0.66410122
## 8043  0.66410122
## 8044  0.66410122
## 8045  0.66410122
## 8046  0.66410122
## 8047  0.66410122
## 8048  0.66410122
## 8049  1.75527391
## 8050  1.75527391
## 8051  1.75527391
## 8052  1.75527391
## 8053  1.75527391
## 8054  1.75527391
## 8055  1.75527391
## 8056  1.75527391
## 8057  1.75527391
## 8058  1.75527391
## 8059  1.75527391
## 8060  1.75527391
## 8061  1.75527391
## 8062  1.75527391
## 8063  1.75527391
## 8064  1.75527391
## 8065  1.72991945
## 8066  1.72991945
## 8067  1.72991945
## 8068  1.72991945
## 8069  1.72991945
## 8070  1.72991945
## 8071  1.72991945
## 8072  1.72991945
## 8073  1.72991945
## 8074  1.72991945
## 8075  1.72991945
## 8076  1.72991945
## 8077  1.72991945
## 8078  1.72991945
## 8079  1.72991945
## 8080  1.72991945
## 8081  0.18634708
## 8082  0.18634708
## 8083  0.18634708
## 8084  0.18634708
## 8085  0.18634708
## 8086  0.18634708
## 8087  0.18634708
## 8088  0.18634708
## 8089  0.18634708
## 8090  0.18634708
## 8091  0.18634708
## 8092  0.18634708
## 8093  0.18634708
## 8094  0.18634708
## 8095  0.18634708
## 8096  0.18634708
## 8097  3.48373700
## 8098  3.48373700
## 8099  3.48373700
## 8100  3.48373700
## 8101  3.48373700
## 8102  3.48373700
## 8103  3.48373700
## 8104  3.48373700
## 8105  3.48373700
## 8106  3.48373700
## 8107  3.48373700
## 8108  3.48373700
## 8109  3.48373700
## 8110  3.48373700
## 8111  3.48373700
## 8112  3.48373700
## 8113  0.80709909
## 8114  0.80709909
## 8115  0.80709909
## 8116  0.80709909
## 8117  0.80709909
## 8118  0.80709909
## 8119  0.80709909
## 8120  0.80709909
## 8121  0.80709909
## 8122  0.80709909
## 8123  0.80709909
## 8124  0.80709909
## 8125  0.80709909
## 8126  0.80709909
## 8127  0.80709909
## 8128  0.80709909
## 8129  3.06542830
## 8130  3.06542830
## 8131  3.06542830
## 8132  3.06542830
## 8133  3.06542830
## 8134  3.06542830
## 8135  3.06542830
## 8136  3.06542830
## 8137  3.06542830
## 8138  3.06542830
## 8139  3.06542830
## 8140  3.06542830
## 8141  3.06542830
## 8142  3.06542830
## 8143  3.06542830
## 8144  3.06542830
## 8145  3.53255170
## 8146  3.53255170
## 8147  3.53255170
## 8148  3.53255170
## 8149  3.53255170
## 8150  3.53255170
## 8151  3.53255170
## 8152  3.53255170
## 8153  3.53255170
## 8154  3.53255170
## 8155  3.53255170
## 8156  3.53255170
## 8157  3.53255170
## 8158  3.53255170
## 8159  3.53255170
## 8160  3.53255170
## 8161  1.13279276
## 8162  1.13279276
## 8163  1.13279276
## 8164  1.13279276
## 8165  1.13279276
## 8166  1.13279276
## 8167  1.13279276
## 8168  1.13279276
## 8169  1.13279276
## 8170  1.13279276
## 8171  1.13279276
## 8172  1.13279276
## 8173  1.13279276
## 8174  1.13279276
## 8175  1.13279276
## 8176  1.13279276
## 8177  0.86615963
## 8178  0.86615963
## 8179  0.86615963
## 8180  0.86615963
## 8181  0.86615963
## 8182  0.86615963
## 8183  0.86615963
## 8184  0.86615963
## 8185  0.86615963
## 8186  0.86615963
## 8187  0.86615963
## 8188  0.86615963
## 8189  0.86615963
## 8190  0.86615963
## 8191  0.86615963
## 8192  0.86615963
## 8193  0.27215963
## 8194  0.27215963
## 8195  0.27215963
## 8196  0.27215963
## 8197  0.27215963
## 8198  0.27215963
## 8199  0.27215963
## 8200  0.27215963
## 8201  0.27215963
## 8202  0.27215963
## 8203  0.27215963
## 8204  0.27215963
## 8205  0.27215963
## 8206  0.27215963
## 8207  0.27215963
## 8208  0.27215963
## 8209  0.80069293
## 8210  0.80069293
## 8211  0.80069293
## 8212  0.80069293
## 8213  0.80069293
## 8214  0.80069293
## 8215  0.80069293
## 8216  0.80069293
## 8217  0.80069293
## 8218  0.80069293
## 8219  0.80069293
## 8220  0.80069293
## 8221  0.80069293
## 8222  0.80069293
## 8223  0.80069293
## 8224  0.80069293
## 8225  0.57221745
## 8226  0.57221745
## 8227  0.57221745
## 8228  0.57221745
## 8229  0.57221745
## 8230  0.57221745
## 8231  0.57221745
## 8232  0.57221745
## 8233  0.57221745
## 8234  0.57221745
## 8235  0.57221745
## 8236  0.57221745
## 8237  0.57221745
## 8238  0.57221745
## 8239  0.57221745
## 8240  0.57221745
## 8241  0.52714147
## 8242  0.52714147
## 8243  0.52714147
## 8244  0.52714147
## 8245  0.52714147
## 8246  0.52714147
## 8247  0.52714147
## 8248  0.52714147
## 8249  0.52714147
## 8250  0.52714147
## 8251  0.52714147
## 8252  0.52714147
## 8253  0.52714147
## 8254  0.52714147
## 8255  0.52714147
## 8256  0.52714147
## 8257  2.23274887
## 8258  2.23274887
## 8259  2.23274887
## 8260  2.23274887
## 8261  2.23274887
## 8262  2.23274887
## 8263  2.23274887
## 8264  2.23274887
## 8265  2.23274887
## 8266  2.23274887
## 8267  2.23274887
## 8268  2.23274887
## 8269  2.23274887
## 8270  2.23274887
## 8271  2.23274887
## 8272  2.23274887
## 8273  2.42591241
## 8274  2.42591241
## 8275  2.42591241
## 8276  2.42591241
## 8277  2.42591241
## 8278  2.42591241
## 8279  2.42591241
## 8280  2.42591241
## 8281  2.42591241
## 8282  2.42591241
## 8283  2.42591241
## 8284  2.42591241
## 8285  2.42591241
## 8286  2.42591241
## 8287  2.42591241
## 8288  2.42591241
## 8289  1.10251774
## 8290  1.10251774
## 8291  1.10251774
## 8292  1.10251774
## 8293  1.10251774
## 8294  1.10251774
## 8295  1.10251774
## 8296  1.10251774
## 8297  1.10251774
## 8298  1.10251774
## 8299  1.10251774
## 8300  1.10251774
## 8301  1.10251774
## 8302  1.10251774
## 8303  1.10251774
## 8304  1.10251774
## 8305  1.11873849
## 8306  1.11873849
## 8307  1.11873849
## 8308  1.11873849
## 8309  1.11873849
## 8310  1.11873849
## 8311  1.11873849
## 8312  1.11873849
## 8313  1.11873849
## 8314  1.11873849
## 8315  1.11873849
## 8316  1.11873849
## 8317  1.11873849
## 8318  1.11873849
## 8319  1.11873849
## 8320  1.11873849
## 8321  1.70016230
## 8322  1.70016230
## 8323  1.70016230
## 8324  1.70016230
## 8325  1.70016230
## 8326  1.70016230
## 8327  1.70016230
## 8328  1.70016230
## 8329  1.70016230
## 8330  1.70016230
## 8331  1.70016230
## 8332  1.70016230
## 8333  1.70016230
## 8334  1.70016230
## 8335  1.70016230
## 8336  1.70016230
## 8337  0.35638851
## 8338  0.35638851
## 8339  0.35638851
## 8340  0.35638851
## 8341  0.35638851
## 8342  0.35638851
## 8343  0.35638851
## 8344  0.35638851
## 8345  0.35638851
## 8346  0.35638851
## 8347  0.35638851
## 8348  0.35638851
## 8349  0.35638851
## 8350  0.35638851
## 8351  0.35638851
## 8352  0.35638851
## 8353  0.42958618
## 8354  0.42958618
## 8355  0.42958618
## 8356  0.42958618
## 8357  0.42958618
## 8358  0.42958618
## 8359  0.42958618
## 8360  0.42958618
## 8361  0.42958618
## 8362  0.42958618
## 8363  0.42958618
## 8364  0.42958618
## 8365  0.42958618
## 8366  0.42958618
## 8367  0.42958618
## 8368  0.42958618
## 8369  0.58427986
## 8370  0.58427986
## 8371  0.58427986
## 8372  0.58427986
## 8373  0.58427986
## 8374  0.58427986
## 8375  0.58427986
## 8376  0.58427986
## 8377  0.58427986
## 8378  0.58427986
## 8379  0.58427986
## 8380  0.58427986
## 8381  0.58427986
## 8382  0.58427986
## 8383  0.58427986
## 8384  0.58427986
## 8385  0.18087954
## 8386  0.18087954
## 8387  0.18087954
## 8388  0.18087954
## 8389  0.18087954
## 8390  0.18087954
## 8391  0.18087954
## 8392  0.18087954
## 8393  0.18087954
## 8394  0.18087954
## 8395  0.18087954
## 8396  0.18087954
## 8397  0.18087954
## 8398  0.18087954
## 8399  0.18087954
## 8400  0.18087954
## 8401  0.40933203
## 8402  0.40933203
## 8403  0.40933203
## 8404  0.40933203
## 8405  0.40933203
## 8406  0.40933203
## 8407  0.40933203
## 8408  0.40933203
## 8409  0.40933203
## 8410  0.40933203
## 8411  0.40933203
## 8412  0.40933203
## 8413  0.40933203
## 8414  0.40933203
## 8415  0.40933203
## 8416  0.40933203
## 8417  0.11621638
## 8418  0.11621638
## 8419  0.11621638
## 8420  0.11621638
## 8421  0.11621638
## 8422  0.11621638
## 8423  0.11621638
## 8424  0.11621638
## 8425  0.11621638
## 8426  0.11621638
## 8427  0.11621638
## 8428  0.11621638
## 8429  0.11621638
## 8430  0.11621638
## 8431  0.11621638
## 8432  0.11621638
## 8433  0.74393614
## 8434  0.74393614
## 8435  0.74393614
## 8436  0.74393614
## 8437  0.74393614
## 8438  0.74393614
## 8439  0.74393614
## 8440  0.74393614
## 8441  0.74393614
## 8442  0.74393614
## 8443  0.74393614
## 8444  0.74393614
## 8445  0.74393614
## 8446  0.74393614
## 8447  0.74393614
## 8448  0.74393614
## 8449  0.75405139
## 8450  0.75405139
## 8451  0.75405139
## 8452  0.75405139
## 8453  0.75405139
## 8454  0.75405139
## 8455  0.75405139
## 8456  0.75405139
## 8457  0.75405139
## 8458  0.75405139
## 8459  0.75405139
## 8460  0.75405139
## 8461  0.75405139
## 8462  0.75405139
## 8463  0.75405139
## 8464  0.75405139
## 8465  0.82585325
## 8466  0.82585325
## 8467  0.82585325
## 8468  0.82585325
## 8469  0.82585325
## 8470  0.82585325
## 8471  0.82585325
## 8472  0.82585325
## 8473  0.82585325
## 8474  0.82585325
## 8475  0.82585325
## 8476  0.82585325
## 8477  0.82585325
## 8478  0.82585325
## 8479  0.82585325
## 8480  0.82585325
## 8481  2.71434893
## 8482  2.71434893
## 8483  2.71434893
## 8484  2.71434893
## 8485  2.71434893
## 8486  2.71434893
## 8487  2.71434893
## 8488  2.71434893
## 8489  2.71434893
## 8490  2.71434893
## 8491  2.71434893
## 8492  2.71434893
## 8493  2.71434893
## 8494  2.71434893
## 8495  2.71434893
## 8496  2.71434893
## 8497  0.59925762
## 8498  0.59925762
## 8499  0.59925762
## 8500  0.59925762
## 8501  0.59925762
## 8502  0.59925762
## 8503  0.59925762
## 8504  0.59925762
## 8505  0.59925762
## 8506  0.59925762
## 8507  0.59925762
## 8508  0.59925762
## 8509  0.59925762
## 8510  0.59925762
## 8511  0.59925762
## 8512  0.59925762
## 8513  0.54102044
## 8514  0.54102044
## 8515  0.54102044
## 8516  0.54102044
## 8517  0.54102044
## 8518  0.54102044
## 8519  0.54102044
## 8520  0.54102044
## 8521  0.54102044
## 8522  0.54102044
## 8523  0.54102044
## 8524  0.54102044
## 8525  0.54102044
## 8526  0.54102044
## 8527  0.54102044
## 8528  0.54102044
## 8529  4.57434398
## 8530  4.57434398
## 8531  4.57434398
## 8532  4.57434398
## 8533  4.57434398
## 8534  4.57434398
## 8535  4.57434398
## 8536  4.57434398
## 8537  4.57434398
## 8538  4.57434398
## 8539  4.57434398
## 8540  4.57434398
## 8541  4.57434398
## 8542  4.57434398
## 8543  4.57434398
## 8544  4.57434398
## 8545  2.15345659
## 8546  2.15345659
## 8547  2.15345659
## 8548  2.15345659
## 8549  2.15345659
## 8550  2.15345659
## 8551  2.15345659
## 8552  2.15345659
## 8553  2.15345659
## 8554  2.15345659
## 8555  2.15345659
## 8556  2.15345659
## 8557  2.15345659
## 8558  2.15345659
## 8559  2.15345659
## 8560  2.15345659
## 8561  1.24394392
## 8562  1.24394392
## 8563  1.24394392
## 8564  1.24394392
## 8565  1.24394392
## 8566  1.24394392
## 8567  1.24394392
## 8568  1.24394392
## 8569  1.24394392
## 8570  1.24394392
## 8571  1.24394392
## 8572  1.24394392
## 8573  1.24394392
## 8574  1.24394392
## 8575  1.24394392
## 8576  1.24394392
## 8577  0.46159849
## 8578  0.46159849
## 8579  0.46159849
## 8580  0.46159849
## 8581  0.46159849
## 8582  0.46159849
## 8583  0.46159849
## 8584  0.46159849
## 8585  0.46159849
## 8586  0.46159849
## 8587  0.46159849
## 8588  0.46159849
## 8589  0.46159849
## 8590  0.46159849
## 8591  0.46159849
## 8592  0.46159849
## 8593  1.29479619
## 8594  1.29479619
## 8595  1.29479619
## 8596  1.29479619
## 8597  1.29479619
## 8598  1.29479619
## 8599  1.29479619
## 8600  1.29479619
## 8601  1.29479619
## 8602  1.29479619
## 8603  1.29479619
## 8604  1.29479619
## 8605  1.29479619
## 8606  1.29479619
## 8607  1.29479619
## 8608  1.29479619
## 8609  0.98882473
## 8610  0.98882473
## 8611  0.98882473
## 8612  0.98882473
## 8613  0.98882473
## 8614  0.98882473
## 8615  0.98882473
## 8616  0.98882473
## 8617  0.98882473
## 8618  0.98882473
## 8619  0.98882473
## 8620  0.98882473
## 8621  0.98882473
## 8622  0.98882473
## 8623  0.98882473
## 8624  0.98882473
## 8625  1.37373354
## 8626  1.37373354
## 8627  1.37373354
## 8628  1.37373354
## 8629  1.37373354
## 8630  1.37373354
## 8631  1.37373354
## 8632  1.37373354
## 8633  1.37373354
## 8634  1.37373354
## 8635  1.37373354
## 8636  1.37373354
## 8637  1.37373354
## 8638  1.37373354
## 8639  1.37373354
## 8640  1.37373354
## 8641  1.33266781
## 8642  1.33266781
## 8643  1.33266781
## 8644  1.33266781
## 8645  1.33266781
## 8646  1.33266781
## 8647  1.33266781
## 8648  1.33266781
## 8649  1.33266781
## 8650  1.33266781
## 8651  1.33266781
## 8652  1.33266781
## 8653  1.33266781
## 8654  1.33266781
## 8655  1.33266781
## 8656  1.33266781
## 8657  0.79341419
## 8658  0.79341419
## 8659  0.79341419
## 8660  0.79341419
## 8661  0.79341419
## 8662  0.79341419
## 8663  0.79341419
## 8664  0.79341419
## 8665  0.79341419
## 8666  0.79341419
## 8667  0.79341419
## 8668  0.79341419
## 8669  0.79341419
## 8670  0.79341419
## 8671  0.79341419
## 8672  0.79341419
## 8673  0.22332217
## 8674  0.22332217
## 8675  0.22332217
## 8676  0.22332217
## 8677  0.22332217
## 8678  0.22332217
## 8679  0.22332217
## 8680  0.22332217
## 8681  0.22332217
## 8682  0.22332217
## 8683  0.22332217
## 8684  0.22332217
## 8685  0.22332217
## 8686  0.22332217
## 8687  0.22332217
## 8688  0.22332217
## 8689  1.09894524
## 8690  1.09894524
## 8691  1.09894524
## 8692  1.09894524
## 8693  1.09894524
## 8694  1.09894524
## 8695  1.09894524
## 8696  1.09894524
## 8697  1.09894524
## 8698  1.09894524
## 8699  1.09894524
## 8700  1.09894524
## 8701  1.09894524
## 8702  1.09894524
## 8703  1.09894524
## 8704  1.09894524
## 8705  1.20329017
## 8706  1.20329017
## 8707  1.20329017
## 8708  1.20329017
## 8709  1.20329017
## 8710  1.20329017
## 8711  1.20329017
## 8712  1.20329017
## 8713  1.20329017
## 8714  1.20329017
## 8715  1.20329017
## 8716  1.20329017
## 8717  1.20329017
## 8718  1.20329017
## 8719  1.20329017
## 8720  1.20329017
## 8721  0.32628839
## 8722  0.32628839
## 8723  0.32628839
## 8724  0.32628839
## 8725  0.32628839
## 8726  0.32628839
## 8727  0.32628839
## 8728  0.32628839
## 8729  0.32628839
## 8730  0.32628839
## 8731  0.32628839
## 8732  0.32628839
## 8733  0.32628839
## 8734  0.32628839
## 8735  0.32628839
## 8736  0.32628839
## 8737  0.81526656
## 8738  0.81526656
## 8739  0.81526656
## 8740  0.81526656
## 8741  0.81526656
## 8742  0.81526656
## 8743  0.81526656
## 8744  0.81526656
## 8745  0.81526656
## 8746  0.81526656
## 8747  0.81526656
## 8748  0.81526656
## 8749  0.81526656
## 8750  0.81526656
## 8751  0.81526656
## 8752  0.81526656
## 8753  2.44739249
## 8754  2.44739249
## 8755  2.44739249
## 8756  2.44739249
## 8757  2.44739249
## 8758  2.44739249
## 8759  2.44739249
## 8760  2.44739249
## 8761  2.44739249
## 8762  2.44739249
## 8763  2.44739249
## 8764  2.44739249
## 8765  2.44739249
## 8766  2.44739249
## 8767  2.44739249
## 8768  2.44739249
## 8769  0.24096864
## 8770  0.24096864
## 8771  0.24096864
## 8772  0.24096864
## 8773  0.24096864
## 8774  0.24096864
## 8775  0.24096864
## 8776  0.24096864
## 8777  0.24096864
## 8778  0.24096864
## 8779  0.24096864
## 8780  0.24096864
## 8781  0.24096864
## 8782  0.24096864
## 8783  0.24096864
## 8784  0.24096864
## 8785  1.55458330
## 8786  1.55458330
## 8787  1.55458330
## 8788  1.55458330
## 8789  1.55458330
## 8790  1.55458330
## 8791  1.55458330
## 8792  1.55458330
## 8793  1.55458330
## 8794  1.55458330
## 8795  1.55458330
## 8796  1.55458330
## 8797  1.55458330
## 8798  1.55458330
## 8799  1.55458330
## 8800  1.55458330
## 8801  0.71729142
## 8802  0.71729142
## 8803  0.71729142
## 8804  0.71729142
## 8805  0.71729142
## 8806  0.71729142
## 8807  0.71729142
## 8808  0.71729142
## 8809  0.71729142
## 8810  0.71729142
## 8811  0.71729142
## 8812  0.71729142
## 8813  0.71729142
## 8814  0.71729142
## 8815  0.71729142
## 8816  0.71729142
## 8817  0.71296438
## 8818  0.71296438
## 8819  0.71296438
## 8820  0.71296438
## 8821  0.71296438
## 8822  0.71296438
## 8823  0.71296438
## 8824  0.71296438
## 8825  0.71296438
## 8826  0.71296438
## 8827  0.71296438
## 8828  0.71296438
## 8829  0.71296438
## 8830  0.71296438
## 8831  0.71296438
## 8832  0.71296438
## 8833  1.04152363
## 8834  1.04152363
## 8835  1.04152363
## 8836  1.04152363
## 8837  1.04152363
## 8838  1.04152363
## 8839  1.04152363
## 8840  1.04152363
## 8841  1.04152363
## 8842  1.04152363
## 8843  1.04152363
## 8844  1.04152363
## 8845  1.04152363
## 8846  1.04152363
## 8847  1.04152363
## 8848  1.04152363
## 8849  0.17774489
## 8850  0.17774489
## 8851  0.17774489
## 8852  0.17774489
## 8853  0.17774489
## 8854  0.17774489
## 8855  0.17774489
## 8856  0.17774489
## 8857  0.17774489
## 8858  0.17774489
## 8859  0.17774489
## 8860  0.17774489
## 8861  0.17774489
## 8862  0.17774489
## 8863  0.17774489
## 8864  0.17774489
## 8865  0.16349785
## 8866  0.16349785
## 8867  0.16349785
## 8868  0.16349785
## 8869  0.16349785
## 8870  0.16349785
## 8871  0.16349785
## 8872  0.16349785
## 8873  0.16349785
## 8874  0.16349785
## 8875  0.16349785
## 8876  0.16349785
## 8877  0.16349785
## 8878  0.16349785
## 8879  0.16349785
## 8880  0.16349785
## 8881  0.11055574
## 8882  0.11055574
## 8883  0.11055574
## 8884  0.11055574
## 8885  0.11055574
## 8886  0.11055574
## 8887  0.11055574
## 8888  0.11055574
## 8889  0.11055574
## 8890  0.11055574
## 8891  0.11055574
## 8892  0.11055574
## 8893  0.11055574
## 8894  0.11055574
## 8895  0.11055574
## 8896  0.11055574
## 8897  2.54736206
## 8898  2.54736206
## 8899  2.54736206
## 8900  2.54736206
## 8901  2.54736206
## 8902  2.54736206
## 8903  2.54736206
## 8904  2.54736206
## 8905  2.54736206
## 8906  2.54736206
## 8907  2.54736206
## 8908  2.54736206
## 8909  2.54736206
## 8910  2.54736206
## 8911  2.54736206
## 8912  2.54736206
## 8913  0.75670257
## 8914  0.75670257
## 8915  0.75670257
## 8916  0.75670257
## 8917  0.75670257
## 8918  0.75670257
## 8919  0.75670257
## 8920  0.75670257
## 8921  0.75670257
## 8922  0.75670257
## 8923  0.75670257
## 8924  0.75670257
## 8925  0.75670257
## 8926  0.75670257
## 8927  0.75670257
## 8928  0.75670257
## 8929  1.53357051
## 8930  1.53357051
## 8931  1.53357051
## 8932  1.53357051
## 8933  1.53357051
## 8934  1.53357051
## 8935  1.53357051
## 8936  1.53357051
## 8937  1.53357051
## 8938  1.53357051
## 8939  1.53357051
## 8940  1.53357051
## 8941  1.53357051
## 8942  1.53357051
## 8943  1.53357051
## 8944  1.53357051
## 8945  1.75290661
## 8946  1.75290661
## 8947  1.75290661
## 8948  1.75290661
## 8949  1.75290661
## 8950  1.75290661
## 8951  1.75290661
## 8952  1.75290661
## 8953  1.75290661
## 8954  1.75290661
## 8955  1.75290661
## 8956  1.75290661
## 8957  1.75290661
## 8958  1.75290661
## 8959  1.75290661
## 8960  1.75290661
## 8961  0.92396422
## 8962  0.92396422
## 8963  0.92396422
## 8964  0.92396422
## 8965  0.92396422
## 8966  0.92396422
## 8967  0.92396422
## 8968  0.92396422
## 8969  0.92396422
## 8970  0.92396422
## 8971  0.92396422
## 8972  0.92396422
## 8973  0.92396422
## 8974  0.92396422
## 8975  0.92396422
## 8976  0.92396422
## 8977  1.13728365
## 8978  1.13728365
## 8979  1.13728365
## 8980  1.13728365
## 8981  1.13728365
## 8982  1.13728365
## 8983  1.13728365
## 8984  1.13728365
## 8985  1.13728365
## 8986  1.13728365
## 8987  1.13728365
## 8988  1.13728365
## 8989  1.13728365
## 8990  1.13728365
## 8991  1.13728365
## 8992  1.13728365
## 8993  0.61358362
## 8994  0.61358362
## 8995  0.61358362
## 8996  0.61358362
## 8997  0.61358362
## 8998  0.61358362
## 8999  0.61358362
## 9000  0.61358362
## 9001  0.61358362
## 9002  0.61358362
## 9003  0.61358362
## 9004  0.61358362
## 9005  0.61358362
## 9006  0.61358362
## 9007  0.61358362
## 9008  0.61358362
## 9009  1.09406409
## 9010  1.09406409
## 9011  1.09406409
## 9012  1.09406409
## 9013  1.09406409
## 9014  1.09406409
## 9015  1.09406409
## 9016  1.09406409
## 9017  1.09406409
## 9018  1.09406409
## 9019  1.09406409
## 9020  1.09406409
## 9021  1.09406409
## 9022  1.09406409
## 9023  1.09406409
## 9024  1.09406409
## 9025  0.37981203
## 9026  0.37981203
## 9027  0.37981203
## 9028  0.37981203
## 9029  0.37981203
## 9030  0.37981203
## 9031  0.37981203
## 9032  0.37981203
## 9033  0.37981203
## 9034  0.37981203
## 9035  0.37981203
## 9036  0.37981203
## 9037  0.37981203
## 9038  0.37981203
## 9039  0.37981203
## 9040  0.37981203
## 9041  0.38433790
## 9042  0.38433790
## 9043  0.38433790
## 9044  0.38433790
## 9045  0.38433790
## 9046  0.38433790
## 9047  0.38433790
## 9048  0.38433790
## 9049  0.38433790
## 9050  0.38433790
## 9051  0.38433790
## 9052  0.38433790
## 9053  0.38433790
## 9054  0.38433790
## 9055  0.38433790
## 9056  0.38433790
## 9057  0.26188090
## 9058  0.26188090
## 9059  0.26188090
## 9060  0.26188090
## 9061  0.26188090
## 9062  0.26188090
## 9063  0.26188090
## 9064  0.26188090
## 9065  0.26188090
## 9066  0.26188090
## 9067  0.26188090
## 9068  0.26188090
## 9069  0.26188090
## 9070  0.26188090
## 9071  0.26188090
## 9072  0.26188090
## 9073  0.32032407
## 9074  0.32032407
## 9075  0.32032407
## 9076  0.32032407
## 9077  0.32032407
## 9078  0.32032407
## 9079  0.32032407
## 9080  0.32032407
## 9081  0.32032407
## 9082  0.32032407
## 9083  0.32032407
## 9084  0.32032407
## 9085  0.32032407
## 9086  0.32032407
## 9087  0.32032407
## 9088  0.32032407
## 9089  0.49246291
## 9090  0.49246291
## 9091  0.49246291
## 9092  0.49246291
## 9093  0.49246291
## 9094  0.49246291
## 9095  0.49246291
## 9096  0.49246291
## 9097  0.49246291
## 9098  0.49246291
## 9099  0.49246291
## 9100  0.49246291
## 9101  0.49246291
## 9102  0.49246291
## 9103  0.49246291
## 9104  0.49246291
## 9105  0.27672051
## 9106  0.27672051
## 9107  0.27672051
## 9108  0.27672051
## 9109  0.27672051
## 9110  0.27672051
## 9111  0.27672051
## 9112  0.27672051
## 9113  0.27672051
## 9114  0.27672051
## 9115  0.27672051
## 9116  0.27672051
## 9117  0.27672051
## 9118  0.27672051
## 9119  0.27672051
## 9120  0.27672051
## 9121  0.42088172
## 9122  0.42088172
## 9123  0.42088172
## 9124  0.42088172
## 9125  0.42088172
## 9126  0.42088172
## 9127  0.42088172
## 9128  0.42088172
## 9129  0.42088172
## 9130  0.42088172
## 9131  0.42088172
## 9132  0.42088172
## 9133  0.42088172
## 9134  0.42088172
## 9135  0.42088172
## 9136  0.42088172
## 9137  0.33426314
## 9138  0.33426314
## 9139  0.33426314
## 9140  0.33426314
## 9141  0.33426314
## 9142  0.33426314
## 9143  0.33426314
## 9144  0.33426314
## 9145  0.33426314
## 9146  0.33426314
## 9147  0.33426314
## 9148  0.33426314
## 9149  0.33426314
## 9150  0.33426314
## 9151  0.33426314
## 9152  0.33426314
## 9153  1.09433887
## 9154  1.09433887
## 9155  1.09433887
## 9156  1.09433887
## 9157  1.09433887
## 9158  1.09433887
## 9159  1.09433887
## 9160  1.09433887
## 9161  1.09433887
## 9162  1.09433887
## 9163  1.09433887
## 9164  1.09433887
## 9165  1.09433887
## 9166  1.09433887
## 9167  1.09433887
## 9168  1.09433887
## 9169  0.15206991
## 9170  0.15206991
## 9171  0.15206991
## 9172  0.15206991
## 9173  0.15206991
## 9174  0.15206991
## 9175  0.15206991
## 9176  0.15206991
## 9177  0.15206991
## 9178  0.15206991
## 9179  0.15206991
## 9180  0.15206991
## 9181  0.15206991
## 9182  0.15206991
## 9183  0.15206991
## 9184  0.15206991
## 9185  0.60418787
## 9186  0.60418787
## 9187  0.60418787
## 9188  0.60418787
## 9189  0.60418787
## 9190  0.60418787
## 9191  0.60418787
## 9192  0.60418787
## 9193  0.60418787
## 9194  0.60418787
## 9195  0.60418787
## 9196  0.60418787
## 9197  0.60418787
## 9198  0.60418787
## 9199  0.60418787
## 9200  0.60418787
## 9201  1.59057774
## 9202  1.59057774
## 9203  1.59057774
## 9204  1.59057774
## 9205  1.59057774
## 9206  1.59057774
## 9207  1.59057774
## 9208  1.59057774
## 9209  1.59057774
## 9210  1.59057774
## 9211  1.59057774
## 9212  1.59057774
## 9213  1.59057774
## 9214  1.59057774
## 9215  1.59057774
## 9216  1.59057774
## 9217  0.76374884
## 9218  0.76374884
## 9219  0.76374884
## 9220  0.76374884
## 9221  0.76374884
## 9222  0.76374884
## 9223  0.76374884
## 9224  0.76374884
## 9225  0.76374884
## 9226  0.76374884
## 9227  0.76374884
## 9228  0.76374884
## 9229  0.76374884
## 9230  0.76374884
## 9231  0.76374884
## 9232  0.76374884
## 9233  2.20009324
## 9234  2.20009324
## 9235  2.20009324
## 9236  2.20009324
## 9237  2.20009324
## 9238  2.20009324
## 9239  2.20009324
## 9240  2.20009324
## 9241  2.20009324
## 9242  2.20009324
## 9243  2.20009324
## 9244  2.20009324
## 9245  2.20009324
## 9246  2.20009324
## 9247  2.20009324
## 9248  2.20009324
## 9249  0.88266594
## 9250  0.88266594
## 9251  0.88266594
## 9252  0.88266594
## 9253  0.88266594
## 9254  0.88266594
## 9255  0.88266594
## 9256  0.88266594
## 9257  0.88266594
## 9258  0.88266594
## 9259  0.88266594
## 9260  0.88266594
## 9261  0.88266594
## 9262  0.88266594
## 9263  0.88266594
## 9264  0.88266594
## 9265  1.75236526
## 9266  1.75236526
## 9267  1.75236526
## 9268  1.75236526
## 9269  1.75236526
## 9270  1.75236526
## 9271  1.75236526
## 9272  1.75236526
## 9273  1.75236526
## 9274  1.75236526
## 9275  1.75236526
## 9276  1.75236526
## 9277  1.75236526
## 9278  1.75236526
## 9279  1.75236526
## 9280  1.75236526
## 9281  0.17909796
## 9282  0.17909796
## 9283  0.17909796
## 9284  0.17909796
## 9285  0.17909796
## 9286  0.17909796
## 9287  0.17909796
## 9288  0.17909796
## 9289  0.17909796
## 9290  0.17909796
## 9291  0.17909796
## 9292  0.17909796
## 9293  0.17909796
## 9294  0.17909796
## 9295  0.17909796
## 9296  0.17909796
## 9297  0.57567290
## 9298  0.57567290
## 9299  0.57567290
## 9300  0.57567290
## 9301  0.57567290
## 9302  0.57567290
## 9303  0.57567290
## 9304  0.57567290
## 9305  0.57567290
## 9306  0.57567290
## 9307  0.57567290
## 9308  0.57567290
## 9309  0.57567290
## 9310  0.57567290
## 9311  0.57567290
## 9312  0.57567290
## 9313  1.78674043
## 9314  1.78674043
## 9315  1.78674043
## 9316  1.78674043
## 9317  1.78674043
## 9318  1.78674043
## 9319  1.78674043
## 9320  1.78674043
## 9321  1.78674043
## 9322  1.78674043
## 9323  1.78674043
## 9324  1.78674043
## 9325  1.78674043
## 9326  1.78674043
## 9327  1.78674043
## 9328  1.78674043
## 9329  5.00541955
## 9330  5.00541955
## 9331  5.00541955
## 9332  5.00541955
## 9333  5.00541955
## 9334  5.00541955
## 9335  5.00541955
## 9336  5.00541955
## 9337  5.00541955
## 9338  5.00541955
## 9339  5.00541955
## 9340  5.00541955
## 9341  5.00541955
## 9342  5.00541955
## 9343  5.00541955
## 9344  5.00541955
## 9345  0.28151470
## 9346  0.28151470
## 9347  0.28151470
## 9348  0.28151470
## 9349  0.28151470
## 9350  0.28151470
## 9351  0.28151470
## 9352  0.28151470
## 9353  0.28151470
## 9354  0.28151470
## 9355  0.28151470
## 9356  0.28151470
## 9357  0.28151470
## 9358  0.28151470
## 9359  0.28151470
## 9360  0.28151470
## 9361  1.15705566
## 9362  1.15705566
## 9363  1.15705566
## 9364  1.15705566
## 9365  1.15705566
## 9366  1.15705566
## 9367  1.15705566
## 9368  1.15705566
## 9369  1.15705566
## 9370  1.15705566
## 9371  1.15705566
## 9372  1.15705566
## 9373  1.15705566
## 9374  1.15705566
## 9375  1.15705566
## 9376  1.15705566
## 9377  0.62232748
## 9378  0.62232748
## 9379  0.62232748
## 9380  0.62232748
## 9381  0.62232748
## 9382  0.62232748
## 9383  0.62232748
## 9384  0.62232748
## 9385  0.62232748
## 9386  0.62232748
## 9387  0.62232748
## 9388  0.62232748
## 9389  0.62232748
## 9390  0.62232748
## 9391  0.62232748
## 9392  0.62232748
## 9393  0.42386092
## 9394  0.42386092
## 9395  0.42386092
## 9396  0.42386092
## 9397  0.42386092
## 9398  0.42386092
## 9399  0.42386092
## 9400  0.42386092
## 9401  0.42386092
## 9402  0.42386092
## 9403  0.42386092
## 9404  0.42386092
## 9405  0.42386092
## 9406  0.42386092
## 9407  0.42386092
## 9408  0.42386092
## 9409  0.57251204
## 9410  0.57251204
## 9411  0.57251204
## 9412  0.57251204
## 9413  0.57251204
## 9414  0.57251204
## 9415  0.57251204
## 9416  0.57251204
## 9417  0.57251204
## 9418  0.57251204
## 9419  0.57251204
## 9420  0.57251204
## 9421  0.57251204
## 9422  0.57251204
## 9423  0.57251204
## 9424  0.57251204
## 9425  0.61728249
## 9426  0.61728249
## 9427  0.61728249
## 9428  0.61728249
## 9429  0.61728249
## 9430  0.61728249
## 9431  0.61728249
## 9432  0.61728249
## 9433  0.61728249
## 9434  0.61728249
## 9435  0.61728249
## 9436  0.61728249
## 9437  0.61728249
## 9438  0.61728249
## 9439  0.61728249
## 9440  0.61728249
## 9441  0.76235015
## 9442  0.76235015
## 9443  0.76235015
## 9444  0.76235015
## 9445  0.76235015
## 9446  0.76235015
## 9447  0.76235015
## 9448  0.76235015
## 9449  0.76235015
## 9450  0.76235015
## 9451  0.76235015
## 9452  0.76235015
## 9453  0.76235015
## 9454  0.76235015
## 9455  0.76235015
## 9456  0.76235015
## 9457  2.55503319
## 9458  2.55503319
## 9459  2.55503319
## 9460  2.55503319
## 9461  2.55503319
## 9462  2.55503319
## 9463  2.55503319
## 9464  2.55503319
## 9465  2.55503319
## 9466  2.55503319
## 9467  2.55503319
## 9468  2.55503319
## 9469  2.55503319
## 9470  2.55503319
## 9471  2.55503319
## 9472  2.55503319
## 9473  0.36654833
## 9474  0.36654833
## 9475  0.36654833
## 9476  0.36654833
## 9477  0.36654833
## 9478  0.36654833
## 9479  0.36654833
## 9480  0.36654833
## 9481  0.36654833
## 9482  0.36654833
## 9483  0.36654833
## 9484  0.36654833
## 9485  0.36654833
## 9486  0.36654833
## 9487  0.36654833
## 9488  0.36654833
## 9489  5.15384821
## 9490  5.15384821
## 9491  5.15384821
## 9492  5.15384821
## 9493  5.15384821
## 9494  5.15384821
## 9495  5.15384821
## 9496  5.15384821
## 9497  5.15384821
## 9498  5.15384821
## 9499  5.15384821
## 9500  5.15384821
## 9501  5.15384821
## 9502  5.15384821
## 9503  5.15384821
## 9504  5.15384821
## 9505  0.70994070
## 9506  0.70994070
## 9507  0.70994070
## 9508  0.70994070
## 9509  0.70994070
## 9510  0.70994070
## 9511  0.70994070
## 9512  0.70994070
## 9513  0.70994070
## 9514  0.70994070
## 9515  0.70994070
## 9516  0.70994070
## 9517  0.70994070
## 9518  0.70994070
## 9519  0.70994070
## 9520  0.70994070
## 9521  0.70956505
## 9522  0.70956505
## 9523  0.70956505
## 9524  0.70956505
## 9525  0.70956505
## 9526  0.70956505
## 9527  0.70956505
## 9528  0.70956505
## 9529  0.70956505
## 9530  0.70956505
## 9531  0.70956505
## 9532  0.70956505
## 9533  0.70956505
## 9534  0.70956505
## 9535  0.70956505
## 9536  0.70956505
## 9537  1.87993439
## 9538  1.87993439
## 9539  1.87993439
## 9540  1.87993439
## 9541  1.87993439
## 9542  1.87993439
## 9543  1.87993439
## 9544  1.87993439
## 9545  1.87993439
## 9546  1.87993439
## 9547  1.87993439
## 9548  1.87993439
## 9549  1.87993439
## 9550  1.87993439
## 9551  1.87993439
## 9552  1.87993439
## 9553  0.67710768
## 9554  0.67710768
## 9555  0.67710768
## 9556  0.67710768
## 9557  0.67710768
## 9558  0.67710768
## 9559  0.67710768
## 9560  0.67710768
## 9561  0.67710768
## 9562  0.67710768
## 9563  0.67710768
## 9564  0.67710768
## 9565  0.67710768
## 9566  0.67710768
## 9567  0.67710768
## 9568  0.67710768
## 9569  1.17077982
## 9570  1.17077982
## 9571  1.17077982
## 9572  1.17077982
## 9573  1.17077982
## 9574  1.17077982
## 9575  1.17077982
## 9576  1.17077982
## 9577  1.17077982
## 9578  1.17077982
## 9579  1.17077982
## 9580  1.17077982
## 9581  1.17077982
## 9582  1.17077982
## 9583  1.17077982
## 9584  1.17077982
## 9585  0.41624786
## 9586  0.41624786
## 9587  0.41624786
## 9588  0.41624786
## 9589  0.41624786
## 9590  0.41624786
## 9591  0.41624786
## 9592  0.41624786
## 9593  0.41624786
## 9594  0.41624786
## 9595  0.41624786
## 9596  0.41624786
## 9597  0.41624786
## 9598  0.41624786
## 9599  0.41624786
## 9600  0.41624786
## 9601  0.30811779
## 9602  0.30811779
## 9603  0.30811779
## 9604  0.30811779
## 9605  0.30811779
## 9606  0.30811779
## 9607  0.30811779
## 9608  0.30811779
## 9609  0.30811779
## 9610  0.30811779
## 9611  0.30811779
## 9612  0.30811779
## 9613  0.30811779
## 9614  0.30811779
## 9615  0.30811779
## 9616  0.30811779
## 9617  0.74455005
## 9618  0.74455005
## 9619  0.74455005
## 9620  0.74455005
## 9621  0.74455005
## 9622  0.74455005
## 9623  0.74455005
## 9624  0.74455005
## 9625  0.74455005
## 9626  0.74455005
## 9627  0.74455005
## 9628  0.74455005
## 9629  0.74455005
## 9630  0.74455005
## 9631  0.74455005
## 9632  0.74455005
## 9633  2.11266835
## 9634  2.11266835
## 9635  2.11266835
## 9636  2.11266835
## 9637  2.11266835
## 9638  2.11266835
## 9639  2.11266835
## 9640  2.11266835
## 9641  2.11266835
## 9642  2.11266835
## 9643  2.11266835
## 9644  2.11266835
## 9645  2.11266835
## 9646  2.11266835
## 9647  2.11266835
## 9648  2.11266835
## 9649  0.57938043
## 9650  0.57938043
## 9651  0.57938043
## 9652  0.57938043
## 9653  0.57938043
## 9654  0.57938043
## 9655  0.57938043
## 9656  0.57938043
## 9657  0.57938043
## 9658  0.57938043
## 9659  0.57938043
## 9660  0.57938043
## 9661  0.57938043
## 9662  0.57938043
## 9663  0.57938043
## 9664  0.57938043
## 9665  0.21208065
## 9666  0.21208065
## 9667  0.21208065
## 9668  0.21208065
## 9669  0.21208065
## 9670  0.21208065
## 9671  0.21208065
## 9672  0.21208065
## 9673  0.21208065
## 9674  0.21208065
## 9675  0.21208065
## 9676  0.21208065
## 9677  0.21208065
## 9678  0.21208065
## 9679  0.21208065
## 9680  0.21208065
## 9681  0.46108107
## 9682  0.46108107
## 9683  0.46108107
## 9684  0.46108107
## 9685  0.46108107
## 9686  0.46108107
## 9687  0.46108107
## 9688  0.46108107
## 9689  0.46108107
## 9690  0.46108107
## 9691  0.46108107
## 9692  0.46108107
## 9693  0.46108107
## 9694  0.46108107
## 9695  0.46108107
## 9696  0.46108107
## 9697  0.07025890
## 9698  0.07025890
## 9699  0.07025890
## 9700  0.07025890
## 9701  0.07025890
## 9702  0.07025890
## 9703  0.07025890
## 9704  0.07025890
## 9705  0.07025890
## 9706  0.07025890
## 9707  0.07025890
## 9708  0.07025890
## 9709  0.07025890
## 9710  0.07025890
## 9711  0.07025890
## 9712  0.07025890
## 9713  0.92042591
## 9714  0.92042591
## 9715  0.92042591
## 9716  0.92042591
## 9717  0.92042591
## 9718  0.92042591
## 9719  0.92042591
## 9720  0.92042591
## 9721  0.92042591
## 9722  0.92042591
## 9723  0.92042591
## 9724  0.92042591
## 9725  0.92042591
## 9726  0.92042591
## 9727  0.92042591
## 9728  0.92042591
## 9729  0.31528653
## 9730  0.31528653
## 9731  0.31528653
## 9732  0.31528653
## 9733  0.31528653
## 9734  0.31528653
## 9735  0.31528653
## 9736  0.31528653
## 9737  0.31528653
## 9738  0.31528653
## 9739  0.31528653
## 9740  0.31528653
## 9741  0.31528653
## 9742  0.31528653
## 9743  0.31528653
## 9744  0.31528653
## 9745  0.48559523
## 9746  0.48559523
## 9747  0.48559523
## 9748  0.48559523
## 9749  0.48559523
## 9750  0.48559523
## 9751  0.48559523
## 9752  0.48559523
## 9753  0.48559523
## 9754  0.48559523
## 9755  0.48559523
## 9756  0.48559523
## 9757  0.48559523
## 9758  0.48559523
## 9759  0.48559523
## 9760  0.48559523
## 9761  0.61946330
## 9762  0.61946330
## 9763  0.61946330
## 9764  0.61946330
## 9765  0.61946330
## 9766  0.61946330
## 9767  0.61946330
## 9768  0.61946330
## 9769  0.61946330
## 9770  0.61946330
## 9771  0.61946330
## 9772  0.61946330
## 9773  0.61946330
## 9774  0.61946330
## 9775  0.61946330
## 9776  0.61946330
## 9777  0.22322785
## 9778  0.22322785
## 9779  0.22322785
## 9780  0.22322785
## 9781  0.22322785
## 9782  0.22322785
## 9783  0.22322785
## 9784  0.22322785
## 9785  0.22322785
## 9786  0.22322785
## 9787  0.22322785
## 9788  0.22322785
## 9789  0.22322785
## 9790  0.22322785
## 9791  0.22322785
## 9792  0.22322785
## 9793  1.09451556
## 9794  1.09451556
## 9795  1.09451556
## 9796  1.09451556
## 9797  1.09451556
## 9798  1.09451556
## 9799  1.09451556
## 9800  1.09451556
## 9801  1.09451556
## 9802  1.09451556
## 9803  1.09451556
## 9804  1.09451556
## 9805  1.09451556
## 9806  1.09451556
## 9807  1.09451556
## 9808  1.09451556
## 9809  0.88599667
## 9810  0.88599667
## 9811  0.88599667
## 9812  0.88599667
## 9813  0.88599667
## 9814  0.88599667
## 9815  0.88599667
## 9816  0.88599667
## 9817  0.88599667
## 9818  0.88599667
## 9819  0.88599667
## 9820  0.88599667
## 9821  0.88599667
## 9822  0.88599667
## 9823  0.88599667
## 9824  0.88599667
## 9825  1.49565025
## 9826  1.49565025
## 9827  1.49565025
## 9828  1.49565025
## 9829  1.49565025
## 9830  1.49565025
## 9831  1.49565025
## 9832  1.49565025
## 9833  1.49565025
## 9834  1.49565025
## 9835  1.49565025
## 9836  1.49565025
## 9837  1.49565025
## 9838  1.49565025
## 9839  1.49565025
## 9840  1.49565025
## 9841  2.17530139
## 9842  2.17530139
## 9843  2.17530139
## 9844  2.17530139
## 9845  2.17530139
## 9846  2.17530139
## 9847  2.17530139
## 9848  2.17530139
## 9849  2.17530139
## 9850  2.17530139
## 9851  2.17530139
## 9852  2.17530139
## 9853  2.17530139
## 9854  2.17530139
## 9855  2.17530139
## 9856  2.17530139
## 9857  2.14636487
## 9858  2.14636487
## 9859  2.14636487
## 9860  2.14636487
## 9861  2.14636487
## 9862  2.14636487
## 9863  2.14636487
## 9864  2.14636487
## 9865  2.14636487
## 9866  2.14636487
## 9867  2.14636487
## 9868  2.14636487
## 9869  2.14636487
## 9870  2.14636487
## 9871  2.14636487
## 9872  2.14636487
## 9873  1.42203873
## 9874  1.42203873
## 9875  1.42203873
## 9876  1.42203873
## 9877  1.42203873
## 9878  1.42203873
## 9879  1.42203873
## 9880  1.42203873
## 9881  1.42203873
## 9882  1.42203873
## 9883  1.42203873
## 9884  1.42203873
## 9885  1.42203873
## 9886  1.42203873
## 9887  1.42203873
## 9888  1.42203873
## 9889  0.33863012
## 9890  0.33863012
## 9891  0.33863012
## 9892  0.33863012
## 9893  0.33863012
## 9894  0.33863012
## 9895  0.33863012
## 9896  0.33863012
## 9897  0.33863012
## 9898  0.33863012
## 9899  0.33863012
## 9900  0.33863012
## 9901  0.33863012
## 9902  0.33863012
## 9903  0.33863012
## 9904  0.33863012
## 9905  1.81888835
## 9906  1.81888835
## 9907  1.81888835
## 9908  1.81888835
## 9909  1.81888835
## 9910  1.81888835
## 9911  1.81888835
## 9912  1.81888835
## 9913  1.81888835
## 9914  1.81888835
## 9915  1.81888835
## 9916  1.81888835
## 9917  1.81888835
## 9918  1.81888835
## 9919  1.81888835
## 9920  1.81888835
## 9921  1.66742975
## 9922  1.66742975
## 9923  1.66742975
## 9924  1.66742975
## 9925  1.66742975
## 9926  1.66742975
## 9927  1.66742975
## 9928  1.66742975
## 9929  1.66742975
## 9930  1.66742975
## 9931  1.66742975
## 9932  1.66742975
## 9933  1.66742975
## 9934  1.66742975
## 9935  1.66742975
## 9936  1.66742975
## 9937  0.12828810
## 9938  0.12828810
## 9939  0.12828810
## 9940  0.12828810
## 9941  0.12828810
## 9942  0.12828810
## 9943  0.12828810
## 9944  0.12828810
## 9945  0.12828810
## 9946  0.12828810
## 9947  0.12828810
## 9948  0.12828810
## 9949  0.12828810
## 9950  0.12828810
## 9951  0.12828810
## 9952  0.12828810
## 9953  0.78680308
## 9954  0.78680308
## 9955  0.78680308
## 9956  0.78680308
## 9957  0.78680308
## 9958  0.78680308
## 9959  0.78680308
## 9960  0.78680308
## 9961  0.78680308
## 9962  0.78680308
## 9963  0.78680308
## 9964  0.78680308
## 9965  0.78680308
## 9966  0.78680308
## 9967  0.78680308
## 9968  0.78680308
## 9969  0.47734265
## 9970  0.47734265
## 9971  0.47734265
## 9972  0.47734265
## 9973  0.47734265
## 9974  0.47734265
## 9975  0.47734265
## 9976  0.47734265
## 9977  0.47734265
## 9978  0.47734265
## 9979  0.47734265
## 9980  0.47734265
## 9981  0.47734265
## 9982  0.47734265
## 9983  0.47734265
## 9984  0.47734265
## 9985  1.76145776
## 9986  1.76145776
## 9987  1.76145776
## 9988  1.76145776
## 9989  1.76145776
## 9990  1.76145776
## 9991  1.76145776
## 9992  1.76145776
## 9993  1.76145776
## 9994  1.76145776
## 9995  1.76145776
## 9996  1.76145776
## 9997  1.76145776
## 9998  1.76145776
## 9999  1.76145776
## 10000 1.76145776
## 10001 1.57525960
## 10002 1.57525960
## 10003 1.57525960
## 10004 1.57525960
## 10005 1.57525960
## 10006 1.57525960
## 10007 1.57525960
## 10008 1.57525960
## 10009 1.57525960
## 10010 1.57525960
## 10011 1.57525960
## 10012 1.57525960
## 10013 1.57525960
## 10014 1.57525960
## 10015 1.57525960
## 10016 1.57525960
## 10017 0.34964301
## 10018 0.34964301
## 10019 0.34964301
## 10020 0.34964301
## 10021 0.34964301
## 10022 0.34964301
## 10023 0.34964301
## 10024 0.34964301
## 10025 0.34964301
## 10026 0.34964301
## 10027 0.34964301
## 10028 0.34964301
## 10029 0.34964301
## 10030 0.34964301
## 10031 0.34964301
## 10032 0.34964301
## 10033 0.61807059
## 10034 0.61807059
## 10035 0.61807059
## 10036 0.61807059
## 10037 0.61807059
## 10038 0.61807059
## 10039 0.61807059
## 10040 0.61807059
## 10041 0.61807059
## 10042 0.61807059
## 10043 0.61807059
## 10044 0.61807059
## 10045 0.61807059
## 10046 0.61807059
## 10047 0.61807059
## 10048 0.61807059
## 10049 0.51204337
## 10050 0.51204337
## 10051 0.51204337
## 10052 0.51204337
## 10053 0.51204337
## 10054 0.51204337
## 10055 0.51204337
## 10056 0.51204337
## 10057 0.51204337
## 10058 0.51204337
## 10059 0.51204337
## 10060 0.51204337
## 10061 0.51204337
## 10062 0.51204337
## 10063 0.51204337
## 10064 0.51204337
## 10065 0.35461197
## 10066 0.35461197
## 10067 0.35461197
## 10068 0.35461197
## 10069 0.35461197
## 10070 0.35461197
## 10071 0.35461197
## 10072 0.35461197
## 10073 0.35461197
## 10074 0.35461197
## 10075 0.35461197
## 10076 0.35461197
## 10077 0.35461197
## 10078 0.35461197
## 10079 0.35461197
## 10080 0.35461197
## 10081 0.40532891
## 10082 0.40532891
## 10083 0.40532891
## 10084 0.40532891
## 10085 0.40532891
## 10086 0.40532891
## 10087 0.40532891
## 10088 0.40532891
## 10089 0.40532891
## 10090 0.40532891
## 10091 0.40532891
## 10092 0.40532891
## 10093 0.40532891
## 10094 0.40532891
## 10095 0.40532891
## 10096 0.40532891
## 10097 1.27679424
## 10098 1.27679424
## 10099 1.27679424
## 10100 1.27679424
## 10101 1.27679424
## 10102 1.27679424
## 10103 1.27679424
## 10104 1.27679424
## 10105 1.27679424
## 10106 1.27679424
## 10107 1.27679424
## 10108 1.27679424
## 10109 1.27679424
## 10110 1.27679424
## 10111 1.27679424
## 10112 1.27679424
## 10113 0.38995952
## 10114 0.38995952
## 10115 0.38995952
## 10116 0.38995952
## 10117 0.38995952
## 10118 0.38995952
## 10119 0.38995952
## 10120 0.38995952
## 10121 0.38995952
## 10122 0.38995952
## 10123 0.38995952
## 10124 0.38995952
## 10125 0.38995952
## 10126 0.38995952
## 10127 0.38995952
## 10128 0.38995952
## 10129 0.19888630
## 10130 0.19888630
## 10131 0.19888630
## 10132 0.19888630
## 10133 0.19888630
## 10134 0.19888630
## 10135 0.19888630
## 10136 0.19888630
## 10137 0.19888630
## 10138 0.19888630
## 10139 0.19888630
## 10140 0.19888630
## 10141 0.19888630
## 10142 0.19888630
## 10143 0.19888630
## 10144 0.19888630
## 10145 0.80975683
## 10146 0.80975683
## 10147 0.80975683
## 10148 0.80975683
## 10149 0.80975683
## 10150 0.80975683
## 10151 0.80975683
## 10152 0.80975683
## 10153 0.80975683
## 10154 0.80975683
## 10155 0.80975683
## 10156 0.80975683
## 10157 0.80975683
## 10158 0.80975683
## 10159 0.80975683
## 10160 0.80975683
## 10161 0.32911872
## 10162 0.32911872
## 10163 0.32911872
## 10164 0.32911872
## 10165 0.32911872
## 10166 0.32911872
## 10167 0.32911872
## 10168 0.32911872
## 10169 0.32911872
## 10170 0.32911872
## 10171 0.32911872
## 10172 0.32911872
## 10173 0.32911872
## 10174 0.32911872
## 10175 0.32911872
## 10176 0.32911872
## 10177 0.44901424
## 10178 0.44901424
## 10179 0.44901424
## 10180 0.44901424
## 10181 0.44901424
## 10182 0.44901424
## 10183 0.44901424
## 10184 0.44901424
## 10185 0.44901424
## 10186 0.44901424
## 10187 0.44901424
## 10188 0.44901424
## 10189 0.44901424
## 10190 0.44901424
## 10191 0.44901424
## 10192 0.44901424
## 10193 1.00445586
## 10194 1.00445586
## 10195 1.00445586
## 10196 1.00445586
## 10197 1.00445586
## 10198 1.00445586
## 10199 1.00445586
## 10200 1.00445586
## 10201 1.00445586
## 10202 1.00445586
## 10203 1.00445586
## 10204 1.00445586
## 10205 1.00445586
## 10206 1.00445586
## 10207 1.00445586
## 10208 1.00445586
## 10209 0.68528003
## 10210 0.68528003
## 10211 0.68528003
## 10212 0.68528003
## 10213 0.68528003
## 10214 0.68528003
## 10215 0.68528003
## 10216 0.68528003
## 10217 0.68528003
## 10218 0.68528003
## 10219 0.68528003
## 10220 0.68528003
## 10221 0.68528003
## 10222 0.68528003
## 10223 0.68528003
## 10224 0.68528003
## 10225 3.65448100
## 10226 3.65448100
## 10227 3.65448100
## 10228 3.65448100
## 10229 3.65448100
## 10230 3.65448100
## 10231 3.65448100
## 10232 3.65448100
## 10233 3.65448100
## 10234 3.65448100
## 10235 3.65448100
## 10236 3.65448100
## 10237 3.65448100
## 10238 3.65448100
## 10239 3.65448100
## 10240 3.65448100
## 10241 1.21815613
## 10242 1.21815613
## 10243 1.21815613
## 10244 1.21815613
## 10245 1.21815613
## 10246 1.21815613
## 10247 1.21815613
## 10248 1.21815613
## 10249 1.21815613
## 10250 1.21815613
## 10251 1.21815613
## 10252 1.21815613
## 10253 1.21815613
## 10254 1.21815613
## 10255 1.21815613
## 10256 1.21815613
## 10257 1.38920306
## 10258 1.38920306
## 10259 1.38920306
## 10260 1.38920306
## 10261 1.38920306
## 10262 1.38920306
## 10263 1.38920306
## 10264 1.38920306
## 10265 1.38920306
## 10266 1.38920306
## 10267 1.38920306
## 10268 1.38920306
## 10269 1.38920306
## 10270 1.38920306
## 10271 1.38920306
## 10272 1.38920306
## 10273 0.47965082
## 10274 0.47965082
## 10275 0.47965082
## 10276 0.47965082
## 10277 0.47965082
## 10278 0.47965082
## 10279 0.47965082
## 10280 0.47965082
## 10281 0.47965082
## 10282 0.47965082
## 10283 0.47965082
## 10284 0.47965082
## 10285 0.47965082
## 10286 0.47965082
## 10287 0.47965082
## 10288 0.47965082
## 10289 1.03556155
## 10290 1.03556155
## 10291 1.03556155
## 10292 1.03556155
## 10293 1.03556155
## 10294 1.03556155
## 10295 1.03556155
## 10296 1.03556155
## 10297 1.03556155
## 10298 1.03556155
## 10299 1.03556155
## 10300 1.03556155
## 10301 1.03556155
## 10302 1.03556155
## 10303 1.03556155
## 10304 1.03556155
## 10305 0.37877550
## 10306 0.37877550
## 10307 0.37877550
## 10308 0.37877550
## 10309 0.37877550
## 10310 0.37877550
## 10311 0.37877550
## 10312 0.37877550
## 10313 0.37877550
## 10314 0.37877550
## 10315 0.37877550
## 10316 0.37877550
## 10317 0.37877550
## 10318 0.37877550
## 10319 0.37877550
## 10320 0.37877550
## 10321 1.35961035
## 10322 1.35961035
## 10323 1.35961035
## 10324 1.35961035
## 10325 1.35961035
## 10326 1.35961035
## 10327 1.35961035
## 10328 1.35961035
## 10329 1.35961035
## 10330 1.35961035
## 10331 1.35961035
## 10332 1.35961035
## 10333 1.35961035
## 10334 1.35961035
## 10335 1.35961035
## 10336 1.35961035
## 10337 0.04144594
## 10338 0.04144594
## 10339 0.04144594
## 10340 0.04144594
## 10341 0.04144594
## 10342 0.04144594
## 10343 0.04144594
## 10344 0.04144594
## 10345 0.04144594
## 10346 0.04144594
## 10347 0.04144594
## 10348 0.04144594
## 10349 0.04144594
## 10350 0.04144594
## 10351 0.04144594
## 10352 0.04144594
## 10353 2.12350052
## 10354 2.12350052
## 10355 2.12350052
## 10356 2.12350052
## 10357 2.12350052
## 10358 2.12350052
## 10359 2.12350052
## 10360 2.12350052
## 10361 2.12350052
## 10362 2.12350052
## 10363 2.12350052
## 10364 2.12350052
## 10365 2.12350052
## 10366 2.12350052
## 10367 2.12350052
## 10368 2.12350052
## 10369 0.69267832
## 10370 0.69267832
## 10371 0.69267832
## 10372 0.69267832
## 10373 0.69267832
## 10374 0.69267832
## 10375 0.69267832
## 10376 0.69267832
## 10377 0.69267832
## 10378 0.69267832
## 10379 0.69267832
## 10380 0.69267832
## 10381 0.69267832
## 10382 0.69267832
## 10383 0.69267832
## 10384 0.69267832
## 10385 1.23428365
## 10386 1.23428365
## 10387 1.23428365
## 10388 1.23428365
## 10389 1.23428365
## 10390 1.23428365
## 10391 1.23428365
## 10392 1.23428365
## 10393 1.23428365
## 10394 1.23428365
## 10395 1.23428365
## 10396 1.23428365
## 10397 1.23428365
## 10398 1.23428365
## 10399 1.23428365
## 10400 1.23428365
## 10401 0.37302998
## 10402 0.37302998
## 10403 0.37302998
## 10404 0.37302998
## 10405 0.37302998
## 10406 0.37302998
## 10407 0.37302998
## 10408 0.37302998
## 10409 0.37302998
## 10410 0.37302998
## 10411 0.37302998
## 10412 0.37302998
## 10413 0.37302998
## 10414 0.37302998
## 10415 0.37302998
## 10416 0.37302998
## 10417 5.22553456
## 10418 5.22553456
## 10419 5.22553456
## 10420 5.22553456
## 10421 5.22553456
## 10422 5.22553456
## 10423 5.22553456
## 10424 5.22553456
## 10425 5.22553456
## 10426 5.22553456
## 10427 5.22553456
## 10428 5.22553456
## 10429 5.22553456
## 10430 5.22553456
## 10431 5.22553456
## 10432 5.22553456
## 10433 0.86170576
## 10434 0.86170576
## 10435 0.86170576
## 10436 0.86170576
## 10437 0.86170576
## 10438 0.86170576
## 10439 0.86170576
## 10440 0.86170576
## 10441 0.86170576
## 10442 0.86170576
## 10443 0.86170576
## 10444 0.86170576
## 10445 0.86170576
## 10446 0.86170576
## 10447 0.86170576
## 10448 0.86170576
## 10449 0.85250962
## 10450 0.85250962
## 10451 0.85250962
## 10452 0.85250962
## 10453 0.85250962
## 10454 0.85250962
## 10455 0.85250962
## 10456 0.85250962
## 10457 0.85250962
## 10458 0.85250962
## 10459 0.85250962
## 10460 0.85250962
## 10461 0.85250962
## 10462 0.85250962
## 10463 0.85250962
## 10464 0.85250962
## 10465 0.94091000
## 10466 0.94091000
## 10467 0.94091000
## 10468 0.94091000
## 10469 0.94091000
## 10470 0.94091000
## 10471 0.94091000
## 10472 0.94091000
## 10473 0.94091000
## 10474 0.94091000
## 10475 0.94091000
## 10476 0.94091000
## 10477 0.94091000
## 10478 0.94091000
## 10479 0.94091000
## 10480 0.94091000
## 10481 1.66994673
## 10482 1.66994673
## 10483 1.66994673
## 10484 1.66994673
## 10485 1.66994673
## 10486 1.66994673
## 10487 1.66994673
## 10488 1.66994673
## 10489 1.66994673
## 10490 1.66994673
## 10491 1.66994673
## 10492 1.66994673
## 10493 1.66994673
## 10494 1.66994673
## 10495 1.66994673
## 10496 1.66994673
## 10497 0.76747192
## 10498 0.76747192
## 10499 0.76747192
## 10500 0.76747192
## 10501 0.76747192
## 10502 0.76747192
## 10503 0.76747192
## 10504 0.76747192
## 10505 0.76747192
## 10506 0.76747192
## 10507 0.76747192
## 10508 0.76747192
## 10509 0.76747192
## 10510 0.76747192
## 10511 0.76747192
## 10512 0.76747192
## 10513 1.74254511
## 10514 1.74254511
## 10515 1.74254511
## 10516 1.74254511
## 10517 1.74254511
## 10518 1.74254511
## 10519 1.74254511
## 10520 1.74254511
## 10521 1.74254511
## 10522 1.74254511
## 10523 1.74254511
## 10524 1.74254511
## 10525 1.74254511
## 10526 1.74254511
## 10527 1.74254511
## 10528 1.74254511
## 10529 1.19114928
## 10530 1.19114928
## 10531 1.19114928
## 10532 1.19114928
## 10533 1.19114928
## 10534 1.19114928
## 10535 1.19114928
## 10536 1.19114928
## 10537 1.19114928
## 10538 1.19114928
## 10539 1.19114928
## 10540 1.19114928
## 10541 1.19114928
## 10542 1.19114928
## 10543 1.19114928
## 10544 1.19114928
## 10545 0.19686971
## 10546 0.19686971
## 10547 0.19686971
## 10548 0.19686971
## 10549 0.19686971
## 10550 0.19686971
## 10551 0.19686971
## 10552 0.19686971
## 10553 0.19686971
## 10554 0.19686971
## 10555 0.19686971
## 10556 0.19686971
## 10557 0.19686971
## 10558 0.19686971
## 10559 0.19686971
## 10560 0.19686971
## 10561 0.63254976
## 10562 0.63254976
## 10563 0.63254976
## 10564 0.63254976
## 10565 0.63254976
## 10566 0.63254976
## 10567 0.63254976
## 10568 0.63254976
## 10569 0.63254976
## 10570 0.63254976
## 10571 0.63254976
## 10572 0.63254976
## 10573 0.63254976
## 10574 0.63254976
## 10575 0.63254976
## 10576 0.63254976
## 10577 1.66533993
## 10578 1.66533993
## 10579 1.66533993
## 10580 1.66533993
## 10581 1.66533993
## 10582 1.66533993
## 10583 1.66533993
## 10584 1.66533993
## 10585 1.66533993
## 10586 1.66533993
## 10587 1.66533993
## 10588 1.66533993
## 10589 1.66533993
## 10590 1.66533993
## 10591 1.66533993
## 10592 1.66533993
## 10593 0.58880556
## 10594 0.58880556
## 10595 0.58880556
## 10596 0.58880556
## 10597 0.58880556
## 10598 0.58880556
## 10599 0.58880556
## 10600 0.58880556
## 10601 0.58880556
## 10602 0.58880556
## 10603 0.58880556
## 10604 0.58880556
## 10605 0.58880556
## 10606 0.58880556
## 10607 0.58880556
## 10608 0.58880556
## 10609 0.74080374
## 10610 0.74080374
## 10611 0.74080374
## 10612 0.74080374
## 10613 0.74080374
## 10614 0.74080374
## 10615 0.74080374
## 10616 0.74080374
## 10617 0.74080374
## 10618 0.74080374
## 10619 0.74080374
## 10620 0.74080374
## 10621 0.74080374
## 10622 0.74080374
## 10623 0.74080374
## 10624 0.74080374
## 10625 1.50492454
## 10626 1.50492454
## 10627 1.50492454
## 10628 1.50492454
## 10629 1.50492454
## 10630 1.50492454
## 10631 1.50492454
## 10632 1.50492454
## 10633 1.50492454
## 10634 1.50492454
## 10635 1.50492454
## 10636 1.50492454
## 10637 1.50492454
## 10638 1.50492454
## 10639 1.50492454
## 10640 1.50492454
## 10641 0.42706100
## 10642 0.42706100
## 10643 0.42706100
## 10644 0.42706100
## 10645 0.42706100
## 10646 0.42706100
## 10647 0.42706100
## 10648 0.42706100
## 10649 0.42706100
## 10650 0.42706100
## 10651 0.42706100
## 10652 0.42706100
## 10653 0.42706100
## 10654 0.42706100
## 10655 0.42706100
## 10656 0.42706100
## 10657 1.13782023
## 10658 1.13782023
## 10659 1.13782023
## 10660 1.13782023
## 10661 1.13782023
## 10662 1.13782023
## 10663 1.13782023
## 10664 1.13782023
## 10665 1.13782023
## 10666 1.13782023
## 10667 1.13782023
## 10668 1.13782023
## 10669 1.13782023
## 10670 1.13782023
## 10671 1.13782023
## 10672 1.13782023
## 10673 0.36795126
## 10674 0.36795126
## 10675 0.36795126
## 10676 0.36795126
## 10677 0.36795126
## 10678 0.36795126
## 10679 0.36795126
## 10680 0.36795126
## 10681 0.36795126
## 10682 0.36795126
## 10683 0.36795126
## 10684 0.36795126
## 10685 0.36795126
## 10686 0.36795126
## 10687 0.36795126
## 10688 0.36795126
## 10689 1.24799779
## 10690 1.24799779
## 10691 1.24799779
## 10692 1.24799779
## 10693 1.24799779
## 10694 1.24799779
## 10695 1.24799779
## 10696 1.24799779
## 10697 1.24799779
## 10698 1.24799779
## 10699 1.24799779
## 10700 1.24799779
## 10701 1.24799779
## 10702 1.24799779
## 10703 1.24799779
## 10704 1.24799779
## 10705 1.02000910
## 10706 1.02000910
## 10707 1.02000910
## 10708 1.02000910
## 10709 1.02000910
## 10710 1.02000910
## 10711 1.02000910
## 10712 1.02000910
## 10713 1.02000910
## 10714 1.02000910
## 10715 1.02000910
## 10716 1.02000910
## 10717 1.02000910
## 10718 1.02000910
## 10719 1.02000910
## 10720 1.02000910
## 10721 2.16644492
## 10722 2.16644492
## 10723 2.16644492
## 10724 2.16644492
## 10725 2.16644492
## 10726 2.16644492
## 10727 2.16644492
## 10728 2.16644492
## 10729 2.16644492
## 10730 2.16644492
## 10731 2.16644492
## 10732 2.16644492
## 10733 2.16644492
## 10734 2.16644492
## 10735 2.16644492
## 10736 2.16644492
## 10737 0.55333791
## 10738 0.55333791
## 10739 0.55333791
## 10740 0.55333791
## 10741 0.55333791
## 10742 0.55333791
## 10743 0.55333791
## 10744 0.55333791
## 10745 0.55333791
## 10746 0.55333791
## 10747 0.55333791
## 10748 0.55333791
## 10749 0.55333791
## 10750 0.55333791
## 10751 0.55333791
## 10752 0.55333791
## 10753 0.36203278
## 10754 0.36203278
## 10755 0.36203278
## 10756 0.36203278
## 10757 0.36203278
## 10758 0.36203278
## 10759 0.36203278
## 10760 0.36203278
## 10761 0.36203278
## 10762 0.36203278
## 10763 0.36203278
## 10764 0.36203278
## 10765 0.36203278
## 10766 0.36203278
## 10767 0.36203278
## 10768 0.36203278
## 10769 0.37697088
## 10770 0.37697088
## 10771 0.37697088
## 10772 0.37697088
## 10773 0.37697088
## 10774 0.37697088
## 10775 0.37697088
## 10776 0.37697088
## 10777 0.37697088
## 10778 0.37697088
## 10779 0.37697088
## 10780 0.37697088
## 10781 0.37697088
## 10782 0.37697088
## 10783 0.37697088
## 10784 0.37697088
## 10785 1.60194918
## 10786 1.60194918
## 10787 1.60194918
## 10788 1.60194918
## 10789 1.60194918
## 10790 1.60194918
## 10791 1.60194918
## 10792 1.60194918
## 10793 1.60194918
## 10794 1.60194918
## 10795 1.60194918
## 10796 1.60194918
## 10797 1.60194918
## 10798 1.60194918
## 10799 1.60194918
## 10800 1.60194918
## 10801 0.43195037
## 10802 0.43195037
## 10803 0.43195037
## 10804 0.43195037
## 10805 0.43195037
## 10806 0.43195037
## 10807 0.43195037
## 10808 0.43195037
## 10809 0.43195037
## 10810 0.43195037
## 10811 0.43195037
## 10812 0.43195037
## 10813 0.43195037
## 10814 0.43195037
## 10815 0.43195037
## 10816 0.43195037
## 10817 0.48920271
## 10818 0.48920271
## 10819 0.48920271
## 10820 0.48920271
## 10821 0.48920271
## 10822 0.48920271
## 10823 0.48920271
## 10824 0.48920271
## 10825 0.48920271
## 10826 0.48920271
## 10827 0.48920271
## 10828 0.48920271
## 10829 0.48920271
## 10830 0.48920271
## 10831 0.48920271
## 10832 0.48920271
## 10833 0.61175102
## 10834 0.61175102
## 10835 0.61175102
## 10836 0.61175102
## 10837 0.61175102
## 10838 0.61175102
## 10839 0.61175102
## 10840 0.61175102
## 10841 0.61175102
## 10842 0.61175102
## 10843 0.61175102
## 10844 0.61175102
## 10845 0.61175102
## 10846 0.61175102
## 10847 0.61175102
## 10848 0.61175102
## 10849 0.50796359
## 10850 0.50796359
## 10851 0.50796359
## 10852 0.50796359
## 10853 0.50796359
## 10854 0.50796359
## 10855 0.50796359
## 10856 0.50796359
## 10857 0.50796359
## 10858 0.50796359
## 10859 0.50796359
## 10860 0.50796359
## 10861 0.50796359
## 10862 0.50796359
## 10863 0.50796359
## 10864 0.50796359
## 10865 2.11258171
## 10866 2.11258171
## 10867 2.11258171
## 10868 2.11258171
## 10869 2.11258171
## 10870 2.11258171
## 10871 2.11258171
## 10872 2.11258171
## 10873 2.11258171
## 10874 2.11258171
## 10875 2.11258171
## 10876 2.11258171
## 10877 2.11258171
## 10878 2.11258171
## 10879 2.11258171
## 10880 2.11258171
## 10881 0.48262597
## 10882 0.48262597
## 10883 0.48262597
## 10884 0.48262597
## 10885 0.48262597
## 10886 0.48262597
## 10887 0.48262597
## 10888 0.48262597
## 10889 0.48262597
## 10890 0.48262597
## 10891 0.48262597
## 10892 0.48262597
## 10893 0.48262597
## 10894 0.48262597
## 10895 0.48262597
## 10896 0.48262597
## 10897 0.92137437
## 10898 0.92137437
## 10899 0.92137437
## 10900 0.92137437
## 10901 0.92137437
## 10902 0.92137437
## 10903 0.92137437
## 10904 0.92137437
## 10905 0.92137437
## 10906 0.92137437
## 10907 0.92137437
## 10908 0.92137437
## 10909 0.92137437
## 10910 0.92137437
## 10911 0.92137437
## 10912 0.92137437
## 10913 1.10937083
## 10914 1.10937083
## 10915 1.10937083
## 10916 1.10937083
## 10917 1.10937083
## 10918 1.10937083
## 10919 1.10937083
## 10920 1.10937083
## 10921 1.10937083
## 10922 1.10937083
## 10923 1.10937083
## 10924 1.10937083
## 10925 1.10937083
## 10926 1.10937083
## 10927 1.10937083
## 10928 1.10937083
## 10929 3.17525762
## 10930 3.17525762
## 10931 3.17525762
## 10932 3.17525762
## 10933 3.17525762
## 10934 3.17525762
## 10935 3.17525762
## 10936 3.17525762
## 10937 3.17525762
## 10938 3.17525762
## 10939 3.17525762
## 10940 3.17525762
## 10941 3.17525762
## 10942 3.17525762
## 10943 3.17525762
## 10944 3.17525762
## 10945 2.40900109
## 10946 2.40900109
## 10947 2.40900109
## 10948 2.40900109
## 10949 2.40900109
## 10950 2.40900109
## 10951 2.40900109
## 10952 2.40900109
## 10953 2.40900109
## 10954 2.40900109
## 10955 2.40900109
## 10956 2.40900109
## 10957 2.40900109
## 10958 2.40900109
## 10959 2.40900109
## 10960 2.40900109
## 10961 0.70447701
## 10962 0.70447701
## 10963 0.70447701
## 10964 0.70447701
## 10965 0.70447701
## 10966 0.70447701
## 10967 0.70447701
## 10968 0.70447701
## 10969 0.70447701
## 10970 0.70447701
## 10971 0.70447701
## 10972 0.70447701
## 10973 0.70447701
## 10974 0.70447701
## 10975 0.70447701
## 10976 0.70447701
## 10977 0.24661135
## 10978 0.24661135
## 10979 0.24661135
## 10980 0.24661135
## 10981 0.24661135
## 10982 0.24661135
## 10983 0.24661135
## 10984 0.24661135
## 10985 0.24661135
## 10986 0.24661135
## 10987 0.24661135
## 10988 0.24661135
## 10989 0.24661135
## 10990 0.24661135
## 10991 0.24661135
## 10992 0.24661135
## 10993 1.37309766
## 10994 1.37309766
## 10995 1.37309766
## 10996 1.37309766
## 10997 1.37309766
## 10998 1.37309766
## 10999 1.37309766
## 11000 1.37309766
## 11001 1.37309766
## 11002 1.37309766
## 11003 1.37309766
## 11004 1.37309766
## 11005 1.37309766
## 11006 1.37309766
## 11007 1.37309766
## 11008 1.37309766
## 11009 2.87853161
## 11010 2.87853161
## 11011 2.87853161
## 11012 2.87853161
## 11013 2.87853161
## 11014 2.87853161
## 11015 2.87853161
## 11016 2.87853161
## 11017 2.87853161
## 11018 2.87853161
## 11019 2.87853161
## 11020 2.87853161
## 11021 2.87853161
## 11022 2.87853161
## 11023 2.87853161
## 11024 2.87853161
## 11025 0.11821801
## 11026 0.11821801
## 11027 0.11821801
## 11028 0.11821801
## 11029 0.11821801
## 11030 0.11821801
## 11031 0.11821801
## 11032 0.11821801
## 11033 0.11821801
## 11034 0.11821801
## 11035 0.11821801
## 11036 0.11821801
## 11037 0.11821801
## 11038 0.11821801
## 11039 0.11821801
## 11040 0.11821801
## 11041 0.78636964
## 11042 0.78636964
## 11043 0.78636964
## 11044 0.78636964
## 11045 0.78636964
## 11046 0.78636964
## 11047 0.78636964
## 11048 0.78636964
## 11049 0.78636964
## 11050 0.78636964
## 11051 0.78636964
## 11052 0.78636964
## 11053 0.78636964
## 11054 0.78636964
## 11055 0.78636964
## 11056 0.78636964
## 11057 0.32461049
## 11058 0.32461049
## 11059 0.32461049
## 11060 0.32461049
## 11061 0.32461049
## 11062 0.32461049
## 11063 0.32461049
## 11064 0.32461049
## 11065 0.32461049
## 11066 0.32461049
## 11067 0.32461049
## 11068 0.32461049
## 11069 0.32461049
## 11070 0.32461049
## 11071 0.32461049
## 11072 0.32461049
## 11073 0.86145312
## 11074 0.86145312
## 11075 0.86145312
## 11076 0.86145312
## 11077 0.86145312
## 11078 0.86145312
## 11079 0.86145312
## 11080 0.86145312
## 11081 0.86145312
## 11082 0.86145312
## 11083 0.86145312
## 11084 0.86145312
## 11085 0.86145312
## 11086 0.86145312
## 11087 0.86145312
## 11088 0.86145312
## 11089 2.44667613
## 11090 2.44667613
## 11091 2.44667613
## 11092 2.44667613
## 11093 2.44667613
## 11094 2.44667613
## 11095 2.44667613
## 11096 2.44667613
## 11097 2.44667613
## 11098 2.44667613
## 11099 2.44667613
## 11100 2.44667613
## 11101 2.44667613
## 11102 2.44667613
## 11103 2.44667613
## 11104 2.44667613
## 11105 0.55731091
## 11106 0.55731091
## 11107 0.55731091
## 11108 0.55731091
## 11109 0.55731091
## 11110 0.55731091
## 11111 0.55731091
## 11112 0.55731091
## 11113 0.55731091
## 11114 0.55731091
## 11115 0.55731091
## 11116 0.55731091
## 11117 0.55731091
## 11118 0.55731091
## 11119 0.55731091
## 11120 0.55731091
## 11121 0.62081852
## 11122 0.62081852
## 11123 0.62081852
## 11124 0.62081852
## 11125 0.62081852
## 11126 0.62081852
## 11127 0.62081852
## 11128 0.62081852
## 11129 0.62081852
## 11130 0.62081852
## 11131 0.62081852
## 11132 0.62081852
## 11133 0.62081852
## 11134 0.62081852
## 11135 0.62081852
## 11136 0.62081852
## 11137 1.41562074
## 11138 1.41562074
## 11139 1.41562074
## 11140 1.41562074
## 11141 1.41562074
## 11142 1.41562074
## 11143 1.41562074
## 11144 1.41562074
## 11145 1.41562074
## 11146 1.41562074
## 11147 1.41562074
## 11148 1.41562074
## 11149 1.41562074
## 11150 1.41562074
## 11151 1.41562074
## 11152 1.41562074
## 11153 0.37834180
## 11154 0.37834180
## 11155 0.37834180
## 11156 0.37834180
## 11157 0.37834180
## 11158 0.37834180
## 11159 0.37834180
## 11160 0.37834180
## 11161 0.37834180
## 11162 0.37834180
## 11163 0.37834180
## 11164 0.37834180
## 11165 0.37834180
## 11166 0.37834180
## 11167 0.37834180
## 11168 0.37834180
## 11169 0.45092602
## 11170 0.45092602
## 11171 0.45092602
## 11172 0.45092602
## 11173 0.45092602
## 11174 0.45092602
## 11175 0.45092602
## 11176 0.45092602
## 11177 0.45092602
## 11178 0.45092602
## 11179 0.45092602
## 11180 0.45092602
## 11181 0.45092602
## 11182 0.45092602
## 11183 0.45092602
## 11184 0.45092602
## 11185 0.85919633
## 11186 0.85919633
## 11187 0.85919633
## 11188 0.85919633
## 11189 0.85919633
## 11190 0.85919633
## 11191 0.85919633
## 11192 0.85919633
## 11193 0.85919633
## 11194 0.85919633
## 11195 0.85919633
## 11196 0.85919633
## 11197 0.85919633
## 11198 0.85919633
## 11199 0.85919633
## 11200 0.85919633
## 11201 0.20187969
## 11202 0.20187969
## 11203 0.20187969
## 11204 0.20187969
## 11205 0.20187969
## 11206 0.20187969
## 11207 0.20187969
## 11208 0.20187969
## 11209 0.20187969
## 11210 0.20187969
## 11211 0.20187969
## 11212 0.20187969
## 11213 0.20187969
## 11214 0.20187969
## 11215 0.20187969
## 11216 0.20187969
## 11217 0.90263645
## 11218 0.90263645
## 11219 0.90263645
## 11220 0.90263645
## 11221 0.90263645
## 11222 0.90263645
## 11223 0.90263645
## 11224 0.90263645
## 11225 0.90263645
## 11226 0.90263645
## 11227 0.90263645
## 11228 0.90263645
## 11229 0.90263645
## 11230 0.90263645
## 11231 0.90263645
## 11232 0.90263645
## 11233 0.41335275
## 11234 0.41335275
## 11235 0.41335275
## 11236 0.41335275
## 11237 0.41335275
## 11238 0.41335275
## 11239 0.41335275
## 11240 0.41335275
## 11241 0.41335275
## 11242 0.41335275
## 11243 0.41335275
## 11244 0.41335275
## 11245 0.41335275
## 11246 0.41335275
## 11247 0.41335275
## 11248 0.41335275
## 11249 0.29034252
## 11250 0.29034252
## 11251 0.29034252
## 11252 0.29034252
## 11253 0.29034252
## 11254 0.29034252
## 11255 0.29034252
## 11256 0.29034252
## 11257 0.29034252
## 11258 0.29034252
## 11259 0.29034252
## 11260 0.29034252
## 11261 0.29034252
## 11262 0.29034252
## 11263 0.29034252
## 11264 0.29034252
## 11265 0.16061839
## 11266 0.16061839
## 11267 0.16061839
## 11268 0.16061839
## 11269 0.16061839
## 11270 0.16061839
## 11271 0.16061839
## 11272 0.16061839
## 11273 0.16061839
## 11274 0.16061839
## 11275 0.16061839
## 11276 0.16061839
## 11277 0.16061839
## 11278 0.16061839
## 11279 0.16061839
## 11280 0.16061839
## 11281 0.32966320
## 11282 0.32966320
## 11283 0.32966320
## 11284 0.32966320
## 11285 0.32966320
## 11286 0.32966320
## 11287 0.32966320
## 11288 0.32966320
## 11289 0.32966320
## 11290 0.32966320
## 11291 0.32966320
## 11292 0.32966320
## 11293 0.32966320
## 11294 0.32966320
## 11295 0.32966320
## 11296 0.32966320
## 11297 2.77314842
## 11298 2.77314842
## 11299 2.77314842
## 11300 2.77314842
## 11301 2.77314842
## 11302 2.77314842
## 11303 2.77314842
## 11304 2.77314842
## 11305 2.77314842
## 11306 2.77314842
## 11307 2.77314842
## 11308 2.77314842
## 11309 2.77314842
## 11310 2.77314842
## 11311 2.77314842
## 11312 2.77314842
## 11313 2.36564941
## 11314 2.36564941
## 11315 2.36564941
## 11316 2.36564941
## 11317 2.36564941
## 11318 2.36564941
## 11319 2.36564941
## 11320 2.36564941
## 11321 2.36564941
## 11322 2.36564941
## 11323 2.36564941
## 11324 2.36564941
## 11325 2.36564941
## 11326 2.36564941
## 11327 2.36564941
## 11328 2.36564941
## 11329 0.68931516
## 11330 0.68931516
## 11331 0.68931516
## 11332 0.68931516
## 11333 0.68931516
## 11334 0.68931516
## 11335 0.68931516
## 11336 0.68931516
## 11337 0.68931516
## 11338 0.68931516
## 11339 0.68931516
## 11340 0.68931516
## 11341 0.68931516
## 11342 0.68931516
## 11343 0.68931516
## 11344 0.68931516
## 11345 2.15086057
## 11346 2.15086057
## 11347 2.15086057
## 11348 2.15086057
## 11349 2.15086057
## 11350 2.15086057
## 11351 2.15086057
## 11352 2.15086057
## 11353 2.15086057
## 11354 2.15086057
## 11355 2.15086057
## 11356 2.15086057
## 11357 2.15086057
## 11358 2.15086057
## 11359 2.15086057
## 11360 2.15086057
## 11361 0.81351036
## 11362 0.81351036
## 11363 0.81351036
## 11364 0.81351036
## 11365 0.81351036
## 11366 0.81351036
## 11367 0.81351036
## 11368 0.81351036
## 11369 0.81351036
## 11370 0.81351036
## 11371 0.81351036
## 11372 0.81351036
## 11373 0.81351036
## 11374 0.81351036
## 11375 0.81351036
## 11376 0.81351036
## 11377 1.28247763
## 11378 1.28247763
## 11379 1.28247763
## 11380 1.28247763
## 11381 1.28247763
## 11382 1.28247763
## 11383 1.28247763
## 11384 1.28247763
## 11385 1.28247763
## 11386 1.28247763
## 11387 1.28247763
## 11388 1.28247763
## 11389 1.28247763
## 11390 1.28247763
## 11391 1.28247763
## 11392 1.28247763
## 11393 0.22577641
## 11394 0.22577641
## 11395 0.22577641
## 11396 0.22577641
## 11397 0.22577641
## 11398 0.22577641
## 11399 0.22577641
## 11400 0.22577641
## 11401 0.22577641
## 11402 0.22577641
## 11403 0.22577641
## 11404 0.22577641
## 11405 0.22577641
## 11406 0.22577641
## 11407 0.22577641
## 11408 0.22577641
## 11409 2.71976900
## 11410 2.71976900
## 11411 2.71976900
## 11412 2.71976900
## 11413 2.71976900
## 11414 2.71976900
## 11415 2.71976900
## 11416 2.71976900
## 11417 2.71976900
## 11418 2.71976900
## 11419 2.71976900
## 11420 2.71976900
## 11421 2.71976900
## 11422 2.71976900
## 11423 2.71976900
## 11424 2.71976900
## 11425 0.05851345
## 11426 0.05851345
## 11427 0.05851345
## 11428 0.05851345
## 11429 0.05851345
## 11430 0.05851345
## 11431 0.05851345
## 11432 0.05851345
## 11433 0.05851345
## 11434 0.05851345
## 11435 0.05851345
## 11436 0.05851345
## 11437 0.05851345
## 11438 0.05851345
## 11439 0.05851345
## 11440 0.05851345
## 11441 0.98848457
## 11442 0.98848457
## 11443 0.98848457
## 11444 0.98848457
## 11445 0.98848457
## 11446 0.98848457
## 11447 0.98848457
## 11448 0.98848457
## 11449 0.98848457
## 11450 0.98848457
## 11451 0.98848457
## 11452 0.98848457
## 11453 0.98848457
## 11454 0.98848457
## 11455 0.98848457
## 11456 0.98848457
## 11457 0.64241446
## 11458 0.64241446
## 11459 0.64241446
## 11460 0.64241446
## 11461 0.64241446
## 11462 0.64241446
## 11463 0.64241446
## 11464 0.64241446
## 11465 0.64241446
## 11466 0.64241446
## 11467 0.64241446
## 11468 0.64241446
## 11469 0.64241446
## 11470 0.64241446
## 11471 0.64241446
## 11472 0.64241446
## 11473 0.64940772
## 11474 0.64940772
## 11475 0.64940772
## 11476 0.64940772
## 11477 0.64940772
## 11478 0.64940772
## 11479 0.64940772
## 11480 0.64940772
## 11481 0.64940772
## 11482 0.64940772
## 11483 0.64940772
## 11484 0.64940772
## 11485 0.64940772
## 11486 0.64940772
## 11487 0.64940772
## 11488 0.64940772
## 11489 0.35673365
## 11490 0.35673365
## 11491 0.35673365
## 11492 0.35673365
## 11493 0.35673365
## 11494 0.35673365
## 11495 0.35673365
## 11496 0.35673365
## 11497 0.35673365
## 11498 0.35673365
## 11499 0.35673365
## 11500 0.35673365
## 11501 0.35673365
## 11502 0.35673365
## 11503 0.35673365
## 11504 0.35673365
## 11505 1.49003036
## 11506 1.49003036
## 11507 1.49003036
## 11508 1.49003036
## 11509 1.49003036
## 11510 1.49003036
## 11511 1.49003036
## 11512 1.49003036
## 11513 1.49003036
## 11514 1.49003036
## 11515 1.49003036
## 11516 1.49003036
## 11517 1.49003036
## 11518 1.49003036
## 11519 1.49003036
## 11520 1.49003036
## 11521 0.74274523
## 11522 0.74274523
## 11523 0.74274523
## 11524 0.74274523
## 11525 0.74274523
## 11526 0.74274523
## 11527 0.74274523
## 11528 0.74274523
## 11529 0.74274523
## 11530 0.74274523
## 11531 0.74274523
## 11532 0.74274523
## 11533 0.74274523
## 11534 0.74274523
## 11535 0.74274523
## 11536 0.74274523
## 11537 0.69640909
## 11538 0.69640909
## 11539 0.69640909
## 11540 0.69640909
## 11541 0.69640909
## 11542 0.69640909
## 11543 0.69640909
## 11544 0.69640909
## 11545 0.69640909
## 11546 0.69640909
## 11547 0.69640909
## 11548 0.69640909
## 11549 0.69640909
## 11550 0.69640909
## 11551 0.69640909
## 11552 0.69640909
## 11553 0.68033420
## 11554 0.68033420
## 11555 0.68033420
## 11556 0.68033420
## 11557 0.68033420
## 11558 0.68033420
## 11559 0.68033420
## 11560 0.68033420
## 11561 0.68033420
## 11562 0.68033420
## 11563 0.68033420
## 11564 0.68033420
## 11565 0.68033420
## 11566 0.68033420
## 11567 0.68033420
## 11568 0.68033420
## 11569 0.36988385
## 11570 0.36988385
## 11571 0.36988385
## 11572 0.36988385
## 11573 0.36988385
## 11574 0.36988385
## 11575 0.36988385
## 11576 0.36988385
## 11577 0.36988385
## 11578 0.36988385
## 11579 0.36988385
## 11580 0.36988385
## 11581 0.36988385
## 11582 0.36988385
## 11583 0.36988385
## 11584 0.36988385
## 11585 1.71336876
## 11586 1.71336876
## 11587 1.71336876
## 11588 1.71336876
## 11589 1.71336876
## 11590 1.71336876
## 11591 1.71336876
## 11592 1.71336876
## 11593 1.71336876
## 11594 1.71336876
## 11595 1.71336876
## 11596 1.71336876
## 11597 1.71336876
## 11598 1.71336876
## 11599 1.71336876
## 11600 1.71336876
## 11601 0.47715751
## 11602 0.47715751
## 11603 0.47715751
## 11604 0.47715751
## 11605 0.47715751
## 11606 0.47715751
## 11607 0.47715751
## 11608 0.47715751
## 11609 0.47715751
## 11610 0.47715751
## 11611 0.47715751
## 11612 0.47715751
## 11613 0.47715751
## 11614 0.47715751
## 11615 0.47715751
## 11616 0.47715751
## 11617 0.66319043
## 11618 0.66319043
## 11619 0.66319043
## 11620 0.66319043
## 11621 0.66319043
## 11622 0.66319043
## 11623 0.66319043
## 11624 0.66319043
## 11625 0.66319043
## 11626 0.66319043
## 11627 0.66319043
## 11628 0.66319043
## 11629 0.66319043
## 11630 0.66319043
## 11631 0.66319043
## 11632 0.66319043
## 11633 0.18578435
## 11634 0.18578435
## 11635 0.18578435
## 11636 0.18578435
## 11637 0.18578435
## 11638 0.18578435
## 11639 0.18578435
## 11640 0.18578435
## 11641 0.18578435
## 11642 0.18578435
## 11643 0.18578435
## 11644 0.18578435
## 11645 0.18578435
## 11646 0.18578435
## 11647 0.18578435
## 11648 0.18578435
## 11649 0.36902431
## 11650 0.36902431
## 11651 0.36902431
## 11652 0.36902431
## 11653 0.36902431
## 11654 0.36902431
## 11655 0.36902431
## 11656 0.36902431
## 11657 0.36902431
## 11658 0.36902431
## 11659 0.36902431
## 11660 0.36902431
## 11661 0.36902431
## 11662 0.36902431
## 11663 0.36902431
## 11664 0.36902431
## 11665 0.56755022
## 11666 0.56755022
## 11667 0.56755022
## 11668 0.56755022
## 11669 0.56755022
## 11670 0.56755022
## 11671 0.56755022
## 11672 0.56755022
## 11673 0.56755022
## 11674 0.56755022
## 11675 0.56755022
## 11676 0.56755022
## 11677 0.56755022
## 11678 0.56755022
## 11679 0.56755022
## 11680 0.56755022
## 11681 1.08639219
## 11682 1.08639219
## 11683 1.08639219
## 11684 1.08639219
## 11685 1.08639219
## 11686 1.08639219
## 11687 1.08639219
## 11688 1.08639219
## 11689 1.08639219
## 11690 1.08639219
## 11691 1.08639219
## 11692 1.08639219
## 11693 1.08639219
## 11694 1.08639219
## 11695 1.08639219
## 11696 1.08639219
## 11697 0.50416238
## 11698 0.50416238
## 11699 0.50416238
## 11700 0.50416238
## 11701 0.50416238
## 11702 0.50416238
## 11703 0.50416238
## 11704 0.50416238
## 11705 0.50416238
## 11706 0.50416238
## 11707 0.50416238
## 11708 0.50416238
## 11709 0.50416238
## 11710 0.50416238
## 11711 0.50416238
## 11712 0.50416238
## 11713 0.42395100
## 11714 0.42395100
## 11715 0.42395100
## 11716 0.42395100
## 11717 0.42395100
## 11718 0.42395100
## 11719 0.42395100
## 11720 0.42395100
## 11721 0.42395100
## 11722 0.42395100
## 11723 0.42395100
## 11724 0.42395100
## 11725 0.42395100
## 11726 0.42395100
## 11727 0.42395100
## 11728 0.42395100
## 11729 0.67665319
## 11730 0.67665319
## 11731 0.67665319
## 11732 0.67665319
## 11733 0.67665319
## 11734 0.67665319
## 11735 0.67665319
## 11736 0.67665319
## 11737 0.67665319
## 11738 0.67665319
## 11739 0.67665319
## 11740 0.67665319
## 11741 0.67665319
## 11742 0.67665319
## 11743 0.67665319
## 11744 0.67665319
## 11745 0.46358068
## 11746 0.46358068
## 11747 0.46358068
## 11748 0.46358068
## 11749 0.46358068
## 11750 0.46358068
## 11751 0.46358068
## 11752 0.46358068
## 11753 0.46358068
## 11754 0.46358068
## 11755 0.46358068
## 11756 0.46358068
## 11757 0.46358068
## 11758 0.46358068
## 11759 0.46358068
## 11760 0.46358068
## 11761 1.08081091
## 11762 1.08081091
## 11763 1.08081091
## 11764 1.08081091
## 11765 1.08081091
## 11766 1.08081091
## 11767 1.08081091
## 11768 1.08081091
## 11769 1.08081091
## 11770 1.08081091
## 11771 1.08081091
## 11772 1.08081091
## 11773 1.08081091
## 11774 1.08081091
## 11775 1.08081091
## 11776 1.08081091
## 11777 1.98543527
## 11778 1.98543527
## 11779 1.98543527
## 11780 1.98543527
## 11781 1.98543527
## 11782 1.98543527
## 11783 1.98543527
## 11784 1.98543527
## 11785 1.98543527
## 11786 1.98543527
## 11787 1.98543527
## 11788 1.98543527
## 11789 1.98543527
## 11790 1.98543527
## 11791 1.98543527
## 11792 1.98543527
## 11793 0.74972173
## 11794 0.74972173
## 11795 0.74972173
## 11796 0.74972173
## 11797 0.74972173
## 11798 0.74972173
## 11799 0.74972173
## 11800 0.74972173
## 11801 0.74972173
## 11802 0.74972173
## 11803 0.74972173
## 11804 0.74972173
## 11805 0.74972173
## 11806 0.74972173
## 11807 0.74972173
## 11808 0.74972173
## 11809 0.65362191
## 11810 0.65362191
## 11811 0.65362191
## 11812 0.65362191
## 11813 0.65362191
## 11814 0.65362191
## 11815 0.65362191
## 11816 0.65362191
## 11817 0.65362191
## 11818 0.65362191
## 11819 0.65362191
## 11820 0.65362191
## 11821 0.65362191
## 11822 0.65362191
## 11823 0.65362191
## 11824 0.65362191
## 11825 2.20935865
## 11826 2.20935865
## 11827 2.20935865
## 11828 2.20935865
## 11829 2.20935865
## 11830 2.20935865
## 11831 2.20935865
## 11832 2.20935865
## 11833 2.20935865
## 11834 2.20935865
## 11835 2.20935865
## 11836 2.20935865
## 11837 2.20935865
## 11838 2.20935865
## 11839 2.20935865
## 11840 2.20935865
## 11841 0.45802299
## 11842 0.45802299
## 11843 0.45802299
## 11844 0.45802299
## 11845 0.45802299
## 11846 0.45802299
## 11847 0.45802299
## 11848 0.45802299
## 11849 0.45802299
## 11850 0.45802299
## 11851 0.45802299
## 11852 0.45802299
## 11853 0.45802299
## 11854 0.45802299
## 11855 0.45802299
## 11856 0.45802299
## 11857 0.75074948
## 11858 0.75074948
## 11859 0.75074948
## 11860 0.75074948
## 11861 0.75074948
## 11862 0.75074948
## 11863 0.75074948
## 11864 0.75074948
## 11865 0.75074948
## 11866 0.75074948
## 11867 0.75074948
## 11868 0.75074948
## 11869 0.75074948
## 11870 0.75074948
## 11871 0.75074948
## 11872 0.75074948
## 11873 1.61025664
## 11874 1.61025664
## 11875 1.61025664
## 11876 1.61025664
## 11877 1.61025664
## 11878 1.61025664
## 11879 1.61025664
## 11880 1.61025664
## 11881 1.61025664
## 11882 1.61025664
## 11883 1.61025664
## 11884 1.61025664
## 11885 1.61025664
## 11886 1.61025664
## 11887 1.61025664
## 11888 1.61025664
## 11889 1.96420605
## 11890 1.96420605
## 11891 1.96420605
## 11892 1.96420605
## 11893 1.96420605
## 11894 1.96420605
## 11895 1.96420605
## 11896 1.96420605
## 11897 1.96420605
## 11898 1.96420605
## 11899 1.96420605
## 11900 1.96420605
## 11901 1.96420605
## 11902 1.96420605
## 11903 1.96420605
## 11904 1.96420605
## 11905 0.32119734
## 11906 0.32119734
## 11907 0.32119734
## 11908 0.32119734
## 11909 0.32119734
## 11910 0.32119734
## 11911 0.32119734
## 11912 0.32119734
## 11913 0.32119734
## 11914 0.32119734
## 11915 0.32119734
## 11916 0.32119734
## 11917 0.32119734
## 11918 0.32119734
## 11919 0.32119734
## 11920 0.32119734
## 11921 0.19247583
## 11922 0.19247583
## 11923 0.19247583
## 11924 0.19247583
## 11925 0.19247583
## 11926 0.19247583
## 11927 0.19247583
## 11928 0.19247583
## 11929 0.19247583
## 11930 0.19247583
## 11931 0.19247583
## 11932 0.19247583
## 11933 0.19247583
## 11934 0.19247583
## 11935 0.19247583
## 11936 0.19247583
## 11937 0.15593622
## 11938 0.15593622
## 11939 0.15593622
## 11940 0.15593622
## 11941 0.15593622
## 11942 0.15593622
## 11943 0.15593622
## 11944 0.15593622
## 11945 0.15593622
## 11946 0.15593622
## 11947 0.15593622
## 11948 0.15593622
## 11949 0.15593622
## 11950 0.15593622
## 11951 0.15593622
## 11952 0.15593622
## 11953 1.12706435
## 11954 1.12706435
## 11955 1.12706435
## 11956 1.12706435
## 11957 1.12706435
## 11958 1.12706435
## 11959 1.12706435
## 11960 1.12706435
## 11961 1.12706435
## 11962 1.12706435
## 11963 1.12706435
## 11964 1.12706435
## 11965 1.12706435
## 11966 1.12706435
## 11967 1.12706435
## 11968 1.12706435
## 11969 1.59191285
## 11970 1.59191285
## 11971 1.59191285
## 11972 1.59191285
## 11973 1.59191285
## 11974 1.59191285
## 11975 1.59191285
## 11976 1.59191285
## 11977 1.59191285
## 11978 1.59191285
## 11979 1.59191285
## 11980 1.59191285
## 11981 1.59191285
## 11982 1.59191285
## 11983 1.59191285
## 11984 1.59191285
## 11985 0.22178063
## 11986 0.22178063
## 11987 0.22178063
## 11988 0.22178063
## 11989 0.22178063
## 11990 0.22178063
## 11991 0.22178063
## 11992 0.22178063
## 11993 0.22178063
## 11994 0.22178063
## 11995 0.22178063
## 11996 0.22178063
## 11997 0.22178063
## 11998 0.22178063
## 11999 0.22178063
## 12000 0.22178063
## 12001 0.27349268
## 12002 0.27349268
## 12003 0.27349268
## 12004 0.27349268
## 12005 0.27349268
## 12006 0.27349268
## 12007 0.27349268
## 12008 0.27349268
## 12009 0.27349268
## 12010 0.27349268
## 12011 0.27349268
## 12012 0.27349268
## 12013 0.27349268
## 12014 0.27349268
## 12015 0.27349268
## 12016 0.27349268
## 12017 0.65468160
## 12018 0.65468160
## 12019 0.65468160
## 12020 0.65468160
## 12021 0.65468160
## 12022 0.65468160
## 12023 0.65468160
## 12024 0.65468160
## 12025 0.65468160
## 12026 0.65468160
## 12027 0.65468160
## 12028 0.65468160
## 12029 0.65468160
## 12030 0.65468160
## 12031 0.65468160
## 12032 0.65468160
## 12033 0.24731516
## 12034 0.24731516
## 12035 0.24731516
## 12036 0.24731516
## 12037 0.24731516
## 12038 0.24731516
## 12039 0.24731516
## 12040 0.24731516
## 12041 0.24731516
## 12042 0.24731516
## 12043 0.24731516
## 12044 0.24731516
## 12045 0.24731516
## 12046 0.24731516
## 12047 0.24731516
## 12048 0.24731516
## 12049 0.35248587
## 12050 0.35248587
## 12051 0.35248587
## 12052 0.35248587
## 12053 0.35248587
## 12054 0.35248587
## 12055 0.35248587
## 12056 0.35248587
## 12057 0.35248587
## 12058 0.35248587
## 12059 0.35248587
## 12060 0.35248587
## 12061 0.35248587
## 12062 0.35248587
## 12063 0.35248587
## 12064 0.35248587
## 12065 0.59203207
## 12066 0.59203207
## 12067 0.59203207
## 12068 0.59203207
## 12069 0.59203207
## 12070 0.59203207
## 12071 0.59203207
## 12072 0.59203207
## 12073 0.59203207
## 12074 0.59203207
## 12075 0.59203207
## 12076 0.59203207
## 12077 0.59203207
## 12078 0.59203207
## 12079 0.59203207
## 12080 0.59203207
## 12081 1.14835120
## 12082 1.14835120
## 12083 1.14835120
## 12084 1.14835120
## 12085 1.14835120
## 12086 1.14835120
## 12087 1.14835120
## 12088 1.14835120
## 12089 1.14835120
## 12090 1.14835120
## 12091 1.14835120
## 12092 1.14835120
## 12093 1.14835120
## 12094 1.14835120
## 12095 1.14835120
## 12096 1.14835120
## 12097 1.28665305
## 12098 1.28665305
## 12099 1.28665305
## 12100 1.28665305
## 12101 1.28665305
## 12102 1.28665305
## 12103 1.28665305
## 12104 1.28665305
## 12105 1.28665305
## 12106 1.28665305
## 12107 1.28665305
## 12108 1.28665305
## 12109 1.28665305
## 12110 1.28665305
## 12111 1.28665305
## 12112 1.28665305
## 12113 0.62053131
## 12114 0.62053131
## 12115 0.62053131
## 12116 0.62053131
## 12117 0.62053131
## 12118 0.62053131
## 12119 0.62053131
## 12120 0.62053131
## 12121 0.62053131
## 12122 0.62053131
## 12123 0.62053131
## 12124 0.62053131
## 12125 0.62053131
## 12126 0.62053131
## 12127 0.62053131
## 12128 0.62053131
## 12129 4.01463295
## 12130 4.01463295
## 12131 4.01463295
## 12132 4.01463295
## 12133 4.01463295
## 12134 4.01463295
## 12135 4.01463295
## 12136 4.01463295
## 12137 4.01463295
## 12138 4.01463295
## 12139 4.01463295
## 12140 4.01463295
## 12141 4.01463295
## 12142 4.01463295
## 12143 4.01463295
## 12144 4.01463295
## 12145 5.64967407
## 12146 5.64967407
## 12147 5.64967407
## 12148 5.64967407
## 12149 5.64967407
## 12150 5.64967407
## 12151 5.64967407
## 12152 5.64967407
## 12153 5.64967407
## 12154 5.64967407
## 12155 5.64967407
## 12156 5.64967407
## 12157 5.64967407
## 12158 5.64967407
## 12159 5.64967407
## 12160 5.64967407
## 12161 0.50052982
## 12162 0.50052982
## 12163 0.50052982
## 12164 0.50052982
## 12165 0.50052982
## 12166 0.50052982
## 12167 0.50052982
## 12168 0.50052982
## 12169 0.50052982
## 12170 0.50052982
## 12171 0.50052982
## 12172 0.50052982
## 12173 0.50052982
## 12174 0.50052982
## 12175 0.50052982
## 12176 0.50052982
## 12177 2.11754272
## 12178 2.11754272
## 12179 2.11754272
## 12180 2.11754272
## 12181 2.11754272
## 12182 2.11754272
## 12183 2.11754272
## 12184 2.11754272
## 12185 2.11754272
## 12186 2.11754272
## 12187 2.11754272
## 12188 2.11754272
## 12189 2.11754272
## 12190 2.11754272
## 12191 2.11754272
## 12192 2.11754272
## 12193 1.09755332
## 12194 1.09755332
## 12195 1.09755332
## 12196 1.09755332
## 12197 1.09755332
## 12198 1.09755332
## 12199 1.09755332
## 12200 1.09755332
## 12201 1.09755332
## 12202 1.09755332
## 12203 1.09755332
## 12204 1.09755332
## 12205 1.09755332
## 12206 1.09755332
## 12207 1.09755332
## 12208 1.09755332
## 12209 0.13921561
## 12210 0.13921561
## 12211 0.13921561
## 12212 0.13921561
## 12213 0.13921561
## 12214 0.13921561
## 12215 0.13921561
## 12216 0.13921561
## 12217 0.13921561
## 12218 0.13921561
## 12219 0.13921561
## 12220 0.13921561
## 12221 0.13921561
## 12222 0.13921561
## 12223 0.13921561
## 12224 0.13921561
## 12225 0.49338435
## 12226 0.49338435
## 12227 0.49338435
## 12228 0.49338435
## 12229 0.49338435
## 12230 0.49338435
## 12231 0.49338435
## 12232 0.49338435
## 12233 0.49338435
## 12234 0.49338435
## 12235 0.49338435
## 12236 0.49338435
## 12237 0.49338435
## 12238 0.49338435
## 12239 0.49338435
## 12240 0.49338435
## 12241 1.55447965
## 12242 1.55447965
## 12243 1.55447965
## 12244 1.55447965
## 12245 1.55447965
## 12246 1.55447965
## 12247 1.55447965
## 12248 1.55447965
## 12249 1.55447965
## 12250 1.55447965
## 12251 1.55447965
## 12252 1.55447965
## 12253 1.55447965
## 12254 1.55447965
## 12255 1.55447965
## 12256 1.55447965
## 12257 2.20349271
## 12258 2.20349271
## 12259 2.20349271
## 12260 2.20349271
## 12261 2.20349271
## 12262 2.20349271
## 12263 2.20349271
## 12264 2.20349271
## 12265 2.20349271
## 12266 2.20349271
## 12267 2.20349271
## 12268 2.20349271
## 12269 2.20349271
## 12270 2.20349271
## 12271 2.20349271
## 12272 2.20349271
## 12273 0.27450913
## 12274 0.27450913
## 12275 0.27450913
## 12276 0.27450913
## 12277 0.27450913
## 12278 0.27450913
## 12279 0.27450913
## 12280 0.27450913
## 12281 0.27450913
## 12282 0.27450913
## 12283 0.27450913
## 12284 0.27450913
## 12285 0.27450913
## 12286 0.27450913
## 12287 0.27450913
## 12288 0.27450913
## 12289 0.89598327
## 12290 0.89598327
## 12291 0.89598327
## 12292 0.89598327
## 12293 0.89598327
## 12294 0.89598327
## 12295 0.89598327
## 12296 0.89598327
## 12297 0.89598327
## 12298 0.89598327
## 12299 0.89598327
## 12300 0.89598327
## 12301 0.89598327
## 12302 0.89598327
## 12303 0.89598327
## 12304 0.89598327
## 12305 0.53614065
## 12306 0.53614065
## 12307 0.53614065
## 12308 0.53614065
## 12309 0.53614065
## 12310 0.53614065
## 12311 0.53614065
## 12312 0.53614065
## 12313 0.53614065
## 12314 0.53614065
## 12315 0.53614065
## 12316 0.53614065
## 12317 0.53614065
## 12318 0.53614065
## 12319 0.53614065
## 12320 0.53614065
## 12321 0.17363794
## 12322 0.17363794
## 12323 0.17363794
## 12324 0.17363794
## 12325 0.17363794
## 12326 0.17363794
## 12327 0.17363794
## 12328 0.17363794
## 12329 0.17363794
## 12330 0.17363794
## 12331 0.17363794
## 12332 0.17363794
## 12333 0.17363794
## 12334 0.17363794
## 12335 0.17363794
## 12336 0.17363794
## 12337 0.35168143
## 12338 0.35168143
## 12339 0.35168143
## 12340 0.35168143
## 12341 0.35168143
## 12342 0.35168143
## 12343 0.35168143
## 12344 0.35168143
## 12345 0.35168143
## 12346 0.35168143
## 12347 0.35168143
## 12348 0.35168143
## 12349 0.35168143
## 12350 0.35168143
## 12351 0.35168143
## 12352 0.35168143
## 12353 0.59598089
## 12354 0.59598089
## 12355 0.59598089
## 12356 0.59598089
## 12357 0.59598089
## 12358 0.59598089
## 12359 0.59598089
## 12360 0.59598089
## 12361 0.59598089
## 12362 0.59598089
## 12363 0.59598089
## 12364 0.59598089
## 12365 0.59598089
## 12366 0.59598089
## 12367 0.59598089
## 12368 0.59598089
## 12369 0.41272917
## 12370 0.41272917
## 12371 0.41272917
## 12372 0.41272917
## 12373 0.41272917
## 12374 0.41272917
## 12375 0.41272917
## 12376 0.41272917
## 12377 0.41272917
## 12378 0.41272917
## 12379 0.41272917
## 12380 0.41272917
## 12381 0.41272917
## 12382 0.41272917
## 12383 0.41272917
## 12384 0.41272917
## 12385 3.16169586
## 12386 3.16169586
## 12387 3.16169586
## 12388 3.16169586
## 12389 3.16169586
## 12390 3.16169586
## 12391 3.16169586
## 12392 3.16169586
## 12393 3.16169586
## 12394 3.16169586
## 12395 3.16169586
## 12396 3.16169586
## 12397 3.16169586
## 12398 3.16169586
## 12399 3.16169586
## 12400 3.16169586
## 12401 4.46195871
## 12402 4.46195871
## 12403 4.46195871
## 12404 4.46195871
## 12405 4.46195871
## 12406 4.46195871
## 12407 4.46195871
## 12408 4.46195871
## 12409 4.46195871
## 12410 4.46195871
## 12411 4.46195871
## 12412 4.46195871
## 12413 4.46195871
## 12414 4.46195871
## 12415 4.46195871
## 12416 4.46195871
## 12417 0.05538473
## 12418 0.05538473
## 12419 0.05538473
## 12420 0.05538473
## 12421 0.05538473
## 12422 0.05538473
## 12423 0.05538473
## 12424 0.05538473
## 12425 0.05538473
## 12426 0.05538473
## 12427 0.05538473
## 12428 0.05538473
## 12429 0.05538473
## 12430 0.05538473
## 12431 0.05538473
## 12432 0.05538473
## 12433 1.07611309
## 12434 1.07611309
## 12435 1.07611309
## 12436 1.07611309
## 12437 1.07611309
## 12438 1.07611309
## 12439 1.07611309
## 12440 1.07611309
## 12441 1.07611309
## 12442 1.07611309
## 12443 1.07611309
## 12444 1.07611309
## 12445 1.07611309
## 12446 1.07611309
## 12447 1.07611309
## 12448 1.07611309
## 12449 3.05826906
## 12450 3.05826906
## 12451 3.05826906
## 12452 3.05826906
## 12453 3.05826906
## 12454 3.05826906
## 12455 3.05826906
## 12456 3.05826906
## 12457 3.05826906
## 12458 3.05826906
## 12459 3.05826906
## 12460 3.05826906
## 12461 3.05826906
## 12462 3.05826906
## 12463 3.05826906
## 12464 3.05826906
## 12465 0.17825484
## 12466 0.17825484
## 12467 0.17825484
## 12468 0.17825484
## 12469 0.17825484
## 12470 0.17825484
## 12471 0.17825484
## 12472 0.17825484
## 12473 0.17825484
## 12474 0.17825484
## 12475 0.17825484
## 12476 0.17825484
## 12477 0.17825484
## 12478 0.17825484
## 12479 0.17825484
## 12480 0.17825484
## 12481 4.09339084
## 12482 4.09339084
## 12483 4.09339084
## 12484 4.09339084
## 12485 4.09339084
## 12486 4.09339084
## 12487 4.09339084
## 12488 4.09339084
## 12489 4.09339084
## 12490 4.09339084
## 12491 4.09339084
## 12492 4.09339084
## 12493 4.09339084
## 12494 4.09339084
## 12495 4.09339084
## 12496 4.09339084
## 12497 1.29495542
## 12498 1.29495542
## 12499 1.29495542
## 12500 1.29495542
## 12501 1.29495542
## 12502 1.29495542
## 12503 1.29495542
## 12504 1.29495542
## 12505 1.29495542
## 12506 1.29495542
## 12507 1.29495542
## 12508 1.29495542
## 12509 1.29495542
## 12510 1.29495542
## 12511 1.29495542
## 12512 1.29495542
## 12513 0.68446370
## 12514 0.68446370
## 12515 0.68446370
## 12516 0.68446370
## 12517 0.68446370
## 12518 0.68446370
## 12519 0.68446370
## 12520 0.68446370
## 12521 0.68446370
## 12522 0.68446370
## 12523 0.68446370
## 12524 0.68446370
## 12525 0.68446370
## 12526 0.68446370
## 12527 0.68446370
## 12528 0.68446370
## 12529 3.52482883
## 12530 3.52482883
## 12531 3.52482883
## 12532 3.52482883
## 12533 3.52482883
## 12534 3.52482883
## 12535 3.52482883
## 12536 3.52482883
## 12537 3.52482883
## 12538 3.52482883
## 12539 3.52482883
## 12540 3.52482883
## 12541 3.52482883
## 12542 3.52482883
## 12543 3.52482883
## 12544 3.52482883
## 12545 1.15476805
## 12546 1.15476805
## 12547 1.15476805
## 12548 1.15476805
## 12549 1.15476805
## 12550 1.15476805
## 12551 1.15476805
## 12552 1.15476805
## 12553 1.15476805
## 12554 1.15476805
## 12555 1.15476805
## 12556 1.15476805
## 12557 1.15476805
## 12558 1.15476805
## 12559 1.15476805
## 12560 1.15476805
## 12561 0.90800946
## 12562 0.90800946
## 12563 0.90800946
## 12564 0.90800946
## 12565 0.90800946
## 12566 0.90800946
## 12567 0.90800946
## 12568 0.90800946
## 12569 0.90800946
## 12570 0.90800946
## 12571 0.90800946
## 12572 0.90800946
## 12573 0.90800946
## 12574 0.90800946
## 12575 0.90800946
## 12576 0.90800946
## 12577 0.60431794
## 12578 0.60431794
## 12579 0.60431794
## 12580 0.60431794
## 12581 0.60431794
## 12582 0.60431794
## 12583 0.60431794
## 12584 0.60431794
## 12585 0.60431794
## 12586 0.60431794
## 12587 0.60431794
## 12588 0.60431794
## 12589 0.60431794
## 12590 0.60431794
## 12591 0.60431794
## 12592 0.60431794
## 12593 0.43238547
## 12594 0.43238547
## 12595 0.43238547
## 12596 0.43238547
## 12597 0.43238547
## 12598 0.43238547
## 12599 0.43238547
## 12600 0.43238547
## 12601 0.43238547
## 12602 0.43238547
## 12603 0.43238547
## 12604 0.43238547
## 12605 0.43238547
## 12606 0.43238547
## 12607 0.43238547
## 12608 0.43238547
## 12609 0.37975892
## 12610 0.37975892
## 12611 0.37975892
## 12612 0.37975892
## 12613 0.37975892
## 12614 0.37975892
## 12615 0.37975892
## 12616 0.37975892
## 12617 0.37975892
## 12618 0.37975892
## 12619 0.37975892
## 12620 0.37975892
## 12621 0.37975892
## 12622 0.37975892
## 12623 0.37975892
## 12624 0.37975892
## 12625 1.12685308
## 12626 1.12685308
## 12627 1.12685308
## 12628 1.12685308
## 12629 1.12685308
## 12630 1.12685308
## 12631 1.12685308
## 12632 1.12685308
## 12633 1.12685308
## 12634 1.12685308
## 12635 1.12685308
## 12636 1.12685308
## 12637 1.12685308
## 12638 1.12685308
## 12639 1.12685308
## 12640 1.12685308
## 12641 0.43530173
## 12642 0.43530173
## 12643 0.43530173
## 12644 0.43530173
## 12645 0.43530173
## 12646 0.43530173
## 12647 0.43530173
## 12648 0.43530173
## 12649 0.43530173
## 12650 0.43530173
## 12651 0.43530173
## 12652 0.43530173
## 12653 0.43530173
## 12654 0.43530173
## 12655 0.43530173
## 12656 0.43530173
## 12657 0.88395450
## 12658 0.88395450
## 12659 0.88395450
## 12660 0.88395450
## 12661 0.88395450
## 12662 0.88395450
## 12663 0.88395450
## 12664 0.88395450
## 12665 0.88395450
## 12666 0.88395450
## 12667 0.88395450
## 12668 0.88395450
## 12669 0.88395450
## 12670 0.88395450
## 12671 0.88395450
## 12672 0.88395450
## 12673 0.54784087
## 12674 0.54784087
## 12675 0.54784087
## 12676 0.54784087
## 12677 0.54784087
## 12678 0.54784087
## 12679 0.54784087
## 12680 0.54784087
## 12681 0.54784087
## 12682 0.54784087
## 12683 0.54784087
## 12684 0.54784087
## 12685 0.54784087
## 12686 0.54784087
## 12687 0.54784087
## 12688 0.54784087
## 12689 0.53372407
## 12690 0.53372407
## 12691 0.53372407
## 12692 0.53372407
## 12693 0.53372407
## 12694 0.53372407
## 12695 0.53372407
## 12696 0.53372407
## 12697 0.53372407
## 12698 0.53372407
## 12699 0.53372407
## 12700 0.53372407
## 12701 0.53372407
## 12702 0.53372407
## 12703 0.53372407
## 12704 0.53372407
## 12705 0.03575511
## 12706 0.03575511
## 12707 0.03575511
## 12708 0.03575511
## 12709 0.03575511
## 12710 0.03575511
## 12711 0.03575511
## 12712 0.03575511
## 12713 0.03575511
## 12714 0.03575511
## 12715 0.03575511
## 12716 0.03575511
## 12717 0.03575511
## 12718 0.03575511
## 12719 0.03575511
## 12720 0.03575511
## 12721 0.76074168
## 12722 0.76074168
## 12723 0.76074168
## 12724 0.76074168
## 12725 0.76074168
## 12726 0.76074168
## 12727 0.76074168
## 12728 0.76074168
## 12729 0.76074168
## 12730 0.76074168
## 12731 0.76074168
## 12732 0.76074168
## 12733 0.76074168
## 12734 0.76074168
## 12735 0.76074168
## 12736 0.76074168
## 12737 0.29430470
## 12738 0.29430470
## 12739 0.29430470
## 12740 0.29430470
## 12741 0.29430470
## 12742 0.29430470
## 12743 0.29430470
## 12744 0.29430470
## 12745 0.29430470
## 12746 0.29430470
## 12747 0.29430470
## 12748 0.29430470
## 12749 0.29430470
## 12750 0.29430470
## 12751 0.29430470
## 12752 0.29430470
## 12753 1.62533739
## 12754 1.62533739
## 12755 1.62533739
## 12756 1.62533739
## 12757 1.62533739
## 12758 1.62533739
## 12759 1.62533739
## 12760 1.62533739
## 12761 1.62533739
## 12762 1.62533739
## 12763 1.62533739
## 12764 1.62533739
## 12765 1.62533739
## 12766 1.62533739
## 12767 1.62533739
## 12768 1.62533739
## 12769 2.02013712
## 12770 2.02013712
## 12771 2.02013712
## 12772 2.02013712
## 12773 2.02013712
## 12774 2.02013712
## 12775 2.02013712
## 12776 2.02013712
## 12777 2.02013712
## 12778 2.02013712
## 12779 2.02013712
## 12780 2.02013712
## 12781 2.02013712
## 12782 2.02013712
## 12783 2.02013712
## 12784 2.02013712
## 12785 0.09718339
## 12786 0.09718339
## 12787 0.09718339
## 12788 0.09718339
## 12789 0.09718339
## 12790 0.09718339
## 12791 0.09718339
## 12792 0.09718339
## 12793 0.09718339
## 12794 0.09718339
## 12795 0.09718339
## 12796 0.09718339
## 12797 0.09718339
## 12798 0.09718339
## 12799 0.09718339
## 12800 0.09718339
## 12801 0.29113679
## 12802 0.29113679
## 12803 0.29113679
## 12804 0.29113679
## 12805 0.29113679
## 12806 0.29113679
## 12807 0.29113679
## 12808 0.29113679
## 12809 0.29113679
## 12810 0.29113679
## 12811 0.29113679
## 12812 0.29113679
## 12813 0.29113679
## 12814 0.29113679
## 12815 0.29113679
## 12816 0.29113679
## 12817 0.57626622
## 12818 0.57626622
## 12819 0.57626622
## 12820 0.57626622
## 12821 0.57626622
## 12822 0.57626622
## 12823 0.57626622
## 12824 0.57626622
## 12825 0.57626622
## 12826 0.57626622
## 12827 0.57626622
## 12828 0.57626622
## 12829 0.57626622
## 12830 0.57626622
## 12831 0.57626622
## 12832 0.57626622
## 12833 0.96861106
## 12834 0.96861106
## 12835 0.96861106
## 12836 0.96861106
## 12837 0.96861106
## 12838 0.96861106
## 12839 0.96861106
## 12840 0.96861106
## 12841 0.96861106
## 12842 0.96861106
## 12843 0.96861106
## 12844 0.96861106
## 12845 0.96861106
## 12846 0.96861106
## 12847 0.96861106
## 12848 0.96861106
## 12849 0.73281868
## 12850 0.73281868
## 12851 0.73281868
## 12852 0.73281868
## 12853 0.73281868
## 12854 0.73281868
## 12855 0.73281868
## 12856 0.73281868
## 12857 0.73281868
## 12858 0.73281868
## 12859 0.73281868
## 12860 0.73281868
## 12861 0.73281868
## 12862 0.73281868
## 12863 0.73281868
## 12864 0.73281868
## 12865 2.27304251
## 12866 2.27304251
## 12867 2.27304251
## 12868 2.27304251
## 12869 2.27304251
## 12870 2.27304251
## 12871 2.27304251
## 12872 2.27304251
## 12873 2.27304251
## 12874 2.27304251
## 12875 2.27304251
## 12876 2.27304251
## 12877 2.27304251
## 12878 2.27304251
## 12879 2.27304251
## 12880 2.27304251
## 12881 0.53127061
## 12882 0.53127061
## 12883 0.53127061
## 12884 0.53127061
## 12885 0.53127061
## 12886 0.53127061
## 12887 0.53127061
## 12888 0.53127061
## 12889 0.53127061
## 12890 0.53127061
## 12891 0.53127061
## 12892 0.53127061
## 12893 0.53127061
## 12894 0.53127061
## 12895 0.53127061
## 12896 0.53127061
## 12897 0.08455454
## 12898 0.08455454
## 12899 0.08455454
## 12900 0.08455454
## 12901 0.08455454
## 12902 0.08455454
## 12903 0.08455454
## 12904 0.08455454
## 12905 0.08455454
## 12906 0.08455454
## 12907 0.08455454
## 12908 0.08455454
## 12909 0.08455454
## 12910 0.08455454
## 12911 0.08455454
## 12912 0.08455454
## 12913 0.31834383
## 12914 0.31834383
## 12915 0.31834383
## 12916 0.31834383
## 12917 0.31834383
## 12918 0.31834383
## 12919 0.31834383
## 12920 0.31834383
## 12921 0.31834383
## 12922 0.31834383
## 12923 0.31834383
## 12924 0.31834383
## 12925 0.31834383
## 12926 0.31834383
## 12927 0.31834383
## 12928 0.31834383
## 12929 1.61114519
## 12930 1.61114519
## 12931 1.61114519
## 12932 1.61114519
## 12933 1.61114519
## 12934 1.61114519
## 12935 1.61114519
## 12936 1.61114519
## 12937 1.61114519
## 12938 1.61114519
## 12939 1.61114519
## 12940 1.61114519
## 12941 1.61114519
## 12942 1.61114519
## 12943 1.61114519
## 12944 1.61114519
## 12945 1.88507661
## 12946 1.88507661
## 12947 1.88507661
## 12948 1.88507661
## 12949 1.88507661
## 12950 1.88507661
## 12951 1.88507661
## 12952 1.88507661
## 12953 1.88507661
## 12954 1.88507661
## 12955 1.88507661
## 12956 1.88507661
## 12957 1.88507661
## 12958 1.88507661
## 12959 1.88507661
## 12960 1.88507661
## 12961 0.74622701
## 12962 0.74622701
## 12963 0.74622701
## 12964 0.74622701
## 12965 0.74622701
## 12966 0.74622701
## 12967 0.74622701
## 12968 0.74622701
## 12969 0.74622701
## 12970 0.74622701
## 12971 0.74622701
## 12972 0.74622701
## 12973 0.74622701
## 12974 0.74622701
## 12975 0.74622701
## 12976 0.74622701
## 12977 0.32243473
## 12978 0.32243473
## 12979 0.32243473
## 12980 0.32243473
## 12981 0.32243473
## 12982 0.32243473
## 12983 0.32243473
## 12984 0.32243473
## 12985 0.32243473
## 12986 0.32243473
## 12987 0.32243473
## 12988 0.32243473
## 12989 0.32243473
## 12990 0.32243473
## 12991 0.32243473
## 12992 0.32243473
## 12993 0.88101236
## 12994 0.88101236
## 12995 0.88101236
## 12996 0.88101236
## 12997 0.88101236
## 12998 0.88101236
## 12999 0.88101236
## 13000 0.88101236
## 13001 0.88101236
## 13002 0.88101236
## 13003 0.88101236
## 13004 0.88101236
## 13005 0.88101236
## 13006 0.88101236
## 13007 0.88101236
## 13008 0.88101236
## 13009 0.59803205
## 13010 0.59803205
## 13011 0.59803205
## 13012 0.59803205
## 13013 0.59803205
## 13014 0.59803205
## 13015 0.59803205
## 13016 0.59803205
## 13017 0.59803205
## 13018 0.59803205
## 13019 0.59803205
## 13020 0.59803205
## 13021 0.59803205
## 13022 0.59803205
## 13023 0.59803205
## 13024 0.59803205
## 13025 0.56036966
## 13026 0.56036966
## 13027 0.56036966
## 13028 0.56036966
## 13029 0.56036966
## 13030 0.56036966
## 13031 0.56036966
## 13032 0.56036966
## 13033 0.56036966
## 13034 0.56036966
## 13035 0.56036966
## 13036 0.56036966
## 13037 0.56036966
## 13038 0.56036966
## 13039 0.56036966
## 13040 0.56036966
## 13041 1.54953889
## 13042 1.54953889
## 13043 1.54953889
## 13044 1.54953889
## 13045 1.54953889
## 13046 1.54953889
## 13047 1.54953889
## 13048 1.54953889
## 13049 1.54953889
## 13050 1.54953889
## 13051 1.54953889
## 13052 1.54953889
## 13053 1.54953889
## 13054 1.54953889
## 13055 1.54953889
## 13056 1.54953889
## 13057 0.83193895
## 13058 0.83193895
## 13059 0.83193895
## 13060 0.83193895
## 13061 0.83193895
## 13062 0.83193895
## 13063 0.83193895
## 13064 0.83193895
## 13065 0.83193895
## 13066 0.83193895
## 13067 0.83193895
## 13068 0.83193895
## 13069 0.83193895
## 13070 0.83193895
## 13071 0.83193895
## 13072 0.83193895
## 13073 0.36052291
## 13074 0.36052291
## 13075 0.36052291
## 13076 0.36052291
## 13077 0.36052291
## 13078 0.36052291
## 13079 0.36052291
## 13080 0.36052291
## 13081 0.36052291
## 13082 0.36052291
## 13083 0.36052291
## 13084 0.36052291
## 13085 0.36052291
## 13086 0.36052291
## 13087 0.36052291
## 13088 0.36052291
## 13089 0.46366318
## 13090 0.46366318
## 13091 0.46366318
## 13092 0.46366318
## 13093 0.46366318
## 13094 0.46366318
## 13095 0.46366318
## 13096 0.46366318
## 13097 0.46366318
## 13098 0.46366318
## 13099 0.46366318
## 13100 0.46366318
## 13101 0.46366318
## 13102 0.46366318
## 13103 0.46366318
## 13104 0.46366318
## 13105 0.76962389
## 13106 0.76962389
## 13107 0.76962389
## 13108 0.76962389
## 13109 0.76962389
## 13110 0.76962389
## 13111 0.76962389
## 13112 0.76962389
## 13113 0.76962389
## 13114 0.76962389
## 13115 0.76962389
## 13116 0.76962389
## 13117 0.76962389
## 13118 0.76962389
## 13119 0.76962389
## 13120 0.76962389
## 13121 0.34785327
## 13122 0.34785327
## 13123 0.34785327
## 13124 0.34785327
## 13125 0.34785327
## 13126 0.34785327
## 13127 0.34785327
## 13128 0.34785327
## 13129 0.34785327
## 13130 0.34785327
## 13131 0.34785327
## 13132 0.34785327
## 13133 0.34785327
## 13134 0.34785327
## 13135 0.34785327
## 13136 0.34785327
## 13137 2.55277151
## 13138 2.55277151
## 13139 2.55277151
## 13140 2.55277151
## 13141 2.55277151
## 13142 2.55277151
## 13143 2.55277151
## 13144 2.55277151
## 13145 2.55277151
## 13146 2.55277151
## 13147 2.55277151
## 13148 2.55277151
## 13149 2.55277151
## 13150 2.55277151
## 13151 2.55277151
## 13152 2.55277151
## 13153 4.40385328
## 13154 4.40385328
## 13155 4.40385328
## 13156 4.40385328
## 13157 4.40385328
## 13158 4.40385328
## 13159 4.40385328
## 13160 4.40385328
## 13161 4.40385328
## 13162 4.40385328
## 13163 4.40385328
## 13164 4.40385328
## 13165 4.40385328
## 13166 4.40385328
## 13167 4.40385328
## 13168 4.40385328
## 13169 1.49172808
## 13170 1.49172808
## 13171 1.49172808
## 13172 1.49172808
## 13173 1.49172808
## 13174 1.49172808
## 13175 1.49172808
## 13176 1.49172808
## 13177 1.49172808
## 13178 1.49172808
## 13179 1.49172808
## 13180 1.49172808
## 13181 1.49172808
## 13182 1.49172808
## 13183 1.49172808
## 13184 1.49172808
## 13185 0.53425627
## 13186 0.53425627
## 13187 0.53425627
## 13188 0.53425627
## 13189 0.53425627
## 13190 0.53425627
## 13191 0.53425627
## 13192 0.53425627
## 13193 0.53425627
## 13194 0.53425627
## 13195 0.53425627
## 13196 0.53425627
## 13197 0.53425627
## 13198 0.53425627
## 13199 0.53425627
## 13200 0.53425627
## 13201 0.38107956
## 13202 0.38107956
## 13203 0.38107956
## 13204 0.38107956
## 13205 0.38107956
## 13206 0.38107956
## 13207 0.38107956
## 13208 0.38107956
## 13209 0.38107956
## 13210 0.38107956
## 13211 0.38107956
## 13212 0.38107956
## 13213 0.38107956
## 13214 0.38107956
## 13215 0.38107956
## 13216 0.38107956
## 13217 5.55660361
## 13218 5.55660361
## 13219 5.55660361
## 13220 5.55660361
## 13221 5.55660361
## 13222 5.55660361
## 13223 5.55660361
## 13224 5.55660361
## 13225 5.55660361
## 13226 5.55660361
## 13227 5.55660361
## 13228 5.55660361
## 13229 5.55660361
## 13230 5.55660361
## 13231 5.55660361
## 13232 5.55660361
## 13233 0.34671462
## 13234 0.34671462
## 13235 0.34671462
## 13236 0.34671462
## 13237 0.34671462
## 13238 0.34671462
## 13239 0.34671462
## 13240 0.34671462
## 13241 0.34671462
## 13242 0.34671462
## 13243 0.34671462
## 13244 0.34671462
## 13245 0.34671462
## 13246 0.34671462
## 13247 0.34671462
## 13248 0.34671462
## 13249 1.81486019
## 13250 1.81486019
## 13251 1.81486019
## 13252 1.81486019
## 13253 1.81486019
## 13254 1.81486019
## 13255 1.81486019
## 13256 1.81486019
## 13257 1.81486019
## 13258 1.81486019
## 13259 1.81486019
## 13260 1.81486019
## 13261 1.81486019
## 13262 1.81486019
## 13263 1.81486019
## 13264 1.81486019
## 13265 1.59337136
## 13266 1.59337136
## 13267 1.59337136
## 13268 1.59337136
## 13269 1.59337136
## 13270 1.59337136
## 13271 1.59337136
## 13272 1.59337136
## 13273 1.59337136
## 13274 1.59337136
## 13275 1.59337136
## 13276 1.59337136
## 13277 1.59337136
## 13278 1.59337136
## 13279 1.59337136
## 13280 1.59337136
## 13281 1.16229846
## 13282 1.16229846
## 13283 1.16229846
## 13284 1.16229846
## 13285 1.16229846
## 13286 1.16229846
## 13287 1.16229846
## 13288 1.16229846
## 13289 1.16229846
## 13290 1.16229846
## 13291 1.16229846
## 13292 1.16229846
## 13293 1.16229846
## 13294 1.16229846
## 13295 1.16229846
## 13296 1.16229846
## 13297 2.76183753
## 13298 2.76183753
## 13299 2.76183753
## 13300 2.76183753
## 13301 2.76183753
## 13302 2.76183753
## 13303 2.76183753
## 13304 2.76183753
## 13305 2.76183753
## 13306 2.76183753
## 13307 2.76183753
## 13308 2.76183753
## 13309 2.76183753
## 13310 2.76183753
## 13311 2.76183753
## 13312 2.76183753
## 13313 0.37675440
## 13314 0.37675440
## 13315 0.37675440
## 13316 0.37675440
## 13317 0.37675440
## 13318 0.37675440
## 13319 0.37675440
## 13320 0.37675440
## 13321 0.37675440
## 13322 0.37675440
## 13323 0.37675440
## 13324 0.37675440
## 13325 0.37675440
## 13326 0.37675440
## 13327 0.37675440
## 13328 0.37675440
## 13329 0.09023462
## 13330 0.09023462
## 13331 0.09023462
## 13332 0.09023462
## 13333 0.09023462
## 13334 0.09023462
## 13335 0.09023462
## 13336 0.09023462
## 13337 0.09023462
## 13338 0.09023462
## 13339 0.09023462
## 13340 0.09023462
## 13341 0.09023462
## 13342 0.09023462
## 13343 0.09023462
## 13344 0.09023462
## 13345 0.98912638
## 13346 0.98912638
## 13347 0.98912638
## 13348 0.98912638
## 13349 0.98912638
## 13350 0.98912638
## 13351 0.98912638
## 13352 0.98912638
## 13353 0.98912638
## 13354 0.98912638
## 13355 0.98912638
## 13356 0.98912638
## 13357 0.98912638
## 13358 0.98912638
## 13359 0.98912638
## 13360 0.98912638
## 13361 0.66204050
## 13362 0.66204050
## 13363 0.66204050
## 13364 0.66204050
## 13365 0.66204050
## 13366 0.66204050
## 13367 0.66204050
## 13368 0.66204050
## 13369 0.66204050
## 13370 0.66204050
## 13371 0.66204050
## 13372 0.66204050
## 13373 0.66204050
## 13374 0.66204050
## 13375 0.66204050
## 13376 0.66204050
## 13377 0.66196021
## 13378 0.66196021
## 13379 0.66196021
## 13380 0.66196021
## 13381 0.66196021
## 13382 0.66196021
## 13383 0.66196021
## 13384 0.66196021
## 13385 0.66196021
## 13386 0.66196021
## 13387 0.66196021
## 13388 0.66196021
## 13389 0.66196021
## 13390 0.66196021
## 13391 0.66196021
## 13392 0.66196021
## 13393 1.96107145
## 13394 1.96107145
## 13395 1.96107145
## 13396 1.96107145
## 13397 1.96107145
## 13398 1.96107145
## 13399 1.96107145
## 13400 1.96107145
## 13401 1.96107145
## 13402 1.96107145
## 13403 1.96107145
## 13404 1.96107145
## 13405 1.96107145
## 13406 1.96107145
## 13407 1.96107145
## 13408 1.96107145
## 13409 0.22647102
## 13410 0.22647102
## 13411 0.22647102
## 13412 0.22647102
## 13413 0.22647102
## 13414 0.22647102
## 13415 0.22647102
## 13416 0.22647102
## 13417 0.22647102
## 13418 0.22647102
## 13419 0.22647102
## 13420 0.22647102
## 13421 0.22647102
## 13422 0.22647102
## 13423 0.22647102
## 13424 0.22647102
## 13425 0.21635375
## 13426 0.21635375
## 13427 0.21635375
## 13428 0.21635375
## 13429 0.21635375
## 13430 0.21635375
## 13431 0.21635375
## 13432 0.21635375
## 13433 0.21635375
## 13434 0.21635375
## 13435 0.21635375
## 13436 0.21635375
## 13437 0.21635375
## 13438 0.21635375
## 13439 0.21635375
## 13440 0.21635375
## 13441 0.70926817
## 13442 0.70926817
## 13443 0.70926817
## 13444 0.70926817
## 13445 0.70926817
## 13446 0.70926817
## 13447 0.70926817
## 13448 0.70926817
## 13449 0.70926817
## 13450 0.70926817
## 13451 0.70926817
## 13452 0.70926817
## 13453 0.70926817
## 13454 0.70926817
## 13455 0.70926817
## 13456 0.70926817
## 13457 0.28349800
## 13458 0.28349800
## 13459 0.28349800
## 13460 0.28349800
## 13461 0.28349800
## 13462 0.28349800
## 13463 0.28349800
## 13464 0.28349800
## 13465 0.28349800
## 13466 0.28349800
## 13467 0.28349800
## 13468 0.28349800
## 13469 0.28349800
## 13470 0.28349800
## 13471 0.28349800
## 13472 0.28349800
## 13473 1.11987829
## 13474 1.11987829
## 13475 1.11987829
## 13476 1.11987829
## 13477 1.11987829
## 13478 1.11987829
## 13479 1.11987829
## 13480 1.11987829
## 13481 1.11987829
## 13482 1.11987829
## 13483 1.11987829
## 13484 1.11987829
## 13485 1.11987829
## 13486 1.11987829
## 13487 1.11987829
## 13488 1.11987829
## 13489 0.34276509
## 13490 0.34276509
## 13491 0.34276509
## 13492 0.34276509
## 13493 0.34276509
## 13494 0.34276509
## 13495 0.34276509
## 13496 0.34276509
## 13497 0.34276509
## 13498 0.34276509
## 13499 0.34276509
## 13500 0.34276509
## 13501 0.34276509
## 13502 0.34276509
## 13503 0.34276509
## 13504 0.34276509
## 13505 0.62436930
## 13506 0.62436930
## 13507 0.62436930
## 13508 0.62436930
## 13509 0.62436930
## 13510 0.62436930
## 13511 0.62436930
## 13512 0.62436930
## 13513 0.62436930
## 13514 0.62436930
## 13515 0.62436930
## 13516 0.62436930
## 13517 0.62436930
## 13518 0.62436930
## 13519 0.62436930
## 13520 0.62436930
## 13521 0.08055258
## 13522 0.08055258
## 13523 0.08055258
## 13524 0.08055258
## 13525 0.08055258
## 13526 0.08055258
## 13527 0.08055258
## 13528 0.08055258
## 13529 0.08055258
## 13530 0.08055258
## 13531 0.08055258
## 13532 0.08055258
## 13533 0.08055258
## 13534 0.08055258
## 13535 0.08055258
## 13536 0.08055258
## 13537 4.17760779
## 13538 4.17760779
## 13539 4.17760779
## 13540 4.17760779
## 13541 4.17760779
## 13542 4.17760779
## 13543 4.17760779
## 13544 4.17760779
## 13545 4.17760779
## 13546 4.17760779
## 13547 4.17760779
## 13548 4.17760779
## 13549 4.17760779
## 13550 4.17760779
## 13551 4.17760779
## 13552 4.17760779
## 13553 1.40251454
## 13554 1.40251454
## 13555 1.40251454
## 13556 1.40251454
## 13557 1.40251454
## 13558 1.40251454
## 13559 1.40251454
## 13560 1.40251454
## 13561 1.40251454
## 13562 1.40251454
## 13563 1.40251454
## 13564 1.40251454
## 13565 1.40251454
## 13566 1.40251454
## 13567 1.40251454
## 13568 1.40251454
## 13569 0.34059891
## 13570 0.34059891
## 13571 0.34059891
## 13572 0.34059891
## 13573 0.34059891
## 13574 0.34059891
## 13575 0.34059891
## 13576 0.34059891
## 13577 0.34059891
## 13578 0.34059891
## 13579 0.34059891
## 13580 0.34059891
## 13581 0.34059891
## 13582 0.34059891
## 13583 0.34059891
## 13584 0.34059891
## 13585 2.72145431
## 13586 2.72145431
## 13587 2.72145431
## 13588 2.72145431
## 13589 2.72145431
## 13590 2.72145431
## 13591 2.72145431
## 13592 2.72145431
## 13593 2.72145431
## 13594 2.72145431
## 13595 2.72145431
## 13596 2.72145431
## 13597 2.72145431
## 13598 2.72145431
## 13599 2.72145431
## 13600 2.72145431
## 13601 0.72935024
## 13602 0.72935024
## 13603 0.72935024
## 13604 0.72935024
## 13605 0.72935024
## 13606 0.72935024
## 13607 0.72935024
## 13608 0.72935024
## 13609 0.72935024
## 13610 0.72935024
## 13611 0.72935024
## 13612 0.72935024
## 13613 0.72935024
## 13614 0.72935024
## 13615 0.72935024
## 13616 0.72935024
## 13617 3.61730073
## 13618 3.61730073
## 13619 3.61730073
## 13620 3.61730073
## 13621 3.61730073
## 13622 3.61730073
## 13623 3.61730073
## 13624 3.61730073
## 13625 3.61730073
## 13626 3.61730073
## 13627 3.61730073
## 13628 3.61730073
## 13629 3.61730073
## 13630 3.61730073
## 13631 3.61730073
## 13632 3.61730073
## 13633 0.12632832
## 13634 0.12632832
## 13635 0.12632832
## 13636 0.12632832
## 13637 0.12632832
## 13638 0.12632832
## 13639 0.12632832
## 13640 0.12632832
## 13641 0.12632832
## 13642 0.12632832
## 13643 0.12632832
## 13644 0.12632832
## 13645 0.12632832
## 13646 0.12632832
## 13647 0.12632832
## 13648 0.12632832
## 13649 1.61140015
## 13650 1.61140015
## 13651 1.61140015
## 13652 1.61140015
## 13653 1.61140015
## 13654 1.61140015
## 13655 1.61140015
## 13656 1.61140015
## 13657 1.61140015
## 13658 1.61140015
## 13659 1.61140015
## 13660 1.61140015
## 13661 1.61140015
## 13662 1.61140015
## 13663 1.61140015
## 13664 1.61140015
## 13665 1.57311581
## 13666 1.57311581
## 13667 1.57311581
## 13668 1.57311581
## 13669 1.57311581
## 13670 1.57311581
## 13671 1.57311581
## 13672 1.57311581
## 13673 1.57311581
## 13674 1.57311581
## 13675 1.57311581
## 13676 1.57311581
## 13677 1.57311581
## 13678 1.57311581
## 13679 1.57311581
## 13680 1.57311581
## 13681 0.72094887
## 13682 0.72094887
## 13683 0.72094887
## 13684 0.72094887
## 13685 0.72094887
## 13686 0.72094887
## 13687 0.72094887
## 13688 0.72094887
## 13689 0.72094887
## 13690 0.72094887
## 13691 0.72094887
## 13692 0.72094887
## 13693 0.72094887
## 13694 0.72094887
## 13695 0.72094887
## 13696 0.72094887
## 13697 0.73051795
## 13698 0.73051795
## 13699 0.73051795
## 13700 0.73051795
## 13701 0.73051795
## 13702 0.73051795
## 13703 0.73051795
## 13704 0.73051795
## 13705 0.73051795
## 13706 0.73051795
## 13707 0.73051795
## 13708 0.73051795
## 13709 0.73051795
## 13710 0.73051795
## 13711 0.73051795
## 13712 0.73051795
## 13713 1.22805966
## 13714 1.22805966
## 13715 1.22805966
## 13716 1.22805966
## 13717 1.22805966
## 13718 1.22805966
## 13719 1.22805966
## 13720 1.22805966
## 13721 1.22805966
## 13722 1.22805966
## 13723 1.22805966
## 13724 1.22805966
## 13725 1.22805966
## 13726 1.22805966
## 13727 1.22805966
## 13728 1.22805966
## 13729 0.34494216
## 13730 0.34494216
## 13731 0.34494216
## 13732 0.34494216
## 13733 0.34494216
## 13734 0.34494216
## 13735 0.34494216
## 13736 0.34494216
## 13737 0.34494216
## 13738 0.34494216
## 13739 0.34494216
## 13740 0.34494216
## 13741 0.34494216
## 13742 0.34494216
## 13743 0.34494216
## 13744 0.34494216
## 13745 0.32087142
## 13746 0.32087142
## 13747 0.32087142
## 13748 0.32087142
## 13749 0.32087142
## 13750 0.32087142
## 13751 0.32087142
## 13752 0.32087142
## 13753 0.32087142
## 13754 0.32087142
## 13755 0.32087142
## 13756 0.32087142
## 13757 0.32087142
## 13758 0.32087142
## 13759 0.32087142
## 13760 0.32087142
## 13761 0.42560893
## 13762 0.42560893
## 13763 0.42560893
## 13764 0.42560893
## 13765 0.42560893
## 13766 0.42560893
## 13767 0.42560893
## 13768 0.42560893
## 13769 0.42560893
## 13770 0.42560893
## 13771 0.42560893
## 13772 0.42560893
## 13773 0.42560893
## 13774 0.42560893
## 13775 0.42560893
## 13776 0.42560893
## 13777 0.48689443
## 13778 0.48689443
## 13779 0.48689443
## 13780 0.48689443
## 13781 0.48689443
## 13782 0.48689443
## 13783 0.48689443
## 13784 0.48689443
## 13785 0.48689443
## 13786 0.48689443
## 13787 0.48689443
## 13788 0.48689443
## 13789 0.48689443
## 13790 0.48689443
## 13791 0.48689443
## 13792 0.48689443
## 13793 0.06022018
## 13794 0.06022018
## 13795 0.06022018
## 13796 0.06022018
## 13797 0.06022018
## 13798 0.06022018
## 13799 0.06022018
## 13800 0.06022018
## 13801 0.06022018
## 13802 0.06022018
## 13803 0.06022018
## 13804 0.06022018
## 13805 0.06022018
## 13806 0.06022018
## 13807 0.06022018
## 13808 0.06022018
## 13809 0.73711971
## 13810 0.73711971
## 13811 0.73711971
## 13812 0.73711971
## 13813 0.73711971
## 13814 0.73711971
## 13815 0.73711971
## 13816 0.73711971
## 13817 0.73711971
## 13818 0.73711971
## 13819 0.73711971
## 13820 0.73711971
## 13821 0.73711971
## 13822 0.73711971
## 13823 0.73711971
## 13824 0.73711971
## 13825 0.79339251
## 13826 0.79339251
## 13827 0.79339251
## 13828 0.79339251
## 13829 0.79339251
## 13830 0.79339251
## 13831 0.79339251
## 13832 0.79339251
## 13833 0.79339251
## 13834 0.79339251
## 13835 0.79339251
## 13836 0.79339251
## 13837 0.79339251
## 13838 0.79339251
## 13839 0.79339251
## 13840 0.79339251
## 13841 1.53072501
## 13842 1.53072501
## 13843 1.53072501
## 13844 1.53072501
## 13845 1.53072501
## 13846 1.53072501
## 13847 1.53072501
## 13848 1.53072501
## 13849 1.53072501
## 13850 1.53072501
## 13851 1.53072501
## 13852 1.53072501
## 13853 1.53072501
## 13854 1.53072501
## 13855 1.53072501
## 13856 1.53072501
## 13857 0.36625209
## 13858 0.36625209
## 13859 0.36625209
## 13860 0.36625209
## 13861 0.36625209
## 13862 0.36625209
## 13863 0.36625209
## 13864 0.36625209
## 13865 0.36625209
## 13866 0.36625209
## 13867 0.36625209
## 13868 0.36625209
## 13869 0.36625209
## 13870 0.36625209
## 13871 0.36625209
## 13872 0.36625209
## 13873 0.81445843
## 13874 0.81445843
## 13875 0.81445843
## 13876 0.81445843
## 13877 0.81445843
## 13878 0.81445843
## 13879 0.81445843
## 13880 0.81445843
## 13881 0.81445843
## 13882 0.81445843
## 13883 0.81445843
## 13884 0.81445843
## 13885 0.81445843
## 13886 0.81445843
## 13887 0.81445843
## 13888 0.81445843
## 13889 0.55587532
## 13890 0.55587532
## 13891 0.55587532
## 13892 0.55587532
## 13893 0.55587532
## 13894 0.55587532
## 13895 0.55587532
## 13896 0.55587532
## 13897 0.55587532
## 13898 0.55587532
## 13899 0.55587532
## 13900 0.55587532
## 13901 0.55587532
## 13902 0.55587532
## 13903 0.55587532
## 13904 0.55587532
## 13905 3.24110824
## 13906 3.24110824
## 13907 3.24110824
## 13908 3.24110824
## 13909 3.24110824
## 13910 3.24110824
## 13911 3.24110824
## 13912 3.24110824
## 13913 3.24110824
## 13914 3.24110824
## 13915 3.24110824
## 13916 3.24110824
## 13917 3.24110824
## 13918 3.24110824
## 13919 3.24110824
## 13920 3.24110824
## 13921 0.30609759
## 13922 0.30609759
## 13923 0.30609759
## 13924 0.30609759
## 13925 0.30609759
## 13926 0.30609759
## 13927 0.30609759
## 13928 0.30609759
## 13929 0.30609759
## 13930 0.30609759
## 13931 0.30609759
## 13932 0.30609759
## 13933 0.30609759
## 13934 0.30609759
## 13935 0.30609759
## 13936 0.30609759
## 13937 0.51915792
## 13938 0.51915792
## 13939 0.51915792
## 13940 0.51915792
## 13941 0.51915792
## 13942 0.51915792
## 13943 0.51915792
## 13944 0.51915792
## 13945 0.51915792
## 13946 0.51915792
## 13947 0.51915792
## 13948 0.51915792
## 13949 0.51915792
## 13950 0.51915792
## 13951 0.51915792
## 13952 0.51915792
## 13953 0.08172727
## 13954 0.08172727
## 13955 0.08172727
## 13956 0.08172727
## 13957 0.08172727
## 13958 0.08172727
## 13959 0.08172727
## 13960 0.08172727
## 13961 0.08172727
## 13962 0.08172727
## 13963 0.08172727
## 13964 0.08172727
## 13965 0.08172727
## 13966 0.08172727
## 13967 0.08172727
## 13968 0.08172727
## 13969 0.44770222
## 13970 0.44770222
## 13971 0.44770222
## 13972 0.44770222
## 13973 0.44770222
## 13974 0.44770222
## 13975 0.44770222
## 13976 0.44770222
## 13977 0.44770222
## 13978 0.44770222
## 13979 0.44770222
## 13980 0.44770222
## 13981 0.44770222
## 13982 0.44770222
## 13983 0.44770222
## 13984 0.44770222
## 13985 0.78506185
## 13986 0.78506185
## 13987 0.78506185
## 13988 0.78506185
## 13989 0.78506185
## 13990 0.78506185
## 13991 0.78506185
## 13992 0.78506185
## 13993 0.78506185
## 13994 0.78506185
## 13995 0.78506185
## 13996 0.78506185
## 13997 0.78506185
## 13998 0.78506185
## 13999 0.78506185
## 14000 0.78506185
## 14001 0.76080984
## 14002 0.76080984
## 14003 0.76080984
## 14004 0.76080984
## 14005 0.76080984
## 14006 0.76080984
## 14007 0.76080984
## 14008 0.76080984
## 14009 0.76080984
## 14010 0.76080984
## 14011 0.76080984
## 14012 0.76080984
## 14013 0.76080984
## 14014 0.76080984
## 14015 0.76080984
## 14016 0.76080984
## 14017 1.57709833
## 14018 1.57709833
## 14019 1.57709833
## 14020 1.57709833
## 14021 1.57709833
## 14022 1.57709833
## 14023 1.57709833
## 14024 1.57709833
## 14025 1.57709833
## 14026 1.57709833
## 14027 1.57709833
## 14028 1.57709833
## 14029 1.57709833
## 14030 1.57709833
## 14031 1.57709833
## 14032 1.57709833
## 14033 2.47104098
## 14034 2.47104098
## 14035 2.47104098
## 14036 2.47104098
## 14037 2.47104098
## 14038 2.47104098
## 14039 2.47104098
## 14040 2.47104098
## 14041 2.47104098
## 14042 2.47104098
## 14043 2.47104098
## 14044 2.47104098
## 14045 2.47104098
## 14046 2.47104098
## 14047 2.47104098
## 14048 2.47104098
## 14049 1.26810056
## 14050 1.26810056
## 14051 1.26810056
## 14052 1.26810056
## 14053 1.26810056
## 14054 1.26810056
## 14055 1.26810056
## 14056 1.26810056
## 14057 1.26810056
## 14058 1.26810056
## 14059 1.26810056
## 14060 1.26810056
## 14061 1.26810056
## 14062 1.26810056
## 14063 1.26810056
## 14064 1.26810056
## 14065 0.73246961
## 14066 0.73246961
## 14067 0.73246961
## 14068 0.73246961
## 14069 0.73246961
## 14070 0.73246961
## 14071 0.73246961
## 14072 0.73246961
## 14073 0.73246961
## 14074 0.73246961
## 14075 0.73246961
## 14076 0.73246961
## 14077 0.73246961
## 14078 0.73246961
## 14079 0.73246961
## 14080 0.73246961
## 14081 2.76308404
## 14082 2.76308404
## 14083 2.76308404
## 14084 2.76308404
## 14085 2.76308404
## 14086 2.76308404
## 14087 2.76308404
## 14088 2.76308404
## 14089 2.76308404
## 14090 2.76308404
## 14091 2.76308404
## 14092 2.76308404
## 14093 2.76308404
## 14094 2.76308404
## 14095 2.76308404
## 14096 2.76308404
## 14097 0.63376270
## 14098 0.63376270
## 14099 0.63376270
## 14100 0.63376270
## 14101 0.63376270
## 14102 0.63376270
## 14103 0.63376270
## 14104 0.63376270
## 14105 0.63376270
## 14106 0.63376270
## 14107 0.63376270
## 14108 0.63376270
## 14109 0.63376270
## 14110 0.63376270
## 14111 0.63376270
## 14112 0.63376270
## 14113 0.74094660
## 14114 0.74094660
## 14115 0.74094660
## 14116 0.74094660
## 14117 0.74094660
## 14118 0.74094660
## 14119 0.74094660
## 14120 0.74094660
## 14121 0.74094660
## 14122 0.74094660
## 14123 0.74094660
## 14124 0.74094660
## 14125 0.74094660
## 14126 0.74094660
## 14127 0.74094660
## 14128 0.74094660
## 14129 0.54759366
## 14130 0.54759366
## 14131 0.54759366
## 14132 0.54759366
## 14133 0.54759366
## 14134 0.54759366
## 14135 0.54759366
## 14136 0.54759366
## 14137 0.54759366
## 14138 0.54759366
## 14139 0.54759366
## 14140 0.54759366
## 14141 0.54759366
## 14142 0.54759366
## 14143 0.54759366
## 14144 0.54759366
## 14145 0.41658373
## 14146 0.41658373
## 14147 0.41658373
## 14148 0.41658373
## 14149 0.41658373
## 14150 0.41658373
## 14151 0.41658373
## 14152 0.41658373
## 14153 0.41658373
## 14154 0.41658373
## 14155 0.41658373
## 14156 0.41658373
## 14157 0.41658373
## 14158 0.41658373
## 14159 0.41658373
## 14160 0.41658373
## 14161 0.95607549
## 14162 0.95607549
## 14163 0.95607549
## 14164 0.95607549
## 14165 0.95607549
## 14166 0.95607549
## 14167 0.95607549
## 14168 0.95607549
## 14169 0.95607549
## 14170 0.95607549
## 14171 0.95607549
## 14172 0.95607549
## 14173 0.95607549
## 14174 0.95607549
## 14175 0.95607549
## 14176 0.95607549
## 14177 0.88225714
## 14178 0.88225714
## 14179 0.88225714
## 14180 0.88225714
## 14181 0.88225714
## 14182 0.88225714
## 14183 0.88225714
## 14184 0.88225714
## 14185 0.88225714
## 14186 0.88225714
## 14187 0.88225714
## 14188 0.88225714
## 14189 0.88225714
## 14190 0.88225714
## 14191 0.88225714
## 14192 0.88225714
## 14193 0.58714964
## 14194 0.58714964
## 14195 0.58714964
## 14196 0.58714964
## 14197 0.58714964
## 14198 0.58714964
## 14199 0.58714964
## 14200 0.58714964
## 14201 0.58714964
## 14202 0.58714964
## 14203 0.58714964
## 14204 0.58714964
## 14205 0.58714964
## 14206 0.58714964
## 14207 0.58714964
## 14208 0.58714964
## 14209 1.17026049
## 14210 1.17026049
## 14211 1.17026049
## 14212 1.17026049
## 14213 1.17026049
## 14214 1.17026049
## 14215 1.17026049
## 14216 1.17026049
## 14217 1.17026049
## 14218 1.17026049
## 14219 1.17026049
## 14220 1.17026049
## 14221 1.17026049
## 14222 1.17026049
## 14223 1.17026049
## 14224 1.17026049
## 14225 1.35381566
## 14226 1.35381566
## 14227 1.35381566
## 14228 1.35381566
## 14229 1.35381566
## 14230 1.35381566
## 14231 1.35381566
## 14232 1.35381566
## 14233 1.35381566
## 14234 1.35381566
## 14235 1.35381566
## 14236 1.35381566
## 14237 1.35381566
## 14238 1.35381566
## 14239 1.35381566
## 14240 1.35381566
## 14241 1.80710722
## 14242 1.80710722
## 14243 1.80710722
## 14244 1.80710722
## 14245 1.80710722
## 14246 1.80710722
## 14247 1.80710722
## 14248 1.80710722
## 14249 1.80710722
## 14250 1.80710722
## 14251 1.80710722
## 14252 1.80710722
## 14253 1.80710722
## 14254 1.80710722
## 14255 1.80710722
## 14256 1.80710722
## 14257 0.72352850
## 14258 0.72352850
## 14259 0.72352850
## 14260 0.72352850
## 14261 0.72352850
## 14262 0.72352850
## 14263 0.72352850
## 14264 0.72352850
## 14265 0.72352850
## 14266 0.72352850
## 14267 0.72352850
## 14268 0.72352850
## 14269 0.72352850
## 14270 0.72352850
## 14271 0.72352850
## 14272 0.72352850
## 14273 1.33965962
## 14274 1.33965962
## 14275 1.33965962
## 14276 1.33965962
## 14277 1.33965962
## 14278 1.33965962
## 14279 1.33965962
## 14280 1.33965962
## 14281 1.33965962
## 14282 1.33965962
## 14283 1.33965962
## 14284 1.33965962
## 14285 1.33965962
## 14286 1.33965962
## 14287 1.33965962
## 14288 1.33965962
## 14289 2.65141012
## 14290 2.65141012
## 14291 2.65141012
## 14292 2.65141012
## 14293 2.65141012
## 14294 2.65141012
## 14295 2.65141012
## 14296 2.65141012
## 14297 2.65141012
## 14298 2.65141012
## 14299 2.65141012
## 14300 2.65141012
## 14301 2.65141012
## 14302 2.65141012
## 14303 2.65141012
## 14304 2.65141012
## 14305 0.98253257
## 14306 0.98253257
## 14307 0.98253257
## 14308 0.98253257
## 14309 0.98253257
## 14310 0.98253257
## 14311 0.98253257
## 14312 0.98253257
## 14313 0.98253257
## 14314 0.98253257
## 14315 0.98253257
## 14316 0.98253257
## 14317 0.98253257
## 14318 0.98253257
## 14319 0.98253257
## 14320 0.98253257
## 14321 0.26390498
## 14322 0.26390498
## 14323 0.26390498
## 14324 0.26390498
## 14325 0.26390498
## 14326 0.26390498
## 14327 0.26390498
## 14328 0.26390498
## 14329 0.26390498
## 14330 0.26390498
## 14331 0.26390498
## 14332 0.26390498
## 14333 0.26390498
## 14334 0.26390498
## 14335 0.26390498
## 14336 0.26390498
## 14337 0.75335771
## 14338 0.75335771
## 14339 0.75335771
## 14340 0.75335771
## 14341 0.75335771
## 14342 0.75335771
## 14343 0.75335771
## 14344 0.75335771
## 14345 0.75335771
## 14346 0.75335771
## 14347 0.75335771
## 14348 0.75335771
## 14349 0.75335771
## 14350 0.75335771
## 14351 0.75335771
## 14352 0.75335771
## 14353 0.46562598
## 14354 0.46562598
## 14355 0.46562598
## 14356 0.46562598
## 14357 0.46562598
## 14358 0.46562598
## 14359 0.46562598
## 14360 0.46562598
## 14361 0.46562598
## 14362 0.46562598
## 14363 0.46562598
## 14364 0.46562598
## 14365 0.46562598
## 14366 0.46562598
## 14367 0.46562598
## 14368 0.46562598
## 14369 1.32170199
## 14370 1.32170199
## 14371 1.32170199
## 14372 1.32170199
## 14373 1.32170199
## 14374 1.32170199
## 14375 1.32170199
## 14376 1.32170199
## 14377 1.32170199
## 14378 1.32170199
## 14379 1.32170199
## 14380 1.32170199
## 14381 1.32170199
## 14382 1.32170199
## 14383 1.32170199
## 14384 1.32170199
## 14385 0.49987900
## 14386 0.49987900
## 14387 0.49987900
## 14388 0.49987900
## 14389 0.49987900
## 14390 0.49987900
## 14391 0.49987900
## 14392 0.49987900
## 14393 0.49987900
## 14394 0.49987900
## 14395 0.49987900
## 14396 0.49987900
## 14397 0.49987900
## 14398 0.49987900
## 14399 0.49987900
## 14400 0.49987900
## 14401 0.63926519
## 14402 0.63926519
## 14403 0.63926519
## 14404 0.63926519
## 14405 0.63926519
## 14406 0.63926519
## 14407 0.63926519
## 14408 0.63926519
## 14409 0.63926519
## 14410 0.63926519
## 14411 0.63926519
## 14412 0.63926519
## 14413 0.63926519
## 14414 0.63926519
## 14415 0.63926519
## 14416 0.63926519
## 14417 0.27384373
## 14418 0.27384373
## 14419 0.27384373
## 14420 0.27384373
## 14421 0.27384373
## 14422 0.27384373
## 14423 0.27384373
## 14424 0.27384373
## 14425 0.27384373
## 14426 0.27384373
## 14427 0.27384373
## 14428 0.27384373
## 14429 0.27384373
## 14430 0.27384373
## 14431 0.27384373
## 14432 0.27384373
## 14433 0.82602897
## 14434 0.82602897
## 14435 0.82602897
## 14436 0.82602897
## 14437 0.82602897
## 14438 0.82602897
## 14439 0.82602897
## 14440 0.82602897
## 14441 0.82602897
## 14442 0.82602897
## 14443 0.82602897
## 14444 0.82602897
## 14445 0.82602897
## 14446 0.82602897
## 14447 0.82602897
## 14448 0.82602897
## 14449 0.72186313
## 14450 0.72186313
## 14451 0.72186313
## 14452 0.72186313
## 14453 0.72186313
## 14454 0.72186313
## 14455 0.72186313
## 14456 0.72186313
## 14457 0.72186313
## 14458 0.72186313
## 14459 0.72186313
## 14460 0.72186313
## 14461 0.72186313
## 14462 0.72186313
## 14463 0.72186313
## 14464 0.72186313
## 14465 1.62962908
## 14466 1.62962908
## 14467 1.62962908
## 14468 1.62962908
## 14469 1.62962908
## 14470 1.62962908
## 14471 1.62962908
## 14472 1.62962908
## 14473 1.62962908
## 14474 1.62962908
## 14475 1.62962908
## 14476 1.62962908
## 14477 1.62962908
## 14478 1.62962908
## 14479 1.62962908
## 14480 1.62962908
## 14481 0.38317259
## 14482 0.38317259
## 14483 0.38317259
## 14484 0.38317259
## 14485 0.38317259
## 14486 0.38317259
## 14487 0.38317259
## 14488 0.38317259
## 14489 0.38317259
## 14490 0.38317259
## 14491 0.38317259
## 14492 0.38317259
## 14493 0.38317259
## 14494 0.38317259
## 14495 0.38317259
## 14496 0.38317259
## 14497 0.44572099
## 14498 0.44572099
## 14499 0.44572099
## 14500 0.44572099
## 14501 0.44572099
## 14502 0.44572099
## 14503 0.44572099
## 14504 0.44572099
## 14505 0.44572099
## 14506 0.44572099
## 14507 0.44572099
## 14508 0.44572099
## 14509 0.44572099
## 14510 0.44572099
## 14511 0.44572099
## 14512 0.44572099
## 14513 1.61656123
## 14514 1.61656123
## 14515 1.61656123
## 14516 1.61656123
## 14517 1.61656123
## 14518 1.61656123
## 14519 1.61656123
## 14520 1.61656123
## 14521 1.61656123
## 14522 1.61656123
## 14523 1.61656123
## 14524 1.61656123
## 14525 1.61656123
## 14526 1.61656123
## 14527 1.61656123
## 14528 1.61656123
## 14529 0.90032851
## 14530 0.90032851
## 14531 0.90032851
## 14532 0.90032851
## 14533 0.90032851
## 14534 0.90032851
## 14535 0.90032851
## 14536 0.90032851
## 14537 0.90032851
## 14538 0.90032851
## 14539 0.90032851
## 14540 0.90032851
## 14541 0.90032851
## 14542 0.90032851
## 14543 0.90032851
## 14544 0.90032851
## 14545 2.31507262
## 14546 2.31507262
## 14547 2.31507262
## 14548 2.31507262
## 14549 2.31507262
## 14550 2.31507262
## 14551 2.31507262
## 14552 2.31507262
## 14553 2.31507262
## 14554 2.31507262
## 14555 2.31507262
## 14556 2.31507262
## 14557 2.31507262
## 14558 2.31507262
## 14559 2.31507262
## 14560 2.31507262
## 14561 0.69792107
## 14562 0.69792107
## 14563 0.69792107
## 14564 0.69792107
## 14565 0.69792107
## 14566 0.69792107
## 14567 0.69792107
## 14568 0.69792107
## 14569 0.69792107
## 14570 0.69792107
## 14571 0.69792107
## 14572 0.69792107
## 14573 0.69792107
## 14574 0.69792107
## 14575 0.69792107
## 14576 0.69792107
## 14577 0.37198163
## 14578 0.37198163
## 14579 0.37198163
## 14580 0.37198163
## 14581 0.37198163
## 14582 0.37198163
## 14583 0.37198163
## 14584 0.37198163
## 14585 0.37198163
## 14586 0.37198163
## 14587 0.37198163
## 14588 0.37198163
## 14589 0.37198163
## 14590 0.37198163
## 14591 0.37198163
## 14592 0.37198163
## 14593 1.09946189
## 14594 1.09946189
## 14595 1.09946189
## 14596 1.09946189
## 14597 1.09946189
## 14598 1.09946189
## 14599 1.09946189
## 14600 1.09946189
## 14601 1.09946189
## 14602 1.09946189
## 14603 1.09946189
## 14604 1.09946189
## 14605 1.09946189
## 14606 1.09946189
## 14607 1.09946189
## 14608 1.09946189
## 14609 0.93884628
## 14610 0.93884628
## 14611 0.93884628
## 14612 0.93884628
## 14613 0.93884628
## 14614 0.93884628
## 14615 0.93884628
## 14616 0.93884628
## 14617 0.93884628
## 14618 0.93884628
## 14619 0.93884628
## 14620 0.93884628
## 14621 0.93884628
## 14622 0.93884628
## 14623 0.93884628
## 14624 0.93884628
## 14625 0.66180674
## 14626 0.66180674
## 14627 0.66180674
## 14628 0.66180674
## 14629 0.66180674
## 14630 0.66180674
## 14631 0.66180674
## 14632 0.66180674
## 14633 0.66180674
## 14634 0.66180674
## 14635 0.66180674
## 14636 0.66180674
## 14637 0.66180674
## 14638 0.66180674
## 14639 0.66180674
## 14640 0.66180674
## 14641 2.74604754
## 14642 2.74604754
## 14643 2.74604754
## 14644 2.74604754
## 14645 2.74604754
## 14646 2.74604754
## 14647 2.74604754
## 14648 2.74604754
## 14649 2.74604754
## 14650 2.74604754
## 14651 2.74604754
## 14652 2.74604754
## 14653 2.74604754
## 14654 2.74604754
## 14655 2.74604754
## 14656 2.74604754
## 14657 1.18091648
## 14658 1.18091648
## 14659 1.18091648
## 14660 1.18091648
## 14661 1.18091648
## 14662 1.18091648
## 14663 1.18091648
## 14664 1.18091648
## 14665 1.18091648
## 14666 1.18091648
## 14667 1.18091648
## 14668 1.18091648
## 14669 1.18091648
## 14670 1.18091648
## 14671 1.18091648
## 14672 1.18091648
## 14673 7.09956419
## 14674 7.09956419
## 14675 7.09956419
## 14676 7.09956419
## 14677 7.09956419
## 14678 7.09956419
## 14679 7.09956419
## 14680 7.09956419
## 14681 7.09956419
## 14682 7.09956419
## 14683 7.09956419
## 14684 7.09956419
## 14685 7.09956419
## 14686 7.09956419
## 14687 7.09956419
## 14688 7.09956419
## 14689 0.67651957
## 14690 0.67651957
## 14691 0.67651957
## 14692 0.67651957
## 14693 0.67651957
## 14694 0.67651957
## 14695 0.67651957
## 14696 0.67651957
## 14697 0.67651957
## 14698 0.67651957
## 14699 0.67651957
## 14700 0.67651957
## 14701 0.67651957
## 14702 0.67651957
## 14703 0.67651957
## 14704 0.67651957
## 14705 1.04098482
## 14706 1.04098482
## 14707 1.04098482
## 14708 1.04098482
## 14709 1.04098482
## 14710 1.04098482
## 14711 1.04098482
## 14712 1.04098482
## 14713 1.04098482
## 14714 1.04098482
## 14715 1.04098482
## 14716 1.04098482
## 14717 1.04098482
## 14718 1.04098482
## 14719 1.04098482
## 14720 1.04098482
## 14721 2.37621726
## 14722 2.37621726
## 14723 2.37621726
## 14724 2.37621726
## 14725 2.37621726
## 14726 2.37621726
## 14727 2.37621726
## 14728 2.37621726
## 14729 2.37621726
## 14730 2.37621726
## 14731 2.37621726
## 14732 2.37621726
## 14733 2.37621726
## 14734 2.37621726
## 14735 2.37621726
## 14736 2.37621726
## 14737 3.71306307
## 14738 3.71306307
## 14739 3.71306307
## 14740 3.71306307
## 14741 3.71306307
## 14742 3.71306307
## 14743 3.71306307
## 14744 3.71306307
## 14745 3.71306307
## 14746 3.71306307
## 14747 3.71306307
## 14748 3.71306307
## 14749 3.71306307
## 14750 3.71306307
## 14751 3.71306307
## 14752 3.71306307
## 14753 0.37359446
## 14754 0.37359446
## 14755 0.37359446
## 14756 0.37359446
## 14757 0.37359446
## 14758 0.37359446
## 14759 0.37359446
## 14760 0.37359446
## 14761 0.37359446
## 14762 0.37359446
## 14763 0.37359446
## 14764 0.37359446
## 14765 0.37359446
## 14766 0.37359446
## 14767 0.37359446
## 14768 0.37359446
## 14769 0.75309352
## 14770 0.75309352
## 14771 0.75309352
## 14772 0.75309352
## 14773 0.75309352
## 14774 0.75309352
## 14775 0.75309352
## 14776 0.75309352
## 14777 0.75309352
## 14778 0.75309352
## 14779 0.75309352
## 14780 0.75309352
## 14781 0.75309352
## 14782 0.75309352
## 14783 0.75309352
## 14784 0.75309352
## 14785 0.33880225
## 14786 0.33880225
## 14787 0.33880225
## 14788 0.33880225
## 14789 0.33880225
## 14790 0.33880225
## 14791 0.33880225
## 14792 0.33880225
## 14793 0.33880225
## 14794 0.33880225
## 14795 0.33880225
## 14796 0.33880225
## 14797 0.33880225
## 14798 0.33880225
## 14799 0.33880225
## 14800 0.33880225
## 14801 0.87451991
## 14802 0.87451991
## 14803 0.87451991
## 14804 0.87451991
## 14805 0.87451991
## 14806 0.87451991
## 14807 0.87451991
## 14808 0.87451991
## 14809 0.87451991
## 14810 0.87451991
## 14811 0.87451991
## 14812 0.87451991
## 14813 0.87451991
## 14814 0.87451991
## 14815 0.87451991
## 14816 0.87451991
## 14817 0.10207875
## 14818 0.10207875
## 14819 0.10207875
## 14820 0.10207875
## 14821 0.10207875
## 14822 0.10207875
## 14823 0.10207875
## 14824 0.10207875
## 14825 0.10207875
## 14826 0.10207875
## 14827 0.10207875
## 14828 0.10207875
## 14829 0.10207875
## 14830 0.10207875
## 14831 0.10207875
## 14832 0.10207875
## 14833 1.05708382
## 14834 1.05708382
## 14835 1.05708382
## 14836 1.05708382
## 14837 1.05708382
## 14838 1.05708382
## 14839 1.05708382
## 14840 1.05708382
## 14841 1.05708382
## 14842 1.05708382
## 14843 1.05708382
## 14844 1.05708382
## 14845 1.05708382
## 14846 1.05708382
## 14847 1.05708382
## 14848 1.05708382
## 14849 0.11543571
## 14850 0.11543571
## 14851 0.11543571
## 14852 0.11543571
## 14853 0.11543571
## 14854 0.11543571
## 14855 0.11543571
## 14856 0.11543571
## 14857 0.11543571
## 14858 0.11543571
## 14859 0.11543571
## 14860 0.11543571
## 14861 0.11543571
## 14862 0.11543571
## 14863 0.11543571
## 14864 0.11543571
## 14865 1.58651002
## 14866 1.58651002
## 14867 1.58651002
## 14868 1.58651002
## 14869 1.58651002
## 14870 1.58651002
## 14871 1.58651002
## 14872 1.58651002
## 14873 1.58651002
## 14874 1.58651002
## 14875 1.58651002
## 14876 1.58651002
## 14877 1.58651002
## 14878 1.58651002
## 14879 1.58651002
## 14880 1.58651002
## 14881 0.07752011
## 14882 0.07752011
## 14883 0.07752011
## 14884 0.07752011
## 14885 0.07752011
## 14886 0.07752011
## 14887 0.07752011
## 14888 0.07752011
## 14889 0.07752011
## 14890 0.07752011
## 14891 0.07752011
## 14892 0.07752011
## 14893 0.07752011
## 14894 0.07752011
## 14895 0.07752011
## 14896 0.07752011
## 14897 0.55837566
## 14898 0.55837566
## 14899 0.55837566
## 14900 0.55837566
## 14901 0.55837566
## 14902 0.55837566
## 14903 0.55837566
## 14904 0.55837566
## 14905 0.55837566
## 14906 0.55837566
## 14907 0.55837566
## 14908 0.55837566
## 14909 0.55837566
## 14910 0.55837566
## 14911 0.55837566
## 14912 0.55837566
## 14913 3.65213719
## 14914 3.65213719
## 14915 3.65213719
## 14916 3.65213719
## 14917 3.65213719
## 14918 3.65213719
## 14919 3.65213719
## 14920 3.65213719
## 14921 3.65213719
## 14922 3.65213719
## 14923 3.65213719
## 14924 3.65213719
## 14925 3.65213719
## 14926 3.65213719
## 14927 3.65213719
## 14928 3.65213719
## 14929 0.30718227
## 14930 0.30718227
## 14931 0.30718227
## 14932 0.30718227
## 14933 0.30718227
## 14934 0.30718227
## 14935 0.30718227
## 14936 0.30718227
## 14937 0.30718227
## 14938 0.30718227
## 14939 0.30718227
## 14940 0.30718227
## 14941 0.30718227
## 14942 0.30718227
## 14943 0.30718227
## 14944 0.30718227
## 14945 1.70971861
## 14946 1.70971861
## 14947 1.70971861
## 14948 1.70971861
## 14949 1.70971861
## 14950 1.70971861
## 14951 1.70971861
## 14952 1.70971861
## 14953 1.70971861
## 14954 1.70971861
## 14955 1.70971861
## 14956 1.70971861
## 14957 1.70971861
## 14958 1.70971861
## 14959 1.70971861
## 14960 1.70971861
## 14961 0.58280674
## 14962 0.58280674
## 14963 0.58280674
## 14964 0.58280674
## 14965 0.58280674
## 14966 0.58280674
## 14967 0.58280674
## 14968 0.58280674
## 14969 0.58280674
## 14970 0.58280674
## 14971 0.58280674
## 14972 0.58280674
## 14973 0.58280674
## 14974 0.58280674
## 14975 0.58280674
## 14976 0.58280674
## 14977 0.28084328
## 14978 0.28084328
## 14979 0.28084328
## 14980 0.28084328
## 14981 0.28084328
## 14982 0.28084328
## 14983 0.28084328
## 14984 0.28084328
## 14985 0.28084328
## 14986 0.28084328
## 14987 0.28084328
## 14988 0.28084328
## 14989 0.28084328
## 14990 0.28084328
## 14991 0.28084328
## 14992 0.28084328
## 14993 0.79726423
## 14994 0.79726423
## 14995 0.79726423
## 14996 0.79726423
## 14997 0.79726423
## 14998 0.79726423
## 14999 0.79726423
## 15000 0.79726423
## 15001 0.79726423
## 15002 0.79726423
## 15003 0.79726423
## 15004 0.79726423
## 15005 0.79726423
## 15006 0.79726423
## 15007 0.79726423
## 15008 0.79726423
## 15009 0.35622868
## 15010 0.35622868
## 15011 0.35622868
## 15012 0.35622868
## 15013 0.35622868
## 15014 0.35622868
## 15015 0.35622868
## 15016 0.35622868
## 15017 0.35622868
## 15018 0.35622868
## 15019 0.35622868
## 15020 0.35622868
## 15021 0.35622868
## 15022 0.35622868
## 15023 0.35622868
## 15024 0.35622868
## 15025 0.59184379
## 15026 0.59184379
## 15027 0.59184379
## 15028 0.59184379
## 15029 0.59184379
## 15030 0.59184379
## 15031 0.59184379
## 15032 0.59184379
## 15033 0.59184379
## 15034 0.59184379
## 15035 0.59184379
## 15036 0.59184379
## 15037 0.59184379
## 15038 0.59184379
## 15039 0.59184379
## 15040 0.59184379
## 15041 0.46951834
## 15042 0.46951834
## 15043 0.46951834
## 15044 0.46951834
## 15045 0.46951834
## 15046 0.46951834
## 15047 0.46951834
## 15048 0.46951834
## 15049 0.46951834
## 15050 0.46951834
## 15051 0.46951834
## 15052 0.46951834
## 15053 0.46951834
## 15054 0.46951834
## 15055 0.46951834
## 15056 0.46951834
## 15057 0.45604482
## 15058 0.45604482
## 15059 0.45604482
## 15060 0.45604482
## 15061 0.45604482
## 15062 0.45604482
## 15063 0.45604482
## 15064 0.45604482
## 15065 0.45604482
## 15066 0.45604482
## 15067 0.45604482
## 15068 0.45604482
## 15069 0.45604482
## 15070 0.45604482
## 15071 0.45604482
## 15072 0.45604482
## 15073 0.36374820
## 15074 0.36374820
## 15075 0.36374820
## 15076 0.36374820
## 15077 0.36374820
## 15078 0.36374820
## 15079 0.36374820
## 15080 0.36374820
## 15081 0.36374820
## 15082 0.36374820
## 15083 0.36374820
## 15084 0.36374820
## 15085 0.36374820
## 15086 0.36374820
## 15087 0.36374820
## 15088 0.36374820
## 15089 1.64063024
## 15090 1.64063024
## 15091 1.64063024
## 15092 1.64063024
## 15093 1.64063024
## 15094 1.64063024
## 15095 1.64063024
## 15096 1.64063024
## 15097 1.64063024
## 15098 1.64063024
## 15099 1.64063024
## 15100 1.64063024
## 15101 1.64063024
## 15102 1.64063024
## 15103 1.64063024
## 15104 1.64063024
## 15105 3.50207448
## 15106 3.50207448
## 15107 3.50207448
## 15108 3.50207448
## 15109 3.50207448
## 15110 3.50207448
## 15111 3.50207448
## 15112 3.50207448
## 15113 3.50207448
## 15114 3.50207448
## 15115 3.50207448
## 15116 3.50207448
## 15117 3.50207448
## 15118 3.50207448
## 15119 3.50207448
## 15120 3.50207448
## 15121 0.43821535
## 15122 0.43821535
## 15123 0.43821535
## 15124 0.43821535
## 15125 0.43821535
## 15126 0.43821535
## 15127 0.43821535
## 15128 0.43821535
## 15129 0.43821535
## 15130 0.43821535
## 15131 0.43821535
## 15132 0.43821535
## 15133 0.43821535
## 15134 0.43821535
## 15135 0.43821535
## 15136 0.43821535
## 15137 0.06516979
## 15138 0.06516979
## 15139 0.06516979
## 15140 0.06516979
## 15141 0.06516979
## 15142 0.06516979
## 15143 0.06516979
## 15144 0.06516979
## 15145 0.06516979
## 15146 0.06516979
## 15147 0.06516979
## 15148 0.06516979
## 15149 0.06516979
## 15150 0.06516979
## 15151 0.06516979
## 15152 0.06516979
## 15153 4.01289585
## 15154 4.01289585
## 15155 4.01289585
## 15156 4.01289585
## 15157 4.01289585
## 15158 4.01289585
## 15159 4.01289585
## 15160 4.01289585
## 15161 4.01289585
## 15162 4.01289585
## 15163 4.01289585
## 15164 4.01289585
## 15165 4.01289585
## 15166 4.01289585
## 15167 4.01289585
## 15168 4.01289585
## 15169 1.08579556
## 15170 1.08579556
## 15171 1.08579556
## 15172 1.08579556
## 15173 1.08579556
## 15174 1.08579556
## 15175 1.08579556
## 15176 1.08579556
## 15177 1.08579556
## 15178 1.08579556
## 15179 1.08579556
## 15180 1.08579556
## 15181 1.08579556
## 15182 1.08579556
## 15183 1.08579556
## 15184 1.08579556
## 15185 0.56488731
## 15186 0.56488731
## 15187 0.56488731
## 15188 0.56488731
## 15189 0.56488731
## 15190 0.56488731
## 15191 0.56488731
## 15192 0.56488731
## 15193 0.56488731
## 15194 0.56488731
## 15195 0.56488731
## 15196 0.56488731
## 15197 0.56488731
## 15198 0.56488731
## 15199 0.56488731
## 15200 0.56488731
## 15201 1.85352231
## 15202 1.85352231
## 15203 1.85352231
## 15204 1.85352231
## 15205 1.85352231
## 15206 1.85352231
## 15207 1.85352231
## 15208 1.85352231
## 15209 1.85352231
## 15210 1.85352231
## 15211 1.85352231
## 15212 1.85352231
## 15213 1.85352231
## 15214 1.85352231
## 15215 1.85352231
## 15216 1.85352231
## 15217 2.86928344
## 15218 2.86928344
## 15219 2.86928344
## 15220 2.86928344
## 15221 2.86928344
## 15222 2.86928344
## 15223 2.86928344
## 15224 2.86928344
## 15225 2.86928344
## 15226 2.86928344
## 15227 2.86928344
## 15228 2.86928344
## 15229 2.86928344
## 15230 2.86928344
## 15231 2.86928344
## 15232 2.86928344
## 15233 0.23368011
## 15234 0.23368011
## 15235 0.23368011
## 15236 0.23368011
## 15237 0.23368011
## 15238 0.23368011
## 15239 0.23368011
## 15240 0.23368011
## 15241 0.23368011
## 15242 0.23368011
## 15243 0.23368011
## 15244 0.23368011
## 15245 0.23368011
## 15246 0.23368011
## 15247 0.23368011
## 15248 0.23368011
## 15249 0.40887006
## 15250 0.40887006
## 15251 0.40887006
## 15252 0.40887006
## 15253 0.40887006
## 15254 0.40887006
## 15255 0.40887006
## 15256 0.40887006
## 15257 0.40887006
## 15258 0.40887006
## 15259 0.40887006
## 15260 0.40887006
## 15261 0.40887006
## 15262 0.40887006
## 15263 0.40887006
## 15264 0.40887006
## 15265 0.32604018
## 15266 0.32604018
## 15267 0.32604018
## 15268 0.32604018
## 15269 0.32604018
## 15270 0.32604018
## 15271 0.32604018
## 15272 0.32604018
## 15273 0.32604018
## 15274 0.32604018
## 15275 0.32604018
## 15276 0.32604018
## 15277 0.32604018
## 15278 0.32604018
## 15279 0.32604018
## 15280 0.32604018
## 15281 0.46959202
## 15282 0.46959202
## 15283 0.46959202
## 15284 0.46959202
## 15285 0.46959202
## 15286 0.46959202
## 15287 0.46959202
## 15288 0.46959202
## 15289 0.46959202
## 15290 0.46959202
## 15291 0.46959202
## 15292 0.46959202
## 15293 0.46959202
## 15294 0.46959202
## 15295 0.46959202
## 15296 0.46959202
## 15297 0.39294345
## 15298 0.39294345
## 15299 0.39294345
## 15300 0.39294345
## 15301 0.39294345
## 15302 0.39294345
## 15303 0.39294345
## 15304 0.39294345
## 15305 0.39294345
## 15306 0.39294345
## 15307 0.39294345
## 15308 0.39294345
## 15309 0.39294345
## 15310 0.39294345
## 15311 0.39294345
## 15312 0.39294345
## 15313 1.88701421
## 15314 1.88701421
## 15315 1.88701421
## 15316 1.88701421
## 15317 1.88701421
## 15318 1.88701421
## 15319 1.88701421
## 15320 1.88701421
## 15321 1.88701421
## 15322 1.88701421
## 15323 1.88701421
## 15324 1.88701421
## 15325 1.88701421
## 15326 1.88701421
## 15327 1.88701421
## 15328 1.88701421
## 15329 1.72996020
## 15330 1.72996020
## 15331 1.72996020
## 15332 1.72996020
## 15333 1.72996020
## 15334 1.72996020
## 15335 1.72996020
## 15336 1.72996020
## 15337 1.72996020
## 15338 1.72996020
## 15339 1.72996020
## 15340 1.72996020
## 15341 1.72996020
## 15342 1.72996020
## 15343 1.72996020
## 15344 1.72996020
## 15345 0.89798771
## 15346 0.89798771
## 15347 0.89798771
## 15348 0.89798771
## 15349 0.89798771
## 15350 0.89798771
## 15351 0.89798771
## 15352 0.89798771
## 15353 0.89798771
## 15354 0.89798771
## 15355 0.89798771
## 15356 0.89798771
## 15357 0.89798771
## 15358 0.89798771
## 15359 0.89798771
## 15360 0.89798771
## 15361 0.79316076
## 15362 0.79316076
## 15363 0.79316076
## 15364 0.79316076
## 15365 0.79316076
## 15366 0.79316076
## 15367 0.79316076
## 15368 0.79316076
## 15369 0.79316076
## 15370 0.79316076
## 15371 0.79316076
## 15372 0.79316076
## 15373 0.79316076
## 15374 0.79316076
## 15375 0.79316076
## 15376 0.79316076
## 15377 2.22093210
## 15378 2.22093210
## 15379 2.22093210
## 15380 2.22093210
## 15381 2.22093210
## 15382 2.22093210
## 15383 2.22093210
## 15384 2.22093210
## 15385 2.22093210
## 15386 2.22093210
## 15387 2.22093210
## 15388 2.22093210
## 15389 2.22093210
## 15390 2.22093210
## 15391 2.22093210
## 15392 2.22093210
## 15393 0.66394433
## 15394 0.66394433
## 15395 0.66394433
## 15396 0.66394433
## 15397 0.66394433
## 15398 0.66394433
## 15399 0.66394433
## 15400 0.66394433
## 15401 0.66394433
## 15402 0.66394433
## 15403 0.66394433
## 15404 0.66394433
## 15405 0.66394433
## 15406 0.66394433
## 15407 0.66394433
## 15408 0.66394433
## 15409 1.50477769
## 15410 1.50477769
## 15411 1.50477769
## 15412 1.50477769
## 15413 1.50477769
## 15414 1.50477769
## 15415 1.50477769
## 15416 1.50477769
## 15417 1.50477769
## 15418 1.50477769
## 15419 1.50477769
## 15420 1.50477769
## 15421 1.50477769
## 15422 1.50477769
## 15423 1.50477769
## 15424 1.50477769
## 15425 1.24227618
## 15426 1.24227618
## 15427 1.24227618
## 15428 1.24227618
## 15429 1.24227618
## 15430 1.24227618
## 15431 1.24227618
## 15432 1.24227618
## 15433 1.24227618
## 15434 1.24227618
## 15435 1.24227618
## 15436 1.24227618
## 15437 1.24227618
## 15438 1.24227618
## 15439 1.24227618
## 15440 1.24227618
## 15441 0.57521022
## 15442 0.57521022
## 15443 0.57521022
## 15444 0.57521022
## 15445 0.57521022
## 15446 0.57521022
## 15447 0.57521022
## 15448 0.57521022
## 15449 0.57521022
## 15450 0.57521022
## 15451 0.57521022
## 15452 0.57521022
## 15453 0.57521022
## 15454 0.57521022
## 15455 0.57521022
## 15456 0.57521022
## 15457 0.06987305
## 15458 0.06987305
## 15459 0.06987305
## 15460 0.06987305
## 15461 0.06987305
## 15462 0.06987305
## 15463 0.06987305
## 15464 0.06987305
## 15465 0.06987305
## 15466 0.06987305
## 15467 0.06987305
## 15468 0.06987305
## 15469 0.06987305
## 15470 0.06987305
## 15471 0.06987305
## 15472 0.06987305
## 15473 0.65074575
## 15474 0.65074575
## 15475 0.65074575
## 15476 0.65074575
## 15477 0.65074575
## 15478 0.65074575
## 15479 0.65074575
## 15480 0.65074575
## 15481 0.65074575
## 15482 0.65074575
## 15483 0.65074575
## 15484 0.65074575
## 15485 0.65074575
## 15486 0.65074575
## 15487 0.65074575
## 15488 0.65074575
## 15489 1.02968285
## 15490 1.02968285
## 15491 1.02968285
## 15492 1.02968285
## 15493 1.02968285
## 15494 1.02968285
## 15495 1.02968285
## 15496 1.02968285
## 15497 1.02968285
## 15498 1.02968285
## 15499 1.02968285
## 15500 1.02968285
## 15501 1.02968285
## 15502 1.02968285
## 15503 1.02968285
## 15504 1.02968285
## 15505 0.33006724
## 15506 0.33006724
## 15507 0.33006724
## 15508 0.33006724
## 15509 0.33006724
## 15510 0.33006724
## 15511 0.33006724
## 15512 0.33006724
## 15513 0.33006724
## 15514 0.33006724
## 15515 0.33006724
## 15516 0.33006724
## 15517 0.33006724
## 15518 0.33006724
## 15519 0.33006724
## 15520 0.33006724
## 15521 0.83183936
## 15522 0.83183936
## 15523 0.83183936
## 15524 0.83183936
## 15525 0.83183936
## 15526 0.83183936
## 15527 0.83183936
## 15528 0.83183936
## 15529 0.83183936
## 15530 0.83183936
## 15531 0.83183936
## 15532 0.83183936
## 15533 0.83183936
## 15534 0.83183936
## 15535 0.83183936
## 15536 0.83183936
## 15537 0.14173663
## 15538 0.14173663
## 15539 0.14173663
## 15540 0.14173663
## 15541 0.14173663
## 15542 0.14173663
## 15543 0.14173663
## 15544 0.14173663
## 15545 0.14173663
## 15546 0.14173663
## 15547 0.14173663
## 15548 0.14173663
## 15549 0.14173663
## 15550 0.14173663
## 15551 0.14173663
## 15552 0.14173663
## 15553 0.78888010
## 15554 0.78888010
## 15555 0.78888010
## 15556 0.78888010
## 15557 0.78888010
## 15558 0.78888010
## 15559 0.78888010
## 15560 0.78888010
## 15561 0.78888010
## 15562 0.78888010
## 15563 0.78888010
## 15564 0.78888010
## 15565 0.78888010
## 15566 0.78888010
## 15567 0.78888010
## 15568 0.78888010
## 15569 3.27358354
## 15570 3.27358354
## 15571 3.27358354
## 15572 3.27358354
## 15573 3.27358354
## 15574 3.27358354
## 15575 3.27358354
## 15576 3.27358354
## 15577 3.27358354
## 15578 3.27358354
## 15579 3.27358354
## 15580 3.27358354
## 15581 3.27358354
## 15582 3.27358354
## 15583 3.27358354
## 15584 3.27358354
## 15585 0.23953694
## 15586 0.23953694
## 15587 0.23953694
## 15588 0.23953694
## 15589 0.23953694
## 15590 0.23953694
## 15591 0.23953694
## 15592 0.23953694
## 15593 0.23953694
## 15594 0.23953694
## 15595 0.23953694
## 15596 0.23953694
## 15597 0.23953694
## 15598 0.23953694
## 15599 0.23953694
## 15600 0.23953694
## 15601 0.88875891
## 15602 0.88875891
## 15603 0.88875891
## 15604 0.88875891
## 15605 0.88875891
## 15606 0.88875891
## 15607 0.88875891
## 15608 0.88875891
## 15609 0.88875891
## 15610 0.88875891
## 15611 0.88875891
## 15612 0.88875891
## 15613 0.88875891
## 15614 0.88875891
## 15615 0.88875891
## 15616 0.88875891
## 15617 0.29143905
## 15618 0.29143905
## 15619 0.29143905
## 15620 0.29143905
## 15621 0.29143905
## 15622 0.29143905
## 15623 0.29143905
## 15624 0.29143905
## 15625 0.29143905
## 15626 0.29143905
## 15627 0.29143905
## 15628 0.29143905
## 15629 0.29143905
## 15630 0.29143905
## 15631 0.29143905
## 15632 0.29143905
## 15633 2.42900883
## 15634 2.42900883
## 15635 2.42900883
## 15636 2.42900883
## 15637 2.42900883
## 15638 2.42900883
## 15639 2.42900883
## 15640 2.42900883
## 15641 2.42900883
## 15642 2.42900883
## 15643 2.42900883
## 15644 2.42900883
## 15645 2.42900883
## 15646 2.42900883
## 15647 2.42900883
## 15648 2.42900883
## 15649 2.42946080
## 15650 2.42946080
## 15651 2.42946080
## 15652 2.42946080
## 15653 2.42946080
## 15654 2.42946080
## 15655 2.42946080
## 15656 2.42946080
## 15657 2.42946080
## 15658 2.42946080
## 15659 2.42946080
## 15660 2.42946080
## 15661 2.42946080
## 15662 2.42946080
## 15663 2.42946080
## 15664 2.42946080
## 15665 0.95362440
## 15666 0.95362440
## 15667 0.95362440
## 15668 0.95362440
## 15669 0.95362440
## 15670 0.95362440
## 15671 0.95362440
## 15672 0.95362440
## 15673 0.95362440
## 15674 0.95362440
## 15675 0.95362440
## 15676 0.95362440
## 15677 0.95362440
## 15678 0.95362440
## 15679 0.95362440
## 15680 0.95362440
## 15681 0.69195531
## 15682 0.69195531
## 15683 0.69195531
## 15684 0.69195531
## 15685 0.69195531
## 15686 0.69195531
## 15687 0.69195531
## 15688 0.69195531
## 15689 0.69195531
## 15690 0.69195531
## 15691 0.69195531
## 15692 0.69195531
## 15693 0.69195531
## 15694 0.69195531
## 15695 0.69195531
## 15696 0.69195531
## 15697 0.86984811
## 15698 0.86984811
## 15699 0.86984811
## 15700 0.86984811
## 15701 0.86984811
## 15702 0.86984811
## 15703 0.86984811
## 15704 0.86984811
## 15705 0.86984811
## 15706 0.86984811
## 15707 0.86984811
## 15708 0.86984811
## 15709 0.86984811
## 15710 0.86984811
## 15711 0.86984811
## 15712 0.86984811
## 15713 1.29138046
## 15714 1.29138046
## 15715 1.29138046
## 15716 1.29138046
## 15717 1.29138046
## 15718 1.29138046
## 15719 1.29138046
## 15720 1.29138046
## 15721 1.29138046
## 15722 1.29138046
## 15723 1.29138046
## 15724 1.29138046
## 15725 1.29138046
## 15726 1.29138046
## 15727 1.29138046
## 15728 1.29138046
## 15729 0.59270280
## 15730 0.59270280
## 15731 0.59270280
## 15732 0.59270280
## 15733 0.59270280
## 15734 0.59270280
## 15735 0.59270280
## 15736 0.59270280
## 15737 0.59270280
## 15738 0.59270280
## 15739 0.59270280
## 15740 0.59270280
## 15741 0.59270280
## 15742 0.59270280
## 15743 0.59270280
## 15744 0.59270280
## 15745 0.36668643
## 15746 0.36668643
## 15747 0.36668643
## 15748 0.36668643
## 15749 0.36668643
## 15750 0.36668643
## 15751 0.36668643
## 15752 0.36668643
## 15753 0.36668643
## 15754 0.36668643
## 15755 0.36668643
## 15756 0.36668643
## 15757 0.36668643
## 15758 0.36668643
## 15759 0.36668643
## 15760 0.36668643
## 15761 0.96157343
## 15762 0.96157343
## 15763 0.96157343
## 15764 0.96157343
## 15765 0.96157343
## 15766 0.96157343
## 15767 0.96157343
## 15768 0.96157343
## 15769 0.96157343
## 15770 0.96157343
## 15771 0.96157343
## 15772 0.96157343
## 15773 0.96157343
## 15774 0.96157343
## 15775 0.96157343
## 15776 0.96157343
## 15777 0.65054822
## 15778 0.65054822
## 15779 0.65054822
## 15780 0.65054822
## 15781 0.65054822
## 15782 0.65054822
## 15783 0.65054822
## 15784 0.65054822
## 15785 0.65054822
## 15786 0.65054822
## 15787 0.65054822
## 15788 0.65054822
## 15789 0.65054822
## 15790 0.65054822
## 15791 0.65054822
## 15792 0.65054822
## 15793 0.36681510
## 15794 0.36681510
## 15795 0.36681510
## 15796 0.36681510
## 15797 0.36681510
## 15798 0.36681510
## 15799 0.36681510
## 15800 0.36681510
## 15801 0.36681510
## 15802 0.36681510
## 15803 0.36681510
## 15804 0.36681510
## 15805 0.36681510
## 15806 0.36681510
## 15807 0.36681510
## 15808 0.36681510
## 15809 1.21091969
## 15810 1.21091969
## 15811 1.21091969
## 15812 1.21091969
## 15813 1.21091969
## 15814 1.21091969
## 15815 1.21091969
## 15816 1.21091969
## 15817 1.21091969
## 15818 1.21091969
## 15819 1.21091969
## 15820 1.21091969
## 15821 1.21091969
## 15822 1.21091969
## 15823 1.21091969
## 15824 1.21091969
## 15825 5.39894313
## 15826 5.39894313
## 15827 5.39894313
## 15828 5.39894313
## 15829 5.39894313
## 15830 5.39894313
## 15831 5.39894313
## 15832 5.39894313
## 15833 5.39894313
## 15834 5.39894313
## 15835 5.39894313
## 15836 5.39894313
## 15837 5.39894313
## 15838 5.39894313
## 15839 5.39894313
## 15840 5.39894313
## 15841 1.48456877
## 15842 1.48456877
## 15843 1.48456877
## 15844 1.48456877
## 15845 1.48456877
## 15846 1.48456877
## 15847 1.48456877
## 15848 1.48456877
## 15849 1.48456877
## 15850 1.48456877
## 15851 1.48456877
## 15852 1.48456877
## 15853 1.48456877
## 15854 1.48456877
## 15855 1.48456877
## 15856 1.48456877
## 15857 2.16131510
## 15858 2.16131510
## 15859 2.16131510
## 15860 2.16131510
## 15861 2.16131510
## 15862 2.16131510
## 15863 2.16131510
## 15864 2.16131510
## 15865 2.16131510
## 15866 2.16131510
## 15867 2.16131510
## 15868 2.16131510
## 15869 2.16131510
## 15870 2.16131510
## 15871 2.16131510
## 15872 2.16131510
## 15873 1.98265616
## 15874 1.98265616
## 15875 1.98265616
## 15876 1.98265616
## 15877 1.98265616
## 15878 1.98265616
## 15879 1.98265616
## 15880 1.98265616
## 15881 1.98265616
## 15882 1.98265616
## 15883 1.98265616
## 15884 1.98265616
## 15885 1.98265616
## 15886 1.98265616
## 15887 1.98265616
## 15888 1.98265616
## 15889 2.02316140
## 15890 2.02316140
## 15891 2.02316140
## 15892 2.02316140
## 15893 2.02316140
## 15894 2.02316140
## 15895 2.02316140
## 15896 2.02316140
## 15897 2.02316140
## 15898 2.02316140
## 15899 2.02316140
## 15900 2.02316140
## 15901 2.02316140
## 15902 2.02316140
## 15903 2.02316140
## 15904 2.02316140
## 15905 1.34661669
## 15906 1.34661669
## 15907 1.34661669
## 15908 1.34661669
## 15909 1.34661669
## 15910 1.34661669
## 15911 1.34661669
## 15912 1.34661669
## 15913 1.34661669
## 15914 1.34661669
## 15915 1.34661669
## 15916 1.34661669
## 15917 1.34661669
## 15918 1.34661669
## 15919 1.34661669
## 15920 1.34661669
## 15921 0.78158296
## 15922 0.78158296
## 15923 0.78158296
## 15924 0.78158296
## 15925 0.78158296
## 15926 0.78158296
## 15927 0.78158296
## 15928 0.78158296
## 15929 0.78158296
## 15930 0.78158296
## 15931 0.78158296
## 15932 0.78158296
## 15933 0.78158296
## 15934 0.78158296
## 15935 0.78158296
## 15936 0.78158296
## 15937 0.59104491
## 15938 0.59104491
## 15939 0.59104491
## 15940 0.59104491
## 15941 0.59104491
## 15942 0.59104491
## 15943 0.59104491
## 15944 0.59104491
## 15945 0.59104491
## 15946 0.59104491
## 15947 0.59104491
## 15948 0.59104491
## 15949 0.59104491
## 15950 0.59104491
## 15951 0.59104491
## 15952 0.59104491
## 15953 1.81408318
## 15954 1.81408318
## 15955 1.81408318
## 15956 1.81408318
## 15957 1.81408318
## 15958 1.81408318
## 15959 1.81408318
## 15960 1.81408318
## 15961 1.81408318
## 15962 1.81408318
## 15963 1.81408318
## 15964 1.81408318
## 15965 1.81408318
## 15966 1.81408318
## 15967 1.81408318
## 15968 1.81408318
## 15969 0.38858311
## 15970 0.38858311
## 15971 0.38858311
## 15972 0.38858311
## 15973 0.38858311
## 15974 0.38858311
## 15975 0.38858311
## 15976 0.38858311
## 15977 0.38858311
## 15978 0.38858311
## 15979 0.38858311
## 15980 0.38858311
## 15981 0.38858311
## 15982 0.38858311
## 15983 0.38858311
## 15984 0.38858311
## 15985 1.29004613
## 15986 1.29004613
## 15987 1.29004613
## 15988 1.29004613
## 15989 1.29004613
## 15990 1.29004613
## 15991 1.29004613
## 15992 1.29004613
## 15993 1.29004613
## 15994 1.29004613
## 15995 1.29004613
## 15996 1.29004613
## 15997 1.29004613
## 15998 1.29004613
## 15999 1.29004613
## 16000 1.29004613
## 16001 1.80316197
## 16002 1.80316197
## 16003 1.80316197
## 16004 1.80316197
## 16005 1.80316197
## 16006 1.80316197
## 16007 1.80316197
## 16008 1.80316197
## 16009 1.80316197
## 16010 1.80316197
## 16011 1.80316197
## 16012 1.80316197
## 16013 1.80316197
## 16014 1.80316197
## 16015 1.80316197
## 16016 1.80316197
## 16017 0.54303682
## 16018 0.54303682
## 16019 0.54303682
## 16020 0.54303682
## 16021 0.54303682
## 16022 0.54303682
## 16023 0.54303682
## 16024 0.54303682
## 16025 0.54303682
## 16026 0.54303682
## 16027 0.54303682
## 16028 0.54303682
## 16029 0.54303682
## 16030 0.54303682
## 16031 0.54303682
## 16032 0.54303682
## 16033 0.52455204
## 16034 0.52455204
## 16035 0.52455204
## 16036 0.52455204
## 16037 0.52455204
## 16038 0.52455204
## 16039 0.52455204
## 16040 0.52455204
## 16041 0.52455204
## 16042 0.52455204
## 16043 0.52455204
## 16044 0.52455204
## 16045 0.52455204
## 16046 0.52455204
## 16047 0.52455204
## 16048 0.52455204
## 16049 0.30884822
## 16050 0.30884822
## 16051 0.30884822
## 16052 0.30884822
## 16053 0.30884822
## 16054 0.30884822
## 16055 0.30884822
## 16056 0.30884822
## 16057 0.30884822
## 16058 0.30884822
## 16059 0.30884822
## 16060 0.30884822
## 16061 0.30884822
## 16062 0.30884822
## 16063 0.30884822
## 16064 0.30884822
## 16065 1.30107124
## 16066 1.30107124
## 16067 1.30107124
## 16068 1.30107124
## 16069 1.30107124
## 16070 1.30107124
## 16071 1.30107124
## 16072 1.30107124
## 16073 1.30107124
## 16074 1.30107124
## 16075 1.30107124
## 16076 1.30107124
## 16077 1.30107124
## 16078 1.30107124
## 16079 1.30107124
## 16080 1.30107124
## 16081 1.24685058
## 16082 1.24685058
## 16083 1.24685058
## 16084 1.24685058
## 16085 1.24685058
## 16086 1.24685058
## 16087 1.24685058
## 16088 1.24685058
## 16089 1.24685058
## 16090 1.24685058
## 16091 1.24685058
## 16092 1.24685058
## 16093 1.24685058
## 16094 1.24685058
## 16095 1.24685058
## 16096 1.24685058
## 16097 0.44598256
## 16098 0.44598256
## 16099 0.44598256
## 16100 0.44598256
## 16101 0.44598256
## 16102 0.44598256
## 16103 0.44598256
## 16104 0.44598256
## 16105 0.44598256
## 16106 0.44598256
## 16107 0.44598256
## 16108 0.44598256
## 16109 0.44598256
## 16110 0.44598256
## 16111 0.44598256
## 16112 0.44598256
## 16113 1.08477403
## 16114 1.08477403
## 16115 1.08477403
## 16116 1.08477403
## 16117 1.08477403
## 16118 1.08477403
## 16119 1.08477403
## 16120 1.08477403
## 16121 1.08477403
## 16122 1.08477403
## 16123 1.08477403
## 16124 1.08477403
## 16125 1.08477403
## 16126 1.08477403
## 16127 1.08477403
## 16128 1.08477403
## 16129 0.64980979
## 16130 0.64980979
## 16131 0.64980979
## 16132 0.64980979
## 16133 0.64980979
## 16134 0.64980979
## 16135 0.64980979
## 16136 0.64980979
## 16137 0.64980979
## 16138 0.64980979
## 16139 0.64980979
## 16140 0.64980979
## 16141 0.64980979
## 16142 0.64980979
## 16143 0.64980979
## 16144 0.64980979
## 16145 0.43427824
## 16146 0.43427824
## 16147 0.43427824
## 16148 0.43427824
## 16149 0.43427824
## 16150 0.43427824
## 16151 0.43427824
## 16152 0.43427824
## 16153 0.43427824
## 16154 0.43427824
## 16155 0.43427824
## 16156 0.43427824
## 16157 0.43427824
## 16158 0.43427824
## 16159 0.43427824
## 16160 0.43427824
## 16161 0.13031351
## 16162 0.13031351
## 16163 0.13031351
## 16164 0.13031351
## 16165 0.13031351
## 16166 0.13031351
## 16167 0.13031351
## 16168 0.13031351
## 16169 0.13031351
## 16170 0.13031351
## 16171 0.13031351
## 16172 0.13031351
## 16173 0.13031351
## 16174 0.13031351
## 16175 0.13031351
## 16176 0.13031351
## 16177 0.23993197
## 16178 0.23993197
## 16179 0.23993197
## 16180 0.23993197
## 16181 0.23993197
## 16182 0.23993197
## 16183 0.23993197
## 16184 0.23993197
## 16185 0.23993197
## 16186 0.23993197
## 16187 0.23993197
## 16188 0.23993197
## 16189 0.23993197
## 16190 0.23993197
## 16191 0.23993197
## 16192 0.23993197
## 16193 0.60704738
## 16194 0.60704738
## 16195 0.60704738
## 16196 0.60704738
## 16197 0.60704738
## 16198 0.60704738
## 16199 0.60704738
## 16200 0.60704738
## 16201 0.60704738
## 16202 0.60704738
## 16203 0.60704738
## 16204 0.60704738
## 16205 0.60704738
## 16206 0.60704738
## 16207 0.60704738
## 16208 0.60704738
## 16209 0.34414898
## 16210 0.34414898
## 16211 0.34414898
## 16212 0.34414898
## 16213 0.34414898
## 16214 0.34414898
## 16215 0.34414898
## 16216 0.34414898
## 16217 0.34414898
## 16218 0.34414898
## 16219 0.34414898
## 16220 0.34414898
## 16221 0.34414898
## 16222 0.34414898
## 16223 0.34414898
## 16224 0.34414898
## 16225 0.93756586
## 16226 0.93756586
## 16227 0.93756586
## 16228 0.93756586
## 16229 0.93756586
## 16230 0.93756586
## 16231 0.93756586
## 16232 0.93756586
## 16233 0.93756586
## 16234 0.93756586
## 16235 0.93756586
## 16236 0.93756586
## 16237 0.93756586
## 16238 0.93756586
## 16239 0.93756586
## 16240 0.93756586
## 16241 3.51282749
## 16242 3.51282749
## 16243 3.51282749
## 16244 3.51282749
## 16245 3.51282749
## 16246 3.51282749
## 16247 3.51282749
## 16248 3.51282749
## 16249 3.51282749
## 16250 3.51282749
## 16251 3.51282749
## 16252 3.51282749
## 16253 3.51282749
## 16254 3.51282749
## 16255 3.51282749
## 16256 3.51282749
## 16257 1.76273280
## 16258 1.76273280
## 16259 1.76273280
## 16260 1.76273280
## 16261 1.76273280
## 16262 1.76273280
## 16263 1.76273280
## 16264 1.76273280
## 16265 1.76273280
## 16266 1.76273280
## 16267 1.76273280
## 16268 1.76273280
## 16269 1.76273280
## 16270 1.76273280
## 16271 1.76273280
## 16272 1.76273280
## 16273 0.94091343
## 16274 0.94091343
## 16275 0.94091343
## 16276 0.94091343
## 16277 0.94091343
## 16278 0.94091343
## 16279 0.94091343
## 16280 0.94091343
## 16281 0.94091343
## 16282 0.94091343
## 16283 0.94091343
## 16284 0.94091343
## 16285 0.94091343
## 16286 0.94091343
## 16287 0.94091343
## 16288 0.94091343
## 16289 0.95103471
## 16290 0.95103471
## 16291 0.95103471
## 16292 0.95103471
## 16293 0.95103471
## 16294 0.95103471
## 16295 0.95103471
## 16296 0.95103471
## 16297 0.95103471
## 16298 0.95103471
## 16299 0.95103471
## 16300 0.95103471
## 16301 0.95103471
## 16302 0.95103471
## 16303 0.95103471
## 16304 0.95103471
## 16305 0.48754546
## 16306 0.48754546
## 16307 0.48754546
## 16308 0.48754546
## 16309 0.48754546
## 16310 0.48754546
## 16311 0.48754546
## 16312 0.48754546
## 16313 0.48754546
## 16314 0.48754546
## 16315 0.48754546
## 16316 0.48754546
## 16317 0.48754546
## 16318 0.48754546
## 16319 0.48754546
## 16320 0.48754546
## 16321 1.59057774
## 16322 1.59057774
## 16323 1.59057774
## 16324 1.59057774
## 16325 1.59057774
## 16326 1.59057774
## 16327 1.59057774
## 16328 1.59057774
## 16329 1.59057774
## 16330 1.59057774
## 16331 1.59057774
## 16332 1.59057774
## 16333 1.59057774
## 16334 1.59057774
## 16335 1.59057774
## 16336 1.59057774
## 16337 1.39297229
## 16338 1.39297229
## 16339 1.39297229
## 16340 1.39297229
## 16341 1.39297229
## 16342 1.39297229
## 16343 1.39297229
## 16344 1.39297229
## 16345 1.39297229
## 16346 1.39297229
## 16347 1.39297229
## 16348 1.39297229
## 16349 1.39297229
## 16350 1.39297229
## 16351 1.39297229
## 16352 1.39297229
## 16353 0.42730136
## 16354 0.42730136
## 16355 0.42730136
## 16356 0.42730136
## 16357 0.42730136
## 16358 0.42730136
## 16359 0.42730136
## 16360 0.42730136
## 16361 0.42730136
## 16362 0.42730136
## 16363 0.42730136
## 16364 0.42730136
## 16365 0.42730136
## 16366 0.42730136
## 16367 0.42730136
## 16368 0.42730136
## 16369 1.78932763
## 16370 1.78932763
## 16371 1.78932763
## 16372 1.78932763
## 16373 1.78932763
## 16374 1.78932763
## 16375 1.78932763
## 16376 1.78932763
## 16377 1.78932763
## 16378 1.78932763
## 16379 1.78932763
## 16380 1.78932763
## 16381 1.78932763
## 16382 1.78932763
## 16383 1.78932763
## 16384 1.78932763
## 16385 1.10560872
## 16386 1.10560872
## 16387 1.10560872
## 16388 1.10560872
## 16389 1.10560872
## 16390 1.10560872
## 16391 1.10560872
## 16392 1.10560872
## 16393 1.10560872
## 16394 1.10560872
## 16395 1.10560872
## 16396 1.10560872
## 16397 1.10560872
## 16398 1.10560872
## 16399 1.10560872
## 16400 1.10560872
## 16401 0.90147049
## 16402 0.90147049
## 16403 0.90147049
## 16404 0.90147049
## 16405 0.90147049
## 16406 0.90147049
## 16407 0.90147049
## 16408 0.90147049
## 16409 0.90147049
## 16410 0.90147049
## 16411 0.90147049
## 16412 0.90147049
## 16413 0.90147049
## 16414 0.90147049
## 16415 0.90147049
## 16416 0.90147049
## 16417 1.19459067
## 16418 1.19459067
## 16419 1.19459067
## 16420 1.19459067
## 16421 1.19459067
## 16422 1.19459067
## 16423 1.19459067
## 16424 1.19459067
## 16425 1.19459067
## 16426 1.19459067
## 16427 1.19459067
## 16428 1.19459067
## 16429 1.19459067
## 16430 1.19459067
## 16431 1.19459067
## 16432 1.19459067
## 16433 0.49295685
## 16434 0.49295685
## 16435 0.49295685
## 16436 0.49295685
## 16437 0.49295685
## 16438 0.49295685
## 16439 0.49295685
## 16440 0.49295685
## 16441 0.49295685
## 16442 0.49295685
## 16443 0.49295685
## 16444 0.49295685
## 16445 0.49295685
## 16446 0.49295685
## 16447 0.49295685
## 16448 0.49295685
## 16449 1.21841258
## 16450 1.21841258
## 16451 1.21841258
## 16452 1.21841258
## 16453 1.21841258
## 16454 1.21841258
## 16455 1.21841258
## 16456 1.21841258
## 16457 1.21841258
## 16458 1.21841258
## 16459 1.21841258
## 16460 1.21841258
## 16461 1.21841258
## 16462 1.21841258
## 16463 1.21841258
## 16464 1.21841258
## 16465 1.43284299
## 16466 1.43284299
## 16467 1.43284299
## 16468 1.43284299
## 16469 1.43284299
## 16470 1.43284299
## 16471 1.43284299
## 16472 1.43284299
## 16473 1.43284299
## 16474 1.43284299
## 16475 1.43284299
## 16476 1.43284299
## 16477 1.43284299
## 16478 1.43284299
## 16479 1.43284299
## 16480 1.43284299
## 16481 0.49987900
## 16482 0.49987900
## 16483 0.49987900
## 16484 0.49987900
## 16485 0.49987900
## 16486 0.49987900
## 16487 0.49987900
## 16488 0.49987900
## 16489 0.49987900
## 16490 0.49987900
## 16491 0.49987900
## 16492 0.49987900
## 16493 0.49987900
## 16494 0.49987900
## 16495 0.49987900
## 16496 0.49987900
## 16497 1.45819906
## 16498 1.45819906
## 16499 1.45819906
## 16500 1.45819906
## 16501 1.45819906
## 16502 1.45819906
## 16503 1.45819906
## 16504 1.45819906
## 16505 1.45819906
## 16506 1.45819906
## 16507 1.45819906
## 16508 1.45819906
## 16509 1.45819906
## 16510 1.45819906
## 16511 1.45819906
## 16512 1.45819906
## 16513 0.35001088
## 16514 0.35001088
## 16515 0.35001088
## 16516 0.35001088
## 16517 0.35001088
## 16518 0.35001088
## 16519 0.35001088
## 16520 0.35001088
## 16521 0.35001088
## 16522 0.35001088
## 16523 0.35001088
## 16524 0.35001088
## 16525 0.35001088
## 16526 0.35001088
## 16527 0.35001088
## 16528 0.35001088
## 16529 0.49946628
## 16530 0.49946628
## 16531 0.49946628
## 16532 0.49946628
## 16533 0.49946628
## 16534 0.49946628
## 16535 0.49946628
## 16536 0.49946628
## 16537 0.49946628
## 16538 0.49946628
## 16539 0.49946628
## 16540 0.49946628
## 16541 0.49946628
## 16542 0.49946628
## 16543 0.49946628
## 16544 0.49946628
## 16545 0.84851126
## 16546 0.84851126
## 16547 0.84851126
## 16548 0.84851126
## 16549 0.84851126
## 16550 0.84851126
## 16551 0.84851126
## 16552 0.84851126
## 16553 0.84851126
## 16554 0.84851126
## 16555 0.84851126
## 16556 0.84851126
## 16557 0.84851126
## 16558 0.84851126
## 16559 0.84851126
## 16560 0.84851126
## 16561 0.30129142
## 16562 0.30129142
## 16563 0.30129142
## 16564 0.30129142
## 16565 0.30129142
## 16566 0.30129142
## 16567 0.30129142
## 16568 0.30129142
## 16569 0.30129142
## 16570 0.30129142
## 16571 0.30129142
## 16572 0.30129142
## 16573 0.30129142
## 16574 0.30129142
## 16575 0.30129142
## 16576 0.30129142
## 16577 0.59476853
## 16578 0.59476853
## 16579 0.59476853
## 16580 0.59476853
## 16581 0.59476853
## 16582 0.59476853
## 16583 0.59476853
## 16584 0.59476853
## 16585 0.59476853
## 16586 0.59476853
## 16587 0.59476853
## 16588 0.59476853
## 16589 0.59476853
## 16590 0.59476853
## 16591 0.59476853
## 16592 0.59476853
## 16593 0.39816204
## 16594 0.39816204
## 16595 0.39816204
## 16596 0.39816204
## 16597 0.39816204
## 16598 0.39816204
## 16599 0.39816204
## 16600 0.39816204
## 16601 0.39816204
## 16602 0.39816204
## 16603 0.39816204
## 16604 0.39816204
## 16605 0.39816204
## 16606 0.39816204
## 16607 0.39816204
## 16608 0.39816204
## 16609 0.52251055
## 16610 0.52251055
## 16611 0.52251055
## 16612 0.52251055
## 16613 0.52251055
## 16614 0.52251055
## 16615 0.52251055
## 16616 0.52251055
## 16617 0.52251055
## 16618 0.52251055
## 16619 0.52251055
## 16620 0.52251055
## 16621 0.52251055
## 16622 0.52251055
## 16623 0.52251055
## 16624 0.52251055
## 16625 0.44174632
## 16626 0.44174632
## 16627 0.44174632
## 16628 0.44174632
## 16629 0.44174632
## 16630 0.44174632
## 16631 0.44174632
## 16632 0.44174632
## 16633 0.44174632
## 16634 0.44174632
## 16635 0.44174632
## 16636 0.44174632
## 16637 0.44174632
## 16638 0.44174632
## 16639 0.44174632
## 16640 0.44174632
## 16641 0.84070140
## 16642 0.84070140
## 16643 0.84070140
## 16644 0.84070140
## 16645 0.84070140
## 16646 0.84070140
## 16647 0.84070140
## 16648 0.84070140
## 16649 0.84070140
## 16650 0.84070140
## 16651 0.84070140
## 16652 0.84070140
## 16653 0.84070140
## 16654 0.84070140
## 16655 0.84070140
## 16656 0.84070140
## 16657 0.95022900
## 16658 0.95022900
## 16659 0.95022900
## 16660 0.95022900
## 16661 0.95022900
## 16662 0.95022900
## 16663 0.95022900
## 16664 0.95022900
## 16665 0.95022900
## 16666 0.95022900
## 16667 0.95022900
## 16668 0.95022900
## 16669 0.95022900
## 16670 0.95022900
## 16671 0.95022900
## 16672 0.95022900
## 16673 0.33276084
## 16674 0.33276084
## 16675 0.33276084
## 16676 0.33276084
## 16677 0.33276084
## 16678 0.33276084
## 16679 0.33276084
## 16680 0.33276084
## 16681 0.33276084
## 16682 0.33276084
## 16683 0.33276084
## 16684 0.33276084
## 16685 0.33276084
## 16686 0.33276084
## 16687 0.33276084
## 16688 0.33276084
## 16689 1.17470106
## 16690 1.17470106
## 16691 1.17470106
## 16692 1.17470106
## 16693 1.17470106
## 16694 1.17470106
## 16695 1.17470106
## 16696 1.17470106
## 16697 1.17470106
## 16698 1.17470106
## 16699 1.17470106
## 16700 1.17470106
## 16701 1.17470106
## 16702 1.17470106
## 16703 1.17470106
## 16704 1.17470106
## 16705 0.37409679
## 16706 0.37409679
## 16707 0.37409679
## 16708 0.37409679
## 16709 0.37409679
## 16710 0.37409679
## 16711 0.37409679
## 16712 0.37409679
## 16713 0.37409679
## 16714 0.37409679
## 16715 0.37409679
## 16716 0.37409679
## 16717 0.37409679
## 16718 0.37409679
## 16719 0.37409679
## 16720 0.37409679
## 16721 0.25091491
## 16722 0.25091491
## 16723 0.25091491
## 16724 0.25091491
## 16725 0.25091491
## 16726 0.25091491
## 16727 0.25091491
## 16728 0.25091491
## 16729 0.25091491
## 16730 0.25091491
## 16731 0.25091491
## 16732 0.25091491
## 16733 0.25091491
## 16734 0.25091491
## 16735 0.25091491
## 16736 0.25091491
## 16737 1.15370949
## 16738 1.15370949
## 16739 1.15370949
## 16740 1.15370949
## 16741 1.15370949
## 16742 1.15370949
## 16743 1.15370949
## 16744 1.15370949
## 16745 1.15370949
## 16746 1.15370949
## 16747 1.15370949
## 16748 1.15370949
## 16749 1.15370949
## 16750 1.15370949
## 16751 1.15370949
## 16752 1.15370949
## 16753 0.90302726
## 16754 0.90302726
## 16755 0.90302726
## 16756 0.90302726
## 16757 0.90302726
## 16758 0.90302726
## 16759 0.90302726
## 16760 0.90302726
## 16761 0.90302726
## 16762 0.90302726
## 16763 0.90302726
## 16764 0.90302726
## 16765 0.90302726
## 16766 0.90302726
## 16767 0.90302726
## 16768 0.90302726
## 16769 0.78241414
## 16770 0.78241414
## 16771 0.78241414
## 16772 0.78241414
## 16773 0.78241414
## 16774 0.78241414
## 16775 0.78241414
## 16776 0.78241414
## 16777 0.78241414
## 16778 0.78241414
## 16779 0.78241414
## 16780 0.78241414
## 16781 0.78241414
## 16782 0.78241414
## 16783 0.78241414
## 16784 0.78241414
## 16785 0.83052150
## 16786 0.83052150
## 16787 0.83052150
## 16788 0.83052150
## 16789 0.83052150
## 16790 0.83052150
## 16791 0.83052150
## 16792 0.83052150
## 16793 0.83052150
## 16794 0.83052150
## 16795 0.83052150
## 16796 0.83052150
## 16797 0.83052150
## 16798 0.83052150
## 16799 0.83052150
## 16800 0.83052150
## 16801 0.25656214
## 16802 0.25656214
## 16803 0.25656214
## 16804 0.25656214
## 16805 0.25656214
## 16806 0.25656214
## 16807 0.25656214
## 16808 0.25656214
## 16809 0.25656214
## 16810 0.25656214
## 16811 0.25656214
## 16812 0.25656214
## 16813 0.25656214
## 16814 0.25656214
## 16815 0.25656214
## 16816 0.25656214
## 16817 0.74576882
## 16818 0.74576882
## 16819 0.74576882
## 16820 0.74576882
## 16821 0.74576882
## 16822 0.74576882
## 16823 0.74576882
## 16824 0.74576882
## 16825 0.74576882
## 16826 0.74576882
## 16827 0.74576882
## 16828 0.74576882
## 16829 0.74576882
## 16830 0.74576882
## 16831 0.74576882
## 16832 0.74576882
## 16833 2.42600481
## 16834 2.42600481
## 16835 2.42600481
## 16836 2.42600481
## 16837 2.42600481
## 16838 2.42600481
## 16839 2.42600481
## 16840 2.42600481
## 16841 2.42600481
## 16842 2.42600481
## 16843 2.42600481
## 16844 2.42600481
## 16845 2.42600481
## 16846 2.42600481
## 16847 2.42600481
## 16848 2.42600481
## 16849 0.92801047
## 16850 0.92801047
## 16851 0.92801047
## 16852 0.92801047
## 16853 0.92801047
## 16854 0.92801047
## 16855 0.92801047
## 16856 0.92801047
## 16857 0.92801047
## 16858 0.92801047
## 16859 0.92801047
## 16860 0.92801047
## 16861 0.92801047
## 16862 0.92801047
## 16863 0.92801047
## 16864 0.92801047
## 16865 0.49583917
## 16866 0.49583917
## 16867 0.49583917
## 16868 0.49583917
## 16869 0.49583917
## 16870 0.49583917
## 16871 0.49583917
## 16872 0.49583917
## 16873 0.49583917
## 16874 0.49583917
## 16875 0.49583917
## 16876 0.49583917
## 16877 0.49583917
## 16878 0.49583917
## 16879 0.49583917
## 16880 0.49583917
## 16881 0.74867162
## 16882 0.74867162
## 16883 0.74867162
## 16884 0.74867162
## 16885 0.74867162
## 16886 0.74867162
## 16887 0.74867162
## 16888 0.74867162
## 16889 0.74867162
## 16890 0.74867162
## 16891 0.74867162
## 16892 0.74867162
## 16893 0.74867162
## 16894 0.74867162
## 16895 0.74867162
## 16896 0.74867162
## 16897 0.44000010
## 16898 0.44000010
## 16899 0.44000010
## 16900 0.44000010
## 16901 0.44000010
## 16902 0.44000010
## 16903 0.44000010
## 16904 0.44000010
## 16905 0.44000010
## 16906 0.44000010
## 16907 0.44000010
## 16908 0.44000010
## 16909 0.44000010
## 16910 0.44000010
## 16911 0.44000010
## 16912 0.44000010
## 16913 0.30974231
## 16914 0.30974231
## 16915 0.30974231
## 16916 0.30974231
## 16917 0.30974231
## 16918 0.30974231
## 16919 0.30974231
## 16920 0.30974231
## 16921 0.30974231
## 16922 0.30974231
## 16923 0.30974231
## 16924 0.30974231
## 16925 0.30974231
## 16926 0.30974231
## 16927 0.30974231
## 16928 0.30974231
## 16929 0.09116564
## 16930 0.09116564
## 16931 0.09116564
## 16932 0.09116564
## 16933 0.09116564
## 16934 0.09116564
## 16935 0.09116564
## 16936 0.09116564
## 16937 0.09116564
## 16938 0.09116564
## 16939 0.09116564
## 16940 0.09116564
## 16941 0.09116564
## 16942 0.09116564
## 16943 0.09116564
## 16944 0.09116564
## 16945 1.12172184
## 16946 1.12172184
## 16947 1.12172184
## 16948 1.12172184
## 16949 1.12172184
## 16950 1.12172184
## 16951 1.12172184
## 16952 1.12172184
## 16953 1.12172184
## 16954 1.12172184
## 16955 1.12172184
## 16956 1.12172184
## 16957 1.12172184
## 16958 1.12172184
## 16959 1.12172184
## 16960 1.12172184
## 16961 0.60097411
## 16962 0.60097411
## 16963 0.60097411
## 16964 0.60097411
## 16965 0.60097411
## 16966 0.60097411
## 16967 0.60097411
## 16968 0.60097411
## 16969 0.60097411
## 16970 0.60097411
## 16971 0.60097411
## 16972 0.60097411
## 16973 0.60097411
## 16974 0.60097411
## 16975 0.60097411
## 16976 0.60097411
## 16977 0.34572117
## 16978 0.34572117
## 16979 0.34572117
## 16980 0.34572117
## 16981 0.34572117
## 16982 0.34572117
## 16983 0.34572117
## 16984 0.34572117
## 16985 0.34572117
## 16986 0.34572117
## 16987 0.34572117
## 16988 0.34572117
## 16989 0.34572117
## 16990 0.34572117
## 16991 0.34572117
## 16992 0.34572117
## 16993 0.40996489
## 16994 0.40996489
## 16995 0.40996489
## 16996 0.40996489
## 16997 0.40996489
## 16998 0.40996489
## 16999 0.40996489
## 17000 0.40996489
## 17001 0.40996489
## 17002 0.40996489
## 17003 0.40996489
## 17004 0.40996489
## 17005 0.40996489
## 17006 0.40996489
## 17007 0.40996489
## 17008 0.40996489
## 17009 0.63383241
## 17010 0.63383241
## 17011 0.63383241
## 17012 0.63383241
## 17013 0.63383241
## 17014 0.63383241
## 17015 0.63383241
## 17016 0.63383241
## 17017 0.63383241
## 17018 0.63383241
## 17019 0.63383241
## 17020 0.63383241
## 17021 0.63383241
## 17022 0.63383241
## 17023 0.63383241
## 17024 0.63383241
## 17025 0.56955136
## 17026 0.56955136
## 17027 0.56955136
## 17028 0.56955136
## 17029 0.56955136
## 17030 0.56955136
## 17031 0.56955136
## 17032 0.56955136
## 17033 0.56955136
## 17034 0.56955136
## 17035 0.56955136
## 17036 0.56955136
## 17037 0.56955136
## 17038 0.56955136
## 17039 0.56955136
## 17040 0.56955136
## 17041 2.04789036
## 17042 2.04789036
## 17043 2.04789036
## 17044 2.04789036
## 17045 2.04789036
## 17046 2.04789036
## 17047 2.04789036
## 17048 2.04789036
## 17049 2.04789036
## 17050 2.04789036
## 17051 2.04789036
## 17052 2.04789036
## 17053 2.04789036
## 17054 2.04789036
## 17055 2.04789036
## 17056 2.04789036
## 17057 0.14475324
## 17058 0.14475324
## 17059 0.14475324
## 17060 0.14475324
## 17061 0.14475324
## 17062 0.14475324
## 17063 0.14475324
## 17064 0.14475324
## 17065 0.14475324
## 17066 0.14475324
## 17067 0.14475324
## 17068 0.14475324
## 17069 0.14475324
## 17070 0.14475324
## 17071 0.14475324
## 17072 0.14475324
## 17073 0.11276935
## 17074 0.11276935
## 17075 0.11276935
## 17076 0.11276935
## 17077 0.11276935
## 17078 0.11276935
## 17079 0.11276935
## 17080 0.11276935
## 17081 0.11276935
## 17082 0.11276935
## 17083 0.11276935
## 17084 0.11276935
## 17085 0.11276935
## 17086 0.11276935
## 17087 0.11276935
## 17088 0.11276935
## 17089 1.01219025
## 17090 1.01219025
## 17091 1.01219025
## 17092 1.01219025
## 17093 1.01219025
## 17094 1.01219025
## 17095 1.01219025
## 17096 1.01219025
## 17097 1.01219025
## 17098 1.01219025
## 17099 1.01219025
## 17100 1.01219025
## 17101 1.01219025
## 17102 1.01219025
## 17103 1.01219025
## 17104 1.01219025
## 17105 0.68821896
## 17106 0.68821896
## 17107 0.68821896
## 17108 0.68821896
## 17109 0.68821896
## 17110 0.68821896
## 17111 0.68821896
## 17112 0.68821896
## 17113 0.68821896
## 17114 0.68821896
## 17115 0.68821896
## 17116 0.68821896
## 17117 0.68821896
## 17118 0.68821896
## 17119 0.68821896
## 17120 0.68821896
## 17121 0.77802874
## 17122 0.77802874
## 17123 0.77802874
## 17124 0.77802874
## 17125 0.77802874
## 17126 0.77802874
## 17127 0.77802874
## 17128 0.77802874
## 17129 0.77802874
## 17130 0.77802874
## 17131 0.77802874
## 17132 0.77802874
## 17133 0.77802874
## 17134 0.77802874
## 17135 0.77802874
## 17136 0.77802874
## 17137 0.65471271
## 17138 0.65471271
## 17139 0.65471271
## 17140 0.65471271
## 17141 0.65471271
## 17142 0.65471271
## 17143 0.65471271
## 17144 0.65471271
## 17145 0.65471271
## 17146 0.65471271
## 17147 0.65471271
## 17148 0.65471271
## 17149 0.65471271
## 17150 0.65471271
## 17151 0.65471271
## 17152 0.65471271
## 17153 2.57331663
## 17154 2.57331663
## 17155 2.57331663
## 17156 2.57331663
## 17157 2.57331663
## 17158 2.57331663
## 17159 2.57331663
## 17160 2.57331663
## 17161 2.57331663
## 17162 2.57331663
## 17163 2.57331663
## 17164 2.57331663
## 17165 2.57331663
## 17166 2.57331663
## 17167 2.57331663
## 17168 2.57331663
## 17169 0.02663928
## 17170 0.02663928
## 17171 0.02663928
## 17172 0.02663928
## 17173 0.02663928
## 17174 0.02663928
## 17175 0.02663928
## 17176 0.02663928
## 17177 0.02663928
## 17178 0.02663928
## 17179 0.02663928
## 17180 0.02663928
## 17181 0.02663928
## 17182 0.02663928
## 17183 0.02663928
## 17184 0.02663928
## 17185 1.34832343
## 17186 1.34832343
## 17187 1.34832343
## 17188 1.34832343
## 17189 1.34832343
## 17190 1.34832343
## 17191 1.34832343
## 17192 1.34832343
## 17193 1.34832343
## 17194 1.34832343
## 17195 1.34832343
## 17196 1.34832343
## 17197 1.34832343
## 17198 1.34832343
## 17199 1.34832343
## 17200 1.34832343
## 17201 0.21729062
## 17202 0.21729062
## 17203 0.21729062
## 17204 0.21729062
## 17205 0.21729062
## 17206 0.21729062
## 17207 0.21729062
## 17208 0.21729062
## 17209 0.21729062
## 17210 0.21729062
## 17211 0.21729062
## 17212 0.21729062
## 17213 0.21729062
## 17214 0.21729062
## 17215 0.21729062
## 17216 0.21729062
## 17217 0.50165018
## 17218 0.50165018
## 17219 0.50165018
## 17220 0.50165018
## 17221 0.50165018
## 17222 0.50165018
## 17223 0.50165018
## 17224 0.50165018
## 17225 0.50165018
## 17226 0.50165018
## 17227 0.50165018
## 17228 0.50165018
## 17229 0.50165018
## 17230 0.50165018
## 17231 0.50165018
## 17232 0.50165018
## 17233 1.23161405
## 17234 1.23161405
## 17235 1.23161405
## 17236 1.23161405
## 17237 1.23161405
## 17238 1.23161405
## 17239 1.23161405
## 17240 1.23161405
## 17241 1.23161405
## 17242 1.23161405
## 17243 1.23161405
## 17244 1.23161405
## 17245 1.23161405
## 17246 1.23161405
## 17247 1.23161405
## 17248 1.23161405
## 17249 0.64482171
## 17250 0.64482171
## 17251 0.64482171
## 17252 0.64482171
## 17253 0.64482171
## 17254 0.64482171
## 17255 0.64482171
## 17256 0.64482171
## 17257 0.64482171
## 17258 0.64482171
## 17259 0.64482171
## 17260 0.64482171
## 17261 0.64482171
## 17262 0.64482171
## 17263 0.64482171
## 17264 0.64482171
## 17265 0.19897895
## 17266 0.19897895
## 17267 0.19897895
## 17268 0.19897895
## 17269 0.19897895
## 17270 0.19897895
## 17271 0.19897895
## 17272 0.19897895
## 17273 0.19897895
## 17274 0.19897895
## 17275 0.19897895
## 17276 0.19897895
## 17277 0.19897895
## 17278 0.19897895
## 17279 0.19897895
## 17280 0.19897895
## 17281 1.00664546
## 17282 1.00664546
## 17283 1.00664546
## 17284 1.00664546
## 17285 1.00664546
## 17286 1.00664546
## 17287 1.00664546
## 17288 1.00664546
## 17289 1.00664546
## 17290 1.00664546
## 17291 1.00664546
## 17292 1.00664546
## 17293 1.00664546
## 17294 1.00664546
## 17295 1.00664546
## 17296 1.00664546
## 17297 3.20871816
## 17298 3.20871816
## 17299 3.20871816
## 17300 3.20871816
## 17301 3.20871816
## 17302 3.20871816
## 17303 3.20871816
## 17304 3.20871816
## 17305 3.20871816
## 17306 3.20871816
## 17307 3.20871816
## 17308 3.20871816
## 17309 3.20871816
## 17310 3.20871816
## 17311 3.20871816
## 17312 3.20871816
## 17313 1.22975070
## 17314 1.22975070
## 17315 1.22975070
## 17316 1.22975070
## 17317 1.22975070
## 17318 1.22975070
## 17319 1.22975070
## 17320 1.22975070
## 17321 1.22975070
## 17322 1.22975070
## 17323 1.22975070
## 17324 1.22975070
## 17325 1.22975070
## 17326 1.22975070
## 17327 1.22975070
## 17328 1.22975070
## 17329 0.34949282
## 17330 0.34949282
## 17331 0.34949282
## 17332 0.34949282
## 17333 0.34949282
## 17334 0.34949282
## 17335 0.34949282
## 17336 0.34949282
## 17337 0.34949282
## 17338 0.34949282
## 17339 0.34949282
## 17340 0.34949282
## 17341 0.34949282
## 17342 0.34949282
## 17343 0.34949282
## 17344 0.34949282
## 17345 2.00734822
## 17346 2.00734822
## 17347 2.00734822
## 17348 2.00734822
## 17349 2.00734822
## 17350 2.00734822
## 17351 2.00734822
## 17352 2.00734822
## 17353 2.00734822
## 17354 2.00734822
## 17355 2.00734822
## 17356 2.00734822
## 17357 2.00734822
## 17358 2.00734822
## 17359 2.00734822
## 17360 2.00734822
## 17361 1.67403519
## 17362 1.67403519
## 17363 1.67403519
## 17364 1.67403519
## 17365 1.67403519
## 17366 1.67403519
## 17367 1.67403519
## 17368 1.67403519
## 17369 1.67403519
## 17370 1.67403519
## 17371 1.67403519
## 17372 1.67403519
## 17373 1.67403519
## 17374 1.67403519
## 17375 1.67403519
## 17376 1.67403519
## 17377 1.54918525
## 17378 1.54918525
## 17379 1.54918525
## 17380 1.54918525
## 17381 1.54918525
## 17382 1.54918525
## 17383 1.54918525
## 17384 1.54918525
## 17385 1.54918525
## 17386 1.54918525
## 17387 1.54918525
## 17388 1.54918525
## 17389 1.54918525
## 17390 1.54918525
## 17391 1.54918525
## 17392 1.54918525
## 17393 0.56930004
## 17394 0.56930004
## 17395 0.56930004
## 17396 0.56930004
## 17397 0.56930004
## 17398 0.56930004
## 17399 0.56930004
## 17400 0.56930004
## 17401 0.56930004
## 17402 0.56930004
## 17403 0.56930004
## 17404 0.56930004
## 17405 0.56930004
## 17406 0.56930004
## 17407 0.56930004
## 17408 0.56930004
## 17409 0.51706414
## 17410 0.51706414
## 17411 0.51706414
## 17412 0.51706414
## 17413 0.51706414
## 17414 0.51706414
## 17415 0.51706414
## 17416 0.51706414
## 17417 0.51706414
## 17418 0.51706414
## 17419 0.51706414
## 17420 0.51706414
## 17421 0.51706414
## 17422 0.51706414
## 17423 0.51706414
## 17424 0.51706414
## 17425 1.94882985
## 17426 1.94882985
## 17427 1.94882985
## 17428 1.94882985
## 17429 1.94882985
## 17430 1.94882985
## 17431 1.94882985
## 17432 1.94882985
## 17433 1.94882985
## 17434 1.94882985
## 17435 1.94882985
## 17436 1.94882985
## 17437 1.94882985
## 17438 1.94882985
## 17439 1.94882985
## 17440 1.94882985
## 17441 0.43825651
## 17442 0.43825651
## 17443 0.43825651
## 17444 0.43825651
## 17445 0.43825651
## 17446 0.43825651
## 17447 0.43825651
## 17448 0.43825651
## 17449 0.43825651
## 17450 0.43825651
## 17451 0.43825651
## 17452 0.43825651
## 17453 0.43825651
## 17454 0.43825651
## 17455 0.43825651
## 17456 0.43825651
## 17457 1.11401847
## 17458 1.11401847
## 17459 1.11401847
## 17460 1.11401847
## 17461 1.11401847
## 17462 1.11401847
## 17463 1.11401847
## 17464 1.11401847
## 17465 1.11401847
## 17466 1.11401847
## 17467 1.11401847
## 17468 1.11401847
## 17469 1.11401847
## 17470 1.11401847
## 17471 1.11401847
## 17472 1.11401847
## 17473 0.38170324
## 17474 0.38170324
## 17475 0.38170324
## 17476 0.38170324
## 17477 0.38170324
## 17478 0.38170324
## 17479 0.38170324
## 17480 0.38170324
## 17481 0.38170324
## 17482 0.38170324
## 17483 0.38170324
## 17484 0.38170324
## 17485 0.38170324
## 17486 0.38170324
## 17487 0.38170324
## 17488 0.38170324
## 17489 1.32239123
## 17490 1.32239123
## 17491 1.32239123
## 17492 1.32239123
## 17493 1.32239123
## 17494 1.32239123
## 17495 1.32239123
## 17496 1.32239123
## 17497 1.32239123
## 17498 1.32239123
## 17499 1.32239123
## 17500 1.32239123
## 17501 1.32239123
## 17502 1.32239123
## 17503 1.32239123
## 17504 1.32239123
## 17505 1.11923505
## 17506 1.11923505
## 17507 1.11923505
## 17508 1.11923505
## 17509 1.11923505
## 17510 1.11923505
## 17511 1.11923505
## 17512 1.11923505
## 17513 1.11923505
## 17514 1.11923505
## 17515 1.11923505
## 17516 1.11923505
## 17517 1.11923505
## 17518 1.11923505
## 17519 1.11923505
## 17520 1.11923505
## 17521 0.34098812
## 17522 0.34098812
## 17523 0.34098812
## 17524 0.34098812
## 17525 0.34098812
## 17526 0.34098812
## 17527 0.34098812
## 17528 0.34098812
## 17529 0.34098812
## 17530 0.34098812
## 17531 0.34098812
## 17532 0.34098812
## 17533 0.34098812
## 17534 0.34098812
## 17535 0.34098812
## 17536 0.34098812
## 17537 2.02313538
## 17538 2.02313538
## 17539 2.02313538
## 17540 2.02313538
## 17541 2.02313538
## 17542 2.02313538
## 17543 2.02313538
## 17544 2.02313538
## 17545 2.02313538
## 17546 2.02313538
## 17547 2.02313538
## 17548 2.02313538
## 17549 2.02313538
## 17550 2.02313538
## 17551 2.02313538
## 17552 2.02313538
## 17553 0.19568758
## 17554 0.19568758
## 17555 0.19568758
## 17556 0.19568758
## 17557 0.19568758
## 17558 0.19568758
## 17559 0.19568758
## 17560 0.19568758
## 17561 0.19568758
## 17562 0.19568758
## 17563 0.19568758
## 17564 0.19568758
## 17565 0.19568758
## 17566 0.19568758
## 17567 0.19568758
## 17568 0.19568758
## 17569 0.70932285
## 17570 0.70932285
## 17571 0.70932285
## 17572 0.70932285
## 17573 0.70932285
## 17574 0.70932285
## 17575 0.70932285
## 17576 0.70932285
## 17577 0.70932285
## 17578 0.70932285
## 17579 0.70932285
## 17580 0.70932285
## 17581 0.70932285
## 17582 0.70932285
## 17583 0.70932285
## 17584 0.70932285
## 17585 1.56838242
## 17586 1.56838242
## 17587 1.56838242
## 17588 1.56838242
## 17589 1.56838242
## 17590 1.56838242
## 17591 1.56838242
## 17592 1.56838242
## 17593 1.56838242
## 17594 1.56838242
## 17595 1.56838242
## 17596 1.56838242
## 17597 1.56838242
## 17598 1.56838242
## 17599 1.56838242
## 17600 1.56838242
## 17601 0.65034385
## 17602 0.65034385
## 17603 0.65034385
## 17604 0.65034385
## 17605 0.65034385
## 17606 0.65034385
## 17607 0.65034385
## 17608 0.65034385
## 17609 0.65034385
## 17610 0.65034385
## 17611 0.65034385
## 17612 0.65034385
## 17613 0.65034385
## 17614 0.65034385
## 17615 0.65034385
## 17616 0.65034385
## 17617 0.24961347
## 17618 0.24961347
## 17619 0.24961347
## 17620 0.24961347
## 17621 0.24961347
## 17622 0.24961347
## 17623 0.24961347
## 17624 0.24961347
## 17625 0.24961347
## 17626 0.24961347
## 17627 0.24961347
## 17628 0.24961347
## 17629 0.24961347
## 17630 0.24961347
## 17631 0.24961347
## 17632 0.24961347
## 17633 1.40202173
## 17634 1.40202173
## 17635 1.40202173
## 17636 1.40202173
## 17637 1.40202173
## 17638 1.40202173
## 17639 1.40202173
## 17640 1.40202173
## 17641 1.40202173
## 17642 1.40202173
## 17643 1.40202173
## 17644 1.40202173
## 17645 1.40202173
## 17646 1.40202173
## 17647 1.40202173
## 17648 1.40202173
## 17649 0.41374970
## 17650 0.41374970
## 17651 0.41374970
## 17652 0.41374970
## 17653 0.41374970
## 17654 0.41374970
## 17655 0.41374970
## 17656 0.41374970
## 17657 0.41374970
## 17658 0.41374970
## 17659 0.41374970
## 17660 0.41374970
## 17661 0.41374970
## 17662 0.41374970
## 17663 0.41374970
## 17664 0.41374970
## 17665 0.59751093
## 17666 0.59751093
## 17667 0.59751093
## 17668 0.59751093
## 17669 0.59751093
## 17670 0.59751093
## 17671 0.59751093
## 17672 0.59751093
## 17673 0.59751093
## 17674 0.59751093
## 17675 0.59751093
## 17676 0.59751093
## 17677 0.59751093
## 17678 0.59751093
## 17679 0.59751093
## 17680 0.59751093
## 17681 0.43541926
## 17682 0.43541926
## 17683 0.43541926
## 17684 0.43541926
## 17685 0.43541926
## 17686 0.43541926
## 17687 0.43541926
## 17688 0.43541926
## 17689 0.43541926
## 17690 0.43541926
## 17691 0.43541926
## 17692 0.43541926
## 17693 0.43541926
## 17694 0.43541926
## 17695 0.43541926
## 17696 0.43541926
## 17697 0.65435420
## 17698 0.65435420
## 17699 0.65435420
## 17700 0.65435420
## 17701 0.65435420
## 17702 0.65435420
## 17703 0.65435420
## 17704 0.65435420
## 17705 0.65435420
## 17706 0.65435420
## 17707 0.65435420
## 17708 0.65435420
## 17709 0.65435420
## 17710 0.65435420
## 17711 0.65435420
## 17712 0.65435420
## 17713 0.42236207
## 17714 0.42236207
## 17715 0.42236207
## 17716 0.42236207
## 17717 0.42236207
## 17718 0.42236207
## 17719 0.42236207
## 17720 0.42236207
## 17721 0.42236207
## 17722 0.42236207
## 17723 0.42236207
## 17724 0.42236207
## 17725 0.42236207
## 17726 0.42236207
## 17727 0.42236207
## 17728 0.42236207
## 17729 4.44041023
## 17730 4.44041023
## 17731 4.44041023
## 17732 4.44041023
## 17733 4.44041023
## 17734 4.44041023
## 17735 4.44041023
## 17736 4.44041023
## 17737 4.44041023
## 17738 4.44041023
## 17739 4.44041023
## 17740 4.44041023
## 17741 4.44041023
## 17742 4.44041023
## 17743 4.44041023
## 17744 4.44041023
## 17745 0.40518651
## 17746 0.40518651
## 17747 0.40518651
## 17748 0.40518651
## 17749 0.40518651
## 17750 0.40518651
## 17751 0.40518651
## 17752 0.40518651
## 17753 0.40518651
## 17754 0.40518651
## 17755 0.40518651
## 17756 0.40518651
## 17757 0.40518651
## 17758 0.40518651
## 17759 0.40518651
## 17760 0.40518651
## 17761 0.51178587
## 17762 0.51178587
## 17763 0.51178587
## 17764 0.51178587
## 17765 0.51178587
## 17766 0.51178587
## 17767 0.51178587
## 17768 0.51178587
## 17769 0.51178587
## 17770 0.51178587
## 17771 0.51178587
## 17772 0.51178587
## 17773 0.51178587
## 17774 0.51178587
## 17775 0.51178587
## 17776 0.51178587
## 17777 0.31509770
## 17778 0.31509770
## 17779 0.31509770
## 17780 0.31509770
## 17781 0.31509770
## 17782 0.31509770
## 17783 0.31509770
## 17784 0.31509770
## 17785 0.31509770
## 17786 0.31509770
## 17787 0.31509770
## 17788 0.31509770
## 17789 0.31509770
## 17790 0.31509770
## 17791 0.31509770
## 17792 0.31509770
## 17793 0.17088798
## 17794 0.17088798
## 17795 0.17088798
## 17796 0.17088798
## 17797 0.17088798
## 17798 0.17088798
## 17799 0.17088798
## 17800 0.17088798
## 17801 0.17088798
## 17802 0.17088798
## 17803 0.17088798
## 17804 0.17088798
## 17805 0.17088798
## 17806 0.17088798
## 17807 0.17088798
## 17808 0.17088798
## 17809 2.27983635
## 17810 2.27983635
## 17811 2.27983635
## 17812 2.27983635
## 17813 2.27983635
## 17814 2.27983635
## 17815 2.27983635
## 17816 2.27983635
## 17817 2.27983635
## 17818 2.27983635
## 17819 2.27983635
## 17820 2.27983635
## 17821 2.27983635
## 17822 2.27983635
## 17823 2.27983635
## 17824 2.27983635
## 17825 0.73920104
## 17826 0.73920104
## 17827 0.73920104
## 17828 0.73920104
## 17829 0.73920104
## 17830 0.73920104
## 17831 0.73920104
## 17832 0.73920104
## 17833 0.73920104
## 17834 0.73920104
## 17835 0.73920104
## 17836 0.73920104
## 17837 0.73920104
## 17838 0.73920104
## 17839 0.73920104
## 17840 0.73920104
## 17841 2.78842455
## 17842 2.78842455
## 17843 2.78842455
## 17844 2.78842455
## 17845 2.78842455
## 17846 2.78842455
## 17847 2.78842455
## 17848 2.78842455
## 17849 2.78842455
## 17850 2.78842455
## 17851 2.78842455
## 17852 2.78842455
## 17853 2.78842455
## 17854 2.78842455
## 17855 2.78842455
## 17856 2.78842455
## 17857 0.55319032
## 17858 0.55319032
## 17859 0.55319032
## 17860 0.55319032
## 17861 0.55319032
## 17862 0.55319032
## 17863 0.55319032
## 17864 0.55319032
## 17865 0.55319032
## 17866 0.55319032
## 17867 0.55319032
## 17868 0.55319032
## 17869 0.55319032
## 17870 0.55319032
## 17871 0.55319032
## 17872 0.55319032
## 17873 0.71535026
## 17874 0.71535026
## 17875 0.71535026
## 17876 0.71535026
## 17877 0.71535026
## 17878 0.71535026
## 17879 0.71535026
## 17880 0.71535026
## 17881 0.71535026
## 17882 0.71535026
## 17883 0.71535026
## 17884 0.71535026
## 17885 0.71535026
## 17886 0.71535026
## 17887 0.71535026
## 17888 0.71535026
## 17889 0.81686243
## 17890 0.81686243
## 17891 0.81686243
## 17892 0.81686243
## 17893 0.81686243
## 17894 0.81686243
## 17895 0.81686243
## 17896 0.81686243
## 17897 0.81686243
## 17898 0.81686243
## 17899 0.81686243
## 17900 0.81686243
## 17901 0.81686243
## 17902 0.81686243
## 17903 0.81686243
## 17904 0.81686243
## 17905 0.24430979
## 17906 0.24430979
## 17907 0.24430979
## 17908 0.24430979
## 17909 0.24430979
## 17910 0.24430979
## 17911 0.24430979
## 17912 0.24430979
## 17913 0.24430979
## 17914 0.24430979
## 17915 0.24430979
## 17916 0.24430979
## 17917 0.24430979
## 17918 0.24430979
## 17919 0.24430979
## 17920 0.24430979
## 17921 0.39109807
## 17922 0.39109807
## 17923 0.39109807
## 17924 0.39109807
## 17925 0.39109807
## 17926 0.39109807
## 17927 0.39109807
## 17928 0.39109807
## 17929 0.39109807
## 17930 0.39109807
## 17931 0.39109807
## 17932 0.39109807
## 17933 0.39109807
## 17934 0.39109807
## 17935 0.39109807
## 17936 0.39109807
## 17937 1.00811146
## 17938 1.00811146
## 17939 1.00811146
## 17940 1.00811146
## 17941 1.00811146
## 17942 1.00811146
## 17943 1.00811146
## 17944 1.00811146
## 17945 1.00811146
## 17946 1.00811146
## 17947 1.00811146
## 17948 1.00811146
## 17949 1.00811146
## 17950 1.00811146
## 17951 1.00811146
## 17952 1.00811146
## 17953 0.95693677
## 17954 0.95693677
## 17955 0.95693677
## 17956 0.95693677
## 17957 0.95693677
## 17958 0.95693677
## 17959 0.95693677
## 17960 0.95693677
## 17961 0.95693677
## 17962 0.95693677
## 17963 0.95693677
## 17964 0.95693677
## 17965 0.95693677
## 17966 0.95693677
## 17967 0.95693677
## 17968 0.95693677
## 17969 1.58346959
## 17970 1.58346959
## 17971 1.58346959
## 17972 1.58346959
## 17973 1.58346959
## 17974 1.58346959
## 17975 1.58346959
## 17976 1.58346959
## 17977 1.58346959
## 17978 1.58346959
## 17979 1.58346959
## 17980 1.58346959
## 17981 1.58346959
## 17982 1.58346959
## 17983 1.58346959
## 17984 1.58346959
## 17985 0.68900015
## 17986 0.68900015
## 17987 0.68900015
## 17988 0.68900015
## 17989 0.68900015
## 17990 0.68900015
## 17991 0.68900015
## 17992 0.68900015
## 17993 0.68900015
## 17994 0.68900015
## 17995 0.68900015
## 17996 0.68900015
## 17997 0.68900015
## 17998 0.68900015
## 17999 0.68900015
## 18000 0.68900015
## 18001 0.50108945
## 18002 0.50108945
## 18003 0.50108945
## 18004 0.50108945
## 18005 0.50108945
## 18006 0.50108945
## 18007 0.50108945
## 18008 0.50108945
## 18009 0.50108945
## 18010 0.50108945
## 18011 0.50108945
## 18012 0.50108945
## 18013 0.50108945
## 18014 0.50108945
## 18015 0.50108945
## 18016 0.50108945
## 18017 1.60737127
## 18018 1.60737127
## 18019 1.60737127
## 18020 1.60737127
## 18021 1.60737127
## 18022 1.60737127
## 18023 1.60737127
## 18024 1.60737127
## 18025 1.60737127
## 18026 1.60737127
## 18027 1.60737127
## 18028 1.60737127
## 18029 1.60737127
## 18030 1.60737127
## 18031 1.60737127
## 18032 1.60737127
## 18033 0.28375911
## 18034 0.28375911
## 18035 0.28375911
## 18036 0.28375911
## 18037 0.28375911
## 18038 0.28375911
## 18039 0.28375911
## 18040 0.28375911
## 18041 0.28375911
## 18042 0.28375911
## 18043 0.28375911
## 18044 0.28375911
## 18045 0.28375911
## 18046 0.28375911
## 18047 0.28375911
## 18048 0.28375911
## 18049 0.52056000
## 18050 0.52056000
## 18051 0.52056000
## 18052 0.52056000
## 18053 0.52056000
## 18054 0.52056000
## 18055 0.52056000
## 18056 0.52056000
## 18057 0.52056000
## 18058 0.52056000
## 18059 0.52056000
## 18060 0.52056000
## 18061 0.52056000
## 18062 0.52056000
## 18063 0.52056000
## 18064 0.52056000
## 18065 1.15815278
## 18066 1.15815278
## 18067 1.15815278
## 18068 1.15815278
## 18069 1.15815278
## 18070 1.15815278
## 18071 1.15815278
## 18072 1.15815278
## 18073 1.15815278
## 18074 1.15815278
## 18075 1.15815278
## 18076 1.15815278
## 18077 1.15815278
## 18078 1.15815278
## 18079 1.15815278
## 18080 1.15815278
## 18081 0.69582329
## 18082 0.69582329
## 18083 0.69582329
## 18084 0.69582329
## 18085 0.69582329
## 18086 0.69582329
## 18087 0.69582329
## 18088 0.69582329
## 18089 0.69582329
## 18090 0.69582329
## 18091 0.69582329
## 18092 0.69582329
## 18093 0.69582329
## 18094 0.69582329
## 18095 0.69582329
## 18096 0.69582329
## 18097 1.21211125
## 18098 1.21211125
## 18099 1.21211125
## 18100 1.21211125
## 18101 1.21211125
## 18102 1.21211125
## 18103 1.21211125
## 18104 1.21211125
## 18105 1.21211125
## 18106 1.21211125
## 18107 1.21211125
## 18108 1.21211125
## 18109 1.21211125
## 18110 1.21211125
## 18111 1.21211125
## 18112 1.21211125
## 18113 0.47710586
## 18114 0.47710586
## 18115 0.47710586
## 18116 0.47710586
## 18117 0.47710586
## 18118 0.47710586
## 18119 0.47710586
## 18120 0.47710586
## 18121 0.47710586
## 18122 0.47710586
## 18123 0.47710586
## 18124 0.47710586
## 18125 0.47710586
## 18126 0.47710586
## 18127 0.47710586
## 18128 0.47710586
## 18129 1.27534488
## 18130 1.27534488
## 18131 1.27534488
## 18132 1.27534488
## 18133 1.27534488
## 18134 1.27534488
## 18135 1.27534488
## 18136 1.27534488
## 18137 1.27534488
## 18138 1.27534488
## 18139 1.27534488
## 18140 1.27534488
## 18141 1.27534488
## 18142 1.27534488
## 18143 1.27534488
## 18144 1.27534488
## 18145 0.25661663
## 18146 0.25661663
## 18147 0.25661663
## 18148 0.25661663
## 18149 0.25661663
## 18150 0.25661663
## 18151 0.25661663
## 18152 0.25661663
## 18153 0.25661663
## 18154 0.25661663
## 18155 0.25661663
## 18156 0.25661663
## 18157 0.25661663
## 18158 0.25661663
## 18159 0.25661663
## 18160 0.25661663
## 18161 1.02880344
## 18162 1.02880344
## 18163 1.02880344
## 18164 1.02880344
## 18165 1.02880344
## 18166 1.02880344
## 18167 1.02880344
## 18168 1.02880344
## 18169 1.02880344
## 18170 1.02880344
## 18171 1.02880344
## 18172 1.02880344
## 18173 1.02880344
## 18174 1.02880344
## 18175 1.02880344
## 18176 1.02880344
## 18177 4.14340942
## 18178 4.14340942
## 18179 4.14340942
## 18180 4.14340942
## 18181 4.14340942
## 18182 4.14340942
## 18183 4.14340942
## 18184 4.14340942
## 18185 4.14340942
## 18186 4.14340942
## 18187 4.14340942
## 18188 4.14340942
## 18189 4.14340942
## 18190 4.14340942
## 18191 4.14340942
## 18192 4.14340942
## 18193 0.41999627
## 18194 0.41999627
## 18195 0.41999627
## 18196 0.41999627
## 18197 0.41999627
## 18198 0.41999627
## 18199 0.41999627
## 18200 0.41999627
## 18201 0.41999627
## 18202 0.41999627
## 18203 0.41999627
## 18204 0.41999627
## 18205 0.41999627
## 18206 0.41999627
## 18207 0.41999627
## 18208 0.41999627
## 18209 5.94708076
## 18210 5.94708076
## 18211 5.94708076
## 18212 5.94708076
## 18213 5.94708076
## 18214 5.94708076
## 18215 5.94708076
## 18216 5.94708076
## 18217 5.94708076
## 18218 5.94708076
## 18219 5.94708076
## 18220 5.94708076
## 18221 5.94708076
## 18222 5.94708076
## 18223 5.94708076
## 18224 5.94708076
## 18225 0.71595532
## 18226 0.71595532
## 18227 0.71595532
## 18228 0.71595532
## 18229 0.71595532
## 18230 0.71595532
## 18231 0.71595532
## 18232 0.71595532
## 18233 0.71595532
## 18234 0.71595532
## 18235 0.71595532
## 18236 0.71595532
## 18237 0.71595532
## 18238 0.71595532
## 18239 0.71595532
## 18240 0.71595532
## 18241 0.41165107
## 18242 0.41165107
## 18243 0.41165107
## 18244 0.41165107
## 18245 0.41165107
## 18246 0.41165107
## 18247 0.41165107
## 18248 0.41165107
## 18249 0.41165107
## 18250 0.41165107
## 18251 0.41165107
## 18252 0.41165107
## 18253 0.41165107
## 18254 0.41165107
## 18255 0.41165107
## 18256 0.41165107
## 18257 0.69951725
## 18258 0.69951725
## 18259 0.69951725
## 18260 0.69951725
## 18261 0.69951725
## 18262 0.69951725
## 18263 0.69951725
## 18264 0.69951725
## 18265 0.69951725
## 18266 0.69951725
## 18267 0.69951725
## 18268 0.69951725
## 18269 0.69951725
## 18270 0.69951725
## 18271 0.69951725
## 18272 0.69951725
## 18273 1.76799702
## 18274 1.76799702
## 18275 1.76799702
## 18276 1.76799702
## 18277 1.76799702
## 18278 1.76799702
## 18279 1.76799702
## 18280 1.76799702
## 18281 1.76799702
## 18282 1.76799702
## 18283 1.76799702
## 18284 1.76799702
## 18285 1.76799702
## 18286 1.76799702
## 18287 1.76799702
## 18288 1.76799702
## 18289 0.37487968
## 18290 0.37487968
## 18291 0.37487968
## 18292 0.37487968
## 18293 0.37487968
## 18294 0.37487968
## 18295 0.37487968
## 18296 0.37487968
## 18297 0.37487968
## 18298 0.37487968
## 18299 0.37487968
## 18300 0.37487968
## 18301 0.37487968
## 18302 0.37487968
## 18303 0.37487968
## 18304 0.37487968
## 18305 0.82369255
## 18306 0.82369255
## 18307 0.82369255
## 18308 0.82369255
## 18309 0.82369255
## 18310 0.82369255
## 18311 0.82369255
## 18312 0.82369255
## 18313 0.82369255
## 18314 0.82369255
## 18315 0.82369255
## 18316 0.82369255
## 18317 0.82369255
## 18318 0.82369255
## 18319 0.82369255
## 18320 0.82369255
## 18321 0.15188087
## 18322 0.15188087
## 18323 0.15188087
## 18324 0.15188087
## 18325 0.15188087
## 18326 0.15188087
## 18327 0.15188087
## 18328 0.15188087
## 18329 0.15188087
## 18330 0.15188087
## 18331 0.15188087
## 18332 0.15188087
## 18333 0.15188087
## 18334 0.15188087
## 18335 0.15188087
## 18336 0.15188087
## 18337 0.96635728
## 18338 0.96635728
## 18339 0.96635728
## 18340 0.96635728
## 18341 0.96635728
## 18342 0.96635728
## 18343 0.96635728
## 18344 0.96635728
## 18345 0.96635728
## 18346 0.96635728
## 18347 0.96635728
## 18348 0.96635728
## 18349 0.96635728
## 18350 0.96635728
## 18351 0.96635728
## 18352 0.96635728
## 18353 1.68889568
## 18354 1.68889568
## 18355 1.68889568
## 18356 1.68889568
## 18357 1.68889568
## 18358 1.68889568
## 18359 1.68889568
## 18360 1.68889568
## 18361 1.68889568
## 18362 1.68889568
## 18363 1.68889568
## 18364 1.68889568
## 18365 1.68889568
## 18366 1.68889568
## 18367 1.68889568
## 18368 1.68889568
## 18369 1.25732597
## 18370 1.25732597
## 18371 1.25732597
## 18372 1.25732597
## 18373 1.25732597
## 18374 1.25732597
## 18375 1.25732597
## 18376 1.25732597
## 18377 1.25732597
## 18378 1.25732597
## 18379 1.25732597
## 18380 1.25732597
## 18381 1.25732597
## 18382 1.25732597
## 18383 1.25732597
## 18384 1.25732597
## 18385 1.06077848
## 18386 1.06077848
## 18387 1.06077848
## 18388 1.06077848
## 18389 1.06077848
## 18390 1.06077848
## 18391 1.06077848
## 18392 1.06077848
## 18393 1.06077848
## 18394 1.06077848
## 18395 1.06077848
## 18396 1.06077848
## 18397 1.06077848
## 18398 1.06077848
## 18399 1.06077848
## 18400 1.06077848
## 18401 1.79977698
## 18402 1.79977698
## 18403 1.79977698
## 18404 1.79977698
## 18405 1.79977698
## 18406 1.79977698
## 18407 1.79977698
## 18408 1.79977698
## 18409 1.79977698
## 18410 1.79977698
## 18411 1.79977698
## 18412 1.79977698
## 18413 1.79977698
## 18414 1.79977698
## 18415 1.79977698
## 18416 1.79977698
## 18417 0.75979162
## 18418 0.75979162
## 18419 0.75979162
## 18420 0.75979162
## 18421 0.75979162
## 18422 0.75979162
## 18423 0.75979162
## 18424 0.75979162
## 18425 0.75979162
## 18426 0.75979162
## 18427 0.75979162
## 18428 0.75979162
## 18429 0.75979162
## 18430 0.75979162
## 18431 0.75979162
## 18432 0.75979162
## 18433 0.60378051
## 18434 0.60378051
## 18435 0.60378051
## 18436 0.60378051
## 18437 0.60378051
## 18438 0.60378051
## 18439 0.60378051
## 18440 0.60378051
## 18441 0.60378051
## 18442 0.60378051
## 18443 0.60378051
## 18444 0.60378051
## 18445 0.60378051
## 18446 0.60378051
## 18447 0.60378051
## 18448 0.60378051
## 18449 1.41464534
## 18450 1.41464534
## 18451 1.41464534
## 18452 1.41464534
## 18453 1.41464534
## 18454 1.41464534
## 18455 1.41464534
## 18456 1.41464534
## 18457 1.41464534
## 18458 1.41464534
## 18459 1.41464534
## 18460 1.41464534
## 18461 1.41464534
## 18462 1.41464534
## 18463 1.41464534
## 18464 1.41464534
## 18465 0.27969059
## 18466 0.27969059
## 18467 0.27969059
## 18468 0.27969059
## 18469 0.27969059
## 18470 0.27969059
## 18471 0.27969059
## 18472 0.27969059
## 18473 0.27969059
## 18474 0.27969059
## 18475 0.27969059
## 18476 0.27969059
## 18477 0.27969059
## 18478 0.27969059
## 18479 0.27969059
## 18480 0.27969059
## 18481 0.83200575
## 18482 0.83200575
## 18483 0.83200575
## 18484 0.83200575
## 18485 0.83200575
## 18486 0.83200575
## 18487 0.83200575
## 18488 0.83200575
## 18489 0.83200575
## 18490 0.83200575
## 18491 0.83200575
## 18492 0.83200575
## 18493 0.83200575
## 18494 0.83200575
## 18495 0.83200575
## 18496 0.83200575
## 18497 0.67503564
## 18498 0.67503564
## 18499 0.67503564
## 18500 0.67503564
## 18501 0.67503564
## 18502 0.67503564
## 18503 0.67503564
## 18504 0.67503564
## 18505 0.67503564
## 18506 0.67503564
## 18507 0.67503564
## 18508 0.67503564
## 18509 0.67503564
## 18510 0.67503564
## 18511 0.67503564
## 18512 0.67503564
## 18513 0.32049681
## 18514 0.32049681
## 18515 0.32049681
## 18516 0.32049681
## 18517 0.32049681
## 18518 0.32049681
## 18519 0.32049681
## 18520 0.32049681
## 18521 0.32049681
## 18522 0.32049681
## 18523 0.32049681
## 18524 0.32049681
## 18525 0.32049681
## 18526 0.32049681
## 18527 0.32049681
## 18528 0.32049681
## 18529 1.24313695
## 18530 1.24313695
## 18531 1.24313695
## 18532 1.24313695
## 18533 1.24313695
## 18534 1.24313695
## 18535 1.24313695
## 18536 1.24313695
## 18537 1.24313695
## 18538 1.24313695
## 18539 1.24313695
## 18540 1.24313695
## 18541 1.24313695
## 18542 1.24313695
## 18543 1.24313695
## 18544 1.24313695
## 18545 0.21002987
## 18546 0.21002987
## 18547 0.21002987
## 18548 0.21002987
## 18549 0.21002987
## 18550 0.21002987
## 18551 0.21002987
## 18552 0.21002987
## 18553 0.21002987
## 18554 0.21002987
## 18555 0.21002987
## 18556 0.21002987
## 18557 0.21002987
## 18558 0.21002987
## 18559 0.21002987
## 18560 0.21002987
## 18561 0.70074115
## 18562 0.70074115
## 18563 0.70074115
## 18564 0.70074115
## 18565 0.70074115
## 18566 0.70074115
## 18567 0.70074115
## 18568 0.70074115
## 18569 0.70074115
## 18570 0.70074115
## 18571 0.70074115
## 18572 0.70074115
## 18573 0.70074115
## 18574 0.70074115
## 18575 0.70074115
## 18576 0.70074115
## 18577 0.66471983
## 18578 0.66471983
## 18579 0.66471983
## 18580 0.66471983
## 18581 0.66471983
## 18582 0.66471983
## 18583 0.66471983
## 18584 0.66471983
## 18585 0.66471983
## 18586 0.66471983
## 18587 0.66471983
## 18588 0.66471983
## 18589 0.66471983
## 18590 0.66471983
## 18591 0.66471983
## 18592 0.66471983
## 18593 0.01891362
## 18594 0.01891362
## 18595 0.01891362
## 18596 0.01891362
## 18597 0.01891362
## 18598 0.01891362
## 18599 0.01891362
## 18600 0.01891362
## 18601 0.01891362
## 18602 0.01891362
## 18603 0.01891362
## 18604 0.01891362
## 18605 0.01891362
## 18606 0.01891362
## 18607 0.01891362
## 18608 0.01891362
## 18609 0.77891665
## 18610 0.77891665
## 18611 0.77891665
## 18612 0.77891665
## 18613 0.77891665
## 18614 0.77891665
## 18615 0.77891665
## 18616 0.77891665
## 18617 0.77891665
## 18618 0.77891665
## 18619 0.77891665
## 18620 0.77891665
## 18621 0.77891665
## 18622 0.77891665
## 18623 0.77891665
## 18624 0.77891665
## 18625 1.22509686
## 18626 1.22509686
## 18627 1.22509686
## 18628 1.22509686
## 18629 1.22509686
## 18630 1.22509686
## 18631 1.22509686
## 18632 1.22509686
## 18633 1.22509686
## 18634 1.22509686
## 18635 1.22509686
## 18636 1.22509686
## 18637 1.22509686
## 18638 1.22509686
## 18639 1.22509686
## 18640 1.22509686
## 18641 0.44761221
## 18642 0.44761221
## 18643 0.44761221
## 18644 0.44761221
## 18645 0.44761221
## 18646 0.44761221
## 18647 0.44761221
## 18648 0.44761221
## 18649 0.44761221
## 18650 0.44761221
## 18651 0.44761221
## 18652 0.44761221
## 18653 0.44761221
## 18654 0.44761221
## 18655 0.44761221
## 18656 0.44761221
## 18657 0.36653720
## 18658 0.36653720
## 18659 0.36653720
## 18660 0.36653720
## 18661 0.36653720
## 18662 0.36653720
## 18663 0.36653720
## 18664 0.36653720
## 18665 0.36653720
## 18666 0.36653720
## 18667 0.36653720
## 18668 0.36653720
## 18669 0.36653720
## 18670 0.36653720
## 18671 0.36653720
## 18672 0.36653720
## 18673 1.21965996
## 18674 1.21965996
## 18675 1.21965996
## 18676 1.21965996
## 18677 1.21965996
## 18678 1.21965996
## 18679 1.21965996
## 18680 1.21965996
## 18681 1.21965996
## 18682 1.21965996
## 18683 1.21965996
## 18684 1.21965996
## 18685 1.21965996
## 18686 1.21965996
## 18687 1.21965996
## 18688 1.21965996
## 18689 0.68215379
## 18690 0.68215379
## 18691 0.68215379
## 18692 0.68215379
## 18693 0.68215379
## 18694 0.68215379
## 18695 0.68215379
## 18696 0.68215379
## 18697 0.68215379
## 18698 0.68215379
## 18699 0.68215379
## 18700 0.68215379
## 18701 0.68215379
## 18702 0.68215379
## 18703 0.68215379
## 18704 0.68215379
## 18705 0.03907561
## 18706 0.03907561
## 18707 0.03907561
## 18708 0.03907561
## 18709 0.03907561
## 18710 0.03907561
## 18711 0.03907561
## 18712 0.03907561
## 18713 0.03907561
## 18714 0.03907561
## 18715 0.03907561
## 18716 0.03907561
## 18717 0.03907561
## 18718 0.03907561
## 18719 0.03907561
## 18720 0.03907561
## 18721 0.79611230
## 18722 0.79611230
## 18723 0.79611230
## 18724 0.79611230
## 18725 0.79611230
## 18726 0.79611230
## 18727 0.79611230
## 18728 0.79611230
## 18729 0.79611230
## 18730 0.79611230
## 18731 0.79611230
## 18732 0.79611230
## 18733 0.79611230
## 18734 0.79611230
## 18735 0.79611230
## 18736 0.79611230
## 18737 0.15410010
## 18738 0.15410010
## 18739 0.15410010
## 18740 0.15410010
## 18741 0.15410010
## 18742 0.15410010
## 18743 0.15410010
## 18744 0.15410010
## 18745 0.15410010
## 18746 0.15410010
## 18747 0.15410010
## 18748 0.15410010
## 18749 0.15410010
## 18750 0.15410010
## 18751 0.15410010
## 18752 0.15410010
## 18753 0.82331020
## 18754 0.82331020
## 18755 0.82331020
## 18756 0.82331020
## 18757 0.82331020
## 18758 0.82331020
## 18759 0.82331020
## 18760 0.82331020
## 18761 0.82331020
## 18762 0.82331020
## 18763 0.82331020
## 18764 0.82331020
## 18765 0.82331020
## 18766 0.82331020
## 18767 0.82331020
## 18768 0.82331020
## 18769 0.10588323
## 18770 0.10588323
## 18771 0.10588323
## 18772 0.10588323
## 18773 0.10588323
## 18774 0.10588323
## 18775 0.10588323
## 18776 0.10588323
## 18777 0.10588323
## 18778 0.10588323
## 18779 0.10588323
## 18780 0.10588323
## 18781 0.10588323
## 18782 0.10588323
## 18783 0.10588323
## 18784 0.10588323
## 18785 0.64893957
## 18786 0.64893957
## 18787 0.64893957
## 18788 0.64893957
## 18789 0.64893957
## 18790 0.64893957
## 18791 0.64893957
## 18792 0.64893957
## 18793 0.64893957
## 18794 0.64893957
## 18795 0.64893957
## 18796 0.64893957
## 18797 0.64893957
## 18798 0.64893957
## 18799 0.64893957
## 18800 0.64893957
## 18801 0.40726991
## 18802 0.40726991
## 18803 0.40726991
## 18804 0.40726991
## 18805 0.40726991
## 18806 0.40726991
## 18807 0.40726991
## 18808 0.40726991
## 18809 0.40726991
## 18810 0.40726991
## 18811 0.40726991
## 18812 0.40726991
## 18813 0.40726991
## 18814 0.40726991
## 18815 0.40726991
## 18816 0.40726991
## 18817 0.31069502
## 18818 0.31069502
## 18819 0.31069502
## 18820 0.31069502
## 18821 0.31069502
## 18822 0.31069502
## 18823 0.31069502
## 18824 0.31069502
## 18825 0.31069502
## 18826 0.31069502
## 18827 0.31069502
## 18828 0.31069502
## 18829 0.31069502
## 18830 0.31069502
## 18831 0.31069502
## 18832 0.31069502
## 18833 0.11448631
## 18834 0.11448631
## 18835 0.11448631
## 18836 0.11448631
## 18837 0.11448631
## 18838 0.11448631
## 18839 0.11448631
## 18840 0.11448631
## 18841 0.11448631
## 18842 0.11448631
## 18843 0.11448631
## 18844 0.11448631
## 18845 0.11448631
## 18846 0.11448631
## 18847 0.11448631
## 18848 0.11448631
## 18849 0.16403546
## 18850 0.16403546
## 18851 0.16403546
## 18852 0.16403546
## 18853 0.16403546
## 18854 0.16403546
## 18855 0.16403546
## 18856 0.16403546
## 18857 0.16403546
## 18858 0.16403546
## 18859 0.16403546
## 18860 0.16403546
## 18861 0.16403546
## 18862 0.16403546
## 18863 0.16403546
## 18864 0.16403546
## 18865 0.36332226
## 18866 0.36332226
## 18867 0.36332226
## 18868 0.36332226
## 18869 0.36332226
## 18870 0.36332226
## 18871 0.36332226
## 18872 0.36332226
## 18873 0.36332226
## 18874 0.36332226
## 18875 0.36332226
## 18876 0.36332226
## 18877 0.36332226
## 18878 0.36332226
## 18879 0.36332226
## 18880 0.36332226
## 18881 1.41091965
## 18882 1.41091965
## 18883 1.41091965
## 18884 1.41091965
## 18885 1.41091965
## 18886 1.41091965
## 18887 1.41091965
## 18888 1.41091965
## 18889 1.41091965
## 18890 1.41091965
## 18891 1.41091965
## 18892 1.41091965
## 18893 1.41091965
## 18894 1.41091965
## 18895 1.41091965
## 18896 1.41091965
## 18897 4.07881785
## 18898 4.07881785
## 18899 4.07881785
## 18900 4.07881785
## 18901 4.07881785
## 18902 4.07881785
## 18903 4.07881785
## 18904 4.07881785
## 18905 4.07881785
## 18906 4.07881785
## 18907 4.07881785
## 18908 4.07881785
## 18909 4.07881785
## 18910 4.07881785
## 18911 4.07881785
## 18912 4.07881785
## 18913 0.22009835
## 18914 0.22009835
## 18915 0.22009835
## 18916 0.22009835
## 18917 0.22009835
## 18918 0.22009835
## 18919 0.22009835
## 18920 0.22009835
## 18921 0.22009835
## 18922 0.22009835
## 18923 0.22009835
## 18924 0.22009835
## 18925 0.22009835
## 18926 0.22009835
## 18927 0.22009835
## 18928 0.22009835
## 18929 1.93606673
## 18930 1.93606673
## 18931 1.93606673
## 18932 1.93606673
## 18933 1.93606673
## 18934 1.93606673
## 18935 1.93606673
## 18936 1.93606673
## 18937 1.93606673
## 18938 1.93606673
## 18939 1.93606673
## 18940 1.93606673
## 18941 1.93606673
## 18942 1.93606673
## 18943 1.93606673
## 18944 1.93606673
## 18945 1.88062801
## 18946 1.88062801
## 18947 1.88062801
## 18948 1.88062801
## 18949 1.88062801
## 18950 1.88062801
## 18951 1.88062801
## 18952 1.88062801
## 18953 1.88062801
## 18954 1.88062801
## 18955 1.88062801
## 18956 1.88062801
## 18957 1.88062801
## 18958 1.88062801
## 18959 1.88062801
## 18960 1.88062801
## 18961 0.29348833
## 18962 0.29348833
## 18963 0.29348833
## 18964 0.29348833
## 18965 0.29348833
## 18966 0.29348833
## 18967 0.29348833
## 18968 0.29348833
## 18969 0.29348833
## 18970 0.29348833
## 18971 0.29348833
## 18972 0.29348833
## 18973 0.29348833
## 18974 0.29348833
## 18975 0.29348833
## 18976 0.29348833
## 18977 0.04087720
## 18978 0.04087720
## 18979 0.04087720
## 18980 0.04087720
## 18981 0.04087720
## 18982 0.04087720
## 18983 0.04087720
## 18984 0.04087720
## 18985 0.04087720
## 18986 0.04087720
## 18987 0.04087720
## 18988 0.04087720
## 18989 0.04087720
## 18990 0.04087720
## 18991 0.04087720
## 18992 0.04087720
## 18993 0.34284861
## 18994 0.34284861
## 18995 0.34284861
## 18996 0.34284861
## 18997 0.34284861
## 18998 0.34284861
## 18999 0.34284861
## 19000 0.34284861
## 19001 0.34284861
## 19002 0.34284861
## 19003 0.34284861
## 19004 0.34284861
## 19005 0.34284861
## 19006 0.34284861
## 19007 0.34284861
## 19008 0.34284861
## 19009 1.27307910
## 19010 1.27307910
## 19011 1.27307910
## 19012 1.27307910
## 19013 1.27307910
## 19014 1.27307910
## 19015 1.27307910
## 19016 1.27307910
## 19017 1.27307910
## 19018 1.27307910
## 19019 1.27307910
## 19020 1.27307910
## 19021 1.27307910
## 19022 1.27307910
## 19023 1.27307910
## 19024 1.27307910
## 19025 0.30619367
## 19026 0.30619367
## 19027 0.30619367
## 19028 0.30619367
## 19029 0.30619367
## 19030 0.30619367
## 19031 0.30619367
## 19032 0.30619367
## 19033 0.30619367
## 19034 0.30619367
## 19035 0.30619367
## 19036 0.30619367
## 19037 0.30619367
## 19038 0.30619367
## 19039 0.30619367
## 19040 0.30619367
## 19041 0.15412409
## 19042 0.15412409
## 19043 0.15412409
## 19044 0.15412409
## 19045 0.15412409
## 19046 0.15412409
## 19047 0.15412409
## 19048 0.15412409
## 19049 0.15412409
## 19050 0.15412409
## 19051 0.15412409
## 19052 0.15412409
## 19053 0.15412409
## 19054 0.15412409
## 19055 0.15412409
## 19056 0.15412409
## 19057 0.10367099
## 19058 0.10367099
## 19059 0.10367099
## 19060 0.10367099
## 19061 0.10367099
## 19062 0.10367099
## 19063 0.10367099
## 19064 0.10367099
## 19065 0.10367099
## 19066 0.10367099
## 19067 0.10367099
## 19068 0.10367099
## 19069 0.10367099
## 19070 0.10367099
## 19071 0.10367099
## 19072 0.10367099
## 19073 0.61601523
## 19074 0.61601523
## 19075 0.61601523
## 19076 0.61601523
## 19077 0.61601523
## 19078 0.61601523
## 19079 0.61601523
## 19080 0.61601523
## 19081 0.61601523
## 19082 0.61601523
## 19083 0.61601523
## 19084 0.61601523
## 19085 0.61601523
## 19086 0.61601523
## 19087 0.61601523
## 19088 0.61601523
## 19089 0.76523582
## 19090 0.76523582
## 19091 0.76523582
## 19092 0.76523582
## 19093 0.76523582
## 19094 0.76523582
## 19095 0.76523582
## 19096 0.76523582
## 19097 0.76523582
## 19098 0.76523582
## 19099 0.76523582
## 19100 0.76523582
## 19101 0.76523582
## 19102 0.76523582
## 19103 0.76523582
## 19104 0.76523582
## 19105 0.57413168
## 19106 0.57413168
## 19107 0.57413168
## 19108 0.57413168
## 19109 0.57413168
## 19110 0.57413168
## 19111 0.57413168
## 19112 0.57413168
## 19113 0.57413168
## 19114 0.57413168
## 19115 0.57413168
## 19116 0.57413168
## 19117 0.57413168
## 19118 0.57413168
## 19119 0.57413168
## 19120 0.57413168
## 19121 0.96950841
## 19122 0.96950841
## 19123 0.96950841
## 19124 0.96950841
## 19125 0.96950841
## 19126 0.96950841
## 19127 0.96950841
## 19128 0.96950841
## 19129 0.96950841
## 19130 0.96950841
## 19131 0.96950841
## 19132 0.96950841
## 19133 0.96950841
## 19134 0.96950841
## 19135 0.96950841
## 19136 0.96950841
## 19137 0.47387415
## 19138 0.47387415
## 19139 0.47387415
## 19140 0.47387415
## 19141 0.47387415
## 19142 0.47387415
## 19143 0.47387415
## 19144 0.47387415
## 19145 0.47387415
## 19146 0.47387415
## 19147 0.47387415
## 19148 0.47387415
## 19149 0.47387415
## 19150 0.47387415
## 19151 0.47387415
## 19152 0.47387415
## 19153 6.14341677
## 19154 6.14341677
## 19155 6.14341677
## 19156 6.14341677
## 19157 6.14341677
## 19158 6.14341677
## 19159 6.14341677
## 19160 6.14341677
## 19161 6.14341677
## 19162 6.14341677
## 19163 6.14341677
## 19164 6.14341677
## 19165 6.14341677
## 19166 6.14341677
## 19167 6.14341677
## 19168 6.14341677
## 19169 1.12800227
## 19170 1.12800227
## 19171 1.12800227
## 19172 1.12800227
## 19173 1.12800227
## 19174 1.12800227
## 19175 1.12800227
## 19176 1.12800227
## 19177 1.12800227
## 19178 1.12800227
## 19179 1.12800227
## 19180 1.12800227
## 19181 1.12800227
## 19182 1.12800227
## 19183 1.12800227
## 19184 1.12800227
## 19185 0.65765265
## 19186 0.65765265
## 19187 0.65765265
## 19188 0.65765265
## 19189 0.65765265
## 19190 0.65765265
## 19191 0.65765265
## 19192 0.65765265
## 19193 0.65765265
## 19194 0.65765265
## 19195 0.65765265
## 19196 0.65765265
## 19197 0.65765265
## 19198 0.65765265
## 19199 0.65765265
## 19200 0.65765265
## 19201 0.08145735
## 19202 0.08145735
## 19203 0.08145735
## 19204 0.08145735
## 19205 0.08145735
## 19206 0.08145735
## 19207 0.08145735
## 19208 0.08145735
## 19209 0.08145735
## 19210 0.08145735
## 19211 0.08145735
## 19212 0.08145735
## 19213 0.08145735
## 19214 0.08145735
## 19215 0.08145735
## 19216 0.08145735
## 19217 0.08424302
## 19218 0.08424302
## 19219 0.08424302
## 19220 0.08424302
## 19221 0.08424302
## 19222 0.08424302
## 19223 0.08424302
## 19224 0.08424302
## 19225 0.08424302
## 19226 0.08424302
## 19227 0.08424302
## 19228 0.08424302
## 19229 0.08424302
## 19230 0.08424302
## 19231 0.08424302
## 19232 0.08424302
## 19233 0.87634529
## 19234 0.87634529
## 19235 0.87634529
## 19236 0.87634529
## 19237 0.87634529
## 19238 0.87634529
## 19239 0.87634529
## 19240 0.87634529
## 19241 0.87634529
## 19242 0.87634529
## 19243 0.87634529
## 19244 0.87634529
## 19245 0.87634529
## 19246 0.87634529
## 19247 0.87634529
## 19248 0.87634529
## 19249 0.11273557
## 19250 0.11273557
## 19251 0.11273557
## 19252 0.11273557
## 19253 0.11273557
## 19254 0.11273557
## 19255 0.11273557
## 19256 0.11273557
## 19257 0.11273557
## 19258 0.11273557
## 19259 0.11273557
## 19260 0.11273557
## 19261 0.11273557
## 19262 0.11273557
## 19263 0.11273557
## 19264 0.11273557
## 19265 0.42651109
## 19266 0.42651109
## 19267 0.42651109
## 19268 0.42651109
## 19269 0.42651109
## 19270 0.42651109
## 19271 0.42651109
## 19272 0.42651109
## 19273 0.42651109
## 19274 0.42651109
## 19275 0.42651109
## 19276 0.42651109
## 19277 0.42651109
## 19278 0.42651109
## 19279 0.42651109
## 19280 0.42651109
## 19281 0.62549764
## 19282 0.62549764
## 19283 0.62549764
## 19284 0.62549764
## 19285 0.62549764
## 19286 0.62549764
## 19287 0.62549764
## 19288 0.62549764
## 19289 0.62549764
## 19290 0.62549764
## 19291 0.62549764
## 19292 0.62549764
## 19293 0.62549764
## 19294 0.62549764
## 19295 0.62549764
## 19296 0.62549764
## 19297 0.13627120
## 19298 0.13627120
## 19299 0.13627120
## 19300 0.13627120
## 19301 0.13627120
## 19302 0.13627120
## 19303 0.13627120
## 19304 0.13627120
## 19305 0.13627120
## 19306 0.13627120
## 19307 0.13627120
## 19308 0.13627120
## 19309 0.13627120
## 19310 0.13627120
## 19311 0.13627120
## 19312 0.13627120
## 19313 0.20254917
## 19314 0.20254917
## 19315 0.20254917
## 19316 0.20254917
## 19317 0.20254917
## 19318 0.20254917
## 19319 0.20254917
## 19320 0.20254917
## 19321 0.20254917
## 19322 0.20254917
## 19323 0.20254917
## 19324 0.20254917
## 19325 0.20254917
## 19326 0.20254917
## 19327 0.20254917
## 19328 0.20254917
## 19329 0.48986105
## 19330 0.48986105
## 19331 0.48986105
## 19332 0.48986105
## 19333 0.48986105
## 19334 0.48986105
## 19335 0.48986105
## 19336 0.48986105
## 19337 0.48986105
## 19338 0.48986105
## 19339 0.48986105
## 19340 0.48986105
## 19341 0.48986105
## 19342 0.48986105
## 19343 0.48986105
## 19344 0.48986105
## 19345 1.12402116
## 19346 1.12402116
## 19347 1.12402116
## 19348 1.12402116
## 19349 1.12402116
## 19350 1.12402116
## 19351 1.12402116
## 19352 1.12402116
## 19353 1.12402116
## 19354 1.12402116
## 19355 1.12402116
## 19356 1.12402116
## 19357 1.12402116
## 19358 1.12402116
## 19359 1.12402116
## 19360 1.12402116
## 19361 1.44952467
## 19362 1.44952467
## 19363 1.44952467
## 19364 1.44952467
## 19365 1.44952467
## 19366 1.44952467
## 19367 1.44952467
## 19368 1.44952467
## 19369 1.44952467
## 19370 1.44952467
## 19371 1.44952467
## 19372 1.44952467
## 19373 1.44952467
## 19374 1.44952467
## 19375 1.44952467
## 19376 1.44952467
## 19377 0.11241355
## 19378 0.11241355
## 19379 0.11241355
## 19380 0.11241355
## 19381 0.11241355
## 19382 0.11241355
## 19383 0.11241355
## 19384 0.11241355
## 19385 0.11241355
## 19386 0.11241355
## 19387 0.11241355
## 19388 0.11241355
## 19389 0.11241355
## 19390 0.11241355
## 19391 0.11241355
## 19392 0.11241355
## 19393 0.17084890
## 19394 0.17084890
## 19395 0.17084890
## 19396 0.17084890
## 19397 0.17084890
## 19398 0.17084890
## 19399 0.17084890
## 19400 0.17084890
## 19401 0.17084890
## 19402 0.17084890
## 19403 0.17084890
## 19404 0.17084890
## 19405 0.17084890
## 19406 0.17084890
## 19407 0.17084890
## 19408 0.17084890
## 19409 0.37867906
## 19410 0.37867906
## 19411 0.37867906
## 19412 0.37867906
## 19413 0.37867906
## 19414 0.37867906
## 19415 0.37867906
## 19416 0.37867906
## 19417 0.37867906
## 19418 0.37867906
## 19419 0.37867906
## 19420 0.37867906
## 19421 0.37867906
## 19422 0.37867906
## 19423 0.37867906
## 19424 0.37867906
## 19425 0.11226815
## 19426 0.11226815
## 19427 0.11226815
## 19428 0.11226815
## 19429 0.11226815
## 19430 0.11226815
## 19431 0.11226815
## 19432 0.11226815
## 19433 0.11226815
## 19434 0.11226815
## 19435 0.11226815
## 19436 0.11226815
## 19437 0.11226815
## 19438 0.11226815
## 19439 0.11226815
## 19440 0.11226815
## 19441 0.61656572
## 19442 0.61656572
## 19443 0.61656572
## 19444 0.61656572
## 19445 0.61656572
## 19446 0.61656572
## 19447 0.61656572
## 19448 0.61656572
## 19449 0.61656572
## 19450 0.61656572
## 19451 0.61656572
## 19452 0.61656572
## 19453 0.61656572
## 19454 0.61656572
## 19455 0.61656572
## 19456 0.61656572
## 19457 0.19426001
## 19458 0.19426001
## 19459 0.19426001
## 19460 0.19426001
## 19461 0.19426001
## 19462 0.19426001
## 19463 0.19426001
## 19464 0.19426001
## 19465 0.19426001
## 19466 0.19426001
## 19467 0.19426001
## 19468 0.19426001
## 19469 0.19426001
## 19470 0.19426001
## 19471 0.19426001
## 19472 0.19426001
## 19473 2.07352749
## 19474 2.07352749
## 19475 2.07352749
## 19476 2.07352749
## 19477 2.07352749
## 19478 2.07352749
## 19479 2.07352749
## 19480 2.07352749
## 19481 2.07352749
## 19482 2.07352749
## 19483 2.07352749
## 19484 2.07352749
## 19485 2.07352749
## 19486 2.07352749
## 19487 2.07352749
## 19488 2.07352749
## 19489 0.14105429
## 19490 0.14105429
## 19491 0.14105429
## 19492 0.14105429
## 19493 0.14105429
## 19494 0.14105429
## 19495 0.14105429
## 19496 0.14105429
## 19497 0.14105429
## 19498 0.14105429
## 19499 0.14105429
## 19500 0.14105429
## 19501 0.14105429
## 19502 0.14105429
## 19503 0.14105429
## 19504 0.14105429
## 19505 0.18948142
## 19506 0.18948142
## 19507 0.18948142
## 19508 0.18948142
## 19509 0.18948142
## 19510 0.18948142
## 19511 0.18948142
## 19512 0.18948142
## 19513 0.18948142
## 19514 0.18948142
## 19515 0.18948142
## 19516 0.18948142
## 19517 0.18948142
## 19518 0.18948142
## 19519 0.18948142
## 19520 0.18948142
## 19521 0.40126103
## 19522 0.40126103
## 19523 0.40126103
## 19524 0.40126103
## 19525 0.40126103
## 19526 0.40126103
## 19527 0.40126103
## 19528 0.40126103
## 19529 0.40126103
## 19530 0.40126103
## 19531 0.40126103
## 19532 0.40126103
## 19533 0.40126103
## 19534 0.40126103
## 19535 0.40126103
## 19536 0.40126103
## 19537 0.17039399
## 19538 0.17039399
## 19539 0.17039399
## 19540 0.17039399
## 19541 0.17039399
## 19542 0.17039399
## 19543 0.17039399
## 19544 0.17039399
## 19545 0.17039399
## 19546 0.17039399
## 19547 0.17039399
## 19548 0.17039399
## 19549 0.17039399
## 19550 0.17039399
## 19551 0.17039399
## 19552 0.17039399
## 19553 1.27197540
## 19554 1.27197540
## 19555 1.27197540
## 19556 1.27197540
## 19557 1.27197540
## 19558 1.27197540
## 19559 1.27197540
## 19560 1.27197540
## 19561 1.27197540
## 19562 1.27197540
## 19563 1.27197540
## 19564 1.27197540
## 19565 1.27197540
## 19566 1.27197540
## 19567 1.27197540
## 19568 1.27197540
## 19569 3.04032026
## 19570 3.04032026
## 19571 3.04032026
## 19572 3.04032026
## 19573 3.04032026
## 19574 3.04032026
## 19575 3.04032026
## 19576 3.04032026
## 19577 3.04032026
## 19578 3.04032026
## 19579 3.04032026
## 19580 3.04032026
## 19581 3.04032026
## 19582 3.04032026
## 19583 3.04032026
## 19584 3.04032026
## 19585 0.82464689
## 19586 0.82464689
## 19587 0.82464689
## 19588 0.82464689
## 19589 0.82464689
## 19590 0.82464689
## 19591 0.82464689
## 19592 0.82464689
## 19593 0.82464689
## 19594 0.82464689
## 19595 0.82464689
## 19596 0.82464689
## 19597 0.82464689
## 19598 0.82464689
## 19599 0.82464689
## 19600 0.82464689
## 19601 0.12137589
## 19602 0.12137589
## 19603 0.12137589
## 19604 0.12137589
## 19605 0.12137589
## 19606 0.12137589
## 19607 0.12137589
## 19608 0.12137589
## 19609 0.12137589
## 19610 0.12137589
## 19611 0.12137589
## 19612 0.12137589
## 19613 0.12137589
## 19614 0.12137589
## 19615 0.12137589
## 19616 0.12137589
## 19617 0.73760258
## 19618 0.73760258
## 19619 0.73760258
## 19620 0.73760258
## 19621 0.73760258
## 19622 0.73760258
## 19623 0.73760258
## 19624 0.73760258
## 19625 0.73760258
## 19626 0.73760258
## 19627 0.73760258
## 19628 0.73760258
## 19629 0.73760258
## 19630 0.73760258
## 19631 0.73760258
## 19632 0.73760258
## 19633 0.61326551
## 19634 0.61326551
## 19635 0.61326551
## 19636 0.61326551
## 19637 0.61326551
## 19638 0.61326551
## 19639 0.61326551
## 19640 0.61326551
## 19641 0.61326551
## 19642 0.61326551
## 19643 0.61326551
## 19644 0.61326551
## 19645 0.61326551
## 19646 0.61326551
## 19647 0.61326551
## 19648 0.61326551
## 19649 0.13150860
## 19650 0.13150860
## 19651 0.13150860
## 19652 0.13150860
## 19653 0.13150860
## 19654 0.13150860
## 19655 0.13150860
## 19656 0.13150860
## 19657 0.13150860
## 19658 0.13150860
## 19659 0.13150860
## 19660 0.13150860
## 19661 0.13150860
## 19662 0.13150860
## 19663 0.13150860
## 19664 0.13150860
## 19665 0.60779951
## 19666 0.60779951
## 19667 0.60779951
## 19668 0.60779951
## 19669 0.60779951
## 19670 0.60779951
## 19671 0.60779951
## 19672 0.60779951
## 19673 0.60779951
## 19674 0.60779951
## 19675 0.60779951
## 19676 0.60779951
## 19677 0.60779951
## 19678 0.60779951
## 19679 0.60779951
## 19680 0.60779951
## 19681 0.08747628
## 19682 0.08747628
## 19683 0.08747628
## 19684 0.08747628
## 19685 0.08747628
## 19686 0.08747628
## 19687 0.08747628
## 19688 0.08747628
## 19689 0.08747628
## 19690 0.08747628
## 19691 0.08747628
## 19692 0.08747628
## 19693 0.08747628
## 19694 0.08747628
## 19695 0.08747628
## 19696 0.08747628
## 19697 1.38043769
## 19698 1.38043769
## 19699 1.38043769
## 19700 1.38043769
## 19701 1.38043769
## 19702 1.38043769
## 19703 1.38043769
## 19704 1.38043769
## 19705 1.38043769
## 19706 1.38043769
## 19707 1.38043769
## 19708 1.38043769
## 19709 1.38043769
## 19710 1.38043769
## 19711 1.38043769
## 19712 1.38043769
## 19713 0.99484042
## 19714 0.99484042
## 19715 0.99484042
## 19716 0.99484042
## 19717 0.99484042
## 19718 0.99484042
## 19719 0.99484042
## 19720 0.99484042
## 19721 0.99484042
## 19722 0.99484042
## 19723 0.99484042
## 19724 0.99484042
## 19725 0.99484042
## 19726 0.99484042
## 19727 0.99484042
## 19728 0.99484042
## 19729 0.41150830
## 19730 0.41150830
## 19731 0.41150830
## 19732 0.41150830
## 19733 0.41150830
## 19734 0.41150830
## 19735 0.41150830
## 19736 0.41150830
## 19737 0.41150830
## 19738 0.41150830
## 19739 0.41150830
## 19740 0.41150830
## 19741 0.41150830
## 19742 0.41150830
## 19743 0.41150830
## 19744 0.41150830
## 19745 0.54207859
## 19746 0.54207859
## 19747 0.54207859
## 19748 0.54207859
## 19749 0.54207859
## 19750 0.54207859
## 19751 0.54207859
## 19752 0.54207859
## 19753 0.54207859
## 19754 0.54207859
## 19755 0.54207859
## 19756 0.54207859
## 19757 0.54207859
## 19758 0.54207859
## 19759 0.54207859
## 19760 0.54207859
## 19761 0.78944939
## 19762 0.78944939
## 19763 0.78944939
## 19764 0.78944939
## 19765 0.78944939
## 19766 0.78944939
## 19767 0.78944939
## 19768 0.78944939
## 19769 0.78944939
## 19770 0.78944939
## 19771 0.78944939
## 19772 0.78944939
## 19773 0.78944939
## 19774 0.78944939
## 19775 0.78944939
## 19776 0.78944939
## 19777 0.88320889
## 19778 0.88320889
## 19779 0.88320889
## 19780 0.88320889
## 19781 0.88320889
## 19782 0.88320889
## 19783 0.88320889
## 19784 0.88320889
## 19785 0.88320889
## 19786 0.88320889
## 19787 0.88320889
## 19788 0.88320889
## 19789 0.88320889
## 19790 0.88320889
## 19791 0.88320889
## 19792 0.88320889
## 19793 0.71952939
## 19794 0.71952939
## 19795 0.71952939
## 19796 0.71952939
## 19797 0.71952939
## 19798 0.71952939
## 19799 0.71952939
## 19800 0.71952939
## 19801 0.71952939
## 19802 0.71952939
## 19803 0.71952939
## 19804 0.71952939
## 19805 0.71952939
## 19806 0.71952939
## 19807 0.71952939
## 19808 0.71952939
## 19809 1.32799815
## 19810 1.32799815
## 19811 1.32799815
## 19812 1.32799815
## 19813 1.32799815
## 19814 1.32799815
## 19815 1.32799815
## 19816 1.32799815
## 19817 1.32799815
## 19818 1.32799815
## 19819 1.32799815
## 19820 1.32799815
## 19821 1.32799815
## 19822 1.32799815
## 19823 1.32799815
## 19824 1.32799815
## 19825 0.39859880
## 19826 0.39859880
## 19827 0.39859880
## 19828 0.39859880
## 19829 0.39859880
## 19830 0.39859880
## 19831 0.39859880
## 19832 0.39859880
## 19833 0.39859880
## 19834 0.39859880
## 19835 0.39859880
## 19836 0.39859880
## 19837 0.39859880
## 19838 0.39859880
## 19839 0.39859880
## 19840 0.39859880
## 19841 0.39901237
## 19842 0.39901237
## 19843 0.39901237
## 19844 0.39901237
## 19845 0.39901237
## 19846 0.39901237
## 19847 0.39901237
## 19848 0.39901237
## 19849 0.39901237
## 19850 0.39901237
## 19851 0.39901237
## 19852 0.39901237
## 19853 0.39901237
## 19854 0.39901237
## 19855 0.39901237
## 19856 0.39901237
## 19857 0.39315050
## 19858 0.39315050
## 19859 0.39315050
## 19860 0.39315050
## 19861 0.39315050
## 19862 0.39315050
## 19863 0.39315050
## 19864 0.39315050
## 19865 0.39315050
## 19866 0.39315050
## 19867 0.39315050
## 19868 0.39315050
## 19869 0.39315050
## 19870 0.39315050
## 19871 0.39315050
## 19872 0.39315050
## 19873 0.27065242
## 19874 0.27065242
## 19875 0.27065242
## 19876 0.27065242
## 19877 0.27065242
## 19878 0.27065242
## 19879 0.27065242
## 19880 0.27065242
## 19881 0.27065242
## 19882 0.27065242
## 19883 0.27065242
## 19884 0.27065242
## 19885 0.27065242
## 19886 0.27065242
## 19887 0.27065242
## 19888 0.27065242
## 19889 0.11399488
## 19890 0.11399488
## 19891 0.11399488
## 19892 0.11399488
## 19893 0.11399488
## 19894 0.11399488
## 19895 0.11399488
## 19896 0.11399488
## 19897 0.11399488
## 19898 0.11399488
## 19899 0.11399488
## 19900 0.11399488
## 19901 0.11399488
## 19902 0.11399488
## 19903 0.11399488
## 19904 0.11399488
## 19905 0.86853169
## 19906 0.86853169
## 19907 0.86853169
## 19908 0.86853169
## 19909 0.86853169
## 19910 0.86853169
## 19911 0.86853169
## 19912 0.86853169
## 19913 0.86853169
## 19914 0.86853169
## 19915 0.86853169
## 19916 0.86853169
## 19917 0.86853169
## 19918 0.86853169
## 19919 0.86853169
## 19920 0.86853169
## 19921 1.24505446
## 19922 1.24505446
## 19923 1.24505446
## 19924 1.24505446
## 19925 1.24505446
## 19926 1.24505446
## 19927 1.24505446
## 19928 1.24505446
## 19929 1.24505446
## 19930 1.24505446
## 19931 1.24505446
## 19932 1.24505446
## 19933 1.24505446
## 19934 1.24505446
## 19935 1.24505446
## 19936 1.24505446
## 19937 0.81325079
## 19938 0.81325079
## 19939 0.81325079
## 19940 0.81325079
## 19941 0.81325079
## 19942 0.81325079
## 19943 0.81325079
## 19944 0.81325079
## 19945 0.81325079
## 19946 0.81325079
## 19947 0.81325079
## 19948 0.81325079
## 19949 0.81325079
## 19950 0.81325079
## 19951 0.81325079
## 19952 0.81325079
## 19953 3.18024494
## 19954 3.18024494
## 19955 3.18024494
## 19956 3.18024494
## 19957 3.18024494
## 19958 3.18024494
## 19959 3.18024494
## 19960 3.18024494
## 19961 3.18024494
## 19962 3.18024494
## 19963 3.18024494
## 19964 3.18024494
## 19965 3.18024494
## 19966 3.18024494
## 19967 3.18024494
## 19968 3.18024494
## 19969 1.28349516
## 19970 1.28349516
## 19971 1.28349516
## 19972 1.28349516
## 19973 1.28349516
## 19974 1.28349516
## 19975 1.28349516
## 19976 1.28349516
## 19977 1.28349516
## 19978 1.28349516
## 19979 1.28349516
## 19980 1.28349516
## 19981 1.28349516
## 19982 1.28349516
## 19983 1.28349516
## 19984 1.28349516
## 19985 0.28752554
## 19986 0.28752554
## 19987 0.28752554
## 19988 0.28752554
## 19989 0.28752554
## 19990 0.28752554
## 19991 0.28752554
## 19992 0.28752554
## 19993 0.28752554
## 19994 0.28752554
## 19995 0.28752554
## 19996 0.28752554
## 19997 0.28752554
## 19998 0.28752554
## 19999 0.28752554
## 20000 0.28752554
## 20001 0.29647531
## 20002 0.29647531
## 20003 0.29647531
## 20004 0.29647531
## 20005 0.29647531
## 20006 0.29647531
## 20007 0.29647531
## 20008 0.29647531
## 20009 0.29647531
## 20010 0.29647531
## 20011 0.29647531
## 20012 0.29647531
## 20013 0.29647531
## 20014 0.29647531
## 20015 0.29647531
## 20016 0.29647531
## 20017 0.78761075
## 20018 0.78761075
## 20019 0.78761075
## 20020 0.78761075
## 20021 0.78761075
## 20022 0.78761075
## 20023 0.78761075
## 20024 0.78761075
## 20025 0.78761075
## 20026 0.78761075
## 20027 0.78761075
## 20028 0.78761075
## 20029 0.78761075
## 20030 0.78761075
## 20031 0.78761075
## 20032 0.78761075
## 20033 0.50167133
## 20034 0.50167133
## 20035 0.50167133
## 20036 0.50167133
## 20037 0.50167133
## 20038 0.50167133
## 20039 0.50167133
## 20040 0.50167133
## 20041 0.50167133
## 20042 0.50167133
## 20043 0.50167133
## 20044 0.50167133
## 20045 0.50167133
## 20046 0.50167133
## 20047 0.50167133
## 20048 0.50167133
## 20049 1.08762792
## 20050 1.08762792
## 20051 1.08762792
## 20052 1.08762792
## 20053 1.08762792
## 20054 1.08762792
## 20055 1.08762792
## 20056 1.08762792
## 20057 1.08762792
## 20058 1.08762792
## 20059 1.08762792
## 20060 1.08762792
## 20061 1.08762792
## 20062 1.08762792
## 20063 1.08762792
## 20064 1.08762792
## 20065 0.11585139
## 20066 0.11585139
## 20067 0.11585139
## 20068 0.11585139
## 20069 0.11585139
## 20070 0.11585139
## 20071 0.11585139
## 20072 0.11585139
## 20073 0.11585139
## 20074 0.11585139
## 20075 0.11585139
## 20076 0.11585139
## 20077 0.11585139
## 20078 0.11585139
## 20079 0.11585139
## 20080 0.11585139
## 20081 0.79664277
## 20082 0.79664277
## 20083 0.79664277
## 20084 0.79664277
## 20085 0.79664277
## 20086 0.79664277
## 20087 0.79664277
## 20088 0.79664277
## 20089 0.79664277
## 20090 0.79664277
## 20091 0.79664277
## 20092 0.79664277
## 20093 0.79664277
## 20094 0.79664277
## 20095 0.79664277
## 20096 0.79664277
## 20097 0.11612696
## 20098 0.11612696
## 20099 0.11612696
## 20100 0.11612696
## 20101 0.11612696
## 20102 0.11612696
## 20103 0.11612696
## 20104 0.11612696
## 20105 0.11612696
## 20106 0.11612696
## 20107 0.11612696
## 20108 0.11612696
## 20109 0.11612696
## 20110 0.11612696
## 20111 0.11612696
## 20112 0.11612696
## 20113 0.20043641
## 20114 0.20043641
## 20115 0.20043641
## 20116 0.20043641
## 20117 0.20043641
## 20118 0.20043641
## 20119 0.20043641
## 20120 0.20043641
## 20121 0.20043641
## 20122 0.20043641
## 20123 0.20043641
## 20124 0.20043641
## 20125 0.20043641
## 20126 0.20043641
## 20127 0.20043641
## 20128 0.20043641
## 20129 4.17795624
## 20130 4.17795624
## 20131 4.17795624
## 20132 4.17795624
## 20133 4.17795624
## 20134 4.17795624
## 20135 4.17795624
## 20136 4.17795624
## 20137 4.17795624
## 20138 4.17795624
## 20139 4.17795624
## 20140 4.17795624
## 20141 4.17795624
## 20142 4.17795624
## 20143 4.17795624
## 20144 4.17795624
## 20145 0.21888321
## 20146 0.21888321
## 20147 0.21888321
## 20148 0.21888321
## 20149 0.21888321
## 20150 0.21888321
## 20151 0.21888321
## 20152 0.21888321
## 20153 0.21888321
## 20154 0.21888321
## 20155 0.21888321
## 20156 0.21888321
## 20157 0.21888321
## 20158 0.21888321
## 20159 0.21888321
## 20160 0.21888321
## 20161 0.26792022
## 20162 0.26792022
## 20163 0.26792022
## 20164 0.26792022
## 20165 0.26792022
## 20166 0.26792022
## 20167 0.26792022
## 20168 0.26792022
## 20169 0.26792022
## 20170 0.26792022
## 20171 0.26792022
## 20172 0.26792022
## 20173 0.26792022
## 20174 0.26792022
## 20175 0.26792022
## 20176 0.26792022
## 20177 0.64120874
## 20178 0.64120874
## 20179 0.64120874
## 20180 0.64120874
## 20181 0.64120874
## 20182 0.64120874
## 20183 0.64120874
## 20184 0.64120874
## 20185 0.64120874
## 20186 0.64120874
## 20187 0.64120874
## 20188 0.64120874
## 20189 0.64120874
## 20190 0.64120874
## 20191 0.64120874
## 20192 0.64120874
## 20193 0.87918873
## 20194 0.87918873
## 20195 0.87918873
## 20196 0.87918873
## 20197 0.87918873
## 20198 0.87918873
## 20199 0.87918873
## 20200 0.87918873
## 20201 0.87918873
## 20202 0.87918873
## 20203 0.87918873
## 20204 0.87918873
## 20205 0.87918873
## 20206 0.87918873
## 20207 0.87918873
## 20208 0.87918873
## 20209 0.95171529
## 20210 0.95171529
## 20211 0.95171529
## 20212 0.95171529
## 20213 0.95171529
## 20214 0.95171529
## 20215 0.95171529
## 20216 0.95171529
## 20217 0.95171529
## 20218 0.95171529
## 20219 0.95171529
## 20220 0.95171529
## 20221 0.95171529
## 20222 0.95171529
## 20223 0.95171529
## 20224 0.95171529
## 20225 0.33215005
## 20226 0.33215005
## 20227 0.33215005
## 20228 0.33215005
## 20229 0.33215005
## 20230 0.33215005
## 20231 0.33215005
## 20232 0.33215005
## 20233 0.33215005
## 20234 0.33215005
## 20235 0.33215005
## 20236 0.33215005
## 20237 0.33215005
## 20238 0.33215005
## 20239 0.33215005
## 20240 0.33215005
## 20241 0.91336187
## 20242 0.91336187
## 20243 0.91336187
## 20244 0.91336187
## 20245 0.91336187
## 20246 0.91336187
## 20247 0.91336187
## 20248 0.91336187
## 20249 0.91336187
## 20250 0.91336187
## 20251 0.91336187
## 20252 0.91336187
## 20253 0.91336187
## 20254 0.91336187
## 20255 0.91336187
## 20256 0.91336187
## 20257 0.54562200
## 20258 0.54562200
## 20259 0.54562200
## 20260 0.54562200
## 20261 0.54562200
## 20262 0.54562200
## 20263 0.54562200
## 20264 0.54562200
## 20265 0.54562200
## 20266 0.54562200
## 20267 0.54562200
## 20268 0.54562200
## 20269 0.54562200
## 20270 0.54562200
## 20271 0.54562200
## 20272 0.54562200
## 20273 0.09389951
## 20274 0.09389951
## 20275 0.09389951
## 20276 0.09389951
## 20277 0.09389951
## 20278 0.09389951
## 20279 0.09389951
## 20280 0.09389951
## 20281 0.09389951
## 20282 0.09389951
## 20283 0.09389951
## 20284 0.09389951
## 20285 0.09389951
## 20286 0.09389951
## 20287 0.09389951
## 20288 0.09389951
## 20289 0.62691430
## 20290 0.62691430
## 20291 0.62691430
## 20292 0.62691430
## 20293 0.62691430
## 20294 0.62691430
## 20295 0.62691430
## 20296 0.62691430
## 20297 0.62691430
## 20298 0.62691430
## 20299 0.62691430
## 20300 0.62691430
## 20301 0.62691430
## 20302 0.62691430
## 20303 0.62691430
## 20304 0.62691430
## 20305 0.30032918
## 20306 0.30032918
## 20307 0.30032918
## 20308 0.30032918
## 20309 0.30032918
## 20310 0.30032918
## 20311 0.30032918
## 20312 0.30032918
## 20313 0.30032918
## 20314 0.30032918
## 20315 0.30032918
## 20316 0.30032918
## 20317 0.30032918
## 20318 0.30032918
## 20319 0.30032918
## 20320 0.30032918
## 20321 0.15295346
## 20322 0.15295346
## 20323 0.15295346
## 20324 0.15295346
## 20325 0.15295346
## 20326 0.15295346
## 20327 0.15295346
## 20328 0.15295346
## 20329 0.15295346
## 20330 0.15295346
## 20331 0.15295346
## 20332 0.15295346
## 20333 0.15295346
## 20334 0.15295346
## 20335 0.15295346
## 20336 0.15295346
## 20337 0.14248922
## 20338 0.14248922
## 20339 0.14248922
## 20340 0.14248922
## 20341 0.14248922
## 20342 0.14248922
## 20343 0.14248922
## 20344 0.14248922
## 20345 0.14248922
## 20346 0.14248922
## 20347 0.14248922
## 20348 0.14248922
## 20349 0.14248922
## 20350 0.14248922
## 20351 0.14248922
## 20352 0.14248922
## 20353 0.91293941
## 20354 0.91293941
## 20355 0.91293941
## 20356 0.91293941
## 20357 0.91293941
## 20358 0.91293941
## 20359 0.91293941
## 20360 0.91293941
## 20361 0.91293941
## 20362 0.91293941
## 20363 0.91293941
## 20364 0.91293941
## 20365 0.91293941
## 20366 0.91293941
## 20367 0.91293941
## 20368 0.91293941
## 20369 1.83858477
## 20370 1.83858477
## 20371 1.83858477
## 20372 1.83858477
## 20373 1.83858477
## 20374 1.83858477
## 20375 1.83858477
## 20376 1.83858477
## 20377 1.83858477
## 20378 1.83858477
## 20379 1.83858477
## 20380 1.83858477
## 20381 1.83858477
## 20382 1.83858477
## 20383 1.83858477
## 20384 1.83858477
## 
## $user.names
## $user.names$VotingChoice
## [1] "Voting.Choice"
## 
## $user.names$ReligionAtt
## [1] "Religion.Att"
## 
## $user.names$GenderAtt
## [1] "Gender.Att"
## 
## $user.names$RaceAtt
## [1] "Race.Att"
## 
## $user.names$EducationAtt
## [1] "Education.Att"
## 
## $user.names$AgeAtt
## [1] "Age.Att"
## 
## $user.names$ExperienceAtt
## [1] "Experience.Att"
## 
## $user.names$PartyAtt
## [1] "Party.Att"
## 
## $user.names$PolicyAtt
## [1] "Policy.Att"
## 
## $user.names$Office
## [1] "Office"
## 
## $user.names$PartisanComp
## [1] "Partisan_Comp"
## 
## 
## $user.levels
## $user.levels$OfficeMayor
## [1] "Mayor"
## 
## $user.levels$OfficePresident
## [1] "President"
## 
## $user.levels$PartisanCompDemocraticPrimary
## [1] "Democratic Primary"
## 
## $user.levels$PartisanCompRepublicanPrimary
## [1] "Republican Primary"
## 
## $user.levels$PartisanCompGeneralElection
## [1] "General Election"
## 
## 
## $data
##         X CaseId     WEIGHT ConfidenceinGod Secularism1 Secularism2 Secularism3
## 1       1     53 0.23430621               5           2           5           2
## 2       2     53 0.23430621               5           2           5           2
## 3       3     53 0.23430621               5           2           5           2
## 4       4     53 0.23430621               5           2           5           2
## 5       5     53 0.23430621               5           2           5           2
## 6       6     53 0.23430621               5           2           5           2
## 7       7     53 0.23430621               5           2           5           2
## 8       8     53 0.23430621               5           2           5           2
## 9       9     53 0.23430621               5           2           5           2
## 10     10     53 0.23430621               5           2           5           2
## 11     11     53 0.23430621               5           2           5           2
## 12     12     53 0.23430621               5           2           5           2
## 13     13     53 0.23430621               5           2           5           2
## 14     14     53 0.23430621               5           2           5           2
## 15     15     53 0.23430621               5           2           5           2
## 16     16     53 0.23430621               5           2           5           2
## 17     17     59 0.26824266               2           1           1           1
## 18     18     59 0.26824266               2           1           1           1
## 19     19     59 0.26824266               2           1           1           1
## 20     20     59 0.26824266               2           1           1           1
## 21     21     59 0.26824266               2           1           1           1
## 22     22     59 0.26824266               2           1           1           1
## 23     23     59 0.26824266               2           1           1           1
## 24     24     59 0.26824266               2           1           1           1
## 25     25     59 0.26824266               2           1           1           1
## 26     26     59 0.26824266               2           1           1           1
## 27     27     59 0.26824266               2           1           1           1
## 28     28     59 0.26824266               2           1           1           1
## 29     29     59 0.26824266               2           1           1           1
## 30     30     59 0.26824266               2           1           1           1
## 31     31     59 0.26824266               2           1           1           1
## 32     32     59 0.26824266               2           1           1           1
## 33     33     62 0.40630295               1           4           4           1
## 34     34     62 0.40630295               1           4           4           1
## 35     35     62 0.40630295               1           4           4           1
## 36     36     62 0.40630295               1           4           4           1
## 37     37     62 0.40630295               1           4           4           1
## 38     38     62 0.40630295               1           4           4           1
## 39     39     62 0.40630295               1           4           4           1
## 40     40     62 0.40630295               1           4           4           1
## 41     41     62 0.40630295               1           4           4           1
## 42     42     62 0.40630295               1           4           4           1
## 43     43     62 0.40630295               1           4           4           1
## 44     44     62 0.40630295               1           4           4           1
## 45     45     62 0.40630295               1           4           4           1
## 46     46     62 0.40630295               1           4           4           1
## 47     47     62 0.40630295               1           4           4           1
## 48     48     62 0.40630295               1           4           4           1
## 49     49     65 0.85697223               3           7          NA           7
## 50     50     65 0.85697223               3           7          NA           7
## 51     51     65 0.85697223               3           7          NA           7
## 52     52     65 0.85697223               3           7          NA           7
## 53     53     65 0.85697223               3           7          NA           7
## 54     54     65 0.85697223               3           7          NA           7
## 55     55     65 0.85697223               3           7          NA           7
## 56     56     65 0.85697223               3           7          NA           7
## 57     57     65 0.85697223               3           7          NA           7
## 58     58     65 0.85697223               3           7          NA           7
## 59     59     65 0.85697223               3           7          NA           7
## 60     60     65 0.85697223               3           7          NA           7
## 61     61     65 0.85697223               3           7          NA           7
## 62     62     65 0.85697223               3           7          NA           7
## 63     63     65 0.85697223               3           7          NA           7
## 64     64     65 0.85697223               3           7          NA           7
## 65     65     70 1.08346945               3           1           2           1
## 66     66     70 1.08346945               3           1           2           1
## 67     67     70 1.08346945               3           1           2           1
## 68     68     70 1.08346945               3           1           2           1
## 69     69     70 1.08346945               3           1           2           1
## 70     70     70 1.08346945               3           1           2           1
## 71     71     70 1.08346945               3           1           2           1
## 72     72     70 1.08346945               3           1           2           1
## 73     73     70 1.08346945               3           1           2           1
## 74     74     70 1.08346945               3           1           2           1
## 75     75     70 1.08346945               3           1           2           1
## 76     76     70 1.08346945               3           1           2           1
## 77     77     70 1.08346945               3           1           2           1
## 78     78     70 1.08346945               3           1           2           1
## 79     79     70 1.08346945               3           1           2           1
## 80     80     70 1.08346945               3           1           2           1
## 81     81     73 0.98012854               4           5           2           5
## 82     82     73 0.98012854               4           5           2           5
## 83     83     73 0.98012854               4           5           2           5
## 84     84     73 0.98012854               4           5           2           5
## 85     85     73 0.98012854               4           5           2           5
## 86     86     73 0.98012854               4           5           2           5
## 87     87     73 0.98012854               4           5           2           5
## 88     88     73 0.98012854               4           5           2           5
## 89     89     73 0.98012854               4           5           2           5
## 90     90     73 0.98012854               4           5           2           5
## 91     91     73 0.98012854               4           5           2           5
## 92     92     73 0.98012854               4           5           2           5
## 93     93     73 0.98012854               4           5           2           5
## 94     94     73 0.98012854               4           5           2           5
## 95     95     73 0.98012854               4           5           2           5
## 96     96     73 0.98012854               4           5           2           5
## 97     97     75 0.54538712               6           5           5           5
## 98     98     75 0.54538712               6           5           5           5
## 99     99     75 0.54538712               6           5           5           5
## 100   100     75 0.54538712               6           5           5           5
## 101   101     75 0.54538712               6           5           5           5
## 102   102     75 0.54538712               6           5           5           5
## 103   103     75 0.54538712               6           5           5           5
## 104   104     75 0.54538712               6           5           5           5
## 105   105     75 0.54538712               6           5           5           5
## 106   106     75 0.54538712               6           5           5           5
## 107   107     75 0.54538712               6           5           5           5
## 108   108     75 0.54538712               6           5           5           5
## 109   109     75 0.54538712               6           5           5           5
## 110   110     75 0.54538712               6           5           5           5
## 111   111     75 0.54538712               6           5           5           5
## 112   112     75 0.54538712               6           5           5           5
## 113   113     76 0.67821633               4           2           3           1
## 114   114     76 0.67821633               4           2           3           1
## 115   115     76 0.67821633               4           2           3           1
## 116   116     76 0.67821633               4           2           3           1
## 117   117     76 0.67821633               4           2           3           1
## 118   118     76 0.67821633               4           2           3           1
## 119   119     76 0.67821633               4           2           3           1
## 120   120     76 0.67821633               4           2           3           1
## 121   121     76 0.67821633               4           2           3           1
## 122   122     76 0.67821633               4           2           3           1
## 123   123     76 0.67821633               4           2           3           1
## 124   124     76 0.67821633               4           2           3           1
## 125   125     76 0.67821633               4           2           3           1
## 126   126     76 0.67821633               4           2           3           1
## 127   127     76 0.67821633               4           2           3           1
## 128   128     76 0.67821633               4           2           3           1
## 129   129     79 0.29653342               5           6           4           6
## 130   130     79 0.29653342               5           6           4           6
## 131   131     79 0.29653342               5           6           4           6
## 132   132     79 0.29653342               5           6           4           6
## 133   133     79 0.29653342               5           6           4           6
## 134   134     79 0.29653342               5           6           4           6
## 135   135     79 0.29653342               5           6           4           6
## 136   136     79 0.29653342               5           6           4           6
## 137   137     79 0.29653342               5           6           4           6
## 138   138     79 0.29653342               5           6           4           6
## 139   139     79 0.29653342               5           6           4           6
## 140   140     79 0.29653342               5           6           4           6
## 141   141     79 0.29653342               5           6           4           6
## 142   142     79 0.29653342               5           6           4           6
## 143   143     79 0.29653342               5           6           4           6
## 144   144     79 0.29653342               5           6           4           6
## 145   145     83 0.48190590               6           3           2           2
## 146   146     83 0.48190590               6           3           2           2
## 147   147     83 0.48190590               6           3           2           2
## 148   148     83 0.48190590               6           3           2           2
## 149   149     83 0.48190590               6           3           2           2
## 150   150     83 0.48190590               6           3           2           2
## 151   151     83 0.48190590               6           3           2           2
## 152   152     83 0.48190590               6           3           2           2
## 153   153     83 0.48190590               6           3           2           2
## 154   154     83 0.48190590               6           3           2           2
## 155   155     83 0.48190590               6           3           2           2
## 156   156     83 0.48190590               6           3           2           2
## 157   157     83 0.48190590               6           3           2           2
## 158   158     83 0.48190590               6           3           2           2
## 159   159     83 0.48190590               6           3           2           2
## 160   160     83 0.48190590               6           3           2           2
## 161   161     86 0.85522163               6           4           4           4
## 162   162     86 0.85522163               6           4           4           4
## 163   163     86 0.85522163               6           4           4           4
## 164   164     86 0.85522163               6           4           4           4
## 165   165     86 0.85522163               6           4           4           4
## 166   166     86 0.85522163               6           4           4           4
## 167   167     86 0.85522163               6           4           4           4
## 168   168     86 0.85522163               6           4           4           4
## 169   169     86 0.85522163               6           4           4           4
## 170   170     86 0.85522163               6           4           4           4
## 171   171     86 0.85522163               6           4           4           4
## 172   172     86 0.85522163               6           4           4           4
## 173   173     86 0.85522163               6           4           4           4
## 174   174     86 0.85522163               6           4           4           4
## 175   175     86 0.85522163               6           4           4           4
## 176   176     86 0.85522163               6           4           4           4
## 177   177     89 1.64536815               6           5           7           7
## 178   178     89 1.64536815               6           5           7           7
## 179   179     89 1.64536815               6           5           7           7
## 180   180     89 1.64536815               6           5           7           7
## 181   181     89 1.64536815               6           5           7           7
## 182   182     89 1.64536815               6           5           7           7
## 183   183     89 1.64536815               6           5           7           7
## 184   184     89 1.64536815               6           5           7           7
## 185   185     89 1.64536815               6           5           7           7
## 186   186     89 1.64536815               6           5           7           7
## 187   187     89 1.64536815               6           5           7           7
## 188   188     89 1.64536815               6           5           7           7
## 189   189     89 1.64536815               6           5           7           7
## 190   190     89 1.64536815               6           5           7           7
## 191   191     89 1.64536815               6           5           7           7
## 192   192     89 1.64536815               6           5           7           7
## 193   193     93 1.28500546               1           1           1           1
## 194   194     93 1.28500546               1           1           1           1
## 195   195     93 1.28500546               1           1           1           1
## 196   196     93 1.28500546               1           1           1           1
## 197   197     93 1.28500546               1           1           1           1
## 198   198     93 1.28500546               1           1           1           1
## 199   199     93 1.28500546               1           1           1           1
## 200   200     93 1.28500546               1           1           1           1
## 201   201     93 1.28500546               1           1           1           1
## 202   202     93 1.28500546               1           1           1           1
## 203   203     93 1.28500546               1           1           1           1
## 204   204     93 1.28500546               1           1           1           1
## 205   205     93 1.28500546               1           1           1           1
## 206   206     93 1.28500546               1           1           1           1
## 207   207     93 1.28500546               1           1           1           1
## 208   208     93 1.28500546               1           1           1           1
## 209   209     94 0.74644245               6           1           1           1
## 210   210     94 0.74644245               6           1           1           1
## 211   211     94 0.74644245               6           1           1           1
## 212   212     94 0.74644245               6           1           1           1
## 213   213     94 0.74644245               6           1           1           1
## 214   214     94 0.74644245               6           1           1           1
## 215   215     94 0.74644245               6           1           1           1
## 216   216     94 0.74644245               6           1           1           1
## 217   217     94 0.74644245               6           1           1           1
## 218   218     94 0.74644245               6           1           1           1
## 219   219     94 0.74644245               6           1           1           1
## 220   220     94 0.74644245               6           1           1           1
## 221   221     94 0.74644245               6           1           1           1
## 222   222     94 0.74644245               6           1           1           1
## 223   223     94 0.74644245               6           1           1           1
## 224   224     94 0.74644245               6           1           1           1
## 225   225     98 0.39834229               6           5           7           7
## 226   226     98 0.39834229               6           5           7           7
## 227   227     98 0.39834229               6           5           7           7
## 228   228     98 0.39834229               6           5           7           7
## 229   229     98 0.39834229               6           5           7           7
## 230   230     98 0.39834229               6           5           7           7
## 231   231     98 0.39834229               6           5           7           7
## 232   232     98 0.39834229               6           5           7           7
## 233   233     98 0.39834229               6           5           7           7
## 234   234     98 0.39834229               6           5           7           7
## 235   235     98 0.39834229               6           5           7           7
## 236   236     98 0.39834229               6           5           7           7
## 237   237     98 0.39834229               6           5           7           7
## 238   238     98 0.39834229               6           5           7           7
## 239   239     98 0.39834229               6           5           7           7
## 240   240     98 0.39834229               6           5           7           7
## 241   241    103 0.39806349               6           4           5           1
## 242   242    103 0.39806349               6           4           5           1
## 243   243    103 0.39806349               6           4           5           1
## 244   244    103 0.39806349               6           4           5           1
## 245   245    103 0.39806349               6           4           5           1
## 246   246    103 0.39806349               6           4           5           1
## 247   247    103 0.39806349               6           4           5           1
## 248   248    103 0.39806349               6           4           5           1
## 249   249    103 0.39806349               6           4           5           1
## 250   250    103 0.39806349               6           4           5           1
## 251   251    103 0.39806349               6           4           5           1
## 252   252    103 0.39806349               6           4           5           1
## 253   253    103 0.39806349               6           4           5           1
## 254   254    103 0.39806349               6           4           5           1
## 255   255    103 0.39806349               6           4           5           1
## 256   256    103 0.39806349               6           4           5           1
## 257   257    109 0.58543495               3           2           2           2
## 258   258    109 0.58543495               3           2           2           2
## 259   259    109 0.58543495               3           2           2           2
## 260   260    109 0.58543495               3           2           2           2
## 261   261    109 0.58543495               3           2           2           2
## 262   262    109 0.58543495               3           2           2           2
## 263   263    109 0.58543495               3           2           2           2
## 264   264    109 0.58543495               3           2           2           2
## 265   265    109 0.58543495               3           2           2           2
## 266   266    109 0.58543495               3           2           2           2
## 267   267    109 0.58543495               3           2           2           2
## 268   268    109 0.58543495               3           2           2           2
## 269   269    109 0.58543495               3           2           2           2
## 270   270    109 0.58543495               3           2           2           2
## 271   271    109 0.58543495               3           2           2           2
## 272   272    109 0.58543495               3           2           2           2
## 273   273    117 0.68033004               2           2           2           1
## 274   274    117 0.68033004               2           2           2           1
## 275   275    117 0.68033004               2           2           2           1
## 276   276    117 0.68033004               2           2           2           1
## 277   277    117 0.68033004               2           2           2           1
## 278   278    117 0.68033004               2           2           2           1
## 279   279    117 0.68033004               2           2           2           1
## 280   280    117 0.68033004               2           2           2           1
## 281   281    117 0.68033004               2           2           2           1
## 282   282    117 0.68033004               2           2           2           1
## 283   283    117 0.68033004               2           2           2           1
## 284   284    117 0.68033004               2           2           2           1
## 285   285    117 0.68033004               2           2           2           1
## 286   286    117 0.68033004               2           2           2           1
## 287   287    117 0.68033004               2           2           2           1
## 288   288    117 0.68033004               2           2           2           1
## 289   289    119 1.66287397               6           1           5           1
## 290   290    119 1.66287397               6           1           5           1
## 291   291    119 1.66287397               6           1           5           1
## 292   292    119 1.66287397               6           1           5           1
## 293   293    119 1.66287397               6           1           5           1
## 294   294    119 1.66287397               6           1           5           1
## 295   295    119 1.66287397               6           1           5           1
## 296   296    119 1.66287397               6           1           5           1
## 297   297    119 1.66287397               6           1           5           1
## 298   298    119 1.66287397               6           1           5           1
## 299   299    119 1.66287397               6           1           5           1
## 300   300    119 1.66287397               6           1           5           1
## 301   301    119 1.66287397               6           1           5           1
## 302   302    119 1.66287397               6           1           5           1
## 303   303    119 1.66287397               6           1           5           1
## 304   304    119 1.66287397               6           1           5           1
## 305   305    121 1.88844529               2           4           3           1
## 306   306    121 1.88844529               2           4           3           1
## 307   307    121 1.88844529               2           4           3           1
## 308   308    121 1.88844529               2           4           3           1
## 309   309    121 1.88844529               2           4           3           1
## 310   310    121 1.88844529               2           4           3           1
## 311   311    121 1.88844529               2           4           3           1
## 312   312    121 1.88844529               2           4           3           1
## 313   313    121 1.88844529               2           4           3           1
## 314   314    121 1.88844529               2           4           3           1
## 315   315    121 1.88844529               2           4           3           1
## 316   316    121 1.88844529               2           4           3           1
## 317   317    121 1.88844529               2           4           3           1
## 318   318    121 1.88844529               2           4           3           1
## 319   319    121 1.88844529               2           4           3           1
## 320   320    121 1.88844529               2           4           3           1
## 321   321    123 0.50927027               1           2           1           1
## 322   322    123 0.50927027               1           2           1           1
## 323   323    123 0.50927027               1           2           1           1
## 324   324    123 0.50927027               1           2           1           1
## 325   325    123 0.50927027               1           2           1           1
## 326   326    123 0.50927027               1           2           1           1
## 327   327    123 0.50927027               1           2           1           1
## 328   328    123 0.50927027               1           2           1           1
## 329   329    123 0.50927027               1           2           1           1
## 330   330    123 0.50927027               1           2           1           1
## 331   331    123 0.50927027               1           2           1           1
## 332   332    123 0.50927027               1           2           1           1
## 333   333    123 0.50927027               1           2           1           1
## 334   334    123 0.50927027               1           2           1           1
## 335   335    123 0.50927027               1           2           1           1
## 336   336    123 0.50927027               1           2           1           1
## 337   337    125 0.38958812               5           2           3           2
## 338   338    125 0.38958812               5           2           3           2
## 339   339    125 0.38958812               5           2           3           2
## 340   340    125 0.38958812               5           2           3           2
## 341   341    125 0.38958812               5           2           3           2
## 342   342    125 0.38958812               5           2           3           2
## 343   343    125 0.38958812               5           2           3           2
## 344   344    125 0.38958812               5           2           3           2
## 345   345    125 0.38958812               5           2           3           2
## 346   346    125 0.38958812               5           2           3           2
## 347   347    125 0.38958812               5           2           3           2
## 348   348    125 0.38958812               5           2           3           2
## 349   349    125 0.38958812               5           2           3           2
## 350   350    125 0.38958812               5           2           3           2
## 351   351    125 0.38958812               5           2           3           2
## 352   352    125 0.38958812               5           2           3           2
## 353   353    126 1.17750941               3           4           2           1
## 354   354    126 1.17750941               3           4           2           1
## 355   355    126 1.17750941               3           4           2           1
## 356   356    126 1.17750941               3           4           2           1
## 357   357    126 1.17750941               3           4           2           1
## 358   358    126 1.17750941               3           4           2           1
## 359   359    126 1.17750941               3           4           2           1
## 360   360    126 1.17750941               3           4           2           1
## 361   361    126 1.17750941               3           4           2           1
## 362   362    126 1.17750941               3           4           2           1
## 363   363    126 1.17750941               3           4           2           1
## 364   364    126 1.17750941               3           4           2           1
## 365   365    126 1.17750941               3           4           2           1
## 366   366    126 1.17750941               3           4           2           1
## 367   367    126 1.17750941               3           4           2           1
## 368   368    126 1.17750941               3           4           2           1
## 369   369    128 1.02719542               5           4           4           4
## 370   370    128 1.02719542               5           4           4           4
## 371   371    128 1.02719542               5           4           4           4
## 372   372    128 1.02719542               5           4           4           4
## 373   373    128 1.02719542               5           4           4           4
## 374   374    128 1.02719542               5           4           4           4
## 375   375    128 1.02719542               5           4           4           4
## 376   376    128 1.02719542               5           4           4           4
## 377   377    128 1.02719542               5           4           4           4
## 378   378    128 1.02719542               5           4           4           4
## 379   379    128 1.02719542               5           4           4           4
## 380   380    128 1.02719542               5           4           4           4
## 381   381    128 1.02719542               5           4           4           4
## 382   382    128 1.02719542               5           4           4           4
## 383   383    128 1.02719542               5           4           4           4
## 384   384    128 1.02719542               5           4           4           4
## 385   385    147 0.44782638               2           4           4           5
## 386   386    147 0.44782638               2           4           4           5
## 387   387    147 0.44782638               2           4           4           5
## 388   388    147 0.44782638               2           4           4           5
## 389   389    147 0.44782638               2           4           4           5
## 390   390    147 0.44782638               2           4           4           5
## 391   391    147 0.44782638               2           4           4           5
## 392   392    147 0.44782638               2           4           4           5
## 393   393    147 0.44782638               2           4           4           5
## 394   394    147 0.44782638               2           4           4           5
## 395   395    147 0.44782638               2           4           4           5
## 396   396    147 0.44782638               2           4           4           5
## 397   397    147 0.44782638               2           4           4           5
## 398   398    147 0.44782638               2           4           4           5
## 399   399    147 0.44782638               2           4           4           5
## 400   400    147 0.44782638               2           4           4           5
## 401   401    150 0.31780187               5           5           6           6
## 402   402    150 0.31780187               5           5           6           6
## 403   403    150 0.31780187               5           5           6           6
## 404   404    150 0.31780187               5           5           6           6
## 405   405    150 0.31780187               5           5           6           6
## 406   406    150 0.31780187               5           5           6           6
## 407   407    150 0.31780187               5           5           6           6
## 408   408    150 0.31780187               5           5           6           6
## 409   409    150 0.31780187               5           5           6           6
## 410   410    150 0.31780187               5           5           6           6
## 411   411    150 0.31780187               5           5           6           6
## 412   412    150 0.31780187               5           5           6           6
## 413   413    150 0.31780187               5           5           6           6
## 414   414    150 0.31780187               5           5           6           6
## 415   415    150 0.31780187               5           5           6           6
## 416   416    150 0.31780187               5           5           6           6
## 417   417    151 0.68608759               5           2           3           2
## 418   418    151 0.68608759               5           2           3           2
## 419   419    151 0.68608759               5           2           3           2
## 420   420    151 0.68608759               5           2           3           2
## 421   421    151 0.68608759               5           2           3           2
## 422   422    151 0.68608759               5           2           3           2
## 423   423    151 0.68608759               5           2           3           2
## 424   424    151 0.68608759               5           2           3           2
## 425   425    151 0.68608759               5           2           3           2
## 426   426    151 0.68608759               5           2           3           2
## 427   427    151 0.68608759               5           2           3           2
## 428   428    151 0.68608759               5           2           3           2
## 429   429    151 0.68608759               5           2           3           2
## 430   430    151 0.68608759               5           2           3           2
## 431   431    151 0.68608759               5           2           3           2
## 432   432    151 0.68608759               5           2           3           2
## 433   433    155 3.15501626               5           5           5           6
## 434   434    155 3.15501626               5           5           5           6
## 435   435    155 3.15501626               5           5           5           6
## 436   436    155 3.15501626               5           5           5           6
## 437   437    155 3.15501626               5           5           5           6
## 438   438    155 3.15501626               5           5           5           6
## 439   439    155 3.15501626               5           5           5           6
## 440   440    155 3.15501626               5           5           5           6
## 441   441    155 3.15501626               5           5           5           6
## 442   442    155 3.15501626               5           5           5           6
## 443   443    155 3.15501626               5           5           5           6
## 444   444    155 3.15501626               5           5           5           6
## 445   445    155 3.15501626               5           5           5           6
## 446   446    155 3.15501626               5           5           5           6
## 447   447    155 3.15501626               5           5           5           6
## 448   448    155 3.15501626               5           5           5           6
## 449   449    165 0.53392542               1           1           2           2
## 450   450    165 0.53392542               1           1           2           2
## 451   451    165 0.53392542               1           1           2           2
## 452   452    165 0.53392542               1           1           2           2
## 453   453    165 0.53392542               1           1           2           2
## 454   454    165 0.53392542               1           1           2           2
## 455   455    165 0.53392542               1           1           2           2
## 456   456    165 0.53392542               1           1           2           2
## 457   457    165 0.53392542               1           1           2           2
## 458   458    165 0.53392542               1           1           2           2
## 459   459    165 0.53392542               1           1           2           2
## 460   460    165 0.53392542               1           1           2           2
## 461   461    165 0.53392542               1           1           2           2
## 462   462    165 0.53392542               1           1           2           2
## 463   463    165 0.53392542               1           1           2           2
## 464   464    165 0.53392542               1           1           2           2
## 465   465    168 0.52217237               2           2           6           2
## 466   466    168 0.52217237               2           2           6           2
## 467   467    168 0.52217237               2           2           6           2
## 468   468    168 0.52217237               2           2           6           2
## 469   469    168 0.52217237               2           2           6           2
## 470   470    168 0.52217237               2           2           6           2
## 471   471    168 0.52217237               2           2           6           2
## 472   472    168 0.52217237               2           2           6           2
## 473   473    168 0.52217237               2           2           6           2
## 474   474    168 0.52217237               2           2           6           2
## 475   475    168 0.52217237               2           2           6           2
## 476   476    168 0.52217237               2           2           6           2
## 477   477    168 0.52217237               2           2           6           2
## 478   478    168 0.52217237               2           2           6           2
## 479   479    168 0.52217237               2           2           6           2
## 480   480    168 0.52217237               2           2           6           2
## 481   481    175 2.35661427               3           4           1           1
## 482   482    175 2.35661427               3           4           1           1
## 483   483    175 2.35661427               3           4           1           1
## 484   484    175 2.35661427               3           4           1           1
## 485   485    175 2.35661427               3           4           1           1
## 486   486    175 2.35661427               3           4           1           1
## 487   487    175 2.35661427               3           4           1           1
## 488   488    175 2.35661427               3           4           1           1
## 489   489    175 2.35661427               3           4           1           1
## 490   490    175 2.35661427               3           4           1           1
## 491   491    175 2.35661427               3           4           1           1
## 492   492    175 2.35661427               3           4           1           1
## 493   493    175 2.35661427               3           4           1           1
## 494   494    175 2.35661427               3           4           1           1
## 495   495    175 2.35661427               3           4           1           1
## 496   496    175 2.35661427               3           4           1           1
## 497   497    181 0.97667533               6           4           7           4
## 498   498    181 0.97667533               6           4           7           4
## 499   499    181 0.97667533               6           4           7           4
## 500   500    181 0.97667533               6           4           7           4
## 501   501    181 0.97667533               6           4           7           4
## 502   502    181 0.97667533               6           4           7           4
## 503   503    181 0.97667533               6           4           7           4
## 504   504    181 0.97667533               6           4           7           4
## 505   505    181 0.97667533               6           4           7           4
## 506   506    181 0.97667533               6           4           7           4
## 507   507    181 0.97667533               6           4           7           4
## 508   508    181 0.97667533               6           4           7           4
## 509   509    181 0.97667533               6           4           7           4
## 510   510    181 0.97667533               6           4           7           4
## 511   511    181 0.97667533               6           4           7           4
## 512   512    181 0.97667533               6           4           7           4
## 513   513    186 0.43841485               1           3           1           2
## 514   514    186 0.43841485               1           3           1           2
## 515   515    186 0.43841485               1           3           1           2
## 516   516    186 0.43841485               1           3           1           2
## 517   517    186 0.43841485               1           3           1           2
## 518   518    186 0.43841485               1           3           1           2
## 519   519    186 0.43841485               1           3           1           2
## 520   520    186 0.43841485               1           3           1           2
## 521   521    186 0.43841485               1           3           1           2
## 522   522    186 0.43841485               1           3           1           2
## 523   523    186 0.43841485               1           3           1           2
## 524   524    186 0.43841485               1           3           1           2
## 525   525    186 0.43841485               1           3           1           2
## 526   526    186 0.43841485               1           3           1           2
## 527   527    186 0.43841485               1           3           1           2
## 528   528    186 0.43841485               1           3           1           2
## 529   529    188 1.79591808               3           4           4           4
## 530   530    188 1.79591808               3           4           4           4
## 531   531    188 1.79591808               3           4           4           4
## 532   532    188 1.79591808               3           4           4           4
## 533   533    188 1.79591808               3           4           4           4
## 534   534    188 1.79591808               3           4           4           4
## 535   535    188 1.79591808               3           4           4           4
## 536   536    188 1.79591808               3           4           4           4
## 537   537    188 1.79591808               3           4           4           4
## 538   538    188 1.79591808               3           4           4           4
## 539   539    188 1.79591808               3           4           4           4
## 540   540    188 1.79591808               3           4           4           4
## 541   541    188 1.79591808               3           4           4           4
## 542   542    188 1.79591808               3           4           4           4
## 543   543    188 1.79591808               3           4           4           4
## 544   544    188 1.79591808               3           4           4           4
## 545   545    193 0.74009777               6           1           4           1
## 546   546    193 0.74009777               6           1           4           1
## 547   547    193 0.74009777               6           1           4           1
## 548   548    193 0.74009777               6           1           4           1
## 549   549    193 0.74009777               6           1           4           1
## 550   550    193 0.74009777               6           1           4           1
## 551   551    193 0.74009777               6           1           4           1
## 552   552    193 0.74009777               6           1           4           1
## 553   553    193 0.74009777               6           1           4           1
## 554   554    193 0.74009777               6           1           4           1
## 555   555    193 0.74009777               6           1           4           1
## 556   556    193 0.74009777               6           1           4           1
## 557   557    193 0.74009777               6           1           4           1
## 558   558    193 0.74009777               6           1           4           1
## 559   559    193 0.74009777               6           1           4           1
## 560   560    193 0.74009777               6           1           4           1
## 561   561    194 0.54741492               3           2           5           1
## 562   562    194 0.54741492               3           2           5           1
## 563   563    194 0.54741492               3           2           5           1
## 564   564    194 0.54741492               3           2           5           1
## 565   565    194 0.54741492               3           2           5           1
## 566   566    194 0.54741492               3           2           5           1
## 567   567    194 0.54741492               3           2           5           1
## 568   568    194 0.54741492               3           2           5           1
## 569   569    194 0.54741492               3           2           5           1
## 570   570    194 0.54741492               3           2           5           1
## 571   571    194 0.54741492               3           2           5           1
## 572   572    194 0.54741492               3           2           5           1
## 573   573    194 0.54741492               3           2           5           1
## 574   574    194 0.54741492               3           2           5           1
## 575   575    194 0.54741492               3           2           5           1
## 576   576    194 0.54741492               3           2           5           1
## 577   577    197 1.17128053               3           1           1           3
## 578   578    197 1.17128053               3           1           1           3
## 579   579    197 1.17128053               3           1           1           3
## 580   580    197 1.17128053               3           1           1           3
## 581   581    197 1.17128053               3           1           1           3
## 582   582    197 1.17128053               3           1           1           3
## 583   583    197 1.17128053               3           1           1           3
## 584   584    197 1.17128053               3           1           1           3
## 585   585    197 1.17128053               3           1           1           3
## 586   586    197 1.17128053               3           1           1           3
## 587   587    197 1.17128053               3           1           1           3
## 588   588    197 1.17128053               3           1           1           3
## 589   589    197 1.17128053               3           1           1           3
## 590   590    197 1.17128053               3           1           1           3
## 591   591    197 1.17128053               3           1           1           3
## 592   592    197 1.17128053               3           1           1           3
## 593   593    215 0.61000978               6           1           1           1
## 594   594    215 0.61000978               6           1           1           1
## 595   595    215 0.61000978               6           1           1           1
## 596   596    215 0.61000978               6           1           1           1
## 597   597    215 0.61000978               6           1           1           1
## 598   598    215 0.61000978               6           1           1           1
## 599   599    215 0.61000978               6           1           1           1
## 600   600    215 0.61000978               6           1           1           1
## 601   601    215 0.61000978               6           1           1           1
## 602   602    215 0.61000978               6           1           1           1
## 603   603    215 0.61000978               6           1           1           1
## 604   604    215 0.61000978               6           1           1           1
## 605   605    215 0.61000978               6           1           1           1
## 606   606    215 0.61000978               6           1           1           1
## 607   607    215 0.61000978               6           1           1           1
## 608   608    215 0.61000978               6           1           1           1
## 609   609    229 0.88317034               6           4           7           2
## 610   610    229 0.88317034               6           4           7           2
## 611   611    229 0.88317034               6           4           7           2
## 612   612    229 0.88317034               6           4           7           2
## 613   613    229 0.88317034               6           4           7           2
## 614   614    229 0.88317034               6           4           7           2
## 615   615    229 0.88317034               6           4           7           2
## 616   616    229 0.88317034               6           4           7           2
## 617   617    229 0.88317034               6           4           7           2
## 618   618    229 0.88317034               6           4           7           2
## 619   619    229 0.88317034               6           4           7           2
## 620   620    229 0.88317034               6           4           7           2
## 621   621    229 0.88317034               6           4           7           2
## 622   622    229 0.88317034               6           4           7           2
## 623   623    229 0.88317034               6           4           7           2
## 624   624    229 0.88317034               6           4           7           2
## 625   625    230 0.57520469               6           2           2           3
## 626   626    230 0.57520469               6           2           2           3
## 627   627    230 0.57520469               6           2           2           3
## 628   628    230 0.57520469               6           2           2           3
## 629   629    230 0.57520469               6           2           2           3
## 630   630    230 0.57520469               6           2           2           3
## 631   631    230 0.57520469               6           2           2           3
## 632   632    230 0.57520469               6           2           2           3
## 633   633    230 0.57520469               6           2           2           3
## 634   634    230 0.57520469               6           2           2           3
## 635   635    230 0.57520469               6           2           2           3
## 636   636    230 0.57520469               6           2           2           3
## 637   637    230 0.57520469               6           2           2           3
## 638   638    230 0.57520469               6           2           2           3
## 639   639    230 0.57520469               6           2           2           3
## 640   640    230 0.57520469               6           2           2           3
## 641   641    231 1.27596016               2           2           3           3
## 642   642    231 1.27596016               2           2           3           3
## 643   643    231 1.27596016               2           2           3           3
## 644   644    231 1.27596016               2           2           3           3
## 645   645    231 1.27596016               2           2           3           3
## 646   646    231 1.27596016               2           2           3           3
## 647   647    231 1.27596016               2           2           3           3
## 648   648    231 1.27596016               2           2           3           3
## 649   649    231 1.27596016               2           2           3           3
## 650   650    231 1.27596016               2           2           3           3
## 651   651    231 1.27596016               2           2           3           3
## 652   652    231 1.27596016               2           2           3           3
## 653   653    231 1.27596016               2           2           3           3
## 654   654    231 1.27596016               2           2           3           3
## 655   655    231 1.27596016               2           2           3           3
## 656   656    231 1.27596016               2           2           3           3
## 657   657    235 0.76044935               3           1           1           2
## 658   658    235 0.76044935               3           1           1           2
## 659   659    235 0.76044935               3           1           1           2
## 660   660    235 0.76044935               3           1           1           2
## 661   661    235 0.76044935               3           1           1           2
## 662   662    235 0.76044935               3           1           1           2
## 663   663    235 0.76044935               3           1           1           2
## 664   664    235 0.76044935               3           1           1           2
## 665   665    235 0.76044935               3           1           1           2
## 666   666    235 0.76044935               3           1           1           2
## 667   667    235 0.76044935               3           1           1           2
## 668   668    235 0.76044935               3           1           1           2
## 669   669    235 0.76044935               3           1           1           2
## 670   670    235 0.76044935               3           1           1           2
## 671   671    235 0.76044935               3           1           1           2
## 672   672    235 0.76044935               3           1           1           2
## 673   673    237 1.20795332               2           1           1           1
## 674   674    237 1.20795332               2           1           1           1
## 675   675    237 1.20795332               2           1           1           1
## 676   676    237 1.20795332               2           1           1           1
## 677   677    237 1.20795332               2           1           1           1
## 678   678    237 1.20795332               2           1           1           1
## 679   679    237 1.20795332               2           1           1           1
## 680   680    237 1.20795332               2           1           1           1
## 681   681    237 1.20795332               2           1           1           1
## 682   682    237 1.20795332               2           1           1           1
## 683   683    237 1.20795332               2           1           1           1
## 684   684    237 1.20795332               2           1           1           1
## 685   685    237 1.20795332               2           1           1           1
## 686   686    237 1.20795332               2           1           1           1
## 687   687    237 1.20795332               2           1           1           1
## 688   688    237 1.20795332               2           1           1           1
## 689   689    238 1.05956313               6           4           4           4
## 690   690    238 1.05956313               6           4           4           4
## 691   691    238 1.05956313               6           4           4           4
## 692   692    238 1.05956313               6           4           4           4
## 693   693    238 1.05956313               6           4           4           4
## 694   694    238 1.05956313               6           4           4           4
## 695   695    238 1.05956313               6           4           4           4
## 696   696    238 1.05956313               6           4           4           4
## 697   697    238 1.05956313               6           4           4           4
## 698   698    238 1.05956313               6           4           4           4
## 699   699    238 1.05956313               6           4           4           4
## 700   700    238 1.05956313               6           4           4           4
## 701   701    238 1.05956313               6           4           4           4
## 702   702    238 1.05956313               6           4           4           4
## 703   703    238 1.05956313               6           4           4           4
## 704   704    238 1.05956313               6           4           4           4
## 705   705    242 1.16349049               6           6           6           4
## 706   706    242 1.16349049               6           6           6           4
## 707   707    242 1.16349049               6           6           6           4
## 708   708    242 1.16349049               6           6           6           4
## 709   709    242 1.16349049               6           6           6           4
## 710   710    242 1.16349049               6           6           6           4
## 711   711    242 1.16349049               6           6           6           4
## 712   712    242 1.16349049               6           6           6           4
## 713   713    242 1.16349049               6           6           6           4
## 714   714    242 1.16349049               6           6           6           4
## 715   715    242 1.16349049               6           6           6           4
## 716   716    242 1.16349049               6           6           6           4
## 717   717    242 1.16349049               6           6           6           4
## 718   718    242 1.16349049               6           6           6           4
## 719   719    242 1.16349049               6           6           6           4
## 720   720    242 1.16349049               6           6           6           4
## 721   721    245 0.07370932               3           2           1           1
## 722   722    245 0.07370932               3           2           1           1
## 723   723    245 0.07370932               3           2           1           1
## 724   724    245 0.07370932               3           2           1           1
## 725   725    245 0.07370932               3           2           1           1
## 726   726    245 0.07370932               3           2           1           1
## 727   727    245 0.07370932               3           2           1           1
## 728   728    245 0.07370932               3           2           1           1
## 729   729    245 0.07370932               3           2           1           1
## 730   730    245 0.07370932               3           2           1           1
## 731   731    245 0.07370932               3           2           1           1
## 732   732    245 0.07370932               3           2           1           1
## 733   733    245 0.07370932               3           2           1           1
## 734   734    245 0.07370932               3           2           1           1
## 735   735    245 0.07370932               3           2           1           1
## 736   736    245 0.07370932               3           2           1           1
## 737   737    255 0.95643888               6           7           7           7
## 738   738    255 0.95643888               6           7           7           7
## 739   739    255 0.95643888               6           7           7           7
## 740   740    255 0.95643888               6           7           7           7
## 741   741    255 0.95643888               6           7           7           7
## 742   742    255 0.95643888               6           7           7           7
## 743   743    255 0.95643888               6           7           7           7
## 744   744    255 0.95643888               6           7           7           7
## 745   745    255 0.95643888               6           7           7           7
## 746   746    255 0.95643888               6           7           7           7
## 747   747    255 0.95643888               6           7           7           7
## 748   748    255 0.95643888               6           7           7           7
## 749   749    255 0.95643888               6           7           7           7
## 750   750    255 0.95643888               6           7           7           7
## 751   751    255 0.95643888               6           7           7           7
## 752   752    255 0.95643888               6           7           7           7
## 753   753    257 0.70270422               3           4           4           4
## 754   754    257 0.70270422               3           4           4           4
## 755   755    257 0.70270422               3           4           4           4
## 756   756    257 0.70270422               3           4           4           4
## 757   757    257 0.70270422               3           4           4           4
## 758   758    257 0.70270422               3           4           4           4
## 759   759    257 0.70270422               3           4           4           4
## 760   760    257 0.70270422               3           4           4           4
## 761   761    257 0.70270422               3           4           4           4
## 762   762    257 0.70270422               3           4           4           4
## 763   763    257 0.70270422               3           4           4           4
## 764   764    257 0.70270422               3           4           4           4
## 765   765    257 0.70270422               3           4           4           4
## 766   766    257 0.70270422               3           4           4           4
## 767   767    257 0.70270422               3           4           4           4
## 768   768    257 0.70270422               3           4           4           4
## 769   769    263 0.79998246               6           4           6           1
## 770   770    263 0.79998246               6           4           6           1
## 771   771    263 0.79998246               6           4           6           1
## 772   772    263 0.79998246               6           4           6           1
## 773   773    263 0.79998246               6           4           6           1
## 774   774    263 0.79998246               6           4           6           1
## 775   775    263 0.79998246               6           4           6           1
## 776   776    263 0.79998246               6           4           6           1
## 777   777    263 0.79998246               6           4           6           1
## 778   778    263 0.79998246               6           4           6           1
## 779   779    263 0.79998246               6           4           6           1
## 780   780    263 0.79998246               6           4           6           1
## 781   781    263 0.79998246               6           4           6           1
## 782   782    263 0.79998246               6           4           6           1
## 783   783    263 0.79998246               6           4           6           1
## 784   784    263 0.79998246               6           4           6           1
## 785   785    265 0.91542052               3           5           4           1
## 786   786    265 0.91542052               3           5           4           1
## 787   787    265 0.91542052               3           5           4           1
## 788   788    265 0.91542052               3           5           4           1
## 789   789    265 0.91542052               3           5           4           1
## 790   790    265 0.91542052               3           5           4           1
## 791   791    265 0.91542052               3           5           4           1
## 792   792    265 0.91542052               3           5           4           1
## 793   793    265 0.91542052               3           5           4           1
## 794   794    265 0.91542052               3           5           4           1
## 795   795    265 0.91542052               3           5           4           1
## 796   796    265 0.91542052               3           5           4           1
## 797   797    265 0.91542052               3           5           4           1
## 798   798    265 0.91542052               3           5           4           1
## 799   799    265 0.91542052               3           5           4           1
## 800   800    265 0.91542052               3           5           4           1
## 801   801    266 2.57686224               2           4           7           1
## 802   802    266 2.57686224               2           4           7           1
## 803   803    266 2.57686224               2           4           7           1
## 804   804    266 2.57686224               2           4           7           1
## 805   805    266 2.57686224               2           4           7           1
## 806   806    266 2.57686224               2           4           7           1
## 807   807    266 2.57686224               2           4           7           1
## 808   808    266 2.57686224               2           4           7           1
## 809   809    266 2.57686224               2           4           7           1
## 810   810    266 2.57686224               2           4           7           1
## 811   811    266 2.57686224               2           4           7           1
## 812   812    266 2.57686224               2           4           7           1
## 813   813    266 2.57686224               2           4           7           1
## 814   814    266 2.57686224               2           4           7           1
## 815   815    266 2.57686224               2           4           7           1
## 816   816    266 2.57686224               2           4           7           1
## 817   817    269 1.56417708               2           1           1           1
## 818   818    269 1.56417708               2           1           1           1
## 819   819    269 1.56417708               2           1           1           1
## 820   820    269 1.56417708               2           1           1           1
## 821   821    269 1.56417708               2           1           1           1
## 822   822    269 1.56417708               2           1           1           1
## 823   823    269 1.56417708               2           1           1           1
## 824   824    269 1.56417708               2           1           1           1
## 825   825    269 1.56417708               2           1           1           1
## 826   826    269 1.56417708               2           1           1           1
## 827   827    269 1.56417708               2           1           1           1
## 828   828    269 1.56417708               2           1           1           1
## 829   829    269 1.56417708               2           1           1           1
## 830   830    269 1.56417708               2           1           1           1
## 831   831    269 1.56417708               2           1           1           1
## 832   832    269 1.56417708               2           1           1           1
## 833   833    271 0.39623786               1           4           2           1
## 834   834    271 0.39623786               1           4           2           1
## 835   835    271 0.39623786               1           4           2           1
## 836   836    271 0.39623786               1           4           2           1
## 837   837    271 0.39623786               1           4           2           1
## 838   838    271 0.39623786               1           4           2           1
## 839   839    271 0.39623786               1           4           2           1
## 840   840    271 0.39623786               1           4           2           1
## 841   841    271 0.39623786               1           4           2           1
## 842   842    271 0.39623786               1           4           2           1
## 843   843    271 0.39623786               1           4           2           1
## 844   844    271 0.39623786               1           4           2           1
## 845   845    271 0.39623786               1           4           2           1
## 846   846    271 0.39623786               1           4           2           1
## 847   847    271 0.39623786               1           4           2           1
## 848   848    271 0.39623786               1           4           2           1
## 849   849    273 0.74300787               5           6           2           7
## 850   850    273 0.74300787               5           6           2           7
## 851   851    273 0.74300787               5           6           2           7
## 852   852    273 0.74300787               5           6           2           7
## 853   853    273 0.74300787               5           6           2           7
## 854   854    273 0.74300787               5           6           2           7
## 855   855    273 0.74300787               5           6           2           7
## 856   856    273 0.74300787               5           6           2           7
## 857   857    273 0.74300787               5           6           2           7
## 858   858    273 0.74300787               5           6           2           7
## 859   859    273 0.74300787               5           6           2           7
## 860   860    273 0.74300787               5           6           2           7
## 861   861    273 0.74300787               5           6           2           7
## 862   862    273 0.74300787               5           6           2           7
## 863   863    273 0.74300787               5           6           2           7
## 864   864    273 0.74300787               5           6           2           7
## 865   865    274 0.89953930               6           1           3           1
## 866   866    274 0.89953930               6           1           3           1
## 867   867    274 0.89953930               6           1           3           1
## 868   868    274 0.89953930               6           1           3           1
## 869   869    274 0.89953930               6           1           3           1
## 870   870    274 0.89953930               6           1           3           1
## 871   871    274 0.89953930               6           1           3           1
## 872   872    274 0.89953930               6           1           3           1
## 873   873    274 0.89953930               6           1           3           1
## 874   874    274 0.89953930               6           1           3           1
## 875   875    274 0.89953930               6           1           3           1
## 876   876    274 0.89953930               6           1           3           1
## 877   877    274 0.89953930               6           1           3           1
## 878   878    274 0.89953930               6           1           3           1
## 879   879    274 0.89953930               6           1           3           1
## 880   880    274 0.89953930               6           1           3           1
## 881   881    275 0.75531802               6           4           4           3
## 882   882    275 0.75531802               6           4           4           3
## 883   883    275 0.75531802               6           4           4           3
## 884   884    275 0.75531802               6           4           4           3
## 885   885    275 0.75531802               6           4           4           3
## 886   886    275 0.75531802               6           4           4           3
## 887   887    275 0.75531802               6           4           4           3
## 888   888    275 0.75531802               6           4           4           3
## 889   889    275 0.75531802               6           4           4           3
## 890   890    275 0.75531802               6           4           4           3
## 891   891    275 0.75531802               6           4           4           3
## 892   892    275 0.75531802               6           4           4           3
## 893   893    275 0.75531802               6           4           4           3
## 894   894    275 0.75531802               6           4           4           3
## 895   895    275 0.75531802               6           4           4           3
## 896   896    275 0.75531802               6           4           4           3
## 897   897    282 0.73830289               2           2           5           3
## 898   898    282 0.73830289               2           2           5           3
## 899   899    282 0.73830289               2           2           5           3
## 900   900    282 0.73830289               2           2           5           3
## 901   901    282 0.73830289               2           2           5           3
## 902   902    282 0.73830289               2           2           5           3
## 903   903    282 0.73830289               2           2           5           3
## 904   904    282 0.73830289               2           2           5           3
## 905   905    282 0.73830289               2           2           5           3
## 906   906    282 0.73830289               2           2           5           3
## 907   907    282 0.73830289               2           2           5           3
## 908   908    282 0.73830289               2           2           5           3
## 909   909    282 0.73830289               2           2           5           3
## 910   910    282 0.73830289               2           2           5           3
## 911   911    282 0.73830289               2           2           5           3
## 912   912    282 0.73830289               2           2           5           3
## 913   913    285 0.45948958               2           2           2           2
## 914   914    285 0.45948958               2           2           2           2
## 915   915    285 0.45948958               2           2           2           2
## 916   916    285 0.45948958               2           2           2           2
## 917   917    285 0.45948958               2           2           2           2
## 918   918    285 0.45948958               2           2           2           2
## 919   919    285 0.45948958               2           2           2           2
## 920   920    285 0.45948958               2           2           2           2
## 921   921    285 0.45948958               2           2           2           2
## 922   922    285 0.45948958               2           2           2           2
## 923   923    285 0.45948958               2           2           2           2
## 924   924    285 0.45948958               2           2           2           2
## 925   925    285 0.45948958               2           2           2           2
## 926   926    285 0.45948958               2           2           2           2
## 927   927    285 0.45948958               2           2           2           2
## 928   928    285 0.45948958               2           2           2           2
## 929   929    290 0.67218753               2           5           5           6
## 930   930    290 0.67218753               2           5           5           6
## 931   931    290 0.67218753               2           5           5           6
## 932   932    290 0.67218753               2           5           5           6
## 933   933    290 0.67218753               2           5           5           6
## 934   934    290 0.67218753               2           5           5           6
## 935   935    290 0.67218753               2           5           5           6
## 936   936    290 0.67218753               2           5           5           6
## 937   937    290 0.67218753               2           5           5           6
## 938   938    290 0.67218753               2           5           5           6
## 939   939    290 0.67218753               2           5           5           6
## 940   940    290 0.67218753               2           5           5           6
## 941   941    290 0.67218753               2           5           5           6
## 942   942    290 0.67218753               2           5           5           6
## 943   943    290 0.67218753               2           5           5           6
## 944   944    290 0.67218753               2           5           5           6
## 945   945    305 0.42993877               5           4           4           2
## 946   946    305 0.42993877               5           4           4           2
## 947   947    305 0.42993877               5           4           4           2
## 948   948    305 0.42993877               5           4           4           2
## 949   949    305 0.42993877               5           4           4           2
## 950   950    305 0.42993877               5           4           4           2
## 951   951    305 0.42993877               5           4           4           2
## 952   952    305 0.42993877               5           4           4           2
## 953   953    305 0.42993877               5           4           4           2
## 954   954    305 0.42993877               5           4           4           2
## 955   955    305 0.42993877               5           4           4           2
## 956   956    305 0.42993877               5           4           4           2
## 957   957    305 0.42993877               5           4           4           2
## 958   958    305 0.42993877               5           4           4           2
## 959   959    305 0.42993877               5           4           4           2
## 960   960    305 0.42993877               5           4           4           2
## 961   961    307 1.95852135               3           4           4           2
## 962   962    307 1.95852135               3           4           4           2
## 963   963    307 1.95852135               3           4           4           2
## 964   964    307 1.95852135               3           4           4           2
## 965   965    307 1.95852135               3           4           4           2
## 966   966    307 1.95852135               3           4           4           2
## 967   967    307 1.95852135               3           4           4           2
## 968   968    307 1.95852135               3           4           4           2
## 969   969    307 1.95852135               3           4           4           2
## 970   970    307 1.95852135               3           4           4           2
## 971   971    307 1.95852135               3           4           4           2
## 972   972    307 1.95852135               3           4           4           2
## 973   973    307 1.95852135               3           4           4           2
## 974   974    307 1.95852135               3           4           4           2
## 975   975    307 1.95852135               3           4           4           2
## 976   976    307 1.95852135               3           4           4           2
## 977   977    314 0.71538879               6           4           4           4
## 978   978    314 0.71538879               6           4           4           4
## 979   979    314 0.71538879               6           4           4           4
## 980   980    314 0.71538879               6           4           4           4
## 981   981    314 0.71538879               6           4           4           4
## 982   982    314 0.71538879               6           4           4           4
## 983   983    314 0.71538879               6           4           4           4
## 984   984    314 0.71538879               6           4           4           4
## 985   985    314 0.71538879               6           4           4           4
## 986   986    314 0.71538879               6           4           4           4
## 987   987    314 0.71538879               6           4           4           4
## 988   988    314 0.71538879               6           4           4           4
## 989   989    314 0.71538879               6           4           4           4
## 990   990    314 0.71538879               6           4           4           4
## 991   991    314 0.71538879               6           4           4           4
## 992   992    314 0.71538879               6           4           4           4
## 993   993    315 1.00950391               1           2           3           1
## 994   994    315 1.00950391               1           2           3           1
## 995   995    315 1.00950391               1           2           3           1
## 996   996    315 1.00950391               1           2           3           1
## 997   997    315 1.00950391               1           2           3           1
## 998   998    315 1.00950391               1           2           3           1
## 999   999    315 1.00950391               1           2           3           1
## 1000 1000    315 1.00950391               1           2           3           1
## 1001 1001    315 1.00950391               1           2           3           1
## 1002 1002    315 1.00950391               1           2           3           1
## 1003 1003    315 1.00950391               1           2           3           1
## 1004 1004    315 1.00950391               1           2           3           1
## 1005 1005    315 1.00950391               1           2           3           1
## 1006 1006    315 1.00950391               1           2           3           1
## 1007 1007    315 1.00950391               1           2           3           1
## 1008 1008    315 1.00950391               1           2           3           1
## 1009 1009    318 1.01207870               6           5           3           5
## 1010 1010    318 1.01207870               6           5           3           5
## 1011 1011    318 1.01207870               6           5           3           5
## 1012 1012    318 1.01207870               6           5           3           5
## 1013 1013    318 1.01207870               6           5           3           5
## 1014 1014    318 1.01207870               6           5           3           5
## 1015 1015    318 1.01207870               6           5           3           5
## 1016 1016    318 1.01207870               6           5           3           5
## 1017 1017    318 1.01207870               6           5           3           5
## 1018 1018    318 1.01207870               6           5           3           5
## 1019 1019    318 1.01207870               6           5           3           5
## 1020 1020    318 1.01207870               6           5           3           5
## 1021 1021    318 1.01207870               6           5           3           5
## 1022 1022    318 1.01207870               6           5           3           5
## 1023 1023    318 1.01207870               6           5           3           5
## 1024 1024    318 1.01207870               6           5           3           5
## 1025 1025    319 2.63109781               5           5           7           1
## 1026 1026    319 2.63109781               5           5           7           1
## 1027 1027    319 2.63109781               5           5           7           1
## 1028 1028    319 2.63109781               5           5           7           1
## 1029 1029    319 2.63109781               5           5           7           1
## 1030 1030    319 2.63109781               5           5           7           1
## 1031 1031    319 2.63109781               5           5           7           1
## 1032 1032    319 2.63109781               5           5           7           1
## 1033 1033    319 2.63109781               5           5           7           1
## 1034 1034    319 2.63109781               5           5           7           1
## 1035 1035    319 2.63109781               5           5           7           1
## 1036 1036    319 2.63109781               5           5           7           1
## 1037 1037    319 2.63109781               5           5           7           1
## 1038 1038    319 2.63109781               5           5           7           1
## 1039 1039    319 2.63109781               5           5           7           1
## 1040 1040    319 2.63109781               5           5           7           1
## 1041 1041    326 0.65213378               3           5           6           4
## 1042 1042    326 0.65213378               3           5           6           4
## 1043 1043    326 0.65213378               3           5           6           4
## 1044 1044    326 0.65213378               3           5           6           4
## 1045 1045    326 0.65213378               3           5           6           4
## 1046 1046    326 0.65213378               3           5           6           4
## 1047 1047    326 0.65213378               3           5           6           4
## 1048 1048    326 0.65213378               3           5           6           4
## 1049 1049    326 0.65213378               3           5           6           4
## 1050 1050    326 0.65213378               3           5           6           4
## 1051 1051    326 0.65213378               3           5           6           4
## 1052 1052    326 0.65213378               3           5           6           4
## 1053 1053    326 0.65213378               3           5           6           4
## 1054 1054    326 0.65213378               3           5           6           4
## 1055 1055    326 0.65213378               3           5           6           4
## 1056 1056    326 0.65213378               3           5           6           4
## 1057 1057    327 0.92856948               2           2           1           1
## 1058 1058    327 0.92856948               2           2           1           1
## 1059 1059    327 0.92856948               2           2           1           1
## 1060 1060    327 0.92856948               2           2           1           1
## 1061 1061    327 0.92856948               2           2           1           1
## 1062 1062    327 0.92856948               2           2           1           1
## 1063 1063    327 0.92856948               2           2           1           1
## 1064 1064    327 0.92856948               2           2           1           1
## 1065 1065    327 0.92856948               2           2           1           1
## 1066 1066    327 0.92856948               2           2           1           1
## 1067 1067    327 0.92856948               2           2           1           1
## 1068 1068    327 0.92856948               2           2           1           1
## 1069 1069    327 0.92856948               2           2           1           1
## 1070 1070    327 0.92856948               2           2           1           1
## 1071 1071    327 0.92856948               2           2           1           1
## 1072 1072    327 0.92856948               2           2           1           1
## 1073 1073    331 0.48962597               6           7           7           7
## 1074 1074    331 0.48962597               6           7           7           7
## 1075 1075    331 0.48962597               6           7           7           7
## 1076 1076    331 0.48962597               6           7           7           7
## 1077 1077    331 0.48962597               6           7           7           7
## 1078 1078    331 0.48962597               6           7           7           7
## 1079 1079    331 0.48962597               6           7           7           7
## 1080 1080    331 0.48962597               6           7           7           7
## 1081 1081    331 0.48962597               6           7           7           7
## 1082 1082    331 0.48962597               6           7           7           7
## 1083 1083    331 0.48962597               6           7           7           7
## 1084 1084    331 0.48962597               6           7           7           7
## 1085 1085    331 0.48962597               6           7           7           7
## 1086 1086    331 0.48962597               6           7           7           7
## 1087 1087    331 0.48962597               6           7           7           7
## 1088 1088    331 0.48962597               6           7           7           7
## 1089 1089    335 0.63504880               5           5           4           4
## 1090 1090    335 0.63504880               5           5           4           4
## 1091 1091    335 0.63504880               5           5           4           4
## 1092 1092    335 0.63504880               5           5           4           4
## 1093 1093    335 0.63504880               5           5           4           4
## 1094 1094    335 0.63504880               5           5           4           4
## 1095 1095    335 0.63504880               5           5           4           4
## 1096 1096    335 0.63504880               5           5           4           4
## 1097 1097    335 0.63504880               5           5           4           4
## 1098 1098    335 0.63504880               5           5           4           4
## 1099 1099    335 0.63504880               5           5           4           4
## 1100 1100    335 0.63504880               5           5           4           4
## 1101 1101    335 0.63504880               5           5           4           4
## 1102 1102    335 0.63504880               5           5           4           4
## 1103 1103    335 0.63504880               5           5           4           4
## 1104 1104    335 0.63504880               5           5           4           4
## 1105 1105    338 0.26334005               2          NA          NA          NA
## 1106 1106    338 0.26334005               2          NA          NA          NA
## 1107 1107    338 0.26334005               2          NA          NA          NA
## 1108 1108    338 0.26334005               2          NA          NA          NA
## 1109 1109    338 0.26334005               2          NA          NA          NA
## 1110 1110    338 0.26334005               2          NA          NA          NA
## 1111 1111    338 0.26334005               2          NA          NA          NA
## 1112 1112    338 0.26334005               2          NA          NA          NA
## 1113 1113    338 0.26334005               2          NA          NA          NA
## 1114 1114    338 0.26334005               2          NA          NA          NA
## 1115 1115    338 0.26334005               2          NA          NA          NA
## 1116 1116    338 0.26334005               2          NA          NA          NA
## 1117 1117    338 0.26334005               2          NA          NA          NA
## 1118 1118    338 0.26334005               2          NA          NA          NA
## 1119 1119    338 0.26334005               2          NA          NA          NA
## 1120 1120    338 0.26334005               2          NA          NA          NA
## 1121 1121    340 0.31604233              NA           6           7           2
## 1122 1122    340 0.31604233              NA           6           7           2
## 1123 1123    340 0.31604233              NA           6           7           2
## 1124 1124    340 0.31604233              NA           6           7           2
## 1125 1125    340 0.31604233              NA           6           7           2
## 1126 1126    340 0.31604233              NA           6           7           2
## 1127 1127    340 0.31604233              NA           6           7           2
## 1128 1128    340 0.31604233              NA           6           7           2
## 1129 1129    340 0.31604233              NA           6           7           2
## 1130 1130    340 0.31604233              NA           6           7           2
## 1131 1131    340 0.31604233              NA           6           7           2
## 1132 1132    340 0.31604233              NA           6           7           2
## 1133 1133    340 0.31604233              NA           6           7           2
## 1134 1134    340 0.31604233              NA           6           7           2
## 1135 1135    340 0.31604233              NA           6           7           2
## 1136 1136    340 0.31604233              NA           6           7           2
## 1137 1137    342 1.67138859               5           5           4           4
## 1138 1138    342 1.67138859               5           5           4           4
## 1139 1139    342 1.67138859               5           5           4           4
## 1140 1140    342 1.67138859               5           5           4           4
## 1141 1141    342 1.67138859               5           5           4           4
## 1142 1142    342 1.67138859               5           5           4           4
## 1143 1143    342 1.67138859               5           5           4           4
## 1144 1144    342 1.67138859               5           5           4           4
## 1145 1145    342 1.67138859               5           5           4           4
## 1146 1146    342 1.67138859               5           5           4           4
## 1147 1147    342 1.67138859               5           5           4           4
## 1148 1148    342 1.67138859               5           5           4           4
## 1149 1149    342 1.67138859               5           5           4           4
## 1150 1150    342 1.67138859               5           5           4           4
## 1151 1151    342 1.67138859               5           5           4           4
## 1152 1152    342 1.67138859               5           5           4           4
## 1153 1153    344 2.13073042               6           6           6           6
## 1154 1154    344 2.13073042               6           6           6           6
## 1155 1155    344 2.13073042               6           6           6           6
## 1156 1156    344 2.13073042               6           6           6           6
## 1157 1157    344 2.13073042               6           6           6           6
## 1158 1158    344 2.13073042               6           6           6           6
## 1159 1159    344 2.13073042               6           6           6           6
## 1160 1160    344 2.13073042               6           6           6           6
## 1161 1161    344 2.13073042               6           6           6           6
## 1162 1162    344 2.13073042               6           6           6           6
## 1163 1163    344 2.13073042               6           6           6           6
## 1164 1164    344 2.13073042               6           6           6           6
## 1165 1165    344 2.13073042               6           6           6           6
## 1166 1166    344 2.13073042               6           6           6           6
## 1167 1167    344 2.13073042               6           6           6           6
## 1168 1168    344 2.13073042               6           6           6           6
## 1169 1169    348 0.28531981               6           3           4           4
## 1170 1170    348 0.28531981               6           3           4           4
## 1171 1171    348 0.28531981               6           3           4           4
## 1172 1172    348 0.28531981               6           3           4           4
## 1173 1173    348 0.28531981               6           3           4           4
## 1174 1174    348 0.28531981               6           3           4           4
## 1175 1175    348 0.28531981               6           3           4           4
## 1176 1176    348 0.28531981               6           3           4           4
## 1177 1177    348 0.28531981               6           3           4           4
## 1178 1178    348 0.28531981               6           3           4           4
## 1179 1179    348 0.28531981               6           3           4           4
## 1180 1180    348 0.28531981               6           3           4           4
## 1181 1181    348 0.28531981               6           3           4           4
## 1182 1182    348 0.28531981               6           3           4           4
## 1183 1183    348 0.28531981               6           3           4           4
## 1184 1184    348 0.28531981               6           3           4           4
## 1185 1185    358 0.31482151               2           3           5           4
## 1186 1186    358 0.31482151               2           3           5           4
## 1187 1187    358 0.31482151               2           3           5           4
## 1188 1188    358 0.31482151               2           3           5           4
## 1189 1189    358 0.31482151               2           3           5           4
## 1190 1190    358 0.31482151               2           3           5           4
## 1191 1191    358 0.31482151               2           3           5           4
## 1192 1192    358 0.31482151               2           3           5           4
## 1193 1193    358 0.31482151               2           3           5           4
## 1194 1194    358 0.31482151               2           3           5           4
## 1195 1195    358 0.31482151               2           3           5           4
## 1196 1196    358 0.31482151               2           3           5           4
## 1197 1197    358 0.31482151               2           3           5           4
## 1198 1198    358 0.31482151               2           3           5           4
## 1199 1199    358 0.31482151               2           3           5           4
## 1200 1200    358 0.31482151               2           3           5           4
## 1201 1201    363 0.72892223               6          NA          NA          NA
## 1202 1202    363 0.72892223               6          NA          NA          NA
## 1203 1203    363 0.72892223               6          NA          NA          NA
## 1204 1204    363 0.72892223               6          NA          NA          NA
## 1205 1205    363 0.72892223               6          NA          NA          NA
## 1206 1206    363 0.72892223               6          NA          NA          NA
## 1207 1207    363 0.72892223               6          NA          NA          NA
## 1208 1208    363 0.72892223               6          NA          NA          NA
## 1209 1209    363 0.72892223               6          NA          NA          NA
## 1210 1210    363 0.72892223               6          NA          NA          NA
## 1211 1211    363 0.72892223               6          NA          NA          NA
## 1212 1212    363 0.72892223               6          NA          NA          NA
## 1213 1213    363 0.72892223               6          NA          NA          NA
## 1214 1214    363 0.72892223               6          NA          NA          NA
## 1215 1215    363 0.72892223               6          NA          NA          NA
## 1216 1216    363 0.72892223               6          NA          NA          NA
## 1217 1217    365 0.10237293               3           3           3           1
## 1218 1218    365 0.10237293               3           3           3           1
## 1219 1219    365 0.10237293               3           3           3           1
## 1220 1220    365 0.10237293               3           3           3           1
## 1221 1221    365 0.10237293               3           3           3           1
## 1222 1222    365 0.10237293               3           3           3           1
## 1223 1223    365 0.10237293               3           3           3           1
## 1224 1224    365 0.10237293               3           3           3           1
## 1225 1225    365 0.10237293               3           3           3           1
## 1226 1226    365 0.10237293               3           3           3           1
## 1227 1227    365 0.10237293               3           3           3           1
## 1228 1228    365 0.10237293               3           3           3           1
## 1229 1229    365 0.10237293               3           3           3           1
## 1230 1230    365 0.10237293               3           3           3           1
## 1231 1231    365 0.10237293               3           3           3           1
## 1232 1232    365 0.10237293               3           3           3           1
## 1233 1233    366 1.87702205               6           2           7           4
## 1234 1234    366 1.87702205               6           2           7           4
## 1235 1235    366 1.87702205               6           2           7           4
## 1236 1236    366 1.87702205               6           2           7           4
## 1237 1237    366 1.87702205               6           2           7           4
## 1238 1238    366 1.87702205               6           2           7           4
## 1239 1239    366 1.87702205               6           2           7           4
## 1240 1240    366 1.87702205               6           2           7           4
## 1241 1241    366 1.87702205               6           2           7           4
## 1242 1242    366 1.87702205               6           2           7           4
## 1243 1243    366 1.87702205               6           2           7           4
## 1244 1244    366 1.87702205               6           2           7           4
## 1245 1245    366 1.87702205               6           2           7           4
## 1246 1246    366 1.87702205               6           2           7           4
## 1247 1247    366 1.87702205               6           2           7           4
## 1248 1248    366 1.87702205               6           2           7           4
## 1249 1249    367 1.11126306               6           4           5           3
## 1250 1250    367 1.11126306               6           4           5           3
## 1251 1251    367 1.11126306               6           4           5           3
## 1252 1252    367 1.11126306               6           4           5           3
## 1253 1253    367 1.11126306               6           4           5           3
## 1254 1254    367 1.11126306               6           4           5           3
## 1255 1255    367 1.11126306               6           4           5           3
## 1256 1256    367 1.11126306               6           4           5           3
## 1257 1257    367 1.11126306               6           4           5           3
## 1258 1258    367 1.11126306               6           4           5           3
## 1259 1259    367 1.11126306               6           4           5           3
## 1260 1260    367 1.11126306               6           4           5           3
## 1261 1261    367 1.11126306               6           4           5           3
## 1262 1262    367 1.11126306               6           4           5           3
## 1263 1263    367 1.11126306               6           4           5           3
## 1264 1264    367 1.11126306               6           4           5           3
## 1265 1265    369 1.47427989               2           1           1           1
## 1266 1266    369 1.47427989               2           1           1           1
## 1267 1267    369 1.47427989               2           1           1           1
## 1268 1268    369 1.47427989               2           1           1           1
## 1269 1269    369 1.47427989               2           1           1           1
## 1270 1270    369 1.47427989               2           1           1           1
## 1271 1271    369 1.47427989               2           1           1           1
## 1272 1272    369 1.47427989               2           1           1           1
## 1273 1273    369 1.47427989               2           1           1           1
## 1274 1274    369 1.47427989               2           1           1           1
## 1275 1275    369 1.47427989               2           1           1           1
## 1276 1276    369 1.47427989               2           1           1           1
## 1277 1277    369 1.47427989               2           1           1           1
## 1278 1278    369 1.47427989               2           1           1           1
## 1279 1279    369 1.47427989               2           1           1           1
## 1280 1280    369 1.47427989               2           1           1           1
## 1281 1281    376 0.66746369               6           1           1           3
## 1282 1282    376 0.66746369               6           1           1           3
## 1283 1283    376 0.66746369               6           1           1           3
## 1284 1284    376 0.66746369               6           1           1           3
## 1285 1285    376 0.66746369               6           1           1           3
## 1286 1286    376 0.66746369               6           1           1           3
## 1287 1287    376 0.66746369               6           1           1           3
## 1288 1288    376 0.66746369               6           1           1           3
## 1289 1289    376 0.66746369               6           1           1           3
## 1290 1290    376 0.66746369               6           1           1           3
## 1291 1291    376 0.66746369               6           1           1           3
## 1292 1292    376 0.66746369               6           1           1           3
## 1293 1293    376 0.66746369               6           1           1           3
## 1294 1294    376 0.66746369               6           1           1           3
## 1295 1295    376 0.66746369               6           1           1           3
## 1296 1296    376 0.66746369               6           1           1           3
## 1297 1297    385 0.36866166               3           3           1           3
## 1298 1298    385 0.36866166               3           3           1           3
## 1299 1299    385 0.36866166               3           3           1           3
## 1300 1300    385 0.36866166               3           3           1           3
## 1301 1301    385 0.36866166               3           3           1           3
## 1302 1302    385 0.36866166               3           3           1           3
## 1303 1303    385 0.36866166               3           3           1           3
## 1304 1304    385 0.36866166               3           3           1           3
## 1305 1305    385 0.36866166               3           3           1           3
## 1306 1306    385 0.36866166               3           3           1           3
## 1307 1307    385 0.36866166               3           3           1           3
## 1308 1308    385 0.36866166               3           3           1           3
## 1309 1309    385 0.36866166               3           3           1           3
## 1310 1310    385 0.36866166               3           3           1           3
## 1311 1311    385 0.36866166               3           3           1           3
## 1312 1312    385 0.36866166               3           3           1           3
## 1313 1313    388 0.57363495               1           2           3           1
## 1314 1314    388 0.57363495               1           2           3           1
## 1315 1315    388 0.57363495               1           2           3           1
##      Secularism4 MayorPresidentRandom1 AttributeOrder1 AttributeOrder2
## 1              3                     1               4               8
## 2              3                     1               4               8
## 3              3                     1               4               8
## 4              3                     1               4               8
## 5              3                     1               4               8
## 6              3                     1               4               8
## 7              3                     1               4               8
## 8              3                     1               4               8
## 9              3                     1               4               8
## 10             3                     1               4               8
## 11             3                     1               4               8
## 12             3                     1               4               8
## 13             3                     1               4               8
## 14             3                     1               4               8
## 15             3                     1               4               8
## 16             3                     1               4               8
## 17             1                     1               8               2
## 18             1                     1               8               2
## 19             1                     1               8               2
## 20             1                     1               8               2
## 21             1                     1               8               2
## 22             1                     1               8               2
## 23             1                     1               8               2
## 24             1                     1               8               2
## 25             1                     1               8               2
## 26             1                     1               8               2
## 27             1                     1               8               2
## 28             1                     1               8               2
## 29             1                     1               8               2
## 30             1                     1               8               2
## 31             1                     1               8               2
## 32             1                     1               8               2
## 33             7                     2               8               5
## 34             7                     2               8               5
## 35             7                     2               8               5
## 36             7                     2               8               5
## 37             7                     2               8               5
## 38             7                     2               8               5
## 39             7                     2               8               5
## 40             7                     2               8               5
## 41             7                     2               8               5
## 42             7                     2               8               5
## 43             7                     2               8               5
## 44             7                     2               8               5
## 45             7                     2               8               5
## 46             7                     2               8               5
## 47             7                     2               8               5
## 48             7                     2               8               5
## 49             7                     1               8               4
## 50             7                     1               8               4
## 51             7                     1               8               4
## 52             7                     1               8               4
## 53             7                     1               8               4
## 54             7                     1               8               4
## 55             7                     1               8               4
## 56             7                     1               8               4
## 57             7                     1               8               4
## 58             7                     1               8               4
## 59             7                     1               8               4
## 60             7                     1               8               4
## 61             7                     1               8               4
## 62             7                     1               8               4
## 63             7                     1               8               4
## 64             7                     1               8               4
## 65             1                     2               1               2
## 66             1                     2               1               2
## 67             1                     2               1               2
## 68             1                     2               1               2
## 69             1                     2               1               2
## 70             1                     2               1               2
## 71             1                     2               1               2
## 72             1                     2               1               2
## 73             1                     2               1               2
## 74             1                     2               1               2
## 75             1                     2               1               2
## 76             1                     2               1               2
## 77             1                     2               1               2
## 78             1                     2               1               2
## 79             1                     2               1               2
## 80             1                     2               1               2
## 81             4                     1               3               6
## 82             4                     1               3               6
## 83             4                     1               3               6
## 84             4                     1               3               6
## 85             4                     1               3               6
## 86             4                     1               3               6
## 87             4                     1               3               6
## 88             4                     1               3               6
## 89             4                     1               3               6
## 90             4                     1               3               6
## 91             4                     1               3               6
## 92             4                     1               3               6
## 93             4                     1               3               6
## 94             4                     1               3               6
## 95             4                     1               3               6
## 96             4                     1               3               6
## 97             3                     2               5               7
## 98             3                     2               5               7
## 99             3                     2               5               7
## 100            3                     2               5               7
## 101            3                     2               5               7
## 102            3                     2               5               7
## 103            3                     2               5               7
## 104            3                     2               5               7
## 105            3                     2               5               7
## 106            3                     2               5               7
## 107            3                     2               5               7
## 108            3                     2               5               7
## 109            3                     2               5               7
## 110            3                     2               5               7
## 111            3                     2               5               7
## 112            3                     2               5               7
## 113            2                     2               5               7
## 114            2                     2               5               7
## 115            2                     2               5               7
## 116            2                     2               5               7
## 117            2                     2               5               7
## 118            2                     2               5               7
## 119            2                     2               5               7
## 120            2                     2               5               7
## 121            2                     2               5               7
## 122            2                     2               5               7
## 123            2                     2               5               7
## 124            2                     2               5               7
## 125            2                     2               5               7
## 126            2                     2               5               7
## 127            2                     2               5               7
## 128            2                     2               5               7
## 129            6                     2               3               8
## 130            6                     2               3               8
## 131            6                     2               3               8
## 132            6                     2               3               8
## 133            6                     2               3               8
## 134            6                     2               3               8
## 135            6                     2               3               8
## 136            6                     2               3               8
## 137            6                     2               3               8
## 138            6                     2               3               8
## 139            6                     2               3               8
## 140            6                     2               3               8
## 141            6                     2               3               8
## 142            6                     2               3               8
## 143            6                     2               3               8
## 144            6                     2               3               8
## 145            3                     2               8               6
## 146            3                     2               8               6
## 147            3                     2               8               6
## 148            3                     2               8               6
## 149            3                     2               8               6
## 150            3                     2               8               6
## 151            3                     2               8               6
## 152            3                     2               8               6
## 153            3                     2               8               6
## 154            3                     2               8               6
## 155            3                     2               8               6
## 156            3                     2               8               6
## 157            3                     2               8               6
## 158            3                     2               8               6
## 159            3                     2               8               6
## 160            3                     2               8               6
## 161            4                     2               4               7
## 162            4                     2               4               7
## 163            4                     2               4               7
## 164            4                     2               4               7
## 165            4                     2               4               7
## 166            4                     2               4               7
## 167            4                     2               4               7
## 168            4                     2               4               7
## 169            4                     2               4               7
## 170            4                     2               4               7
## 171            4                     2               4               7
## 172            4                     2               4               7
## 173            4                     2               4               7
## 174            4                     2               4               7
## 175            4                     2               4               7
## 176            4                     2               4               7
## 177            7                     2               3               1
## 178            7                     2               3               1
## 179            7                     2               3               1
## 180            7                     2               3               1
## 181            7                     2               3               1
## 182            7                     2               3               1
## 183            7                     2               3               1
## 184            7                     2               3               1
## 185            7                     2               3               1
## 186            7                     2               3               1
## 187            7                     2               3               1
## 188            7                     2               3               1
## 189            7                     2               3               1
## 190            7                     2               3               1
## 191            7                     2               3               1
## 192            7                     2               3               1
## 193            1                     1               4               6
## 194            1                     1               4               6
## 195            1                     1               4               6
## 196            1                     1               4               6
## 197            1                     1               4               6
## 198            1                     1               4               6
## 199            1                     1               4               6
## 200            1                     1               4               6
## 201            1                     1               4               6
## 202            1                     1               4               6
## 203            1                     1               4               6
## 204            1                     1               4               6
## 205            1                     1               4               6
## 206            1                     1               4               6
## 207            1                     1               4               6
## 208            1                     1               4               6
## 209            1                     1               2               3
## 210            1                     1               2               3
## 211            1                     1               2               3
## 212            1                     1               2               3
## 213            1                     1               2               3
## 214            1                     1               2               3
## 215            1                     1               2               3
## 216            1                     1               2               3
## 217            1                     1               2               3
## 218            1                     1               2               3
## 219            1                     1               2               3
## 220            1                     1               2               3
## 221            1                     1               2               3
## 222            1                     1               2               3
## 223            1                     1               2               3
## 224            1                     1               2               3
## 225            6                     1               2               8
## 226            6                     1               2               8
## 227            6                     1               2               8
## 228            6                     1               2               8
## 229            6                     1               2               8
## 230            6                     1               2               8
## 231            6                     1               2               8
## 232            6                     1               2               8
## 233            6                     1               2               8
## 234            6                     1               2               8
## 235            6                     1               2               8
## 236            6                     1               2               8
## 237            6                     1               2               8
## 238            6                     1               2               8
## 239            6                     1               2               8
## 240            6                     1               2               8
## 241            4                     1               1               2
## 242            4                     1               1               2
## 243            4                     1               1               2
## 244            4                     1               1               2
## 245            4                     1               1               2
## 246            4                     1               1               2
## 247            4                     1               1               2
## 248            4                     1               1               2
## 249            4                     1               1               2
## 250            4                     1               1               2
## 251            4                     1               1               2
## 252            4                     1               1               2
## 253            4                     1               1               2
## 254            4                     1               1               2
## 255            4                     1               1               2
## 256            4                     1               1               2
## 257            2                     2               6               8
## 258            2                     2               6               8
## 259            2                     2               6               8
## 260            2                     2               6               8
## 261            2                     2               6               8
## 262            2                     2               6               8
## 263            2                     2               6               8
## 264            2                     2               6               8
## 265            2                     2               6               8
## 266            2                     2               6               8
## 267            2                     2               6               8
## 268            2                     2               6               8
## 269            2                     2               6               8
## 270            2                     2               6               8
## 271            2                     2               6               8
## 272            2                     2               6               8
## 273            1                     1               1               6
## 274            1                     1               1               6
## 275            1                     1               1               6
## 276            1                     1               1               6
## 277            1                     1               1               6
## 278            1                     1               1               6
## 279            1                     1               1               6
## 280            1                     1               1               6
## 281            1                     1               1               6
## 282            1                     1               1               6
## 283            1                     1               1               6
## 284            1                     1               1               6
## 285            1                     1               1               6
## 286            1                     1               1               6
## 287            1                     1               1               6
## 288            1                     1               1               6
## 289            1                     2               1               8
## 290            1                     2               1               8
## 291            1                     2               1               8
## 292            1                     2               1               8
## 293            1                     2               1               8
## 294            1                     2               1               8
## 295            1                     2               1               8
## 296            1                     2               1               8
## 297            1                     2               1               8
## 298            1                     2               1               8
## 299            1                     2               1               8
## 300            1                     2               1               8
## 301            1                     2               1               8
## 302            1                     2               1               8
## 303            1                     2               1               8
## 304            1                     2               1               8
## 305            3                     2               4               3
## 306            3                     2               4               3
## 307            3                     2               4               3
## 308            3                     2               4               3
## 309            3                     2               4               3
## 310            3                     2               4               3
## 311            3                     2               4               3
## 312            3                     2               4               3
## 313            3                     2               4               3
## 314            3                     2               4               3
## 315            3                     2               4               3
## 316            3                     2               4               3
## 317            3                     2               4               3
## 318            3                     2               4               3
## 319            3                     2               4               3
## 320            3                     2               4               3
## 321            3                     2               2               1
## 322            3                     2               2               1
## 323            3                     2               2               1
## 324            3                     2               2               1
## 325            3                     2               2               1
## 326            3                     2               2               1
## 327            3                     2               2               1
## 328            3                     2               2               1
## 329            3                     2               2               1
## 330            3                     2               2               1
## 331            3                     2               2               1
## 332            3                     2               2               1
## 333            3                     2               2               1
## 334            3                     2               2               1
## 335            3                     2               2               1
## 336            3                     2               2               1
## 337            2                     2               6               1
## 338            2                     2               6               1
## 339            2                     2               6               1
## 340            2                     2               6               1
## 341            2                     2               6               1
## 342            2                     2               6               1
## 343            2                     2               6               1
## 344            2                     2               6               1
## 345            2                     2               6               1
## 346            2                     2               6               1
## 347            2                     2               6               1
## 348            2                     2               6               1
## 349            2                     2               6               1
## 350            2                     2               6               1
## 351            2                     2               6               1
## 352            2                     2               6               1
## 353            4                     1               5               8
## 354            4                     1               5               8
## 355            4                     1               5               8
## 356            4                     1               5               8
## 357            4                     1               5               8
## 358            4                     1               5               8
## 359            4                     1               5               8
## 360            4                     1               5               8
## 361            4                     1               5               8
## 362            4                     1               5               8
## 363            4                     1               5               8
## 364            4                     1               5               8
## 365            4                     1               5               8
## 366            4                     1               5               8
## 367            4                     1               5               8
## 368            4                     1               5               8
## 369            4                     2               5               8
## 370            4                     2               5               8
## 371            4                     2               5               8
## 372            4                     2               5               8
## 373            4                     2               5               8
## 374            4                     2               5               8
## 375            4                     2               5               8
## 376            4                     2               5               8
## 377            4                     2               5               8
## 378            4                     2               5               8
## 379            4                     2               5               8
## 380            4                     2               5               8
## 381            4                     2               5               8
## 382            4                     2               5               8
## 383            4                     2               5               8
## 384            4                     2               5               8
## 385            5                     2               2               1
## 386            5                     2               2               1
## 387            5                     2               2               1
## 388            5                     2               2               1
## 389            5                     2               2               1
## 390            5                     2               2               1
## 391            5                     2               2               1
## 392            5                     2               2               1
## 393            5                     2               2               1
## 394            5                     2               2               1
## 395            5                     2               2               1
## 396            5                     2               2               1
## 397            5                     2               2               1
## 398            5                     2               2               1
## 399            5                     2               2               1
## 400            5                     2               2               1
## 401            4                     2               5               6
## 402            4                     2               5               6
## 403            4                     2               5               6
## 404            4                     2               5               6
## 405            4                     2               5               6
## 406            4                     2               5               6
## 407            4                     2               5               6
## 408            4                     2               5               6
## 409            4                     2               5               6
## 410            4                     2               5               6
## 411            4                     2               5               6
## 412            4                     2               5               6
## 413            4                     2               5               6
## 414            4                     2               5               6
## 415            4                     2               5               6
## 416            4                     2               5               6
## 417            2                     2               4               7
## 418            2                     2               4               7
## 419            2                     2               4               7
## 420            2                     2               4               7
## 421            2                     2               4               7
## 422            2                     2               4               7
## 423            2                     2               4               7
## 424            2                     2               4               7
## 425            2                     2               4               7
## 426            2                     2               4               7
## 427            2                     2               4               7
## 428            2                     2               4               7
## 429            2                     2               4               7
## 430            2                     2               4               7
## 431            2                     2               4               7
## 432            2                     2               4               7
## 433            6                     2               2               7
## 434            6                     2               2               7
## 435            6                     2               2               7
## 436            6                     2               2               7
## 437            6                     2               2               7
## 438            6                     2               2               7
## 439            6                     2               2               7
## 440            6                     2               2               7
## 441            6                     2               2               7
## 442            6                     2               2               7
## 443            6                     2               2               7
## 444            6                     2               2               7
## 445            6                     2               2               7
## 446            6                     2               2               7
## 447            6                     2               2               7
## 448            6                     2               2               7
## 449            2                     2               7               8
## 450            2                     2               7               8
## 451            2                     2               7               8
## 452            2                     2               7               8
## 453            2                     2               7               8
## 454            2                     2               7               8
## 455            2                     2               7               8
## 456            2                     2               7               8
## 457            2                     2               7               8
## 458            2                     2               7               8
## 459            2                     2               7               8
## 460            2                     2               7               8
## 461            2                     2               7               8
## 462            2                     2               7               8
## 463            2                     2               7               8
## 464            2                     2               7               8
## 465            2                     1               7               8
## 466            2                     1               7               8
## 467            2                     1               7               8
## 468            2                     1               7               8
## 469            2                     1               7               8
## 470            2                     1               7               8
## 471            2                     1               7               8
## 472            2                     1               7               8
## 473            2                     1               7               8
## 474            2                     1               7               8
## 475            2                     1               7               8
## 476            2                     1               7               8
## 477            2                     1               7               8
## 478            2                     1               7               8
## 479            2                     1               7               8
## 480            2                     1               7               8
## 481            1                     1               2               3
## 482            1                     1               2               3
## 483            1                     1               2               3
## 484            1                     1               2               3
## 485            1                     1               2               3
## 486            1                     1               2               3
## 487            1                     1               2               3
## 488            1                     1               2               3
## 489            1                     1               2               3
## 490            1                     1               2               3
## 491            1                     1               2               3
## 492            1                     1               2               3
## 493            1                     1               2               3
## 494            1                     1               2               3
## 495            1                     1               2               3
## 496            1                     1               2               3
## 497            4                     1               6               5
## 498            4                     1               6               5
## 499            4                     1               6               5
## 500            4                     1               6               5
## 501            4                     1               6               5
## 502            4                     1               6               5
## 503            4                     1               6               5
## 504            4                     1               6               5
## 505            4                     1               6               5
## 506            4                     1               6               5
## 507            4                     1               6               5
## 508            4                     1               6               5
## 509            4                     1               6               5
## 510            4                     1               6               5
## 511            4                     1               6               5
## 512            4                     1               6               5
## 513            1                     2               2               6
## 514            1                     2               2               6
## 515            1                     2               2               6
## 516            1                     2               2               6
## 517            1                     2               2               6
## 518            1                     2               2               6
## 519            1                     2               2               6
## 520            1                     2               2               6
## 521            1                     2               2               6
## 522            1                     2               2               6
## 523            1                     2               2               6
## 524            1                     2               2               6
## 525            1                     2               2               6
## 526            1                     2               2               6
## 527            1                     2               2               6
## 528            1                     2               2               6
## 529            4                     2               1               3
## 530            4                     2               1               3
## 531            4                     2               1               3
## 532            4                     2               1               3
## 533            4                     2               1               3
## 534            4                     2               1               3
## 535            4                     2               1               3
## 536            4                     2               1               3
## 537            4                     2               1               3
## 538            4                     2               1               3
## 539            4                     2               1               3
## 540            4                     2               1               3
## 541            4                     2               1               3
## 542            4                     2               1               3
## 543            4                     2               1               3
## 544            4                     2               1               3
## 545            1                     1               4               8
## 546            1                     1               4               8
## 547            1                     1               4               8
## 548            1                     1               4               8
## 549            1                     1               4               8
## 550            1                     1               4               8
## 551            1                     1               4               8
## 552            1                     1               4               8
## 553            1                     1               4               8
## 554            1                     1               4               8
## 555            1                     1               4               8
## 556            1                     1               4               8
## 557            1                     1               4               8
## 558            1                     1               4               8
## 559            1                     1               4               8
## 560            1                     1               4               8
## 561            1                     2               2               6
## 562            1                     2               2               6
## 563            1                     2               2               6
## 564            1                     2               2               6
## 565            1                     2               2               6
## 566            1                     2               2               6
## 567            1                     2               2               6
## 568            1                     2               2               6
## 569            1                     2               2               6
## 570            1                     2               2               6
## 571            1                     2               2               6
## 572            1                     2               2               6
## 573            1                     2               2               6
## 574            1                     2               2               6
## 575            1                     2               2               6
## 576            1                     2               2               6
## 577            3                     1               8               6
## 578            3                     1               8               6
## 579            3                     1               8               6
## 580            3                     1               8               6
## 581            3                     1               8               6
## 582            3                     1               8               6
## 583            3                     1               8               6
## 584            3                     1               8               6
## 585            3                     1               8               6
## 586            3                     1               8               6
## 587            3                     1               8               6
## 588            3                     1               8               6
## 589            3                     1               8               6
## 590            3                     1               8               6
## 591            3                     1               8               6
## 592            3                     1               8               6
## 593            1                     1               7               4
## 594            1                     1               7               4
## 595            1                     1               7               4
## 596            1                     1               7               4
## 597            1                     1               7               4
## 598            1                     1               7               4
## 599            1                     1               7               4
## 600            1                     1               7               4
## 601            1                     1               7               4
## 602            1                     1               7               4
## 603            1                     1               7               4
## 604            1                     1               7               4
## 605            1                     1               7               4
## 606            1                     1               7               4
## 607            1                     1               7               4
## 608            1                     1               7               4
## 609            7                     1               2               8
## 610            7                     1               2               8
## 611            7                     1               2               8
## 612            7                     1               2               8
## 613            7                     1               2               8
## 614            7                     1               2               8
## 615            7                     1               2               8
## 616            7                     1               2               8
## 617            7                     1               2               8
## 618            7                     1               2               8
## 619            7                     1               2               8
## 620            7                     1               2               8
## 621            7                     1               2               8
## 622            7                     1               2               8
## 623            7                     1               2               8
## 624            7                     1               2               8
## 625            3                     1               1               8
## 626            3                     1               1               8
## 627            3                     1               1               8
## 628            3                     1               1               8
## 629            3                     1               1               8
## 630            3                     1               1               8
## 631            3                     1               1               8
## 632            3                     1               1               8
## 633            3                     1               1               8
## 634            3                     1               1               8
## 635            3                     1               1               8
## 636            3                     1               1               8
## 637            3                     1               1               8
## 638            3                     1               1               8
## 639            3                     1               1               8
## 640            3                     1               1               8
## 641            2                     1               2               6
## 642            2                     1               2               6
## 643            2                     1               2               6
## 644            2                     1               2               6
## 645            2                     1               2               6
## 646            2                     1               2               6
## 647            2                     1               2               6
## 648            2                     1               2               6
## 649            2                     1               2               6
## 650            2                     1               2               6
## 651            2                     1               2               6
## 652            2                     1               2               6
## 653            2                     1               2               6
## 654            2                     1               2               6
## 655            2                     1               2               6
## 656            2                     1               2               6
## 657            1                     2               8               1
## 658            1                     2               8               1
## 659            1                     2               8               1
## 660            1                     2               8               1
## 661            1                     2               8               1
## 662            1                     2               8               1
## 663            1                     2               8               1
## 664            1                     2               8               1
## 665            1                     2               8               1
## 666            1                     2               8               1
## 667            1                     2               8               1
## 668            1                     2               8               1
## 669            1                     2               8               1
## 670            1                     2               8               1
## 671            1                     2               8               1
## 672            1                     2               8               1
## 673            2                     1               1               4
## 674            2                     1               1               4
## 675            2                     1               1               4
## 676            2                     1               1               4
## 677            2                     1               1               4
## 678            2                     1               1               4
## 679            2                     1               1               4
## 680            2                     1               1               4
## 681            2                     1               1               4
## 682            2                     1               1               4
## 683            2                     1               1               4
## 684            2                     1               1               4
## 685            2                     1               1               4
## 686            2                     1               1               4
## 687            2                     1               1               4
## 688            2                     1               1               4
## 689            4                     2               7               6
## 690            4                     2               7               6
## 691            4                     2               7               6
## 692            4                     2               7               6
## 693            4                     2               7               6
## 694            4                     2               7               6
## 695            4                     2               7               6
## 696            4                     2               7               6
## 697            4                     2               7               6
## 698            4                     2               7               6
## 699            4                     2               7               6
## 700            4                     2               7               6
## 701            4                     2               7               6
## 702            4                     2               7               6
## 703            4                     2               7               6
## 704            4                     2               7               6
## 705            4                     1               6               2
## 706            4                     1               6               2
## 707            4                     1               6               2
## 708            4                     1               6               2
## 709            4                     1               6               2
## 710            4                     1               6               2
## 711            4                     1               6               2
## 712            4                     1               6               2
## 713            4                     1               6               2
## 714            4                     1               6               2
## 715            4                     1               6               2
## 716            4                     1               6               2
## 717            4                     1               6               2
## 718            4                     1               6               2
## 719            4                     1               6               2
## 720            4                     1               6               2
## 721            3                     1               4               8
## 722            3                     1               4               8
## 723            3                     1               4               8
## 724            3                     1               4               8
## 725            3                     1               4               8
## 726            3                     1               4               8
## 727            3                     1               4               8
## 728            3                     1               4               8
## 729            3                     1               4               8
## 730            3                     1               4               8
## 731            3                     1               4               8
## 732            3                     1               4               8
## 733            3                     1               4               8
## 734            3                     1               4               8
## 735            3                     1               4               8
## 736            3                     1               4               8
## 737            7                     2               7               4
## 738            7                     2               7               4
## 739            7                     2               7               4
## 740            7                     2               7               4
## 741            7                     2               7               4
## 742            7                     2               7               4
## 743            7                     2               7               4
## 744            7                     2               7               4
## 745            7                     2               7               4
## 746            7                     2               7               4
## 747            7                     2               7               4
## 748            7                     2               7               4
## 749            7                     2               7               4
## 750            7                     2               7               4
## 751            7                     2               7               4
## 752            7                     2               7               4
## 753            4                     1               7               3
## 754            4                     1               7               3
## 755            4                     1               7               3
## 756            4                     1               7               3
## 757            4                     1               7               3
## 758            4                     1               7               3
## 759            4                     1               7               3
## 760            4                     1               7               3
## 761            4                     1               7               3
## 762            4                     1               7               3
## 763            4                     1               7               3
## 764            4                     1               7               3
## 765            4                     1               7               3
## 766            4                     1               7               3
## 767            4                     1               7               3
## 768            4                     1               7               3
## 769            3                     2               3               1
## 770            3                     2               3               1
## 771            3                     2               3               1
## 772            3                     2               3               1
## 773            3                     2               3               1
## 774            3                     2               3               1
## 775            3                     2               3               1
## 776            3                     2               3               1
## 777            3                     2               3               1
## 778            3                     2               3               1
## 779            3                     2               3               1
## 780            3                     2               3               1
## 781            3                     2               3               1
## 782            3                     2               3               1
## 783            3                     2               3               1
## 784            3                     2               3               1
## 785            4                     2               8               6
## 786            4                     2               8               6
## 787            4                     2               8               6
## 788            4                     2               8               6
## 789            4                     2               8               6
## 790            4                     2               8               6
## 791            4                     2               8               6
## 792            4                     2               8               6
## 793            4                     2               8               6
## 794            4                     2               8               6
## 795            4                     2               8               6
## 796            4                     2               8               6
## 797            4                     2               8               6
## 798            4                     2               8               6
## 799            4                     2               8               6
## 800            4                     2               8               6
## 801            7                     2               3               2
## 802            7                     2               3               2
## 803            7                     2               3               2
## 804            7                     2               3               2
## 805            7                     2               3               2
## 806            7                     2               3               2
## 807            7                     2               3               2
## 808            7                     2               3               2
## 809            7                     2               3               2
## 810            7                     2               3               2
## 811            7                     2               3               2
## 812            7                     2               3               2
## 813            7                     2               3               2
## 814            7                     2               3               2
## 815            7                     2               3               2
## 816            7                     2               3               2
## 817            1                     1               1               4
## 818            1                     1               1               4
## 819            1                     1               1               4
## 820            1                     1               1               4
## 821            1                     1               1               4
## 822            1                     1               1               4
## 823            1                     1               1               4
## 824            1                     1               1               4
## 825            1                     1               1               4
## 826            1                     1               1               4
## 827            1                     1               1               4
## 828            1                     1               1               4
## 829            1                     1               1               4
## 830            1                     1               1               4
## 831            1                     1               1               4
## 832            1                     1               1               4
## 833            1                     2               2               5
## 834            1                     2               2               5
## 835            1                     2               2               5
## 836            1                     2               2               5
## 837            1                     2               2               5
## 838            1                     2               2               5
## 839            1                     2               2               5
## 840            1                     2               2               5
## 841            1                     2               2               5
## 842            1                     2               2               5
## 843            1                     2               2               5
## 844            1                     2               2               5
## 845            1                     2               2               5
## 846            1                     2               2               5
## 847            1                     2               2               5
## 848            1                     2               2               5
## 849            4                     1               5               1
## 850            4                     1               5               1
## 851            4                     1               5               1
## 852            4                     1               5               1
## 853            4                     1               5               1
## 854            4                     1               5               1
## 855            4                     1               5               1
## 856            4                     1               5               1
## 857            4                     1               5               1
## 858            4                     1               5               1
## 859            4                     1               5               1
## 860            4                     1               5               1
## 861            4                     1               5               1
## 862            4                     1               5               1
## 863            4                     1               5               1
## 864            4                     1               5               1
## 865            1                     1               1               7
## 866            1                     1               1               7
## 867            1                     1               1               7
## 868            1                     1               1               7
## 869            1                     1               1               7
## 870            1                     1               1               7
## 871            1                     1               1               7
## 872            1                     1               1               7
## 873            1                     1               1               7
## 874            1                     1               1               7
## 875            1                     1               1               7
## 876            1                     1               1               7
## 877            1                     1               1               7
## 878            1                     1               1               7
## 879            1                     1               1               7
## 880            1                     1               1               7
## 881            2                     1               6               3
## 882            2                     1               6               3
## 883            2                     1               6               3
## 884            2                     1               6               3
## 885            2                     1               6               3
## 886            2                     1               6               3
## 887            2                     1               6               3
## 888            2                     1               6               3
## 889            2                     1               6               3
## 890            2                     1               6               3
## 891            2                     1               6               3
## 892            2                     1               6               3
## 893            2                     1               6               3
## 894            2                     1               6               3
## 895            2                     1               6               3
## 896            2                     1               6               3
## 897            2                     2               1               6
## 898            2                     2               1               6
## 899            2                     2               1               6
## 900            2                     2               1               6
## 901            2                     2               1               6
## 902            2                     2               1               6
## 903            2                     2               1               6
## 904            2                     2               1               6
## 905            2                     2               1               6
## 906            2                     2               1               6
## 907            2                     2               1               6
## 908            2                     2               1               6
## 909            2                     2               1               6
## 910            2                     2               1               6
## 911            2                     2               1               6
## 912            2                     2               1               6
## 913            1                     2               7               4
## 914            1                     2               7               4
## 915            1                     2               7               4
## 916            1                     2               7               4
## 917            1                     2               7               4
## 918            1                     2               7               4
## 919            1                     2               7               4
## 920            1                     2               7               4
## 921            1                     2               7               4
## 922            1                     2               7               4
## 923            1                     2               7               4
## 924            1                     2               7               4
## 925            1                     2               7               4
## 926            1                     2               7               4
## 927            1                     2               7               4
## 928            1                     2               7               4
## 929            4                     2               4               5
## 930            4                     2               4               5
## 931            4                     2               4               5
## 932            4                     2               4               5
## 933            4                     2               4               5
## 934            4                     2               4               5
## 935            4                     2               4               5
## 936            4                     2               4               5
## 937            4                     2               4               5
## 938            4                     2               4               5
## 939            4                     2               4               5
## 940            4                     2               4               5
## 941            4                     2               4               5
## 942            4                     2               4               5
## 943            4                     2               4               5
## 944            4                     2               4               5
## 945            3                     1               3               2
## 946            3                     1               3               2
## 947            3                     1               3               2
## 948            3                     1               3               2
## 949            3                     1               3               2
## 950            3                     1               3               2
## 951            3                     1               3               2
## 952            3                     1               3               2
## 953            3                     1               3               2
## 954            3                     1               3               2
## 955            3                     1               3               2
## 956            3                     1               3               2
## 957            3                     1               3               2
## 958            3                     1               3               2
## 959            3                     1               3               2
## 960            3                     1               3               2
## 961            2                     1               3               5
## 962            2                     1               3               5
## 963            2                     1               3               5
## 964            2                     1               3               5
## 965            2                     1               3               5
## 966            2                     1               3               5
## 967            2                     1               3               5
## 968            2                     1               3               5
## 969            2                     1               3               5
## 970            2                     1               3               5
## 971            2                     1               3               5
## 972            2                     1               3               5
## 973            2                     1               3               5
## 974            2                     1               3               5
## 975            2                     1               3               5
## 976            2                     1               3               5
## 977            6                     1               3               1
## 978            6                     1               3               1
## 979            6                     1               3               1
## 980            6                     1               3               1
## 981            6                     1               3               1
## 982            6                     1               3               1
## 983            6                     1               3               1
## 984            6                     1               3               1
## 985            6                     1               3               1
## 986            6                     1               3               1
## 987            6                     1               3               1
## 988            6                     1               3               1
## 989            6                     1               3               1
## 990            6                     1               3               1
## 991            6                     1               3               1
## 992            6                     1               3               1
## 993            1                     1               7               6
## 994            1                     1               7               6
## 995            1                     1               7               6
## 996            1                     1               7               6
## 997            1                     1               7               6
## 998            1                     1               7               6
## 999            1                     1               7               6
## 1000           1                     1               7               6
## 1001           1                     1               7               6
## 1002           1                     1               7               6
## 1003           1                     1               7               6
## 1004           1                     1               7               6
## 1005           1                     1               7               6
## 1006           1                     1               7               6
## 1007           1                     1               7               6
## 1008           1                     1               7               6
## 1009           3                     2               6               3
## 1010           3                     2               6               3
## 1011           3                     2               6               3
## 1012           3                     2               6               3
## 1013           3                     2               6               3
## 1014           3                     2               6               3
## 1015           3                     2               6               3
## 1016           3                     2               6               3
## 1017           3                     2               6               3
## 1018           3                     2               6               3
## 1019           3                     2               6               3
## 1020           3                     2               6               3
## 1021           3                     2               6               3
## 1022           3                     2               6               3
## 1023           3                     2               6               3
## 1024           3                     2               6               3
## 1025           5                     1               2               3
## 1026           5                     1               2               3
## 1027           5                     1               2               3
## 1028           5                     1               2               3
## 1029           5                     1               2               3
## 1030           5                     1               2               3
## 1031           5                     1               2               3
## 1032           5                     1               2               3
## 1033           5                     1               2               3
## 1034           5                     1               2               3
## 1035           5                     1               2               3
## 1036           5                     1               2               3
## 1037           5                     1               2               3
## 1038           5                     1               2               3
## 1039           5                     1               2               3
## 1040           5                     1               2               3
## 1041           6                     2               7               2
## 1042           6                     2               7               2
## 1043           6                     2               7               2
## 1044           6                     2               7               2
## 1045           6                     2               7               2
## 1046           6                     2               7               2
## 1047           6                     2               7               2
## 1048           6                     2               7               2
## 1049           6                     2               7               2
## 1050           6                     2               7               2
## 1051           6                     2               7               2
## 1052           6                     2               7               2
## 1053           6                     2               7               2
## 1054           6                     2               7               2
## 1055           6                     2               7               2
## 1056           6                     2               7               2
## 1057           2                     2               2               7
## 1058           2                     2               2               7
## 1059           2                     2               2               7
## 1060           2                     2               2               7
## 1061           2                     2               2               7
## 1062           2                     2               2               7
## 1063           2                     2               2               7
## 1064           2                     2               2               7
## 1065           2                     2               2               7
## 1066           2                     2               2               7
## 1067           2                     2               2               7
## 1068           2                     2               2               7
## 1069           2                     2               2               7
## 1070           2                     2               2               7
## 1071           2                     2               2               7
## 1072           2                     2               2               7
## 1073           7                     1               4               1
## 1074           7                     1               4               1
## 1075           7                     1               4               1
## 1076           7                     1               4               1
## 1077           7                     1               4               1
## 1078           7                     1               4               1
## 1079           7                     1               4               1
## 1080           7                     1               4               1
## 1081           7                     1               4               1
## 1082           7                     1               4               1
## 1083           7                     1               4               1
## 1084           7                     1               4               1
## 1085           7                     1               4               1
## 1086           7                     1               4               1
## 1087           7                     1               4               1
## 1088           7                     1               4               1
## 1089           3                     1               5               8
## 1090           3                     1               5               8
## 1091           3                     1               5               8
## 1092           3                     1               5               8
## 1093           3                     1               5               8
## 1094           3                     1               5               8
## 1095           3                     1               5               8
## 1096           3                     1               5               8
## 1097           3                     1               5               8
## 1098           3                     1               5               8
## 1099           3                     1               5               8
## 1100           3                     1               5               8
## 1101           3                     1               5               8
## 1102           3                     1               5               8
## 1103           3                     1               5               8
## 1104           3                     1               5               8
## 1105          NA                     2               8               2
## 1106          NA                     2               8               2
## 1107          NA                     2               8               2
## 1108          NA                     2               8               2
## 1109          NA                     2               8               2
## 1110          NA                     2               8               2
## 1111          NA                     2               8               2
## 1112          NA                     2               8               2
## 1113          NA                     2               8               2
## 1114          NA                     2               8               2
## 1115          NA                     2               8               2
## 1116          NA                     2               8               2
## 1117          NA                     2               8               2
## 1118          NA                     2               8               2
## 1119          NA                     2               8               2
## 1120          NA                     2               8               2
## 1121           4                     2               2               1
## 1122           4                     2               2               1
## 1123           4                     2               2               1
## 1124           4                     2               2               1
## 1125           4                     2               2               1
## 1126           4                     2               2               1
## 1127           4                     2               2               1
## 1128           4                     2               2               1
## 1129           4                     2               2               1
## 1130           4                     2               2               1
## 1131           4                     2               2               1
## 1132           4                     2               2               1
## 1133           4                     2               2               1
## 1134           4                     2               2               1
## 1135           4                     2               2               1
## 1136           4                     2               2               1
## 1137           4                     2               2               6
## 1138           4                     2               2               6
## 1139           4                     2               2               6
## 1140           4                     2               2               6
## 1141           4                     2               2               6
## 1142           4                     2               2               6
## 1143           4                     2               2               6
## 1144           4                     2               2               6
## 1145           4                     2               2               6
## 1146           4                     2               2               6
## 1147           4                     2               2               6
## 1148           4                     2               2               6
## 1149           4                     2               2               6
## 1150           4                     2               2               6
## 1151           4                     2               2               6
## 1152           4                     2               2               6
## 1153           6                     2               5               3
## 1154           6                     2               5               3
## 1155           6                     2               5               3
## 1156           6                     2               5               3
## 1157           6                     2               5               3
## 1158           6                     2               5               3
## 1159           6                     2               5               3
## 1160           6                     2               5               3
## 1161           6                     2               5               3
## 1162           6                     2               5               3
## 1163           6                     2               5               3
## 1164           6                     2               5               3
## 1165           6                     2               5               3
## 1166           6                     2               5               3
## 1167           6                     2               5               3
## 1168           6                     2               5               3
## 1169           3                     1               6               1
## 1170           3                     1               6               1
## 1171           3                     1               6               1
## 1172           3                     1               6               1
## 1173           3                     1               6               1
## 1174           3                     1               6               1
## 1175           3                     1               6               1
## 1176           3                     1               6               1
## 1177           3                     1               6               1
## 1178           3                     1               6               1
## 1179           3                     1               6               1
## 1180           3                     1               6               1
## 1181           3                     1               6               1
## 1182           3                     1               6               1
## 1183           3                     1               6               1
## 1184           3                     1               6               1
## 1185           2                     2               5               6
## 1186           2                     2               5               6
## 1187           2                     2               5               6
## 1188           2                     2               5               6
## 1189           2                     2               5               6
## 1190           2                     2               5               6
## 1191           2                     2               5               6
## 1192           2                     2               5               6
## 1193           2                     2               5               6
## 1194           2                     2               5               6
## 1195           2                     2               5               6
## 1196           2                     2               5               6
## 1197           2                     2               5               6
## 1198           2                     2               5               6
## 1199           2                     2               5               6
## 1200           2                     2               5               6
## 1201           4                     2               1               6
## 1202           4                     2               1               6
## 1203           4                     2               1               6
## 1204           4                     2               1               6
## 1205           4                     2               1               6
## 1206           4                     2               1               6
## 1207           4                     2               1               6
## 1208           4                     2               1               6
## 1209           4                     2               1               6
## 1210           4                     2               1               6
## 1211           4                     2               1               6
## 1212           4                     2               1               6
## 1213           4                     2               1               6
## 1214           4                     2               1               6
## 1215           4                     2               1               6
## 1216           4                     2               1               6
## 1217           2                     1               3               8
## 1218           2                     1               3               8
## 1219           2                     1               3               8
## 1220           2                     1               3               8
## 1221           2                     1               3               8
## 1222           2                     1               3               8
## 1223           2                     1               3               8
## 1224           2                     1               3               8
## 1225           2                     1               3               8
## 1226           2                     1               3               8
## 1227           2                     1               3               8
## 1228           2                     1               3               8
## 1229           2                     1               3               8
## 1230           2                     1               3               8
## 1231           2                     1               3               8
## 1232           2                     1               3               8
## 1233           7                     1               8               1
## 1234           7                     1               8               1
## 1235           7                     1               8               1
## 1236           7                     1               8               1
## 1237           7                     1               8               1
## 1238           7                     1               8               1
## 1239           7                     1               8               1
## 1240           7                     1               8               1
## 1241           7                     1               8               1
## 1242           7                     1               8               1
## 1243           7                     1               8               1
## 1244           7                     1               8               1
## 1245           7                     1               8               1
## 1246           7                     1               8               1
## 1247           7                     1               8               1
## 1248           7                     1               8               1
## 1249           5                     1               2               8
## 1250           5                     1               2               8
## 1251           5                     1               2               8
## 1252           5                     1               2               8
## 1253           5                     1               2               8
## 1254           5                     1               2               8
## 1255           5                     1               2               8
## 1256           5                     1               2               8
## 1257           5                     1               2               8
## 1258           5                     1               2               8
## 1259           5                     1               2               8
## 1260           5                     1               2               8
## 1261           5                     1               2               8
## 1262           5                     1               2               8
## 1263           5                     1               2               8
## 1264           5                     1               2               8
## 1265           1                     2               4               7
## 1266           1                     2               4               7
## 1267           1                     2               4               7
## 1268           1                     2               4               7
## 1269           1                     2               4               7
## 1270           1                     2               4               7
## 1271           1                     2               4               7
## 1272           1                     2               4               7
## 1273           1                     2               4               7
## 1274           1                     2               4               7
## 1275           1                     2               4               7
## 1276           1                     2               4               7
## 1277           1                     2               4               7
## 1278           1                     2               4               7
## 1279           1                     2               4               7
## 1280           1                     2               4               7
## 1281           2                     2               1               6
## 1282           2                     2               1               6
## 1283           2                     2               1               6
## 1284           2                     2               1               6
## 1285           2                     2               1               6
## 1286           2                     2               1               6
## 1287           2                     2               1               6
## 1288           2                     2               1               6
## 1289           2                     2               1               6
## 1290           2                     2               1               6
## 1291           2                     2               1               6
## 1292           2                     2               1               6
## 1293           2                     2               1               6
## 1294           2                     2               1               6
## 1295           2                     2               1               6
## 1296           2                     2               1               6
## 1297           5                     1               2               5
## 1298           5                     1               2               5
## 1299           5                     1               2               5
## 1300           5                     1               2               5
## 1301           5                     1               2               5
## 1302           5                     1               2               5
## 1303           5                     1               2               5
## 1304           5                     1               2               5
## 1305           5                     1               2               5
## 1306           5                     1               2               5
## 1307           5                     1               2               5
## 1308           5                     1               2               5
## 1309           5                     1               2               5
## 1310           5                     1               2               5
## 1311           5                     1               2               5
## 1312           5                     1               2               5
## 1313           1                     2               1               6
## 1314           1                     2               1               6
## 1315           1                     2               1               6
##      AttributeOrder3 AttributeOrder4 AttributeOrder5 AttributeOrder6
## 1                  1               6               2               7
## 2                  1               6               2               7
## 3                  1               6               2               7
## 4                  1               6               2               7
## 5                  1               6               2               7
## 6                  1               6               2               7
## 7                  1               6               2               7
## 8                  1               6               2               7
## 9                  1               6               2               7
## 10                 1               6               2               7
## 11                 1               6               2               7
## 12                 1               6               2               7
## 13                 1               6               2               7
## 14                 1               6               2               7
## 15                 1               6               2               7
## 16                 1               6               2               7
## 17                 3               5               4               7
## 18                 3               5               4               7
## 19                 3               5               4               7
## 20                 3               5               4               7
## 21                 3               5               4               7
## 22                 3               5               4               7
## 23                 3               5               4               7
## 24                 3               5               4               7
## 25                 3               5               4               7
## 26                 3               5               4               7
## 27                 3               5               4               7
## 28                 3               5               4               7
## 29                 3               5               4               7
## 30                 3               5               4               7
## 31                 3               5               4               7
## 32                 3               5               4               7
## 33                 1               4               7               6
## 34                 1               4               7               6
## 35                 1               4               7               6
## 36                 1               4               7               6
## 37                 1               4               7               6
## 38                 1               4               7               6
## 39                 1               4               7               6
## 40                 1               4               7               6
## 41                 1               4               7               6
## 42                 1               4               7               6
## 43                 1               4               7               6
## 44                 1               4               7               6
## 45                 1               4               7               6
## 46                 1               4               7               6
## 47                 1               4               7               6
## 48                 1               4               7               6
## 49                 3               6               7               5
## 50                 3               6               7               5
## 51                 3               6               7               5
## 52                 3               6               7               5
## 53                 3               6               7               5
## 54                 3               6               7               5
## 55                 3               6               7               5
## 56                 3               6               7               5
## 57                 3               6               7               5
## 58                 3               6               7               5
## 59                 3               6               7               5
## 60                 3               6               7               5
## 61                 3               6               7               5
## 62                 3               6               7               5
## 63                 3               6               7               5
## 64                 3               6               7               5
## 65                 7               5               6               8
## 66                 7               5               6               8
## 67                 7               5               6               8
## 68                 7               5               6               8
## 69                 7               5               6               8
## 70                 7               5               6               8
## 71                 7               5               6               8
## 72                 7               5               6               8
## 73                 7               5               6               8
## 74                 7               5               6               8
## 75                 7               5               6               8
## 76                 7               5               6               8
## 77                 7               5               6               8
## 78                 7               5               6               8
## 79                 7               5               6               8
## 80                 7               5               6               8
## 81                 7               1               5               8
## 82                 7               1               5               8
## 83                 7               1               5               8
## 84                 7               1               5               8
## 85                 7               1               5               8
## 86                 7               1               5               8
## 87                 7               1               5               8
## 88                 7               1               5               8
## 89                 7               1               5               8
## 90                 7               1               5               8
## 91                 7               1               5               8
## 92                 7               1               5               8
## 93                 7               1               5               8
## 94                 7               1               5               8
## 95                 7               1               5               8
## 96                 7               1               5               8
## 97                 2               4               6               3
## 98                 2               4               6               3
## 99                 2               4               6               3
## 100                2               4               6               3
## 101                2               4               6               3
## 102                2               4               6               3
## 103                2               4               6               3
## 104                2               4               6               3
## 105                2               4               6               3
## 106                2               4               6               3
## 107                2               4               6               3
## 108                2               4               6               3
## 109                2               4               6               3
## 110                2               4               6               3
## 111                2               4               6               3
## 112                2               4               6               3
## 113                3               4               2               8
## 114                3               4               2               8
## 115                3               4               2               8
## 116                3               4               2               8
## 117                3               4               2               8
## 118                3               4               2               8
## 119                3               4               2               8
## 120                3               4               2               8
## 121                3               4               2               8
## 122                3               4               2               8
## 123                3               4               2               8
## 124                3               4               2               8
## 125                3               4               2               8
## 126                3               4               2               8
## 127                3               4               2               8
## 128                3               4               2               8
## 129                2               4               6               1
## 130                2               4               6               1
## 131                2               4               6               1
## 132                2               4               6               1
## 133                2               4               6               1
## 134                2               4               6               1
## 135                2               4               6               1
## 136                2               4               6               1
## 137                2               4               6               1
## 138                2               4               6               1
## 139                2               4               6               1
## 140                2               4               6               1
## 141                2               4               6               1
## 142                2               4               6               1
## 143                2               4               6               1
## 144                2               4               6               1
## 145                3               2               5               4
## 146                3               2               5               4
## 147                3               2               5               4
## 148                3               2               5               4
## 149                3               2               5               4
## 150                3               2               5               4
## 151                3               2               5               4
## 152                3               2               5               4
## 153                3               2               5               4
## 154                3               2               5               4
## 155                3               2               5               4
## 156                3               2               5               4
## 157                3               2               5               4
## 158                3               2               5               4
## 159                3               2               5               4
## 160                3               2               5               4
## 161                1               2               5               8
## 162                1               2               5               8
## 163                1               2               5               8
## 164                1               2               5               8
## 165                1               2               5               8
## 166                1               2               5               8
## 167                1               2               5               8
## 168                1               2               5               8
## 169                1               2               5               8
## 170                1               2               5               8
## 171                1               2               5               8
## 172                1               2               5               8
## 173                1               2               5               8
## 174                1               2               5               8
## 175                1               2               5               8
## 176                1               2               5               8
## 177                5               8               4               6
## 178                5               8               4               6
## 179                5               8               4               6
## 180                5               8               4               6
## 181                5               8               4               6
## 182                5               8               4               6
## 183                5               8               4               6
## 184                5               8               4               6
## 185                5               8               4               6
## 186                5               8               4               6
## 187                5               8               4               6
## 188                5               8               4               6
## 189                5               8               4               6
## 190                5               8               4               6
## 191                5               8               4               6
## 192                5               8               4               6
## 193                2               5               8               1
## 194                2               5               8               1
## 195                2               5               8               1
## 196                2               5               8               1
## 197                2               5               8               1
## 198                2               5               8               1
## 199                2               5               8               1
## 200                2               5               8               1
## 201                2               5               8               1
## 202                2               5               8               1
## 203                2               5               8               1
## 204                2               5               8               1
## 205                2               5               8               1
## 206                2               5               8               1
## 207                2               5               8               1
## 208                2               5               8               1
## 209                1               4               5               8
## 210                1               4               5               8
## 211                1               4               5               8
## 212                1               4               5               8
## 213                1               4               5               8
## 214                1               4               5               8
## 215                1               4               5               8
## 216                1               4               5               8
## 217                1               4               5               8
## 218                1               4               5               8
## 219                1               4               5               8
## 220                1               4               5               8
## 221                1               4               5               8
## 222                1               4               5               8
## 223                1               4               5               8
## 224                1               4               5               8
## 225                7               1               4               6
## 226                7               1               4               6
## 227                7               1               4               6
## 228                7               1               4               6
## 229                7               1               4               6
## 230                7               1               4               6
## 231                7               1               4               6
## 232                7               1               4               6
## 233                7               1               4               6
## 234                7               1               4               6
## 235                7               1               4               6
## 236                7               1               4               6
## 237                7               1               4               6
## 238                7               1               4               6
## 239                7               1               4               6
## 240                7               1               4               6
## 241                3               4               8               5
## 242                3               4               8               5
## 243                3               4               8               5
## 244                3               4               8               5
## 245                3               4               8               5
## 246                3               4               8               5
## 247                3               4               8               5
## 248                3               4               8               5
## 249                3               4               8               5
## 250                3               4               8               5
## 251                3               4               8               5
## 252                3               4               8               5
## 253                3               4               8               5
## 254                3               4               8               5
## 255                3               4               8               5
## 256                3               4               8               5
## 257                2               7               4               1
## 258                2               7               4               1
## 259                2               7               4               1
## 260                2               7               4               1
## 261                2               7               4               1
## 262                2               7               4               1
## 263                2               7               4               1
## 264                2               7               4               1
## 265                2               7               4               1
## 266                2               7               4               1
## 267                2               7               4               1
## 268                2               7               4               1
## 269                2               7               4               1
## 270                2               7               4               1
## 271                2               7               4               1
## 272                2               7               4               1
## 273                8               2               5               7
## 274                8               2               5               7
## 275                8               2               5               7
## 276                8               2               5               7
## 277                8               2               5               7
## 278                8               2               5               7
## 279                8               2               5               7
## 280                8               2               5               7
## 281                8               2               5               7
## 282                8               2               5               7
## 283                8               2               5               7
## 284                8               2               5               7
## 285                8               2               5               7
## 286                8               2               5               7
## 287                8               2               5               7
## 288                8               2               5               7
## 289                2               4               3               5
## 290                2               4               3               5
## 291                2               4               3               5
## 292                2               4               3               5
## 293                2               4               3               5
## 294                2               4               3               5
## 295                2               4               3               5
## 296                2               4               3               5
## 297                2               4               3               5
## 298                2               4               3               5
## 299                2               4               3               5
## 300                2               4               3               5
## 301                2               4               3               5
## 302                2               4               3               5
## 303                2               4               3               5
## 304                2               4               3               5
## 305                8               2               1               6
## 306                8               2               1               6
## 307                8               2               1               6
## 308                8               2               1               6
## 309                8               2               1               6
## 310                8               2               1               6
## 311                8               2               1               6
## 312                8               2               1               6
## 313                8               2               1               6
## 314                8               2               1               6
## 315                8               2               1               6
## 316                8               2               1               6
## 317                8               2               1               6
## 318                8               2               1               6
## 319                8               2               1               6
## 320                8               2               1               6
## 321                3               5               6               7
## 322                3               5               6               7
## 323                3               5               6               7
## 324                3               5               6               7
## 325                3               5               6               7
## 326                3               5               6               7
## 327                3               5               6               7
## 328                3               5               6               7
## 329                3               5               6               7
## 330                3               5               6               7
## 331                3               5               6               7
## 332                3               5               6               7
## 333                3               5               6               7
## 334                3               5               6               7
## 335                3               5               6               7
## 336                3               5               6               7
## 337                4               5               2               7
## 338                4               5               2               7
## 339                4               5               2               7
## 340                4               5               2               7
## 341                4               5               2               7
## 342                4               5               2               7
## 343                4               5               2               7
## 344                4               5               2               7
## 345                4               5               2               7
## 346                4               5               2               7
## 347                4               5               2               7
## 348                4               5               2               7
## 349                4               5               2               7
## 350                4               5               2               7
## 351                4               5               2               7
## 352                4               5               2               7
## 353                7               3               4               6
## 354                7               3               4               6
## 355                7               3               4               6
## 356                7               3               4               6
## 357                7               3               4               6
## 358                7               3               4               6
## 359                7               3               4               6
## 360                7               3               4               6
## 361                7               3               4               6
## 362                7               3               4               6
## 363                7               3               4               6
## 364                7               3               4               6
## 365                7               3               4               6
## 366                7               3               4               6
## 367                7               3               4               6
## 368                7               3               4               6
## 369                2               4               7               1
## 370                2               4               7               1
## 371                2               4               7               1
## 372                2               4               7               1
## 373                2               4               7               1
## 374                2               4               7               1
## 375                2               4               7               1
## 376                2               4               7               1
## 377                2               4               7               1
## 378                2               4               7               1
## 379                2               4               7               1
## 380                2               4               7               1
## 381                2               4               7               1
## 382                2               4               7               1
## 383                2               4               7               1
## 384                2               4               7               1
## 385                3               7               8               5
## 386                3               7               8               5
## 387                3               7               8               5
## 388                3               7               8               5
## 389                3               7               8               5
## 390                3               7               8               5
## 391                3               7               8               5
## 392                3               7               8               5
## 393                3               7               8               5
## 394                3               7               8               5
## 395                3               7               8               5
## 396                3               7               8               5
## 397                3               7               8               5
## 398                3               7               8               5
## 399                3               7               8               5
## 400                3               7               8               5
## 401                2               8               3               4
## 402                2               8               3               4
## 403                2               8               3               4
## 404                2               8               3               4
## 405                2               8               3               4
## 406                2               8               3               4
## 407                2               8               3               4
## 408                2               8               3               4
## 409                2               8               3               4
## 410                2               8               3               4
## 411                2               8               3               4
## 412                2               8               3               4
## 413                2               8               3               4
## 414                2               8               3               4
## 415                2               8               3               4
## 416                2               8               3               4
## 417                8               6               1               5
## 418                8               6               1               5
## 419                8               6               1               5
## 420                8               6               1               5
## 421                8               6               1               5
## 422                8               6               1               5
## 423                8               6               1               5
## 424                8               6               1               5
## 425                8               6               1               5
## 426                8               6               1               5
## 427                8               6               1               5
## 428                8               6               1               5
## 429                8               6               1               5
## 430                8               6               1               5
## 431                8               6               1               5
## 432                8               6               1               5
## 433                3               5               1               4
## 434                3               5               1               4
## 435                3               5               1               4
## 436                3               5               1               4
## 437                3               5               1               4
## 438                3               5               1               4
## 439                3               5               1               4
## 440                3               5               1               4
## 441                3               5               1               4
## 442                3               5               1               4
## 443                3               5               1               4
## 444                3               5               1               4
## 445                3               5               1               4
## 446                3               5               1               4
## 447                3               5               1               4
## 448                3               5               1               4
## 449                1               4               5               6
## 450                1               4               5               6
## 451                1               4               5               6
## 452                1               4               5               6
## 453                1               4               5               6
## 454                1               4               5               6
## 455                1               4               5               6
## 456                1               4               5               6
## 457                1               4               5               6
## 458                1               4               5               6
## 459                1               4               5               6
## 460                1               4               5               6
## 461                1               4               5               6
## 462                1               4               5               6
## 463                1               4               5               6
## 464                1               4               5               6
## 465                3               4               5               6
## 466                3               4               5               6
## 467                3               4               5               6
## 468                3               4               5               6
## 469                3               4               5               6
## 470                3               4               5               6
## 471                3               4               5               6
## 472                3               4               5               6
## 473                3               4               5               6
## 474                3               4               5               6
## 475                3               4               5               6
## 476                3               4               5               6
## 477                3               4               5               6
## 478                3               4               5               6
## 479                3               4               5               6
## 480                3               4               5               6
## 481                4               7               6               5
## 482                4               7               6               5
## 483                4               7               6               5
## 484                4               7               6               5
## 485                4               7               6               5
## 486                4               7               6               5
## 487                4               7               6               5
## 488                4               7               6               5
## 489                4               7               6               5
## 490                4               7               6               5
## 491                4               7               6               5
## 492                4               7               6               5
## 493                4               7               6               5
## 494                4               7               6               5
## 495                4               7               6               5
## 496                4               7               6               5
## 497                3               4               1               2
## 498                3               4               1               2
## 499                3               4               1               2
## 500                3               4               1               2
## 501                3               4               1               2
## 502                3               4               1               2
## 503                3               4               1               2
## 504                3               4               1               2
## 505                3               4               1               2
## 506                3               4               1               2
## 507                3               4               1               2
## 508                3               4               1               2
## 509                3               4               1               2
## 510                3               4               1               2
## 511                3               4               1               2
## 512                3               4               1               2
## 513                7               5               3               4
## 514                7               5               3               4
## 515                7               5               3               4
## 516                7               5               3               4
## 517                7               5               3               4
## 518                7               5               3               4
## 519                7               5               3               4
## 520                7               5               3               4
## 521                7               5               3               4
## 522                7               5               3               4
## 523                7               5               3               4
## 524                7               5               3               4
## 525                7               5               3               4
## 526                7               5               3               4
## 527                7               5               3               4
## 528                7               5               3               4
## 529                7               5               2               8
## 530                7               5               2               8
## 531                7               5               2               8
## 532                7               5               2               8
## 533                7               5               2               8
## 534                7               5               2               8
## 535                7               5               2               8
## 536                7               5               2               8
## 537                7               5               2               8
## 538                7               5               2               8
## 539                7               5               2               8
## 540                7               5               2               8
## 541                7               5               2               8
## 542                7               5               2               8
## 543                7               5               2               8
## 544                7               5               2               8
## 545                5               6               7               2
## 546                5               6               7               2
## 547                5               6               7               2
## 548                5               6               7               2
## 549                5               6               7               2
## 550                5               6               7               2
## 551                5               6               7               2
## 552                5               6               7               2
## 553                5               6               7               2
## 554                5               6               7               2
## 555                5               6               7               2
## 556                5               6               7               2
## 557                5               6               7               2
## 558                5               6               7               2
## 559                5               6               7               2
## 560                5               6               7               2
## 561                1               5               3               8
## 562                1               5               3               8
## 563                1               5               3               8
## 564                1               5               3               8
## 565                1               5               3               8
## 566                1               5               3               8
## 567                1               5               3               8
## 568                1               5               3               8
## 569                1               5               3               8
## 570                1               5               3               8
## 571                1               5               3               8
## 572                1               5               3               8
## 573                1               5               3               8
## 574                1               5               3               8
## 575                1               5               3               8
## 576                1               5               3               8
## 577                4               7               5               3
## 578                4               7               5               3
## 579                4               7               5               3
## 580                4               7               5               3
## 581                4               7               5               3
## 582                4               7               5               3
## 583                4               7               5               3
## 584                4               7               5               3
## 585                4               7               5               3
## 586                4               7               5               3
## 587                4               7               5               3
## 588                4               7               5               3
## 589                4               7               5               3
## 590                4               7               5               3
## 591                4               7               5               3
## 592                4               7               5               3
## 593                6               1               8               3
## 594                6               1               8               3
## 595                6               1               8               3
## 596                6               1               8               3
## 597                6               1               8               3
## 598                6               1               8               3
## 599                6               1               8               3
## 600                6               1               8               3
## 601                6               1               8               3
## 602                6               1               8               3
## 603                6               1               8               3
## 604                6               1               8               3
## 605                6               1               8               3
## 606                6               1               8               3
## 607                6               1               8               3
## 608                6               1               8               3
## 609                4               3               1               5
## 610                4               3               1               5
## 611                4               3               1               5
## 612                4               3               1               5
## 613                4               3               1               5
## 614                4               3               1               5
## 615                4               3               1               5
## 616                4               3               1               5
## 617                4               3               1               5
## 618                4               3               1               5
## 619                4               3               1               5
## 620                4               3               1               5
## 621                4               3               1               5
## 622                4               3               1               5
## 623                4               3               1               5
## 624                4               3               1               5
## 625                3               2               7               6
## 626                3               2               7               6
## 627                3               2               7               6
## 628                3               2               7               6
## 629                3               2               7               6
## 630                3               2               7               6
## 631                3               2               7               6
## 632                3               2               7               6
## 633                3               2               7               6
## 634                3               2               7               6
## 635                3               2               7               6
## 636                3               2               7               6
## 637                3               2               7               6
## 638                3               2               7               6
## 639                3               2               7               6
## 640                3               2               7               6
## 641                3               5               7               1
## 642                3               5               7               1
## 643                3               5               7               1
## 644                3               5               7               1
## 645                3               5               7               1
## 646                3               5               7               1
## 647                3               5               7               1
## 648                3               5               7               1
## 649                3               5               7               1
## 650                3               5               7               1
## 651                3               5               7               1
## 652                3               5               7               1
## 653                3               5               7               1
## 654                3               5               7               1
## 655                3               5               7               1
## 656                3               5               7               1
## 657                2               5               6               3
## 658                2               5               6               3
## 659                2               5               6               3
## 660                2               5               6               3
## 661                2               5               6               3
## 662                2               5               6               3
## 663                2               5               6               3
## 664                2               5               6               3
## 665                2               5               6               3
## 666                2               5               6               3
## 667                2               5               6               3
## 668                2               5               6               3
## 669                2               5               6               3
## 670                2               5               6               3
## 671                2               5               6               3
## 672                2               5               6               3
## 673                2               7               3               8
## 674                2               7               3               8
## 675                2               7               3               8
## 676                2               7               3               8
## 677                2               7               3               8
## 678                2               7               3               8
## 679                2               7               3               8
## 680                2               7               3               8
## 681                2               7               3               8
## 682                2               7               3               8
## 683                2               7               3               8
## 684                2               7               3               8
## 685                2               7               3               8
## 686                2               7               3               8
## 687                2               7               3               8
## 688                2               7               3               8
## 689                5               1               4               2
## 690                5               1               4               2
## 691                5               1               4               2
## 692                5               1               4               2
## 693                5               1               4               2
## 694                5               1               4               2
## 695                5               1               4               2
## 696                5               1               4               2
## 697                5               1               4               2
## 698                5               1               4               2
## 699                5               1               4               2
## 700                5               1               4               2
## 701                5               1               4               2
## 702                5               1               4               2
## 703                5               1               4               2
## 704                5               1               4               2
## 705                4               3               7               1
## 706                4               3               7               1
## 707                4               3               7               1
## 708                4               3               7               1
## 709                4               3               7               1
## 710                4               3               7               1
## 711                4               3               7               1
## 712                4               3               7               1
## 713                4               3               7               1
## 714                4               3               7               1
## 715                4               3               7               1
## 716                4               3               7               1
## 717                4               3               7               1
## 718                4               3               7               1
## 719                4               3               7               1
## 720                4               3               7               1
## 721                1               7               6               3
## 722                1               7               6               3
## 723                1               7               6               3
## 724                1               7               6               3
## 725                1               7               6               3
## 726                1               7               6               3
## 727                1               7               6               3
## 728                1               7               6               3
## 729                1               7               6               3
## 730                1               7               6               3
## 731                1               7               6               3
## 732                1               7               6               3
## 733                1               7               6               3
## 734                1               7               6               3
## 735                1               7               6               3
## 736                1               7               6               3
## 737                8               1               5               3
## 738                8               1               5               3
## 739                8               1               5               3
## 740                8               1               5               3
## 741                8               1               5               3
## 742                8               1               5               3
## 743                8               1               5               3
## 744                8               1               5               3
## 745                8               1               5               3
## 746                8               1               5               3
## 747                8               1               5               3
## 748                8               1               5               3
## 749                8               1               5               3
## 750                8               1               5               3
## 751                8               1               5               3
## 752                8               1               5               3
## 753                5               1               6               8
## 754                5               1               6               8
## 755                5               1               6               8
## 756                5               1               6               8
## 757                5               1               6               8
## 758                5               1               6               8
## 759                5               1               6               8
## 760                5               1               6               8
## 761                5               1               6               8
## 762                5               1               6               8
## 763                5               1               6               8
## 764                5               1               6               8
## 765                5               1               6               8
## 766                5               1               6               8
## 767                5               1               6               8
## 768                5               1               6               8
## 769                8               5               4               6
## 770                8               5               4               6
## 771                8               5               4               6
## 772                8               5               4               6
## 773                8               5               4               6
## 774                8               5               4               6
## 775                8               5               4               6
## 776                8               5               4               6
## 777                8               5               4               6
## 778                8               5               4               6
## 779                8               5               4               6
## 780                8               5               4               6
## 781                8               5               4               6
## 782                8               5               4               6
## 783                8               5               4               6
## 784                8               5               4               6
## 785                3               7               4               1
## 786                3               7               4               1
## 787                3               7               4               1
## 788                3               7               4               1
## 789                3               7               4               1
## 790                3               7               4               1
## 791                3               7               4               1
## 792                3               7               4               1
## 793                3               7               4               1
## 794                3               7               4               1
## 795                3               7               4               1
## 796                3               7               4               1
## 797                3               7               4               1
## 798                3               7               4               1
## 799                3               7               4               1
## 800                3               7               4               1
## 801                7               8               1               6
## 802                7               8               1               6
## 803                7               8               1               6
## 804                7               8               1               6
## 805                7               8               1               6
## 806                7               8               1               6
## 807                7               8               1               6
## 808                7               8               1               6
## 809                7               8               1               6
## 810                7               8               1               6
## 811                7               8               1               6
## 812                7               8               1               6
## 813                7               8               1               6
## 814                7               8               1               6
## 815                7               8               1               6
## 816                7               8               1               6
## 817                7               5               6               8
## 818                7               5               6               8
## 819                7               5               6               8
## 820                7               5               6               8
## 821                7               5               6               8
## 822                7               5               6               8
## 823                7               5               6               8
## 824                7               5               6               8
## 825                7               5               6               8
## 826                7               5               6               8
## 827                7               5               6               8
## 828                7               5               6               8
## 829                7               5               6               8
## 830                7               5               6               8
## 831                7               5               6               8
## 832                7               5               6               8
## 833                4               3               1               8
## 834                4               3               1               8
## 835                4               3               1               8
## 836                4               3               1               8
## 837                4               3               1               8
## 838                4               3               1               8
## 839                4               3               1               8
## 840                4               3               1               8
## 841                4               3               1               8
## 842                4               3               1               8
## 843                4               3               1               8
## 844                4               3               1               8
## 845                4               3               1               8
## 846                4               3               1               8
## 847                4               3               1               8
## 848                4               3               1               8
## 849                8               3               7               6
## 850                8               3               7               6
## 851                8               3               7               6
## 852                8               3               7               6
## 853                8               3               7               6
## 854                8               3               7               6
## 855                8               3               7               6
## 856                8               3               7               6
## 857                8               3               7               6
## 858                8               3               7               6
## 859                8               3               7               6
## 860                8               3               7               6
## 861                8               3               7               6
## 862                8               3               7               6
## 863                8               3               7               6
## 864                8               3               7               6
## 865                5               2               3               8
## 866                5               2               3               8
## 867                5               2               3               8
## 868                5               2               3               8
## 869                5               2               3               8
## 870                5               2               3               8
## 871                5               2               3               8
## 872                5               2               3               8
## 873                5               2               3               8
## 874                5               2               3               8
## 875                5               2               3               8
## 876                5               2               3               8
## 877                5               2               3               8
## 878                5               2               3               8
## 879                5               2               3               8
## 880                5               2               3               8
## 881                7               5               1               2
## 882                7               5               1               2
## 883                7               5               1               2
## 884                7               5               1               2
## 885                7               5               1               2
## 886                7               5               1               2
## 887                7               5               1               2
## 888                7               5               1               2
## 889                7               5               1               2
## 890                7               5               1               2
## 891                7               5               1               2
## 892                7               5               1               2
## 893                7               5               1               2
## 894                7               5               1               2
## 895                7               5               1               2
## 896                7               5               1               2
## 897                2               3               8               5
## 898                2               3               8               5
## 899                2               3               8               5
## 900                2               3               8               5
## 901                2               3               8               5
## 902                2               3               8               5
## 903                2               3               8               5
## 904                2               3               8               5
## 905                2               3               8               5
## 906                2               3               8               5
## 907                2               3               8               5
## 908                2               3               8               5
## 909                2               3               8               5
## 910                2               3               8               5
## 911                2               3               8               5
## 912                2               3               8               5
## 913                5               2               1               3
## 914                5               2               1               3
## 915                5               2               1               3
## 916                5               2               1               3
## 917                5               2               1               3
## 918                5               2               1               3
## 919                5               2               1               3
## 920                5               2               1               3
## 921                5               2               1               3
## 922                5               2               1               3
## 923                5               2               1               3
## 924                5               2               1               3
## 925                5               2               1               3
## 926                5               2               1               3
## 927                5               2               1               3
## 928                5               2               1               3
## 929                2               7               3               6
## 930                2               7               3               6
## 931                2               7               3               6
## 932                2               7               3               6
## 933                2               7               3               6
## 934                2               7               3               6
## 935                2               7               3               6
## 936                2               7               3               6
## 937                2               7               3               6
## 938                2               7               3               6
## 939                2               7               3               6
## 940                2               7               3               6
## 941                2               7               3               6
## 942                2               7               3               6
## 943                2               7               3               6
## 944                2               7               3               6
## 945                8               4               5               7
## 946                8               4               5               7
## 947                8               4               5               7
## 948                8               4               5               7
## 949                8               4               5               7
## 950                8               4               5               7
## 951                8               4               5               7
## 952                8               4               5               7
## 953                8               4               5               7
## 954                8               4               5               7
## 955                8               4               5               7
## 956                8               4               5               7
## 957                8               4               5               7
## 958                8               4               5               7
## 959                8               4               5               7
## 960                8               4               5               7
## 961                1               6               4               2
## 962                1               6               4               2
## 963                1               6               4               2
## 964                1               6               4               2
## 965                1               6               4               2
## 966                1               6               4               2
## 967                1               6               4               2
## 968                1               6               4               2
## 969                1               6               4               2
## 970                1               6               4               2
## 971                1               6               4               2
## 972                1               6               4               2
## 973                1               6               4               2
## 974                1               6               4               2
## 975                1               6               4               2
## 976                1               6               4               2
## 977                4               7               5               8
## 978                4               7               5               8
## 979                4               7               5               8
## 980                4               7               5               8
## 981                4               7               5               8
## 982                4               7               5               8
## 983                4               7               5               8
## 984                4               7               5               8
## 985                4               7               5               8
## 986                4               7               5               8
## 987                4               7               5               8
## 988                4               7               5               8
## 989                4               7               5               8
## 990                4               7               5               8
## 991                4               7               5               8
## 992                4               7               5               8
## 993                5               3               8               2
## 994                5               3               8               2
## 995                5               3               8               2
## 996                5               3               8               2
## 997                5               3               8               2
## 998                5               3               8               2
## 999                5               3               8               2
## 1000               5               3               8               2
## 1001               5               3               8               2
## 1002               5               3               8               2
## 1003               5               3               8               2
## 1004               5               3               8               2
## 1005               5               3               8               2
## 1006               5               3               8               2
## 1007               5               3               8               2
## 1008               5               3               8               2
## 1009               1               8               2               5
## 1010               1               8               2               5
## 1011               1               8               2               5
## 1012               1               8               2               5
## 1013               1               8               2               5
## 1014               1               8               2               5
## 1015               1               8               2               5
## 1016               1               8               2               5
## 1017               1               8               2               5
## 1018               1               8               2               5
## 1019               1               8               2               5
## 1020               1               8               2               5
## 1021               1               8               2               5
## 1022               1               8               2               5
## 1023               1               8               2               5
## 1024               1               8               2               5
## 1025               5               1               8               6
## 1026               5               1               8               6
## 1027               5               1               8               6
## 1028               5               1               8               6
## 1029               5               1               8               6
## 1030               5               1               8               6
## 1031               5               1               8               6
## 1032               5               1               8               6
## 1033               5               1               8               6
## 1034               5               1               8               6
## 1035               5               1               8               6
## 1036               5               1               8               6
## 1037               5               1               8               6
## 1038               5               1               8               6
## 1039               5               1               8               6
## 1040               5               1               8               6
## 1041               5               6               8               4
## 1042               5               6               8               4
## 1043               5               6               8               4
## 1044               5               6               8               4
## 1045               5               6               8               4
## 1046               5               6               8               4
## 1047               5               6               8               4
## 1048               5               6               8               4
## 1049               5               6               8               4
## 1050               5               6               8               4
## 1051               5               6               8               4
## 1052               5               6               8               4
## 1053               5               6               8               4
## 1054               5               6               8               4
## 1055               5               6               8               4
## 1056               5               6               8               4
## 1057               6               4               8               3
## 1058               6               4               8               3
## 1059               6               4               8               3
## 1060               6               4               8               3
## 1061               6               4               8               3
## 1062               6               4               8               3
## 1063               6               4               8               3
## 1064               6               4               8               3
## 1065               6               4               8               3
## 1066               6               4               8               3
## 1067               6               4               8               3
## 1068               6               4               8               3
## 1069               6               4               8               3
## 1070               6               4               8               3
## 1071               6               4               8               3
## 1072               6               4               8               3
## 1073               7               5               6               8
## 1074               7               5               6               8
## 1075               7               5               6               8
## 1076               7               5               6               8
## 1077               7               5               6               8
## 1078               7               5               6               8
## 1079               7               5               6               8
## 1080               7               5               6               8
## 1081               7               5               6               8
## 1082               7               5               6               8
## 1083               7               5               6               8
## 1084               7               5               6               8
## 1085               7               5               6               8
## 1086               7               5               6               8
## 1087               7               5               6               8
## 1088               7               5               6               8
## 1089               2               3               6               4
## 1090               2               3               6               4
## 1091               2               3               6               4
## 1092               2               3               6               4
## 1093               2               3               6               4
## 1094               2               3               6               4
## 1095               2               3               6               4
## 1096               2               3               6               4
## 1097               2               3               6               4
## 1098               2               3               6               4
## 1099               2               3               6               4
## 1100               2               3               6               4
## 1101               2               3               6               4
## 1102               2               3               6               4
## 1103               2               3               6               4
## 1104               2               3               6               4
## 1105               4               7               1               5
## 1106               4               7               1               5
## 1107               4               7               1               5
## 1108               4               7               1               5
## 1109               4               7               1               5
## 1110               4               7               1               5
## 1111               4               7               1               5
## 1112               4               7               1               5
## 1113               4               7               1               5
## 1114               4               7               1               5
## 1115               4               7               1               5
## 1116               4               7               1               5
## 1117               4               7               1               5
## 1118               4               7               1               5
## 1119               4               7               1               5
## 1120               4               7               1               5
## 1121               7               3               8               4
## 1122               7               3               8               4
## 1123               7               3               8               4
## 1124               7               3               8               4
## 1125               7               3               8               4
## 1126               7               3               8               4
## 1127               7               3               8               4
## 1128               7               3               8               4
## 1129               7               3               8               4
## 1130               7               3               8               4
## 1131               7               3               8               4
## 1132               7               3               8               4
## 1133               7               3               8               4
## 1134               7               3               8               4
## 1135               7               3               8               4
## 1136               7               3               8               4
## 1137               1               5               8               7
## 1138               1               5               8               7
## 1139               1               5               8               7
## 1140               1               5               8               7
## 1141               1               5               8               7
## 1142               1               5               8               7
## 1143               1               5               8               7
## 1144               1               5               8               7
## 1145               1               5               8               7
## 1146               1               5               8               7
## 1147               1               5               8               7
## 1148               1               5               8               7
## 1149               1               5               8               7
## 1150               1               5               8               7
## 1151               1               5               8               7
## 1152               1               5               8               7
## 1153               4               7               2               6
## 1154               4               7               2               6
## 1155               4               7               2               6
## 1156               4               7               2               6
## 1157               4               7               2               6
## 1158               4               7               2               6
## 1159               4               7               2               6
## 1160               4               7               2               6
## 1161               4               7               2               6
## 1162               4               7               2               6
## 1163               4               7               2               6
## 1164               4               7               2               6
## 1165               4               7               2               6
## 1166               4               7               2               6
## 1167               4               7               2               6
## 1168               4               7               2               6
## 1169               5               4               7               8
## 1170               5               4               7               8
## 1171               5               4               7               8
## 1172               5               4               7               8
## 1173               5               4               7               8
## 1174               5               4               7               8
## 1175               5               4               7               8
## 1176               5               4               7               8
## 1177               5               4               7               8
## 1178               5               4               7               8
## 1179               5               4               7               8
## 1180               5               4               7               8
## 1181               5               4               7               8
## 1182               5               4               7               8
## 1183               5               4               7               8
## 1184               5               4               7               8
## 1185               3               4               1               8
## 1186               3               4               1               8
## 1187               3               4               1               8
## 1188               3               4               1               8
## 1189               3               4               1               8
## 1190               3               4               1               8
## 1191               3               4               1               8
## 1192               3               4               1               8
## 1193               3               4               1               8
## 1194               3               4               1               8
## 1195               3               4               1               8
## 1196               3               4               1               8
## 1197               3               4               1               8
## 1198               3               4               1               8
## 1199               3               4               1               8
## 1200               3               4               1               8
## 1201               3               8               7               5
## 1202               3               8               7               5
## 1203               3               8               7               5
## 1204               3               8               7               5
## 1205               3               8               7               5
## 1206               3               8               7               5
## 1207               3               8               7               5
## 1208               3               8               7               5
## 1209               3               8               7               5
## 1210               3               8               7               5
## 1211               3               8               7               5
## 1212               3               8               7               5
## 1213               3               8               7               5
## 1214               3               8               7               5
## 1215               3               8               7               5
## 1216               3               8               7               5
## 1217               1               4               2               6
## 1218               1               4               2               6
## 1219               1               4               2               6
## 1220               1               4               2               6
## 1221               1               4               2               6
## 1222               1               4               2               6
## 1223               1               4               2               6
## 1224               1               4               2               6
## 1225               1               4               2               6
## 1226               1               4               2               6
## 1227               1               4               2               6
## 1228               1               4               2               6
## 1229               1               4               2               6
## 1230               1               4               2               6
## 1231               1               4               2               6
## 1232               1               4               2               6
## 1233               4               5               7               3
## 1234               4               5               7               3
## 1235               4               5               7               3
## 1236               4               5               7               3
## 1237               4               5               7               3
## 1238               4               5               7               3
## 1239               4               5               7               3
## 1240               4               5               7               3
## 1241               4               5               7               3
## 1242               4               5               7               3
## 1243               4               5               7               3
## 1244               4               5               7               3
## 1245               4               5               7               3
## 1246               4               5               7               3
## 1247               4               5               7               3
## 1248               4               5               7               3
## 1249               1               4               7               5
## 1250               1               4               7               5
## 1251               1               4               7               5
## 1252               1               4               7               5
## 1253               1               4               7               5
## 1254               1               4               7               5
## 1255               1               4               7               5
## 1256               1               4               7               5
## 1257               1               4               7               5
## 1258               1               4               7               5
## 1259               1               4               7               5
## 1260               1               4               7               5
## 1261               1               4               7               5
## 1262               1               4               7               5
## 1263               1               4               7               5
## 1264               1               4               7               5
## 1265               8               5               1               3
## 1266               8               5               1               3
## 1267               8               5               1               3
## 1268               8               5               1               3
## 1269               8               5               1               3
## 1270               8               5               1               3
## 1271               8               5               1               3
## 1272               8               5               1               3
## 1273               8               5               1               3
## 1274               8               5               1               3
## 1275               8               5               1               3
## 1276               8               5               1               3
## 1277               8               5               1               3
## 1278               8               5               1               3
## 1279               8               5               1               3
## 1280               8               5               1               3
## 1281               7               2               3               5
## 1282               7               2               3               5
## 1283               7               2               3               5
## 1284               7               2               3               5
## 1285               7               2               3               5
## 1286               7               2               3               5
## 1287               7               2               3               5
## 1288               7               2               3               5
## 1289               7               2               3               5
## 1290               7               2               3               5
## 1291               7               2               3               5
## 1292               7               2               3               5
## 1293               7               2               3               5
## 1294               7               2               3               5
## 1295               7               2               3               5
## 1296               7               2               3               5
## 1297               3               1               8               6
## 1298               3               1               8               6
## 1299               3               1               8               6
## 1300               3               1               8               6
## 1301               3               1               8               6
## 1302               3               1               8               6
## 1303               3               1               8               6
## 1304               3               1               8               6
## 1305               3               1               8               6
## 1306               3               1               8               6
## 1307               3               1               8               6
## 1308               3               1               8               6
## 1309               3               1               8               6
## 1310               3               1               8               6
## 1311               3               1               8               6
## 1312               3               1               8               6
## 1313               8               5               3               7
## 1314               8               5               3               7
## 1315               8               5               3               7
##      AttributeOrder7 AttributeOrder8 PartyID7 PartyID5 IDEO RELIG RELIGOE
## 1                  3               5        5        4    3     1        
## 2                  3               5        5        4    3     1        
## 3                  3               5        5        4    3     1        
## 4                  3               5        5        4    3     1        
## 5                  3               5        5        4    3     1        
## 6                  3               5        5        4    3     1        
## 7                  3               5        5        4    3     1        
## 8                  3               5        5        4    3     1        
## 9                  3               5        5        4    3     1        
## 10                 3               5        5        4    3     1        
## 11                 3               5        5        4    3     1        
## 12                 3               5        5        4    3     1        
## 13                 3               5        5        4    3     1        
## 14                 3               5        5        4    3     1        
## 15                 3               5        5        4    3     1        
## 16                 3               5        5        4    3     1        
## 17                 1               6        2        1    2    12        
## 18                 1               6        2        1    2    12        
## 19                 1               6        2        1    2    12        
## 20                 1               6        2        1    2    12        
## 21                 1               6        2        1    2    12        
## 22                 1               6        2        1    2    12        
## 23                 1               6        2        1    2    12        
## 24                 1               6        2        1    2    12        
## 25                 1               6        2        1    2    12        
## 26                 1               6        2        1    2    12        
## 27                 1               6        2        1    2    12        
## 28                 1               6        2        1    2    12        
## 29                 1               6        2        1    2    12        
## 30                 1               6        2        1    2    12        
## 31                 1               6        2        1    2    12        
## 32                 1               6        2        1    2    12        
## 33                 2               3        1        1    1    11        
## 34                 2               3        1        1    1    11        
## 35                 2               3        1        1    1    11        
## 36                 2               3        1        1    1    11        
## 37                 2               3        1        1    1    11        
## 38                 2               3        1        1    1    11        
## 39                 2               3        1        1    1    11        
## 40                 2               3        1        1    1    11        
## 41                 2               3        1        1    1    11        
## 42                 2               3        1        1    1    11        
## 43                 2               3        1        1    1    11        
## 44                 2               3        1        1    1    11        
## 45                 2               3        1        1    1    11        
## 46                 2               3        1        1    1    11        
## 47                 2               3        1        1    1    11        
## 48                 2               3        1        1    1    11        
## 49                 1               2        6        5    3     2        
## 50                 1               2        6        5    3     2        
## 51                 1               2        6        5    3     2        
## 52                 1               2        6        5    3     2        
## 53                 1               2        6        5    3     2        
## 54                 1               2        6        5    3     2        
## 55                 1               2        6        5    3     2        
## 56                 1               2        6        5    3     2        
## 57                 1               2        6        5    3     2        
## 58                 1               2        6        5    3     2        
## 59                 1               2        6        5    3     2        
## 60                 1               2        6        5    3     2        
## 61                 1               2        6        5    3     2        
## 62                 1               2        6        5    3     2        
## 63                 1               2        6        5    3     2        
## 64                 1               2        6        5    3     2        
## 65                 3               4        2        1    2    11        
## 66                 3               4        2        1    2    11        
## 67                 3               4        2        1    2    11        
## 68                 3               4        2        1    2    11        
## 69                 3               4        2        1    2    11        
## 70                 3               4        2        1    2    11        
## 71                 3               4        2        1    2    11        
## 72                 3               4        2        1    2    11        
## 73                 3               4        2        1    2    11        
## 74                 3               4        2        1    2    11        
## 75                 3               4        2        1    2    11        
## 76                 3               4        2        1    2    11        
## 77                 3               4        2        1    2    11        
## 78                 3               4        2        1    2    11        
## 79                 3               4        2        1    2    11        
## 80                 3               4        2        1    2    11        
## 81                 2               4        4        3    1     1        
## 82                 2               4        4        3    1     1        
## 83                 2               4        4        3    1     1        
## 84                 2               4        4        3    1     1        
## 85                 2               4        4        3    1     1        
## 86                 2               4        4        3    1     1        
## 87                 2               4        4        3    1     1        
## 88                 2               4        4        3    1     1        
## 89                 2               4        4        3    1     1        
## 90                 2               4        4        3    1     1        
## 91                 2               4        4        3    1     1        
## 92                 2               4        4        3    1     1        
## 93                 2               4        4        3    1     1        
## 94                 2               4        4        3    1     1        
## 95                 2               4        4        3    1     1        
## 96                 2               4        4        3    1     1        
## 97                 8               1        1        1    2     1        
## 98                 8               1        1        1    2     1        
## 99                 8               1        1        1    2     1        
## 100                8               1        1        1    2     1        
## 101                8               1        1        1    2     1        
## 102                8               1        1        1    2     1        
## 103                8               1        1        1    2     1        
## 104                8               1        1        1    2     1        
## 105                8               1        1        1    2     1        
## 106                8               1        1        1    2     1        
## 107                8               1        1        1    2     1        
## 108                8               1        1        1    2     1        
## 109                8               1        1        1    2     1        
## 110                8               1        1        1    2     1        
## 111                8               1        1        1    2     1        
## 112                8               1        1        1    2     1        
## 113                6               1        2        1    3     2        
## 114                6               1        2        1    3     2        
## 115                6               1        2        1    3     2        
## 116                6               1        2        1    3     2        
## 117                6               1        2        1    3     2        
## 118                6               1        2        1    3     2        
## 119                6               1        2        1    3     2        
## 120                6               1        2        1    3     2        
## 121                6               1        2        1    3     2        
## 122                6               1        2        1    3     2        
## 123                6               1        2        1    3     2        
## 124                6               1        2        1    3     2        
## 125                6               1        2        1    3     2        
## 126                6               1        2        1    3     2        
## 127                6               1        2        1    3     2        
## 128                6               1        2        1    3     2        
## 129                5               7        2        1    3    12        
## 130                5               7        2        1    3    12        
## 131                5               7        2        1    3    12        
## 132                5               7        2        1    3    12        
## 133                5               7        2        1    3    12        
## 134                5               7        2        1    3    12        
## 135                5               7        2        1    3    12        
## 136                5               7        2        1    3    12        
## 137                5               7        2        1    3    12        
## 138                5               7        2        1    3    12        
## 139                5               7        2        1    3    12        
## 140                5               7        2        1    3    12        
## 141                5               7        2        1    3    12        
## 142                5               7        2        1    3    12        
## 143                5               7        2        1    3    12        
## 144                5               7        2        1    3    12        
## 145                7               1        4        3    3    12        
## 146                7               1        4        3    3    12        
## 147                7               1        4        3    3    12        
## 148                7               1        4        3    3    12        
## 149                7               1        4        3    3    12        
## 150                7               1        4        3    3    12        
## 151                7               1        4        3    3    12        
## 152                7               1        4        3    3    12        
## 153                7               1        4        3    3    12        
## 154                7               1        4        3    3    12        
## 155                7               1        4        3    3    12        
## 156                7               1        4        3    3    12        
## 157                7               1        4        3    3    12        
## 158                7               1        4        3    3    12        
## 159                7               1        4        3    3    12        
## 160                7               1        4        3    3    12        
## 161                3               6        4        3    3     2        
## 162                3               6        4        3    3     2        
## 163                3               6        4        3    3     2        
## 164                3               6        4        3    3     2        
## 165                3               6        4        3    3     2        
## 166                3               6        4        3    3     2        
## 167                3               6        4        3    3     2        
## 168                3               6        4        3    3     2        
## 169                3               6        4        3    3     2        
## 170                3               6        4        3    3     2        
## 171                3               6        4        3    3     2        
## 172                3               6        4        3    3     2        
## 173                3               6        4        3    3     2        
## 174                3               6        4        3    3     2        
## 175                3               6        4        3    3     2        
## 176                3               6        4        3    3     2        
## 177                2               7        1        1    1     1        
## 178                2               7        1        1    1     1        
## 179                2               7        1        1    1     1        
## 180                2               7        1        1    1     1        
## 181                2               7        1        1    1     1        
## 182                2               7        1        1    1     1        
## 183                2               7        1        1    1     1        
## 184                2               7        1        1    1     1        
## 185                2               7        1        1    1     1        
## 186                2               7        1        1    1     1        
## 187                2               7        1        1    1     1        
## 188                2               7        1        1    1     1        
## 189                2               7        1        1    1     1        
## 190                2               7        1        1    1     1        
## 191                2               7        1        1    1     1        
## 192                2               7        1        1    1     1        
## 193                7               3        1        1    1     9        
## 194                7               3        1        1    1     9        
## 195                7               3        1        1    1     9        
## 196                7               3        1        1    1     9        
## 197                7               3        1        1    1     9        
## 198                7               3        1        1    1     9        
## 199                7               3        1        1    1     9        
## 200                7               3        1        1    1     9        
## 201                7               3        1        1    1     9        
## 202                7               3        1        1    1     9        
## 203                7               3        1        1    1     9        
## 204                7               3        1        1    1     9        
## 205                7               3        1        1    1     9        
## 206                7               3        1        1    1     9        
## 207                7               3        1        1    1     9        
## 208                7               3        1        1    1     9        
## 209                7               6        3        2    3    12        
## 210                7               6        3        2    3    12        
## 211                7               6        3        2    3    12        
## 212                7               6        3        2    3    12        
## 213                7               6        3        2    3    12        
## 214                7               6        3        2    3    12        
## 215                7               6        3        2    3    12        
## 216                7               6        3        2    3    12        
## 217                7               6        3        2    3    12        
## 218                7               6        3        2    3    12        
## 219                7               6        3        2    3    12        
## 220                7               6        3        2    3    12        
## 221                7               6        3        2    3    12        
## 222                7               6        3        2    3    12        
## 223                7               6        3        2    3    12        
## 224                7               6        3        2    3    12        
## 225                5               3        7        5    4     1        
## 226                5               3        7        5    4     1        
## 227                5               3        7        5    4     1        
## 228                5               3        7        5    4     1        
## 229                5               3        7        5    4     1        
## 230                5               3        7        5    4     1        
## 231                5               3        7        5    4     1        
## 232                5               3        7        5    4     1        
## 233                5               3        7        5    4     1        
## 234                5               3        7        5    4     1        
## 235                5               3        7        5    4     1        
## 236                5               3        7        5    4     1        
## 237                5               3        7        5    4     1        
## 238                5               3        7        5    4     1        
## 239                5               3        7        5    4     1        
## 240                5               3        7        5    4     1        
## 241                7               6        7        5    5     1        
## 242                7               6        7        5    5     1        
## 243                7               6        7        5    5     1        
## 244                7               6        7        5    5     1        
## 245                7               6        7        5    5     1        
## 246                7               6        7        5    5     1        
## 247                7               6        7        5    5     1        
## 248                7               6        7        5    5     1        
## 249                7               6        7        5    5     1        
## 250                7               6        7        5    5     1        
## 251                7               6        7        5    5     1        
## 252                7               6        7        5    5     1        
## 253                7               6        7        5    5     1        
## 254                7               6        7        5    5     1        
## 255                7               6        7        5    5     1        
## 256                7               6        7        5    5     1        
## 257                5               3        2        1    3    11        
## 258                5               3        2        1    3    11        
## 259                5               3        2        1    3    11        
## 260                5               3        2        1    3    11        
## 261                5               3        2        1    3    11        
## 262                5               3        2        1    3    11        
## 263                5               3        2        1    3    11        
## 264                5               3        2        1    3    11        
## 265                5               3        2        1    3    11        
## 266                5               3        2        1    3    11        
## 267                5               3        2        1    3    11        
## 268                5               3        2        1    3    11        
## 269                5               3        2        1    3    11        
## 270                5               3        2        1    3    11        
## 271                5               3        2        1    3    11        
## 272                5               3        2        1    3    11        
## 273                4               3        1        1    1    10        
## 274                4               3        1        1    1    10        
## 275                4               3        1        1    1    10        
## 276                4               3        1        1    1    10        
## 277                4               3        1        1    1    10        
## 278                4               3        1        1    1    10        
## 279                4               3        1        1    1    10        
## 280                4               3        1        1    1    10        
## 281                4               3        1        1    1    10        
## 282                4               3        1        1    1    10        
## 283                4               3        1        1    1    10        
## 284                4               3        1        1    1    10        
## 285                4               3        1        1    1    10        
## 286                4               3        1        1    1    10        
## 287                4               3        1        1    1    10        
## 288                4               3        1        1    1    10        
## 289                6               7        2        1    3    13        
## 290                6               7        2        1    3    13        
## 291                6               7        2        1    3    13        
## 292                6               7        2        1    3    13        
## 293                6               7        2        1    3    13        
## 294                6               7        2        1    3    13        
## 295                6               7        2        1    3    13        
## 296                6               7        2        1    3    13        
## 297                6               7        2        1    3    13        
## 298                6               7        2        1    3    13        
## 299                6               7        2        1    3    13        
## 300                6               7        2        1    3    13        
## 301                6               7        2        1    3    13        
## 302                6               7        2        1    3    13        
## 303                6               7        2        1    3    13        
## 304                6               7        2        1    3    13        
## 305                5               7        4        3    3    11        
## 306                5               7        4        3    3    11        
## 307                5               7        4        3    3    11        
## 308                5               7        4        3    3    11        
## 309                5               7        4        3    3    11        
## 310                5               7        4        3    3    11        
## 311                5               7        4        3    3    11        
## 312                5               7        4        3    3    11        
## 313                5               7        4        3    3    11        
## 314                5               7        4        3    3    11        
## 315                5               7        4        3    3    11        
## 316                5               7        4        3    3    11        
## 317                5               7        4        3    3    11        
## 318                5               7        4        3    3    11        
## 319                5               7        4        3    3    11        
## 320                5               7        4        3    3    11        
## 321                4               8        3        2    1     9        
## 322                4               8        3        2    1     9        
## 323                4               8        3        2    1     9        
## 324                4               8        3        2    1     9        
## 325                4               8        3        2    1     9        
## 326                4               8        3        2    1     9        
## 327                4               8        3        2    1     9        
## 328                4               8        3        2    1     9        
## 329                4               8        3        2    1     9        
## 330                4               8        3        2    1     9        
## 331                4               8        3        2    1     9        
## 332                4               8        3        2    1     9        
## 333                4               8        3        2    1     9        
## 334                4               8        3        2    1     9        
## 335                4               8        3        2    1     9        
## 336                4               8        3        2    1     9        
## 337                8               3        2        1    3     1        
## 338                8               3        2        1    3     1        
## 339                8               3        2        1    3     1        
## 340                8               3        2        1    3     1        
## 341                8               3        2        1    3     1        
## 342                8               3        2        1    3     1        
## 343                8               3        2        1    3     1        
## 344                8               3        2        1    3     1        
## 345                8               3        2        1    3     1        
## 346                8               3        2        1    3     1        
## 347                8               3        2        1    3     1        
## 348                8               3        2        1    3     1        
## 349                8               3        2        1    3     1        
## 350                8               3        2        1    3     1        
## 351                8               3        2        1    3     1        
## 352                8               3        2        1    3     1        
## 353                1               2        6        5    3     1        
## 354                1               2        6        5    3     1        
## 355                1               2        6        5    3     1        
## 356                1               2        6        5    3     1        
## 357                1               2        6        5    3     1        
## 358                1               2        6        5    3     1        
## 359                1               2        6        5    3     1        
## 360                1               2        6        5    3     1        
## 361                1               2        6        5    3     1        
## 362                1               2        6        5    3     1        
## 363                1               2        6        5    3     1        
## 364                1               2        6        5    3     1        
## 365                1               2        6        5    3     1        
## 366                1               2        6        5    3     1        
## 367                1               2        6        5    3     1        
## 368                1               2        6        5    3     1        
## 369                3               6        6        5    3     5        
## 370                3               6        6        5    3     5        
## 371                3               6        6        5    3     5        
## 372                3               6        6        5    3     5        
## 373                3               6        6        5    3     5        
## 374                3               6        6        5    3     5        
## 375                3               6        6        5    3     5        
## 376                3               6        6        5    3     5        
## 377                3               6        6        5    3     5        
## 378                3               6        6        5    3     5        
## 379                3               6        6        5    3     5        
## 380                3               6        6        5    3     5        
## 381                3               6        6        5    3     5        
## 382                3               6        6        5    3     5        
## 383                3               6        6        5    3     5        
## 384                3               6        6        5    3     5        
## 385                4               6        4        3    1    11        
## 386                4               6        4        3    1    11        
## 387                4               6        4        3    1    11        
## 388                4               6        4        3    1    11        
## 389                4               6        4        3    1    11        
## 390                4               6        4        3    1    11        
## 391                4               6        4        3    1    11        
## 392                4               6        4        3    1    11        
## 393                4               6        4        3    1    11        
## 394                4               6        4        3    1    11        
## 395                4               6        4        3    1    11        
## 396                4               6        4        3    1    11        
## 397                4               6        4        3    1    11        
## 398                4               6        4        3    1    11        
## 399                4               6        4        3    1    11        
## 400                4               6        4        3    1    11        
## 401                1               7        3        2    4     1        
## 402                1               7        3        2    4     1        
## 403                1               7        3        2    4     1        
## 404                1               7        3        2    4     1        
## 405                1               7        3        2    4     1        
## 406                1               7        3        2    4     1        
## 407                1               7        3        2    4     1        
## 408                1               7        3        2    4     1        
## 409                1               7        3        2    4     1        
## 410                1               7        3        2    4     1        
## 411                1               7        3        2    4     1        
## 412                1               7        3        2    4     1        
## 413                1               7        3        2    4     1        
## 414                1               7        3        2    4     1        
## 415                1               7        3        2    4     1        
## 416                1               7        3        2    4     1        
## 417                3               2        7        5    3     1        
## 418                3               2        7        5    3     1        
## 419                3               2        7        5    3     1        
## 420                3               2        7        5    3     1        
## 421                3               2        7        5    3     1        
## 422                3               2        7        5    3     1        
## 423                3               2        7        5    3     1        
## 424                3               2        7        5    3     1        
## 425                3               2        7        5    3     1        
## 426                3               2        7        5    3     1        
## 427                3               2        7        5    3     1        
## 428                3               2        7        5    3     1        
## 429                3               2        7        5    3     1        
## 430                3               2        7        5    3     1        
## 431                3               2        7        5    3     1        
## 432                3               2        7        5    3     1        
## 433                8               6        1        1    2    12        
## 434                8               6        1        1    2    12        
## 435                8               6        1        1    2    12        
## 436                8               6        1        1    2    12        
## 437                8               6        1        1    2    12        
## 438                8               6        1        1    2    12        
## 439                8               6        1        1    2    12        
## 440                8               6        1        1    2    12        
## 441                8               6        1        1    2    12        
## 442                8               6        1        1    2    12        
## 443                8               6        1        1    2    12        
## 444                8               6        1        1    2    12        
## 445                8               6        1        1    2    12        
## 446                8               6        1        1    2    12        
## 447                8               6        1        1    2    12        
## 448                8               6        1        1    2    12        
## 449                2               3        1        1    1     9        
## 450                2               3        1        1    1     9        
## 451                2               3        1        1    1     9        
## 452                2               3        1        1    1     9        
## 453                2               3        1        1    1     9        
## 454                2               3        1        1    1     9        
## 455                2               3        1        1    1     9        
## 456                2               3        1        1    1     9        
## 457                2               3        1        1    1     9        
## 458                2               3        1        1    1     9        
## 459                2               3        1        1    1     9        
## 460                2               3        1        1    1     9        
## 461                2               3        1        1    1     9        
## 462                2               3        1        1    1     9        
## 463                2               3        1        1    1     9        
## 464                2               3        1        1    1     9        
## 465                1               2        6        5    3     5        
## 466                1               2        6        5    3     5        
## 467                1               2        6        5    3     5        
## 468                1               2        6        5    3     5        
## 469                1               2        6        5    3     5        
## 470                1               2        6        5    3     5        
## 471                1               2        6        5    3     5        
## 472                1               2        6        5    3     5        
## 473                1               2        6        5    3     5        
## 474                1               2        6        5    3     5        
## 475                1               2        6        5    3     5        
## 476                1               2        6        5    3     5        
## 477                1               2        6        5    3     5        
## 478                1               2        6        5    3     5        
## 479                1               2        6        5    3     5        
## 480                1               2        6        5    3     5        
## 481                1               8        2        1    3     2        
## 482                1               8        2        1    3     2        
## 483                1               8        2        1    3     2        
## 484                1               8        2        1    3     2        
## 485                1               8        2        1    3     2        
## 486                1               8        2        1    3     2        
## 487                1               8        2        1    3     2        
## 488                1               8        2        1    3     2        
## 489                1               8        2        1    3     2        
## 490                1               8        2        1    3     2        
## 491                1               8        2        1    3     2        
## 492                1               8        2        1    3     2        
## 493                1               8        2        1    3     2        
## 494                1               8        2        1    3     2        
## 495                1               8        2        1    3     2        
## 496                1               8        2        1    3     2        
## 497                8               7        7        5    4     1        
## 498                8               7        7        5    4     1        
## 499                8               7        7        5    4     1        
## 500                8               7        7        5    4     1        
## 501                8               7        7        5    4     1        
## 502                8               7        7        5    4     1        
## 503                8               7        7        5    4     1        
## 504                8               7        7        5    4     1        
## 505                8               7        7        5    4     1        
## 506                8               7        7        5    4     1        
## 507                8               7        7        5    4     1        
## 508                8               7        7        5    4     1        
## 509                8               7        7        5    4     1        
## 510                8               7        7        5    4     1        
## 511                8               7        7        5    4     1        
## 512                8               7        7        5    4     1        
## 513                8               1        3        2    3    11        
## 514                8               1        3        2    3    11        
## 515                8               1        3        2    3    11        
## 516                8               1        3        2    3    11        
## 517                8               1        3        2    3    11        
## 518                8               1        3        2    3    11        
## 519                8               1        3        2    3    11        
## 520                8               1        3        2    3    11        
## 521                8               1        3        2    3    11        
## 522                8               1        3        2    3    11        
## 523                8               1        3        2    3    11        
## 524                8               1        3        2    3    11        
## 525                8               1        3        2    3    11        
## 526                8               1        3        2    3    11        
## 527                8               1        3        2    3    11        
## 528                8               1        3        2    3    11        
## 529                6               4        4        3    3    11        
## 530                6               4        4        3    3    11        
## 531                6               4        4        3    3    11        
## 532                6               4        4        3    3    11        
## 533                6               4        4        3    3    11        
## 534                6               4        4        3    3    11        
## 535                6               4        4        3    3    11        
## 536                6               4        4        3    3    11        
## 537                6               4        4        3    3    11        
## 538                6               4        4        3    3    11        
## 539                6               4        4        3    3    11        
## 540                6               4        4        3    3    11        
## 541                6               4        4        3    3    11        
## 542                6               4        4        3    3    11        
## 543                6               4        4        3    3    11        
## 544                6               4        4        3    3    11        
## 545                1               3        5        4    5     1        
## 546                1               3        5        4    5     1        
## 547                1               3        5        4    5     1        
## 548                1               3        5        4    5     1        
## 549                1               3        5        4    5     1        
## 550                1               3        5        4    5     1        
## 551                1               3        5        4    5     1        
## 552                1               3        5        4    5     1        
## 553                1               3        5        4    5     1        
## 554                1               3        5        4    5     1        
## 555                1               3        5        4    5     1        
## 556                1               3        5        4    5     1        
## 557                1               3        5        4    5     1        
## 558                1               3        5        4    5     1        
## 559                1               3        5        4    5     1        
## 560                1               3        5        4    5     1        
## 561                7               4        7        5    3     1        
## 562                7               4        7        5    3     1        
## 563                7               4        7        5    3     1        
## 564                7               4        7        5    3     1        
## 565                7               4        7        5    3     1        
## 566                7               4        7        5    3     1        
## 567                7               4        7        5    3     1        
## 568                7               4        7        5    3     1        
## 569                7               4        7        5    3     1        
## 570                7               4        7        5    3     1        
## 571                7               4        7        5    3     1        
## 572                7               4        7        5    3     1        
## 573                7               4        7        5    3     1        
## 574                7               4        7        5    3     1        
## 575                7               4        7        5    3     1        
## 576                7               4        7        5    3     1        
## 577                2               1        3        2    2    11        
## 578                2               1        3        2    2    11        
## 579                2               1        3        2    2    11        
## 580                2               1        3        2    2    11        
## 581                2               1        3        2    2    11        
## 582                2               1        3        2    2    11        
## 583                2               1        3        2    2    11        
## 584                2               1        3        2    2    11        
## 585                2               1        3        2    2    11        
## 586                2               1        3        2    2    11        
## 587                2               1        3        2    2    11        
## 588                2               1        3        2    2    11        
## 589                2               1        3        2    2    11        
## 590                2               1        3        2    2    11        
## 591                2               1        3        2    2    11        
## 592                2               1        3        2    2    11        
## 593                2               5        6        5    1     1        
## 594                2               5        6        5    1     1        
## 595                2               5        6        5    1     1        
## 596                2               5        6        5    1     1        
## 597                2               5        6        5    1     1        
## 598                2               5        6        5    1     1        
## 599                2               5        6        5    1     1        
## 600                2               5        6        5    1     1        
## 601                2               5        6        5    1     1        
## 602                2               5        6        5    1     1        
## 603                2               5        6        5    1     1        
## 604                2               5        6        5    1     1        
## 605                2               5        6        5    1     1        
## 606                2               5        6        5    1     1        
## 607                2               5        6        5    1     1        
## 608                2               5        6        5    1     1        
## 609                6               7        6        5    3     2        
## 610                6               7        6        5    3     2        
## 611                6               7        6        5    3     2        
## 612                6               7        6        5    3     2        
## 613                6               7        6        5    3     2        
## 614                6               7        6        5    3     2        
## 615                6               7        6        5    3     2        
## 616                6               7        6        5    3     2        
## 617                6               7        6        5    3     2        
## 618                6               7        6        5    3     2        
## 619                6               7        6        5    3     2        
## 620                6               7        6        5    3     2        
## 621                6               7        6        5    3     2        
## 622                6               7        6        5    3     2        
## 623                6               7        6        5    3     2        
## 624                6               7        6        5    3     2        
## 625                5               4        4        3   NA    11        
## 626                5               4        4        3   NA    11        
## 627                5               4        4        3   NA    11        
## 628                5               4        4        3   NA    11        
## 629                5               4        4        3   NA    11        
## 630                5               4        4        3   NA    11        
## 631                5               4        4        3   NA    11        
## 632                5               4        4        3   NA    11        
## 633                5               4        4        3   NA    11        
## 634                5               4        4        3   NA    11        
## 635                5               4        4        3   NA    11        
## 636                5               4        4        3   NA    11        
## 637                5               4        4        3   NA    11        
## 638                5               4        4        3   NA    11        
## 639                5               4        4        3   NA    11        
## 640                5               4        4        3   NA    11        
## 641                4               8        1        1    2    11        
## 642                4               8        1        1    2    11        
## 643                4               8        1        1    2    11        
## 644                4               8        1        1    2    11        
## 645                4               8        1        1    2    11        
## 646                4               8        1        1    2    11        
## 647                4               8        1        1    2    11        
## 648                4               8        1        1    2    11        
## 649                4               8        1        1    2    11        
## 650                4               8        1        1    2    11        
## 651                4               8        1        1    2    11        
## 652                4               8        1        1    2    11        
## 653                4               8        1        1    2    11        
## 654                4               8        1        1    2    11        
## 655                4               8        1        1    2    11        
## 656                4               8        1        1    2    11        
## 657                4               7        2        1    2     9        
## 658                4               7        2        1    2     9        
## 659                4               7        2        1    2     9        
## 660                4               7        2        1    2     9        
## 661                4               7        2        1    2     9        
## 662                4               7        2        1    2     9        
## 663                4               7        2        1    2     9        
## 664                4               7        2        1    2     9        
## 665                4               7        2        1    2     9        
## 666                4               7        2        1    2     9        
## 667                4               7        2        1    2     9        
## 668                4               7        2        1    2     9        
## 669                4               7        2        1    2     9        
## 670                4               7        2        1    2     9        
## 671                4               7        2        1    2     9        
## 672                4               7        2        1    2     9        
## 673                6               5        1        1    1    10        
## 674                6               5        1        1    1    10        
## 675                6               5        1        1    1    10        
## 676                6               5        1        1    1    10        
## 677                6               5        1        1    1    10        
## 678                6               5        1        1    1    10        
## 679                6               5        1        1    1    10        
## 680                6               5        1        1    1    10        
## 681                6               5        1        1    1    10        
## 682                6               5        1        1    1    10        
## 683                6               5        1        1    1    10        
## 684                6               5        1        1    1    10        
## 685                6               5        1        1    1    10        
## 686                6               5        1        1    1    10        
## 687                6               5        1        1    1    10        
## 688                6               5        1        1    1    10        
## 689                8               3        4        3   NA     1        
## 690                8               3        4        3   NA     1        
## 691                8               3        4        3   NA     1        
## 692                8               3        4        3   NA     1        
## 693                8               3        4        3   NA     1        
## 694                8               3        4        3   NA     1        
## 695                8               3        4        3   NA     1        
## 696                8               3        4        3   NA     1        
## 697                8               3        4        3   NA     1        
## 698                8               3        4        3   NA     1        
## 699                8               3        4        3   NA     1        
## 700                8               3        4        3   NA     1        
## 701                8               3        4        3   NA     1        
## 702                8               3        4        3   NA     1        
## 703                8               3        4        3   NA     1        
## 704                8               3        4        3   NA     1        
## 705                5               8        7        5    5    12        
## 706                5               8        7        5    5    12        
## 707                5               8        7        5    5    12        
## 708                5               8        7        5    5    12        
## 709                5               8        7        5    5    12        
## 710                5               8        7        5    5    12        
## 711                5               8        7        5    5    12        
## 712                5               8        7        5    5    12        
## 713                5               8        7        5    5    12        
## 714                5               8        7        5    5    12        
## 715                5               8        7        5    5    12        
## 716                5               8        7        5    5    12        
## 717                5               8        7        5    5    12        
## 718                5               8        7        5    5    12        
## 719                5               8        7        5    5    12        
## 720                5               8        7        5    5    12        
## 721                2               5        1        1    2    11        
## 722                2               5        1        1    2    11        
## 723                2               5        1        1    2    11        
## 724                2               5        1        1    2    11        
## 725                2               5        1        1    2    11        
## 726                2               5        1        1    2    11        
## 727                2               5        1        1    2    11        
## 728                2               5        1        1    2    11        
## 729                2               5        1        1    2    11        
## 730                2               5        1        1    2    11        
## 731                2               5        1        1    2    11        
## 732                2               5        1        1    2    11        
## 733                2               5        1        1    2    11        
## 734                2               5        1        1    2    11        
## 735                2               5        1        1    2    11        
## 736                2               5        1        1    2    11        
## 737                6               2        7        5    3    12        
## 738                6               2        7        5    3    12        
## 739                6               2        7        5    3    12        
## 740                6               2        7        5    3    12        
## 741                6               2        7        5    3    12        
## 742                6               2        7        5    3    12        
## 743                6               2        7        5    3    12        
## 744                6               2        7        5    3    12        
## 745                6               2        7        5    3    12        
## 746                6               2        7        5    3    12        
## 747                6               2        7        5    3    12        
## 748                6               2        7        5    3    12        
## 749                6               2        7        5    3    12        
## 750                6               2        7        5    3    12        
## 751                6               2        7        5    3    12        
## 752                6               2        7        5    3    12        
## 753                2               4        1        1    1    11        
## 754                2               4        1        1    1    11        
## 755                2               4        1        1    1    11        
## 756                2               4        1        1    1    11        
## 757                2               4        1        1    1    11        
## 758                2               4        1        1    1    11        
## 759                2               4        1        1    1    11        
## 760                2               4        1        1    1    11        
## 761                2               4        1        1    1    11        
## 762                2               4        1        1    1    11        
## 763                2               4        1        1    1    11        
## 764                2               4        1        1    1    11        
## 765                2               4        1        1    1    11        
## 766                2               4        1        1    1    11        
## 767                2               4        1        1    1    11        
## 768                2               4        1        1    1    11        
## 769                7               2        1        1    3     1        
## 770                7               2        1        1    3     1        
## 771                7               2        1        1    3     1        
## 772                7               2        1        1    3     1        
## 773                7               2        1        1    3     1        
## 774                7               2        1        1    3     1        
## 775                7               2        1        1    3     1        
## 776                7               2        1        1    3     1        
## 777                7               2        1        1    3     1        
## 778                7               2        1        1    3     1        
## 779                7               2        1        1    3     1        
## 780                7               2        1        1    3     1        
## 781                7               2        1        1    3     1        
## 782                7               2        1        1    3     1        
## 783                7               2        1        1    3     1        
## 784                7               2        1        1    3     1        
## 785                5               2        4        3   NA    11        
## 786                5               2        4        3   NA    11        
## 787                5               2        4        3   NA    11        
## 788                5               2        4        3   NA    11        
## 789                5               2        4        3   NA    11        
## 790                5               2        4        3   NA    11        
## 791                5               2        4        3   NA    11        
## 792                5               2        4        3   NA    11        
## 793                5               2        4        3   NA    11        
## 794                5               2        4        3   NA    11        
## 795                5               2        4        3   NA    11        
## 796                5               2        4        3   NA    11        
## 797                5               2        4        3   NA    11        
## 798                5               2        4        3   NA    11        
## 799                5               2        4        3   NA    11        
## 800                5               2        4        3   NA    11        
## 801                5               4        4        3    3     2        
## 802                5               4        4        3    3     2        
## 803                5               4        4        3    3     2        
## 804                5               4        4        3    3     2        
## 805                5               4        4        3    3     2        
## 806                5               4        4        3    3     2        
## 807                5               4        4        3    3     2        
## 808                5               4        4        3    3     2        
## 809                5               4        4        3    3     2        
## 810                5               4        4        3    3     2        
## 811                5               4        4        3    3     2        
## 812                5               4        4        3    3     2        
## 813                5               4        4        3    3     2        
## 814                5               4        4        3    3     2        
## 815                5               4        4        3    3     2        
## 816                5               4        4        3    3     2        
## 817                2               3        3        2    2    11        
## 818                2               3        3        2    2    11        
## 819                2               3        3        2    2    11        
## 820                2               3        3        2    2    11        
## 821                2               3        3        2    2    11        
## 822                2               3        3        2    2    11        
## 823                2               3        3        2    2    11        
## 824                2               3        3        2    2    11        
## 825                2               3        3        2    2    11        
## 826                2               3        3        2    2    11        
## 827                2               3        3        2    2    11        
## 828                2               3        3        2    2    11        
## 829                2               3        3        2    2    11        
## 830                2               3        3        2    2    11        
## 831                2               3        3        2    2    11        
## 832                2               3        3        2    2    11        
## 833                6               7        1        1    1     9        
## 834                6               7        1        1    1     9        
## 835                6               7        1        1    1     9        
## 836                6               7        1        1    1     9        
## 837                6               7        1        1    1     9        
## 838                6               7        1        1    1     9        
## 839                6               7        1        1    1     9        
## 840                6               7        1        1    1     9        
## 841                6               7        1        1    1     9        
## 842                6               7        1        1    1     9        
## 843                6               7        1        1    1     9        
## 844                6               7        1        1    1     9        
## 845                6               7        1        1    1     9        
## 846                6               7        1        1    1     9        
## 847                6               7        1        1    1     9        
## 848                6               7        1        1    1     9        
## 849                4               2        5        4    4     2        
## 850                4               2        5        4    4     2        
## 851                4               2        5        4    4     2        
## 852                4               2        5        4    4     2        
## 853                4               2        5        4    4     2        
## 854                4               2        5        4    4     2        
## 855                4               2        5        4    4     2        
## 856                4               2        5        4    4     2        
## 857                4               2        5        4    4     2        
## 858                4               2        5        4    4     2        
## 859                4               2        5        4    4     2        
## 860                4               2        5        4    4     2        
## 861                4               2        5        4    4     2        
## 862                4               2        5        4    4     2        
## 863                4               2        5        4    4     2        
## 864                4               2        5        4    4     2        
## 865                6               4        3        2    1     1        
## 866                6               4        3        2    1     1        
## 867                6               4        3        2    1     1        
## 868                6               4        3        2    1     1        
## 869                6               4        3        2    1     1        
## 870                6               4        3        2    1     1        
## 871                6               4        3        2    1     1        
## 872                6               4        3        2    1     1        
## 873                6               4        3        2    1     1        
## 874                6               4        3        2    1     1        
## 875                6               4        3        2    1     1        
## 876                6               4        3        2    1     1        
## 877                6               4        3        2    1     1        
## 878                6               4        3        2    1     1        
## 879                6               4        3        2    1     1        
## 880                6               4        3        2    1     1        
## 881                4               8        4        3    3    11        
## 882                4               8        4        3    3    11        
## 883                4               8        4        3    3    11        
## 884                4               8        4        3    3    11        
## 885                4               8        4        3    3    11        
## 886                4               8        4        3    3    11        
## 887                4               8        4        3    3    11        
## 888                4               8        4        3    3    11        
## 889                4               8        4        3    3    11        
## 890                4               8        4        3    3    11        
## 891                4               8        4        3    3    11        
## 892                4               8        4        3    3    11        
## 893                4               8        4        3    3    11        
## 894                4               8        4        3    3    11        
## 895                4               8        4        3    3    11        
## 896                4               8        4        3    3    11        
## 897                7               4        3        2    3     1        
## 898                7               4        3        2    3     1        
## 899                7               4        3        2    3     1        
## 900                7               4        3        2    3     1        
## 901                7               4        3        2    3     1        
## 902                7               4        3        2    3     1        
## 903                7               4        3        2    3     1        
## 904                7               4        3        2    3     1        
## 905                7               4        3        2    3     1        
## 906                7               4        3        2    3     1        
## 907                7               4        3        2    3     1        
## 908                7               4        3        2    3     1        
## 909                7               4        3        2    3     1        
## 910                7               4        3        2    3     1        
## 911                7               4        3        2    3     1        
## 912                7               4        3        2    3     1        
## 913                8               6        3        2    1    11        
## 914                8               6        3        2    1    11        
## 915                8               6        3        2    1    11        
## 916                8               6        3        2    1    11        
## 917                8               6        3        2    1    11        
## 918                8               6        3        2    1    11        
## 919                8               6        3        2    1    11        
## 920                8               6        3        2    1    11        
## 921                8               6        3        2    1    11        
## 922                8               6        3        2    1    11        
## 923                8               6        3        2    1    11        
## 924                8               6        3        2    1    11        
## 925                8               6        3        2    1    11        
## 926                8               6        3        2    1    11        
## 927                8               6        3        2    1    11        
## 928                8               6        3        2    1    11        
## 929                1               8        4        3    4     2        
## 930                1               8        4        3    4     2        
## 931                1               8        4        3    4     2        
## 932                1               8        4        3    4     2        
## 933                1               8        4        3    4     2        
## 934                1               8        4        3    4     2        
## 935                1               8        4        3    4     2        
## 936                1               8        4        3    4     2        
## 937                1               8        4        3    4     2        
## 938                1               8        4        3    4     2        
## 939                1               8        4        3    4     2        
## 940                1               8        4        3    4     2        
## 941                1               8        4        3    4     2        
## 942                1               8        4        3    4     2        
## 943                1               8        4        3    4     2        
## 944                1               8        4        3    4     2        
## 945                1               6        3        2    3     1        
## 946                1               6        3        2    3     1        
## 947                1               6        3        2    3     1        
## 948                1               6        3        2    3     1        
## 949                1               6        3        2    3     1        
## 950                1               6        3        2    3     1        
## 951                1               6        3        2    3     1        
## 952                1               6        3        2    3     1        
## 953                1               6        3        2    3     1        
## 954                1               6        3        2    3     1        
## 955                1               6        3        2    3     1        
## 956                1               6        3        2    3     1        
## 957                1               6        3        2    3     1        
## 958                1               6        3        2    3     1        
## 959                1               6        3        2    3     1        
## 960                1               6        3        2    3     1        
## 961                7               8        5        4    3    10        
## 962                7               8        5        4    3    10        
## 963                7               8        5        4    3    10        
## 964                7               8        5        4    3    10        
## 965                7               8        5        4    3    10        
## 966                7               8        5        4    3    10        
## 967                7               8        5        4    3    10        
## 968                7               8        5        4    3    10        
## 969                7               8        5        4    3    10        
## 970                7               8        5        4    3    10        
## 971                7               8        5        4    3    10        
## 972                7               8        5        4    3    10        
## 973                7               8        5        4    3    10        
## 974                7               8        5        4    3    10        
## 975                7               8        5        4    3    10        
## 976                7               8        5        4    3    10        
## 977                2               6        6        5    4     1        
## 978                2               6        6        5    4     1        
## 979                2               6        6        5    4     1        
## 980                2               6        6        5    4     1        
## 981                2               6        6        5    4     1        
## 982                2               6        6        5    4     1        
## 983                2               6        6        5    4     1        
## 984                2               6        6        5    4     1        
## 985                2               6        6        5    4     1        
## 986                2               6        6        5    4     1        
## 987                2               6        6        5    4     1        
## 988                2               6        6        5    4     1        
## 989                2               6        6        5    4     1        
## 990                2               6        6        5    4     1        
## 991                2               6        6        5    4     1        
## 992                2               6        6        5    4     1        
## 993                4               1        2        1    2    11        
## 994                4               1        2        1    2    11        
## 995                4               1        2        1    2    11        
## 996                4               1        2        1    2    11        
## 997                4               1        2        1    2    11        
## 998                4               1        2        1    2    11        
## 999                4               1        2        1    2    11        
## 1000               4               1        2        1    2    11        
## 1001               4               1        2        1    2    11        
## 1002               4               1        2        1    2    11        
## 1003               4               1        2        1    2    11        
## 1004               4               1        2        1    2    11        
## 1005               4               1        2        1    2    11        
## 1006               4               1        2        1    2    11        
## 1007               4               1        2        1    2    11        
## 1008               4               1        2        1    2    11        
## 1009               4               7        7        5    5     2        
## 1010               4               7        7        5    5     2        
## 1011               4               7        7        5    5     2        
## 1012               4               7        7        5    5     2        
## 1013               4               7        7        5    5     2        
## 1014               4               7        7        5    5     2        
## 1015               4               7        7        5    5     2        
## 1016               4               7        7        5    5     2        
## 1017               4               7        7        5    5     2        
## 1018               4               7        7        5    5     2        
## 1019               4               7        7        5    5     2        
## 1020               4               7        7        5    5     2        
## 1021               4               7        7        5    5     2        
## 1022               4               7        7        5    5     2        
## 1023               4               7        7        5    5     2        
## 1024               4               7        7        5    5     2        
## 1025               4               7        7        5    3    12        
## 1026               4               7        7        5    3    12        
## 1027               4               7        7        5    3    12        
## 1028               4               7        7        5    3    12        
## 1029               4               7        7        5    3    12        
## 1030               4               7        7        5    3    12        
## 1031               4               7        7        5    3    12        
## 1032               4               7        7        5    3    12        
## 1033               4               7        7        5    3    12        
## 1034               4               7        7        5    3    12        
## 1035               4               7        7        5    3    12        
## 1036               4               7        7        5    3    12        
## 1037               4               7        7        5    3    12        
## 1038               4               7        7        5    3    12        
## 1039               4               7        7        5    3    12        
## 1040               4               7        7        5    3    12        
## 1041               3               1        3        2    1     1        
## 1042               3               1        3        2    1     1        
## 1043               3               1        3        2    1     1        
## 1044               3               1        3        2    1     1        
## 1045               3               1        3        2    1     1        
## 1046               3               1        3        2    1     1        
## 1047               3               1        3        2    1     1        
## 1048               3               1        3        2    1     1        
## 1049               3               1        3        2    1     1        
## 1050               3               1        3        2    1     1        
## 1051               3               1        3        2    1     1        
## 1052               3               1        3        2    1     1        
## 1053               3               1        3        2    1     1        
## 1054               3               1        3        2    1     1        
## 1055               3               1        3        2    1     1        
## 1056               3               1        3        2    1     1        
## 1057               1               5        1        1    1    11        
## 1058               1               5        1        1    1    11        
## 1059               1               5        1        1    1    11        
## 1060               1               5        1        1    1    11        
## 1061               1               5        1        1    1    11        
## 1062               1               5        1        1    1    11        
## 1063               1               5        1        1    1    11        
## 1064               1               5        1        1    1    11        
## 1065               1               5        1        1    1    11        
## 1066               1               5        1        1    1    11        
## 1067               1               5        1        1    1    11        
## 1068               1               5        1        1    1    11        
## 1069               1               5        1        1    1    11        
## 1070               1               5        1        1    1    11        
## 1071               1               5        1        1    1    11        
## 1072               1               5        1        1    1    11        
## 1073               2               3        5        4    5     1        
## 1074               2               3        5        4    5     1        
## 1075               2               3        5        4    5     1        
## 1076               2               3        5        4    5     1        
## 1077               2               3        5        4    5     1        
## 1078               2               3        5        4    5     1        
## 1079               2               3        5        4    5     1        
## 1080               2               3        5        4    5     1        
## 1081               2               3        5        4    5     1        
## 1082               2               3        5        4    5     1        
## 1083               2               3        5        4    5     1        
## 1084               2               3        5        4    5     1        
## 1085               2               3        5        4    5     1        
## 1086               2               3        5        4    5     1        
## 1087               2               3        5        4    5     1        
## 1088               2               3        5        4    5     1        
## 1089               1               7        5        4    3    12        
## 1090               1               7        5        4    3    12        
## 1091               1               7        5        4    3    12        
## 1092               1               7        5        4    3    12        
## 1093               1               7        5        4    3    12        
## 1094               1               7        5        4    3    12        
## 1095               1               7        5        4    3    12        
## 1096               1               7        5        4    3    12        
## 1097               1               7        5        4    3    12        
## 1098               1               7        5        4    3    12        
## 1099               1               7        5        4    3    12        
## 1100               1               7        5        4    3    12        
## 1101               1               7        5        4    3    12        
## 1102               1               7        5        4    3    12        
## 1103               1               7        5        4    3    12        
## 1104               1               7        5        4    3    12        
## 1105               6               3        1        1    2    12        
## 1106               6               3        1        1    2    12        
## 1107               6               3        1        1    2    12        
## 1108               6               3        1        1    2    12        
## 1109               6               3        1        1    2    12        
## 1110               6               3        1        1    2    12        
## 1111               6               3        1        1    2    12        
## 1112               6               3        1        1    2    12        
## 1113               6               3        1        1    2    12        
## 1114               6               3        1        1    2    12        
## 1115               6               3        1        1    2    12        
## 1116               6               3        1        1    2    12        
## 1117               6               3        1        1    2    12        
## 1118               6               3        1        1    2    12        
## 1119               6               3        1        1    2    12        
## 1120               6               3        1        1    2    12        
## 1121               5               6        4        3    4     5        
## 1122               5               6        4        3    4     5        
## 1123               5               6        4        3    4     5        
## 1124               5               6        4        3    4     5        
## 1125               5               6        4        3    4     5        
## 1126               5               6        4        3    4     5        
## 1127               5               6        4        3    4     5        
## 1128               5               6        4        3    4     5        
## 1129               5               6        4        3    4     5        
## 1130               5               6        4        3    4     5        
## 1131               5               6        4        3    4     5        
## 1132               5               6        4        3    4     5        
## 1133               5               6        4        3    4     5        
## 1134               5               6        4        3    4     5        
## 1135               5               6        4        3    4     5        
## 1136               5               6        4        3    4     5        
## 1137               3               4        6        5    3    12        
## 1138               3               4        6        5    3    12        
## 1139               3               4        6        5    3    12        
## 1140               3               4        6        5    3    12        
## 1141               3               4        6        5    3    12        
## 1142               3               4        6        5    3    12        
## 1143               3               4        6        5    3    12        
## 1144               3               4        6        5    3    12        
## 1145               3               4        6        5    3    12        
## 1146               3               4        6        5    3    12        
## 1147               3               4        6        5    3    12        
## 1148               3               4        6        5    3    12        
## 1149               3               4        6        5    3    12        
## 1150               3               4        6        5    3    12        
## 1151               3               4        6        5    3    12        
## 1152               3               4        6        5    3    12        
## 1153               8               1        1        1    3     2        
## 1154               8               1        1        1    3     2        
## 1155               8               1        1        1    3     2        
## 1156               8               1        1        1    3     2        
## 1157               8               1        1        1    3     2        
## 1158               8               1        1        1    3     2        
## 1159               8               1        1        1    3     2        
## 1160               8               1        1        1    3     2        
## 1161               8               1        1        1    3     2        
## 1162               8               1        1        1    3     2        
## 1163               8               1        1        1    3     2        
## 1164               8               1        1        1    3     2        
## 1165               8               1        1        1    3     2        
## 1166               8               1        1        1    3     2        
## 1167               8               1        1        1    3     2        
## 1168               8               1        1        1    3     2        
## 1169               2               3        2        1    3    12        
## 1170               2               3        2        1    3    12        
## 1171               2               3        2        1    3    12        
## 1172               2               3        2        1    3    12        
## 1173               2               3        2        1    3    12        
## 1174               2               3        2        1    3    12        
## 1175               2               3        2        1    3    12        
## 1176               2               3        2        1    3    12        
## 1177               2               3        2        1    3    12        
## 1178               2               3        2        1    3    12        
## 1179               2               3        2        1    3    12        
## 1180               2               3        2        1    3    12        
## 1181               2               3        2        1    3    12        
## 1182               2               3        2        1    3    12        
## 1183               2               3        2        1    3    12        
## 1184               2               3        2        1    3    12        
## 1185               2               7        2        1    3     5        
## 1186               2               7        2        1    3     5        
## 1187               2               7        2        1    3     5        
## 1188               2               7        2        1    3     5        
## 1189               2               7        2        1    3     5        
## 1190               2               7        2        1    3     5        
## 1191               2               7        2        1    3     5        
## 1192               2               7        2        1    3     5        
## 1193               2               7        2        1    3     5        
## 1194               2               7        2        1    3     5        
## 1195               2               7        2        1    3     5        
## 1196               2               7        2        1    3     5        
## 1197               2               7        2        1    3     5        
## 1198               2               7        2        1    3     5        
## 1199               2               7        2        1    3     5        
## 1200               2               7        2        1    3     5        
## 1201               2               4        2        1    3     2        
## 1202               2               4        2        1    3     2        
## 1203               2               4        2        1    3     2        
## 1204               2               4        2        1    3     2        
## 1205               2               4        2        1    3     2        
## 1206               2               4        2        1    3     2        
## 1207               2               4        2        1    3     2        
## 1208               2               4        2        1    3     2        
## 1209               2               4        2        1    3     2        
## 1210               2               4        2        1    3     2        
## 1211               2               4        2        1    3     2        
## 1212               2               4        2        1    3     2        
## 1213               2               4        2        1    3     2        
## 1214               2               4        2        1    3     2        
## 1215               2               4        2        1    3     2        
## 1216               2               4        2        1    3     2        
## 1217               5               7        1        1    3    10        
## 1218               5               7        1        1    3    10        
## 1219               5               7        1        1    3    10        
## 1220               5               7        1        1    3    10        
## 1221               5               7        1        1    3    10        
## 1222               5               7        1        1    3    10        
## 1223               5               7        1        1    3    10        
## 1224               5               7        1        1    3    10        
## 1225               5               7        1        1    3    10        
## 1226               5               7        1        1    3    10        
## 1227               5               7        1        1    3    10        
## 1228               5               7        1        1    3    10        
## 1229               5               7        1        1    3    10        
## 1230               5               7        1        1    3    10        
## 1231               5               7        1        1    3    10        
## 1232               5               7        1        1    3    10        
## 1233               6               2        2        1    3     1        
## 1234               6               2        2        1    3     1        
## 1235               6               2        2        1    3     1        
## 1236               6               2        2        1    3     1        
## 1237               6               2        2        1    3     1        
## 1238               6               2        2        1    3     1        
## 1239               6               2        2        1    3     1        
## 1240               6               2        2        1    3     1        
## 1241               6               2        2        1    3     1        
## 1242               6               2        2        1    3     1        
## 1243               6               2        2        1    3     1        
## 1244               6               2        2        1    3     1        
## 1245               6               2        2        1    3     1        
## 1246               6               2        2        1    3     1        
## 1247               6               2        2        1    3     1        
## 1248               6               2        2        1    3     1        
## 1249               3               6        2        1    3     1        
## 1250               3               6        2        1    3     1        
## 1251               3               6        2        1    3     1        
## 1252               3               6        2        1    3     1        
## 1253               3               6        2        1    3     1        
## 1254               3               6        2        1    3     1        
## 1255               3               6        2        1    3     1        
## 1256               3               6        2        1    3     1        
## 1257               3               6        2        1    3     1        
## 1258               3               6        2        1    3     1        
## 1259               3               6        2        1    3     1        
## 1260               3               6        2        1    3     1        
## 1261               3               6        2        1    3     1        
## 1262               3               6        2        1    3     1        
## 1263               3               6        2        1    3     1        
## 1264               3               6        2        1    3     1        
## 1265               6               2        2        1    3    10        
## 1266               6               2        2        1    3    10        
## 1267               6               2        2        1    3    10        
## 1268               6               2        2        1    3    10        
## 1269               6               2        2        1    3    10        
## 1270               6               2        2        1    3    10        
## 1271               6               2        2        1    3    10        
## 1272               6               2        2        1    3    10        
## 1273               6               2        2        1    3    10        
## 1274               6               2        2        1    3    10        
## 1275               6               2        2        1    3    10        
## 1276               6               2        2        1    3    10        
## 1277               6               2        2        1    3    10        
## 1278               6               2        2        1    3    10        
## 1279               6               2        2        1    3    10        
## 1280               6               2        2        1    3    10        
## 1281               4               8        6        5    4     1        
## 1282               4               8        6        5    4     1        
## 1283               4               8        6        5    4     1        
## 1284               4               8        6        5    4     1        
## 1285               4               8        6        5    4     1        
## 1286               4               8        6        5    4     1        
## 1287               4               8        6        5    4     1        
## 1288               4               8        6        5    4     1        
## 1289               4               8        6        5    4     1        
## 1290               4               8        6        5    4     1        
## 1291               4               8        6        5    4     1        
## 1292               4               8        6        5    4     1        
## 1293               4               8        6        5    4     1        
## 1294               4               8        6        5    4     1        
## 1295               4               8        6        5    4     1        
## 1296               4               8        6        5    4     1        
## 1297               7               4        2        1    3    10        
## 1298               7               4        2        1    3    10        
## 1299               7               4        2        1    3    10        
## 1300               7               4        2        1    3    10        
## 1301               7               4        2        1    3    10        
## 1302               7               4        2        1    3    10        
## 1303               7               4        2        1    3    10        
## 1304               7               4        2        1    3    10        
## 1305               7               4        2        1    3    10        
## 1306               7               4        2        1    3    10        
## 1307               7               4        2        1    3    10        
## 1308               7               4        2        1    3    10        
## 1309               7               4        2        1    3    10        
## 1310               7               4        2        1    3    10        
## 1311               7               4        2        1    3    10        
## 1312               7               4        2        1    3    10        
## 1313               2               4        1        1    2     9        
## 1314               2               4        1        1    2     9        
## 1315               2               4        1        1    2     9        
##      ATTEND             STARTDT               ENDDT     Device GENDER AGE AGE4
## 1         2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 2         2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 3         2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 4         2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 5         2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 6         2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 7         2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 8         2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 9         2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 10        2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 11        2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 12        2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 13        2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 14        2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 15        2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 16        2 2024-03-29 16:24:54 2024-03-29 16:29:05    Desktop      2  64    4
## 17        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 18        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 19        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 20        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 21        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 22        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 23        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 24        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 25        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 26        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 27        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 28        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 29        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 30        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 31        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 32        3 2024-04-05 20:01:22 2024-04-05 20:05:45 Smartphone      2  54    3
## 33        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 34        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 35        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 36        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 37        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 38        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 39        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 40        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 41        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 42        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 43        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 44        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 45        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 46        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 47        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 48        1 2024-04-16 10:16:58 2024-04-16 10:21:00 Smartphone      2  39    2
## 49        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 50        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 51        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 52        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 53        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 54        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 55        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 56        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 57        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 58        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 59        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 60        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 61        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 62        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 63        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 64        1 2024-04-01 13:49:48 2024-04-01 13:56:12    Desktop      2  58    3
## 65        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 66        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 67        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 68        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 69        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 70        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 71        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 72        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 73        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 74        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 75        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 76        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 77        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 78        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 79        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 80        1 2024-03-29 16:07:10 2024-03-29 16:10:38    Desktop      2  25    1
## 81        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 82        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 83        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 84        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 85        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 86        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 87        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 88        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 89        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 90        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 91        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 92        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 93        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 94        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 95        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 96        1 2024-04-16 13:30:16 2024-04-16 13:33:38 Smartphone      1  25    1
## 97        7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 98        7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 99        7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 100       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 101       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 102       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 103       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 104       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 105       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 106       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 107       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 108       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 109       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 110       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 111       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 112       7 2024-04-16 10:26:54 2024-04-16 10:51:55    Desktop      2  42    2
## 113       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 114       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 115       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 116       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 117       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 118       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 119       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 120       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 121       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 122       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 123       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 124       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 125       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 126       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 127       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 128       3 2024-03-29 16:08:56 2024-03-29 16:12:53 Smartphone      2  50    3
## 129       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 130       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 131       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 132       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 133       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 134       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 135       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 136       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 137       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 138       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 139       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 140       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 141       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 142       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 143       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 144       3 2024-03-29 20:24:03 2024-03-29 20:28:12    Desktop      2  66    4
## 145       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 146       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 147       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 148       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 149       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 150       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 151       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 152       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 153       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 154       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 155       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 156       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 157       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 158       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 159       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 160       2 2024-04-03 15:36:06 2024-04-03 15:40:25    Desktop      1  33    2
## 161       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 162       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 163       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 164       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 165       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 166       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 167       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 168       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 169       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 170       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 171       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 172       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 173       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 174       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 175       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 176       4 2024-04-10 16:33:25 2024-04-10 16:37:55 Smartphone      2  21    1
## 177       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 178       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 179       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 180       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 181       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 182       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 183       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 184       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 185       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 186       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 187       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 188       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 189       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 190       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 191       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 192       2 2024-04-16 10:17:06 2024-04-16 10:20:41 Smartphone      2  68    4
## 193       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 194       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 195       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 196       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 197       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 198       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 199       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 200       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 201       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 202       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 203       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 204       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 205       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 206       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 207       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 208       1 2024-04-04 19:33:10 2024-04-04 19:39:03    Desktop      1  28    1
## 209       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 210       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 211       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 212       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 213       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 214       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 215       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 216       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 217       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 218       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 219       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 220       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 221       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 222       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 223       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 224       4 2024-03-29 16:27:34 2024-03-29 16:33:40    Desktop      1  81    4
## 225       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 226       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 227       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 228       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 229       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 230       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 231       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 232       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 233       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 234       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 235       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 236       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 237       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 238       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 239       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 240       1 2024-04-16 16:06:09 2024-04-16 16:11:50    Desktop      2  81    4
## 241       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 242       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 243       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 244       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 245       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 246       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 247       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 248       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 249       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 250       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 251       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 252       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 253       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 254       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 255       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 256       7 2024-03-29 17:36:28 2024-03-29 17:40:56    Desktop      1  62    4
## 257       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 258       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 259       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 260       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 261       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 262       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 263       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 264       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 265       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 266       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 267       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 268       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 269       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 270       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 271       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 272       1 2024-04-05 20:32:18 2024-04-05 20:37:11 Smartphone      2  50    3
## 273       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 274       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 275       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 276       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 277       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 278       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 279       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 280       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 281       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 282       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 283       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 284       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 285       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 286       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 287       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 288       1 2024-03-29 16:28:39 2024-03-29 16:31:53    Desktop      1  42    2
## 289       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 290       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 291       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 292       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 293       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 294       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 295       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 296       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 297       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 298       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 299       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 300       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 301       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 302       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 303       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 304       3 2024-04-06 10:51:47 2024-04-06 10:56:34 Smartphone      2  56    3
## 305       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 306       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 307       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 308       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 309       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 310       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 311       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 312       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 313       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 314       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 315       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 316       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 317       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 318       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 319       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 320       1 2024-03-29 16:40:22 2024-03-29 16:44:36 Smartphone      2  32    2
## 321       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 322       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 323       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 324       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 325       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 326       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 327       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 328       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 329       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 330       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 331       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 332       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 333       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 334       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 335       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 336       1 2024-04-03 22:38:33 2024-04-03 22:44:11 Smartphone      1  35    2
## 337       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 338       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 339       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 340       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 341       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 342       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 343       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 344       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 345       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 346       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 347       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 348       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 349       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 350       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 351       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 352       2 2024-04-09 18:51:42 2024-04-09 19:02:42    Desktop      2  60    4
## 353       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 354       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 355       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 356       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 357       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 358       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 359       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 360       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 361       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 362       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 363       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 364       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 365       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 366       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 367       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 368       2 2024-03-31 11:07:03 2024-03-31 11:11:32 Smartphone      1  37    2
## 369       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 370       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 371       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 372       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 373       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 374       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 375       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 376       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 377       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 378       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 379       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 380       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 381       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 382       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 383       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 384       3 2024-04-05 11:39:39 2024-04-05 11:43:52    Desktop      2  42    2
## 385       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 386       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 387       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 388       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 389       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 390       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 391       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 392       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 393       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 394       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 395       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 396       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 397       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 398       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 399       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 400       1 2024-03-31 23:09:40 2024-03-31 23:13:34 Smartphone      1  30    2
## 401       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 402       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 403       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 404       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 405       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 406       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 407       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 408       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 409       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 410       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 411       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 412       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 413       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 414       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 415       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 416       2 2024-03-29 17:23:57 2024-03-29 17:28:43    Desktop      2  60    4
## 417       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 418       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 419       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 420       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 421       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 422       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 423       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 424       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 425       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 426       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 427       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 428       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 429       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 430       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 431       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 432       7 2024-04-06 13:07:57 2024-04-06 13:15:21    Desktop      2  84    4
## 433       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 434       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 435       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 436       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 437       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 438       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 439       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 440       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 441       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 442       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 443       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 444       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 445       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 446       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 447       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 448       2 2024-04-12 23:39:45 2024-04-12 23:52:28     Tablet      2  73    4
## 449       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 450       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 451       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 452       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 453       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 454       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 455       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 456       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 457       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 458       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 459       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 460       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 461       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 462       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 463       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 464       1 2024-03-29 17:19:25 2024-03-29 17:24:01 Smartphone      1  46    3
## 465       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 466       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 467       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 468       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 469       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 470       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 471       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 472       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 473       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 474       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 475       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 476       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 477       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 478       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 479       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 480       7 2024-03-29 17:06:45 2024-03-29 17:10:10    Desktop      1  64    4
## 481       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 482       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 483       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 484       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 485       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 486       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 487       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 488       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 489       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 490       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 491       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 492       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 493       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 494       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 495       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 496       1 2024-03-30 17:38:57 2024-03-30 17:50:04 Smartphone      2  43    2
## 497       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 498       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 499       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 500       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 501       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 502       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 503       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 504       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 505       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 506       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 507       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 508       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 509       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 510       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 511       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 512       7 2024-04-02 08:20:09 2024-04-02 08:28:15 Smartphone      1  21    1
## 513       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 514       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 515       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 516       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 517       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 518       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 519       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 520       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 521       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 522       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 523       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 524       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 525       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 526       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 527       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 528       1 2024-03-30 05:10:31 2024-03-30 05:14:39 Smartphone      1  33    2
## 529       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 530       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 531       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 532       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 533       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 534       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 535       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 536       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 537       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 538       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 539       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 540       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 541       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 542       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 543       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 544       1 2024-04-05 02:05:21 2024-04-05 02:09:45    Desktop      2  37    2
## 545       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 546       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 547       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 548       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 549       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 550       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 551       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 552       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 553       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 554       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 555       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 556       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 557       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 558       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 559       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 560       9 2024-03-29 17:20:33 2024-03-29 17:25:32 Smartphone      1  68    4
## 561       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 562       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 563       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 564       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 565       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 566       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 567       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 568       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 569       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 570       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 571       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 572       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 573       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 574       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 575       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 576       2 2024-03-29 16:43:46 2024-03-29 16:50:34    Desktop      1  65    4
## 577       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 578       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 579       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 580       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 581       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 582       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 583       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 584       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 585       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 586       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 587       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 588       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 589       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 590       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 591       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 592       2 2024-04-17 14:12:37 2024-04-17 14:20:34 Smartphone      1  29    1
## 593       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 594       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 595       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 596       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 597       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 598       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 599       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 600       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 601       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 602       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 603       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 604       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 605       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 606       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 607       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 608       3 2024-04-16 16:31:10 2024-04-16 16:36:50    Desktop      1  60    4
## 609       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 610       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 611       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 612       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 613       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 614       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 615       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 616       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 617       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 618       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 619       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 620       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 621       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 622       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 623       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 624       4 2024-03-30 12:01:54 2024-03-30 12:06:37 Smartphone      2  30    2
## 625       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 626       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 627       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 628       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 629       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 630       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 631       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 632       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 633       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 634       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 635       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 636       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 637       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 638       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 639       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 640       2 2024-04-03 20:11:08 2024-04-03 20:24:25    Desktop      2  26    1
## 641       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 642       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 643       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 644       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 645       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 646       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 647       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 648       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 649       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 650       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 651       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 652       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 653       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 654       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 655       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 656       1 2024-03-29 16:20:05 2024-03-29 16:24:53    Desktop      2  45    3
## 657       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 658       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 659       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 660       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 661       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 662       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 663       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 664       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 665       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 666       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 667       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 668       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 669       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 670       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 671       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 672       1 2024-04-05 23:51:48 2024-04-05 23:55:44 Smartphone      1  42    2
## 673       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 674       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 675       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 676       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 677       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 678       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 679       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 680       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 681       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 682       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 683       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 684       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 685       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 686       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 687       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 688       1 2024-04-01 08:25:22 2024-04-01 08:28:57 Smartphone      1  40    2
## 689       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 690       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 691       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 692       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 693       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 694       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 695       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 696       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 697       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 698       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 699       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 700       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 701       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 702       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 703       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 704       6 2024-04-02 00:23:49 2024-04-02 00:28:08 Smartphone      2  75    4
## 705       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 706       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 707       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 708       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 709       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 710       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 711       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 712       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 713       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 714       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 715       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 716       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 717       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 718       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 719       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 720       8 2024-03-29 18:37:32 2024-03-29 18:40:51 Smartphone      2  34    2
## 721       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 722       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 723       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 724       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 725       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 726       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 727       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 728       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 729       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 730       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 731       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 732       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 733       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 734       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 735       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 736       1 2024-04-08 10:40:06 2024-04-08 10:43:16 Smartphone      2  26    1
## 737       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 738       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 739       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 740       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 741       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 742       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 743       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 744       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 745       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 746       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 747       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 748       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 749       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 750       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 751       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 752       4 2024-04-05 19:19:30 2024-04-05 19:23:43 Smartphone      2  55    3
## 753       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 754       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 755       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 756       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 757       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 758       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 759       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 760       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 761       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 762       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 763       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 764       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 765       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 766       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 767       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 768       3 2024-03-29 17:53:38 2024-03-29 17:57:33 Smartphone      2  48    3
## 769       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 770       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 771       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 772       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 773       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 774       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 775       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 776       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 777       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 778       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 779       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 780       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 781       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 782       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 783       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 784       2 2024-03-29 17:40:25 2024-03-29 17:44:33 Smartphone      2  70    4
## 785       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 786       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 787       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 788       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 789       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 790       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 791       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 792       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 793       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 794       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 795       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 796       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 797       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 798       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 799       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 800       1 2024-04-05 14:16:25 2024-04-05 14:23:23    Desktop      2  64    4
## 801       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 802       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 803       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 804       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 805       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 806       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 807       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 808       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 809       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 810       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 811       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 812       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 813       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 814       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 815       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 816       6 2024-04-02 17:22:17 2024-04-02 17:27:44 Smartphone      2  78    4
## 817       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 818       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 819       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 820       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 821       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 822       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 823       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 824       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 825       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 826       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 827       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 828       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 829       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 830       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 831       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 832       1 2024-03-30 12:46:47 2024-03-30 12:51:42    Desktop      2  49    3
## 833       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 834       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 835       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 836       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 837       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 838       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 839       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 840       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 841       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 842       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 843       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 844       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 845       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 846       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 847       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 848       1 2024-03-29 18:14:54 2024-03-29 18:19:05    Desktop      1  79    4
## 849       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 850       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 851       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 852       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 853       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 854       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 855       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 856       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 857       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 858       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 859       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 860       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 861       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 862       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 863       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 864       1 2024-04-08 16:05:48 2024-04-08 16:09:55    Desktop      1  56    3
## 865       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 866       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 867       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 868       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 869       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 870       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 871       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 872       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 873       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 874       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 875       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 876       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 877       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 878       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 879       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 880       2 2024-03-29 18:19:04 2024-03-29 18:23:19    Desktop      2  80    4
## 881       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 882       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 883       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 884       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 885       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 886       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 887       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 888       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 889       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 890       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 891       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 892       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 893       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 894       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 895       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 896       1 2024-03-31 00:50:17 2024-03-31 00:54:32 Smartphone      1  44    2
## 897       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 898       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 899       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 900       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 901       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 902       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 903       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 904       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 905       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 906       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 907       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 908       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 909       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 910       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 911       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 912       5 2024-03-30 10:01:38 2024-03-30 10:05:06    Desktop      2  21    1
## 913       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 914       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 915       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 916       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 917       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 918       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 919       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 920       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 921       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 922       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 923       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 924       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 925       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 926       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 927       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 928       1 2024-03-30 10:58:58 2024-03-30 11:02:29 Smartphone      1  24    1
## 929       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 930       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 931       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 932       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 933       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 934       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 935       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 936       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 937       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 938       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 939       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 940       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 941       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 942       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 943       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 944       8 2024-03-30 10:14:05 2024-03-30 10:17:45    Desktop      1  23    1
## 945       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 946       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 947       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 948       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 949       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 950       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 951       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 952       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 953       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 954       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 955       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 956       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 957       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 958       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 959       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 960       3 2024-03-29 18:56:30 2024-03-29 19:02:01 Smartphone      2  30    2
## 961       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 962       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 963       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 964       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 965       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 966       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 967       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 968       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 969       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 970       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 971       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 972       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 973       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 974       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 975       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 976       3 2024-04-16 18:56:34 2024-04-16 19:01:19    Desktop      1  55    3
## 977       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 978       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 979       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 980       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 981       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 982       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 983       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 984       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 985       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 986       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 987       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 988       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 989       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 990       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 991       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 992       8 2024-04-01 12:28:10 2024-04-01 12:32:41 Smartphone      2  49    3
## 993       1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 994       1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 995       1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 996       1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 997       1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 998       1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 999       1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 1000      1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 1001      1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 1002      1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 1003      1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 1004      1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 1005      1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 1006      1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 1007      1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 1008      1 2024-04-04 21:07:37 2024-04-04 21:11:25 Smartphone      1  19    1
## 1009      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1010      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1011      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1012      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1013      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1014      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1015      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1016      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1017      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1018      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1019      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1020      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1021      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1022      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1023      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1024      7 2024-03-29 19:49:37 2024-03-29 19:52:58 Smartphone      1  45    3
## 1025      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1026      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1027      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1028      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1029      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1030      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1031      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1032      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1033      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1034      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1035      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1036      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1037      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1038      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1039      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1040      7 2024-04-05 08:49:37 2024-04-05 08:54:23 Smartphone      1  48    3
## 1041      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1042      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1043      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1044      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1045      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1046      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1047      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1048      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1049      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1050      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1051      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1052      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1053      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1054      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1055      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1056      3 2024-04-05 19:25:50 2024-04-05 19:29:20 Smartphone      2  34    2
## 1057      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1058      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1059      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1060      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1061      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1062      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1063      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1064      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1065      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1066      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1067      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1068      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1069      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1070      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1071      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1072      1 2024-04-05 17:43:42 2024-04-05 17:47:55    Desktop      2  29    1
## 1073      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1074      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1075      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1076      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1077      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1078      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1079      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1080      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1081      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1082      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1083      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1084      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1085      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1086      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1087      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1088      2 2024-03-30 07:48:14 2024-03-30 07:53:11 Smartphone      2  34    2
## 1089      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1090      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1091      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1092      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1093      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1094      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1095      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1096      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1097      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1098      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1099      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1100      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1101      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1102      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1103      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1104      4 2024-04-16 12:09:40 2024-04-16 12:13:48 Smartphone      2  27    1
## 1105      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1106      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1107      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1108      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1109      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1110      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1111      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1112      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1113      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1114      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1115      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1116      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1117      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1118      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1119      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1120      2 2024-03-30 12:21:47 2024-03-30 12:25:23 Smartphone      1  28    1
## 1121      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1122      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1123      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1124      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1125      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1126      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1127      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1128      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1129      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1130      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1131      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1132      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1133      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1134      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1135      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1136      1 2024-04-16 16:18:55 2024-04-16 16:23:12 Smartphone      1  69    4
## 1137      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1138      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1139      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1140      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1141      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1142      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1143      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1144      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1145      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1146      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1147      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1148      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1149      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1150      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1151      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1152      8 2024-03-29 20:07:35 2024-03-31 12:33:11    Desktop      2  20    1
## 1153      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1154      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1155      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1156      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1157      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1158      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1159      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1160      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1161      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1162      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1163      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1164      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1165      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1166      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1167      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1168      2 2024-03-29 23:36:52 2024-03-29 23:40:38 Smartphone      1  63    4
## 1169      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1170      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1171      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1172      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1173      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1174      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1175      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1176      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1177      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1178      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1179      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1180      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1181      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1182      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1183      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1184      2 2024-03-29 21:44:29 2024-03-29 21:48:10    Desktop      2  29    1
## 1185      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1186      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1187      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1188      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1189      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1190      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1191      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1192      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1193      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1194      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1195      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1196      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1197      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1198      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1199      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1200      1 2024-03-29 20:17:27 2024-03-30 10:29:13 Smartphone      1  75    4
## 1201      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1202      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1203      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1204      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1205      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1206      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1207      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1208      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1209      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1210      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1211      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1212      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1213      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1214      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1215      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1216      3 2024-03-29 17:56:13 2024-04-16 11:21:39 Smartphone      2  60    4
## 1217      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1218      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1219      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1220      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1221      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1222      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1223      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1224      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1225      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1226      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1227      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1228      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1229      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1230      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1231      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1232      1 2024-03-30 16:09:46 2024-03-30 16:18:33    Desktop      2  65    4
## 1233      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1234      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1235      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1236      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1237      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1238      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1239      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1240      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1241      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1242      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1243      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1244      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1245      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1246      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1247      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1248      4 2024-03-29 16:30:23 2024-03-29 16:34:32 Smartphone      2  19    1
## 1249      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1250      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1251      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1252      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1253      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1254      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1255      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1256      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1257      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1258      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1259      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1260      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1261      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1262      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1263      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1264      4 2024-03-29 19:38:07 2024-03-29 19:41:39 Smartphone      2  42    2
## 1265      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1266      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1267      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1268      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1269      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1270      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1271      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1272      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1273      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1274      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1275      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1276      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1277      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1278      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1279      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1280      1 2024-03-31 22:52:16 2024-03-31 22:56:34 Smartphone      2  40    2
## 1281      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1282      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1283      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1284      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1285      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1286      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1287      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1288      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1289      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1290      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1291      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1292      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1293      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1294      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1295      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1296      8 2024-04-07 17:45:34 2024-04-07 17:48:58    Desktop      1  21    1
## 1297      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1298      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1299      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1300      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1301      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1302      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1303      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1304      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1305      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1306      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1307      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1308      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1309      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1310      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1311      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1312      1 2024-04-05 13:37:24 2024-04-05 13:40:54    Desktop      2  31    2
## 1313      1 2024-03-29 20:58:33 2024-03-29 21:02:55    Desktop      2  69    4
## 1314      1 2024-03-29 20:58:33 2024-03-29 21:02:55    Desktop      2  69    4
## 1315      1 2024-03-29 20:58:33 2024-03-29 21:02:55    Desktop      2  69    4
##      AGE7 RACETHNICITY EDUC5 MARITAL EMPLOY INCOME INCOME4 INCOME9 STATE
## 1       5            1     3       1      5     18       4       9    IA
## 2       5            1     3       1      5     18       4       9    IA
## 3       5            1     3       1      5     18       4       9    IA
## 4       5            1     3       1      5     18       4       9    IA
## 5       5            1     3       1      5     18       4       9    IA
## 6       5            1     3       1      5     18       4       9    IA
## 7       5            1     3       1      5     18       4       9    IA
## 8       5            1     3       1      5     18       4       9    IA
## 9       5            1     3       1      5     18       4       9    IA
## 10      5            1     3       1      5     18       4       9    IA
## 11      5            1     3       1      5     18       4       9    IA
## 12      5            1     3       1      5     18       4       9    IA
## 13      5            1     3       1      5     18       4       9    IA
## 14      5            1     3       1      5     18       4       9    IA
## 15      5            1     3       1      5     18       4       9    IA
## 16      5            1     3       1      5     18       4       9    IA
## 17      4            1     3       3      6     15       4       8    CA
## 18      4            1     3       3      6     15       4       8    CA
## 19      4            1     3       3      6     15       4       8    CA
## 20      4            1     3       3      6     15       4       8    CA
## 21      4            1     3       3      6     15       4       8    CA
## 22      4            1     3       3      6     15       4       8    CA
## 23      4            1     3       3      6     15       4       8    CA
## 24      4            1     3       3      6     15       4       8    CA
## 25      4            1     3       3      6     15       4       8    CA
## 26      4            1     3       3      6     15       4       8    CA
## 27      4            1     3       3      6     15       4       8    CA
## 28      4            1     3       3      6     15       4       8    CA
## 29      4            1     3       3      6     15       4       8    CA
## 30      4            1     3       3      6     15       4       8    CA
## 31      4            1     3       3      6     15       4       8    CA
## 32      4            1     3       3      6     15       4       8    CA
## 33      3            1     4       5      1     11       3       6    WA
## 34      3            1     4       5      1     11       3       6    WA
## 35      3            1     4       5      1     11       3       6    WA
## 36      3            1     4       5      1     11       3       6    WA
## 37      3            1     4       5      1     11       3       6    WA
## 38      3            1     4       5      1     11       3       6    WA
## 39      3            1     4       5      1     11       3       6    WA
## 40      3            1     4       5      1     11       3       6    WA
## 41      3            1     4       5      1     11       3       6    WA
## 42      3            1     4       5      1     11       3       6    WA
## 43      3            1     4       5      1     11       3       6    WA
## 44      3            1     4       5      1     11       3       6    WA
## 45      3            1     4       5      1     11       3       6    WA
## 46      3            1     4       5      1     11       3       6    WA
## 47      3            1     4       5      1     11       3       6    WA
## 48      3            1     4       5      1     11       3       6    WA
## 49      5            5     3       3      7      8       2       4    CA
## 50      5            5     3       3      7      8       2       4    CA
## 51      5            5     3       3      7      8       2       4    CA
## 52      5            5     3       3      7      8       2       4    CA
## 53      5            5     3       3      7      8       2       4    CA
## 54      5            5     3       3      7      8       2       4    CA
## 55      5            5     3       3      7      8       2       4    CA
## 56      5            5     3       3      7      8       2       4    CA
## 57      5            5     3       3      7      8       2       4    CA
## 58      5            5     3       3      7      8       2       4    CA
## 59      5            5     3       3      7      8       2       4    CA
## 60      5            5     3       3      7      8       2       4    CA
## 61      5            5     3       3      7      8       2       4    CA
## 62      5            5     3       3      7      8       2       4    CA
## 63      5            5     3       3      7      8       2       4    CA
## 64      5            5     3       3      7      8       2       4    CA
## 65      2            1     4       5      1     14       4       8    TX
## 66      2            1     4       5      1     14       4       8    TX
## 67      2            1     4       5      1     14       4       8    TX
## 68      2            1     4       5      1     14       4       8    TX
## 69      2            1     4       5      1     14       4       8    TX
## 70      2            1     4       5      1     14       4       8    TX
## 71      2            1     4       5      1     14       4       8    TX
## 72      2            1     4       5      1     14       4       8    TX
## 73      2            1     4       5      1     14       4       8    TX
## 74      2            1     4       5      1     14       4       8    TX
## 75      2            1     4       5      1     14       4       8    TX
## 76      2            1     4       5      1     14       4       8    TX
## 77      2            1     4       5      1     14       4       8    TX
## 78      2            1     4       5      1     14       4       8    TX
## 79      2            1     4       5      1     14       4       8    TX
## 80      2            1     4       5      1     14       4       8    TX
## 81      2            2     1       5      2      1       1       1    MS
## 82      2            2     1       5      2      1       1       1    MS
## 83      2            2     1       5      2      1       1       1    MS
## 84      2            2     1       5      2      1       1       1    MS
## 85      2            2     1       5      2      1       1       1    MS
## 86      2            2     1       5      2      1       1       1    MS
## 87      2            2     1       5      2      1       1       1    MS
## 88      2            2     1       5      2      1       1       1    MS
## 89      2            2     1       5      2      1       1       1    MS
## 90      2            2     1       5      2      1       1       1    MS
## 91      2            2     1       5      2      1       1       1    MS
## 92      2            2     1       5      2      1       1       1    MS
## 93      2            2     1       5      2      1       1       1    MS
## 94      2            2     1       5      2      1       1       1    MS
## 95      2            2     1       5      2      1       1       1    MS
## 96      2            2     1       5      2      1       1       1    MS
## 97      3            1     5       5      1      9       2       5    MI
## 98      3            1     5       5      1      9       2       5    MI
## 99      3            1     5       5      1      9       2       5    MI
## 100     3            1     5       5      1      9       2       5    MI
## 101     3            1     5       5      1      9       2       5    MI
## 102     3            1     5       5      1      9       2       5    MI
## 103     3            1     5       5      1      9       2       5    MI
## 104     3            1     5       5      1      9       2       5    MI
## 105     3            1     5       5      1      9       2       5    MI
## 106     3            1     5       5      1      9       2       5    MI
## 107     3            1     5       5      1      9       2       5    MI
## 108     3            1     5       5      1      9       2       5    MI
## 109     3            1     5       5      1      9       2       5    MI
## 110     3            1     5       5      1      9       2       5    MI
## 111     3            1     5       5      1      9       2       5    MI
## 112     3            1     5       5      1      9       2       5    MI
## 113     4            1     4       1      1     16       4       9    WI
## 114     4            1     4       1      1     16       4       9    WI
## 115     4            1     4       1      1     16       4       9    WI
## 116     4            1     4       1      1     16       4       9    WI
## 117     4            1     4       1      1     16       4       9    WI
## 118     4            1     4       1      1     16       4       9    WI
## 119     4            1     4       1      1     16       4       9    WI
## 120     4            1     4       1      1     16       4       9    WI
## 121     4            1     4       1      1     16       4       9    WI
## 122     4            1     4       1      1     16       4       9    WI
## 123     4            1     4       1      1     16       4       9    WI
## 124     4            1     4       1      1     16       4       9    WI
## 125     4            1     4       1      1     16       4       9    WI
## 126     4            1     4       1      1     16       4       9    WI
## 127     4            1     4       1      1     16       4       9    WI
## 128     4            1     4       1      1     16       4       9    WI
## 129     6            1     3       1      6     10       2       6    CA
## 130     6            1     3       1      6     10       2       6    CA
## 131     6            1     3       1      6     10       2       6    CA
## 132     6            1     3       1      6     10       2       6    CA
## 133     6            1     3       1      6     10       2       6    CA
## 134     6            1     3       1      6     10       2       6    CA
## 135     6            1     3       1      6     10       2       6    CA
## 136     6            1     3       1      6     10       2       6    CA
## 137     6            1     3       1      6     10       2       6    CA
## 138     6            1     3       1      6     10       2       6    CA
## 139     6            1     3       1      6     10       2       6    CA
## 140     6            1     3       1      6     10       2       6    CA
## 141     6            1     3       1      6     10       2       6    CA
## 142     6            1     3       1      6     10       2       6    CA
## 143     6            1     3       1      6     10       2       6    CA
## 144     6            1     3       1      6     10       2       6    CA
## 145     2            2     3       5      7     16       4       9    NJ
## 146     2            2     3       5      7     16       4       9    NJ
## 147     2            2     3       5      7     16       4       9    NJ
## 148     2            2     3       5      7     16       4       9    NJ
## 149     2            2     3       5      7     16       4       9    NJ
## 150     2            2     3       5      7     16       4       9    NJ
## 151     2            2     3       5      7     16       4       9    NJ
## 152     2            2     3       5      7     16       4       9    NJ
## 153     2            2     3       5      7     16       4       9    NJ
## 154     2            2     3       5      7     16       4       9    NJ
## 155     2            2     3       5      7     16       4       9    NJ
## 156     2            2     3       5      7     16       4       9    NJ
## 157     2            2     3       5      7     16       4       9    NJ
## 158     2            2     3       5      7     16       4       9    NJ
## 159     2            2     3       5      7     16       4       9    NJ
## 160     2            2     3       5      7     16       4       9    NJ
## 161     1            1     3       5      1     14       4       8    CA
## 162     1            1     3       5      1     14       4       8    CA
## 163     1            1     3       5      1     14       4       8    CA
## 164     1            1     3       5      1     14       4       8    CA
## 165     1            1     3       5      1     14       4       8    CA
## 166     1            1     3       5      1     14       4       8    CA
## 167     1            1     3       5      1     14       4       8    CA
## 168     1            1     3       5      1     14       4       8    CA
## 169     1            1     3       5      1     14       4       8    CA
## 170     1            1     3       5      1     14       4       8    CA
## 171     1            1     3       5      1     14       4       8    CA
## 172     1            1     3       5      1     14       4       8    CA
## 173     1            1     3       5      1     14       4       8    CA
## 174     1            1     3       5      1     14       4       8    CA
## 175     1            1     3       5      1     14       4       8    CA
## 176     1            1     3       5      1     14       4       8    CA
## 177     6            2     5       1      1      3       1       2    KS
## 178     6            2     5       1      1      3       1       2    KS
## 179     6            2     5       1      1      3       1       2    KS
## 180     6            2     5       1      1      3       1       2    KS
## 181     6            2     5       1      1      3       1       2    KS
## 182     6            2     5       1      1      3       1       2    KS
## 183     6            2     5       1      1      3       1       2    KS
## 184     6            2     5       1      1      3       1       2    KS
## 185     6            2     5       1      1      3       1       2    KS
## 186     6            2     5       1      1      3       1       2    KS
## 187     6            2     5       1      1      3       1       2    KS
## 188     6            2     5       1      1      3       1       2    KS
## 189     6            2     5       1      1      3       1       2    KS
## 190     6            2     5       1      1      3       1       2    KS
## 191     6            2     5       1      1      3       1       2    KS
## 192     6            2     5       1      1      3       1       2    KS
## 193     2            1     4       5      1     18       4       9    GA
## 194     2            1     4       5      1     18       4       9    GA
## 195     2            1     4       5      1     18       4       9    GA
## 196     2            1     4       5      1     18       4       9    GA
## 197     2            1     4       5      1     18       4       9    GA
## 198     2            1     4       5      1     18       4       9    GA
## 199     2            1     4       5      1     18       4       9    GA
## 200     2            1     4       5      1     18       4       9    GA
## 201     2            1     4       5      1     18       4       9    GA
## 202     2            1     4       5      1     18       4       9    GA
## 203     2            1     4       5      1     18       4       9    GA
## 204     2            1     4       5      1     18       4       9    GA
## 205     2            1     4       5      1     18       4       9    GA
## 206     2            1     4       5      1     18       4       9    GA
## 207     2            1     4       5      1     18       4       9    GA
## 208     2            1     4       5      1     18       4       9    GA
## 209     7            1     2       3      1     11       3       6    IN
## 210     7            1     2       3      1     11       3       6    IN
## 211     7            1     2       3      1     11       3       6    IN
## 212     7            1     2       3      1     11       3       6    IN
## 213     7            1     2       3      1     11       3       6    IN
## 214     7            1     2       3      1     11       3       6    IN
## 215     7            1     2       3      1     11       3       6    IN
## 216     7            1     2       3      1     11       3       6    IN
## 217     7            1     2       3      1     11       3       6    IN
## 218     7            1     2       3      1     11       3       6    IN
## 219     7            1     2       3      1     11       3       6    IN
## 220     7            1     2       3      1     11       3       6    IN
## 221     7            1     2       3      1     11       3       6    IN
## 222     7            1     2       3      1     11       3       6    IN
## 223     7            1     2       3      1     11       3       6    IN
## 224     7            1     2       3      1     11       3       6    IN
## 225     7            1     3       2      5      5       1       3    WV
## 226     7            1     3       2      5      5       1       3    WV
## 227     7            1     3       2      5      5       1       3    WV
## 228     7            1     3       2      5      5       1       3    WV
## 229     7            1     3       2      5      5       1       3    WV
## 230     7            1     3       2      5      5       1       3    WV
## 231     7            1     3       2      5      5       1       3    WV
## 232     7            1     3       2      5      5       1       3    WV
## 233     7            1     3       2      5      5       1       3    WV
## 234     7            1     3       2      5      5       1       3    WV
## 235     7            1     3       2      5      5       1       3    WV
## 236     7            1     3       2      5      5       1       3    WV
## 237     7            1     3       2      5      5       1       3    WV
## 238     7            1     3       2      5      5       1       3    WV
## 239     7            1     3       2      5      5       1       3    WV
## 240     7            1     3       2      5      5       1       3    WV
## 241     5            1     4       2      1     14       4       8    WI
## 242     5            1     4       2      1     14       4       8    WI
## 243     5            1     4       2      1     14       4       8    WI
## 244     5            1     4       2      1     14       4       8    WI
## 245     5            1     4       2      1     14       4       8    WI
## 246     5            1     4       2      1     14       4       8    WI
## 247     5            1     4       2      1     14       4       8    WI
## 248     5            1     4       2      1     14       4       8    WI
## 249     5            1     4       2      1     14       4       8    WI
## 250     5            1     4       2      1     14       4       8    WI
## 251     5            1     4       2      1     14       4       8    WI
## 252     5            1     4       2      1     14       4       8    WI
## 253     5            1     4       2      1     14       4       8    WI
## 254     5            1     4       2      1     14       4       8    WI
## 255     5            1     4       2      1     14       4       8    WI
## 256     5            1     4       2      1     14       4       8    WI
## 257     4            1     3       1      1      6       1       3    TX
## 258     4            1     3       1      1      6       1       3    TX
## 259     4            1     3       1      1      6       1       3    TX
## 260     4            1     3       1      1      6       1       3    TX
## 261     4            1     3       1      1      6       1       3    TX
## 262     4            1     3       1      1      6       1       3    TX
## 263     4            1     3       1      1      6       1       3    TX
## 264     4            1     3       1      1      6       1       3    TX
## 265     4            1     3       1      1      6       1       3    TX
## 266     4            1     3       1      1      6       1       3    TX
## 267     4            1     3       1      1      6       1       3    TX
## 268     4            1     3       1      1      6       1       3    TX
## 269     4            1     3       1      1      6       1       3    TX
## 270     4            1     3       1      1      6       1       3    TX
## 271     4            1     3       1      1      6       1       3    TX
## 272     4            1     3       1      1      6       1       3    TX
## 273     3            1     5       1      2     17       4       9    TN
## 274     3            1     5       1      2     17       4       9    TN
## 275     3            1     5       1      2     17       4       9    TN
## 276     3            1     5       1      2     17       4       9    TN
## 277     3            1     5       1      2     17       4       9    TN
## 278     3            1     5       1      2     17       4       9    TN
## 279     3            1     5       1      2     17       4       9    TN
## 280     3            1     5       1      2     17       4       9    TN
## 281     3            1     5       1      2     17       4       9    TN
## 282     3            1     5       1      2     17       4       9    TN
## 283     3            1     5       1      2     17       4       9    TN
## 284     3            1     5       1      2     17       4       9    TN
## 285     3            1     5       1      2     17       4       9    TN
## 286     3            1     5       1      2     17       4       9    TN
## 287     3            1     5       1      2     17       4       9    TN
## 288     3            1     5       1      2     17       4       9    TN
## 289     5            1     4       3      1     11       3       6    OR
## 290     5            1     4       3      1     11       3       6    OR
## 291     5            1     4       3      1     11       3       6    OR
## 292     5            1     4       3      1     11       3       6    OR
## 293     5            1     4       3      1     11       3       6    OR
## 294     5            1     4       3      1     11       3       6    OR
## 295     5            1     4       3      1     11       3       6    OR
## 296     5            1     4       3      1     11       3       6    OR
## 297     5            1     4       3      1     11       3       6    OR
## 298     5            1     4       3      1     11       3       6    OR
## 299     5            1     4       3      1     11       3       6    OR
## 300     5            1     4       3      1     11       3       6    OR
## 301     5            1     4       3      1     11       3       6    OR
## 302     5            1     4       3      1     11       3       6    OR
## 303     5            1     4       3      1     11       3       6    OR
## 304     5            1     4       3      1     11       3       6    OR
## 305     2            1     2       5      1      8       2       4    NY
## 306     2            1     2       5      1      8       2       4    NY
## 307     2            1     2       5      1      8       2       4    NY
## 308     2            1     2       5      1      8       2       4    NY
## 309     2            1     2       5      1      8       2       4    NY
## 310     2            1     2       5      1      8       2       4    NY
## 311     2            1     2       5      1      8       2       4    NY
## 312     2            1     2       5      1      8       2       4    NY
## 313     2            1     2       5      1      8       2       4    NY
## 314     2            1     2       5      1      8       2       4    NY
## 315     2            1     2       5      1      8       2       4    NY
## 316     2            1     2       5      1      8       2       4    NY
## 317     2            1     2       5      1      8       2       4    NY
## 318     2            1     2       5      1      8       2       4    NY
## 319     2            1     2       5      1      8       2       4    NY
## 320     2            1     2       5      1      8       2       4    NY
## 321     3            1     4       1      4     18       4       9    WA
## 322     3            1     4       1      4     18       4       9    WA
## 323     3            1     4       1      4     18       4       9    WA
## 324     3            1     4       1      4     18       4       9    WA
## 325     3            1     4       1      4     18       4       9    WA
## 326     3            1     4       1      4     18       4       9    WA
## 327     3            1     4       1      4     18       4       9    WA
## 328     3            1     4       1      4     18       4       9    WA
## 329     3            1     4       1      4     18       4       9    WA
## 330     3            1     4       1      4     18       4       9    WA
## 331     3            1     4       1      4     18       4       9    WA
## 332     3            1     4       1      4     18       4       9    WA
## 333     3            1     4       1      4     18       4       9    WA
## 334     3            1     4       1      4     18       4       9    WA
## 335     3            1     4       1      4     18       4       9    WA
## 336     3            1     4       1      4     18       4       9    WA
## 337     5            1     4       1      5     14       4       8    NC
## 338     5            1     4       1      5     14       4       8    NC
## 339     5            1     4       1      5     14       4       8    NC
## 340     5            1     4       1      5     14       4       8    NC
## 341     5            1     4       1      5     14       4       8    NC
## 342     5            1     4       1      5     14       4       8    NC
## 343     5            1     4       1      5     14       4       8    NC
## 344     5            1     4       1      5     14       4       8    NC
## 345     5            1     4       1      5     14       4       8    NC
## 346     5            1     4       1      5     14       4       8    NC
## 347     5            1     4       1      5     14       4       8    NC
## 348     5            1     4       1      5     14       4       8    NC
## 349     5            1     4       1      5     14       4       8    NC
## 350     5            1     4       1      5     14       4       8    NC
## 351     5            1     4       1      5     14       4       8    NC
## 352     5            1     4       1      5     14       4       8    NC
## 353     3            1     3       1      1     12       3       7    NY
## 354     3            1     3       1      1     12       3       7    NY
## 355     3            1     3       1      1     12       3       7    NY
## 356     3            1     3       1      1     12       3       7    NY
## 357     3            1     3       1      1     12       3       7    NY
## 358     3            1     3       1      1     12       3       7    NY
## 359     3            1     3       1      1     12       3       7    NY
## 360     3            1     3       1      1     12       3       7    NY
## 361     3            1     3       1      1     12       3       7    NY
## 362     3            1     3       1      1     12       3       7    NY
## 363     3            1     3       1      1     12       3       7    NY
## 364     3            1     3       1      1     12       3       7    NY
## 365     3            1     3       1      1     12       3       7    NY
## 366     3            1     3       1      1     12       3       7    NY
## 367     3            1     3       1      1     12       3       7    NY
## 368     3            1     3       1      1     12       3       7    NY
## 369     3            1     5       3      1      6       1       3    CA
## 370     3            1     5       3      1      6       1       3    CA
## 371     3            1     5       3      1      6       1       3    CA
## 372     3            1     5       3      1      6       1       3    CA
## 373     3            1     5       3      1      6       1       3    CA
## 374     3            1     5       3      1      6       1       3    CA
## 375     3            1     5       3      1      6       1       3    CA
## 376     3            1     5       3      1      6       1       3    CA
## 377     3            1     5       3      1      6       1       3    CA
## 378     3            1     5       3      1      6       1       3    CA
## 379     3            1     5       3      1      6       1       3    CA
## 380     3            1     5       3      1      6       1       3    CA
## 381     3            1     5       3      1      6       1       3    CA
## 382     3            1     5       3      1      6       1       3    CA
## 383     3            1     5       3      1      6       1       3    CA
## 384     3            1     5       3      1      6       1       3    CA
## 385     2            1     3       5      6     11       3       6    MI
## 386     2            1     3       5      6     11       3       6    MI
## 387     2            1     3       5      6     11       3       6    MI
## 388     2            1     3       5      6     11       3       6    MI
## 389     2            1     3       5      6     11       3       6    MI
## 390     2            1     3       5      6     11       3       6    MI
## 391     2            1     3       5      6     11       3       6    MI
## 392     2            1     3       5      6     11       3       6    MI
## 393     2            1     3       5      6     11       3       6    MI
## 394     2            1     3       5      6     11       3       6    MI
## 395     2            1     3       5      6     11       3       6    MI
## 396     2            1     3       5      6     11       3       6    MI
## 397     2            1     3       5      6     11       3       6    MI
## 398     2            1     3       5      6     11       3       6    MI
## 399     2            1     3       5      6     11       3       6    MI
## 400     2            1     3       5      6     11       3       6    MI
## 401     5            1     3       1      1     14       4       8    WI
## 402     5            1     3       1      1     14       4       8    WI
## 403     5            1     3       1      1     14       4       8    WI
## 404     5            1     3       1      1     14       4       8    WI
## 405     5            1     3       1      1     14       4       8    WI
## 406     5            1     3       1      1     14       4       8    WI
## 407     5            1     3       1      1     14       4       8    WI
## 408     5            1     3       1      1     14       4       8    WI
## 409     5            1     3       1      1     14       4       8    WI
## 410     5            1     3       1      1     14       4       8    WI
## 411     5            1     3       1      1     14       4       8    WI
## 412     5            1     3       1      1     14       4       8    WI
## 413     5            1     3       1      1     14       4       8    WI
## 414     5            1     3       1      1     14       4       8    WI
## 415     5            1     3       1      1     14       4       8    WI
## 416     5            1     3       1      1     14       4       8    WI
## 417     7            1     3       2      5      8       2       4    NY
## 418     7            1     3       2      5      8       2       4    NY
## 419     7            1     3       2      5      8       2       4    NY
## 420     7            1     3       2      5      8       2       4    NY
## 421     7            1     3       2      5      8       2       4    NY
## 422     7            1     3       2      5      8       2       4    NY
## 423     7            1     3       2      5      8       2       4    NY
## 424     7            1     3       2      5      8       2       4    NY
## 425     7            1     3       2      5      8       2       4    NY
## 426     7            1     3       2      5      8       2       4    NY
## 427     7            1     3       2      5      8       2       4    NY
## 428     7            1     3       2      5      8       2       4    NY
## 429     7            1     3       2      5      8       2       4    NY
## 430     7            1     3       2      5      8       2       4    NY
## 431     7            1     3       2      5      8       2       4    NY
## 432     7            1     3       2      5      8       2       4    NY
## 433     6            1     2       4      5      7       2       4    MD
## 434     6            1     2       4      5      7       2       4    MD
## 435     6            1     2       4      5      7       2       4    MD
## 436     6            1     2       4      5      7       2       4    MD
## 437     6            1     2       4      5      7       2       4    MD
## 438     6            1     2       4      5      7       2       4    MD
## 439     6            1     2       4      5      7       2       4    MD
## 440     6            1     2       4      5      7       2       4    MD
## 441     6            1     2       4      5      7       2       4    MD
## 442     6            1     2       4      5      7       2       4    MD
## 443     6            1     2       4      5      7       2       4    MD
## 444     6            1     2       4      5      7       2       4    MD
## 445     6            1     2       4      5      7       2       4    MD
## 446     6            1     2       4      5      7       2       4    MD
## 447     6            1     2       4      5      7       2       4    MD
## 448     6            1     2       4      5      7       2       4    MD
## 449     4            1     4       1      4     14       4       8    IN
## 450     4            1     4       1      4     14       4       8    IN
## 451     4            1     4       1      4     14       4       8    IN
## 452     4            1     4       1      4     14       4       8    IN
## 453     4            1     4       1      4     14       4       8    IN
## 454     4            1     4       1      4     14       4       8    IN
## 455     4            1     4       1      4     14       4       8    IN
## 456     4            1     4       1      4     14       4       8    IN
## 457     4            1     4       1      4     14       4       8    IN
## 458     4            1     4       1      4     14       4       8    IN
## 459     4            1     4       1      4     14       4       8    IN
## 460     4            1     4       1      4     14       4       8    IN
## 461     4            1     4       1      4     14       4       8    IN
## 462     4            1     4       1      4     14       4       8    IN
## 463     4            1     4       1      4     14       4       8    IN
## 464     4            1     4       1      4     14       4       8    IN
## 465     5            1     5       2      5     18       4       9    FL
## 466     5            1     5       2      5     18       4       9    FL
## 467     5            1     5       2      5     18       4       9    FL
## 468     5            1     5       2      5     18       4       9    FL
## 469     5            1     5       2      5     18       4       9    FL
## 470     5            1     5       2      5     18       4       9    FL
## 471     5            1     5       2      5     18       4       9    FL
## 472     5            1     5       2      5     18       4       9    FL
## 473     5            1     5       2      5     18       4       9    FL
## 474     5            1     5       2      5     18       4       9    FL
## 475     5            1     5       2      5     18       4       9    FL
## 476     5            1     5       2      5     18       4       9    FL
## 477     5            1     5       2      5     18       4       9    FL
## 478     5            1     5       2      5     18       4       9    FL
## 479     5            1     5       2      5     18       4       9    FL
## 480     5            1     5       2      5     18       4       9    FL
## 481     3            1     3       3      2     11       3       6    NJ
## 482     3            1     3       3      2     11       3       6    NJ
## 483     3            1     3       3      2     11       3       6    NJ
## 484     3            1     3       3      2     11       3       6    NJ
## 485     3            1     3       3      2     11       3       6    NJ
## 486     3            1     3       3      2     11       3       6    NJ
## 487     3            1     3       3      2     11       3       6    NJ
## 488     3            1     3       3      2     11       3       6    NJ
## 489     3            1     3       3      2     11       3       6    NJ
## 490     3            1     3       3      2     11       3       6    NJ
## 491     3            1     3       3      2     11       3       6    NJ
## 492     3            1     3       3      2     11       3       6    NJ
## 493     3            1     3       3      2     11       3       6    NJ
## 494     3            1     3       3      2     11       3       6    NJ
## 495     3            1     3       3      2     11       3       6    NJ
## 496     3            1     3       3      2     11       3       6    NJ
## 497     1            1     1       5      1      3       1       2    KS
## 498     1            1     1       5      1      3       1       2    KS
## 499     1            1     1       5      1      3       1       2    KS
## 500     1            1     1       5      1      3       1       2    KS
## 501     1            1     1       5      1      3       1       2    KS
## 502     1            1     1       5      1      3       1       2    KS
## 503     1            1     1       5      1      3       1       2    KS
## 504     1            1     1       5      1      3       1       2    KS
## 505     1            1     1       5      1      3       1       2    KS
## 506     1            1     1       5      1      3       1       2    KS
## 507     1            1     1       5      1      3       1       2    KS
## 508     1            1     1       5      1      3       1       2    KS
## 509     1            1     1       5      1      3       1       2    KS
## 510     1            1     1       5      1      3       1       2    KS
## 511     1            1     1       5      1      3       1       2    KS
## 512     1            1     1       5      1      3       1       2    KS
## 513     2            1     4       1      1     13       3       7    OH
## 514     2            1     4       1      1     13       3       7    OH
## 515     2            1     4       1      1     13       3       7    OH
## 516     2            1     4       1      1     13       3       7    OH
## 517     2            1     4       1      1     13       3       7    OH
## 518     2            1     4       1      1     13       3       7    OH
## 519     2            1     4       1      1     13       3       7    OH
## 520     2            1     4       1      1     13       3       7    OH
## 521     2            1     4       1      1     13       3       7    OH
## 522     2            1     4       1      1     13       3       7    OH
## 523     2            1     4       1      1     13       3       7    OH
## 524     2            1     4       1      1     13       3       7    OH
## 525     2            1     4       1      1     13       3       7    OH
## 526     2            1     4       1      1     13       3       7    OH
## 527     2            1     4       1      1     13       3       7    OH
## 528     2            1     4       1      1     13       3       7    OH
## 529     3            1     2       1      1      9       2       5    NY
## 530     3            1     2       1      1      9       2       5    NY
## 531     3            1     2       1      1      9       2       5    NY
## 532     3            1     2       1      1      9       2       5    NY
## 533     3            1     2       1      1      9       2       5    NY
## 534     3            1     2       1      1      9       2       5    NY
## 535     3            1     2       1      1      9       2       5    NY
## 536     3            1     2       1      1      9       2       5    NY
## 537     3            1     2       1      1      9       2       5    NY
## 538     3            1     2       1      1      9       2       5    NY
## 539     3            1     2       1      1      9       2       5    NY
## 540     3            1     2       1      1      9       2       5    NY
## 541     3            1     2       1      1      9       2       5    NY
## 542     3            1     2       1      1      9       2       5    NY
## 543     3            1     2       1      1      9       2       5    NY
## 544     3            1     2       1      1      9       2       5    NY
## 545     6            1     4       1      5     15       4       8    NC
## 546     6            1     4       1      5     15       4       8    NC
## 547     6            1     4       1      5     15       4       8    NC
## 548     6            1     4       1      5     15       4       8    NC
## 549     6            1     4       1      5     15       4       8    NC
## 550     6            1     4       1      5     15       4       8    NC
## 551     6            1     4       1      5     15       4       8    NC
## 552     6            1     4       1      5     15       4       8    NC
## 553     6            1     4       1      5     15       4       8    NC
## 554     6            1     4       1      5     15       4       8    NC
## 555     6            1     4       1      5     15       4       8    NC
## 556     6            1     4       1      5     15       4       8    NC
## 557     6            1     4       1      5     15       4       8    NC
## 558     6            1     4       1      5     15       4       8    NC
## 559     6            1     4       1      5     15       4       8    NC
## 560     6            1     4       1      5     15       4       8    NC
## 561     6            1     3       1      5     16       4       9    FL
## 562     6            1     3       1      5     16       4       9    FL
## 563     6            1     3       1      5     16       4       9    FL
## 564     6            1     3       1      5     16       4       9    FL
## 565     6            1     3       1      5     16       4       9    FL
## 566     6            1     3       1      5     16       4       9    FL
## 567     6            1     3       1      5     16       4       9    FL
## 568     6            1     3       1      5     16       4       9    FL
## 569     6            1     3       1      5     16       4       9    FL
## 570     6            1     3       1      5     16       4       9    FL
## 571     6            1     3       1      5     16       4       9    FL
## 572     6            1     3       1      5     16       4       9    FL
## 573     6            1     3       1      5     16       4       9    FL
## 574     6            1     3       1      5     16       4       9    FL
## 575     6            1     3       1      5     16       4       9    FL
## 576     6            1     3       1      5     16       4       9    FL
## 577     2            2     2       5      1      7       2       4    MO
## 578     2            2     2       5      1      7       2       4    MO
## 579     2            2     2       5      1      7       2       4    MO
## 580     2            2     2       5      1      7       2       4    MO
## 581     2            2     2       5      1      7       2       4    MO
## 582     2            2     2       5      1      7       2       4    MO
## 583     2            2     2       5      1      7       2       4    MO
## 584     2            2     2       5      1      7       2       4    MO
## 585     2            2     2       5      1      7       2       4    MO
## 586     2            2     2       5      1      7       2       4    MO
## 587     2            2     2       5      1      7       2       4    MO
## 588     2            2     2       5      1      7       2       4    MO
## 589     2            2     2       5      1      7       2       4    MO
## 590     2            2     2       5      1      7       2       4    MO
## 591     2            2     2       5      1      7       2       4    MO
## 592     2            2     2       5      1      7       2       4    MO
## 593     5            1     4       3      1      5       1       3    PA
## 594     5            1     4       3      1      5       1       3    PA
## 595     5            1     4       3      1      5       1       3    PA
## 596     5            1     4       3      1      5       1       3    PA
## 597     5            1     4       3      1      5       1       3    PA
## 598     5            1     4       3      1      5       1       3    PA
## 599     5            1     4       3      1      5       1       3    PA
## 600     5            1     4       3      1      5       1       3    PA
## 601     5            1     4       3      1      5       1       3    PA
## 602     5            1     4       3      1      5       1       3    PA
## 603     5            1     4       3      1      5       1       3    PA
## 604     5            1     4       3      1      5       1       3    PA
## 605     5            1     4       3      1      5       1       3    PA
## 606     5            1     4       3      1      5       1       3    PA
## 607     5            1     4       3      1      5       1       3    PA
## 608     5            1     4       3      1      5       1       3    PA
## 609     2            1     3       5      2     14       4       8    NY
## 610     2            1     3       5      2     14       4       8    NY
## 611     2            1     3       5      2     14       4       8    NY
## 612     2            1     3       5      2     14       4       8    NY
## 613     2            1     3       5      2     14       4       8    NY
## 614     2            1     3       5      2     14       4       8    NY
## 615     2            1     3       5      2     14       4       8    NY
## 616     2            1     3       5      2     14       4       8    NY
## 617     2            1     3       5      2     14       4       8    NY
## 618     2            1     3       5      2     14       4       8    NY
## 619     2            1     3       5      2     14       4       8    NY
## 620     2            1     3       5      2     14       4       8    NY
## 621     2            1     3       5      2     14       4       8    NY
## 622     2            1     3       5      2     14       4       8    NY
## 623     2            1     3       5      2     14       4       8    NY
## 624     2            1     3       5      2     14       4       8    NY
## 625     2            2     2       5      4      8       2       4    CA
## 626     2            2     2       5      4      8       2       4    CA
## 627     2            2     2       5      4      8       2       4    CA
## 628     2            2     2       5      4      8       2       4    CA
## 629     2            2     2       5      4      8       2       4    CA
## 630     2            2     2       5      4      8       2       4    CA
## 631     2            2     2       5      4      8       2       4    CA
## 632     2            2     2       5      4      8       2       4    CA
## 633     2            2     2       5      4      8       2       4    CA
## 634     2            2     2       5      4      8       2       4    CA
## 635     2            2     2       5      4      8       2       4    CA
## 636     2            2     2       5      4      8       2       4    CA
## 637     2            2     2       5      4      8       2       4    CA
## 638     2            2     2       5      4      8       2       4    CA
## 639     2            2     2       5      4      8       2       4    CA
## 640     2            2     2       5      4      8       2       4    CA
## 641     4            1     5       1      1     14       4       8    MA
## 642     4            1     5       1      1     14       4       8    MA
## 643     4            1     5       1      1     14       4       8    MA
## 644     4            1     5       1      1     14       4       8    MA
## 645     4            1     5       1      1     14       4       8    MA
## 646     4            1     5       1      1     14       4       8    MA
## 647     4            1     5       1      1     14       4       8    MA
## 648     4            1     5       1      1     14       4       8    MA
## 649     4            1     5       1      1     14       4       8    MA
## 650     4            1     5       1      1     14       4       8    MA
## 651     4            1     5       1      1     14       4       8    MA
## 652     4            1     5       1      1     14       4       8    MA
## 653     4            1     5       1      1     14       4       8    MA
## 654     4            1     5       1      1     14       4       8    MA
## 655     4            1     5       1      1     14       4       8    MA
## 656     4            1     5       1      1     14       4       8    MA
## 657     3            1     3       5      1     12       3       7    MN
## 658     3            1     3       5      1     12       3       7    MN
## 659     3            1     3       5      1     12       3       7    MN
## 660     3            1     3       5      1     12       3       7    MN
## 661     3            1     3       5      1     12       3       7    MN
## 662     3            1     3       5      1     12       3       7    MN
## 663     3            1     3       5      1     12       3       7    MN
## 664     3            1     3       5      1     12       3       7    MN
## 665     3            1     3       5      1     12       3       7    MN
## 666     3            1     3       5      1     12       3       7    MN
## 667     3            1     3       5      1     12       3       7    MN
## 668     3            1     3       5      1     12       3       7    MN
## 669     3            1     3       5      1     12       3       7    MN
## 670     3            1     3       5      1     12       3       7    MN
## 671     3            1     3       5      1     12       3       7    MN
## 672     3            1     3       5      1     12       3       7    MN
## 673     3            1     3       1      1     10       2       6    OH
## 674     3            1     3       1      1     10       2       6    OH
## 675     3            1     3       1      1     10       2       6    OH
## 676     3            1     3       1      1     10       2       6    OH
## 677     3            1     3       1      1     10       2       6    OH
## 678     3            1     3       1      1     10       2       6    OH
## 679     3            1     3       1      1     10       2       6    OH
## 680     3            1     3       1      1     10       2       6    OH
## 681     3            1     3       1      1     10       2       6    OH
## 682     3            1     3       1      1     10       2       6    OH
## 683     3            1     3       1      1     10       2       6    OH
## 684     3            1     3       1      1     10       2       6    OH
## 685     3            1     3       1      1     10       2       6    OH
## 686     3            1     3       1      1     10       2       6    OH
## 687     3            1     3       1      1     10       2       6    OH
## 688     3            1     3       1      1     10       2       6    OH
## 689     7            2     4       1      5     10       2       6    SC
## 690     7            2     4       1      5     10       2       6    SC
## 691     7            2     4       1      5     10       2       6    SC
## 692     7            2     4       1      5     10       2       6    SC
## 693     7            2     4       1      5     10       2       6    SC
## 694     7            2     4       1      5     10       2       6    SC
## 695     7            2     4       1      5     10       2       6    SC
## 696     7            2     4       1      5     10       2       6    SC
## 697     7            2     4       1      5     10       2       6    SC
## 698     7            2     4       1      5     10       2       6    SC
## 699     7            2     4       1      5     10       2       6    SC
## 700     7            2     4       1      5     10       2       6    SC
## 701     7            2     4       1      5     10       2       6    SC
## 702     7            2     4       1      5     10       2       6    SC
## 703     7            2     4       1      5     10       2       6    SC
## 704     7            2     4       1      5     10       2       6    SC
## 705     2            1     4       1      7     14       4       8    WI
## 706     2            1     4       1      7     14       4       8    WI
## 707     2            1     4       1      7     14       4       8    WI
## 708     2            1     4       1      7     14       4       8    WI
## 709     2            1     4       1      7     14       4       8    WI
## 710     2            1     4       1      7     14       4       8    WI
## 711     2            1     4       1      7     14       4       8    WI
## 712     2            1     4       1      7     14       4       8    WI
## 713     2            1     4       1      7     14       4       8    WI
## 714     2            1     4       1      7     14       4       8    WI
## 715     2            1     4       1      7     14       4       8    WI
## 716     2            1     4       1      7     14       4       8    WI
## 717     2            1     4       1      7     14       4       8    WI
## 718     2            1     4       1      7     14       4       8    WI
## 719     2            1     4       1      7     14       4       8    WI
## 720     2            1     4       1      7     14       4       8    WI
## 721     2            1     4       5      1     13       3       7    MI
## 722     2            1     4       5      1     13       3       7    MI
## 723     2            1     4       5      1     13       3       7    MI
## 724     2            1     4       5      1     13       3       7    MI
## 725     2            1     4       5      1     13       3       7    MI
## 726     2            1     4       5      1     13       3       7    MI
## 727     2            1     4       5      1     13       3       7    MI
## 728     2            1     4       5      1     13       3       7    MI
## 729     2            1     4       5      1     13       3       7    MI
## 730     2            1     4       5      1     13       3       7    MI
## 731     2            1     4       5      1     13       3       7    MI
## 732     2            1     4       5      1     13       3       7    MI
## 733     2            1     4       5      1     13       3       7    MI
## 734     2            1     4       5      1     13       3       7    MI
## 735     2            1     4       5      1     13       3       7    MI
## 736     2            1     4       5      1     13       3       7    MI
## 737     5            1     3       1      1     11       3       6    OH
## 738     5            1     3       1      1     11       3       6    OH
## 739     5            1     3       1      1     11       3       6    OH
## 740     5            1     3       1      1     11       3       6    OH
## 741     5            1     3       1      1     11       3       6    OH
## 742     5            1     3       1      1     11       3       6    OH
## 743     5            1     3       1      1     11       3       6    OH
## 744     5            1     3       1      1     11       3       6    OH
## 745     5            1     3       1      1     11       3       6    OH
## 746     5            1     3       1      1     11       3       6    OH
## 747     5            1     3       1      1     11       3       6    OH
## 748     5            1     3       1      1     11       3       6    OH
## 749     5            1     3       1      1     11       3       6    OH
## 750     5            1     3       1      1     11       3       6    OH
## 751     5            1     3       1      1     11       3       6    OH
## 752     5            1     3       1      1     11       3       6    OH
## 753     4            3     3       1      4      9       2       5    KS
## 754     4            3     3       1      4      9       2       5    KS
## 755     4            3     3       1      4      9       2       5    KS
## 756     4            3     3       1      4      9       2       5    KS
## 757     4            3     3       1      4      9       2       5    KS
## 758     4            3     3       1      4      9       2       5    KS
## 759     4            3     3       1      4      9       2       5    KS
## 760     4            3     3       1      4      9       2       5    KS
## 761     4            3     3       1      4      9       2       5    KS
## 762     4            3     3       1      4      9       2       5    KS
## 763     4            3     3       1      4      9       2       5    KS
## 764     4            3     3       1      4      9       2       5    KS
## 765     4            3     3       1      4      9       2       5    KS
## 766     4            3     3       1      4      9       2       5    KS
## 767     4            3     3       1      4      9       2       5    KS
## 768     4            3     3       1      4      9       2       5    KS
## 769     6            1     4       1      1     18       4       9    CO
## 770     6            1     4       1      1     18       4       9    CO
## 771     6            1     4       1      1     18       4       9    CO
## 772     6            1     4       1      1     18       4       9    CO
## 773     6            1     4       1      1     18       4       9    CO
## 774     6            1     4       1      1     18       4       9    CO
## 775     6            1     4       1      1     18       4       9    CO
## 776     6            1     4       1      1     18       4       9    CO
## 777     6            1     4       1      1     18       4       9    CO
## 778     6            1     4       1      1     18       4       9    CO
## 779     6            1     4       1      1     18       4       9    CO
## 780     6            1     4       1      1     18       4       9    CO
## 781     6            1     4       1      1     18       4       9    CO
## 782     6            1     4       1      1     18       4       9    CO
## 783     6            1     4       1      1     18       4       9    CO
## 784     6            1     4       1      1     18       4       9    CO
## 785     5            1     3       5      6      9       2       5    OR
## 786     5            1     3       5      6      9       2       5    OR
## 787     5            1     3       5      6      9       2       5    OR
## 788     5            1     3       5      6      9       2       5    OR
## 789     5            1     3       5      6      9       2       5    OR
## 790     5            1     3       5      6      9       2       5    OR
## 791     5            1     3       5      6      9       2       5    OR
## 792     5            1     3       5      6      9       2       5    OR
## 793     5            1     3       5      6      9       2       5    OR
## 794     5            1     3       5      6      9       2       5    OR
## 795     5            1     3       5      6      9       2       5    OR
## 796     5            1     3       5      6      9       2       5    OR
## 797     5            1     3       5      6      9       2       5    OR
## 798     5            1     3       5      6      9       2       5    OR
## 799     5            1     3       5      6      9       2       5    OR
## 800     5            1     3       5      6      9       2       5    OR
## 801     7            1     4       1      1     10       2       6    CO
## 802     7            1     4       1      1     10       2       6    CO
## 803     7            1     4       1      1     10       2       6    CO
## 804     7            1     4       1      1     10       2       6    CO
## 805     7            1     4       1      1     10       2       6    CO
## 806     7            1     4       1      1     10       2       6    CO
## 807     7            1     4       1      1     10       2       6    CO
## 808     7            1     4       1      1     10       2       6    CO
## 809     7            1     4       1      1     10       2       6    CO
## 810     7            1     4       1      1     10       2       6    CO
## 811     7            1     4       1      1     10       2       6    CO
## 812     7            1     4       1      1     10       2       6    CO
## 813     7            1     4       1      1     10       2       6    CO
## 814     7            1     4       1      1     10       2       6    CO
## 815     7            1     4       1      1     10       2       6    CO
## 816     7            1     4       1      1     10       2       6    CO
## 817     4            1     3       5      1     14       4       8    MN
## 818     4            1     3       5      1     14       4       8    MN
## 819     4            1     3       5      1     14       4       8    MN
## 820     4            1     3       5      1     14       4       8    MN
## 821     4            1     3       5      1     14       4       8    MN
## 822     4            1     3       5      1     14       4       8    MN
## 823     4            1     3       5      1     14       4       8    MN
## 824     4            1     3       5      1     14       4       8    MN
## 825     4            1     3       5      1     14       4       8    MN
## 826     4            1     3       5      1     14       4       8    MN
## 827     4            1     3       5      1     14       4       8    MN
## 828     4            1     3       5      1     14       4       8    MN
## 829     4            1     3       5      1     14       4       8    MN
## 830     4            1     3       5      1     14       4       8    MN
## 831     4            1     3       5      1     14       4       8    MN
## 832     4            1     3       5      1     14       4       8    MN
## 833     7            1     3       1      2     10       2       6    WA
## 834     7            1     3       1      2     10       2       6    WA
## 835     7            1     3       1      2     10       2       6    WA
## 836     7            1     3       1      2     10       2       6    WA
## 837     7            1     3       1      2     10       2       6    WA
## 838     7            1     3       1      2     10       2       6    WA
## 839     7            1     3       1      2     10       2       6    WA
## 840     7            1     3       1      2     10       2       6    WA
## 841     7            1     3       1      2     10       2       6    WA
## 842     7            1     3       1      2     10       2       6    WA
## 843     7            1     3       1      2     10       2       6    WA
## 844     7            1     3       1      2     10       2       6    WA
## 845     7            1     3       1      2     10       2       6    WA
## 846     7            1     3       1      2     10       2       6    WA
## 847     7            1     3       1      2     10       2       6    WA
## 848     7            1     3       1      2     10       2       6    WA
## 849     5            1     3       1      2     10       2       6    FL
## 850     5            1     3       1      2     10       2       6    FL
## 851     5            1     3       1      2     10       2       6    FL
## 852     5            1     3       1      2     10       2       6    FL
## 853     5            1     3       1      2     10       2       6    FL
## 854     5            1     3       1      2     10       2       6    FL
## 855     5            1     3       1      2     10       2       6    FL
## 856     5            1     3       1      2     10       2       6    FL
## 857     5            1     3       1      2     10       2       6    FL
## 858     5            1     3       1      2     10       2       6    FL
## 859     5            1     3       1      2     10       2       6    FL
## 860     5            1     3       1      2     10       2       6    FL
## 861     5            1     3       1      2     10       2       6    FL
## 862     5            1     3       1      2     10       2       6    FL
## 863     5            1     3       1      2     10       2       6    FL
## 864     5            1     3       1      2     10       2       6    FL
## 865     7            1     2       2      5      9       2       5    FL
## 866     7            1     2       2      5      9       2       5    FL
## 867     7            1     2       2      5      9       2       5    FL
## 868     7            1     2       2      5      9       2       5    FL
## 869     7            1     2       2      5      9       2       5    FL
## 870     7            1     2       2      5      9       2       5    FL
## 871     7            1     2       2      5      9       2       5    FL
## 872     7            1     2       2      5      9       2       5    FL
## 873     7            1     2       2      5      9       2       5    FL
## 874     7            1     2       2      5      9       2       5    FL
## 875     7            1     2       2      5      9       2       5    FL
## 876     7            1     2       2      5      9       2       5    FL
## 877     7            1     2       2      5      9       2       5    FL
## 878     7            1     2       2      5      9       2       5    FL
## 879     7            1     2       2      5      9       2       5    FL
## 880     7            1     2       2      5      9       2       5    FL
## 881     3            2     4       1      1     11       3       6    TX
## 882     3            2     4       1      1     11       3       6    TX
## 883     3            2     4       1      1     11       3       6    TX
## 884     3            2     4       1      1     11       3       6    TX
## 885     3            2     4       1      1     11       3       6    TX
## 886     3            2     4       1      1     11       3       6    TX
## 887     3            2     4       1      1     11       3       6    TX
## 888     3            2     4       1      1     11       3       6    TX
## 889     3            2     4       1      1     11       3       6    TX
## 890     3            2     4       1      1     11       3       6    TX
## 891     3            2     4       1      1     11       3       6    TX
## 892     3            2     4       1      1     11       3       6    TX
## 893     3            2     4       1      1     11       3       6    TX
## 894     3            2     4       1      1     11       3       6    TX
## 895     3            2     4       1      1     11       3       6    TX
## 896     3            2     4       1      1     11       3       6    TX
## 897     1            1     3       5      1      1       1       1    KY
## 898     1            1     3       5      1      1       1       1    KY
## 899     1            1     3       5      1      1       1       1    KY
## 900     1            1     3       5      1      1       1       1    KY
## 901     1            1     3       5      1      1       1       1    KY
## 902     1            1     3       5      1      1       1       1    KY
## 903     1            1     3       5      1      1       1       1    KY
## 904     1            1     3       5      1      1       1       1    KY
## 905     1            1     3       5      1      1       1       1    KY
## 906     1            1     3       5      1      1       1       1    KY
## 907     1            1     3       5      1      1       1       1    KY
## 908     1            1     3       5      1      1       1       1    KY
## 909     1            1     3       5      1      1       1       1    KY
## 910     1            1     3       5      1      1       1       1    KY
## 911     1            1     3       5      1      1       1       1    KY
## 912     1            1     3       5      1      1       1       1    KY
## 913     1            1     3       5      1     10       2       6    CO
## 914     1            1     3       5      1     10       2       6    CO
## 915     1            1     3       5      1     10       2       6    CO
## 916     1            1     3       5      1     10       2       6    CO
## 917     1            1     3       5      1     10       2       6    CO
## 918     1            1     3       5      1     10       2       6    CO
## 919     1            1     3       5      1     10       2       6    CO
## 920     1            1     3       5      1     10       2       6    CO
## 921     1            1     3       5      1     10       2       6    CO
## 922     1            1     3       5      1     10       2       6    CO
## 923     1            1     3       5      1     10       2       6    CO
## 924     1            1     3       5      1     10       2       6    CO
## 925     1            1     3       5      1     10       2       6    CO
## 926     1            1     3       5      1     10       2       6    CO
## 927     1            1     3       5      1     10       2       6    CO
## 928     1            1     3       5      1     10       2       6    CO
## 929     1            1     3       5      1     17       4       9    NY
## 930     1            1     3       5      1     17       4       9    NY
## 931     1            1     3       5      1     17       4       9    NY
## 932     1            1     3       5      1     17       4       9    NY
## 933     1            1     3       5      1     17       4       9    NY
## 934     1            1     3       5      1     17       4       9    NY
## 935     1            1     3       5      1     17       4       9    NY
## 936     1            1     3       5      1     17       4       9    NY
## 937     1            1     3       5      1     17       4       9    NY
## 938     1            1     3       5      1     17       4       9    NY
## 939     1            1     3       5      1     17       4       9    NY
## 940     1            1     3       5      1     17       4       9    NY
## 941     1            1     3       5      1     17       4       9    NY
## 942     1            1     3       5      1     17       4       9    NY
## 943     1            1     3       5      1     17       4       9    NY
## 944     1            1     3       5      1     17       4       9    NY
## 945     2            1     4       1      7     11       3       6    MN
## 946     2            1     4       1      7     11       3       6    MN
## 947     2            1     4       1      7     11       3       6    MN
## 948     2            1     4       1      7     11       3       6    MN
## 949     2            1     4       1      7     11       3       6    MN
## 950     2            1     4       1      7     11       3       6    MN
## 951     2            1     4       1      7     11       3       6    MN
## 952     2            1     4       1      7     11       3       6    MN
## 953     2            1     4       1      7     11       3       6    MN
## 954     2            1     4       1      7     11       3       6    MN
## 955     2            1     4       1      7     11       3       6    MN
## 956     2            1     4       1      7     11       3       6    MN
## 957     2            1     4       1      7     11       3       6    MN
## 958     2            1     4       1      7     11       3       6    MN
## 959     2            1     4       1      7     11       3       6    MN
## 960     2            1     4       1      7     11       3       6    MN
## 961     5            1     4       5      3     14       4       8    MN
## 962     5            1     4       5      3     14       4       8    MN
## 963     5            1     4       5      3     14       4       8    MN
## 964     5            1     4       5      3     14       4       8    MN
## 965     5            1     4       5      3     14       4       8    MN
## 966     5            1     4       5      3     14       4       8    MN
## 967     5            1     4       5      3     14       4       8    MN
## 968     5            1     4       5      3     14       4       8    MN
## 969     5            1     4       5      3     14       4       8    MN
## 970     5            1     4       5      3     14       4       8    MN
## 971     5            1     4       5      3     14       4       8    MN
## 972     5            1     4       5      3     14       4       8    MN
## 973     5            1     4       5      3     14       4       8    MN
## 974     5            1     4       5      3     14       4       8    MN
## 975     5            1     4       5      3     14       4       8    MN
## 976     5            1     4       5      3     14       4       8    MN
## 977     4            1     5       1      1     16       4       9    GA
## 978     4            1     5       1      1     16       4       9    GA
## 979     4            1     5       1      1     16       4       9    GA
## 980     4            1     5       1      1     16       4       9    GA
## 981     4            1     5       1      1     16       4       9    GA
## 982     4            1     5       1      1     16       4       9    GA
## 983     4            1     5       1      1     16       4       9    GA
## 984     4            1     5       1      1     16       4       9    GA
## 985     4            1     5       1      1     16       4       9    GA
## 986     4            1     5       1      1     16       4       9    GA
## 987     4            1     5       1      1     16       4       9    GA
## 988     4            1     5       1      1     16       4       9    GA
## 989     4            1     5       1      1     16       4       9    GA
## 990     4            1     5       1      1     16       4       9    GA
## 991     4            1     5       1      1     16       4       9    GA
## 992     4            1     5       1      1     16       4       9    GA
## 993     1            1     2       5      7     18       4       9    OR
## 994     1            1     2       5      7     18       4       9    OR
## 995     1            1     2       5      7     18       4       9    OR
## 996     1            1     2       5      7     18       4       9    OR
## 997     1            1     2       5      7     18       4       9    OR
## 998     1            1     2       5      7     18       4       9    OR
## 999     1            1     2       5      7     18       4       9    OR
## 1000    1            1     2       5      7     18       4       9    OR
## 1001    1            1     2       5      7     18       4       9    OR
## 1002    1            1     2       5      7     18       4       9    OR
## 1003    1            1     2       5      7     18       4       9    OR
## 1004    1            1     2       5      7     18       4       9    OR
## 1005    1            1     2       5      7     18       4       9    OR
## 1006    1            1     2       5      7     18       4       9    OR
## 1007    1            1     2       5      7     18       4       9    OR
## 1008    1            1     2       5      7     18       4       9    OR
## 1009    4            1     5       1      1      7       2       4    FL
## 1010    4            1     5       1      1      7       2       4    FL
## 1011    4            1     5       1      1      7       2       4    FL
## 1012    4            1     5       1      1      7       2       4    FL
## 1013    4            1     5       1      1      7       2       4    FL
## 1014    4            1     5       1      1      7       2       4    FL
## 1015    4            1     5       1      1      7       2       4    FL
## 1016    4            1     5       1      1      7       2       4    FL
## 1017    4            1     5       1      1      7       2       4    FL
## 1018    4            1     5       1      1      7       2       4    FL
## 1019    4            1     5       1      1      7       2       4    FL
## 1020    4            1     5       1      1      7       2       4    FL
## 1021    4            1     5       1      1      7       2       4    FL
## 1022    4            1     5       1      1      7       2       4    FL
## 1023    4            1     5       1      1      7       2       4    FL
## 1024    4            1     5       1      1      7       2       4    FL
## 1025    4            1     4       1      1     14       4       8    OK
## 1026    4            1     4       1      1     14       4       8    OK
## 1027    4            1     4       1      1     14       4       8    OK
## 1028    4            1     4       1      1     14       4       8    OK
## 1029    4            1     4       1      1     14       4       8    OK
## 1030    4            1     4       1      1     14       4       8    OK
## 1031    4            1     4       1      1     14       4       8    OK
## 1032    4            1     4       1      1     14       4       8    OK
## 1033    4            1     4       1      1     14       4       8    OK
## 1034    4            1     4       1      1     14       4       8    OK
## 1035    4            1     4       1      1     14       4       8    OK
## 1036    4            1     4       1      1     14       4       8    OK
## 1037    4            1     4       1      1     14       4       8    OK
## 1038    4            1     4       1      1     14       4       8    OK
## 1039    4            1     4       1      1     14       4       8    OK
## 1040    4            1     4       1      1     14       4       8    OK
## 1041    2            1     4       5      1     10       2       6    FL
## 1042    2            1     4       5      1     10       2       6    FL
## 1043    2            1     4       5      1     10       2       6    FL
## 1044    2            1     4       5      1     10       2       6    FL
## 1045    2            1     4       5      1     10       2       6    FL
## 1046    2            1     4       5      1     10       2       6    FL
## 1047    2            1     4       5      1     10       2       6    FL
## 1048    2            1     4       5      1     10       2       6    FL
## 1049    2            1     4       5      1     10       2       6    FL
## 1050    2            1     4       5      1     10       2       6    FL
## 1051    2            1     4       5      1     10       2       6    FL
## 1052    2            1     4       5      1     10       2       6    FL
## 1053    2            1     4       5      1     10       2       6    FL
## 1054    2            1     4       5      1     10       2       6    FL
## 1055    2            1     4       5      1     10       2       6    FL
## 1056    2            1     4       5      1     10       2       6    FL
## 1057    2            1     5       5      4     13       3       7    IL
## 1058    2            1     5       5      4     13       3       7    IL
## 1059    2            1     5       5      4     13       3       7    IL
## 1060    2            1     5       5      4     13       3       7    IL
## 1061    2            1     5       5      4     13       3       7    IL
## 1062    2            1     5       5      4     13       3       7    IL
## 1063    2            1     5       5      4     13       3       7    IL
## 1064    2            1     5       5      4     13       3       7    IL
## 1065    2            1     5       5      4     13       3       7    IL
## 1066    2            1     5       5      4     13       3       7    IL
## 1067    2            1     5       5      4     13       3       7    IL
## 1068    2            1     5       5      4     13       3       7    IL
## 1069    2            1     5       5      4     13       3       7    IL
## 1070    2            1     5       5      4     13       3       7    IL
## 1071    2            1     5       5      4     13       3       7    IL
## 1072    2            1     5       5      4     13       3       7    IL
## 1073    2            1     5       1      7     11       3       6    UT
## 1074    2            1     5       1      7     11       3       6    UT
## 1075    2            1     5       1      7     11       3       6    UT
## 1076    2            1     5       1      7     11       3       6    UT
## 1077    2            1     5       1      7     11       3       6    UT
## 1078    2            1     5       1      7     11       3       6    UT
## 1079    2            1     5       1      7     11       3       6    UT
## 1080    2            1     5       1      7     11       3       6    UT
## 1081    2            1     5       1      7     11       3       6    UT
## 1082    2            1     5       1      7     11       3       6    UT
## 1083    2            1     5       1      7     11       3       6    UT
## 1084    2            1     5       1      7     11       3       6    UT
## 1085    2            1     5       1      7     11       3       6    UT
## 1086    2            1     5       1      7     11       3       6    UT
## 1087    2            1     5       1      7     11       3       6    UT
## 1088    2            1     5       1      7     11       3       6    UT
## 1089    2            1     4       1      1     12       3       7    KY
## 1090    2            1     4       1      1     12       3       7    KY
## 1091    2            1     4       1      1     12       3       7    KY
## 1092    2            1     4       1      1     12       3       7    KY
## 1093    2            1     4       1      1     12       3       7    KY
## 1094    2            1     4       1      1     12       3       7    KY
## 1095    2            1     4       1      1     12       3       7    KY
## 1096    2            1     4       1      1     12       3       7    KY
## 1097    2            1     4       1      1     12       3       7    KY
## 1098    2            1     4       1      1     12       3       7    KY
## 1099    2            1     4       1      1     12       3       7    KY
## 1100    2            1     4       1      1     12       3       7    KY
## 1101    2            1     4       1      1     12       3       7    KY
## 1102    2            1     4       1      1     12       3       7    KY
## 1103    2            1     4       1      1     12       3       7    KY
## 1104    2            1     4       1      1     12       3       7    KY
## 1105    2            2     4       5      2      9       2       5    AL
## 1106    2            2     4       5      2      9       2       5    AL
## 1107    2            2     4       5      2      9       2       5    AL
## 1108    2            2     4       5      2      9       2       5    AL
## 1109    2            2     4       5      2      9       2       5    AL
## 1110    2            2     4       5      2      9       2       5    AL
## 1111    2            2     4       5      2      9       2       5    AL
## 1112    2            2     4       5      2      9       2       5    AL
## 1113    2            2     4       5      2      9       2       5    AL
## 1114    2            2     4       5      2      9       2       5    AL
## 1115    2            2     4       5      2      9       2       5    AL
## 1116    2            2     4       5      2      9       2       5    AL
## 1117    2            2     4       5      2      9       2       5    AL
## 1118    2            2     4       5      2      9       2       5    AL
## 1119    2            2     4       5      2      9       2       5    AL
## 1120    2            2     4       5      2      9       2       5    AL
## 1121    6            1     3       1      6      2       1       1    WV
## 1122    6            1     3       1      6      2       1       1    WV
## 1123    6            1     3       1      6      2       1       1    WV
## 1124    6            1     3       1      6      2       1       1    WV
## 1125    6            1     3       1      6      2       1       1    WV
## 1126    6            1     3       1      6      2       1       1    WV
## 1127    6            1     3       1      6      2       1       1    WV
## 1128    6            1     3       1      6      2       1       1    WV
## 1129    6            1     3       1      6      2       1       1    WV
## 1130    6            1     3       1      6      2       1       1    WV
## 1131    6            1     3       1      6      2       1       1    WV
## 1132    6            1     3       1      6      2       1       1    WV
## 1133    6            1     3       1      6      2       1       1    WV
## 1134    6            1     3       1      6      2       1       1    WV
## 1135    6            1     3       1      6      2       1       1    WV
## 1136    6            1     3       1      6      2       1       1    WV
## 1137    1            1     2       5      1     17       4       9    OH
## 1138    1            1     2       5      1     17       4       9    OH
## 1139    1            1     2       5      1     17       4       9    OH
## 1140    1            1     2       5      1     17       4       9    OH
## 1141    1            1     2       5      1     17       4       9    OH
## 1142    1            1     2       5      1     17       4       9    OH
## 1143    1            1     2       5      1     17       4       9    OH
## 1144    1            1     2       5      1     17       4       9    OH
## 1145    1            1     2       5      1     17       4       9    OH
## 1146    1            1     2       5      1     17       4       9    OH
## 1147    1            1     2       5      1     17       4       9    OH
## 1148    1            1     2       5      1     17       4       9    OH
## 1149    1            1     2       5      1     17       4       9    OH
## 1150    1            1     2       5      1     17       4       9    OH
## 1151    1            1     2       5      1     17       4       9    OH
## 1152    1            1     2       5      1     17       4       9    OH
## 1153    5            2     3       1      5     12       3       7    PA
## 1154    5            2     3       1      5     12       3       7    PA
## 1155    5            2     3       1      5     12       3       7    PA
## 1156    5            2     3       1      5     12       3       7    PA
## 1157    5            2     3       1      5     12       3       7    PA
## 1158    5            2     3       1      5     12       3       7    PA
## 1159    5            2     3       1      5     12       3       7    PA
## 1160    5            2     3       1      5     12       3       7    PA
## 1161    5            2     3       1      5     12       3       7    PA
## 1162    5            2     3       1      5     12       3       7    PA
## 1163    5            2     3       1      5     12       3       7    PA
## 1164    5            2     3       1      5     12       3       7    PA
## 1165    5            2     3       1      5     12       3       7    PA
## 1166    5            2     3       1      5     12       3       7    PA
## 1167    5            2     3       1      5     12       3       7    PA
## 1168    5            2     3       1      5     12       3       7    PA
## 1169    2            2     5       5      1     13       3       7    MI
## 1170    2            2     5       5      1     13       3       7    MI
## 1171    2            2     5       5      1     13       3       7    MI
## 1172    2            2     5       5      1     13       3       7    MI
## 1173    2            2     5       5      1     13       3       7    MI
## 1174    2            2     5       5      1     13       3       7    MI
## 1175    2            2     5       5      1     13       3       7    MI
## 1176    2            2     5       5      1     13       3       7    MI
## 1177    2            2     5       5      1     13       3       7    MI
## 1178    2            2     5       5      1     13       3       7    MI
## 1179    2            2     5       5      1     13       3       7    MI
## 1180    2            2     5       5      1     13       3       7    MI
## 1181    2            2     5       5      1     13       3       7    MI
## 1182    2            2     5       5      1     13       3       7    MI
## 1183    2            2     5       5      1     13       3       7    MI
## 1184    2            2     5       5      1     13       3       7    MI
## 1185    7            1     3       1      5     11       3       6    IL
## 1186    7            1     3       1      5     11       3       6    IL
## 1187    7            1     3       1      5     11       3       6    IL
## 1188    7            1     3       1      5     11       3       6    IL
## 1189    7            1     3       1      5     11       3       6    IL
## 1190    7            1     3       1      5     11       3       6    IL
## 1191    7            1     3       1      5     11       3       6    IL
## 1192    7            1     3       1      5     11       3       6    IL
## 1193    7            1     3       1      5     11       3       6    IL
## 1194    7            1     3       1      5     11       3       6    IL
## 1195    7            1     3       1      5     11       3       6    IL
## 1196    7            1     3       1      5     11       3       6    IL
## 1197    7            1     3       1      5     11       3       6    IL
## 1198    7            1     3       1      5     11       3       6    IL
## 1199    7            1     3       1      5     11       3       6    IL
## 1200    7            1     3       1      5     11       3       6    IL
## 1201    5            1     5       1      2     16       4       9    MN
## 1202    5            1     5       1      2     16       4       9    MN
## 1203    5            1     5       1      2     16       4       9    MN
## 1204    5            1     5       1      2     16       4       9    MN
## 1205    5            1     5       1      2     16       4       9    MN
## 1206    5            1     5       1      2     16       4       9    MN
## 1207    5            1     5       1      2     16       4       9    MN
## 1208    5            1     5       1      2     16       4       9    MN
## 1209    5            1     5       1      2     16       4       9    MN
## 1210    5            1     5       1      2     16       4       9    MN
## 1211    5            1     5       1      2     16       4       9    MN
## 1212    5            1     5       1      2     16       4       9    MN
## 1213    5            1     5       1      2     16       4       9    MN
## 1214    5            1     5       1      2     16       4       9    MN
## 1215    5            1     5       1      2     16       4       9    MN
## 1216    5            1     5       1      2     16       4       9    MN
## 1217    6            1     3       3      7      4       1       2    CA
## 1218    6            1     3       3      7      4       1       2    CA
## 1219    6            1     3       3      7      4       1       2    CA
## 1220    6            1     3       3      7      4       1       2    CA
## 1221    6            1     3       3      7      4       1       2    CA
## 1222    6            1     3       3      7      4       1       2    CA
## 1223    6            1     3       3      7      4       1       2    CA
## 1224    6            1     3       3      7      4       1       2    CA
## 1225    6            1     3       3      7      4       1       2    CA
## 1226    6            1     3       3      7      4       1       2    CA
## 1227    6            1     3       3      7      4       1       2    CA
## 1228    6            1     3       3      7      4       1       2    CA
## 1229    6            1     3       3      7      4       1       2    CA
## 1230    6            1     3       3      7      4       1       2    CA
## 1231    6            1     3       3      7      4       1       2    CA
## 1232    6            1     3       3      7      4       1       2    CA
## 1233    1            2     2       5      1      9       2       5    VA
## 1234    1            2     2       5      1      9       2       5    VA
## 1235    1            2     2       5      1      9       2       5    VA
## 1236    1            2     2       5      1      9       2       5    VA
## 1237    1            2     2       5      1      9       2       5    VA
## 1238    1            2     2       5      1      9       2       5    VA
## 1239    1            2     2       5      1      9       2       5    VA
## 1240    1            2     2       5      1      9       2       5    VA
## 1241    1            2     2       5      1      9       2       5    VA
## 1242    1            2     2       5      1      9       2       5    VA
## 1243    1            2     2       5      1      9       2       5    VA
## 1244    1            2     2       5      1      9       2       5    VA
## 1245    1            2     2       5      1      9       2       5    VA
## 1246    1            2     2       5      1      9       2       5    VA
## 1247    1            2     2       5      1      9       2       5    VA
## 1248    1            2     2       5      1      9       2       5    VA
## 1249    3            1     5       5      1     10       2       6    WV
## 1250    3            1     5       5      1     10       2       6    WV
## 1251    3            1     5       5      1     10       2       6    WV
## 1252    3            1     5       5      1     10       2       6    WV
## 1253    3            1     5       5      1     10       2       6    WV
## 1254    3            1     5       5      1     10       2       6    WV
## 1255    3            1     5       5      1     10       2       6    WV
## 1256    3            1     5       5      1     10       2       6    WV
## 1257    3            1     5       5      1     10       2       6    WV
## 1258    3            1     5       5      1     10       2       6    WV
## 1259    3            1     5       5      1     10       2       6    WV
## 1260    3            1     5       5      1     10       2       6    WV
## 1261    3            1     5       5      1     10       2       6    WV
## 1262    3            1     5       5      1     10       2       6    WV
## 1263    3            1     5       5      1     10       2       6    WV
## 1264    3            1     5       5      1     10       2       6    WV
## 1265    3            1     3       5      1     10       2       6    CT
## 1266    3            1     3       5      1     10       2       6    CT
## 1267    3            1     3       5      1     10       2       6    CT
## 1268    3            1     3       5      1     10       2       6    CT
## 1269    3            1     3       5      1     10       2       6    CT
## 1270    3            1     3       5      1     10       2       6    CT
## 1271    3            1     3       5      1     10       2       6    CT
## 1272    3            1     3       5      1     10       2       6    CT
## 1273    3            1     3       5      1     10       2       6    CT
## 1274    3            1     3       5      1     10       2       6    CT
## 1275    3            1     3       5      1     10       2       6    CT
## 1276    3            1     3       5      1     10       2       6    CT
## 1277    3            1     3       5      1     10       2       6    CT
## 1278    3            1     3       5      1     10       2       6    CT
## 1279    3            1     3       5      1     10       2       6    CT
## 1280    3            1     3       5      1     10       2       6    CT
## 1281    1            1     3       5      1     15       4       8    TX
## 1282    1            1     3       5      1     15       4       8    TX
## 1283    1            1     3       5      1     15       4       8    TX
## 1284    1            1     3       5      1     15       4       8    TX
## 1285    1            1     3       5      1     15       4       8    TX
## 1286    1            1     3       5      1     15       4       8    TX
## 1287    1            1     3       5      1     15       4       8    TX
## 1288    1            1     3       5      1     15       4       8    TX
## 1289    1            1     3       5      1     15       4       8    TX
## 1290    1            1     3       5      1     15       4       8    TX
## 1291    1            1     3       5      1     15       4       8    TX
## 1292    1            1     3       5      1     15       4       8    TX
## 1293    1            1     3       5      1     15       4       8    TX
## 1294    1            1     3       5      1     15       4       8    TX
## 1295    1            1     3       5      1     15       4       8    TX
## 1296    1            1     3       5      1     15       4       8    TX
## 1297    2            1     3       5      1     10       2       6    NH
## 1298    2            1     3       5      1     10       2       6    NH
## 1299    2            1     3       5      1     10       2       6    NH
## 1300    2            1     3       5      1     10       2       6    NH
## 1301    2            1     3       5      1     10       2       6    NH
## 1302    2            1     3       5      1     10       2       6    NH
## 1303    2            1     3       5      1     10       2       6    NH
## 1304    2            1     3       5      1     10       2       6    NH
## 1305    2            1     3       5      1     10       2       6    NH
## 1306    2            1     3       5      1     10       2       6    NH
## 1307    2            1     3       5      1     10       2       6    NH
## 1308    2            1     3       5      1     10       2       6    NH
## 1309    2            1     3       5      1     10       2       6    NH
## 1310    2            1     3       5      1     10       2       6    NH
## 1311    2            1     3       5      1     10       2       6    NH
## 1312    2            1     3       5      1     10       2       6    NH
## 1313    6            1     3       1      5     11       3       6    DE
## 1314    6            1     3       1      5     11       3       6    DE
## 1315    6            1     3       1      5     11       3       6    DE
##      REGION4 REGION9 METRO INTERNET HOUSING HOMETYPE PHONESERVICE HHSIZE HH01
## 1          2       4     0        1       1        3            4      2    0
## 2          2       4     0        1       1        3            4      2    0
## 3          2       4     0        1       1        3            4      2    0
## 4          2       4     0        1       1        3            4      2    0
## 5          2       4     0        1       1        3            4      2    0
## 6          2       4     0        1       1        3            4      2    0
## 7          2       4     0        1       1        3            4      2    0
## 8          2       4     0        1       1        3            4      2    0
## 9          2       4     0        1       1        3            4      2    0
## 10         2       4     0        1       1        3            4      2    0
## 11         2       4     0        1       1        3            4      2    0
## 12         2       4     0        1       1        3            4      2    0
## 13         2       4     0        1       1        3            4      2    0
## 14         2       4     0        1       1        3            4      2    0
## 15         2       4     0        1       1        3            4      2    0
## 16         2       4     0        1       1        3            4      2    0
## 17         4       9     1        1       2        1            4      3    0
## 18         4       9     1        1       2        1            4      3    0
## 19         4       9     1        1       2        1            4      3    0
## 20         4       9     1        1       2        1            4      3    0
## 21         4       9     1        1       2        1            4      3    0
## 22         4       9     1        1       2        1            4      3    0
## 23         4       9     1        1       2        1            4      3    0
## 24         4       9     1        1       2        1            4      3    0
## 25         4       9     1        1       2        1            4      3    0
## 26         4       9     1        1       2        1            4      3    0
## 27         4       9     1        1       2        1            4      3    0
## 28         4       9     1        1       2        1            4      3    0
## 29         4       9     1        1       2        1            4      3    0
## 30         4       9     1        1       2        1            4      3    0
## 31         4       9     1        1       2        1            4      3    0
## 32         4       9     1        1       2        1            4      3    0
## 33         4       9     1        1       2        3            4      3    1
## 34         4       9     1        1       2        3            4      3    1
## 35         4       9     1        1       2        3            4      3    1
## 36         4       9     1        1       2        3            4      3    1
## 37         4       9     1        1       2        3            4      3    1
## 38         4       9     1        1       2        3            4      3    1
## 39         4       9     1        1       2        3            4      3    1
## 40         4       9     1        1       2        3            4      3    1
## 41         4       9     1        1       2        3            4      3    1
## 42         4       9     1        1       2        3            4      3    1
## 43         4       9     1        1       2        3            4      3    1
## 44         4       9     1        1       2        3            4      3    1
## 45         4       9     1        1       2        3            4      3    1
## 46         4       9     1        1       2        3            4      3    1
## 47         4       9     1        1       2        3            4      3    1
## 48         4       9     1        1       2        3            4      3    1
## 49         4       9     1        1       3        2            4      2    0
## 50         4       9     1        1       3        2            4      2    0
## 51         4       9     1        1       3        2            4      2    0
## 52         4       9     1        1       3        2            4      2    0
## 53         4       9     1        1       3        2            4      2    0
## 54         4       9     1        1       3        2            4      2    0
## 55         4       9     1        1       3        2            4      2    0
## 56         4       9     1        1       3        2            4      2    0
## 57         4       9     1        1       3        2            4      2    0
## 58         4       9     1        1       3        2            4      2    0
## 59         4       9     1        1       3        2            4      2    0
## 60         4       9     1        1       3        2            4      2    0
## 61         4       9     1        1       3        2            4      2    0
## 62         4       9     1        1       3        2            4      2    0
## 63         4       9     1        1       3        2            4      2    0
## 64         4       9     1        1       3        2            4      2    0
## 65         3       7     1        1       2        2            4      2    0
## 66         3       7     1        1       2        2            4      2    0
## 67         3       7     1        1       2        2            4      2    0
## 68         3       7     1        1       2        2            4      2    0
## 69         3       7     1        1       2        2            4      2    0
## 70         3       7     1        1       2        2            4      2    0
## 71         3       7     1        1       2        2            4      2    0
## 72         3       7     1        1       2        2            4      2    0
## 73         3       7     1        1       2        2            4      2    0
## 74         3       7     1        1       2        2            4      2    0
## 75         3       7     1        1       2        2            4      2    0
## 76         3       7     1        1       2        2            4      2    0
## 77         3       7     1        1       2        2            4      2    0
## 78         3       7     1        1       2        2            4      2    0
## 79         3       7     1        1       2        2            4      2    0
## 80         3       7     1        1       2        2            4      2    0
## 81         3       6     0        0       3        1            4      1    0
## 82         3       6     0        0       3        1            4      1    0
## 83         3       6     0        0       3        1            4      1    0
## 84         3       6     0        0       3        1            4      1    0
## 85         3       6     0        0       3        1            4      1    0
## 86         3       6     0        0       3        1            4      1    0
## 87         3       6     0        0       3        1            4      1    0
## 88         3       6     0        0       3        1            4      1    0
## 89         3       6     0        0       3        1            4      1    0
## 90         3       6     0        0       3        1            4      1    0
## 91         3       6     0        0       3        1            4      1    0
## 92         3       6     0        0       3        1            4      1    0
## 93         3       6     0        0       3        1            4      1    0
## 94         3       6     0        0       3        1            4      1    0
## 95         3       6     0        0       3        1            4      1    0
## 96         3       6     0        0       3        1            4      1    0
## 97         2       3     0        1       2        3            4      2    0
## 98         2       3     0        1       2        3            4      2    0
## 99         2       3     0        1       2        3            4      2    0
## 100        2       3     0        1       2        3            4      2    0
## 101        2       3     0        1       2        3            4      2    0
## 102        2       3     0        1       2        3            4      2    0
## 103        2       3     0        1       2        3            4      2    0
## 104        2       3     0        1       2        3            4      2    0
## 105        2       3     0        1       2        3            4      2    0
## 106        2       3     0        1       2        3            4      2    0
## 107        2       3     0        1       2        3            4      2    0
## 108        2       3     0        1       2        3            4      2    0
## 109        2       3     0        1       2        3            4      2    0
## 110        2       3     0        1       2        3            4      2    0
## 111        2       3     0        1       2        3            4      2    0
## 112        2       3     0        1       2        3            4      2    0
## 113        2       3     1        1       1        1            2      5    0
## 114        2       3     1        1       1        1            2      5    0
## 115        2       3     1        1       1        1            2      5    0
## 116        2       3     1        1       1        1            2      5    0
## 117        2       3     1        1       1        1            2      5    0
## 118        2       3     1        1       1        1            2      5    0
## 119        2       3     1        1       1        1            2      5    0
## 120        2       3     1        1       1        1            2      5    0
## 121        2       3     1        1       1        1            2      5    0
## 122        2       3     1        1       1        1            2      5    0
## 123        2       3     1        1       1        1            2      5    0
## 124        2       3     1        1       1        1            2      5    0
## 125        2       3     1        1       1        1            2      5    0
## 126        2       3     1        1       1        1            2      5    0
## 127        2       3     1        1       1        1            2      5    0
## 128        2       3     1        1       1        1            2      5    0
## 129        4       9     1        1       2        1            3      2    0
## 130        4       9     1        1       2        1            3      2    0
## 131        4       9     1        1       2        1            3      2    0
## 132        4       9     1        1       2        1            3      2    0
## 133        4       9     1        1       2        1            3      2    0
## 134        4       9     1        1       2        1            3      2    0
## 135        4       9     1        1       2        1            3      2    0
## 136        4       9     1        1       2        1            3      2    0
## 137        4       9     1        1       2        1            3      2    0
## 138        4       9     1        1       2        1            3      2    0
## 139        4       9     1        1       2        1            3      2    0
## 140        4       9     1        1       2        1            3      2    0
## 141        4       9     1        1       2        1            3      2    0
## 142        4       9     1        1       2        1            3      2    0
## 143        4       9     1        1       2        1            3      2    0
## 144        4       9     1        1       2        1            3      2    0
## 145        1       2     1        1       2        3            4      2    0
## 146        1       2     1        1       2        3            4      2    0
## 147        1       2     1        1       2        3            4      2    0
## 148        1       2     1        1       2        3            4      2    0
## 149        1       2     1        1       2        3            4      2    0
## 150        1       2     1        1       2        3            4      2    0
## 151        1       2     1        1       2        3            4      2    0
## 152        1       2     1        1       2        3            4      2    0
## 153        1       2     1        1       2        3            4      2    0
## 154        1       2     1        1       2        3            4      2    0
## 155        1       2     1        1       2        3            4      2    0
## 156        1       2     1        1       2        3            4      2    0
## 157        1       2     1        1       2        3            4      2    0
## 158        1       2     1        1       2        3            4      2    0
## 159        1       2     1        1       2        3            4      2    0
## 160        1       2     1        1       2        3            4      2    0
## 161        4       9     1        1       1        1            4      3    0
## 162        4       9     1        1       1        1            4      3    0
## 163        4       9     1        1       1        1            4      3    0
## 164        4       9     1        1       1        1            4      3    0
## 165        4       9     1        1       1        1            4      3    0
## 166        4       9     1        1       1        1            4      3    0
## 167        4       9     1        1       1        1            4      3    0
## 168        4       9     1        1       1        1            4      3    0
## 169        4       9     1        1       1        1            4      3    0
## 170        4       9     1        1       1        1            4      3    0
## 171        4       9     1        1       1        1            4      3    0
## 172        4       9     1        1       1        1            4      3    0
## 173        4       9     1        1       1        1            4      3    0
## 174        4       9     1        1       1        1            4      3    0
## 175        4       9     1        1       1        1            4      3    0
## 176        4       9     1        1       1        1            4      3    0
## 177        2       4     1        1       1        1            4      2    0
## 178        2       4     1        1       1        1            4      2    0
## 179        2       4     1        1       1        1            4      2    0
## 180        2       4     1        1       1        1            4      2    0
## 181        2       4     1        1       1        1            4      2    0
## 182        2       4     1        1       1        1            4      2    0
## 183        2       4     1        1       1        1            4      2    0
## 184        2       4     1        1       1        1            4      2    0
## 185        2       4     1        1       1        1            4      2    0
## 186        2       4     1        1       1        1            4      2    0
## 187        2       4     1        1       1        1            4      2    0
## 188        2       4     1        1       1        1            4      2    0
## 189        2       4     1        1       1        1            4      2    0
## 190        2       4     1        1       1        1            4      2    0
## 191        2       4     1        1       1        1            4      2    0
## 192        2       4     1        1       1        1            4      2    0
## 193        3       5     1        1       1        1            4      4    0
## 194        3       5     1        1       1        1            4      4    0
## 195        3       5     1        1       1        1            4      4    0
## 196        3       5     1        1       1        1            4      4    0
## 197        3       5     1        1       1        1            4      4    0
## 198        3       5     1        1       1        1            4      4    0
## 199        3       5     1        1       1        1            4      4    0
## 200        3       5     1        1       1        1            4      4    0
## 201        3       5     1        1       1        1            4      4    0
## 202        3       5     1        1       1        1            4      4    0
## 203        3       5     1        1       1        1            4      4    0
## 204        3       5     1        1       1        1            4      4    0
## 205        3       5     1        1       1        1            4      4    0
## 206        3       5     1        1       1        1            4      4    0
## 207        3       5     1        1       1        1            4      4    0
## 208        3       5     1        1       1        1            4      4    0
## 209        2       3     1        1       1        1            4      1    0
## 210        2       3     1        1       1        1            4      1    0
## 211        2       3     1        1       1        1            4      1    0
## 212        2       3     1        1       1        1            4      1    0
## 213        2       3     1        1       1        1            4      1    0
## 214        2       3     1        1       1        1            4      1    0
## 215        2       3     1        1       1        1            4      1    0
## 216        2       3     1        1       1        1            4      1    0
## 217        2       3     1        1       1        1            4      1    0
## 218        2       3     1        1       1        1            4      1    0
## 219        2       3     1        1       1        1            4      1    0
## 220        2       3     1        1       1        1            4      1    0
## 221        2       3     1        1       1        1            4      1    0
## 222        2       3     1        1       1        1            4      1    0
## 223        2       3     1        1       1        1            4      1    0
## 224        2       3     1        1       1        1            4      1    0
## 225        3       5     1        1       1        1            4      2    0
## 226        3       5     1        1       1        1            4      2    0
## 227        3       5     1        1       1        1            4      2    0
## 228        3       5     1        1       1        1            4      2    0
## 229        3       5     1        1       1        1            4      2    0
## 230        3       5     1        1       1        1            4      2    0
## 231        3       5     1        1       1        1            4      2    0
## 232        3       5     1        1       1        1            4      2    0
## 233        3       5     1        1       1        1            4      2    0
## 234        3       5     1        1       1        1            4      2    0
## 235        3       5     1        1       1        1            4      2    0
## 236        3       5     1        1       1        1            4      2    0
## 237        3       5     1        1       1        1            4      2    0
## 238        3       5     1        1       1        1            4      2    0
## 239        3       5     1        1       1        1            4      2    0
## 240        3       5     1        1       1        1            4      2    0
## 241        2       3     1        1       1        1            4      1    0
## 242        2       3     1        1       1        1            4      1    0
## 243        2       3     1        1       1        1            4      1    0
## 244        2       3     1        1       1        1            4      1    0
## 245        2       3     1        1       1        1            4      1    0
## 246        2       3     1        1       1        1            4      1    0
## 247        2       3     1        1       1        1            4      1    0
## 248        2       3     1        1       1        1            4      1    0
## 249        2       3     1        1       1        1            4      1    0
## 250        2       3     1        1       1        1            4      1    0
## 251        2       3     1        1       1        1            4      1    0
## 252        2       3     1        1       1        1            4      1    0
## 253        2       3     1        1       1        1            4      1    0
## 254        2       3     1        1       1        1            4      1    0
## 255        2       3     1        1       1        1            4      1    0
## 256        2       3     1        1       1        1            4      1    0
## 257        3       7     1        1       1        1            4      3    0
## 258        3       7     1        1       1        1            4      3    0
## 259        3       7     1        1       1        1            4      3    0
## 260        3       7     1        1       1        1            4      3    0
## 261        3       7     1        1       1        1            4      3    0
## 262        3       7     1        1       1        1            4      3    0
## 263        3       7     1        1       1        1            4      3    0
## 264        3       7     1        1       1        1            4      3    0
## 265        3       7     1        1       1        1            4      3    0
## 266        3       7     1        1       1        1            4      3    0
## 267        3       7     1        1       1        1            4      3    0
## 268        3       7     1        1       1        1            4      3    0
## 269        3       7     1        1       1        1            4      3    0
## 270        3       7     1        1       1        1            4      3    0
## 271        3       7     1        1       1        1            4      3    0
## 272        3       7     1        1       1        1            4      3    0
## 273        3       6     1        1       1        1            4      4    0
## 274        3       6     1        1       1        1            4      4    0
## 275        3       6     1        1       1        1            4      4    0
## 276        3       6     1        1       1        1            4      4    0
## 277        3       6     1        1       1        1            4      4    0
## 278        3       6     1        1       1        1            4      4    0
## 279        3       6     1        1       1        1            4      4    0
## 280        3       6     1        1       1        1            4      4    0
## 281        3       6     1        1       1        1            4      4    0
## 282        3       6     1        1       1        1            4      4    0
## 283        3       6     1        1       1        1            4      4    0
## 284        3       6     1        1       1        1            4      4    0
## 285        3       6     1        1       1        1            4      4    0
## 286        3       6     1        1       1        1            4      4    0
## 287        3       6     1        1       1        1            4      4    0
## 288        3       6     1        1       1        1            4      4    0
## 289        4       9     1        1       1        1            2      4    0
## 290        4       9     1        1       1        1            2      4    0
## 291        4       9     1        1       1        1            2      4    0
## 292        4       9     1        1       1        1            2      4    0
## 293        4       9     1        1       1        1            2      4    0
## 294        4       9     1        1       1        1            2      4    0
## 295        4       9     1        1       1        1            2      4    0
## 296        4       9     1        1       1        1            2      4    0
## 297        4       9     1        1       1        1            2      4    0
## 298        4       9     1        1       1        1            2      4    0
## 299        4       9     1        1       1        1            2      4    0
## 300        4       9     1        1       1        1            2      4    0
## 301        4       9     1        1       1        1            2      4    0
## 302        4       9     1        1       1        1            2      4    0
## 303        4       9     1        1       1        1            2      4    0
## 304        4       9     1        1       1        1            2      4    0
## 305        1       2     1        1       2        3            4      1    0
## 306        1       2     1        1       2        3            4      1    0
## 307        1       2     1        1       2        3            4      1    0
## 308        1       2     1        1       2        3            4      1    0
## 309        1       2     1        1       2        3            4      1    0
## 310        1       2     1        1       2        3            4      1    0
## 311        1       2     1        1       2        3            4      1    0
## 312        1       2     1        1       2        3            4      1    0
## 313        1       2     1        1       2        3            4      1    0
## 314        1       2     1        1       2        3            4      1    0
## 315        1       2     1        1       2        3            4      1    0
## 316        1       2     1        1       2        3            4      1    0
## 317        1       2     1        1       2        3            4      1    0
## 318        1       2     1        1       2        3            4      1    0
## 319        1       2     1        1       2        3            4      1    0
## 320        1       2     1        1       2        3            4      1    0
## 321        4       9     1        1       1        1            4      2    0
## 322        4       9     1        1       1        1            4      2    0
## 323        4       9     1        1       1        1            4      2    0
## 324        4       9     1        1       1        1            4      2    0
## 325        4       9     1        1       1        1            4      2    0
## 326        4       9     1        1       1        1            4      2    0
## 327        4       9     1        1       1        1            4      2    0
## 328        4       9     1        1       1        1            4      2    0
## 329        4       9     1        1       1        1            4      2    0
## 330        4       9     1        1       1        1            4      2    0
## 331        4       9     1        1       1        1            4      2    0
## 332        4       9     1        1       1        1            4      2    0
## 333        4       9     1        1       1        1            4      2    0
## 334        4       9     1        1       1        1            4      2    0
## 335        4       9     1        1       1        1            4      2    0
## 336        4       9     1        1       1        1            4      2    0
## 337        3       5     1        1       1        2            4      2    0
## 338        3       5     1        1       1        2            4      2    0
## 339        3       5     1        1       1        2            4      2    0
## 340        3       5     1        1       1        2            4      2    0
## 341        3       5     1        1       1        2            4      2    0
## 342        3       5     1        1       1        2            4      2    0
## 343        3       5     1        1       1        2            4      2    0
## 344        3       5     1        1       1        2            4      2    0
## 345        3       5     1        1       1        2            4      2    0
## 346        3       5     1        1       1        2            4      2    0
## 347        3       5     1        1       1        2            4      2    0
## 348        3       5     1        1       1        2            4      2    0
## 349        3       5     1        1       1        2            4      2    0
## 350        3       5     1        1       1        2            4      2    0
## 351        3       5     1        1       1        2            4      2    0
## 352        3       5     1        1       1        2            4      2    0
## 353        1       2     1        1       1        1            3      3    0
## 354        1       2     1        1       1        1            3      3    0
## 355        1       2     1        1       1        1            3      3    0
## 356        1       2     1        1       1        1            3      3    0
## 357        1       2     1        1       1        1            3      3    0
## 358        1       2     1        1       1        1            3      3    0
## 359        1       2     1        1       1        1            3      3    0
## 360        1       2     1        1       1        1            3      3    0
## 361        1       2     1        1       1        1            3      3    0
## 362        1       2     1        1       1        1            3      3    0
## 363        1       2     1        1       1        1            3      3    0
## 364        1       2     1        1       1        1            3      3    0
## 365        1       2     1        1       1        1            3      3    0
## 366        1       2     1        1       1        1            3      3    0
## 367        1       2     1        1       1        1            3      3    0
## 368        1       2     1        1       1        1            3      3    0
## 369        4       9     1        1       1        3            4      2    0
## 370        4       9     1        1       1        3            4      2    0
## 371        4       9     1        1       1        3            4      2    0
## 372        4       9     1        1       1        3            4      2    0
## 373        4       9     1        1       1        3            4      2    0
## 374        4       9     1        1       1        3            4      2    0
## 375        4       9     1        1       1        3            4      2    0
## 376        4       9     1        1       1        3            4      2    0
## 377        4       9     1        1       1        3            4      2    0
## 378        4       9     1        1       1        3            4      2    0
## 379        4       9     1        1       1        3            4      2    0
## 380        4       9     1        1       1        3            4      2    0
## 381        4       9     1        1       1        3            4      2    0
## 382        4       9     1        1       1        3            4      2    0
## 383        4       9     1        1       1        3            4      2    0
## 384        4       9     1        1       1        3            4      2    0
## 385        2       3     1        1       1        1            4      2    0
## 386        2       3     1        1       1        1            4      2    0
## 387        2       3     1        1       1        1            4      2    0
## 388        2       3     1        1       1        1            4      2    0
## 389        2       3     1        1       1        1            4      2    0
## 390        2       3     1        1       1        1            4      2    0
## 391        2       3     1        1       1        1            4      2    0
## 392        2       3     1        1       1        1            4      2    0
## 393        2       3     1        1       1        1            4      2    0
## 394        2       3     1        1       1        1            4      2    0
## 395        2       3     1        1       1        1            4      2    0
## 396        2       3     1        1       1        1            4      2    0
## 397        2       3     1        1       1        1            4      2    0
## 398        2       3     1        1       1        1            4      2    0
## 399        2       3     1        1       1        1            4      2    0
## 400        2       3     1        1       1        1            4      2    0
## 401        2       3     0        1       1        1            3      3    0
## 402        2       3     0        1       1        1            3      3    0
## 403        2       3     0        1       1        1            3      3    0
## 404        2       3     0        1       1        1            3      3    0
## 405        2       3     0        1       1        1            3      3    0
## 406        2       3     0        1       1        1            3      3    0
## 407        2       3     0        1       1        1            3      3    0
## 408        2       3     0        1       1        1            3      3    0
## 409        2       3     0        1       1        1            3      3    0
## 410        2       3     0        1       1        1            3      3    0
## 411        2       3     0        1       1        1            3      3    0
## 412        2       3     0        1       1        1            3      3    0
## 413        2       3     0        1       1        1            3      3    0
## 414        2       3     0        1       1        1            3      3    0
## 415        2       3     0        1       1        1            3      3    0
## 416        2       3     0        1       1        1            3      3    0
## 417        1       2     1        1       1        1            4      1    0
## 418        1       2     1        1       1        1            4      1    0
## 419        1       2     1        1       1        1            4      1    0
## 420        1       2     1        1       1        1            4      1    0
## 421        1       2     1        1       1        1            4      1    0
## 422        1       2     1        1       1        1            4      1    0
## 423        1       2     1        1       1        1            4      1    0
## 424        1       2     1        1       1        1            4      1    0
## 425        1       2     1        1       1        1            4      1    0
## 426        1       2     1        1       1        1            4      1    0
## 427        1       2     1        1       1        1            4      1    0
## 428        1       2     1        1       1        1            4      1    0
## 429        1       2     1        1       1        1            4      1    0
## 430        1       2     1        1       1        1            4      1    0
## 431        1       2     1        1       1        1            4      1    0
## 432        1       2     1        1       1        1            4      1    0
## 433        3       5     1        1       2        3            4      2    0
## 434        3       5     1        1       2        3            4      2    0
## 435        3       5     1        1       2        3            4      2    0
## 436        3       5     1        1       2        3            4      2    0
## 437        3       5     1        1       2        3            4      2    0
## 438        3       5     1        1       2        3            4      2    0
## 439        3       5     1        1       2        3            4      2    0
## 440        3       5     1        1       2        3            4      2    0
## 441        3       5     1        1       2        3            4      2    0
## 442        3       5     1        1       2        3            4      2    0
## 443        3       5     1        1       2        3            4      2    0
## 444        3       5     1        1       2        3            4      2    0
## 445        3       5     1        1       2        3            4      2    0
## 446        3       5     1        1       2        3            4      2    0
## 447        3       5     1        1       2        3            4      2    0
## 448        3       5     1        1       2        3            4      2    0
## 449        2       3     1        1       1        1            4      2    0
## 450        2       3     1        1       1        1            4      2    0
## 451        2       3     1        1       1        1            4      2    0
## 452        2       3     1        1       1        1            4      2    0
## 453        2       3     1        1       1        1            4      2    0
## 454        2       3     1        1       1        1            4      2    0
## 455        2       3     1        1       1        1            4      2    0
## 456        2       3     1        1       1        1            4      2    0
## 457        2       3     1        1       1        1            4      2    0
## 458        2       3     1        1       1        1            4      2    0
## 459        2       3     1        1       1        1            4      2    0
## 460        2       3     1        1       1        1            4      2    0
## 461        2       3     1        1       1        1            4      2    0
## 462        2       3     1        1       1        1            4      2    0
## 463        2       3     1        1       1        1            4      2    0
## 464        2       3     1        1       1        1            4      2    0
## 465        3       5     1        1       1        1            2      1    0
## 466        3       5     1        1       1        1            2      1    0
## 467        3       5     1        1       1        1            2      1    0
## 468        3       5     1        1       1        1            2      1    0
## 469        3       5     1        1       1        1            2      1    0
## 470        3       5     1        1       1        1            2      1    0
## 471        3       5     1        1       1        1            2      1    0
## 472        3       5     1        1       1        1            2      1    0
## 473        3       5     1        1       1        1            2      1    0
## 474        3       5     1        1       1        1            2      1    0
## 475        3       5     1        1       1        1            2      1    0
## 476        3       5     1        1       1        1            2      1    0
## 477        3       5     1        1       1        1            2      1    0
## 478        3       5     1        1       1        1            2      1    0
## 479        3       5     1        1       1        1            2      1    0
## 480        3       5     1        1       1        1            2      1    0
## 481        1       2     1        1       1        1            4      3    0
## 482        1       2     1        1       1        1            4      3    0
## 483        1       2     1        1       1        1            4      3    0
## 484        1       2     1        1       1        1            4      3    0
## 485        1       2     1        1       1        1            4      3    0
## 486        1       2     1        1       1        1            4      3    0
## 487        1       2     1        1       1        1            4      3    0
## 488        1       2     1        1       1        1            4      3    0
## 489        1       2     1        1       1        1            4      3    0
## 490        1       2     1        1       1        1            4      3    0
## 491        1       2     1        1       1        1            4      3    0
## 492        1       2     1        1       1        1            4      3    0
## 493        1       2     1        1       1        1            4      3    0
## 494        1       2     1        1       1        1            4      3    0
## 495        1       2     1        1       1        1            4      3    0
## 496        1       2     1        1       1        1            4      3    0
## 497        2       4     0        0       1        1            4      5    0
## 498        2       4     0        0       1        1            4      5    0
## 499        2       4     0        0       1        1            4      5    0
## 500        2       4     0        0       1        1            4      5    0
## 501        2       4     0        0       1        1            4      5    0
## 502        2       4     0        0       1        1            4      5    0
## 503        2       4     0        0       1        1            4      5    0
## 504        2       4     0        0       1        1            4      5    0
## 505        2       4     0        0       1        1            4      5    0
## 506        2       4     0        0       1        1            4      5    0
## 507        2       4     0        0       1        1            4      5    0
## 508        2       4     0        0       1        1            4      5    0
## 509        2       4     0        0       1        1            4      5    0
## 510        2       4     0        0       1        1            4      5    0
## 511        2       4     0        0       1        1            4      5    0
## 512        2       4     0        0       1        1            4      5    0
## 513        2       3     1        1       1        1            4      3    0
## 514        2       3     1        1       1        1            4      3    0
## 515        2       3     1        1       1        1            4      3    0
## 516        2       3     1        1       1        1            4      3    0
## 517        2       3     1        1       1        1            4      3    0
## 518        2       3     1        1       1        1            4      3    0
## 519        2       3     1        1       1        1            4      3    0
## 520        2       3     1        1       1        1            4      3    0
## 521        2       3     1        1       1        1            4      3    0
## 522        2       3     1        1       1        1            4      3    0
## 523        2       3     1        1       1        1            4      3    0
## 524        2       3     1        1       1        1            4      3    0
## 525        2       3     1        1       1        1            4      3    0
## 526        2       3     1        1       1        1            4      3    0
## 527        2       3     1        1       1        1            4      3    0
## 528        2       3     1        1       1        1            4      3    0
## 529        1       2     1        1       1        2            4      5    0
## 530        1       2     1        1       1        2            4      5    0
## 531        1       2     1        1       1        2            4      5    0
## 532        1       2     1        1       1        2            4      5    0
## 533        1       2     1        1       1        2            4      5    0
## 534        1       2     1        1       1        2            4      5    0
## 535        1       2     1        1       1        2            4      5    0
## 536        1       2     1        1       1        2            4      5    0
## 537        1       2     1        1       1        2            4      5    0
## 538        1       2     1        1       1        2            4      5    0
## 539        1       2     1        1       1        2            4      5    0
## 540        1       2     1        1       1        2            4      5    0
## 541        1       2     1        1       1        2            4      5    0
## 542        1       2     1        1       1        2            4      5    0
## 543        1       2     1        1       1        2            4      5    0
## 544        1       2     1        1       1        2            4      5    0
## 545        3       5     1        1       1        1            3      2    0
## 546        3       5     1        1       1        1            3      2    0
## 547        3       5     1        1       1        1            3      2    0
## 548        3       5     1        1       1        1            3      2    0
## 549        3       5     1        1       1        1            3      2    0
## 550        3       5     1        1       1        1            3      2    0
## 551        3       5     1        1       1        1            3      2    0
## 552        3       5     1        1       1        1            3      2    0
## 553        3       5     1        1       1        1            3      2    0
## 554        3       5     1        1       1        1            3      2    0
## 555        3       5     1        1       1        1            3      2    0
## 556        3       5     1        1       1        1            3      2    0
## 557        3       5     1        1       1        1            3      2    0
## 558        3       5     1        1       1        1            3      2    0
## 559        3       5     1        1       1        1            3      2    0
## 560        3       5     1        1       1        1            3      2    0
## 561        3       5     1        1       1        1            2      2    0
## 562        3       5     1        1       1        1            2      2    0
## 563        3       5     1        1       1        1            2      2    0
## 564        3       5     1        1       1        1            2      2    0
## 565        3       5     1        1       1        1            2      2    0
## 566        3       5     1        1       1        1            2      2    0
## 567        3       5     1        1       1        1            2      2    0
## 568        3       5     1        1       1        1            2      2    0
## 569        3       5     1        1       1        1            2      2    0
## 570        3       5     1        1       1        1            2      2    0
## 571        3       5     1        1       1        1            2      2    0
## 572        3       5     1        1       1        1            2      2    0
## 573        3       5     1        1       1        1            2      2    0
## 574        3       5     1        1       1        1            2      2    0
## 575        3       5     1        1       1        1            2      2    0
## 576        3       5     1        1       1        1            2      2    0
## 577        2       4     1        1       2        1            4      5    0
## 578        2       4     1        1       2        1            4      5    0
## 579        2       4     1        1       2        1            4      5    0
## 580        2       4     1        1       2        1            4      5    0
## 581        2       4     1        1       2        1            4      5    0
## 582        2       4     1        1       2        1            4      5    0
## 583        2       4     1        1       2        1            4      5    0
## 584        2       4     1        1       2        1            4      5    0
## 585        2       4     1        1       2        1            4      5    0
## 586        2       4     1        1       2        1            4      5    0
## 587        2       4     1        1       2        1            4      5    0
## 588        2       4     1        1       2        1            4      5    0
## 589        2       4     1        1       2        1            4      5    0
## 590        2       4     1        1       2        1            4      5    0
## 591        2       4     1        1       2        1            4      5    0
## 592        2       4     1        1       2        1            4      5    0
## 593        1       2     1        1       2        3            3      1    0
## 594        1       2     1        1       2        3            3      1    0
## 595        1       2     1        1       2        3            3      1    0
## 596        1       2     1        1       2        3            3      1    0
## 597        1       2     1        1       2        3            3      1    0
## 598        1       2     1        1       2        3            3      1    0
## 599        1       2     1        1       2        3            3      1    0
## 600        1       2     1        1       2        3            3      1    0
## 601        1       2     1        1       2        3            3      1    0
## 602        1       2     1        1       2        3            3      1    0
## 603        1       2     1        1       2        3            3      1    0
## 604        1       2     1        1       2        3            3      1    0
## 605        1       2     1        1       2        3            3      1    0
## 606        1       2     1        1       2        3            3      1    0
## 607        1       2     1        1       2        3            3      1    0
## 608        1       2     1        1       2        3            3      1    0
## 609        1       2     1        1       1        1            4      2    0
## 610        1       2     1        1       1        1            4      2    0
## 611        1       2     1        1       1        1            4      2    0
## 612        1       2     1        1       1        1            4      2    0
## 613        1       2     1        1       1        1            4      2    0
## 614        1       2     1        1       1        1            4      2    0
## 615        1       2     1        1       1        1            4      2    0
## 616        1       2     1        1       1        1            4      2    0
## 617        1       2     1        1       1        1            4      2    0
## 618        1       2     1        1       1        1            4      2    0
## 619        1       2     1        1       1        1            4      2    0
## 620        1       2     1        1       1        1            4      2    0
## 621        1       2     1        1       1        1            4      2    0
## 622        1       2     1        1       1        1            4      2    0
## 623        1       2     1        1       1        1            4      2    0
## 624        1       2     1        1       1        1            4      2    0
## 625        4       9     1        0       2        3            4      6    0
## 626        4       9     1        0       2        3            4      6    0
## 627        4       9     1        0       2        3            4      6    0
## 628        4       9     1        0       2        3            4      6    0
## 629        4       9     1        0       2        3            4      6    0
## 630        4       9     1        0       2        3            4      6    0
## 631        4       9     1        0       2        3            4      6    0
## 632        4       9     1        0       2        3            4      6    0
## 633        4       9     1        0       2        3            4      6    0
## 634        4       9     1        0       2        3            4      6    0
## 635        4       9     1        0       2        3            4      6    0
## 636        4       9     1        0       2        3            4      6    0
## 637        4       9     1        0       2        3            4      6    0
## 638        4       9     1        0       2        3            4      6    0
## 639        4       9     1        0       2        3            4      6    0
## 640        4       9     1        0       2        3            4      6    0
## 641        1       1     1        1       1        1            4      4    0
## 642        1       1     1        1       1        1            4      4    0
## 643        1       1     1        1       1        1            4      4    0
## 644        1       1     1        1       1        1            4      4    0
## 645        1       1     1        1       1        1            4      4    0
## 646        1       1     1        1       1        1            4      4    0
## 647        1       1     1        1       1        1            4      4    0
## 648        1       1     1        1       1        1            4      4    0
## 649        1       1     1        1       1        1            4      4    0
## 650        1       1     1        1       1        1            4      4    0
## 651        1       1     1        1       1        1            4      4    0
## 652        1       1     1        1       1        1            4      4    0
## 653        1       1     1        1       1        1            4      4    0
## 654        1       1     1        1       1        1            4      4    0
## 655        1       1     1        1       1        1            4      4    0
## 656        1       1     1        1       1        1            4      4    0
## 657        2       4     1        0       2        3            4      2    0
## 658        2       4     1        0       2        3            4      2    0
## 659        2       4     1        0       2        3            4      2    0
## 660        2       4     1        0       2        3            4      2    0
## 661        2       4     1        0       2        3            4      2    0
## 662        2       4     1        0       2        3            4      2    0
## 663        2       4     1        0       2        3            4      2    0
## 664        2       4     1        0       2        3            4      2    0
## 665        2       4     1        0       2        3            4      2    0
## 666        2       4     1        0       2        3            4      2    0
## 667        2       4     1        0       2        3            4      2    0
## 668        2       4     1        0       2        3            4      2    0
## 669        2       4     1        0       2        3            4      2    0
## 670        2       4     1        0       2        3            4      2    0
## 671        2       4     1        0       2        3            4      2    0
## 672        2       4     1        0       2        3            4      2    0
## 673        2       3     1        1       2        3            4      4    0
## 674        2       3     1        1       2        3            4      4    0
## 675        2       3     1        1       2        3            4      4    0
## 676        2       3     1        1       2        3            4      4    0
## 677        2       3     1        1       2        3            4      4    0
## 678        2       3     1        1       2        3            4      4    0
## 679        2       3     1        1       2        3            4      4    0
## 680        2       3     1        1       2        3            4      4    0
## 681        2       3     1        1       2        3            4      4    0
## 682        2       3     1        1       2        3            4      4    0
## 683        2       3     1        1       2        3            4      4    0
## 684        2       3     1        1       2        3            4      4    0
## 685        2       3     1        1       2        3            4      4    0
## 686        2       3     1        1       2        3            4      4    0
## 687        2       3     1        1       2        3            4      4    0
## 688        2       3     1        1       2        3            4      4    0
## 689        3       5     1        1       1        1            3      2    0
## 690        3       5     1        1       1        1            3      2    0
## 691        3       5     1        1       1        1            3      2    0
## 692        3       5     1        1       1        1            3      2    0
## 693        3       5     1        1       1        1            3      2    0
## 694        3       5     1        1       1        1            3      2    0
## 695        3       5     1        1       1        1            3      2    0
## 696        3       5     1        1       1        1            3      2    0
## 697        3       5     1        1       1        1            3      2    0
## 698        3       5     1        1       1        1            3      2    0
## 699        3       5     1        1       1        1            3      2    0
## 700        3       5     1        1       1        1            3      2    0
## 701        3       5     1        1       1        1            3      2    0
## 702        3       5     1        1       1        1            3      2    0
## 703        3       5     1        1       1        1            3      2    0
## 704        3       5     1        1       1        1            3      2    0
## 705        2       3     1        1       1        1            4      5    1
## 706        2       3     1        1       1        1            4      5    1
## 707        2       3     1        1       1        1            4      5    1
## 708        2       3     1        1       1        1            4      5    1
## 709        2       3     1        1       1        1            4      5    1
## 710        2       3     1        1       1        1            4      5    1
## 711        2       3     1        1       1        1            4      5    1
## 712        2       3     1        1       1        1            4      5    1
## 713        2       3     1        1       1        1            4      5    1
## 714        2       3     1        1       1        1            4      5    1
## 715        2       3     1        1       1        1            4      5    1
## 716        2       3     1        1       1        1            4      5    1
## 717        2       3     1        1       1        1            4      5    1
## 718        2       3     1        1       1        1            4      5    1
## 719        2       3     1        1       1        1            4      5    1
## 720        2       3     1        1       1        1            4      5    1
## 721        2       3     1        1       1        1            3      4    0
## 722        2       3     1        1       1        1            3      4    0
## 723        2       3     1        1       1        1            3      4    0
## 724        2       3     1        1       1        1            3      4    0
## 725        2       3     1        1       1        1            3      4    0
## 726        2       3     1        1       1        1            3      4    0
## 727        2       3     1        1       1        1            3      4    0
## 728        2       3     1        1       1        1            3      4    0
## 729        2       3     1        1       1        1            3      4    0
## 730        2       3     1        1       1        1            3      4    0
## 731        2       3     1        1       1        1            3      4    0
## 732        2       3     1        1       1        1            3      4    0
## 733        2       3     1        1       1        1            3      4    0
## 734        2       3     1        1       1        1            3      4    0
## 735        2       3     1        1       1        1            3      4    0
## 736        2       3     1        1       1        1            3      4    0
## 737        2       3     1        1       1        1            4      2    0
## 738        2       3     1        1       1        1            4      2    0
## 739        2       3     1        1       1        1            4      2    0
## 740        2       3     1        1       1        1            4      2    0
## 741        2       3     1        1       1        1            4      2    0
## 742        2       3     1        1       1        1            4      2    0
## 743        2       3     1        1       1        1            4      2    0
## 744        2       3     1        1       1        1            4      2    0
## 745        2       3     1        1       1        1            4      2    0
## 746        2       3     1        1       1        1            4      2    0
## 747        2       3     1        1       1        1            4      2    0
## 748        2       3     1        1       1        1            4      2    0
## 749        2       3     1        1       1        1            4      2    0
## 750        2       3     1        1       1        1            4      2    0
## 751        2       3     1        1       1        1            4      2    0
## 752        2       3     1        1       1        1            4      2    0
## 753        2       4     1        1       2        1            4      2    0
## 754        2       4     1        1       2        1            4      2    0
## 755        2       4     1        1       2        1            4      2    0
## 756        2       4     1        1       2        1            4      2    0
## 757        2       4     1        1       2        1            4      2    0
## 758        2       4     1        1       2        1            4      2    0
## 759        2       4     1        1       2        1            4      2    0
## 760        2       4     1        1       2        1            4      2    0
## 761        2       4     1        1       2        1            4      2    0
## 762        2       4     1        1       2        1            4      2    0
## 763        2       4     1        1       2        1            4      2    0
## 764        2       4     1        1       2        1            4      2    0
## 765        2       4     1        1       2        1            4      2    0
## 766        2       4     1        1       2        1            4      2    0
## 767        2       4     1        1       2        1            4      2    0
## 768        2       4     1        1       2        1            4      2    0
## 769        4       8     1        1       1        1            4      3    0
## 770        4       8     1        1       1        1            4      3    0
## 771        4       8     1        1       1        1            4      3    0
## 772        4       8     1        1       1        1            4      3    0
## 773        4       8     1        1       1        1            4      3    0
## 774        4       8     1        1       1        1            4      3    0
## 775        4       8     1        1       1        1            4      3    0
## 776        4       8     1        1       1        1            4      3    0
## 777        4       8     1        1       1        1            4      3    0
## 778        4       8     1        1       1        1            4      3    0
## 779        4       8     1        1       1        1            4      3    0
## 780        4       8     1        1       1        1            4      3    0
## 781        4       8     1        1       1        1            4      3    0
## 782        4       8     1        1       1        1            4      3    0
## 783        4       8     1        1       1        1            4      3    0
## 784        4       8     1        1       1        1            4      3    0
## 785        4       9     1        1       2        3            4      3    1
## 786        4       9     1        1       2        3            4      3    1
## 787        4       9     1        1       2        3            4      3    1
## 788        4       9     1        1       2        3            4      3    1
## 789        4       9     1        1       2        3            4      3    1
## 790        4       9     1        1       2        3            4      3    1
## 791        4       9     1        1       2        3            4      3    1
## 792        4       9     1        1       2        3            4      3    1
## 793        4       9     1        1       2        3            4      3    1
## 794        4       9     1        1       2        3            4      3    1
## 795        4       9     1        1       2        3            4      3    1
## 796        4       9     1        1       2        3            4      3    1
## 797        4       9     1        1       2        3            4      3    1
## 798        4       9     1        1       2        3            4      3    1
## 799        4       9     1        1       2        3            4      3    1
## 800        4       9     1        1       2        3            4      3    1
## 801        4       8     0        1       1        1            4      1    0
## 802        4       8     0        1       1        1            4      1    0
## 803        4       8     0        1       1        1            4      1    0
## 804        4       8     0        1       1        1            4      1    0
## 805        4       8     0        1       1        1            4      1    0
## 806        4       8     0        1       1        1            4      1    0
## 807        4       8     0        1       1        1            4      1    0
## 808        4       8     0        1       1        1            4      1    0
## 809        4       8     0        1       1        1            4      1    0
## 810        4       8     0        1       1        1            4      1    0
## 811        4       8     0        1       1        1            4      1    0
## 812        4       8     0        1       1        1            4      1    0
## 813        4       8     0        1       1        1            4      1    0
## 814        4       8     0        1       1        1            4      1    0
## 815        4       8     0        1       1        1            4      1    0
## 816        4       8     0        1       1        1            4      1    0
## 817        2       4     1        1       1        1            4      2    0
## 818        2       4     1        1       1        1            4      2    0
## 819        2       4     1        1       1        1            4      2    0
## 820        2       4     1        1       1        1            4      2    0
## 821        2       4     1        1       1        1            4      2    0
## 822        2       4     1        1       1        1            4      2    0
## 823        2       4     1        1       1        1            4      2    0
## 824        2       4     1        1       1        1            4      2    0
## 825        2       4     1        1       1        1            4      2    0
## 826        2       4     1        1       1        1            4      2    0
## 827        2       4     1        1       1        1            4      2    0
## 828        2       4     1        1       1        1            4      2    0
## 829        2       4     1        1       1        1            4      2    0
## 830        2       4     1        1       1        1            4      2    0
## 831        2       4     1        1       1        1            4      2    0
## 832        2       4     1        1       1        1            4      2    0
## 833        4       9     0        1       1        1            2      2    0
## 834        4       9     0        1       1        1            2      2    0
## 835        4       9     0        1       1        1            2      2    0
## 836        4       9     0        1       1        1            2      2    0
## 837        4       9     0        1       1        1            2      2    0
## 838        4       9     0        1       1        1            2      2    0
## 839        4       9     0        1       1        1            2      2    0
## 840        4       9     0        1       1        1            2      2    0
## 841        4       9     0        1       1        1            2      2    0
## 842        4       9     0        1       1        1            2      2    0
## 843        4       9     0        1       1        1            2      2    0
## 844        4       9     0        1       1        1            2      2    0
## 845        4       9     0        1       1        1            2      2    0
## 846        4       9     0        1       1        1            2      2    0
## 847        4       9     0        1       1        1            2      2    0
## 848        4       9     0        1       1        1            2      2    0
## 849        3       5     1        1       1        1            4      2    0
## 850        3       5     1        1       1        1            4      2    0
## 851        3       5     1        1       1        1            4      2    0
## 852        3       5     1        1       1        1            4      2    0
## 853        3       5     1        1       1        1            4      2    0
## 854        3       5     1        1       1        1            4      2    0
## 855        3       5     1        1       1        1            4      2    0
## 856        3       5     1        1       1        1            4      2    0
## 857        3       5     1        1       1        1            4      2    0
## 858        3       5     1        1       1        1            4      2    0
## 859        3       5     1        1       1        1            4      2    0
## 860        3       5     1        1       1        1            4      2    0
## 861        3       5     1        1       1        1            4      2    0
## 862        3       5     1        1       1        1            4      2    0
## 863        3       5     1        1       1        1            4      2    0
## 864        3       5     1        1       1        1            4      2    0
## 865        3       5     1        1       1        1            3      1    0
## 866        3       5     1        1       1        1            3      1    0
## 867        3       5     1        1       1        1            3      1    0
## 868        3       5     1        1       1        1            3      1    0
## 869        3       5     1        1       1        1            3      1    0
## 870        3       5     1        1       1        1            3      1    0
## 871        3       5     1        1       1        1            3      1    0
## 872        3       5     1        1       1        1            3      1    0
## 873        3       5     1        1       1        1            3      1    0
## 874        3       5     1        1       1        1            3      1    0
## 875        3       5     1        1       1        1            3      1    0
## 876        3       5     1        1       1        1            3      1    0
## 877        3       5     1        1       1        1            3      1    0
## 878        3       5     1        1       1        1            3      1    0
## 879        3       5     1        1       1        1            3      1    0
## 880        3       5     1        1       1        1            3      1    0
## 881        3       7     1        1       1        2            4      4    0
## 882        3       7     1        1       1        2            4      4    0
## 883        3       7     1        1       1        2            4      4    0
## 884        3       7     1        1       1        2            4      4    0
## 885        3       7     1        1       1        2            4      4    0
## 886        3       7     1        1       1        2            4      4    0
## 887        3       7     1        1       1        2            4      4    0
## 888        3       7     1        1       1        2            4      4    0
## 889        3       7     1        1       1        2            4      4    0
## 890        3       7     1        1       1        2            4      4    0
## 891        3       7     1        1       1        2            4      4    0
## 892        3       7     1        1       1        2            4      4    0
## 893        3       7     1        1       1        2            4      4    0
## 894        3       7     1        1       1        2            4      4    0
## 895        3       7     1        1       1        2            4      4    0
## 896        3       7     1        1       1        2            4      4    0
## 897        3       6     1        1       2        3            4      1    0
## 898        3       6     1        1       2        3            4      1    0
## 899        3       6     1        1       2        3            4      1    0
## 900        3       6     1        1       2        3            4      1    0
## 901        3       6     1        1       2        3            4      1    0
## 902        3       6     1        1       2        3            4      1    0
## 903        3       6     1        1       2        3            4      1    0
## 904        3       6     1        1       2        3            4      1    0
## 905        3       6     1        1       2        3            4      1    0
## 906        3       6     1        1       2        3            4      1    0
## 907        3       6     1        1       2        3            4      1    0
## 908        3       6     1        1       2        3            4      1    0
## 909        3       6     1        1       2        3            4      1    0
## 910        3       6     1        1       2        3            4      1    0
## 911        3       6     1        1       2        3            4      1    0
## 912        3       6     1        1       2        3            4      1    0
## 913        4       8     1        1       2        3            4      3    0
## 914        4       8     1        1       2        3            4      3    0
## 915        4       8     1        1       2        3            4      3    0
## 916        4       8     1        1       2        3            4      3    0
## 917        4       8     1        1       2        3            4      3    0
## 918        4       8     1        1       2        3            4      3    0
## 919        4       8     1        1       2        3            4      3    0
## 920        4       8     1        1       2        3            4      3    0
## 921        4       8     1        1       2        3            4      3    0
## 922        4       8     1        1       2        3            4      3    0
## 923        4       8     1        1       2        3            4      3    0
## 924        4       8     1        1       2        3            4      3    0
## 925        4       8     1        1       2        3            4      3    0
## 926        4       8     1        1       2        3            4      3    0
## 927        4       8     1        1       2        3            4      3    0
## 928        4       8     1        1       2        3            4      3    0
## 929        1       2     1        1       1        1            1      6    0
## 930        1       2     1        1       1        1            1      6    0
## 931        1       2     1        1       1        1            1      6    0
## 932        1       2     1        1       1        1            1      6    0
## 933        1       2     1        1       1        1            1      6    0
## 934        1       2     1        1       1        1            1      6    0
## 935        1       2     1        1       1        1            1      6    0
## 936        1       2     1        1       1        1            1      6    0
## 937        1       2     1        1       1        1            1      6    0
## 938        1       2     1        1       1        1            1      6    0
## 939        1       2     1        1       1        1            1      6    0
## 940        1       2     1        1       1        1            1      6    0
## 941        1       2     1        1       1        1            1      6    0
## 942        1       2     1        1       1        1            1      6    0
## 943        1       2     1        1       1        1            1      6    0
## 944        1       2     1        1       1        1            1      6    0
## 945        2       4     0        1       1        1            4      3    0
## 946        2       4     0        1       1        1            4      3    0
## 947        2       4     0        1       1        1            4      3    0
## 948        2       4     0        1       1        1            4      3    0
## 949        2       4     0        1       1        1            4      3    0
## 950        2       4     0        1       1        1            4      3    0
## 951        2       4     0        1       1        1            4      3    0
## 952        2       4     0        1       1        1            4      3    0
## 953        2       4     0        1       1        1            4      3    0
## 954        2       4     0        1       1        1            4      3    0
## 955        2       4     0        1       1        1            4      3    0
## 956        2       4     0        1       1        1            4      3    0
## 957        2       4     0        1       1        1            4      3    0
## 958        2       4     0        1       1        1            4      3    0
## 959        2       4     0        1       1        1            4      3    0
## 960        2       4     0        1       1        1            4      3    0
## 961        2       4     1        1       1        1            4      1    0
## 962        2       4     1        1       1        1            4      1    0
## 963        2       4     1        1       1        1            4      1    0
## 964        2       4     1        1       1        1            4      1    0
## 965        2       4     1        1       1        1            4      1    0
## 966        2       4     1        1       1        1            4      1    0
## 967        2       4     1        1       1        1            4      1    0
## 968        2       4     1        1       1        1            4      1    0
## 969        2       4     1        1       1        1            4      1    0
## 970        2       4     1        1       1        1            4      1    0
## 971        2       4     1        1       1        1            4      1    0
## 972        2       4     1        1       1        1            4      1    0
## 973        2       4     1        1       1        1            4      1    0
## 974        2       4     1        1       1        1            4      1    0
## 975        2       4     1        1       1        1            4      1    0
## 976        2       4     1        1       1        1            4      1    0
## 977        3       5     1        1       1        1            3      6    0
## 978        3       5     1        1       1        1            3      6    0
## 979        3       5     1        1       1        1            3      6    0
## 980        3       5     1        1       1        1            3      6    0
## 981        3       5     1        1       1        1            3      6    0
## 982        3       5     1        1       1        1            3      6    0
## 983        3       5     1        1       1        1            3      6    0
## 984        3       5     1        1       1        1            3      6    0
## 985        3       5     1        1       1        1            3      6    0
## 986        3       5     1        1       1        1            3      6    0
## 987        3       5     1        1       1        1            3      6    0
## 988        3       5     1        1       1        1            3      6    0
## 989        3       5     1        1       1        1            3      6    0
## 990        3       5     1        1       1        1            3      6    0
## 991        3       5     1        1       1        1            3      6    0
## 992        3       5     1        1       1        1            3      6    0
## 993        4       9     1        1       1        1            3      4    0
## 994        4       9     1        1       1        1            3      4    0
## 995        4       9     1        1       1        1            3      4    0
## 996        4       9     1        1       1        1            3      4    0
## 997        4       9     1        1       1        1            3      4    0
## 998        4       9     1        1       1        1            3      4    0
## 999        4       9     1        1       1        1            3      4    0
## 1000       4       9     1        1       1        1            3      4    0
## 1001       4       9     1        1       1        1            3      4    0
## 1002       4       9     1        1       1        1            3      4    0
## 1003       4       9     1        1       1        1            3      4    0
## 1004       4       9     1        1       1        1            3      4    0
## 1005       4       9     1        1       1        1            3      4    0
## 1006       4       9     1        1       1        1            3      4    0
## 1007       4       9     1        1       1        1            3      4    0
## 1008       4       9     1        1       1        1            3      4    0
## 1009       3       5     1        1       1        1            4      5    0
## 1010       3       5     1        1       1        1            4      5    0
## 1011       3       5     1        1       1        1            4      5    0
## 1012       3       5     1        1       1        1            4      5    0
## 1013       3       5     1        1       1        1            4      5    0
## 1014       3       5     1        1       1        1            4      5    0
## 1015       3       5     1        1       1        1            4      5    0
## 1016       3       5     1        1       1        1            4      5    0
## 1017       3       5     1        1       1        1            4      5    0
## 1018       3       5     1        1       1        1            4      5    0
## 1019       3       5     1        1       1        1            4      5    0
## 1020       3       5     1        1       1        1            4      5    0
## 1021       3       5     1        1       1        1            4      5    0
## 1022       3       5     1        1       1        1            4      5    0
## 1023       3       5     1        1       1        1            4      5    0
## 1024       3       5     1        1       1        1            4      5    0
## 1025       3       7     1        1       1        1            4      3    0
## 1026       3       7     1        1       1        1            4      3    0
## 1027       3       7     1        1       1        1            4      3    0
## 1028       3       7     1        1       1        1            4      3    0
## 1029       3       7     1        1       1        1            4      3    0
## 1030       3       7     1        1       1        1            4      3    0
## 1031       3       7     1        1       1        1            4      3    0
## 1032       3       7     1        1       1        1            4      3    0
## 1033       3       7     1        1       1        1            4      3    0
## 1034       3       7     1        1       1        1            4      3    0
## 1035       3       7     1        1       1        1            4      3    0
## 1036       3       7     1        1       1        1            4      3    0
## 1037       3       7     1        1       1        1            4      3    0
## 1038       3       7     1        1       1        1            4      3    0
## 1039       3       7     1        1       1        1            4      3    0
## 1040       3       7     1        1       1        1            4      3    0
## 1041       3       5     1        1       1        1            4      1    0
## 1042       3       5     1        1       1        1            4      1    0
## 1043       3       5     1        1       1        1            4      1    0
## 1044       3       5     1        1       1        1            4      1    0
## 1045       3       5     1        1       1        1            4      1    0
## 1046       3       5     1        1       1        1            4      1    0
## 1047       3       5     1        1       1        1            4      1    0
## 1048       3       5     1        1       1        1            4      1    0
## 1049       3       5     1        1       1        1            4      1    0
## 1050       3       5     1        1       1        1            4      1    0
## 1051       3       5     1        1       1        1            4      1    0
## 1052       3       5     1        1       1        1            4      1    0
## 1053       3       5     1        1       1        1            4      1    0
## 1054       3       5     1        1       1        1            4      1    0
## 1055       3       5     1        1       1        1            4      1    0
## 1056       3       5     1        1       1        1            4      1    0
## 1057       2       3     1        1       1        1            4      5    0
## 1058       2       3     1        1       1        1            4      5    0
## 1059       2       3     1        1       1        1            4      5    0
## 1060       2       3     1        1       1        1            4      5    0
## 1061       2       3     1        1       1        1            4      5    0
## 1062       2       3     1        1       1        1            4      5    0
## 1063       2       3     1        1       1        1            4      5    0
## 1064       2       3     1        1       1        1            4      5    0
## 1065       2       3     1        1       1        1            4      5    0
## 1066       2       3     1        1       1        1            4      5    0
## 1067       2       3     1        1       1        1            4      5    0
## 1068       2       3     1        1       1        1            4      5    0
## 1069       2       3     1        1       1        1            4      5    0
## 1070       2       3     1        1       1        1            4      5    0
## 1071       2       3     1        1       1        1            4      5    0
## 1072       2       3     1        1       1        1            4      5    0
## 1073       4       8     1        1       1        1            4      4    1
## 1074       4       8     1        1       1        1            4      4    1
## 1075       4       8     1        1       1        1            4      4    1
## 1076       4       8     1        1       1        1            4      4    1
## 1077       4       8     1        1       1        1            4      4    1
## 1078       4       8     1        1       1        1            4      4    1
## 1079       4       8     1        1       1        1            4      4    1
## 1080       4       8     1        1       1        1            4      4    1
## 1081       4       8     1        1       1        1            4      4    1
## 1082       4       8     1        1       1        1            4      4    1
## 1083       4       8     1        1       1        1            4      4    1
## 1084       4       8     1        1       1        1            4      4    1
## 1085       4       8     1        1       1        1            4      4    1
## 1086       4       8     1        1       1        1            4      4    1
## 1087       4       8     1        1       1        1            4      4    1
## 1088       4       8     1        1       1        1            4      4    1
## 1089       3       6     0        0       1        1            4      2    0
## 1090       3       6     0        0       1        1            4      2    0
## 1091       3       6     0        0       1        1            4      2    0
## 1092       3       6     0        0       1        1            4      2    0
## 1093       3       6     0        0       1        1            4      2    0
## 1094       3       6     0        0       1        1            4      2    0
## 1095       3       6     0        0       1        1            4      2    0
## 1096       3       6     0        0       1        1            4      2    0
## 1097       3       6     0        0       1        1            4      2    0
## 1098       3       6     0        0       1        1            4      2    0
## 1099       3       6     0        0       1        1            4      2    0
## 1100       3       6     0        0       1        1            4      2    0
## 1101       3       6     0        0       1        1            4      2    0
## 1102       3       6     0        0       1        1            4      2    0
## 1103       3       6     0        0       1        1            4      2    0
## 1104       3       6     0        0       1        1            4      2    0
## 1105       3       6     1        1       2        3            2      2    0
## 1106       3       6     1        1       2        3            2      2    0
## 1107       3       6     1        1       2        3            2      2    0
## 1108       3       6     1        1       2        3            2      2    0
## 1109       3       6     1        1       2        3            2      2    0
## 1110       3       6     1        1       2        3            2      2    0
## 1111       3       6     1        1       2        3            2      2    0
## 1112       3       6     1        1       2        3            2      2    0
## 1113       3       6     1        1       2        3            2      2    0
## 1114       3       6     1        1       2        3            2      2    0
## 1115       3       6     1        1       2        3            2      2    0
## 1116       3       6     1        1       2        3            2      2    0
## 1117       3       6     1        1       2        3            2      2    0
## 1118       3       6     1        1       2        3            2      2    0
## 1119       3       6     1        1       2        3            2      2    0
## 1120       3       6     1        1       2        3            2      2    0
## 1121       3       5     1        1       1        1            3      2    0
## 1122       3       5     1        1       1        1            3      2    0
## 1123       3       5     1        1       1        1            3      2    0
## 1124       3       5     1        1       1        1            3      2    0
## 1125       3       5     1        1       1        1            3      2    0
## 1126       3       5     1        1       1        1            3      2    0
## 1127       3       5     1        1       1        1            3      2    0
## 1128       3       5     1        1       1        1            3      2    0
## 1129       3       5     1        1       1        1            3      2    0
## 1130       3       5     1        1       1        1            3      2    0
## 1131       3       5     1        1       1        1            3      2    0
## 1132       3       5     1        1       1        1            3      2    0
## 1133       3       5     1        1       1        1            3      2    0
## 1134       3       5     1        1       1        1            3      2    0
## 1135       3       5     1        1       1        1            3      2    0
## 1136       3       5     1        1       1        1            3      2    0
## 1137       2       3     1        1       1        1            3      6    0
## 1138       2       3     1        1       1        1            3      6    0
## 1139       2       3     1        1       1        1            3      6    0
## 1140       2       3     1        1       1        1            3      6    0
## 1141       2       3     1        1       1        1            3      6    0
## 1142       2       3     1        1       1        1            3      6    0
## 1143       2       3     1        1       1        1            3      6    0
## 1144       2       3     1        1       1        1            3      6    0
## 1145       2       3     1        1       1        1            3      6    0
## 1146       2       3     1        1       1        1            3      6    0
## 1147       2       3     1        1       1        1            3      6    0
## 1148       2       3     1        1       1        1            3      6    0
## 1149       2       3     1        1       1        1            3      6    0
## 1150       2       3     1        1       1        1            3      6    0
## 1151       2       3     1        1       1        1            3      6    0
## 1152       2       3     1        1       1        1            3      6    0
## 1153       1       2     1        1       1        2            3      2    0
## 1154       1       2     1        1       1        2            3      2    0
## 1155       1       2     1        1       1        2            3      2    0
## 1156       1       2     1        1       1        2            3      2    0
## 1157       1       2     1        1       1        2            3      2    0
## 1158       1       2     1        1       1        2            3      2    0
## 1159       1       2     1        1       1        2            3      2    0
## 1160       1       2     1        1       1        2            3      2    0
## 1161       1       2     1        1       1        2            3      2    0
## 1162       1       2     1        1       1        2            3      2    0
## 1163       1       2     1        1       1        2            3      2    0
## 1164       1       2     1        1       1        2            3      2    0
## 1165       1       2     1        1       1        2            3      2    0
## 1166       1       2     1        1       1        2            3      2    0
## 1167       1       2     1        1       1        2            3      2    0
## 1168       1       2     1        1       1        2            3      2    0
## 1169       2       3     1        1       1        1            4      2    0
## 1170       2       3     1        1       1        1            4      2    0
## 1171       2       3     1        1       1        1            4      2    0
## 1172       2       3     1        1       1        1            4      2    0
## 1173       2       3     1        1       1        1            4      2    0
## 1174       2       3     1        1       1        1            4      2    0
## 1175       2       3     1        1       1        1            4      2    0
## 1176       2       3     1        1       1        1            4      2    0
## 1177       2       3     1        1       1        1            4      2    0
## 1178       2       3     1        1       1        1            4      2    0
## 1179       2       3     1        1       1        1            4      2    0
## 1180       2       3     1        1       1        1            4      2    0
## 1181       2       3     1        1       1        1            4      2    0
## 1182       2       3     1        1       1        1            4      2    0
## 1183       2       3     1        1       1        1            4      2    0
## 1184       2       3     1        1       1        1            4      2    0
## 1185       2       3     1        1       1        1            3      2    0
## 1186       2       3     1        1       1        1            3      2    0
## 1187       2       3     1        1       1        1            3      2    0
## 1188       2       3     1        1       1        1            3      2    0
## 1189       2       3     1        1       1        1            3      2    0
## 1190       2       3     1        1       1        1            3      2    0
## 1191       2       3     1        1       1        1            3      2    0
## 1192       2       3     1        1       1        1            3      2    0
## 1193       2       3     1        1       1        1            3      2    0
## 1194       2       3     1        1       1        1            3      2    0
## 1195       2       3     1        1       1        1            3      2    0
## 1196       2       3     1        1       1        1            3      2    0
## 1197       2       3     1        1       1        1            3      2    0
## 1198       2       3     1        1       1        1            3      2    0
## 1199       2       3     1        1       1        1            3      2    0
## 1200       2       3     1        1       1        1            3      2    0
## 1201       2       4     1        1       1        1            4      2    0
## 1202       2       4     1        1       1        1            4      2    0
## 1203       2       4     1        1       1        1            4      2    0
## 1204       2       4     1        1       1        1            4      2    0
## 1205       2       4     1        1       1        1            4      2    0
## 1206       2       4     1        1       1        1            4      2    0
## 1207       2       4     1        1       1        1            4      2    0
## 1208       2       4     1        1       1        1            4      2    0
## 1209       2       4     1        1       1        1            4      2    0
## 1210       2       4     1        1       1        1            4      2    0
## 1211       2       4     1        1       1        1            4      2    0
## 1212       2       4     1        1       1        1            4      2    0
## 1213       2       4     1        1       1        1            4      2    0
## 1214       2       4     1        1       1        1            4      2    0
## 1215       2       4     1        1       1        1            4      2    0
## 1216       2       4     1        1       1        1            4      2    0
## 1217       4       9     1        1       1        1            1      1    0
## 1218       4       9     1        1       1        1            1      1    0
## 1219       4       9     1        1       1        1            1      1    0
## 1220       4       9     1        1       1        1            1      1    0
## 1221       4       9     1        1       1        1            1      1    0
## 1222       4       9     1        1       1        1            1      1    0
## 1223       4       9     1        1       1        1            1      1    0
## 1224       4       9     1        1       1        1            1      1    0
## 1225       4       9     1        1       1        1            1      1    0
## 1226       4       9     1        1       1        1            1      1    0
## 1227       4       9     1        1       1        1            1      1    0
## 1228       4       9     1        1       1        1            1      1    0
## 1229       4       9     1        1       1        1            1      1    0
## 1230       4       9     1        1       1        1            1      1    0
## 1231       4       9     1        1       1        1            1      1    0
## 1232       4       9     1        1       1        1            1      1    0
## 1233       3       5     0        1       1        1            4      6    0
## 1234       3       5     0        1       1        1            4      6    0
## 1235       3       5     0        1       1        1            4      6    0
## 1236       3       5     0        1       1        1            4      6    0
## 1237       3       5     0        1       1        1            4      6    0
## 1238       3       5     0        1       1        1            4      6    0
## 1239       3       5     0        1       1        1            4      6    0
## 1240       3       5     0        1       1        1            4      6    0
## 1241       3       5     0        1       1        1            4      6    0
## 1242       3       5     0        1       1        1            4      6    0
## 1243       3       5     0        1       1        1            4      6    0
## 1244       3       5     0        1       1        1            4      6    0
## 1245       3       5     0        1       1        1            4      6    0
## 1246       3       5     0        1       1        1            4      6    0
## 1247       3       5     0        1       1        1            4      6    0
## 1248       3       5     0        1       1        1            4      6    0
## 1249       3       5     1        1       1        1            4      1    0
## 1250       3       5     1        1       1        1            4      1    0
## 1251       3       5     1        1       1        1            4      1    0
## 1252       3       5     1        1       1        1            4      1    0
## 1253       3       5     1        1       1        1            4      1    0
## 1254       3       5     1        1       1        1            4      1    0
## 1255       3       5     1        1       1        1            4      1    0
## 1256       3       5     1        1       1        1            4      1    0
## 1257       3       5     1        1       1        1            4      1    0
## 1258       3       5     1        1       1        1            4      1    0
## 1259       3       5     1        1       1        1            4      1    0
## 1260       3       5     1        1       1        1            4      1    0
## 1261       3       5     1        1       1        1            4      1    0
## 1262       3       5     1        1       1        1            4      1    0
## 1263       3       5     1        1       1        1            4      1    0
## 1264       3       5     1        1       1        1            4      1    0
## 1265       1       1     1        1       2        3            4      1    0
## 1266       1       1     1        1       2        3            4      1    0
## 1267       1       1     1        1       2        3            4      1    0
## 1268       1       1     1        1       2        3            4      1    0
## 1269       1       1     1        1       2        3            4      1    0
## 1270       1       1     1        1       2        3            4      1    0
## 1271       1       1     1        1       2        3            4      1    0
## 1272       1       1     1        1       2        3            4      1    0
## 1273       1       1     1        1       2        3            4      1    0
## 1274       1       1     1        1       2        3            4      1    0
## 1275       1       1     1        1       2        3            4      1    0
## 1276       1       1     1        1       2        3            4      1    0
## 1277       1       1     1        1       2        3            4      1    0
## 1278       1       1     1        1       2        3            4      1    0
## 1279       1       1     1        1       2        3            4      1    0
## 1280       1       1     1        1       2        3            4      1    0
## 1281       3       7     1        1       1        1            3      4    0
## 1282       3       7     1        1       1        1            3      4    0
## 1283       3       7     1        1       1        1            3      4    0
## 1284       3       7     1        1       1        1            3      4    0
## 1285       3       7     1        1       1        1            3      4    0
## 1286       3       7     1        1       1        1            3      4    0
## 1287       3       7     1        1       1        1            3      4    0
## 1288       3       7     1        1       1        1            3      4    0
## 1289       3       7     1        1       1        1            3      4    0
## 1290       3       7     1        1       1        1            3      4    0
## 1291       3       7     1        1       1        1            3      4    0
## 1292       3       7     1        1       1        1            3      4    0
## 1293       3       7     1        1       1        1            3      4    0
## 1294       3       7     1        1       1        1            3      4    0
## 1295       3       7     1        1       1        1            3      4    0
## 1296       3       7     1        1       1        1            3      4    0
## 1297       1       1     1        1       2        3            4      3    0
## 1298       1       1     1        1       2        3            4      3    0
## 1299       1       1     1        1       2        3            4      3    0
## 1300       1       1     1        1       2        3            4      3    0
## 1301       1       1     1        1       2        3            4      3    0
## 1302       1       1     1        1       2        3            4      3    0
## 1303       1       1     1        1       2        3            4      3    0
## 1304       1       1     1        1       2        3            4      3    0
## 1305       1       1     1        1       2        3            4      3    0
## 1306       1       1     1        1       2        3            4      3    0
## 1307       1       1     1        1       2        3            4      3    0
## 1308       1       1     1        1       2        3            4      3    0
## 1309       1       1     1        1       2        3            4      3    0
## 1310       1       1     1        1       2        3            4      3    0
## 1311       1       1     1        1       2        3            4      3    0
## 1312       1       1     1        1       2        3            4      3    0
## 1313       3       5     1        1       1        1            4      2    0
## 1314       3       5     1        1       1        1            4      2    0
## 1315       3       5     1        1       1        1            4      2    0
##      HH25 HH612 HH1317 HH18OV Secularism1flipped Secularism2flipped
## 1       0     0      0      2                  6                  3
## 2       0     0      0      2                  6                  3
## 3       0     0      0      2                  6                  3
## 4       0     0      0      2                  6                  3
## 5       0     0      0      2                  6                  3
## 6       0     0      0      2                  6                  3
## 7       0     0      0      2                  6                  3
## 8       0     0      0      2                  6                  3
## 9       0     0      0      2                  6                  3
## 10      0     0      0      2                  6                  3
## 11      0     0      0      2                  6                  3
## 12      0     0      0      2                  6                  3
## 13      0     0      0      2                  6                  3
## 14      0     0      0      2                  6                  3
## 15      0     0      0      2                  6                  3
## 16      0     0      0      2                  6                  3
## 17      0     0      0      3                  7                  7
## 18      0     0      0      3                  7                  7
## 19      0     0      0      3                  7                  7
## 20      0     0      0      3                  7                  7
## 21      0     0      0      3                  7                  7
## 22      0     0      0      3                  7                  7
## 23      0     0      0      3                  7                  7
## 24      0     0      0      3                  7                  7
## 25      0     0      0      3                  7                  7
## 26      0     0      0      3                  7                  7
## 27      0     0      0      3                  7                  7
## 28      0     0      0      3                  7                  7
## 29      0     0      0      3                  7                  7
## 30      0     0      0      3                  7                  7
## 31      0     0      0      3                  7                  7
## 32      0     0      0      3                  7                  7
## 33      1     0      0      1                  4                  4
## 34      1     0      0      1                  4                  4
## 35      1     0      0      1                  4                  4
## 36      1     0      0      1                  4                  4
## 37      1     0      0      1                  4                  4
## 38      1     0      0      1                  4                  4
## 39      1     0      0      1                  4                  4
## 40      1     0      0      1                  4                  4
## 41      1     0      0      1                  4                  4
## 42      1     0      0      1                  4                  4
## 43      1     0      0      1                  4                  4
## 44      1     0      0      1                  4                  4
## 45      1     0      0      1                  4                  4
## 46      1     0      0      1                  4                  4
## 47      1     0      0      1                  4                  4
## 48      1     0      0      1                  4                  4
## 49      0     0      0      2                  1                 NA
## 50      0     0      0      2                  1                 NA
## 51      0     0      0      2                  1                 NA
## 52      0     0      0      2                  1                 NA
## 53      0     0      0      2                  1                 NA
## 54      0     0      0      2                  1                 NA
## 55      0     0      0      2                  1                 NA
## 56      0     0      0      2                  1                 NA
## 57      0     0      0      2                  1                 NA
## 58      0     0      0      2                  1                 NA
## 59      0     0      0      2                  1                 NA
## 60      0     0      0      2                  1                 NA
## 61      0     0      0      2                  1                 NA
## 62      0     0      0      2                  1                 NA
## 63      0     0      0      2                  1                 NA
## 64      0     0      0      2                  1                 NA
## 65      0     0      0      2                  7                  6
## 66      0     0      0      2                  7                  6
## 67      0     0      0      2                  7                  6
## 68      0     0      0      2                  7                  6
## 69      0     0      0      2                  7                  6
## 70      0     0      0      2                  7                  6
## 71      0     0      0      2                  7                  6
## 72      0     0      0      2                  7                  6
## 73      0     0      0      2                  7                  6
## 74      0     0      0      2                  7                  6
## 75      0     0      0      2                  7                  6
## 76      0     0      0      2                  7                  6
## 77      0     0      0      2                  7                  6
## 78      0     0      0      2                  7                  6
## 79      0     0      0      2                  7                  6
## 80      0     0      0      2                  7                  6
## 81      0     0      0      1                  3                  6
## 82      0     0      0      1                  3                  6
## 83      0     0      0      1                  3                  6
## 84      0     0      0      1                  3                  6
## 85      0     0      0      1                  3                  6
## 86      0     0      0      1                  3                  6
## 87      0     0      0      1                  3                  6
## 88      0     0      0      1                  3                  6
## 89      0     0      0      1                  3                  6
## 90      0     0      0      1                  3                  6
## 91      0     0      0      1                  3                  6
## 92      0     0      0      1                  3                  6
## 93      0     0      0      1                  3                  6
## 94      0     0      0      1                  3                  6
## 95      0     0      0      1                  3                  6
## 96      0     0      0      1                  3                  6
## 97      0     0      0      2                  3                  3
## 98      0     0      0      2                  3                  3
## 99      0     0      0      2                  3                  3
## 100     0     0      0      2                  3                  3
## 101     0     0      0      2                  3                  3
## 102     0     0      0      2                  3                  3
## 103     0     0      0      2                  3                  3
## 104     0     0      0      2                  3                  3
## 105     0     0      0      2                  3                  3
## 106     0     0      0      2                  3                  3
## 107     0     0      0      2                  3                  3
## 108     0     0      0      2                  3                  3
## 109     0     0      0      2                  3                  3
## 110     0     0      0      2                  3                  3
## 111     0     0      0      2                  3                  3
## 112     0     0      0      2                  3                  3
## 113     0     0      1      4                  6                  5
## 114     0     0      1      4                  6                  5
## 115     0     0      1      4                  6                  5
## 116     0     0      1      4                  6                  5
## 117     0     0      1      4                  6                  5
## 118     0     0      1      4                  6                  5
## 119     0     0      1      4                  6                  5
## 120     0     0      1      4                  6                  5
## 121     0     0      1      4                  6                  5
## 122     0     0      1      4                  6                  5
## 123     0     0      1      4                  6                  5
## 124     0     0      1      4                  6                  5
## 125     0     0      1      4                  6                  5
## 126     0     0      1      4                  6                  5
## 127     0     0      1      4                  6                  5
## 128     0     0      1      4                  6                  5
## 129     0     0      0      2                  2                  4
## 130     0     0      0      2                  2                  4
## 131     0     0      0      2                  2                  4
## 132     0     0      0      2                  2                  4
## 133     0     0      0      2                  2                  4
## 134     0     0      0      2                  2                  4
## 135     0     0      0      2                  2                  4
## 136     0     0      0      2                  2                  4
## 137     0     0      0      2                  2                  4
## 138     0     0      0      2                  2                  4
## 139     0     0      0      2                  2                  4
## 140     0     0      0      2                  2                  4
## 141     0     0      0      2                  2                  4
## 142     0     0      0      2                  2                  4
## 143     0     0      0      2                  2                  4
## 144     0     0      0      2                  2                  4
## 145     0     0      0      2                  5                  6
## 146     0     0      0      2                  5                  6
## 147     0     0      0      2                  5                  6
## 148     0     0      0      2                  5                  6
## 149     0     0      0      2                  5                  6
## 150     0     0      0      2                  5                  6
## 151     0     0      0      2                  5                  6
## 152     0     0      0      2                  5                  6
## 153     0     0      0      2                  5                  6
## 154     0     0      0      2                  5                  6
## 155     0     0      0      2                  5                  6
## 156     0     0      0      2                  5                  6
## 157     0     0      0      2                  5                  6
## 158     0     0      0      2                  5                  6
## 159     0     0      0      2                  5                  6
## 160     0     0      0      2                  5                  6
## 161     0     0      0      3                  4                  4
## 162     0     0      0      3                  4                  4
## 163     0     0      0      3                  4                  4
## 164     0     0      0      3                  4                  4
## 165     0     0      0      3                  4                  4
## 166     0     0      0      3                  4                  4
## 167     0     0      0      3                  4                  4
## 168     0     0      0      3                  4                  4
## 169     0     0      0      3                  4                  4
## 170     0     0      0      3                  4                  4
## 171     0     0      0      3                  4                  4
## 172     0     0      0      3                  4                  4
## 173     0     0      0      3                  4                  4
## 174     0     0      0      3                  4                  4
## 175     0     0      0      3                  4                  4
## 176     0     0      0      3                  4                  4
## 177     0     0      0      2                  3                  1
## 178     0     0      0      2                  3                  1
## 179     0     0      0      2                  3                  1
## 180     0     0      0      2                  3                  1
## 181     0     0      0      2                  3                  1
## 182     0     0      0      2                  3                  1
## 183     0     0      0      2                  3                  1
## 184     0     0      0      2                  3                  1
## 185     0     0      0      2                  3                  1
## 186     0     0      0      2                  3                  1
## 187     0     0      0      2                  3                  1
## 188     0     0      0      2                  3                  1
## 189     0     0      0      2                  3                  1
## 190     0     0      0      2                  3                  1
## 191     0     0      0      2                  3                  1
## 192     0     0      0      2                  3                  1
## 193     0     0      0      4                  7                  7
## 194     0     0      0      4                  7                  7
## 195     0     0      0      4                  7                  7
## 196     0     0      0      4                  7                  7
## 197     0     0      0      4                  7                  7
## 198     0     0      0      4                  7                  7
## 199     0     0      0      4                  7                  7
## 200     0     0      0      4                  7                  7
## 201     0     0      0      4                  7                  7
## 202     0     0      0      4                  7                  7
## 203     0     0      0      4                  7                  7
## 204     0     0      0      4                  7                  7
## 205     0     0      0      4                  7                  7
## 206     0     0      0      4                  7                  7
## 207     0     0      0      4                  7                  7
## 208     0     0      0      4                  7                  7
## 209     0     0      0      1                  7                  7
## 210     0     0      0      1                  7                  7
## 211     0     0      0      1                  7                  7
## 212     0     0      0      1                  7                  7
## 213     0     0      0      1                  7                  7
## 214     0     0      0      1                  7                  7
## 215     0     0      0      1                  7                  7
## 216     0     0      0      1                  7                  7
## 217     0     0      0      1                  7                  7
## 218     0     0      0      1                  7                  7
## 219     0     0      0      1                  7                  7
## 220     0     0      0      1                  7                  7
## 221     0     0      0      1                  7                  7
## 222     0     0      0      1                  7                  7
## 223     0     0      0      1                  7                  7
## 224     0     0      0      1                  7                  7
## 225     0     0      0      2                  3                  1
## 226     0     0      0      2                  3                  1
## 227     0     0      0      2                  3                  1
## 228     0     0      0      2                  3                  1
## 229     0     0      0      2                  3                  1
## 230     0     0      0      2                  3                  1
## 231     0     0      0      2                  3                  1
## 232     0     0      0      2                  3                  1
## 233     0     0      0      2                  3                  1
## 234     0     0      0      2                  3                  1
## 235     0     0      0      2                  3                  1
## 236     0     0      0      2                  3                  1
## 237     0     0      0      2                  3                  1
## 238     0     0      0      2                  3                  1
## 239     0     0      0      2                  3                  1
## 240     0     0      0      2                  3                  1
## 241     0     0      0      1                  4                  3
## 242     0     0      0      1                  4                  3
## 243     0     0      0      1                  4                  3
## 244     0     0      0      1                  4                  3
## 245     0     0      0      1                  4                  3
## 246     0     0      0      1                  4                  3
## 247     0     0      0      1                  4                  3
## 248     0     0      0      1                  4                  3
## 249     0     0      0      1                  4                  3
## 250     0     0      0      1                  4                  3
## 251     0     0      0      1                  4                  3
## 252     0     0      0      1                  4                  3
## 253     0     0      0      1                  4                  3
## 254     0     0      0      1                  4                  3
## 255     0     0      0      1                  4                  3
## 256     0     0      0      1                  4                  3
## 257     0     0      0      3                  6                  6
## 258     0     0      0      3                  6                  6
## 259     0     0      0      3                  6                  6
## 260     0     0      0      3                  6                  6
## 261     0     0      0      3                  6                  6
## 262     0     0      0      3                  6                  6
## 263     0     0      0      3                  6                  6
## 264     0     0      0      3                  6                  6
## 265     0     0      0      3                  6                  6
## 266     0     0      0      3                  6                  6
## 267     0     0      0      3                  6                  6
## 268     0     0      0      3                  6                  6
## 269     0     0      0      3                  6                  6
## 270     0     0      0      3                  6                  6
## 271     0     0      0      3                  6                  6
## 272     0     0      0      3                  6                  6
## 273     0     0      0      2                  6                  6
## 274     0     0      0      2                  6                  6
## 275     0     0      0      2                  6                  6
## 276     0     0      0      2                  6                  6
## 277     0     0      0      2                  6                  6
## 278     0     0      0      2                  6                  6
## 279     0     0      0      2                  6                  6
## 280     0     0      0      2                  6                  6
## 281     0     0      0      2                  6                  6
## 282     0     0      0      2                  6                  6
## 283     0     0      0      2                  6                  6
## 284     0     0      0      2                  6                  6
## 285     0     0      0      2                  6                  6
## 286     0     0      0      2                  6                  6
## 287     0     0      0      2                  6                  6
## 288     0     0      0      2                  6                  6
## 289     0     0      1      3                  7                  3
## 290     0     0      1      3                  7                  3
## 291     0     0      1      3                  7                  3
## 292     0     0      1      3                  7                  3
## 293     0     0      1      3                  7                  3
## 294     0     0      1      3                  7                  3
## 295     0     0      1      3                  7                  3
## 296     0     0      1      3                  7                  3
## 297     0     0      1      3                  7                  3
## 298     0     0      1      3                  7                  3
## 299     0     0      1      3                  7                  3
## 300     0     0      1      3                  7                  3
## 301     0     0      1      3                  7                  3
## 302     0     0      1      3                  7                  3
## 303     0     0      1      3                  7                  3
## 304     0     0      1      3                  7                  3
## 305     0     0      0      1                  4                  5
## 306     0     0      0      1                  4                  5
## 307     0     0      0      1                  4                  5
## 308     0     0      0      1                  4                  5
## 309     0     0      0      1                  4                  5
## 310     0     0      0      1                  4                  5
## 311     0     0      0      1                  4                  5
## 312     0     0      0      1                  4                  5
## 313     0     0      0      1                  4                  5
## 314     0     0      0      1                  4                  5
## 315     0     0      0      1                  4                  5
## 316     0     0      0      1                  4                  5
## 317     0     0      0      1                  4                  5
## 318     0     0      0      1                  4                  5
## 319     0     0      0      1                  4                  5
## 320     0     0      0      1                  4                  5
## 321     0     0      0      2                  6                  7
## 322     0     0      0      2                  6                  7
## 323     0     0      0      2                  6                  7
## 324     0     0      0      2                  6                  7
## 325     0     0      0      2                  6                  7
## 326     0     0      0      2                  6                  7
## 327     0     0      0      2                  6                  7
## 328     0     0      0      2                  6                  7
## 329     0     0      0      2                  6                  7
## 330     0     0      0      2                  6                  7
## 331     0     0      0      2                  6                  7
## 332     0     0      0      2                  6                  7
## 333     0     0      0      2                  6                  7
## 334     0     0      0      2                  6                  7
## 335     0     0      0      2                  6                  7
## 336     0     0      0      2                  6                  7
## 337     0     0      0      2                  6                  5
## 338     0     0      0      2                  6                  5
## 339     0     0      0      2                  6                  5
## 340     0     0      0      2                  6                  5
## 341     0     0      0      2                  6                  5
## 342     0     0      0      2                  6                  5
## 343     0     0      0      2                  6                  5
## 344     0     0      0      2                  6                  5
## 345     0     0      0      2                  6                  5
## 346     0     0      0      2                  6                  5
## 347     0     0      0      2                  6                  5
## 348     0     0      0      2                  6                  5
## 349     0     0      0      2                  6                  5
## 350     0     0      0      2                  6                  5
## 351     0     0      0      2                  6                  5
## 352     0     0      0      2                  6                  5
## 353     0     0      1      2                  4                  6
## 354     0     0      1      2                  4                  6
## 355     0     0      1      2                  4                  6
## 356     0     0      1      2                  4                  6
## 357     0     0      1      2                  4                  6
## 358     0     0      1      2                  4                  6
## 359     0     0      1      2                  4                  6
## 360     0     0      1      2                  4                  6
## 361     0     0      1      2                  4                  6
## 362     0     0      1      2                  4                  6
## 363     0     0      1      2                  4                  6
## 364     0     0      1      2                  4                  6
## 365     0     0      1      2                  4                  6
## 366     0     0      1      2                  4                  6
## 367     0     0      1      2                  4                  6
## 368     0     0      1      2                  4                  6
## 369     0     0      0      2                  4                  4
## 370     0     0      0      2                  4                  4
## 371     0     0      0      2                  4                  4
## 372     0     0      0      2                  4                  4
## 373     0     0      0      2                  4                  4
## 374     0     0      0      2                  4                  4
## 375     0     0      0      2                  4                  4
## 376     0     0      0      2                  4                  4
## 377     0     0      0      2                  4                  4
## 378     0     0      0      2                  4                  4
## 379     0     0      0      2                  4                  4
## 380     0     0      0      2                  4                  4
## 381     0     0      0      2                  4                  4
## 382     0     0      0      2                  4                  4
## 383     0     0      0      2                  4                  4
## 384     0     0      0      2                  4                  4
## 385     0     0      0      2                  4                  4
## 386     0     0      0      2                  4                  4
## 387     0     0      0      2                  4                  4
## 388     0     0      0      2                  4                  4
## 389     0     0      0      2                  4                  4
## 390     0     0      0      2                  4                  4
## 391     0     0      0      2                  4                  4
## 392     0     0      0      2                  4                  4
## 393     0     0      0      2                  4                  4
## 394     0     0      0      2                  4                  4
## 395     0     0      0      2                  4                  4
## 396     0     0      0      2                  4                  4
## 397     0     0      0      2                  4                  4
## 398     0     0      0      2                  4                  4
## 399     0     0      0      2                  4                  4
## 400     0     0      0      2                  4                  4
## 401     0     0      0      3                  3                  2
## 402     0     0      0      3                  3                  2
## 403     0     0      0      3                  3                  2
## 404     0     0      0      3                  3                  2
## 405     0     0      0      3                  3                  2
## 406     0     0      0      3                  3                  2
## 407     0     0      0      3                  3                  2
## 408     0     0      0      3                  3                  2
## 409     0     0      0      3                  3                  2
## 410     0     0      0      3                  3                  2
## 411     0     0      0      3                  3                  2
## 412     0     0      0      3                  3                  2
## 413     0     0      0      3                  3                  2
## 414     0     0      0      3                  3                  2
## 415     0     0      0      3                  3                  2
## 416     0     0      0      3                  3                  2
## 417     0     0      0      1                  6                  5
## 418     0     0      0      1                  6                  5
## 419     0     0      0      1                  6                  5
## 420     0     0      0      1                  6                  5
## 421     0     0      0      1                  6                  5
## 422     0     0      0      1                  6                  5
## 423     0     0      0      1                  6                  5
## 424     0     0      0      1                  6                  5
## 425     0     0      0      1                  6                  5
## 426     0     0      0      1                  6                  5
## 427     0     0      0      1                  6                  5
## 428     0     0      0      1                  6                  5
## 429     0     0      0      1                  6                  5
## 430     0     0      0      1                  6                  5
## 431     0     0      0      1                  6                  5
## 432     0     0      0      1                  6                  5
## 433     0     0      0      2                  3                  3
## 434     0     0      0      2                  3                  3
## 435     0     0      0      2                  3                  3
## 436     0     0      0      2                  3                  3
## 437     0     0      0      2                  3                  3
## 438     0     0      0      2                  3                  3
## 439     0     0      0      2                  3                  3
## 440     0     0      0      2                  3                  3
## 441     0     0      0      2                  3                  3
## 442     0     0      0      2                  3                  3
## 443     0     0      0      2                  3                  3
## 444     0     0      0      2                  3                  3
## 445     0     0      0      2                  3                  3
## 446     0     0      0      2                  3                  3
## 447     0     0      0      2                  3                  3
## 448     0     0      0      2                  3                  3
## 449     0     0      0      2                  7                  6
## 450     0     0      0      2                  7                  6
## 451     0     0      0      2                  7                  6
## 452     0     0      0      2                  7                  6
## 453     0     0      0      2                  7                  6
## 454     0     0      0      2                  7                  6
## 455     0     0      0      2                  7                  6
## 456     0     0      0      2                  7                  6
## 457     0     0      0      2                  7                  6
## 458     0     0      0      2                  7                  6
## 459     0     0      0      2                  7                  6
## 460     0     0      0      2                  7                  6
## 461     0     0      0      2                  7                  6
## 462     0     0      0      2                  7                  6
## 463     0     0      0      2                  7                  6
## 464     0     0      0      2                  7                  6
## 465     0     0      0      1                  6                  2
## 466     0     0      0      1                  6                  2
## 467     0     0      0      1                  6                  2
## 468     0     0      0      1                  6                  2
## 469     0     0      0      1                  6                  2
## 470     0     0      0      1                  6                  2
## 471     0     0      0      1                  6                  2
## 472     0     0      0      1                  6                  2
## 473     0     0      0      1                  6                  2
## 474     0     0      0      1                  6                  2
## 475     0     0      0      1                  6                  2
## 476     0     0      0      1                  6                  2
## 477     0     0      0      1                  6                  2
## 478     0     0      0      1                  6                  2
## 479     0     0      0      1                  6                  2
## 480     0     0      0      1                  6                  2
## 481     0     0      0      3                  4                  7
## 482     0     0      0      3                  4                  7
## 483     0     0      0      3                  4                  7
## 484     0     0      0      3                  4                  7
## 485     0     0      0      3                  4                  7
## 486     0     0      0      3                  4                  7
## 487     0     0      0      3                  4                  7
## 488     0     0      0      3                  4                  7
## 489     0     0      0      3                  4                  7
## 490     0     0      0      3                  4                  7
## 491     0     0      0      3                  4                  7
## 492     0     0      0      3                  4                  7
## 493     0     0      0      3                  4                  7
## 494     0     0      0      3                  4                  7
## 495     0     0      0      3                  4                  7
## 496     0     0      0      3                  4                  7
## 497     0     0      1      4                  4                  1
## 498     0     0      1      4                  4                  1
## 499     0     0      1      4                  4                  1
## 500     0     0      1      4                  4                  1
## 501     0     0      1      4                  4                  1
## 502     0     0      1      4                  4                  1
## 503     0     0      1      4                  4                  1
## 504     0     0      1      4                  4                  1
## 505     0     0      1      4                  4                  1
## 506     0     0      1      4                  4                  1
## 507     0     0      1      4                  4                  1
## 508     0     0      1      4                  4                  1
## 509     0     0      1      4                  4                  1
## 510     0     0      1      4                  4                  1
## 511     0     0      1      4                  4                  1
## 512     0     0      1      4                  4                  1
## 513     0     1      0      2                  5                  7
## 514     0     1      0      2                  5                  7
## 515     0     1      0      2                  5                  7
## 516     0     1      0      2                  5                  7
## 517     0     1      0      2                  5                  7
## 518     0     1      0      2                  5                  7
## 519     0     1      0      2                  5                  7
## 520     0     1      0      2                  5                  7
## 521     0     1      0      2                  5                  7
## 522     0     1      0      2                  5                  7
## 523     0     1      0      2                  5                  7
## 524     0     1      0      2                  5                  7
## 525     0     1      0      2                  5                  7
## 526     0     1      0      2                  5                  7
## 527     0     1      0      2                  5                  7
## 528     0     1      0      2                  5                  7
## 529     1     0      2      2                  4                  4
## 530     1     0      2      2                  4                  4
## 531     1     0      2      2                  4                  4
## 532     1     0      2      2                  4                  4
## 533     1     0      2      2                  4                  4
## 534     1     0      2      2                  4                  4
## 535     1     0      2      2                  4                  4
## 536     1     0      2      2                  4                  4
## 537     1     0      2      2                  4                  4
## 538     1     0      2      2                  4                  4
## 539     1     0      2      2                  4                  4
## 540     1     0      2      2                  4                  4
## 541     1     0      2      2                  4                  4
## 542     1     0      2      2                  4                  4
## 543     1     0      2      2                  4                  4
## 544     1     0      2      2                  4                  4
## 545     0     0      0      2                  7                  4
## 546     0     0      0      2                  7                  4
## 547     0     0      0      2                  7                  4
## 548     0     0      0      2                  7                  4
## 549     0     0      0      2                  7                  4
## 550     0     0      0      2                  7                  4
## 551     0     0      0      2                  7                  4
## 552     0     0      0      2                  7                  4
## 553     0     0      0      2                  7                  4
## 554     0     0      0      2                  7                  4
## 555     0     0      0      2                  7                  4
## 556     0     0      0      2                  7                  4
## 557     0     0      0      2                  7                  4
## 558     0     0      0      2                  7                  4
## 559     0     0      0      2                  7                  4
## 560     0     0      0      2                  7                  4
## 561     0     0      0      2                  6                  3
## 562     0     0      0      2                  6                  3
## 563     0     0      0      2                  6                  3
## 564     0     0      0      2                  6                  3
## 565     0     0      0      2                  6                  3
## 566     0     0      0      2                  6                  3
## 567     0     0      0      2                  6                  3
## 568     0     0      0      2                  6                  3
## 569     0     0      0      2                  6                  3
## 570     0     0      0      2                  6                  3
## 571     0     0      0      2                  6                  3
## 572     0     0      0      2                  6                  3
## 573     0     0      0      2                  6                  3
## 574     0     0      0      2                  6                  3
## 575     0     0      0      2                  6                  3
## 576     0     0      0      2                  6                  3
## 577     0     0      0      5                  7                  7
## 578     0     0      0      5                  7                  7
## 579     0     0      0      5                  7                  7
## 580     0     0      0      5                  7                  7
## 581     0     0      0      5                  7                  7
## 582     0     0      0      5                  7                  7
## 583     0     0      0      5                  7                  7
## 584     0     0      0      5                  7                  7
## 585     0     0      0      5                  7                  7
## 586     0     0      0      5                  7                  7
## 587     0     0      0      5                  7                  7
## 588     0     0      0      5                  7                  7
## 589     0     0      0      5                  7                  7
## 590     0     0      0      5                  7                  7
## 591     0     0      0      5                  7                  7
## 592     0     0      0      5                  7                  7
## 593     0     0      0      1                  7                  7
## 594     0     0      0      1                  7                  7
## 595     0     0      0      1                  7                  7
## 596     0     0      0      1                  7                  7
## 597     0     0      0      1                  7                  7
## 598     0     0      0      1                  7                  7
## 599     0     0      0      1                  7                  7
## 600     0     0      0      1                  7                  7
## 601     0     0      0      1                  7                  7
## 602     0     0      0      1                  7                  7
## 603     0     0      0      1                  7                  7
## 604     0     0      0      1                  7                  7
## 605     0     0      0      1                  7                  7
## 606     0     0      0      1                  7                  7
## 607     0     0      0      1                  7                  7
## 608     0     0      0      1                  7                  7
## 609     0     0      0      2                  4                  1
## 610     0     0      0      2                  4                  1
## 611     0     0      0      2                  4                  1
## 612     0     0      0      2                  4                  1
## 613     0     0      0      2                  4                  1
## 614     0     0      0      2                  4                  1
## 615     0     0      0      2                  4                  1
## 616     0     0      0      2                  4                  1
## 617     0     0      0      2                  4                  1
## 618     0     0      0      2                  4                  1
## 619     0     0      0      2                  4                  1
## 620     0     0      0      2                  4                  1
## 621     0     0      0      2                  4                  1
## 622     0     0      0      2                  4                  1
## 623     0     0      0      2                  4                  1
## 624     0     0      0      2                  4                  1
## 625     0     3      2      5                  6                  6
## 626     0     3      2      5                  6                  6
## 627     0     3      2      5                  6                  6
## 628     0     3      2      5                  6                  6
## 629     0     3      2      5                  6                  6
## 630     0     3      2      5                  6                  6
## 631     0     3      2      5                  6                  6
## 632     0     3      2      5                  6                  6
## 633     0     3      2      5                  6                  6
## 634     0     3      2      5                  6                  6
## 635     0     3      2      5                  6                  6
## 636     0     3      2      5                  6                  6
## 637     0     3      2      5                  6                  6
## 638     0     3      2      5                  6                  6
## 639     0     3      2      5                  6                  6
## 640     0     3      2      5                  6                  6
## 641     0     2      0      2                  6                  5
## 642     0     2      0      2                  6                  5
## 643     0     2      0      2                  6                  5
## 644     0     2      0      2                  6                  5
## 645     0     2      0      2                  6                  5
## 646     0     2      0      2                  6                  5
## 647     0     2      0      2                  6                  5
## 648     0     2      0      2                  6                  5
## 649     0     2      0      2                  6                  5
## 650     0     2      0      2                  6                  5
## 651     0     2      0      2                  6                  5
## 652     0     2      0      2                  6                  5
## 653     0     2      0      2                  6                  5
## 654     0     2      0      2                  6                  5
## 655     0     2      0      2                  6                  5
## 656     0     2      0      2                  6                  5
## 657     0     0      0      2                  7                  7
## 658     0     0      0      2                  7                  7
## 659     0     0      0      2                  7                  7
## 660     0     0      0      2                  7                  7
## 661     0     0      0      2                  7                  7
## 662     0     0      0      2                  7                  7
## 663     0     0      0      2                  7                  7
## 664     0     0      0      2                  7                  7
## 665     0     0      0      2                  7                  7
## 666     0     0      0      2                  7                  7
## 667     0     0      0      2                  7                  7
## 668     0     0      0      2                  7                  7
## 669     0     0      0      2                  7                  7
## 670     0     0      0      2                  7                  7
## 671     0     0      0      2                  7                  7
## 672     0     0      0      2                  7                  7
## 673     0     0      0      2                  7                  7
## 674     0     0      0      2                  7                  7
## 675     0     0      0      2                  7                  7
## 676     0     0      0      2                  7                  7
## 677     0     0      0      2                  7                  7
## 678     0     0      0      2                  7                  7
## 679     0     0      0      2                  7                  7
## 680     0     0      0      2                  7                  7
## 681     0     0      0      2                  7                  7
## 682     0     0      0      2                  7                  7
## 683     0     0      0      2                  7                  7
## 684     0     0      0      2                  7                  7
## 685     0     0      0      2                  7                  7
## 686     0     0      0      2                  7                  7
## 687     0     0      0      2                  7                  7
## 688     0     0      0      2                  7                  7
## 689     0     0      0      2                  4                  4
## 690     0     0      0      2                  4                  4
## 691     0     0      0      2                  4                  4
## 692     0     0      0      2                  4                  4
## 693     0     0      0      2                  4                  4
## 694     0     0      0      2                  4                  4
## 695     0     0      0      2                  4                  4
## 696     0     0      0      2                  4                  4
## 697     0     0      0      2                  4                  4
## 698     0     0      0      2                  4                  4
## 699     0     0      0      2                  4                  4
## 700     0     0      0      2                  4                  4
## 701     0     0      0      2                  4                  4
## 702     0     0      0      2                  4                  4
## 703     0     0      0      2                  4                  4
## 704     0     0      0      2                  4                  4
## 705     1     1      0      2                  2                  2
## 706     1     1      0      2                  2                  2
## 707     1     1      0      2                  2                  2
## 708     1     1      0      2                  2                  2
## 709     1     1      0      2                  2                  2
## 710     1     1      0      2                  2                  2
## 711     1     1      0      2                  2                  2
## 712     1     1      0      2                  2                  2
## 713     1     1      0      2                  2                  2
## 714     1     1      0      2                  2                  2
## 715     1     1      0      2                  2                  2
## 716     1     1      0      2                  2                  2
## 717     1     1      0      2                  2                  2
## 718     1     1      0      2                  2                  2
## 719     1     1      0      2                  2                  2
## 720     1     1      0      2                  2                  2
## 721     0     0      0      4                  6                  7
## 722     0     0      0      4                  6                  7
## 723     0     0      0      4                  6                  7
## 724     0     0      0      4                  6                  7
## 725     0     0      0      4                  6                  7
## 726     0     0      0      4                  6                  7
## 727     0     0      0      4                  6                  7
## 728     0     0      0      4                  6                  7
## 729     0     0      0      4                  6                  7
## 730     0     0      0      4                  6                  7
## 731     0     0      0      4                  6                  7
## 732     0     0      0      4                  6                  7
## 733     0     0      0      4                  6                  7
## 734     0     0      0      4                  6                  7
## 735     0     0      0      4                  6                  7
## 736     0     0      0      4                  6                  7
## 737     0     0      0      2                  1                  1
## 738     0     0      0      2                  1                  1
## 739     0     0      0      2                  1                  1
## 740     0     0      0      2                  1                  1
## 741     0     0      0      2                  1                  1
## 742     0     0      0      2                  1                  1
## 743     0     0      0      2                  1                  1
## 744     0     0      0      2                  1                  1
## 745     0     0      0      2                  1                  1
## 746     0     0      0      2                  1                  1
## 747     0     0      0      2                  1                  1
## 748     0     0      0      2                  1                  1
## 749     0     0      0      2                  1                  1
## 750     0     0      0      2                  1                  1
## 751     0     0      0      2                  1                  1
## 752     0     0      0      2                  1                  1
## 753     0     0      0      2                  4                  4
## 754     0     0      0      2                  4                  4
## 755     0     0      0      2                  4                  4
## 756     0     0      0      2                  4                  4
## 757     0     0      0      2                  4                  4
## 758     0     0      0      2                  4                  4
## 759     0     0      0      2                  4                  4
## 760     0     0      0      2                  4                  4
## 761     0     0      0      2                  4                  4
## 762     0     0      0      2                  4                  4
## 763     0     0      0      2                  4                  4
## 764     0     0      0      2                  4                  4
## 765     0     0      0      2                  4                  4
## 766     0     0      0      2                  4                  4
## 767     0     0      0      2                  4                  4
## 768     0     0      0      2                  4                  4
## 769     0     0      0      1                  4                  2
## 770     0     0      0      1                  4                  2
## 771     0     0      0      1                  4                  2
## 772     0     0      0      1                  4                  2
## 773     0     0      0      1                  4                  2
## 774     0     0      0      1                  4                  2
## 775     0     0      0      1                  4                  2
## 776     0     0      0      1                  4                  2
## 777     0     0      0      1                  4                  2
## 778     0     0      0      1                  4                  2
## 779     0     0      0      1                  4                  2
## 780     0     0      0      1                  4                  2
## 781     0     0      0      1                  4                  2
## 782     0     0      0      1                  4                  2
## 783     0     0      0      1                  4                  2
## 784     0     0      0      1                  4                  2
## 785     0     0      0      2                  3                  4
## 786     0     0      0      2                  3                  4
## 787     0     0      0      2                  3                  4
## 788     0     0      0      2                  3                  4
## 789     0     0      0      2                  3                  4
## 790     0     0      0      2                  3                  4
## 791     0     0      0      2                  3                  4
## 792     0     0      0      2                  3                  4
## 793     0     0      0      2                  3                  4
## 794     0     0      0      2                  3                  4
## 795     0     0      0      2                  3                  4
## 796     0     0      0      2                  3                  4
## 797     0     0      0      2                  3                  4
## 798     0     0      0      2                  3                  4
## 799     0     0      0      2                  3                  4
## 800     0     0      0      2                  3                  4
## 801     0     0      0      1                  4                  1
## 802     0     0      0      1                  4                  1
## 803     0     0      0      1                  4                  1
## 804     0     0      0      1                  4                  1
## 805     0     0      0      1                  4                  1
## 806     0     0      0      1                  4                  1
## 807     0     0      0      1                  4                  1
## 808     0     0      0      1                  4                  1
## 809     0     0      0      1                  4                  1
## 810     0     0      0      1                  4                  1
## 811     0     0      0      1                  4                  1
## 812     0     0      0      1                  4                  1
## 813     0     0      0      1                  4                  1
## 814     0     0      0      1                  4                  1
## 815     0     0      0      1                  4                  1
## 816     0     0      0      1                  4                  1
## 817     0     0      0      2                  7                  7
## 818     0     0      0      2                  7                  7
## 819     0     0      0      2                  7                  7
## 820     0     0      0      2                  7                  7
## 821     0     0      0      2                  7                  7
## 822     0     0      0      2                  7                  7
## 823     0     0      0      2                  7                  7
## 824     0     0      0      2                  7                  7
## 825     0     0      0      2                  7                  7
## 826     0     0      0      2                  7                  7
## 827     0     0      0      2                  7                  7
## 828     0     0      0      2                  7                  7
## 829     0     0      0      2                  7                  7
## 830     0     0      0      2                  7                  7
## 831     0     0      0      2                  7                  7
## 832     0     0      0      2                  7                  7
## 833     0     0      0      2                  4                  6
## 834     0     0      0      2                  4                  6
## 835     0     0      0      2                  4                  6
## 836     0     0      0      2                  4                  6
## 837     0     0      0      2                  4                  6
## 838     0     0      0      2                  4                  6
## 839     0     0      0      2                  4                  6
## 840     0     0      0      2                  4                  6
## 841     0     0      0      2                  4                  6
## 842     0     0      0      2                  4                  6
## 843     0     0      0      2                  4                  6
## 844     0     0      0      2                  4                  6
## 845     0     0      0      2                  4                  6
## 846     0     0      0      2                  4                  6
## 847     0     0      0      2                  4                  6
## 848     0     0      0      2                  4                  6
## 849     0     0      0      2                  2                  6
## 850     0     0      0      2                  2                  6
## 851     0     0      0      2                  2                  6
## 852     0     0      0      2                  2                  6
## 853     0     0      0      2                  2                  6
## 854     0     0      0      2                  2                  6
## 855     0     0      0      2                  2                  6
## 856     0     0      0      2                  2                  6
## 857     0     0      0      2                  2                  6
## 858     0     0      0      2                  2                  6
## 859     0     0      0      2                  2                  6
## 860     0     0      0      2                  2                  6
## 861     0     0      0      2                  2                  6
## 862     0     0      0      2                  2                  6
## 863     0     0      0      2                  2                  6
## 864     0     0      0      2                  2                  6
## 865     0     0      0      1                  7                  5
## 866     0     0      0      1                  7                  5
## 867     0     0      0      1                  7                  5
## 868     0     0      0      1                  7                  5
## 869     0     0      0      1                  7                  5
## 870     0     0      0      1                  7                  5
## 871     0     0      0      1                  7                  5
## 872     0     0      0      1                  7                  5
## 873     0     0      0      1                  7                  5
## 874     0     0      0      1                  7                  5
## 875     0     0      0      1                  7                  5
## 876     0     0      0      1                  7                  5
## 877     0     0      0      1                  7                  5
## 878     0     0      0      1                  7                  5
## 879     0     0      0      1                  7                  5
## 880     0     0      0      1                  7                  5
## 881     0     1      1      2                  4                  4
## 882     0     1      1      2                  4                  4
## 883     0     1      1      2                  4                  4
## 884     0     1      1      2                  4                  4
## 885     0     1      1      2                  4                  4
## 886     0     1      1      2                  4                  4
## 887     0     1      1      2                  4                  4
## 888     0     1      1      2                  4                  4
## 889     0     1      1      2                  4                  4
## 890     0     1      1      2                  4                  4
## 891     0     1      1      2                  4                  4
## 892     0     1      1      2                  4                  4
## 893     0     1      1      2                  4                  4
## 894     0     1      1      2                  4                  4
## 895     0     1      1      2                  4                  4
## 896     0     1      1      2                  4                  4
## 897     0     0      0      1                  6                  3
## 898     0     0      0      1                  6                  3
## 899     0     0      0      1                  6                  3
## 900     0     0      0      1                  6                  3
## 901     0     0      0      1                  6                  3
## 902     0     0      0      1                  6                  3
## 903     0     0      0      1                  6                  3
## 904     0     0      0      1                  6                  3
## 905     0     0      0      1                  6                  3
## 906     0     0      0      1                  6                  3
## 907     0     0      0      1                  6                  3
## 908     0     0      0      1                  6                  3
## 909     0     0      0      1                  6                  3
## 910     0     0      0      1                  6                  3
## 911     0     0      0      1                  6                  3
## 912     0     0      0      1                  6                  3
## 913     0     0      0      3                  6                  6
## 914     0     0      0      3                  6                  6
## 915     0     0      0      3                  6                  6
## 916     0     0      0      3                  6                  6
## 917     0     0      0      3                  6                  6
## 918     0     0      0      3                  6                  6
## 919     0     0      0      3                  6                  6
## 920     0     0      0      3                  6                  6
## 921     0     0      0      3                  6                  6
## 922     0     0      0      3                  6                  6
## 923     0     0      0      3                  6                  6
## 924     0     0      0      3                  6                  6
## 925     0     0      0      3                  6                  6
## 926     0     0      0      3                  6                  6
## 927     0     0      0      3                  6                  6
## 928     0     0      0      3                  6                  6
## 929     0     0      1      5                  3                  3
## 930     0     0      1      5                  3                  3
## 931     0     0      1      5                  3                  3
## 932     0     0      1      5                  3                  3
## 933     0     0      1      5                  3                  3
## 934     0     0      1      5                  3                  3
## 935     0     0      1      5                  3                  3
## 936     0     0      1      5                  3                  3
## 937     0     0      1      5                  3                  3
## 938     0     0      1      5                  3                  3
## 939     0     0      1      5                  3                  3
## 940     0     0      1      5                  3                  3
## 941     0     0      1      5                  3                  3
## 942     0     0      1      5                  3                  3
## 943     0     0      1      5                  3                  3
## 944     0     0      1      5                  3                  3
## 945     1     0      0      2                  4                  4
## 946     1     0      0      2                  4                  4
## 947     1     0      0      2                  4                  4
## 948     1     0      0      2                  4                  4
## 949     1     0      0      2                  4                  4
## 950     1     0      0      2                  4                  4
## 951     1     0      0      2                  4                  4
## 952     1     0      0      2                  4                  4
## 953     1     0      0      2                  4                  4
## 954     1     0      0      2                  4                  4
## 955     1     0      0      2                  4                  4
## 956     1     0      0      2                  4                  4
## 957     1     0      0      2                  4                  4
## 958     1     0      0      2                  4                  4
## 959     1     0      0      2                  4                  4
## 960     1     0      0      2                  4                  4
## 961     0     0      0      1                  4                  4
## 962     0     0      0      1                  4                  4
## 963     0     0      0      1                  4                  4
## 964     0     0      0      1                  4                  4
## 965     0     0      0      1                  4                  4
## 966     0     0      0      1                  4                  4
## 967     0     0      0      1                  4                  4
## 968     0     0      0      1                  4                  4
## 969     0     0      0      1                  4                  4
## 970     0     0      0      1                  4                  4
## 971     0     0      0      1                  4                  4
## 972     0     0      0      1                  4                  4
## 973     0     0      0      1                  4                  4
## 974     0     0      0      1                  4                  4
## 975     0     0      0      1                  4                  4
## 976     0     0      0      1                  4                  4
## 977     0     2      1      5                  4                  4
## 978     0     2      1      5                  4                  4
## 979     0     2      1      5                  4                  4
## 980     0     2      1      5                  4                  4
## 981     0     2      1      5                  4                  4
## 982     0     2      1      5                  4                  4
## 983     0     2      1      5                  4                  4
## 984     0     2      1      5                  4                  4
## 985     0     2      1      5                  4                  4
## 986     0     2      1      5                  4                  4
## 987     0     2      1      5                  4                  4
## 988     0     2      1      5                  4                  4
## 989     0     2      1      5                  4                  4
## 990     0     2      1      5                  4                  4
## 991     0     2      1      5                  4                  4
## 992     0     2      1      5                  4                  4
## 993     0     0      1      3                  6                  5
## 994     0     0      1      3                  6                  5
## 995     0     0      1      3                  6                  5
## 996     0     0      1      3                  6                  5
## 997     0     0      1      3                  6                  5
## 998     0     0      1      3                  6                  5
## 999     0     0      1      3                  6                  5
## 1000    0     0      1      3                  6                  5
## 1001    0     0      1      3                  6                  5
## 1002    0     0      1      3                  6                  5
## 1003    0     0      1      3                  6                  5
## 1004    0     0      1      3                  6                  5
## 1005    0     0      1      3                  6                  5
## 1006    0     0      1      3                  6                  5
## 1007    0     0      1      3                  6                  5
## 1008    0     0      1      3                  6                  5
## 1009    0     2      2      1                  3                  5
## 1010    0     2      2      1                  3                  5
## 1011    0     2      2      1                  3                  5
## 1012    0     2      2      1                  3                  5
## 1013    0     2      2      1                  3                  5
## 1014    0     2      2      1                  3                  5
## 1015    0     2      2      1                  3                  5
## 1016    0     2      2      1                  3                  5
## 1017    0     2      2      1                  3                  5
## 1018    0     2      2      1                  3                  5
## 1019    0     2      2      1                  3                  5
## 1020    0     2      2      1                  3                  5
## 1021    0     2      2      1                  3                  5
## 1022    0     2      2      1                  3                  5
## 1023    0     2      2      1                  3                  5
## 1024    0     2      2      1                  3                  5
## 1025    0     0      0      3                  3                  1
## 1026    0     0      0      3                  3                  1
## 1027    0     0      0      3                  3                  1
## 1028    0     0      0      3                  3                  1
## 1029    0     0      0      3                  3                  1
## 1030    0     0      0      3                  3                  1
## 1031    0     0      0      3                  3                  1
## 1032    0     0      0      3                  3                  1
## 1033    0     0      0      3                  3                  1
## 1034    0     0      0      3                  3                  1
## 1035    0     0      0      3                  3                  1
## 1036    0     0      0      3                  3                  1
## 1037    0     0      0      3                  3                  1
## 1038    0     0      0      3                  3                  1
## 1039    0     0      0      3                  3                  1
## 1040    0     0      0      3                  3                  1
## 1041    0     0      0      1                  3                  2
## 1042    0     0      0      1                  3                  2
## 1043    0     0      0      1                  3                  2
## 1044    0     0      0      1                  3                  2
## 1045    0     0      0      1                  3                  2
## 1046    0     0      0      1                  3                  2
## 1047    0     0      0      1                  3                  2
## 1048    0     0      0      1                  3                  2
## 1049    0     0      0      1                  3                  2
## 1050    0     0      0      1                  3                  2
## 1051    0     0      0      1                  3                  2
## 1052    0     0      0      1                  3                  2
## 1053    0     0      0      1                  3                  2
## 1054    0     0      0      1                  3                  2
## 1055    0     0      0      1                  3                  2
## 1056    0     0      0      1                  3                  2
## 1057    0     0      0      5                  6                  7
## 1058    0     0      0      5                  6                  7
## 1059    0     0      0      5                  6                  7
## 1060    0     0      0      5                  6                  7
## 1061    0     0      0      5                  6                  7
## 1062    0     0      0      5                  6                  7
## 1063    0     0      0      5                  6                  7
## 1064    0     0      0      5                  6                  7
## 1065    0     0      0      5                  6                  7
## 1066    0     0      0      5                  6                  7
## 1067    0     0      0      5                  6                  7
## 1068    0     0      0      5                  6                  7
## 1069    0     0      0      5                  6                  7
## 1070    0     0      0      5                  6                  7
## 1071    0     0      0      5                  6                  7
## 1072    0     0      0      5                  6                  7
## 1073    0     1      0      1                  1                  1
## 1074    0     1      0      1                  1                  1
## 1075    0     1      0      1                  1                  1
## 1076    0     1      0      1                  1                  1
## 1077    0     1      0      1                  1                  1
## 1078    0     1      0      1                  1                  1
## 1079    0     1      0      1                  1                  1
## 1080    0     1      0      1                  1                  1
## 1081    0     1      0      1                  1                  1
## 1082    0     1      0      1                  1                  1
## 1083    0     1      0      1                  1                  1
## 1084    0     1      0      1                  1                  1
## 1085    0     1      0      1                  1                  1
## 1086    0     1      0      1                  1                  1
## 1087    0     1      0      1                  1                  1
## 1088    0     1      0      1                  1                  1
## 1089    0     0      0      2                  3                  4
## 1090    0     0      0      2                  3                  4
## 1091    0     0      0      2                  3                  4
## 1092    0     0      0      2                  3                  4
## 1093    0     0      0      2                  3                  4
## 1094    0     0      0      2                  3                  4
## 1095    0     0      0      2                  3                  4
## 1096    0     0      0      2                  3                  4
## 1097    0     0      0      2                  3                  4
## 1098    0     0      0      2                  3                  4
## 1099    0     0      0      2                  3                  4
## 1100    0     0      0      2                  3                  4
## 1101    0     0      0      2                  3                  4
## 1102    0     0      0      2                  3                  4
## 1103    0     0      0      2                  3                  4
## 1104    0     0      0      2                  3                  4
## 1105    0     0      0      2                 NA                 NA
## 1106    0     0      0      2                 NA                 NA
## 1107    0     0      0      2                 NA                 NA
## 1108    0     0      0      2                 NA                 NA
## 1109    0     0      0      2                 NA                 NA
## 1110    0     0      0      2                 NA                 NA
## 1111    0     0      0      2                 NA                 NA
## 1112    0     0      0      2                 NA                 NA
## 1113    0     0      0      2                 NA                 NA
## 1114    0     0      0      2                 NA                 NA
## 1115    0     0      0      2                 NA                 NA
## 1116    0     0      0      2                 NA                 NA
## 1117    0     0      0      2                 NA                 NA
## 1118    0     0      0      2                 NA                 NA
## 1119    0     0      0      2                 NA                 NA
## 1120    0     0      0      2                 NA                 NA
## 1121    0     0      0      2                  2                  1
## 1122    0     0      0      2                  2                  1
## 1123    0     0      0      2                  2                  1
## 1124    0     0      0      2                  2                  1
## 1125    0     0      0      2                  2                  1
## 1126    0     0      0      2                  2                  1
## 1127    0     0      0      2                  2                  1
## 1128    0     0      0      2                  2                  1
## 1129    0     0      0      2                  2                  1
## 1130    0     0      0      2                  2                  1
## 1131    0     0      0      2                  2                  1
## 1132    0     0      0      2                  2                  1
## 1133    0     0      0      2                  2                  1
## 1134    0     0      0      2                  2                  1
## 1135    0     0      0      2                  2                  1
## 1136    0     0      0      2                  2                  1
## 1137    0     0      1      5                  3                  4
## 1138    0     0      1      5                  3                  4
## 1139    0     0      1      5                  3                  4
## 1140    0     0      1      5                  3                  4
## 1141    0     0      1      5                  3                  4
## 1142    0     0      1      5                  3                  4
## 1143    0     0      1      5                  3                  4
## 1144    0     0      1      5                  3                  4
## 1145    0     0      1      5                  3                  4
## 1146    0     0      1      5                  3                  4
## 1147    0     0      1      5                  3                  4
## 1148    0     0      1      5                  3                  4
## 1149    0     0      1      5                  3                  4
## 1150    0     0      1      5                  3                  4
## 1151    0     0      1      5                  3                  4
## 1152    0     0      1      5                  3                  4
## 1153    0     0      0      2                  2                  2
## 1154    0     0      0      2                  2                  2
## 1155    0     0      0      2                  2                  2
## 1156    0     0      0      2                  2                  2
## 1157    0     0      0      2                  2                  2
## 1158    0     0      0      2                  2                  2
## 1159    0     0      0      2                  2                  2
## 1160    0     0      0      2                  2                  2
## 1161    0     0      0      2                  2                  2
## 1162    0     0      0      2                  2                  2
## 1163    0     0      0      2                  2                  2
## 1164    0     0      0      2                  2                  2
## 1165    0     0      0      2                  2                  2
## 1166    0     0      0      2                  2                  2
## 1167    0     0      0      2                  2                  2
## 1168    0     0      0      2                  2                  2
## 1169    0     0      0      2                  5                  4
## 1170    0     0      0      2                  5                  4
## 1171    0     0      0      2                  5                  4
## 1172    0     0      0      2                  5                  4
## 1173    0     0      0      2                  5                  4
## 1174    0     0      0      2                  5                  4
## 1175    0     0      0      2                  5                  4
## 1176    0     0      0      2                  5                  4
## 1177    0     0      0      2                  5                  4
## 1178    0     0      0      2                  5                  4
## 1179    0     0      0      2                  5                  4
## 1180    0     0      0      2                  5                  4
## 1181    0     0      0      2                  5                  4
## 1182    0     0      0      2                  5                  4
## 1183    0     0      0      2                  5                  4
## 1184    0     0      0      2                  5                  4
## 1185    0     0      0      2                  5                  3
## 1186    0     0      0      2                  5                  3
## 1187    0     0      0      2                  5                  3
## 1188    0     0      0      2                  5                  3
## 1189    0     0      0      2                  5                  3
## 1190    0     0      0      2                  5                  3
## 1191    0     0      0      2                  5                  3
## 1192    0     0      0      2                  5                  3
## 1193    0     0      0      2                  5                  3
## 1194    0     0      0      2                  5                  3
## 1195    0     0      0      2                  5                  3
## 1196    0     0      0      2                  5                  3
## 1197    0     0      0      2                  5                  3
## 1198    0     0      0      2                  5                  3
## 1199    0     0      0      2                  5                  3
## 1200    0     0      0      2                  5                  3
## 1201    0     0      0      2                 NA                 NA
## 1202    0     0      0      2                 NA                 NA
## 1203    0     0      0      2                 NA                 NA
## 1204    0     0      0      2                 NA                 NA
## 1205    0     0      0      2                 NA                 NA
## 1206    0     0      0      2                 NA                 NA
## 1207    0     0      0      2                 NA                 NA
## 1208    0     0      0      2                 NA                 NA
## 1209    0     0      0      2                 NA                 NA
## 1210    0     0      0      2                 NA                 NA
## 1211    0     0      0      2                 NA                 NA
## 1212    0     0      0      2                 NA                 NA
## 1213    0     0      0      2                 NA                 NA
## 1214    0     0      0      2                 NA                 NA
## 1215    0     0      0      2                 NA                 NA
## 1216    0     0      0      2                 NA                 NA
## 1217    0     0      0      1                  5                  5
## 1218    0     0      0      1                  5                  5
## 1219    0     0      0      1                  5                  5
## 1220    0     0      0      1                  5                  5
## 1221    0     0      0      1                  5                  5
## 1222    0     0      0      1                  5                  5
## 1223    0     0      0      1                  5                  5
## 1224    0     0      0      1                  5                  5
## 1225    0     0      0      1                  5                  5
## 1226    0     0      0      1                  5                  5
## 1227    0     0      0      1                  5                  5
## 1228    0     0      0      1                  5                  5
## 1229    0     0      0      1                  5                  5
## 1230    0     0      0      1                  5                  5
## 1231    0     0      0      1                  5                  5
## 1232    0     0      0      1                  5                  5
## 1233    0     0      2      4                  6                  1
## 1234    0     0      2      4                  6                  1
## 1235    0     0      2      4                  6                  1
## 1236    0     0      2      4                  6                  1
## 1237    0     0      2      4                  6                  1
## 1238    0     0      2      4                  6                  1
## 1239    0     0      2      4                  6                  1
## 1240    0     0      2      4                  6                  1
## 1241    0     0      2      4                  6                  1
## 1242    0     0      2      4                  6                  1
## 1243    0     0      2      4                  6                  1
## 1244    0     0      2      4                  6                  1
## 1245    0     0      2      4                  6                  1
## 1246    0     0      2      4                  6                  1
## 1247    0     0      2      4                  6                  1
## 1248    0     0      2      4                  6                  1
## 1249    0     0      0      1                  4                  3
## 1250    0     0      0      1                  4                  3
## 1251    0     0      0      1                  4                  3
## 1252    0     0      0      1                  4                  3
## 1253    0     0      0      1                  4                  3
## 1254    0     0      0      1                  4                  3
## 1255    0     0      0      1                  4                  3
## 1256    0     0      0      1                  4                  3
## 1257    0     0      0      1                  4                  3
## 1258    0     0      0      1                  4                  3
## 1259    0     0      0      1                  4                  3
## 1260    0     0      0      1                  4                  3
## 1261    0     0      0      1                  4                  3
## 1262    0     0      0      1                  4                  3
## 1263    0     0      0      1                  4                  3
## 1264    0     0      0      1                  4                  3
## 1265    0     0      0      1                  7                  7
## 1266    0     0      0      1                  7                  7
## 1267    0     0      0      1                  7                  7
## 1268    0     0      0      1                  7                  7
## 1269    0     0      0      1                  7                  7
## 1270    0     0      0      1                  7                  7
## 1271    0     0      0      1                  7                  7
## 1272    0     0      0      1                  7                  7
## 1273    0     0      0      1                  7                  7
## 1274    0     0      0      1                  7                  7
## 1275    0     0      0      1                  7                  7
## 1276    0     0      0      1                  7                  7
## 1277    0     0      0      1                  7                  7
## 1278    0     0      0      1                  7                  7
## 1279    0     0      0      1                  7                  7
## 1280    0     0      0      1                  7                  7
## 1281    0     0      1      3                  7                  7
## 1282    0     0      1      3                  7                  7
## 1283    0     0      1      3                  7                  7
## 1284    0     0      1      3                  7                  7
## 1285    0     0      1      3                  7                  7
## 1286    0     0      1      3                  7                  7
## 1287    0     0      1      3                  7                  7
## 1288    0     0      1      3                  7                  7
## 1289    0     0      1      3                  7                  7
## 1290    0     0      1      3                  7                  7
## 1291    0     0      1      3                  7                  7
## 1292    0     0      1      3                  7                  7
## 1293    0     0      1      3                  7                  7
## 1294    0     0      1      3                  7                  7
## 1295    0     0      1      3                  7                  7
## 1296    0     0      1      3                  7                  7
## 1297    0     1      0      2                  5                  7
## 1298    0     1      0      2                  5                  7
## 1299    0     1      0      2                  5                  7
## 1300    0     1      0      2                  5                  7
## 1301    0     1      0      2                  5                  7
## 1302    0     1      0      2                  5                  7
## 1303    0     1      0      2                  5                  7
## 1304    0     1      0      2                  5                  7
## 1305    0     1      0      2                  5                  7
## 1306    0     1      0      2                  5                  7
## 1307    0     1      0      2                  5                  7
## 1308    0     1      0      2                  5                  7
## 1309    0     1      0      2                  5                  7
## 1310    0     1      0      2                  5                  7
## 1311    0     1      0      2                  5                  7
## 1312    0     1      0      2                  5                  7
## 1313    0     0      0      2                  6                  5
## 1314    0     0      0      2                  6                  5
## 1315    0     0      0      2                  6                  5
##      Secularism3flipped Secularism4flipped secularism partyid3cat relig2cat
## 1                     6                  5         20           3         2
## 2                     6                  5         20           3         2
## 3                     6                  5         20           3         2
## 4                     6                  5         20           3         2
## 5                     6                  5         20           3         2
## 6                     6                  5         20           3         2
## 7                     6                  5         20           3         2
## 8                     6                  5         20           3         2
## 9                     6                  5         20           3         2
## 10                    6                  5         20           3         2
## 11                    6                  5         20           3         2
## 12                    6                  5         20           3         2
## 13                    6                  5         20           3         2
## 14                    6                  5         20           3         2
## 15                    6                  5         20           3         2
## 16                    6                  5         20           3         2
## 17                    7                  7         28           1         2
## 18                    7                  7         28           1         2
## 19                    7                  7         28           1         2
## 20                    7                  7         28           1         2
## 21                    7                  7         28           1         2
## 22                    7                  7         28           1         2
## 23                    7                  7         28           1         2
## 24                    7                  7         28           1         2
## 25                    7                  7         28           1         2
## 26                    7                  7         28           1         2
## 27                    7                  7         28           1         2
## 28                    7                  7         28           1         2
## 29                    7                  7         28           1         2
## 30                    7                  7         28           1         2
## 31                    7                  7         28           1         2
## 32                    7                  7         28           1         2
## 33                    7                  1         16           1         1
## 34                    7                  1         16           1         1
## 35                    7                  1         16           1         1
## 36                    7                  1         16           1         1
## 37                    7                  1         16           1         1
## 38                    7                  1         16           1         1
## 39                    7                  1         16           1         1
## 40                    7                  1         16           1         1
## 41                    7                  1         16           1         1
## 42                    7                  1         16           1         1
## 43                    7                  1         16           1         1
## 44                    7                  1         16           1         1
## 45                    7                  1         16           1         1
## 46                    7                  1         16           1         1
## 47                    7                  1         16           1         1
## 48                    7                  1         16           1         1
## 49                    1                  1         NA           3         2
## 50                    1                  1         NA           3         2
## 51                    1                  1         NA           3         2
## 52                    1                  1         NA           3         2
## 53                    1                  1         NA           3         2
## 54                    1                  1         NA           3         2
## 55                    1                  1         NA           3         2
## 56                    1                  1         NA           3         2
## 57                    1                  1         NA           3         2
## 58                    1                  1         NA           3         2
## 59                    1                  1         NA           3         2
## 60                    1                  1         NA           3         2
## 61                    1                  1         NA           3         2
## 62                    1                  1         NA           3         2
## 63                    1                  1         NA           3         2
## 64                    1                  1         NA           3         2
## 65                    7                  7         27           1         1
## 66                    7                  7         27           1         1
## 67                    7                  7         27           1         1
## 68                    7                  7         27           1         1
## 69                    7                  7         27           1         1
## 70                    7                  7         27           1         1
## 71                    7                  7         27           1         1
## 72                    7                  7         27           1         1
## 73                    7                  7         27           1         1
## 74                    7                  7         27           1         1
## 75                    7                  7         27           1         1
## 76                    7                  7         27           1         1
## 77                    7                  7         27           1         1
## 78                    7                  7         27           1         1
## 79                    7                  7         27           1         1
## 80                    7                  7         27           1         1
## 81                    3                  4         16           2         2
## 82                    3                  4         16           2         2
## 83                    3                  4         16           2         2
## 84                    3                  4         16           2         2
## 85                    3                  4         16           2         2
## 86                    3                  4         16           2         2
## 87                    3                  4         16           2         2
## 88                    3                  4         16           2         2
## 89                    3                  4         16           2         2
## 90                    3                  4         16           2         2
## 91                    3                  4         16           2         2
## 92                    3                  4         16           2         2
## 93                    3                  4         16           2         2
## 94                    3                  4         16           2         2
## 95                    3                  4         16           2         2
## 96                    3                  4         16           2         2
## 97                    3                  5         14           1         2
## 98                    3                  5         14           1         2
## 99                    3                  5         14           1         2
## 100                   3                  5         14           1         2
## 101                   3                  5         14           1         2
## 102                   3                  5         14           1         2
## 103                   3                  5         14           1         2
## 104                   3                  5         14           1         2
## 105                   3                  5         14           1         2
## 106                   3                  5         14           1         2
## 107                   3                  5         14           1         2
## 108                   3                  5         14           1         2
## 109                   3                  5         14           1         2
## 110                   3                  5         14           1         2
## 111                   3                  5         14           1         2
## 112                   3                  5         14           1         2
## 113                   7                  6         24           1         2
## 114                   7                  6         24           1         2
## 115                   7                  6         24           1         2
## 116                   7                  6         24           1         2
## 117                   7                  6         24           1         2
## 118                   7                  6         24           1         2
## 119                   7                  6         24           1         2
## 120                   7                  6         24           1         2
## 121                   7                  6         24           1         2
## 122                   7                  6         24           1         2
## 123                   7                  6         24           1         2
## 124                   7                  6         24           1         2
## 125                   7                  6         24           1         2
## 126                   7                  6         24           1         2
## 127                   7                  6         24           1         2
## 128                   7                  6         24           1         2
## 129                   2                  2         10           1         2
## 130                   2                  2         10           1         2
## 131                   2                  2         10           1         2
## 132                   2                  2         10           1         2
## 133                   2                  2         10           1         2
## 134                   2                  2         10           1         2
## 135                   2                  2         10           1         2
## 136                   2                  2         10           1         2
## 137                   2                  2         10           1         2
## 138                   2                  2         10           1         2
## 139                   2                  2         10           1         2
## 140                   2                  2         10           1         2
## 141                   2                  2         10           1         2
## 142                   2                  2         10           1         2
## 143                   2                  2         10           1         2
## 144                   2                  2         10           1         2
## 145                   6                  5         22           2         2
## 146                   6                  5         22           2         2
## 147                   6                  5         22           2         2
## 148                   6                  5         22           2         2
## 149                   6                  5         22           2         2
## 150                   6                  5         22           2         2
## 151                   6                  5         22           2         2
## 152                   6                  5         22           2         2
## 153                   6                  5         22           2         2
## 154                   6                  5         22           2         2
## 155                   6                  5         22           2         2
## 156                   6                  5         22           2         2
## 157                   6                  5         22           2         2
## 158                   6                  5         22           2         2
## 159                   6                  5         22           2         2
## 160                   6                  5         22           2         2
## 161                   4                  4         16           2         2
## 162                   4                  4         16           2         2
## 163                   4                  4         16           2         2
## 164                   4                  4         16           2         2
## 165                   4                  4         16           2         2
## 166                   4                  4         16           2         2
## 167                   4                  4         16           2         2
## 168                   4                  4         16           2         2
## 169                   4                  4         16           2         2
## 170                   4                  4         16           2         2
## 171                   4                  4         16           2         2
## 172                   4                  4         16           2         2
## 173                   4                  4         16           2         2
## 174                   4                  4         16           2         2
## 175                   4                  4         16           2         2
## 176                   4                  4         16           2         2
## 177                   1                  1          6           1         2
## 178                   1                  1          6           1         2
## 179                   1                  1          6           1         2
## 180                   1                  1          6           1         2
## 181                   1                  1          6           1         2
## 182                   1                  1          6           1         2
## 183                   1                  1          6           1         2
## 184                   1                  1          6           1         2
## 185                   1                  1          6           1         2
## 186                   1                  1          6           1         2
## 187                   1                  1          6           1         2
## 188                   1                  1          6           1         2
## 189                   1                  1          6           1         2
## 190                   1                  1          6           1         2
## 191                   1                  1          6           1         2
## 192                   1                  1          6           1         2
## 193                   7                  7         28           1         1
## 194                   7                  7         28           1         1
## 195                   7                  7         28           1         1
## 196                   7                  7         28           1         1
## 197                   7                  7         28           1         1
## 198                   7                  7         28           1         1
## 199                   7                  7         28           1         1
## 200                   7                  7         28           1         1
## 201                   7                  7         28           1         1
## 202                   7                  7         28           1         1
## 203                   7                  7         28           1         1
## 204                   7                  7         28           1         1
## 205                   7                  7         28           1         1
## 206                   7                  7         28           1         1
## 207                   7                  7         28           1         1
## 208                   7                  7         28           1         1
## 209                   7                  7         28           1         2
## 210                   7                  7         28           1         2
## 211                   7                  7         28           1         2
## 212                   7                  7         28           1         2
## 213                   7                  7         28           1         2
## 214                   7                  7         28           1         2
## 215                   7                  7         28           1         2
## 216                   7                  7         28           1         2
## 217                   7                  7         28           1         2
## 218                   7                  7         28           1         2
## 219                   7                  7         28           1         2
## 220                   7                  7         28           1         2
## 221                   7                  7         28           1         2
## 222                   7                  7         28           1         2
## 223                   7                  7         28           1         2
## 224                   7                  7         28           1         2
## 225                   1                  2          7           3         2
## 226                   1                  2          7           3         2
## 227                   1                  2          7           3         2
## 228                   1                  2          7           3         2
## 229                   1                  2          7           3         2
## 230                   1                  2          7           3         2
## 231                   1                  2          7           3         2
## 232                   1                  2          7           3         2
## 233                   1                  2          7           3         2
## 234                   1                  2          7           3         2
## 235                   1                  2          7           3         2
## 236                   1                  2          7           3         2
## 237                   1                  2          7           3         2
## 238                   1                  2          7           3         2
## 239                   1                  2          7           3         2
## 240                   1                  2          7           3         2
## 241                   7                  4         18           3         2
## 242                   7                  4         18           3         2
## 243                   7                  4         18           3         2
## 244                   7                  4         18           3         2
## 245                   7                  4         18           3         2
## 246                   7                  4         18           3         2
## 247                   7                  4         18           3         2
## 248                   7                  4         18           3         2
## 249                   7                  4         18           3         2
## 250                   7                  4         18           3         2
## 251                   7                  4         18           3         2
## 252                   7                  4         18           3         2
## 253                   7                  4         18           3         2
## 254                   7                  4         18           3         2
## 255                   7                  4         18           3         2
## 256                   7                  4         18           3         2
## 257                   6                  6         24           1         1
## 258                   6                  6         24           1         1
## 259                   6                  6         24           1         1
## 260                   6                  6         24           1         1
## 261                   6                  6         24           1         1
## 262                   6                  6         24           1         1
## 263                   6                  6         24           1         1
## 264                   6                  6         24           1         1
## 265                   6                  6         24           1         1
## 266                   6                  6         24           1         1
## 267                   6                  6         24           1         1
## 268                   6                  6         24           1         1
## 269                   6                  6         24           1         1
## 270                   6                  6         24           1         1
## 271                   6                  6         24           1         1
## 272                   6                  6         24           1         1
## 273                   7                  7         26           1         1
## 274                   7                  7         26           1         1
## 275                   7                  7         26           1         1
## 276                   7                  7         26           1         1
## 277                   7                  7         26           1         1
## 278                   7                  7         26           1         1
## 279                   7                  7         26           1         1
## 280                   7                  7         26           1         1
## 281                   7                  7         26           1         1
## 282                   7                  7         26           1         1
## 283                   7                  7         26           1         1
## 284                   7                  7         26           1         1
## 285                   7                  7         26           1         1
## 286                   7                  7         26           1         1
## 287                   7                  7         26           1         1
## 288                   7                  7         26           1         1
## 289                   7                  7         24           1         2
## 290                   7                  7         24           1         2
## 291                   7                  7         24           1         2
## 292                   7                  7         24           1         2
## 293                   7                  7         24           1         2
## 294                   7                  7         24           1         2
## 295                   7                  7         24           1         2
## 296                   7                  7         24           1         2
## 297                   7                  7         24           1         2
## 298                   7                  7         24           1         2
## 299                   7                  7         24           1         2
## 300                   7                  7         24           1         2
## 301                   7                  7         24           1         2
## 302                   7                  7         24           1         2
## 303                   7                  7         24           1         2
## 304                   7                  7         24           1         2
## 305                   7                  5         21           2         1
## 306                   7                  5         21           2         1
## 307                   7                  5         21           2         1
## 308                   7                  5         21           2         1
## 309                   7                  5         21           2         1
## 310                   7                  5         21           2         1
## 311                   7                  5         21           2         1
## 312                   7                  5         21           2         1
## 313                   7                  5         21           2         1
## 314                   7                  5         21           2         1
## 315                   7                  5         21           2         1
## 316                   7                  5         21           2         1
## 317                   7                  5         21           2         1
## 318                   7                  5         21           2         1
## 319                   7                  5         21           2         1
## 320                   7                  5         21           2         1
## 321                   7                  5         25           1         1
## 322                   7                  5         25           1         1
## 323                   7                  5         25           1         1
## 324                   7                  5         25           1         1
## 325                   7                  5         25           1         1
## 326                   7                  5         25           1         1
## 327                   7                  5         25           1         1
## 328                   7                  5         25           1         1
## 329                   7                  5         25           1         1
## 330                   7                  5         25           1         1
## 331                   7                  5         25           1         1
## 332                   7                  5         25           1         1
## 333                   7                  5         25           1         1
## 334                   7                  5         25           1         1
## 335                   7                  5         25           1         1
## 336                   7                  5         25           1         1
## 337                   6                  6         23           1         2
## 338                   6                  6         23           1         2
## 339                   6                  6         23           1         2
## 340                   6                  6         23           1         2
## 341                   6                  6         23           1         2
## 342                   6                  6         23           1         2
## 343                   6                  6         23           1         2
## 344                   6                  6         23           1         2
## 345                   6                  6         23           1         2
## 346                   6                  6         23           1         2
## 347                   6                  6         23           1         2
## 348                   6                  6         23           1         2
## 349                   6                  6         23           1         2
## 350                   6                  6         23           1         2
## 351                   6                  6         23           1         2
## 352                   6                  6         23           1         2
## 353                   7                  4         21           3         2
## 354                   7                  4         21           3         2
## 355                   7                  4         21           3         2
## 356                   7                  4         21           3         2
## 357                   7                  4         21           3         2
## 358                   7                  4         21           3         2
## 359                   7                  4         21           3         2
## 360                   7                  4         21           3         2
## 361                   7                  4         21           3         2
## 362                   7                  4         21           3         2
## 363                   7                  4         21           3         2
## 364                   7                  4         21           3         2
## 365                   7                  4         21           3         2
## 366                   7                  4         21           3         2
## 367                   7                  4         21           3         2
## 368                   7                  4         21           3         2
## 369                   4                  4         16           3         2
## 370                   4                  4         16           3         2
## 371                   4                  4         16           3         2
## 372                   4                  4         16           3         2
## 373                   4                  4         16           3         2
## 374                   4                  4         16           3         2
## 375                   4                  4         16           3         2
## 376                   4                  4         16           3         2
## 377                   4                  4         16           3         2
## 378                   4                  4         16           3         2
## 379                   4                  4         16           3         2
## 380                   4                  4         16           3         2
## 381                   4                  4         16           3         2
## 382                   4                  4         16           3         2
## 383                   4                  4         16           3         2
## 384                   4                  4         16           3         2
## 385                   3                  3         14           2         1
## 386                   3                  3         14           2         1
## 387                   3                  3         14           2         1
## 388                   3                  3         14           2         1
## 389                   3                  3         14           2         1
## 390                   3                  3         14           2         1
## 391                   3                  3         14           2         1
## 392                   3                  3         14           2         1
## 393                   3                  3         14           2         1
## 394                   3                  3         14           2         1
## 395                   3                  3         14           2         1
## 396                   3                  3         14           2         1
## 397                   3                  3         14           2         1
## 398                   3                  3         14           2         1
## 399                   3                  3         14           2         1
## 400                   3                  3         14           2         1
## 401                   2                  4         11           1         2
## 402                   2                  4         11           1         2
## 403                   2                  4         11           1         2
## 404                   2                  4         11           1         2
## 405                   2                  4         11           1         2
## 406                   2                  4         11           1         2
## 407                   2                  4         11           1         2
## 408                   2                  4         11           1         2
## 409                   2                  4         11           1         2
## 410                   2                  4         11           1         2
## 411                   2                  4         11           1         2
## 412                   2                  4         11           1         2
## 413                   2                  4         11           1         2
## 414                   2                  4         11           1         2
## 415                   2                  4         11           1         2
## 416                   2                  4         11           1         2
## 417                   6                  6         23           3         2
## 418                   6                  6         23           3         2
## 419                   6                  6         23           3         2
## 420                   6                  6         23           3         2
## 421                   6                  6         23           3         2
## 422                   6                  6         23           3         2
## 423                   6                  6         23           3         2
## 424                   6                  6         23           3         2
## 425                   6                  6         23           3         2
## 426                   6                  6         23           3         2
## 427                   6                  6         23           3         2
## 428                   6                  6         23           3         2
## 429                   6                  6         23           3         2
## 430                   6                  6         23           3         2
## 431                   6                  6         23           3         2
## 432                   6                  6         23           3         2
## 433                   2                  2         10           1         2
## 434                   2                  2         10           1         2
## 435                   2                  2         10           1         2
## 436                   2                  2         10           1         2
## 437                   2                  2         10           1         2
## 438                   2                  2         10           1         2
## 439                   2                  2         10           1         2
## 440                   2                  2         10           1         2
## 441                   2                  2         10           1         2
## 442                   2                  2         10           1         2
## 443                   2                  2         10           1         2
## 444                   2                  2         10           1         2
## 445                   2                  2         10           1         2
## 446                   2                  2         10           1         2
## 447                   2                  2         10           1         2
## 448                   2                  2         10           1         2
## 449                   6                  6         25           1         1
## 450                   6                  6         25           1         1
## 451                   6                  6         25           1         1
## 452                   6                  6         25           1         1
## 453                   6                  6         25           1         1
## 454                   6                  6         25           1         1
## 455                   6                  6         25           1         1
## 456                   6                  6         25           1         1
## 457                   6                  6         25           1         1
## 458                   6                  6         25           1         1
## 459                   6                  6         25           1         1
## 460                   6                  6         25           1         1
## 461                   6                  6         25           1         1
## 462                   6                  6         25           1         1
## 463                   6                  6         25           1         1
## 464                   6                  6         25           1         1
## 465                   6                  6         20           3         2
## 466                   6                  6         20           3         2
## 467                   6                  6         20           3         2
## 468                   6                  6         20           3         2
## 469                   6                  6         20           3         2
## 470                   6                  6         20           3         2
## 471                   6                  6         20           3         2
## 472                   6                  6         20           3         2
## 473                   6                  6         20           3         2
## 474                   6                  6         20           3         2
## 475                   6                  6         20           3         2
## 476                   6                  6         20           3         2
## 477                   6                  6         20           3         2
## 478                   6                  6         20           3         2
## 479                   6                  6         20           3         2
## 480                   6                  6         20           3         2
## 481                   7                  7         25           1         2
## 482                   7                  7         25           1         2
## 483                   7                  7         25           1         2
## 484                   7                  7         25           1         2
## 485                   7                  7         25           1         2
## 486                   7                  7         25           1         2
## 487                   7                  7         25           1         2
## 488                   7                  7         25           1         2
## 489                   7                  7         25           1         2
## 490                   7                  7         25           1         2
## 491                   7                  7         25           1         2
## 492                   7                  7         25           1         2
## 493                   7                  7         25           1         2
## 494                   7                  7         25           1         2
## 495                   7                  7         25           1         2
## 496                   7                  7         25           1         2
## 497                   4                  4         13           3         2
## 498                   4                  4         13           3         2
## 499                   4                  4         13           3         2
## 500                   4                  4         13           3         2
## 501                   4                  4         13           3         2
## 502                   4                  4         13           3         2
## 503                   4                  4         13           3         2
## 504                   4                  4         13           3         2
## 505                   4                  4         13           3         2
## 506                   4                  4         13           3         2
## 507                   4                  4         13           3         2
## 508                   4                  4         13           3         2
## 509                   4                  4         13           3         2
## 510                   4                  4         13           3         2
## 511                   4                  4         13           3         2
## 512                   4                  4         13           3         2
## 513                   6                  7         25           1         1
## 514                   6                  7         25           1         1
## 515                   6                  7         25           1         1
## 516                   6                  7         25           1         1
## 517                   6                  7         25           1         1
## 518                   6                  7         25           1         1
## 519                   6                  7         25           1         1
## 520                   6                  7         25           1         1
## 521                   6                  7         25           1         1
## 522                   6                  7         25           1         1
## 523                   6                  7         25           1         1
## 524                   6                  7         25           1         1
## 525                   6                  7         25           1         1
## 526                   6                  7         25           1         1
## 527                   6                  7         25           1         1
## 528                   6                  7         25           1         1
## 529                   4                  4         16           2         1
## 530                   4                  4         16           2         1
## 531                   4                  4         16           2         1
## 532                   4                  4         16           2         1
## 533                   4                  4         16           2         1
## 534                   4                  4         16           2         1
## 535                   4                  4         16           2         1
## 536                   4                  4         16           2         1
## 537                   4                  4         16           2         1
## 538                   4                  4         16           2         1
## 539                   4                  4         16           2         1
## 540                   4                  4         16           2         1
## 541                   4                  4         16           2         1
## 542                   4                  4         16           2         1
## 543                   4                  4         16           2         1
## 544                   4                  4         16           2         1
## 545                   7                  7         25           3         2
## 546                   7                  7         25           3         2
## 547                   7                  7         25           3         2
## 548                   7                  7         25           3         2
## 549                   7                  7         25           3         2
## 550                   7                  7         25           3         2
## 551                   7                  7         25           3         2
## 552                   7                  7         25           3         2
## 553                   7                  7         25           3         2
## 554                   7                  7         25           3         2
## 555                   7                  7         25           3         2
## 556                   7                  7         25           3         2
## 557                   7                  7         25           3         2
## 558                   7                  7         25           3         2
## 559                   7                  7         25           3         2
## 560                   7                  7         25           3         2
## 561                   7                  7         23           3         2
## 562                   7                  7         23           3         2
## 563                   7                  7         23           3         2
## 564                   7                  7         23           3         2
## 565                   7                  7         23           3         2
## 566                   7                  7         23           3         2
## 567                   7                  7         23           3         2
## 568                   7                  7         23           3         2
## 569                   7                  7         23           3         2
## 570                   7                  7         23           3         2
## 571                   7                  7         23           3         2
## 572                   7                  7         23           3         2
## 573                   7                  7         23           3         2
## 574                   7                  7         23           3         2
## 575                   7                  7         23           3         2
## 576                   7                  7         23           3         2
## 577                   5                  5         24           1         1
## 578                   5                  5         24           1         1
## 579                   5                  5         24           1         1
## 580                   5                  5         24           1         1
## 581                   5                  5         24           1         1
## 582                   5                  5         24           1         1
## 583                   5                  5         24           1         1
## 584                   5                  5         24           1         1
## 585                   5                  5         24           1         1
## 586                   5                  5         24           1         1
## 587                   5                  5         24           1         1
## 588                   5                  5         24           1         1
## 589                   5                  5         24           1         1
## 590                   5                  5         24           1         1
## 591                   5                  5         24           1         1
## 592                   5                  5         24           1         1
## 593                   7                  7         28           3         2
## 594                   7                  7         28           3         2
## 595                   7                  7         28           3         2
## 596                   7                  7         28           3         2
## 597                   7                  7         28           3         2
## 598                   7                  7         28           3         2
## 599                   7                  7         28           3         2
## 600                   7                  7         28           3         2
## 601                   7                  7         28           3         2
## 602                   7                  7         28           3         2
## 603                   7                  7         28           3         2
## 604                   7                  7         28           3         2
## 605                   7                  7         28           3         2
## 606                   7                  7         28           3         2
## 607                   7                  7         28           3         2
## 608                   7                  7         28           3         2
## 609                   6                  1         12           3         2
## 610                   6                  1         12           3         2
## 611                   6                  1         12           3         2
## 612                   6                  1         12           3         2
## 613                   6                  1         12           3         2
## 614                   6                  1         12           3         2
## 615                   6                  1         12           3         2
## 616                   6                  1         12           3         2
## 617                   6                  1         12           3         2
## 618                   6                  1         12           3         2
## 619                   6                  1         12           3         2
## 620                   6                  1         12           3         2
## 621                   6                  1         12           3         2
## 622                   6                  1         12           3         2
## 623                   6                  1         12           3         2
## 624                   6                  1         12           3         2
## 625                   5                  5         22           2         1
## 626                   5                  5         22           2         1
## 627                   5                  5         22           2         1
## 628                   5                  5         22           2         1
## 629                   5                  5         22           2         1
## 630                   5                  5         22           2         1
## 631                   5                  5         22           2         1
## 632                   5                  5         22           2         1
## 633                   5                  5         22           2         1
## 634                   5                  5         22           2         1
## 635                   5                  5         22           2         1
## 636                   5                  5         22           2         1
## 637                   5                  5         22           2         1
## 638                   5                  5         22           2         1
## 639                   5                  5         22           2         1
## 640                   5                  5         22           2         1
## 641                   5                  6         22           1         1
## 642                   5                  6         22           1         1
## 643                   5                  6         22           1         1
## 644                   5                  6         22           1         1
## 645                   5                  6         22           1         1
## 646                   5                  6         22           1         1
## 647                   5                  6         22           1         1
## 648                   5                  6         22           1         1
## 649                   5                  6         22           1         1
## 650                   5                  6         22           1         1
## 651                   5                  6         22           1         1
## 652                   5                  6         22           1         1
## 653                   5                  6         22           1         1
## 654                   5                  6         22           1         1
## 655                   5                  6         22           1         1
## 656                   5                  6         22           1         1
## 657                   6                  7         27           1         1
## 658                   6                  7         27           1         1
## 659                   6                  7         27           1         1
## 660                   6                  7         27           1         1
## 661                   6                  7         27           1         1
## 662                   6                  7         27           1         1
## 663                   6                  7         27           1         1
## 664                   6                  7         27           1         1
## 665                   6                  7         27           1         1
## 666                   6                  7         27           1         1
## 667                   6                  7         27           1         1
## 668                   6                  7         27           1         1
## 669                   6                  7         27           1         1
## 670                   6                  7         27           1         1
## 671                   6                  7         27           1         1
## 672                   6                  7         27           1         1
## 673                   7                  6         27           1         1
## 674                   7                  6         27           1         1
## 675                   7                  6         27           1         1
## 676                   7                  6         27           1         1
## 677                   7                  6         27           1         1
## 678                   7                  6         27           1         1
## 679                   7                  6         27           1         1
## 680                   7                  6         27           1         1
## 681                   7                  6         27           1         1
## 682                   7                  6         27           1         1
## 683                   7                  6         27           1         1
## 684                   7                  6         27           1         1
## 685                   7                  6         27           1         1
## 686                   7                  6         27           1         1
## 687                   7                  6         27           1         1
## 688                   7                  6         27           1         1
## 689                   4                  4         16           2         2
## 690                   4                  4         16           2         2
## 691                   4                  4         16           2         2
## 692                   4                  4         16           2         2
## 693                   4                  4         16           2         2
## 694                   4                  4         16           2         2
## 695                   4                  4         16           2         2
## 696                   4                  4         16           2         2
## 697                   4                  4         16           2         2
## 698                   4                  4         16           2         2
## 699                   4                  4         16           2         2
## 700                   4                  4         16           2         2
## 701                   4                  4         16           2         2
## 702                   4                  4         16           2         2
## 703                   4                  4         16           2         2
## 704                   4                  4         16           2         2
## 705                   4                  4         12           3         2
## 706                   4                  4         12           3         2
## 707                   4                  4         12           3         2
## 708                   4                  4         12           3         2
## 709                   4                  4         12           3         2
## 710                   4                  4         12           3         2
## 711                   4                  4         12           3         2
## 712                   4                  4         12           3         2
## 713                   4                  4         12           3         2
## 714                   4                  4         12           3         2
## 715                   4                  4         12           3         2
## 716                   4                  4         12           3         2
## 717                   4                  4         12           3         2
## 718                   4                  4         12           3         2
## 719                   4                  4         12           3         2
## 720                   4                  4         12           3         2
## 721                   7                  5         25           1         1
## 722                   7                  5         25           1         1
## 723                   7                  5         25           1         1
## 724                   7                  5         25           1         1
## 725                   7                  5         25           1         1
## 726                   7                  5         25           1         1
## 727                   7                  5         25           1         1
## 728                   7                  5         25           1         1
## 729                   7                  5         25           1         1
## 730                   7                  5         25           1         1
## 731                   7                  5         25           1         1
## 732                   7                  5         25           1         1
## 733                   7                  5         25           1         1
## 734                   7                  5         25           1         1
## 735                   7                  5         25           1         1
## 736                   7                  5         25           1         1
## 737                   1                  1          4           3         2
## 738                   1                  1          4           3         2
## 739                   1                  1          4           3         2
## 740                   1                  1          4           3         2
## 741                   1                  1          4           3         2
## 742                   1                  1          4           3         2
## 743                   1                  1          4           3         2
## 744                   1                  1          4           3         2
## 745                   1                  1          4           3         2
## 746                   1                  1          4           3         2
## 747                   1                  1          4           3         2
## 748                   1                  1          4           3         2
## 749                   1                  1          4           3         2
## 750                   1                  1          4           3         2
## 751                   1                  1          4           3         2
## 752                   1                  1          4           3         2
## 753                   4                  4         16           1         1
## 754                   4                  4         16           1         1
## 755                   4                  4         16           1         1
## 756                   4                  4         16           1         1
## 757                   4                  4         16           1         1
## 758                   4                  4         16           1         1
## 759                   4                  4         16           1         1
## 760                   4                  4         16           1         1
## 761                   4                  4         16           1         1
## 762                   4                  4         16           1         1
## 763                   4                  4         16           1         1
## 764                   4                  4         16           1         1
## 765                   4                  4         16           1         1
## 766                   4                  4         16           1         1
## 767                   4                  4         16           1         1
## 768                   4                  4         16           1         1
## 769                   7                  5         18           1         2
## 770                   7                  5         18           1         2
## 771                   7                  5         18           1         2
## 772                   7                  5         18           1         2
## 773                   7                  5         18           1         2
## 774                   7                  5         18           1         2
## 775                   7                  5         18           1         2
## 776                   7                  5         18           1         2
## 777                   7                  5         18           1         2
## 778                   7                  5         18           1         2
## 779                   7                  5         18           1         2
## 780                   7                  5         18           1         2
## 781                   7                  5         18           1         2
## 782                   7                  5         18           1         2
## 783                   7                  5         18           1         2
## 784                   7                  5         18           1         2
## 785                   7                  4         18           2         1
## 786                   7                  4         18           2         1
## 787                   7                  4         18           2         1
## 788                   7                  4         18           2         1
## 789                   7                  4         18           2         1
## 790                   7                  4         18           2         1
## 791                   7                  4         18           2         1
## 792                   7                  4         18           2         1
## 793                   7                  4         18           2         1
## 794                   7                  4         18           2         1
## 795                   7                  4         18           2         1
## 796                   7                  4         18           2         1
## 797                   7                  4         18           2         1
## 798                   7                  4         18           2         1
## 799                   7                  4         18           2         1
## 800                   7                  4         18           2         1
## 801                   7                  1         13           2         2
## 802                   7                  1         13           2         2
## 803                   7                  1         13           2         2
## 804                   7                  1         13           2         2
## 805                   7                  1         13           2         2
## 806                   7                  1         13           2         2
## 807                   7                  1         13           2         2
## 808                   7                  1         13           2         2
## 809                   7                  1         13           2         2
## 810                   7                  1         13           2         2
## 811                   7                  1         13           2         2
## 812                   7                  1         13           2         2
## 813                   7                  1         13           2         2
## 814                   7                  1         13           2         2
## 815                   7                  1         13           2         2
## 816                   7                  1         13           2         2
## 817                   7                  7         28           1         1
## 818                   7                  7         28           1         1
## 819                   7                  7         28           1         1
## 820                   7                  7         28           1         1
## 821                   7                  7         28           1         1
## 822                   7                  7         28           1         1
## 823                   7                  7         28           1         1
## 824                   7                  7         28           1         1
## 825                   7                  7         28           1         1
## 826                   7                  7         28           1         1
## 827                   7                  7         28           1         1
## 828                   7                  7         28           1         1
## 829                   7                  7         28           1         1
## 830                   7                  7         28           1         1
## 831                   7                  7         28           1         1
## 832                   7                  7         28           1         1
## 833                   7                  7         24           1         1
## 834                   7                  7         24           1         1
## 835                   7                  7         24           1         1
## 836                   7                  7         24           1         1
## 837                   7                  7         24           1         1
## 838                   7                  7         24           1         1
## 839                   7                  7         24           1         1
## 840                   7                  7         24           1         1
## 841                   7                  7         24           1         1
## 842                   7                  7         24           1         1
## 843                   7                  7         24           1         1
## 844                   7                  7         24           1         1
## 845                   7                  7         24           1         1
## 846                   7                  7         24           1         1
## 847                   7                  7         24           1         1
## 848                   7                  7         24           1         1
## 849                   1                  4         13           3         2
## 850                   1                  4         13           3         2
## 851                   1                  4         13           3         2
## 852                   1                  4         13           3         2
## 853                   1                  4         13           3         2
## 854                   1                  4         13           3         2
## 855                   1                  4         13           3         2
## 856                   1                  4         13           3         2
## 857                   1                  4         13           3         2
## 858                   1                  4         13           3         2
## 859                   1                  4         13           3         2
## 860                   1                  4         13           3         2
## 861                   1                  4         13           3         2
## 862                   1                  4         13           3         2
## 863                   1                  4         13           3         2
## 864                   1                  4         13           3         2
## 865                   7                  7         26           1         2
## 866                   7                  7         26           1         2
## 867                   7                  7         26           1         2
## 868                   7                  7         26           1         2
## 869                   7                  7         26           1         2
## 870                   7                  7         26           1         2
## 871                   7                  7         26           1         2
## 872                   7                  7         26           1         2
## 873                   7                  7         26           1         2
## 874                   7                  7         26           1         2
## 875                   7                  7         26           1         2
## 876                   7                  7         26           1         2
## 877                   7                  7         26           1         2
## 878                   7                  7         26           1         2
## 879                   7                  7         26           1         2
## 880                   7                  7         26           1         2
## 881                   5                  6         19           2         1
## 882                   5                  6         19           2         1
## 883                   5                  6         19           2         1
## 884                   5                  6         19           2         1
## 885                   5                  6         19           2         1
## 886                   5                  6         19           2         1
## 887                   5                  6         19           2         1
## 888                   5                  6         19           2         1
## 889                   5                  6         19           2         1
## 890                   5                  6         19           2         1
## 891                   5                  6         19           2         1
## 892                   5                  6         19           2         1
## 893                   5                  6         19           2         1
## 894                   5                  6         19           2         1
## 895                   5                  6         19           2         1
## 896                   5                  6         19           2         1
## 897                   5                  6         20           1         2
## 898                   5                  6         20           1         2
## 899                   5                  6         20           1         2
## 900                   5                  6         20           1         2
## 901                   5                  6         20           1         2
## 902                   5                  6         20           1         2
## 903                   5                  6         20           1         2
## 904                   5                  6         20           1         2
## 905                   5                  6         20           1         2
## 906                   5                  6         20           1         2
## 907                   5                  6         20           1         2
## 908                   5                  6         20           1         2
## 909                   5                  6         20           1         2
## 910                   5                  6         20           1         2
## 911                   5                  6         20           1         2
## 912                   5                  6         20           1         2
## 913                   6                  7         25           1         1
## 914                   6                  7         25           1         1
## 915                   6                  7         25           1         1
## 916                   6                  7         25           1         1
## 917                   6                  7         25           1         1
## 918                   6                  7         25           1         1
## 919                   6                  7         25           1         1
## 920                   6                  7         25           1         1
## 921                   6                  7         25           1         1
## 922                   6                  7         25           1         1
## 923                   6                  7         25           1         1
## 924                   6                  7         25           1         1
## 925                   6                  7         25           1         1
## 926                   6                  7         25           1         1
## 927                   6                  7         25           1         1
## 928                   6                  7         25           1         1
## 929                   2                  4         12           2         2
## 930                   2                  4         12           2         2
## 931                   2                  4         12           2         2
## 932                   2                  4         12           2         2
## 933                   2                  4         12           2         2
## 934                   2                  4         12           2         2
## 935                   2                  4         12           2         2
## 936                   2                  4         12           2         2
## 937                   2                  4         12           2         2
## 938                   2                  4         12           2         2
## 939                   2                  4         12           2         2
## 940                   2                  4         12           2         2
## 941                   2                  4         12           2         2
## 942                   2                  4         12           2         2
## 943                   2                  4         12           2         2
## 944                   2                  4         12           2         2
## 945                   6                  5         19           1         2
## 946                   6                  5         19           1         2
## 947                   6                  5         19           1         2
## 948                   6                  5         19           1         2
## 949                   6                  5         19           1         2
## 950                   6                  5         19           1         2
## 951                   6                  5         19           1         2
## 952                   6                  5         19           1         2
## 953                   6                  5         19           1         2
## 954                   6                  5         19           1         2
## 955                   6                  5         19           1         2
## 956                   6                  5         19           1         2
## 957                   6                  5         19           1         2
## 958                   6                  5         19           1         2
## 959                   6                  5         19           1         2
## 960                   6                  5         19           1         2
## 961                   6                  6         20           3         1
## 962                   6                  6         20           3         1
## 963                   6                  6         20           3         1
## 964                   6                  6         20           3         1
## 965                   6                  6         20           3         1
## 966                   6                  6         20           3         1
## 967                   6                  6         20           3         1
## 968                   6                  6         20           3         1
## 969                   6                  6         20           3         1
## 970                   6                  6         20           3         1
## 971                   6                  6         20           3         1
## 972                   6                  6         20           3         1
## 973                   6                  6         20           3         1
## 974                   6                  6         20           3         1
## 975                   6                  6         20           3         1
## 976                   6                  6         20           3         1
## 977                   4                  2         14           3         2
## 978                   4                  2         14           3         2
## 979                   4                  2         14           3         2
## 980                   4                  2         14           3         2
## 981                   4                  2         14           3         2
## 982                   4                  2         14           3         2
## 983                   4                  2         14           3         2
## 984                   4                  2         14           3         2
## 985                   4                  2         14           3         2
## 986                   4                  2         14           3         2
## 987                   4                  2         14           3         2
## 988                   4                  2         14           3         2
## 989                   4                  2         14           3         2
## 990                   4                  2         14           3         2
## 991                   4                  2         14           3         2
## 992                   4                  2         14           3         2
## 993                   7                  7         25           1         1
## 994                   7                  7         25           1         1
## 995                   7                  7         25           1         1
## 996                   7                  7         25           1         1
## 997                   7                  7         25           1         1
## 998                   7                  7         25           1         1
## 999                   7                  7         25           1         1
## 1000                  7                  7         25           1         1
## 1001                  7                  7         25           1         1
## 1002                  7                  7         25           1         1
## 1003                  7                  7         25           1         1
## 1004                  7                  7         25           1         1
## 1005                  7                  7         25           1         1
## 1006                  7                  7         25           1         1
## 1007                  7                  7         25           1         1
## 1008                  7                  7         25           1         1
## 1009                  3                  5         16           3         2
## 1010                  3                  5         16           3         2
## 1011                  3                  5         16           3         2
## 1012                  3                  5         16           3         2
## 1013                  3                  5         16           3         2
## 1014                  3                  5         16           3         2
## 1015                  3                  5         16           3         2
## 1016                  3                  5         16           3         2
## 1017                  3                  5         16           3         2
## 1018                  3                  5         16           3         2
## 1019                  3                  5         16           3         2
## 1020                  3                  5         16           3         2
## 1021                  3                  5         16           3         2
## 1022                  3                  5         16           3         2
## 1023                  3                  5         16           3         2
## 1024                  3                  5         16           3         2
## 1025                  7                  3         14           3         2
## 1026                  7                  3         14           3         2
## 1027                  7                  3         14           3         2
## 1028                  7                  3         14           3         2
## 1029                  7                  3         14           3         2
## 1030                  7                  3         14           3         2
## 1031                  7                  3         14           3         2
## 1032                  7                  3         14           3         2
## 1033                  7                  3         14           3         2
## 1034                  7                  3         14           3         2
## 1035                  7                  3         14           3         2
## 1036                  7                  3         14           3         2
## 1037                  7                  3         14           3         2
## 1038                  7                  3         14           3         2
## 1039                  7                  3         14           3         2
## 1040                  7                  3         14           3         2
## 1041                  4                  2         11           1         2
## 1042                  4                  2         11           1         2
## 1043                  4                  2         11           1         2
## 1044                  4                  2         11           1         2
## 1045                  4                  2         11           1         2
## 1046                  4                  2         11           1         2
## 1047                  4                  2         11           1         2
## 1048                  4                  2         11           1         2
## 1049                  4                  2         11           1         2
## 1050                  4                  2         11           1         2
## 1051                  4                  2         11           1         2
## 1052                  4                  2         11           1         2
## 1053                  4                  2         11           1         2
## 1054                  4                  2         11           1         2
## 1055                  4                  2         11           1         2
## 1056                  4                  2         11           1         2
## 1057                  7                  6         26           1         1
## 1058                  7                  6         26           1         1
## 1059                  7                  6         26           1         1
## 1060                  7                  6         26           1         1
## 1061                  7                  6         26           1         1
## 1062                  7                  6         26           1         1
## 1063                  7                  6         26           1         1
## 1064                  7                  6         26           1         1
## 1065                  7                  6         26           1         1
## 1066                  7                  6         26           1         1
## 1067                  7                  6         26           1         1
## 1068                  7                  6         26           1         1
## 1069                  7                  6         26           1         1
## 1070                  7                  6         26           1         1
## 1071                  7                  6         26           1         1
## 1072                  7                  6         26           1         1
## 1073                  1                  1          4           3         2
## 1074                  1                  1          4           3         2
## 1075                  1                  1          4           3         2
## 1076                  1                  1          4           3         2
## 1077                  1                  1          4           3         2
## 1078                  1                  1          4           3         2
## 1079                  1                  1          4           3         2
## 1080                  1                  1          4           3         2
## 1081                  1                  1          4           3         2
## 1082                  1                  1          4           3         2
## 1083                  1                  1          4           3         2
## 1084                  1                  1          4           3         2
## 1085                  1                  1          4           3         2
## 1086                  1                  1          4           3         2
## 1087                  1                  1          4           3         2
## 1088                  1                  1          4           3         2
## 1089                  4                  5         16           3         2
## 1090                  4                  5         16           3         2
## 1091                  4                  5         16           3         2
## 1092                  4                  5         16           3         2
## 1093                  4                  5         16           3         2
## 1094                  4                  5         16           3         2
## 1095                  4                  5         16           3         2
## 1096                  4                  5         16           3         2
## 1097                  4                  5         16           3         2
## 1098                  4                  5         16           3         2
## 1099                  4                  5         16           3         2
## 1100                  4                  5         16           3         2
## 1101                  4                  5         16           3         2
## 1102                  4                  5         16           3         2
## 1103                  4                  5         16           3         2
## 1104                  4                  5         16           3         2
## 1105                 NA                 NA         NA           1         2
## 1106                 NA                 NA         NA           1         2
## 1107                 NA                 NA         NA           1         2
## 1108                 NA                 NA         NA           1         2
## 1109                 NA                 NA         NA           1         2
## 1110                 NA                 NA         NA           1         2
## 1111                 NA                 NA         NA           1         2
## 1112                 NA                 NA         NA           1         2
## 1113                 NA                 NA         NA           1         2
## 1114                 NA                 NA         NA           1         2
## 1115                 NA                 NA         NA           1         2
## 1116                 NA                 NA         NA           1         2
## 1117                 NA                 NA         NA           1         2
## 1118                 NA                 NA         NA           1         2
## 1119                 NA                 NA         NA           1         2
## 1120                 NA                 NA         NA           1         2
## 1121                  6                  4         13           2         2
## 1122                  6                  4         13           2         2
## 1123                  6                  4         13           2         2
## 1124                  6                  4         13           2         2
## 1125                  6                  4         13           2         2
## 1126                  6                  4         13           2         2
## 1127                  6                  4         13           2         2
## 1128                  6                  4         13           2         2
## 1129                  6                  4         13           2         2
## 1130                  6                  4         13           2         2
## 1131                  6                  4         13           2         2
## 1132                  6                  4         13           2         2
## 1133                  6                  4         13           2         2
## 1134                  6                  4         13           2         2
## 1135                  6                  4         13           2         2
## 1136                  6                  4         13           2         2
## 1137                  4                  4         15           3         2
## 1138                  4                  4         15           3         2
## 1139                  4                  4         15           3         2
## 1140                  4                  4         15           3         2
## 1141                  4                  4         15           3         2
## 1142                  4                  4         15           3         2
## 1143                  4                  4         15           3         2
## 1144                  4                  4         15           3         2
## 1145                  4                  4         15           3         2
## 1146                  4                  4         15           3         2
## 1147                  4                  4         15           3         2
## 1148                  4                  4         15           3         2
## 1149                  4                  4         15           3         2
## 1150                  4                  4         15           3         2
## 1151                  4                  4         15           3         2
## 1152                  4                  4         15           3         2
## 1153                  2                  2          8           1         2
## 1154                  2                  2          8           1         2
## 1155                  2                  2          8           1         2
## 1156                  2                  2          8           1         2
## 1157                  2                  2          8           1         2
## 1158                  2                  2          8           1         2
## 1159                  2                  2          8           1         2
## 1160                  2                  2          8           1         2
## 1161                  2                  2          8           1         2
## 1162                  2                  2          8           1         2
## 1163                  2                  2          8           1         2
## 1164                  2                  2          8           1         2
## 1165                  2                  2          8           1         2
## 1166                  2                  2          8           1         2
## 1167                  2                  2          8           1         2
## 1168                  2                  2          8           1         2
## 1169                  4                  5         18           1         2
## 1170                  4                  5         18           1         2
## 1171                  4                  5         18           1         2
## 1172                  4                  5         18           1         2
## 1173                  4                  5         18           1         2
## 1174                  4                  5         18           1         2
## 1175                  4                  5         18           1         2
## 1176                  4                  5         18           1         2
## 1177                  4                  5         18           1         2
## 1178                  4                  5         18           1         2
## 1179                  4                  5         18           1         2
## 1180                  4                  5         18           1         2
## 1181                  4                  5         18           1         2
## 1182                  4                  5         18           1         2
## 1183                  4                  5         18           1         2
## 1184                  4                  5         18           1         2
## 1185                  4                  6         18           1         2
## 1186                  4                  6         18           1         2
## 1187                  4                  6         18           1         2
## 1188                  4                  6         18           1         2
## 1189                  4                  6         18           1         2
## 1190                  4                  6         18           1         2
## 1191                  4                  6         18           1         2
## 1192                  4                  6         18           1         2
## 1193                  4                  6         18           1         2
## 1194                  4                  6         18           1         2
## 1195                  4                  6         18           1         2
## 1196                  4                  6         18           1         2
## 1197                  4                  6         18           1         2
## 1198                  4                  6         18           1         2
## 1199                  4                  6         18           1         2
## 1200                  4                  6         18           1         2
## 1201                 NA                  4         NA           1         2
## 1202                 NA                  4         NA           1         2
## 1203                 NA                  4         NA           1         2
## 1204                 NA                  4         NA           1         2
## 1205                 NA                  4         NA           1         2
## 1206                 NA                  4         NA           1         2
## 1207                 NA                  4         NA           1         2
## 1208                 NA                  4         NA           1         2
## 1209                 NA                  4         NA           1         2
## 1210                 NA                  4         NA           1         2
## 1211                 NA                  4         NA           1         2
## 1212                 NA                  4         NA           1         2
## 1213                 NA                  4         NA           1         2
## 1214                 NA                  4         NA           1         2
## 1215                 NA                  4         NA           1         2
## 1216                 NA                  4         NA           1         2
## 1217                  7                  6         23           1         1
## 1218                  7                  6         23           1         1
## 1219                  7                  6         23           1         1
## 1220                  7                  6         23           1         1
## 1221                  7                  6         23           1         1
## 1222                  7                  6         23           1         1
## 1223                  7                  6         23           1         1
## 1224                  7                  6         23           1         1
## 1225                  7                  6         23           1         1
## 1226                  7                  6         23           1         1
## 1227                  7                  6         23           1         1
## 1228                  7                  6         23           1         1
## 1229                  7                  6         23           1         1
## 1230                  7                  6         23           1         1
## 1231                  7                  6         23           1         1
## 1232                  7                  6         23           1         1
## 1233                  4                  1         12           1         2
## 1234                  4                  1         12           1         2
## 1235                  4                  1         12           1         2
## 1236                  4                  1         12           1         2
## 1237                  4                  1         12           1         2
## 1238                  4                  1         12           1         2
## 1239                  4                  1         12           1         2
## 1240                  4                  1         12           1         2
## 1241                  4                  1         12           1         2
## 1242                  4                  1         12           1         2
## 1243                  4                  1         12           1         2
## 1244                  4                  1         12           1         2
## 1245                  4                  1         12           1         2
## 1246                  4                  1         12           1         2
## 1247                  4                  1         12           1         2
## 1248                  4                  1         12           1         2
## 1249                  5                  3         15           1         2
## 1250                  5                  3         15           1         2
## 1251                  5                  3         15           1         2
## 1252                  5                  3         15           1         2
## 1253                  5                  3         15           1         2
## 1254                  5                  3         15           1         2
## 1255                  5                  3         15           1         2
## 1256                  5                  3         15           1         2
## 1257                  5                  3         15           1         2
## 1258                  5                  3         15           1         2
## 1259                  5                  3         15           1         2
## 1260                  5                  3         15           1         2
## 1261                  5                  3         15           1         2
## 1262                  5                  3         15           1         2
## 1263                  5                  3         15           1         2
## 1264                  5                  3         15           1         2
## 1265                  7                  7         28           1         1
## 1266                  7                  7         28           1         1
## 1267                  7                  7         28           1         1
## 1268                  7                  7         28           1         1
## 1269                  7                  7         28           1         1
## 1270                  7                  7         28           1         1
## 1271                  7                  7         28           1         1
## 1272                  7                  7         28           1         1
## 1273                  7                  7         28           1         1
## 1274                  7                  7         28           1         1
## 1275                  7                  7         28           1         1
## 1276                  7                  7         28           1         1
## 1277                  7                  7         28           1         1
## 1278                  7                  7         28           1         1
## 1279                  7                  7         28           1         1
## 1280                  7                  7         28           1         1
## 1281                  5                  6         25           3         2
## 1282                  5                  6         25           3         2
## 1283                  5                  6         25           3         2
## 1284                  5                  6         25           3         2
## 1285                  5                  6         25           3         2
## 1286                  5                  6         25           3         2
## 1287                  5                  6         25           3         2
## 1288                  5                  6         25           3         2
## 1289                  5                  6         25           3         2
## 1290                  5                  6         25           3         2
## 1291                  5                  6         25           3         2
## 1292                  5                  6         25           3         2
## 1293                  5                  6         25           3         2
## 1294                  5                  6         25           3         2
## 1295                  5                  6         25           3         2
## 1296                  5                  6         25           3         2
## 1297                  5                  3         20           1         1
## 1298                  5                  3         20           1         1
## 1299                  5                  3         20           1         1
## 1300                  5                  3         20           1         1
## 1301                  5                  3         20           1         1
## 1302                  5                  3         20           1         1
## 1303                  5                  3         20           1         1
## 1304                  5                  3         20           1         1
## 1305                  5                  3         20           1         1
## 1306                  5                  3         20           1         1
## 1307                  5                  3         20           1         1
## 1308                  5                  3         20           1         1
## 1309                  5                  3         20           1         1
## 1310                  5                  3         20           1         1
## 1311                  5                  3         20           1         1
## 1312                  5                  3         20           1         1
## 1313                  7                  7         25           1         1
## 1314                  7                  7         25           1         1
## 1315                  7                  7         25           1         1
##      attend2cat DemsvReps secularism2cat race2cat religiosity Candidate Task
## 1             1         2              2        1           9         1    1
## 2             1         2              2        1           9         2    1
## 3             1         2              2        1           9         1    2
## 4             1         2              2        1           9         2    2
## 5             1         2              2        1           9         1    3
## 6             1         2              2        1           9         2    3
## 7             1         2              2        1           9         1    4
## 8             1         2              2        1           9         2    4
## 9             1         2              2        1           9         1    5
## 10            1         2              2        1           9         2    5
## 11            1         2              2        1           9         1    6
## 12            1         2              2        1           9         2    6
## 13            1         2              2        1           9         1    7
## 14            1         2              2        1           9         2    7
## 15            1         2              2        1           9         1    8
## 16            1         2              2        1           9         2    8
## 17            2         1              2        1           7         1    1
## 18            2         1              2        1           7         2    1
## 19            2         1              2        1           7         1    2
## 20            2         1              2        1           7         2    2
## 21            2         1              2        1           7         1    3
## 22            2         1              2        1           7         2    3
## 23            2         1              2        1           7         1    4
## 24            2         1              2        1           7         2    4
## 25            2         1              2        1           7         1    5
## 26            2         1              2        1           7         2    5
## 27            2         1              2        1           7         1    6
## 28            2         1              2        1           7         2    6
## 29            2         1              2        1           7         1    7
## 30            2         1              2        1           7         2    7
## 31            2         1              2        1           7         1    8
## 32            2         1              2        1           7         2    8
## 33            1         1              1        1           3         1    1
## 34            1         1              1        1           3         2    1
## 35            1         1              1        1           3         1    2
## 36            1         1              1        1           3         2    2
## 37            1         1              1        1           3         1    3
## 38            1         1              1        1           3         2    3
## 39            1         1              1        1           3         1    4
## 40            1         1              1        1           3         2    4
## 41            1         1              1        1           3         1    5
## 42            1         1              1        1           3         2    5
## 43            1         1              1        1           3         1    6
## 44            1         1              1        1           3         2    6
## 45            1         1              1        1           3         1    7
## 46            1         1              1        1           3         2    7
## 47            1         1              1        1           3         1    8
## 48            1         1              1        1           3         2    8
## 49            1         2             NA        2           6         1    1
## 50            1         2             NA        2           6         2    1
## 51            1         2             NA        2           6         1    2
## 52            1         2             NA        2           6         2    2
## 53            1         2             NA        2           6         1    3
## 54            1         2             NA        2           6         2    3
## 55            1         2             NA        2           6         1    4
## 56            1         2             NA        2           6         2    4
## 57            1         2             NA        2           6         1    5
## 58            1         2             NA        2           6         2    5
## 59            1         2             NA        2           6         1    6
## 60            1         2             NA        2           6         2    6
## 61            1         2             NA        2           6         1    7
## 62            1         2             NA        2           6         2    7
## 63            1         2             NA        2           6         1    8
## 64            1         2             NA        2           6         2    8
## 65            1         1              2        1           5         1    1
## 66            1         1              2        1           5         2    1
## 67            1         1              2        1           5         1    2
## 68            1         1              2        1           5         2    2
## 69            1         1              2        1           5         1    3
## 70            1         1              2        1           5         2    3
## 71            1         1              2        1           5         1    4
## 72            1         1              2        1           5         2    4
## 73            1         1              2        1           5         1    5
## 74            1         1              2        1           5         2    5
## 75            1         1              2        1           5         1    6
## 76            1         1              2        1           5         2    6
## 77            1         1              2        1           5         1    7
## 78            1         1              2        1           5         2    7
## 79            1         1              2        1           5         1    8
## 80            1         1              2        1           5         2    8
## 81            1        NA              1        2           7         1    1
## 82            1        NA              1        2           7         2    1
## 83            1        NA              1        2           7         1    2
## 84            1        NA              1        2           7         2    2
## 85            1        NA              1        2           7         1    3
## 86            1        NA              1        2           7         2    3
## 87            1        NA              1        2           7         1    4
## 88            1        NA              1        2           7         2    4
## 89            1        NA              1        2           7         1    5
## 90            1        NA              1        2           7         2    5
## 91            1        NA              1        2           7         1    6
## 92            1        NA              1        2           7         2    6
## 93            1        NA              1        2           7         1    7
## 94            1        NA              1        2           7         2    7
## 95            1        NA              1        2           7         1    8
## 96            1        NA              1        2           7         2    8
## 97            2         1              1        1          15         1    1
## 98            2         1              1        1          15         2    1
## 99            2         1              1        1          15         1    2
## 100           2         1              1        1          15         2    2
## 101           2         1              1        1          15         1    3
## 102           2         1              1        1          15         2    3
## 103           2         1              1        1          15         1    4
## 104           2         1              1        1          15         2    4
## 105           2         1              1        1          15         1    5
## 106           2         1              1        1          15         2    5
## 107           2         1              1        1          15         1    6
## 108           2         1              1        1          15         2    6
## 109           2         1              1        1          15         1    7
## 110           2         1              1        1          15         2    7
## 111           2         1              1        1          15         1    8
## 112           2         1              1        1          15         2    8
## 113           2         1              2        1           9         1    1
## 114           2         1              2        1           9         2    1
## 115           2         1              2        1           9         1    2
## 116           2         1              2        1           9         2    2
## 117           2         1              2        1           9         1    3
## 118           2         1              2        1           9         2    3
## 119           2         1              2        1           9         1    4
## 120           2         1              2        1           9         2    4
## 121           2         1              2        1           9         1    5
## 122           2         1              2        1           9         2    5
## 123           2         1              2        1           9         1    6
## 124           2         1              2        1           9         2    6
## 125           2         1              2        1           9         1    7
## 126           2         1              2        1           9         2    7
## 127           2         1              2        1           9         1    8
## 128           2         1              2        1           9         2    8
## 129           2         1              1        1          10         1    1
## 130           2         1              1        1          10         2    1
## 131           2         1              1        1          10         1    2
## 132           2         1              1        1          10         2    2
## 133           2         1              1        1          10         1    3
## 134           2         1              1        1          10         2    3
## 135           2         1              1        1          10         1    4
## 136           2         1              1        1          10         2    4
## 137           2         1              1        1          10         1    5
## 138           2         1              1        1          10         2    5
## 139           2         1              1        1          10         1    6
## 140           2         1              1        1          10         2    6
## 141           2         1              1        1          10         1    7
## 142           2         1              1        1          10         2    7
## 143           2         1              1        1          10         1    8
## 144           2         1              1        1          10         2    8
## 145           1        NA              2        2          10         1    1
## 146           1        NA              2        2          10         2    1
## 147           1        NA              2        2          10         1    2
## 148           1        NA              2        2          10         2    2
## 149           1        NA              2        2          10         1    3
## 150           1        NA              2        2          10         2    3
## 151           1        NA              2        2          10         1    4
## 152           1        NA              2        2          10         2    4
## 153           1        NA              2        2          10         1    5
## 154           1        NA              2        2          10         2    5
## 155           1        NA              2        2          10         1    6
## 156           1        NA              2        2          10         2    6
## 157           1        NA              2        2          10         1    7
## 158           1        NA              2        2          10         2    7
## 159           1        NA              2        2          10         1    8
## 160           1        NA              2        2          10         2    8
## 161           2        NA              1        1          12         1    1
## 162           2        NA              1        1          12         2    1
## 163           2        NA              1        1          12         1    2
## 164           2        NA              1        1          12         2    2
## 165           2        NA              1        1          12         1    3
## 166           2        NA              1        1          12         2    3
## 167           2        NA              1        1          12         1    4
## 168           2        NA              1        1          12         2    4
## 169           2        NA              1        1          12         1    5
## 170           2        NA              1        1          12         2    5
## 171           2        NA              1        1          12         1    6
## 172           2        NA              1        1          12         2    6
## 173           2        NA              1        1          12         1    7
## 174           2        NA              1        1          12         2    7
## 175           2        NA              1        1          12         1    8
## 176           2        NA              1        1          12         2    8
## 177           1         1              1        2          10         1    1
## 178           1         1              1        2          10         2    1
## 179           1         1              1        2          10         1    2
## 180           1         1              1        2          10         2    2
## 181           1         1              1        2          10         1    3
## 182           1         1              1        2          10         2    3
## 183           1         1              1        2          10         1    4
## 184           1         1              1        2          10         2    4
## 185           1         1              1        2          10         1    5
## 186           1         1              1        2          10         2    5
## 187           1         1              1        2          10         1    6
## 188           1         1              1        2          10         2    6
## 189           1         1              1        2          10         1    7
## 190           1         1              1        2          10         2    7
## 191           1         1              1        2          10         1    8
## 192           1         1              1        2          10         2    8
## 193           1         1              2        1           3         1    1
## 194           1         1              2        1           3         2    1
## 195           1         1              2        1           3         1    2
## 196           1         1              2        1           3         2    2
## 197           1         1              2        1           3         1    3
## 198           1         1              2        1           3         2    3
## 199           1         1              2        1           3         1    4
## 200           1         1              2        1           3         2    4
## 201           1         1              2        1           3         1    5
## 202           1         1              2        1           3         2    5
## 203           1         1              2        1           3         1    6
## 204           1         1              2        1           3         2    6
## 205           1         1              2        1           3         1    7
## 206           1         1              2        1           3         2    7
## 207           1         1              2        1           3         1    8
## 208           1         1              2        1           3         2    8
## 209           2         1              2        1          12         1    1
## 210           2         1              2        1          12         2    1
## 211           2         1              2        1          12         1    2
## 212           2         1              2        1          12         2    2
## 213           2         1              2        1          12         1    3
## 214           2         1              2        1          12         2    3
## 215           2         1              2        1          12         1    4
## 216           2         1              2        1          12         2    4
## 217           2         1              2        1          12         1    5
## 218           2         1              2        1          12         2    5
## 219           2         1              2        1          12         1    6
## 220           2         1              2        1          12         2    6
## 221           2         1              2        1          12         1    7
## 222           2         1              2        1          12         2    7
## 223           2         1              2        1          12         1    8
## 224           2         1              2        1          12         2    8
## 225           1         2              1        1           9         1    1
## 226           1         2              1        1           9         2    1
## 227           1         2              1        1           9         1    2
## 228           1         2              1        1           9         2    2
## 229           1         2              1        1           9         1    3
## 230           1         2              1        1           9         2    3
## 231           1         2              1        1           9         1    4
## 232           1         2              1        1           9         2    4
## 233           1         2              1        1           9         1    5
## 234           1         2              1        1           9         2    5
## 235           1         2              1        1           9         1    6
## 236           1         2              1        1           9         2    6
## 237           1         2              1        1           9         1    7
## 238           1         2              1        1           9         2    7
## 239           1         2              1        1           9         1    8
## 240           1         2              1        1           9         2    8
## 241           2         2              2        1          15         1    1
## 242           2         2              2        1          15         2    1
## 243           2         2              2        1          15         1    2
## 244           2         2              2        1          15         2    2
## 245           2         2              2        1          15         1    3
## 246           2         2              2        1          15         2    3
## 247           2         2              2        1          15         1    4
## 248           2         2              2        1          15         2    4
## 249           2         2              2        1          15         1    5
## 250           2         2              2        1          15         2    5
## 251           2         2              2        1          15         1    6
## 252           2         2              2        1          15         2    6
## 253           2         2              2        1          15         1    7
## 254           2         2              2        1          15         2    7
## 255           2         2              2        1          15         1    8
## 256           2         2              2        1          15         2    8
## 257           1         1              2        1           5         1    1
## 258           1         1              2        1           5         2    1
## 259           1         1              2        1           5         1    2
## 260           1         1              2        1           5         2    2
## 261           1         1              2        1           5         1    3
## 262           1         1              2        1           5         2    3
## 263           1         1              2        1           5         1    4
## 264           1         1              2        1           5         2    4
## 265           1         1              2        1           5         1    5
## 266           1         1              2        1           5         2    5
## 267           1         1              2        1           5         1    6
## 268           1         1              2        1           5         2    6
## 269           1         1              2        1           5         1    7
## 270           1         1              2        1           5         2    7
## 271           1         1              2        1           5         1    8
## 272           1         1              2        1           5         2    8
## 273           1         1              2        1           4         1    1
## 274           1         1              2        1           4         2    1
## 275           1         1              2        1           4         1    2
## 276           1         1              2        1           4         2    2
## 277           1         1              2        1           4         1    3
## 278           1         1              2        1           4         2    3
## 279           1         1              2        1           4         1    4
## 280           1         1              2        1           4         2    4
## 281           1         1              2        1           4         1    5
## 282           1         1              2        1           4         2    5
## 283           1         1              2        1           4         1    6
## 284           1         1              2        1           4         2    6
## 285           1         1              2        1           4         1    7
## 286           1         1              2        1           4         2    7
## 287           1         1              2        1           4         1    8
## 288           1         1              2        1           4         2    8
## 289           2         1              2        1          11         1    1
## 290           2         1              2        1          11         2    1
## 291           2         1              2        1          11         1    2
## 292           2         1              2        1          11         2    2
## 293           2         1              2        1          11         1    3
## 294           2         1              2        1          11         2    3
## 295           2         1              2        1          11         1    4
## 296           2         1              2        1          11         2    4
## 297           2         1              2        1          11         1    5
## 298           2         1              2        1          11         2    5
## 299           2         1              2        1          11         1    6
## 300           2         1              2        1          11         2    6
## 301           2         1              2        1          11         1    7
## 302           2         1              2        1          11         2    7
## 303           2         1              2        1          11         1    8
## 304           2         1              2        1          11         2    8
## 305           1        NA              2        1           4         1    1
## 306           1        NA              2        1           4         2    1
## 307           1        NA              2        1           4         1    2
## 308           1        NA              2        1           4         2    2
## 309           1        NA              2        1           4         1    3
## 310           1        NA              2        1           4         2    3
## 311           1        NA              2        1           4         1    4
## 312           1        NA              2        1           4         2    4
## 313           1        NA              2        1           4         1    5
## 314           1        NA              2        1           4         2    5
## 315           1        NA              2        1           4         1    6
## 316           1        NA              2        1           4         2    6
## 317           1        NA              2        1           4         1    7
## 318           1        NA              2        1           4         2    7
## 319           1        NA              2        1           4         1    8
## 320           1        NA              2        1           4         2    8
## 321           1         1              2        1           3         1    1
## 322           1         1              2        1           3         2    1
## 323           1         1              2        1           3         1    2
## 324           1         1              2        1           3         2    2
## 325           1         1              2        1           3         1    3
## 326           1         1              2        1           3         2    3
## 327           1         1              2        1           3         1    4
## 328           1         1              2        1           3         2    4
## 329           1         1              2        1           3         1    5
## 330           1         1              2        1           3         2    5
## 331           1         1              2        1           3         1    6
## 332           1         1              2        1           3         2    6
## 333           1         1              2        1           3         1    7
## 334           1         1              2        1           3         2    7
## 335           1         1              2        1           3         1    8
## 336           1         1              2        1           3         2    8
## 337           1         1              2        1           9         1    1
## 338           1         1              2        1           9         2    1
## 339           1         1              2        1           9         1    2
## 340           1         1              2        1           9         2    2
## 341           1         1              2        1           9         1    3
## 342           1         1              2        1           9         2    3
## 343           1         1              2        1           9         1    4
## 344           1         1              2        1           9         2    4
## 345           1         1              2        1           9         1    5
## 346           1         1              2        1           9         2    5
## 347           1         1              2        1           9         1    6
## 348           1         1              2        1           9         2    6
## 349           1         1              2        1           9         1    7
## 350           1         1              2        1           9         2    7
## 351           1         1              2        1           9         1    8
## 352           1         1              2        1           9         2    8
## 353           1         2              2        1           7         1    1
## 354           1         2              2        1           7         2    1
## 355           1         2              2        1           7         1    2
## 356           1         2              2        1           7         2    2
## 357           1         2              2        1           7         1    3
## 358           1         2              2        1           7         2    3
## 359           1         2              2        1           7         1    4
## 360           1         2              2        1           7         2    4
## 361           1         2              2        1           7         1    5
## 362           1         2              2        1           7         2    5
## 363           1         2              2        1           7         1    6
## 364           1         2              2        1           7         2    6
## 365           1         2              2        1           7         1    7
## 366           1         2              2        1           7         2    7
## 367           1         2              2        1           7         1    8
## 368           1         2              2        1           7         2    8
## 369           2         2              1        1          10         1    1
## 370           2         2              1        1          10         2    1
## 371           2         2              1        1          10         1    2
## 372           2         2              1        1          10         2    2
## 373           2         2              1        1          10         1    3
## 374           2         2              1        1          10         2    3
## 375           2         2              1        1          10         1    4
## 376           2         2              1        1          10         2    4
## 377           2         2              1        1          10         1    5
## 378           2         2              1        1          10         2    5
## 379           2         2              1        1          10         1    6
## 380           2         2              1        1          10         2    6
## 381           2         2              1        1          10         1    7
## 382           2         2              1        1          10         2    7
## 383           2         2              1        1          10         1    8
## 384           2         2              1        1          10         2    8
## 385           1        NA              1        1           4         1    1
## 386           1        NA              1        1           4         2    1
## 387           1        NA              1        1           4         1    2
## 388           1        NA              1        1           4         2    2
## 389           1        NA              1        1           4         1    3
## 390           1        NA              1        1           4         2    3
## 391           1        NA              1        1           4         1    4
## 392           1        NA              1        1           4         2    4
## 393           1        NA              1        1           4         1    5
## 394           1        NA              1        1           4         2    5
## 395           1        NA              1        1           4         1    6
## 396           1        NA              1        1           4         2    6
## 397           1        NA              1        1           4         1    7
## 398           1        NA              1        1           4         2    7
## 399           1        NA              1        1           4         1    8
## 400           1        NA              1        1           4         2    8
## 401           1         1              1        1           9         1    1
## 402           1         1              1        1           9         2    1
## 403           1         1              1        1           9         1    2
## 404           1         1              1        1           9         2    2
## 405           1         1              1        1           9         1    3
## 406           1         1              1        1           9         2    3
## 407           1         1              1        1           9         1    4
## 408           1         1              1        1           9         2    4
## 409           1         1              1        1           9         1    5
## 410           1         1              1        1           9         2    5
## 411           1         1              1        1           9         1    6
## 412           1         1              1        1           9         2    6
## 413           1         1              1        1           9         1    7
## 414           1         1              1        1           9         2    7
## 415           1         1              1        1           9         1    8
## 416           1         1              1        1           9         2    8
## 417           2         2              2        1          14         1    1
## 418           2         2              2        1          14         2    1
## 419           2         2              2        1          14         1    2
## 420           2         2              2        1          14         2    2
## 421           2         2              2        1          14         1    3
## 422           2         2              2        1          14         2    3
## 423           2         2              2        1          14         1    4
## 424           2         2              2        1          14         2    4
## 425           2         2              2        1          14         1    5
## 426           2         2              2        1          14         2    5
## 427           2         2              2        1          14         1    6
## 428           2         2              2        1          14         2    6
## 429           2         2              2        1          14         1    7
## 430           2         2              2        1          14         2    7
## 431           2         2              2        1          14         1    8
## 432           2         2              2        1          14         2    8
## 433           1         1              1        1           9         1    1
## 434           1         1              1        1           9         2    1
## 435           1         1              1        1           9         1    2
## 436           1         1              1        1           9         2    2
## 437           1         1              1        1           9         1    3
## 438           1         1              1        1           9         2    3
## 439           1         1              1        1           9         1    4
## 440           1         1              1        1           9         2    4
## 441           1         1              1        1           9         1    5
## 442           1         1              1        1           9         2    5
## 443           1         1              1        1           9         1    6
## 444           1         1              1        1           9         2    6
## 445           1         1              1        1           9         1    7
## 446           1         1              1        1           9         2    7
## 447           1         1              1        1           9         1    8
## 448           1         1              1        1           9         2    8
## 449           1         1              2        1           3         1    1
## 450           1         1              2        1           3         2    1
## 451           1         1              2        1           3         1    2
## 452           1         1              2        1           3         2    2
## 453           1         1              2        1           3         1    3
## 454           1         1              2        1           3         2    3
## 455           1         1              2        1           3         1    4
## 456           1         1              2        1           3         2    4
## 457           1         1              2        1           3         1    5
## 458           1         1              2        1           3         2    5
## 459           1         1              2        1           3         1    6
## 460           1         1              2        1           3         2    6
## 461           1         1              2        1           3         1    7
## 462           1         1              2        1           3         2    7
## 463           1         1              2        1           3         1    8
## 464           1         1              2        1           3         2    8
## 465           2         2              2        1          11         1    1
## 466           2         2              2        1          11         2    1
## 467           2         2              2        1          11         1    2
## 468           2         2              2        1          11         2    2
## 469           2         2              2        1          11         1    3
## 470           2         2              2        1          11         2    3
## 471           2         2              2        1          11         1    4
## 472           2         2              2        1          11         2    4
## 473           2         2              2        1          11         1    5
## 474           2         2              2        1          11         2    5
## 475           2         2              2        1          11         1    6
## 476           2         2              2        1          11         2    6
## 477           2         2              2        1          11         1    7
## 478           2         2              2        1          11         2    7
## 479           2         2              2        1          11         1    8
## 480           2         2              2        1          11         2    8
## 481           1         1              2        1           6         1    1
## 482           1         1              2        1           6         2    1
## 483           1         1              2        1           6         1    2
## 484           1         1              2        1           6         2    2
## 485           1         1              2        1           6         1    3
## 486           1         1              2        1           6         2    3
## 487           1         1              2        1           6         1    4
## 488           1         1              2        1           6         2    4
## 489           1         1              2        1           6         1    5
## 490           1         1              2        1           6         2    5
## 491           1         1              2        1           6         1    6
## 492           1         1              2        1           6         2    6
## 493           1         1              2        1           6         1    7
## 494           1         1              2        1           6         2    7
## 495           1         1              2        1           6         1    8
## 496           1         1              2        1           6         2    8
## 497           2         2              1        1          15         1    1
## 498           2         2              1        1          15         2    1
## 499           2         2              1        1          15         1    2
## 500           2         2              1        1          15         2    2
## 501           2         2              1        1          15         1    3
## 502           2         2              1        1          15         2    3
## 503           2         2              1        1          15         1    4
## 504           2         2              1        1          15         2    4
## 505           2         2              1        1          15         1    5
## 506           2         2              1        1          15         2    5
## 507           2         2              1        1          15         1    6
## 508           2         2              1        1          15         2    6
## 509           2         2              1        1          15         1    7
## 510           2         2              1        1          15         2    7
## 511           2         2              1        1          15         1    8
## 512           2         2              1        1          15         2    8
## 513           1         1              2        1           3         1    1
## 514           1         1              2        1           3         2    1
## 515           1         1              2        1           3         1    2
## 516           1         1              2        1           3         2    2
## 517           1         1              2        1           3         1    3
## 518           1         1              2        1           3         2    3
## 519           1         1              2        1           3         1    4
## 520           1         1              2        1           3         2    4
## 521           1         1              2        1           3         1    5
## 522           1         1              2        1           3         2    5
## 523           1         1              2        1           3         1    6
## 524           1         1              2        1           3         2    6
## 525           1         1              2        1           3         1    7
## 526           1         1              2        1           3         2    7
## 527           1         1              2        1           3         1    8
## 528           1         1              2        1           3         2    8
## 529           1        NA              1        1           5         1    1
## 530           1        NA              1        1           5         2    1
## 531           1        NA              1        1           5         1    2
## 532           1        NA              1        1           5         2    2
## 533           1        NA              1        1           5         1    3
## 534           1        NA              1        1           5         2    3
## 535           1        NA              1        1           5         1    4
## 536           1        NA              1        1           5         2    4
## 537           1        NA              1        1           5         1    5
## 538           1        NA              1        1           5         2    5
## 539           1        NA              1        1           5         1    6
## 540           1        NA              1        1           5         2    6
## 541           1        NA              1        1           5         1    7
## 542           1        NA              1        1           5         2    7
## 543           1        NA              1        1           5         1    8
## 544           1        NA              1        1           5         2    8
## 545           2         2              2        1          17         1    1
## 546           2         2              2        1          17         2    1
## 547           2         2              2        1          17         1    2
## 548           2         2              2        1          17         2    2
## 549           2         2              2        1          17         1    3
## 550           2         2              2        1          17         2    3
## 551           2         2              2        1          17         1    4
## 552           2         2              2        1          17         2    4
## 553           2         2              2        1          17         1    5
## 554           2         2              2        1          17         2    5
## 555           2         2              2        1          17         1    6
## 556           2         2              2        1          17         2    6
## 557           2         2              2        1          17         1    7
## 558           2         2              2        1          17         2    7
## 559           2         2              2        1          17         1    8
## 560           2         2              2        1          17         2    8
## 561           1         2              2        1           7         1    1
## 562           1         2              2        1           7         2    1
## 563           1         2              2        1           7         1    2
## 564           1         2              2        1           7         2    2
## 565           1         2              2        1           7         1    3
## 566           1         2              2        1           7         2    3
## 567           1         2              2        1           7         1    4
## 568           1         2              2        1           7         2    4
## 569           1         2              2        1           7         1    5
## 570           1         2              2        1           7         2    5
## 571           1         2              2        1           7         1    6
## 572           1         2              2        1           7         2    6
## 573           1         2              2        1           7         1    7
## 574           1         2              2        1           7         2    7
## 575           1         2              2        1           7         1    8
## 576           1         2              2        1           7         2    8
## 577           1         1              2        2           6         1    1
## 578           1         1              2        2           6         2    1
## 579           1         1              2        2           6         1    2
## 580           1         1              2        2           6         2    2
## 581           1         1              2        2           6         1    3
## 582           1         1              2        2           6         2    3
## 583           1         1              2        2           6         1    4
## 584           1         1              2        2           6         2    4
## 585           1         1              2        2           6         1    5
## 586           1         1              2        2           6         2    5
## 587           1         1              2        2           6         1    6
## 588           1         1              2        2           6         2    6
## 589           1         1              2        2           6         1    7
## 590           1         1              2        2           6         2    7
## 591           1         1              2        2           6         1    8
## 592           1         1              2        2           6         2    8
## 593           2         2              2        1          11         1    1
## 594           2         2              2        1          11         2    1
## 595           2         2              2        1          11         1    2
## 596           2         2              2        1          11         2    2
## 597           2         2              2        1          11         1    3
## 598           2         2              2        1          11         2    3
## 599           2         2              2        1          11         1    4
## 600           2         2              2        1          11         2    4
## 601           2         2              2        1          11         1    5
## 602           2         2              2        1          11         2    5
## 603           2         2              2        1          11         1    6
## 604           2         2              2        1          11         2    6
## 605           2         2              2        1          11         1    7
## 606           2         2              2        1          11         2    7
## 607           2         2              2        1          11         1    8
## 608           2         2              2        1          11         2    8
## 609           2         2              1        1          12         1    1
## 610           2         2              1        1          12         2    1
## 611           2         2              1        1          12         1    2
## 612           2         2              1        1          12         2    2
## 613           2         2              1        1          12         1    3
## 614           2         2              1        1          12         2    3
## 615           2         2              1        1          12         1    4
## 616           2         2              1        1          12         2    4
## 617           2         2              1        1          12         1    5
## 618           2         2              1        1          12         2    5
## 619           2         2              1        1          12         1    6
## 620           2         2              1        1          12         2    6
## 621           2         2              1        1          12         1    7
## 622           2         2              1        1          12         2    7
## 623           2         2              1        1          12         1    8
## 624           2         2              1        1          12         2    8
## 625           1        NA              2        2           9         1    1
## 626           1        NA              2        2           9         2    1
## 627           1        NA              2        2           9         1    2
## 628           1        NA              2        2           9         2    2
## 629           1        NA              2        2           9         1    3
## 630           1        NA              2        2           9         2    3
## 631           1        NA              2        2           9         1    4
## 632           1        NA              2        2           9         2    4
## 633           1        NA              2        2           9         1    5
## 634           1        NA              2        2           9         2    5
## 635           1        NA              2        2           9         1    6
## 636           1        NA              2        2           9         2    6
## 637           1        NA              2        2           9         1    7
## 638           1        NA              2        2           9         2    7
## 639           1        NA              2        2           9         1    8
## 640           1        NA              2        2           9         2    8
## 641           1         1              2        1           4         1    1
## 642           1         1              2        1           4         2    1
## 643           1         1              2        1           4         1    2
## 644           1         1              2        1           4         2    2
## 645           1         1              2        1           4         1    3
## 646           1         1              2        1           4         2    3
## 647           1         1              2        1           4         1    4
## 648           1         1              2        1           4         2    4
## 649           1         1              2        1           4         1    5
## 650           1         1              2        1           4         2    5
## 651           1         1              2        1           4         1    6
## 652           1         1              2        1           4         2    6
## 653           1         1              2        1           4         1    7
## 654           1         1              2        1           4         2    7
## 655           1         1              2        1           4         1    8
## 656           1         1              2        1           4         2    8
## 657           1         1              2        1           5         1    1
## 658           1         1              2        1           5         2    1
## 659           1         1              2        1           5         1    2
## 660           1         1              2        1           5         2    2
## 661           1         1              2        1           5         1    3
## 662           1         1              2        1           5         2    3
## 663           1         1              2        1           5         1    4
## 664           1         1              2        1           5         2    4
## 665           1         1              2        1           5         1    5
## 666           1         1              2        1           5         2    5
## 667           1         1              2        1           5         1    6
## 668           1         1              2        1           5         2    6
## 669           1         1              2        1           5         1    7
## 670           1         1              2        1           5         2    7
## 671           1         1              2        1           5         1    8
## 672           1         1              2        1           5         2    8
## 673           1         1              2        1           4         1    1
## 674           1         1              2        1           4         2    1
## 675           1         1              2        1           4         1    2
## 676           1         1              2        1           4         2    2
## 677           1         1              2        1           4         1    3
## 678           1         1              2        1           4         2    3
## 679           1         1              2        1           4         1    4
## 680           1         1              2        1           4         2    4
## 681           1         1              2        1           4         1    5
## 682           1         1              2        1           4         2    5
## 683           1         1              2        1           4         1    6
## 684           1         1              2        1           4         2    6
## 685           1         1              2        1           4         1    7
## 686           1         1              2        1           4         2    7
## 687           1         1              2        1           4         1    8
## 688           1         1              2        1           4         2    8
## 689           2        NA              1        2          14         1    1
## 690           2        NA              1        2          14         2    1
## 691           2        NA              1        2          14         1    2
## 692           2        NA              1        2          14         2    2
## 693           2        NA              1        2          14         1    3
## 694           2        NA              1        2          14         2    3
## 695           2        NA              1        2          14         1    4
## 696           2        NA              1        2          14         2    4
## 697           2        NA              1        2          14         1    5
## 698           2        NA              1        2          14         2    5
## 699           2        NA              1        2          14         1    6
## 700           2        NA              1        2          14         2    6
## 701           2        NA              1        2          14         1    7
## 702           2        NA              1        2          14         2    7
## 703           2        NA              1        2          14         1    8
## 704           2        NA              1        2          14         2    8
## 705           2         2              1        1          16         1    1
## 706           2         2              1        1          16         2    1
## 707           2         2              1        1          16         1    2
## 708           2         2              1        1          16         2    2
## 709           2         2              1        1          16         1    3
## 710           2         2              1        1          16         2    3
## 711           2         2              1        1          16         1    4
## 712           2         2              1        1          16         2    4
## 713           2         2              1        1          16         1    5
## 714           2         2              1        1          16         2    5
## 715           2         2              1        1          16         1    6
## 716           2         2              1        1          16         2    6
## 717           2         2              1        1          16         1    7
## 718           2         2              1        1          16         2    7
## 719           2         2              1        1          16         1    8
## 720           2         2              1        1          16         2    8
## 721           1         1              2        1           5         1    1
## 722           1         1              2        1           5         2    1
## 723           1         1              2        1           5         1    2
## 724           1         1              2        1           5         2    2
## 725           1         1              2        1           5         1    3
## 726           1         1              2        1           5         2    3
## 727           1         1              2        1           5         1    4
## 728           1         1              2        1           5         2    4
## 729           1         1              2        1           5         1    5
## 730           1         1              2        1           5         2    5
## 731           1         1              2        1           5         1    6
## 732           1         1              2        1           5         2    6
## 733           1         1              2        1           5         1    7
## 734           1         1              2        1           5         2    7
## 735           1         1              2        1           5         1    8
## 736           1         1              2        1           5         2    8
## 737           2         2              1        1          12         1    1
## 738           2         2              1        1          12         2    1
## 739           2         2              1        1          12         1    2
## 740           2         2              1        1          12         2    2
## 741           2         2              1        1          12         1    3
## 742           2         2              1        1          12         2    3
## 743           2         2              1        1          12         1    4
## 744           2         2              1        1          12         2    4
## 745           2         2              1        1          12         1    5
## 746           2         2              1        1          12         2    5
## 747           2         2              1        1          12         1    6
## 748           2         2              1        1          12         2    6
## 749           2         2              1        1          12         1    7
## 750           2         2              1        1          12         2    7
## 751           2         2              1        1          12         1    8
## 752           2         2              1        1          12         2    8
## 753           2         1              1        2           7         1    1
## 754           2         1              1        2           7         2    1
## 755           2         1              1        2           7         1    2
## 756           2         1              1        2           7         2    2
## 757           2         1              1        2           7         1    3
## 758           2         1              1        2           7         2    3
## 759           2         1              1        2           7         1    4
## 760           2         1              1        2           7         2    4
## 761           2         1              1        2           7         1    5
## 762           2         1              1        2           7         2    5
## 763           2         1              1        2           7         1    6
## 764           2         1              1        2           7         2    6
## 765           2         1              1        2           7         1    7
## 766           2         1              1        2           7         2    7
## 767           2         1              1        2           7         1    8
## 768           2         1              1        2           7         2    8
## 769           1         1              2        1          10         1    1
## 770           1         1              2        1          10         2    1
## 771           1         1              2        1          10         1    2
## 772           1         1              2        1          10         2    2
## 773           1         1              2        1          10         1    3
## 774           1         1              2        1          10         2    3
## 775           1         1              2        1          10         1    4
## 776           1         1              2        1          10         2    4
## 777           1         1              2        1          10         1    5
## 778           1         1              2        1          10         2    5
## 779           1         1              2        1          10         1    6
## 780           1         1              2        1          10         2    6
## 781           1         1              2        1          10         1    7
## 782           1         1              2        1          10         2    7
## 783           1         1              2        1          10         1    8
## 784           1         1              2        1          10         2    8
## 785           1        NA              2        1           5         1    1
## 786           1        NA              2        1           5         2    1
## 787           1        NA              2        1           5         1    2
## 788           1        NA              2        1           5         2    2
## 789           1        NA              2        1           5         1    3
## 790           1        NA              2        1           5         2    3
## 791           1        NA              2        1           5         1    4
## 792           1        NA              2        1           5         2    4
## 793           1        NA              2        1           5         1    5
## 794           1        NA              2        1           5         2    5
## 795           1        NA              2        1           5         1    6
## 796           1        NA              2        1           5         2    6
## 797           1        NA              2        1           5         1    7
## 798           1        NA              2        1           5         2    7
## 799           1        NA              2        1           5         1    8
## 800           1        NA              2        1           5         2    8
## 801           2        NA              1        1          10         1    1
## 802           2        NA              1        1          10         2    1
## 803           2        NA              1        1          10         1    2
## 804           2        NA              1        1          10         2    2
## 805           2        NA              1        1          10         1    3
## 806           2        NA              1        1          10         2    3
## 807           2        NA              1        1          10         1    4
## 808           2        NA              1        1          10         2    4
## 809           2        NA              1        1          10         1    5
## 810           2        NA              1        1          10         2    5
## 811           2        NA              1        1          10         1    6
## 812           2        NA              1        1          10         2    6
## 813           2        NA              1        1          10         1    7
## 814           2        NA              1        1          10         2    7
## 815           2        NA              1        1          10         1    8
## 816           2        NA              1        1          10         2    8
## 817           1         1              2        1           4         1    1
## 818           1         1              2        1           4         2    1
## 819           1         1              2        1           4         1    2
## 820           1         1              2        1           4         2    2
## 821           1         1              2        1           4         1    3
## 822           1         1              2        1           4         2    3
## 823           1         1              2        1           4         1    4
## 824           1         1              2        1           4         2    4
## 825           1         1              2        1           4         1    5
## 826           1         1              2        1           4         2    5
## 827           1         1              2        1           4         1    6
## 828           1         1              2        1           4         2    6
## 829           1         1              2        1           4         1    7
## 830           1         1              2        1           4         2    7
## 831           1         1              2        1           4         1    8
## 832           1         1              2        1           4         2    8
## 833           1         1              2        1           3         1    1
## 834           1         1              2        1           3         2    1
## 835           1         1              2        1           3         1    2
## 836           1         1              2        1           3         2    2
## 837           1         1              2        1           3         1    3
## 838           1         1              2        1           3         2    3
## 839           1         1              2        1           3         1    4
## 840           1         1              2        1           3         2    4
## 841           1         1              2        1           3         1    5
## 842           1         1              2        1           3         2    5
## 843           1         1              2        1           3         1    6
## 844           1         1              2        1           3         2    6
## 845           1         1              2        1           3         1    7
## 846           1         1              2        1           3         2    7
## 847           1         1              2        1           3         1    8
## 848           1         1              2        1           3         2    8
## 849           1         2              1        1           8         1    1
## 850           1         2              1        1           8         2    1
## 851           1         2              1        1           8         1    2
## 852           1         2              1        1           8         2    2
## 853           1         2              1        1           8         1    3
## 854           1         2              1        1           8         2    3
## 855           1         2              1        1           8         1    4
## 856           1         2              1        1           8         2    4
## 857           1         2              1        1           8         1    5
## 858           1         2              1        1           8         2    5
## 859           1         2              1        1           8         1    6
## 860           1         2              1        1           8         2    6
## 861           1         2              1        1           8         1    7
## 862           1         2              1        1           8         2    7
## 863           1         2              1        1           8         1    8
## 864           1         2              1        1           8         2    8
## 865           1         1              2        1          10         1    1
## 866           1         1              2        1          10         2    1
## 867           1         1              2        1          10         1    2
## 868           1         1              2        1          10         2    2
## 869           1         1              2        1          10         1    3
## 870           1         1              2        1          10         2    3
## 871           1         1              2        1          10         1    4
## 872           1         1              2        1          10         2    4
## 873           1         1              2        1          10         1    5
## 874           1         1              2        1          10         2    5
## 875           1         1              2        1          10         1    6
## 876           1         1              2        1          10         2    6
## 877           1         1              2        1          10         1    7
## 878           1         1              2        1          10         2    7
## 879           1         1              2        1          10         1    8
## 880           1         1              2        1          10         2    8
## 881           1        NA              2        2           8         1    1
## 882           1        NA              2        2           8         2    1
## 883           1        NA              2        2           8         1    2
## 884           1        NA              2        2           8         2    2
## 885           1        NA              2        2           8         1    3
## 886           1        NA              2        2           8         2    3
## 887           1        NA              2        2           8         1    4
## 888           1        NA              2        2           8         2    4
## 889           1        NA              2        2           8         1    5
## 890           1        NA              2        2           8         2    5
## 891           1        NA              2        2           8         1    6
## 892           1        NA              2        2           8         2    6
## 893           1        NA              2        2           8         1    7
## 894           1        NA              2        2           8         2    7
## 895           1        NA              2        2           8         1    8
## 896           1        NA              2        2           8         2    8
## 897           2         1              2        1           9         1    1
## 898           2         1              2        1           9         2    1
## 899           2         1              2        1           9         1    2
## 900           2         1              2        1           9         2    2
## 901           2         1              2        1           9         1    3
## 902           2         1              2        1           9         2    3
## 903           2         1              2        1           9         1    4
## 904           2         1              2        1           9         2    4
## 905           2         1              2        1           9         1    5
## 906           2         1              2        1           9         2    5
## 907           2         1              2        1           9         1    6
## 908           2         1              2        1           9         2    6
## 909           2         1              2        1           9         1    7
## 910           2         1              2        1           9         2    7
## 911           2         1              2        1           9         1    8
## 912           2         1              2        1           9         2    8
## 913           1         1              2        1           4         1    1
## 914           1         1              2        1           4         2    1
## 915           1         1              2        1           4         1    2
## 916           1         1              2        1           4         2    2
## 917           1         1              2        1           4         1    3
## 918           1         1              2        1           4         2    3
## 919           1         1              2        1           4         1    4
## 920           1         1              2        1           4         2    4
## 921           1         1              2        1           4         1    5
## 922           1         1              2        1           4         2    5
## 923           1         1              2        1           4         1    6
## 924           1         1              2        1           4         2    6
## 925           1         1              2        1           4         1    7
## 926           1         1              2        1           4         2    7
## 927           1         1              2        1           4         1    8
## 928           1         1              2        1           4         2    8
## 929           2        NA              1        1          12         1    1
## 930           2        NA              1        1          12         2    1
## 931           2        NA              1        1          12         1    2
## 932           2        NA              1        1          12         2    2
## 933           2        NA              1        1          12         1    3
## 934           2        NA              1        1          12         2    3
## 935           2        NA              1        1          12         1    4
## 936           2        NA              1        1          12         2    4
## 937           2        NA              1        1          12         1    5
## 938           2        NA              1        1          12         2    5
## 939           2        NA              1        1          12         1    6
## 940           2        NA              1        1          12         2    6
## 941           2        NA              1        1          12         1    7
## 942           2        NA              1        1          12         2    7
## 943           2        NA              1        1          12         1    8
## 944           2        NA              1        1          12         2    8
## 945           2         1              2        1          10         1    1
## 946           2         1              2        1          10         2    1
## 947           2         1              2        1          10         1    2
## 948           2         1              2        1          10         2    2
## 949           2         1              2        1          10         1    3
## 950           2         1              2        1          10         2    3
## 951           2         1              2        1          10         1    4
## 952           2         1              2        1          10         2    4
## 953           2         1              2        1          10         1    5
## 954           2         1              2        1          10         2    5
## 955           2         1              2        1          10         1    6
## 956           2         1              2        1          10         2    6
## 957           2         1              2        1          10         1    7
## 958           2         1              2        1          10         2    7
## 959           2         1              2        1          10         1    8
## 960           2         1              2        1          10         2    8
## 961           2         2              2        1           7         1    1
## 962           2         2              2        1           7         2    1
## 963           2         2              2        1           7         1    2
## 964           2         2              2        1           7         2    2
## 965           2         2              2        1           7         1    3
## 966           2         2              2        1           7         2    3
## 967           2         2              2        1           7         1    4
## 968           2         2              2        1           7         2    4
## 969           2         2              2        1           7         1    5
## 970           2         2              2        1           7         2    5
## 971           2         2              2        1           7         1    6
## 972           2         2              2        1           7         2    6
## 973           2         2              2        1           7         1    7
## 974           2         2              2        1           7         2    7
## 975           2         2              2        1           7         1    8
## 976           2         2              2        1           7         2    8
## 977           2         2              1        1          16         1    1
## 978           2         2              1        1          16         2    1
## 979           2         2              1        1          16         1    2
## 980           2         2              1        1          16         2    2
## 981           2         2              1        1          16         1    3
## 982           2         2              1        1          16         2    3
## 983           2         2              1        1          16         1    4
## 984           2         2              1        1          16         2    4
## 985           2         2              1        1          16         1    5
## 986           2         2              1        1          16         2    5
## 987           2         2              1        1          16         1    6
## 988           2         2              1        1          16         2    6
## 989           2         2              1        1          16         1    7
## 990           2         2              1        1          16         2    7
## 991           2         2              1        1          16         1    8
## 992           2         2              1        1          16         2    8
## 993           1         1              2        1           3         1    1
## 994           1         1              2        1           3         2    1
## 995           1         1              2        1           3         1    2
## 996           1         1              2        1           3         2    2
## 997           1         1              2        1           3         1    3
## 998           1         1              2        1           3         2    3
## 999           1         1              2        1           3         1    4
## 1000          1         1              2        1           3         2    4
## 1001          1         1              2        1           3         1    5
## 1002          1         1              2        1           3         2    5
## 1003          1         1              2        1           3         1    6
## 1004          1         1              2        1           3         2    6
## 1005          1         1              2        1           3         1    7
## 1006          1         1              2        1           3         2    7
## 1007          1         1              2        1           3         1    8
## 1008          1         1              2        1           3         2    8
## 1009          2         2              1        1          15         1    1
## 1010          2         2              1        1          15         2    1
## 1011          2         2              1        1          15         1    2
## 1012          2         2              1        1          15         2    2
## 1013          2         2              1        1          15         1    3
## 1014          2         2              1        1          15         2    3
## 1015          2         2              1        1          15         1    4
## 1016          2         2              1        1          15         2    4
## 1017          2         2              1        1          15         1    5
## 1018          2         2              1        1          15         2    5
## 1019          2         2              1        1          15         1    6
## 1020          2         2              1        1          15         2    6
## 1021          2         2              1        1          15         1    7
## 1022          2         2              1        1          15         2    7
## 1023          2         2              1        1          15         1    8
## 1024          2         2              1        1          15         2    8
## 1025          2         2              1        1          14         1    1
## 1026          2         2              1        1          14         2    1
## 1027          2         2              1        1          14         1    2
## 1028          2         2              1        1          14         2    2
## 1029          2         2              1        1          14         1    3
## 1030          2         2              1        1          14         2    3
## 1031          2         2              1        1          14         1    4
## 1032          2         2              1        1          14         2    4
## 1033          2         2              1        1          14         1    5
## 1034          2         2              1        1          14         2    5
## 1035          2         2              1        1          14         1    6
## 1036          2         2              1        1          14         2    6
## 1037          2         2              1        1          14         1    7
## 1038          2         2              1        1          14         2    7
## 1039          2         2              1        1          14         1    8
## 1040          2         2              1        1          14         2    8
## 1041          2         1              1        1           8         1    1
## 1042          2         1              1        1           8         2    1
## 1043          2         1              1        1           8         1    2
## 1044          2         1              1        1           8         2    2
## 1045          2         1              1        1           8         1    3
## 1046          2         1              1        1           8         2    3
## 1047          2         1              1        1           8         1    4
## 1048          2         1              1        1           8         2    4
## 1049          2         1              1        1           8         1    5
## 1050          2         1              1        1           8         2    5
## 1051          2         1              1        1           8         1    6
## 1052          2         1              1        1           8         2    6
## 1053          2         1              1        1           8         1    7
## 1054          2         1              1        1           8         2    7
## 1055          2         1              1        1           8         1    8
## 1056          2         1              1        1           8         2    8
## 1057          1         1              2        1           4         1    1
## 1058          1         1              2        1           4         2    1
## 1059          1         1              2        1           4         1    2
## 1060          1         1              2        1           4         2    2
## 1061          1         1              2        1           4         1    3
## 1062          1         1              2        1           4         2    3
## 1063          1         1              2        1           4         1    4
## 1064          1         1              2        1           4         2    4
## 1065          1         1              2        1           4         1    5
## 1066          1         1              2        1           4         2    5
## 1067          1         1              2        1           4         1    6
## 1068          1         1              2        1           4         2    6
## 1069          1         1              2        1           4         1    7
## 1070          1         1              2        1           4         2    7
## 1071          1         1              2        1           4         1    8
## 1072          1         1              2        1           4         2    8
## 1073          1         2              1        1          10         1    1
## 1074          1         2              1        1          10         2    1
## 1075          1         2              1        1          10         1    2
## 1076          1         2              1        1          10         2    2
## 1077          1         2              1        1          10         1    3
## 1078          1         2              1        1          10         2    3
## 1079          1         2              1        1          10         1    4
## 1080          1         2              1        1          10         2    4
## 1081          1         2              1        1          10         1    5
## 1082          1         2              1        1          10         2    5
## 1083          1         2              1        1          10         1    6
## 1084          1         2              1        1          10         2    6
## 1085          1         2              1        1          10         1    7
## 1086          1         2              1        1          10         2    7
## 1087          1         2              1        1          10         1    8
## 1088          1         2              1        1          10         2    8
## 1089          2         2              1        1          11         1    1
## 1090          2         2              1        1          11         2    1
## 1091          2         2              1        1          11         1    2
## 1092          2         2              1        1          11         2    2
## 1093          2         2              1        1          11         1    3
## 1094          2         2              1        1          11         2    3
## 1095          2         2              1        1          11         1    4
## 1096          2         2              1        1          11         2    4
## 1097          2         2              1        1          11         1    5
## 1098          2         2              1        1          11         2    5
## 1099          2         2              1        1          11         1    6
## 1100          2         2              1        1          11         2    6
## 1101          2         2              1        1          11         1    7
## 1102          2         2              1        1          11         2    7
## 1103          2         2              1        1          11         1    8
## 1104          2         2              1        1          11         2    8
## 1105          1         1             NA        2           6         1    1
## 1106          1         1             NA        2           6         2    1
## 1107          1         1             NA        2           6         1    2
## 1108          1         1             NA        2           6         2    2
## 1109          1         1             NA        2           6         1    3
## 1110          1         1             NA        2           6         2    3
## 1111          1         1             NA        2           6         1    4
## 1112          1         1             NA        2           6         2    4
## 1113          1         1             NA        2           6         1    5
## 1114          1         1             NA        2           6         2    5
## 1115          1         1             NA        2           6         1    6
## 1116          1         1             NA        2           6         2    6
## 1117          1         1             NA        2           6         1    7
## 1118          1         1             NA        2           6         2    7
## 1119          1         1             NA        2           6         1    8
## 1120          1         1             NA        2           6         2    8
## 1121          1        NA              1        1          NA         1    1
## 1122          1        NA              1        1          NA         2    1
## 1123          1        NA              1        1          NA         1    2
## 1124          1        NA              1        1          NA         2    2
## 1125          1        NA              1        1          NA         1    3
## 1126          1        NA              1        1          NA         2    3
## 1127          1        NA              1        1          NA         1    4
## 1128          1        NA              1        1          NA         2    4
## 1129          1        NA              1        1          NA         1    5
## 1130          1        NA              1        1          NA         2    5
## 1131          1        NA              1        1          NA         1    6
## 1132          1        NA              1        1          NA         2    6
## 1133          1        NA              1        1          NA         1    7
## 1134          1        NA              1        1          NA         2    7
## 1135          1        NA              1        1          NA         1    8
## 1136          1        NA              1        1          NA         2    8
## 1137          2         2              1        1          15         1    1
## 1138          2         2              1        1          15         2    1
## 1139          2         2              1        1          15         1    2
## 1140          2         2              1        1          15         2    2
## 1141          2         2              1        1          15         1    3
## 1142          2         2              1        1          15         2    3
## 1143          2         2              1        1          15         1    4
## 1144          2         2              1        1          15         2    4
## 1145          2         2              1        1          15         1    5
## 1146          2         2              1        1          15         2    5
## 1147          2         2              1        1          15         1    6
## 1148          2         2              1        1          15         2    6
## 1149          2         2              1        1          15         1    7
## 1150          2         2              1        1          15         2    7
## 1151          2         2              1        1          15         1    8
## 1152          2         2              1        1          15         2    8
## 1153          1         1              1        2          10         1    1
## 1154          1         1              1        2          10         2    1
## 1155          1         1              1        2          10         1    2
## 1156          1         1              1        2          10         2    2
## 1157          1         1              1        2          10         1    3
## 1158          1         1              1        2          10         2    3
## 1159          1         1              1        2          10         1    4
## 1160          1         1              1        2          10         2    4
## 1161          1         1              1        2          10         1    5
## 1162          1         1              1        2          10         2    5
## 1163          1         1              1        2          10         1    6
## 1164          1         1              1        2          10         2    6
## 1165          1         1              1        2          10         1    7
## 1166          1         1              1        2          10         2    7
## 1167          1         1              1        2          10         1    8
## 1168          1         1              1        2          10         2    8
## 1169          1         1              2        2          10         1    1
## 1170          1         1              2        2          10         2    1
## 1171          1         1              2        2          10         1    2
## 1172          1         1              2        2          10         2    2
## 1173          1         1              2        2          10         1    3
## 1174          1         1              2        2          10         2    3
## 1175          1         1              2        2          10         1    4
## 1176          1         1              2        2          10         2    4
## 1177          1         1              2        2          10         1    5
## 1178          1         1              2        2          10         2    5
## 1179          1         1              2        2          10         1    6
## 1180          1         1              2        2          10         2    6
## 1181          1         1              2        2          10         1    7
## 1182          1         1              2        2          10         2    7
## 1183          1         1              2        2          10         1    8
## 1184          1         1              2        2          10         2    8
## 1185          1         1              2        1           5         1    1
## 1186          1         1              2        1           5         2    1
## 1187          1         1              2        1           5         1    2
## 1188          1         1              2        1           5         2    2
## 1189          1         1              2        1           5         1    3
## 1190          1         1              2        1           5         2    3
## 1191          1         1              2        1           5         1    4
## 1192          1         1              2        1           5         2    4
## 1193          1         1              2        1           5         1    5
## 1194          1         1              2        1           5         2    5
## 1195          1         1              2        1           5         1    6
## 1196          1         1              2        1           5         2    6
## 1197          1         1              2        1           5         1    7
## 1198          1         1              2        1           5         2    7
## 1199          1         1              2        1           5         1    8
## 1200          1         1              2        1           5         2    8
## 1201          2         1             NA        1          11         1    1
## 1202          2         1             NA        1          11         2    1
## 1203          2         1             NA        1          11         1    2
## 1204          2         1             NA        1          11         2    2
## 1205          2         1             NA        1          11         1    3
## 1206          2         1             NA        1          11         2    3
## 1207          2         1             NA        1          11         1    4
## 1208          2         1             NA        1          11         2    4
## 1209          2         1             NA        1          11         1    5
## 1210          2         1             NA        1          11         2    5
## 1211          2         1             NA        1          11         1    6
## 1212          2         1             NA        1          11         2    6
## 1213          2         1             NA        1          11         1    7
## 1214          2         1             NA        1          11         2    7
## 1215          2         1             NA        1          11         1    8
## 1216          2         1             NA        1          11         2    8
## 1217          1         1              2        1           5         1    1
## 1218          1         1              2        1           5         2    1
## 1219          1         1              2        1           5         1    2
## 1220          1         1              2        1           5         2    2
## 1221          1         1              2        1           5         1    3
## 1222          1         1              2        1           5         2    3
## 1223          1         1              2        1           5         1    4
## 1224          1         1              2        1           5         2    4
## 1225          1         1              2        1           5         1    5
## 1226          1         1              2        1           5         2    5
## 1227          1         1              2        1           5         1    6
## 1228          1         1              2        1           5         2    6
## 1229          1         1              2        1           5         1    7
## 1230          1         1              2        1           5         2    7
## 1231          1         1              2        1           5         1    8
## 1232          1         1              2        1           5         2    8
## 1233          2         1              1        2          12         1    1
## 1234          2         1              1        2          12         2    1
## 1235          2         1              1        2          12         1    2
## 1236          2         1              1        2          12         2    2
## 1237          2         1              1        2          12         1    3
## 1238          2         1              1        2          12         2    3
## 1239          2         1              1        2          12         1    4
## 1240          2         1              1        2          12         2    4
## 1241          2         1              1        2          12         1    5
## 1242          2         1              1        2          12         2    5
## 1243          2         1              1        2          12         1    6
## 1244          2         1              1        2          12         2    6
## 1245          2         1              1        2          12         1    7
## 1246          2         1              1        2          12         2    7
## 1247          2         1              1        2          12         1    8
## 1248          2         1              1        2          12         2    8
## 1249          2         1              1        1          12         1    1
## 1250          2         1              1        1          12         2    1
## 1251          2         1              1        1          12         1    2
## 1252          2         1              1        1          12         2    2
## 1253          2         1              1        1          12         1    3
## 1254          2         1              1        1          12         2    3
## 1255          2         1              1        1          12         1    4
## 1256          2         1              1        1          12         2    4
## 1257          2         1              1        1          12         1    5
## 1258          2         1              1        1          12         2    5
## 1259          2         1              1        1          12         1    6
## 1260          2         1              1        1          12         2    6
## 1261          2         1              1        1          12         1    7
## 1262          2         1              1        1          12         2    7
## 1263          2         1              1        1          12         1    8
## 1264          2         1              1        1          12         2    8
## 1265          1         1              2        1           4         1    1
## 1266          1         1              2        1           4         2    1
## 1267          1         1              2        1           4         1    2
## 1268          1         1              2        1           4         2    2
## 1269          1         1              2        1           4         1    3
## 1270          1         1              2        1           4         2    3
## 1271          1         1              2        1           4         1    4
## 1272          1         1              2        1           4         2    4
## 1273          1         1              2        1           4         1    5
## 1274          1         1              2        1           4         2    5
## 1275          1         1              2        1           4         1    6
## 1276          1         1              2        1           4         2    6
## 1277          1         1              2        1           4         1    7
## 1278          1         1              2        1           4         2    7
## 1279          1         1              2        1           4         1    8
## 1280          1         1              2        1           4         2    8
## 1281          2         2              2        1          16         1    1
## 1282          2         2              2        1          16         2    1
## 1283          2         2              2        1          16         1    2
## 1284          2         2              2        1          16         2    2
## 1285          2         2              2        1          16         1    3
## 1286          2         2              2        1          16         2    3
## 1287          2         2              2        1          16         1    4
## 1288          2         2              2        1          16         2    4
## 1289          2         2              2        1          16         1    5
## 1290          2         2              2        1          16         2    5
## 1291          2         2              2        1          16         1    6
## 1292          2         2              2        1          16         2    6
## 1293          2         2              2        1          16         1    7
## 1294          2         2              2        1          16         2    7
## 1295          2         2              2        1          16         1    8
## 1296          2         2              2        1          16         2    8
## 1297          1         1              2        1           5         1    1
## 1298          1         1              2        1           5         2    1
## 1299          1         1              2        1           5         1    2
## 1300          1         1              2        1           5         2    2
## 1301          1         1              2        1           5         1    3
## 1302          1         1              2        1           5         2    3
## 1303          1         1              2        1           5         1    4
## 1304          1         1              2        1           5         2    4
## 1305          1         1              2        1           5         1    5
## 1306          1         1              2        1           5         2    5
## 1307          1         1              2        1           5         1    6
## 1308          1         1              2        1           5         2    6
## 1309          1         1              2        1           5         1    7
## 1310          1         1              2        1           5         2    7
## 1311          1         1              2        1           5         1    8
## 1312          1         1              2        1           5         2    8
## 1313          1         1              2        1           3         1    1
## 1314          1         1              2        1           3         2    1
## 1315          1         1              2        1           3         1    2
##      VotingChoice                           ReligionAtt GenderAtt  RaceAtt
## 1               1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 2               0                  IsnotsurethereisaGod      Male    Asian
## 3               1 Doesnotcurrentlyidentifywithareligion    Female    White
## 4               0                               Atheist      Male    White
## 5               1                  IsnotsurethereisaGod      Male Hispanic
## 6               0        Attendsreligiousservicesweekly    Female Hispanic
## 7               1                               Atheist      Male    Asian
## 8               0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 9               1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 10              0                  IsnotsurethereisaGod    Female Hispanic
## 11              1        Attendsreligiousservicesweekly    Female    White
## 12              0                             Christian      Male    Asian
## 13              1 Doesnotcurrentlyidentifywithareligion      Male    White
## 14              0                               Atheist      Male    Black
## 15              0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 16              1                             Christian    Female    Asian
## 17              0                  IsnotsurethereisaGod      Male Hispanic
## 18              1                               Atheist      Male    White
## 19              1                             Christian    Female    White
## 20              0                             Christian    Female Hispanic
## 21              1                  IsnotsurethereisaGod    Female    Black
## 22              0                  IsnotsurethereisaGod      Male    White
## 23              1        Attendsreligiousservicesweekly      Male    Black
## 24              0                               Atheist      Male    Asian
## 25              0                  IsnotsurethereisaGod    Female    Black
## 26              1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 27              0                               Atheist      Male    Asian
## 28              1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 29              0                  IsnotsurethereisaGod    Female    Black
## 30              1        Attendsreligiousservicesweekly      Male Hispanic
## 31              1                               Atheist    Female    Asian
## 32              0        Attendsreligiousservicesweekly      Male    Asian
## 33              0                  IsnotsurethereisaGod    Female Hispanic
## 34              1        Attendsreligiousservicesweekly    Female Hispanic
## 35              0                             Christian      Male    Black
## 36              1                  IsnotsurethereisaGod      Male    Asian
## 37              0                  IsnotsurethereisaGod      Male    White
## 38              1                               Atheist      Male    Black
## 39              0                             Christian    Female    Asian
## 40              1        Attendsreligiousservicesweekly      Male    White
## 41              0                  IsnotsurethereisaGod    Female    Black
## 42              1        Attendsreligiousservicesweekly      Male Hispanic
## 43              0        Attendsreligiousservicesweekly    Female    Black
## 44              1                  IsnotsurethereisaGod      Male    Asian
## 45              0                               Atheist      Male    White
## 46              1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 47              1        Attendsreligiousservicesweekly    Female    Asian
## 48              0                             Christian      Male    White
## 49              1 Doesnotcurrentlyidentifywithareligion    Female    White
## 50              0                               Atheist    Female Hispanic
## 51              0 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 52              1                  IsnotsurethereisaGod      Male    White
## 53              0                  IsnotsurethereisaGod    Female    Black
## 54              1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 55              0                             Christian    Female Hispanic
## 56              1        Attendsreligiousservicesweekly    Female    Black
## 57              1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 58              0                  IsnotsurethereisaGod    Female    Black
## 59              0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 60              1                             Christian      Male    White
## 61              0        Attendsreligiousservicesweekly    Female Hispanic
## 62              1        Attendsreligiousservicesweekly    Female    Black
## 63              1                             Christian    Female Hispanic
## 64              0                             Christian      Male    Asian
## 65              0        Attendsreligiousservicesweekly    Female    Black
## 66              1        Attendsreligiousservicesweekly      Male Hispanic
## 67              1                               Atheist    Female    White
## 68              0                               Atheist    Female    Black
## 69              1                  IsnotsurethereisaGod      Male    Asian
## 70              0                             Christian      Male    White
## 71              1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 72              0                  IsnotsurethereisaGod      Male    Asian
## 73              0 Doesnotcurrentlyidentifywithareligion    Female    White
## 74              1                               Atheist      Male    White
## 75              1                  IsnotsurethereisaGod      Male Hispanic
## 76              0        Attendsreligiousservicesweekly    Female Hispanic
## 77              0                               Atheist      Male    Asian
## 78              1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 79              1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 80              0                  IsnotsurethereisaGod    Female Hispanic
## 81              0                               Atheist      Male    Black
## 82              1                  IsnotsurethereisaGod    Female Hispanic
## 83              1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 84              0 Doesnotcurrentlyidentifywithareligion      Male    White
## 85              0                               Atheist      Male    White
## 86              1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 87              1        Attendsreligiousservicesweekly    Female Hispanic
## 88              0                             Christian      Male    Asian
## 89              0                             Christian      Male    White
## 90              1                  IsnotsurethereisaGod    Female Hispanic
## 91              1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 92              0                             Christian    Female    Asian
## 93              0                               Atheist      Male    White
## 94              1                               Atheist    Female    Black
## 95              1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 96              0        Attendsreligiousservicesweekly    Female    White
## 97              0                  IsnotsurethereisaGod      Male    White
## 98              1                               Atheist      Male    Black
## 99              1                             Christian    Female    Asian
## 100             0        Attendsreligiousservicesweekly      Male    White
## 101             0                  IsnotsurethereisaGod    Female    Black
## 102             1        Attendsreligiousservicesweekly      Male Hispanic
## 103             1        Attendsreligiousservicesweekly    Female    Black
## 104             0                  IsnotsurethereisaGod      Male    Asian
## 105             1                               Atheist      Male    White
## 106             0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 107             1        Attendsreligiousservicesweekly    Female    Asian
## 108             0                             Christian      Male    White
## 109             0                               Atheist      Male    Black
## 110             1                  IsnotsurethereisaGod    Female Hispanic
## 111             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 112             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 113             1                               Atheist    Female    White
## 114             0                               Atheist    Female    Black
## 115             0                  IsnotsurethereisaGod      Male    Asian
## 116             1                             Christian      Male    White
## 117             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 118             0                  IsnotsurethereisaGod      Male    Asian
## 119             0 Doesnotcurrentlyidentifywithareligion    Female    White
## 120             1                               Atheist      Male    White
## 121             0                  IsnotsurethereisaGod      Male Hispanic
## 122             1        Attendsreligiousservicesweekly    Female Hispanic
## 123             0                               Atheist      Male    Asian
## 124             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 125             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 126             0                  IsnotsurethereisaGod    Female Hispanic
## 127             1        Attendsreligiousservicesweekly    Female    White
## 128             0                             Christian      Male    Asian
## 129             1                             Christian      Male Hispanic
## 130             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 131             1                               Atheist    Female    White
## 132             0                  IsnotsurethereisaGod      Male    Black
## 133             1                               Atheist      Male    White
## 134             0                               Atheist      Male    Black
## 135             1                  IsnotsurethereisaGod      Male    White
## 136             0                               Atheist    Female    Asian
## 137             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 138             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 139             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 140             1        Attendsreligiousservicesweekly      Male    White
## 141             1                               Atheist    Female Hispanic
## 142             0 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 143             1                               Atheist    Female Hispanic
## 144             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 145             0                             Christian      Male Hispanic
## 146             1 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 147             0 Doesnotcurrentlyidentifywithareligion      Male    Black
## 148             1        Attendsreligiousservicesweekly      Male    White
## 149             1        Attendsreligiousservicesweekly      Male Hispanic
## 150             0                             Christian      Male    White
## 151             0        Attendsreligiousservicesweekly    Female Hispanic
## 152             1                             Christian    Female Hispanic
## 153             0 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 154             1                               Atheist    Female Hispanic
## 155             0                             Christian    Female    White
## 156             1 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 157             1        Attendsreligiousservicesweekly      Male    White
## 158             0                  IsnotsurethereisaGod    Female    White
## 159             1        Attendsreligiousservicesweekly    Female    Black
## 160             0 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 161             1        Attendsreligiousservicesweekly      Male    Asian
## 162             0                               Atheist    Female    Black
## 163             1                             Christian      Male Hispanic
## 164             0                             Christian      Male    Asian
## 165             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 166             1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 167             0                  IsnotsurethereisaGod    Female    Asian
## 168             1                  IsnotsurethereisaGod    Female    Asian
## 169             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 170             1                  IsnotsurethereisaGod    Female    White
## 171             1 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 172             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 173             0        Attendsreligiousservicesweekly      Male    White
## 174             1                             Christian    Female    Black
## 175             0                  IsnotsurethereisaGod      Male    White
## 176             1        Attendsreligiousservicesweekly    Female    Black
## 177             0                             Christian      Male    Black
## 178             1                  IsnotsurethereisaGod      Male    Asian
## 179             1                  IsnotsurethereisaGod      Male    White
## 180             0                               Atheist      Male    Black
## 181             0                             Christian    Female    Asian
## 182             1        Attendsreligiousservicesweekly      Male    White
## 183             1                  IsnotsurethereisaGod    Female    Black
## 184             0        Attendsreligiousservicesweekly      Male Hispanic
## 185             1        Attendsreligiousservicesweekly    Female    Black
## 186             0                  IsnotsurethereisaGod      Male    Asian
## 187             0                               Atheist      Male    White
## 188             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 189             0        Attendsreligiousservicesweekly    Female    Asian
## 190             1                             Christian      Male    White
## 191             0                               Atheist      Male    Black
## 192             1                  IsnotsurethereisaGod    Female Hispanic
## 193             0        Attendsreligiousservicesweekly      Male    Black
## 194             1                             Christian      Male Hispanic
## 195             1                  IsnotsurethereisaGod      Male    White
## 196             0                             Christian    Female Hispanic
## 197             0                  IsnotsurethereisaGod    Female    Black
## 198             1                  IsnotsurethereisaGod      Male    White
## 199             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 200             1                               Atheist    Female Hispanic
## 201             0        Attendsreligiousservicesweekly    Female    White
## 202             1                               Atheist      Male Hispanic
## 203             0        Attendsreligiousservicesweekly      Male    Asian
## 204             1                  IsnotsurethereisaGod      Male    Asian
## 205             1                             Christian      Male Hispanic
## 206             0                             Christian      Male Hispanic
## 207             0                  IsnotsurethereisaGod    Female Hispanic
## 208             1                               Atheist    Female    Black
## 209             0                               Atheist      Male    Asian
## 210             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 211             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 212             0                  IsnotsurethereisaGod    Female Hispanic
## 213             1        Attendsreligiousservicesweekly    Female    White
## 214             0                             Christian      Male    Asian
## 215             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 216             0                               Atheist      Male    Black
## 217             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 218             1                             Christian    Female    Asian
## 219             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 220             0                  IsnotsurethereisaGod      Male Hispanic
## 221             0                             Christian      Male    Asian
## 222             1        Attendsreligiousservicesweekly    Female    Black
## 223             0                             Christian      Male    White
## 224             1                             Christian      Male    White
## 225             0                               Atheist      Male    White
## 226             1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 227             1        Attendsreligiousservicesweekly    Female Hispanic
## 228             0                             Christian      Male    Asian
## 229             1                             Christian      Male    White
## 230             0                  IsnotsurethereisaGod    Female Hispanic
## 231             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 232             1                             Christian    Female    Asian
## 233             0                               Atheist      Male    White
## 234             1                               Atheist    Female    Black
## 235             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 236             0        Attendsreligiousservicesweekly    Female    White
## 237             0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 238             1        Attendsreligiousservicesweekly      Male    White
## 239             1                             Christian      Male Hispanic
## 240             0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 241             1                             Christian    Female    Black
## 242             0                  IsnotsurethereisaGod      Male    White
## 243             0                               Atheist      Male Hispanic
## 244             1                  IsnotsurethereisaGod    Female    Asian
## 245             0                             Christian    Female Hispanic
## 246             1        Attendsreligiousservicesweekly      Male    Asian
## 247             0                  IsnotsurethereisaGod    Female    White
## 248             1        Attendsreligiousservicesweekly    Female    Asian
## 249             0                  IsnotsurethereisaGod    Female    White
## 250             1                  IsnotsurethereisaGod    Female    Black
## 251             1                               Atheist      Male    Black
## 252             0 Doesnotcurrentlyidentifywithareligion    Female    White
## 253             1                               Atheist    Female    White
## 254             0                               Atheist    Female    Black
## 255             0                             Christian    Female    Asian
## 256             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 257             0                               Atheist      Male    Asian
## 258             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 259             0                  IsnotsurethereisaGod    Female    Black
## 260             1        Attendsreligiousservicesweekly      Male Hispanic
## 261             1                               Atheist    Female    Asian
## 262             0        Attendsreligiousservicesweekly      Male    Asian
## 263             1                  IsnotsurethereisaGod    Female    Black
## 264             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 265             0 Doesnotcurrentlyidentifywithareligion    Female    White
## 266             1                  IsnotsurethereisaGod      Male    White
## 267             1                               Atheist      Male    Black
## 268             0                  IsnotsurethereisaGod    Female    Black
## 269             0        Attendsreligiousservicesweekly      Male    White
## 270             1                             Christian    Female    Asian
## 271             0        Attendsreligiousservicesweekly      Male Hispanic
## 272             1                               Atheist    Female    Black
## 273             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 274             0                  IsnotsurethereisaGod    Female Hispanic
## 275             1        Attendsreligiousservicesweekly    Female    White
## 276             0                             Christian      Male    Asian
## 277             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 278             1                               Atheist      Male    Black
## 279             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 280             1                             Christian    Female    Asian
## 281             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 282             0                  IsnotsurethereisaGod      Male Hispanic
## 283             0                             Christian      Male    Asian
## 284             1        Attendsreligiousservicesweekly    Female    Black
## 285             0                             Christian      Male    White
## 286             1                             Christian      Male    White
## 287             1                               Atheist    Female    Asian
## 288             0                             Christian      Male Hispanic
## 289             0                               Atheist    Female    Black
## 290             1                               Atheist      Male    Black
## 291             1 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 292             0        Attendsreligiousservicesweekly    Female    Asian
## 293             0                  IsnotsurethereisaGod    Female    Asian
## 294             1        Attendsreligiousservicesweekly      Male    Black
## 295             0                               Atheist    Female    Asian
## 296             1                  IsnotsurethereisaGod    Female    Black
## 297             1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 298             0        Attendsreligiousservicesweekly      Male    White
## 299             1                               Atheist    Female Hispanic
## 300             0                               Atheist    Female    Black
## 301             0 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 302             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 303             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 304             1                               Atheist      Male    White
## 305             1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 306             0                             Christian    Female    Asian
## 307             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 308             0                  IsnotsurethereisaGod      Male Hispanic
## 309             0                             Christian      Male    Asian
## 310             1        Attendsreligiousservicesweekly    Female    Black
## 311             0                             Christian      Male    White
## 312             1                             Christian      Male    White
## 313             1                               Atheist    Female    Asian
## 314             0                             Christian      Male Hispanic
## 315             1                  IsnotsurethereisaGod    Female    Asian
## 316             0                               Atheist      Male    Asian
## 317             0                             Christian      Male    Black
## 318             1        Attendsreligiousservicesweekly      Male Hispanic
## 319             0                  IsnotsurethereisaGod    Female    White
## 320             1        Attendsreligiousservicesweekly    Female    Black
## 321             0        Attendsreligiousservicesweekly    Female Hispanic
## 322             1                  IsnotsurethereisaGod    Female    Black
## 323             0                               Atheist      Male    Black
## 324             1                               Atheist    Female    White
## 325             0                  IsnotsurethereisaGod    Female    Black
## 326             1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 327             1                               Atheist    Female    Asian
## 328             0                  IsnotsurethereisaGod    Female Hispanic
## 329             1                  IsnotsurethereisaGod      Male    Asian
## 330             0                  IsnotsurethereisaGod      Male Hispanic
## 331             0        Attendsreligiousservicesweekly      Male    Black
## 332             1                             Christian      Male    White
## 333             1                  IsnotsurethereisaGod    Female    White
## 334             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 335             1                               Atheist    Female Hispanic
## 336             0        Attendsreligiousservicesweekly    Female Hispanic
## 337             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 338             0                  IsnotsurethereisaGod      Male Hispanic
## 339             1                  IsnotsurethereisaGod      Male Hispanic
## 340             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 341             0                               Atheist      Male    Asian
## 342             1                             Christian      Male    White
## 343             0                             Christian    Female    Black
## 344             1                             Christian    Female    Asian
## 345             1        Attendsreligiousservicesweekly    Female Hispanic
## 346             0                  IsnotsurethereisaGod      Male    White
## 347             1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 348             0                             Christian    Female Hispanic
## 349             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 350             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 351             1                             Christian    Female    Asian
## 352             0        Attendsreligiousservicesweekly    Female Hispanic
## 353             1                             Christian    Female    Asian
## 354             0                             Christian      Male Hispanic
## 355             1                             Christian      Male    White
## 356             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 357             1        Attendsreligiousservicesweekly      Male Hispanic
## 358             0        Attendsreligiousservicesweekly    Female    Black
## 359             0                               Atheist    Female    White
## 360             1                               Atheist    Female Hispanic
## 361             1                  IsnotsurethereisaGod      Male    White
## 362             0                             Christian      Male Hispanic
## 363             1                             Christian      Male    Asian
## 364             0                               Atheist    Female    Black
## 365             1        Attendsreligiousservicesweekly    Female    Black
## 366             0                             Christian      Male Hispanic
## 367             0        Attendsreligiousservicesweekly    Female Hispanic
## 368             1        Attendsreligiousservicesweekly    Female    Black
## 369             0                  IsnotsurethereisaGod      Male    Black
## 370             1                             Christian    Female    White
## 371             0                  IsnotsurethereisaGod      Male    Asian
## 372             1                  IsnotsurethereisaGod      Male Hispanic
## 373             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 374             1        Attendsreligiousservicesweekly      Male    White
## 375             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 376             1                             Christian      Male Hispanic
## 377             1        Attendsreligiousservicesweekly    Female Hispanic
## 378             0        Attendsreligiousservicesweekly      Male    White
## 379             0                  IsnotsurethereisaGod      Male Hispanic
## 380             1                  IsnotsurethereisaGod      Male    White
## 381             1        Attendsreligiousservicesweekly      Male    Asian
## 382             0                             Christian      Male    Asian
## 383             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 384             0                  IsnotsurethereisaGod    Female    White
## 385             0        Attendsreligiousservicesweekly    Female Hispanic
## 386             1        Attendsreligiousservicesweekly    Female    Black
## 387             1                  IsnotsurethereisaGod      Male    White
## 388             0                               Atheist      Male Hispanic
## 389             1                               Atheist    Female    Black
## 390             0                             Christian    Female    White
## 391             1                               Atheist    Female    Black
## 392             0        Attendsreligiousservicesweekly    Female    Black
## 393             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 394             1                               Atheist    Female    Black
## 395             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 396             0                               Atheist    Female Hispanic
## 397             1 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 398             0                  IsnotsurethereisaGod      Male    White
## 399             1                  IsnotsurethereisaGod    Female    Black
## 400             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 401             0                  IsnotsurethereisaGod    Female    White
## 402             1        Attendsreligiousservicesweekly    Female    Black
## 403             0                             Christian      Male    White
## 404             1                  IsnotsurethereisaGod    Female    Black
## 405             1                             Christian    Female    Black
## 406             0                  IsnotsurethereisaGod      Male    White
## 407             0                               Atheist      Male Hispanic
## 408             1                  IsnotsurethereisaGod    Female    Asian
## 409             1                             Christian    Female Hispanic
## 410             0        Attendsreligiousservicesweekly      Male    Asian
## 411             1                  IsnotsurethereisaGod    Female    White
## 412             0        Attendsreligiousservicesweekly    Female    Asian
## 413             1                  IsnotsurethereisaGod    Female    White
## 414             0                  IsnotsurethereisaGod    Female    Black
## 415             1                               Atheist      Male    Black
## 416             0 Doesnotcurrentlyidentifywithareligion    Female    White
## 417             0                  IsnotsurethereisaGod      Male    White
## 418             1                             Christian    Female Hispanic
## 419             1                  IsnotsurethereisaGod    Female    White
## 420             0 Doesnotcurrentlyidentifywithareligion      Male    Black
## 421             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 422             0                  IsnotsurethereisaGod      Male    Black
## 423             1        Attendsreligiousservicesweekly    Female Hispanic
## 424             0                               Atheist      Male    White
## 425             1        Attendsreligiousservicesweekly      Male    Asian
## 426             0                               Atheist    Female    Black
## 427             1                             Christian      Male Hispanic
## 428             0                             Christian      Male    Black
## 429             1                  IsnotsurethereisaGod      Male    Black
## 430             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 431             0                               Atheist    Female Hispanic
## 432             1                  IsnotsurethereisaGod      Male    White
## 433             0        Attendsreligiousservicesweekly      Male Hispanic
## 434             1        Attendsreligiousservicesweekly    Female    Asian
## 435             0                  IsnotsurethereisaGod      Male Hispanic
## 436             1        Attendsreligiousservicesweekly      Male Hispanic
## 437             1        Attendsreligiousservicesweekly      Male    Asian
## 438             0                  IsnotsurethereisaGod    Female    Black
## 439             0                             Christian      Male    White
## 440             1 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 441             1        Attendsreligiousservicesweekly    Female    Black
## 442             0                               Atheist      Male Hispanic
## 443             1        Attendsreligiousservicesweekly      Male Hispanic
## 444             0                               Atheist    Female    Asian
## 445             1                             Christian      Male    Black
## 446             0                               Atheist      Male    White
## 447             1        Attendsreligiousservicesweekly    Female    Black
## 448             0 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 449             0                  IsnotsurethereisaGod    Female    Asian
## 450             1                               Atheist      Male    Asian
## 451             0                             Christian      Male    Black
## 452             1        Attendsreligiousservicesweekly      Male Hispanic
## 453             0                  IsnotsurethereisaGod    Female    White
## 454             1        Attendsreligiousservicesweekly    Female    Black
## 455             0                             Christian      Male    White
## 456             1                  IsnotsurethereisaGod    Female    Black
## 457             1                             Christian    Female    Black
## 458             0                  IsnotsurethereisaGod      Male    White
## 459             1                               Atheist      Male Hispanic
## 460             0                  IsnotsurethereisaGod    Female    Asian
## 461             1                             Christian    Female Hispanic
## 462             0        Attendsreligiousservicesweekly      Male    Asian
## 463             0                  IsnotsurethereisaGod    Female    White
## 464             1        Attendsreligiousservicesweekly    Female    Asian
## 465             0                             Christian      Male    White
## 466             1                             Christian      Male    White
## 467             1                               Atheist    Female    Asian
## 468             0                             Christian      Male Hispanic
## 469             1                  IsnotsurethereisaGod    Female    Asian
## 470             0                               Atheist      Male    Asian
## 471             0                             Christian      Male    Black
## 472             1        Attendsreligiousservicesweekly      Male Hispanic
## 473             0                  IsnotsurethereisaGod    Female    White
## 474             1        Attendsreligiousservicesweekly    Female    Black
## 475             1                             Christian      Male    White
## 476             0                  IsnotsurethereisaGod    Female    Black
## 477             0                             Christian    Female    Black
## 478             1                  IsnotsurethereisaGod      Male    White
## 479             0                               Atheist      Male Hispanic
## 480             1                  IsnotsurethereisaGod    Female    Asian
## 481             1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 482             0 Doesnotcurrentlyidentifywithareligion    Female    White
## 483             0                  IsnotsurethereisaGod    Female    Black
## 484             1                  IsnotsurethereisaGod    Female    White
## 485             1                               Atheist    Female    White
## 486             0        Attendsreligiousservicesweekly    Female    Black
## 487             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 488             0                               Atheist    Female    Asian
## 489             0        Attendsreligiousservicesweekly    Female    White
## 490             1                             Christian    Female    Black
## 491             1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 492             0                               Atheist    Female    Asian
## 493             0                             Christian    Female    Asian
## 494             1                             Christian      Male Hispanic
## 495             0                             Christian      Male    White
## 496             1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 497             1                               Atheist      Male    Black
## 498             0                             Christian    Female    Black
## 499             0                  IsnotsurethereisaGod    Female    White
## 500             1        Attendsreligiousservicesweekly      Male    White
## 501             0                               Atheist      Male    Asian
## 502             1                             Christian      Male    Asian
## 503             0                             Christian      Male    White
## 504             1                               Atheist      Male    Black
## 505             0                             Christian    Female    Asian
## 506             1                  IsnotsurethereisaGod    Female    White
## 507             1        Attendsreligiousservicesweekly    Female    Asian
## 508             0        Attendsreligiousservicesweekly    Female    Asian
## 509             0                               Atheist    Female    Black
## 510             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 511             0                               Atheist    Female    White
## 512             1                               Atheist      Male Hispanic
## 513             1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 514             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 515             0                  IsnotsurethereisaGod    Female    Black
## 516             1                               Atheist      Male Hispanic
## 517             0        Attendsreligiousservicesweekly      Male Hispanic
## 518             1                               Atheist    Female    White
## 519             1                  IsnotsurethereisaGod      Male    Asian
## 520             0                             Christian      Male    White
## 521             1                             Christian    Female    Asian
## 522             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 523             1                  IsnotsurethereisaGod      Male    White
## 524             0                               Atheist      Male Hispanic
## 525             0        Attendsreligiousservicesweekly    Female    Asian
## 526             1                  IsnotsurethereisaGod    Female Hispanic
## 527             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 528             1                             Christian      Male Hispanic
## 529             1        Attendsreligiousservicesweekly    Female    Asian
## 530             0        Attendsreligiousservicesweekly      Male Hispanic
## 531             0 Doesnotcurrentlyidentifywithareligion      Male    Black
## 532             1                             Christian      Male    Asian
## 533             0                               Atheist      Male    White
## 534             1                               Atheist    Female    White
## 535             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 536             0        Attendsreligiousservicesweekly      Male Hispanic
## 537             1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 538             0                             Christian      Male    White
## 539             0                             Christian      Male    Black
## 540             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 541             0                             Christian    Female    Black
## 542             1                             Christian    Female    Asian
## 543             0                             Christian      Male    White
## 544             1                  IsnotsurethereisaGod    Female Hispanic
## 545             1                             Christian      Male    Black
## 546             0        Attendsreligiousservicesweekly      Male Hispanic
## 547             0                  IsnotsurethereisaGod    Female    White
## 548             1        Attendsreligiousservicesweekly    Female    Black
## 549             1                             Christian      Male    White
## 550             0                  IsnotsurethereisaGod    Female    Black
## 551             1                             Christian    Female    Black
## 552             0                  IsnotsurethereisaGod      Male    White
## 553             0                               Atheist      Male Hispanic
## 554             1                  IsnotsurethereisaGod    Female    Asian
## 555             1                             Christian    Female Hispanic
## 556             0        Attendsreligiousservicesweekly      Male    Asian
## 557             0                  IsnotsurethereisaGod    Female    White
## 558             1        Attendsreligiousservicesweekly    Female    Asian
## 559             0                  IsnotsurethereisaGod    Female    White
## 560             1                  IsnotsurethereisaGod    Female    Black
## 561             0 Doesnotcurrentlyidentifywithareligion    Female    White
## 562             1                  IsnotsurethereisaGod      Male Hispanic
## 563             0                             Christian      Male    Asian
## 564             1        Attendsreligiousservicesweekly    Female    Black
## 565             1                             Christian      Male    White
## 566             0                             Christian      Male    White
## 567             0                               Atheist    Female    Asian
## 568             1                             Christian      Male Hispanic
## 569             1                  IsnotsurethereisaGod    Female    Asian
## 570             0                               Atheist      Male    Asian
## 571             0                             Christian      Male    Black
## 572             1        Attendsreligiousservicesweekly      Male Hispanic
## 573             0                  IsnotsurethereisaGod    Female    White
## 574             1        Attendsreligiousservicesweekly    Female    Black
## 575             1                             Christian      Male    White
## 576             0                  IsnotsurethereisaGod    Female    Black
## 577             1                  IsnotsurethereisaGod    Female Hispanic
## 578             0        Attendsreligiousservicesweekly    Female Hispanic
## 579             0        Attendsreligiousservicesweekly      Male    Black
## 580             1        Attendsreligiousservicesweekly      Male    Asian
## 581             0                             Christian      Male    Black
## 582             1                             Christian      Male    Asian
## 583             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 584             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 585             0                  IsnotsurethereisaGod      Male    Black
## 586             1                               Atheist      Male Hispanic
## 587             0        Attendsreligiousservicesweekly    Female    Black
## 588             1        Attendsreligiousservicesweekly      Male Hispanic
## 589             1                             Christian      Male    Asian
## 590             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 591             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 592             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 593             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 594             0                             Christian    Female    Asian
## 595             0                               Atheist      Male    White
## 596             1                               Atheist    Female    Black
## 597             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 598             0        Attendsreligiousservicesweekly    Female    White
## 599             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 600             0        Attendsreligiousservicesweekly      Male    White
## 601             1                             Christian      Male Hispanic
## 602             0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 603             1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 604             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 605             1                             Christian      Male Hispanic
## 606             0                               Atheist    Female Hispanic
## 607             0                             Christian    Female Hispanic
## 608             1        Attendsreligiousservicesweekly    Female    Asian
## 609             0                             Christian      Male    Asian
## 610             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 611             0                             Christian    Female    White
## 612             1                             Christian      Male Hispanic
## 613             1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 614             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 615             1                               Atheist    Female Hispanic
## 616             0                  IsnotsurethereisaGod      Male    Asian
## 617             0                               Atheist      Male    Asian
## 618             1        Attendsreligiousservicesweekly    Female Hispanic
## 619             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 620             0                  IsnotsurethereisaGod      Male    Black
## 621             1                  IsnotsurethereisaGod      Male    Asian
## 622             0                             Christian      Male    Black
## 623             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 624             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 625             0        Attendsreligiousservicesweekly    Female    White
## 626             1        Attendsreligiousservicesweekly    Female Hispanic
## 627             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 628             1                               Atheist    Female    White
## 629             1        Attendsreligiousservicesweekly      Male    Asian
## 630             0                               Atheist      Male    Black
## 631             1                             Christian      Male Hispanic
## 632             0        Attendsreligiousservicesweekly      Male    Asian
## 633             0        Attendsreligiousservicesweekly    Female Hispanic
## 634             1                             Christian      Male Hispanic
## 635             1                  IsnotsurethereisaGod      Male    Black
## 636             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 637             0        Attendsreligiousservicesweekly    Female Hispanic
## 638             1                  IsnotsurethereisaGod    Female    Asian
## 639             1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 640             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 641             1                  IsnotsurethereisaGod      Male    Asian
## 642             0                             Christian      Male    White
## 643             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 644             0                  IsnotsurethereisaGod      Male    Asian
## 645             0 Doesnotcurrentlyidentifywithareligion    Female    White
## 646             1                               Atheist      Male    White
## 647             1                  IsnotsurethereisaGod      Male Hispanic
## 648             0        Attendsreligiousservicesweekly    Female Hispanic
## 649             0                               Atheist      Male    Asian
## 650             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 651             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 652             0                  IsnotsurethereisaGod    Female Hispanic
## 653             1        Attendsreligiousservicesweekly    Female    White
## 654             0                             Christian      Male    Asian
## 655             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 656             1                               Atheist      Male    Black
## 657             1                               Atheist    Female    White
## 658             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 659             0                               Atheist      Male    White
## 660             1                               Atheist    Female Hispanic
## 661             1                               Atheist      Male    Asian
## 662             0                               Atheist    Female Hispanic
## 663             0        Attendsreligiousservicesweekly      Male    Asian
## 664             1                             Christian      Male    Asian
## 665             1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 666             0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 667             1                  IsnotsurethereisaGod    Female    Asian
## 668             0                             Christian      Male    Asian
## 669             0 Doesnotcurrentlyidentifywithareligion      Male    Black
## 670             1                  IsnotsurethereisaGod      Male    White
## 671             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 672             1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 673             1                               Atheist    Female    Black
## 674             0                             Christian    Female    White
## 675             1                               Atheist    Female    Black
## 676             0        Attendsreligiousservicesweekly    Female    Black
## 677             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 678             1                               Atheist    Female    Black
## 679             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 680             0                               Atheist    Female Hispanic
## 681             1 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 682             0                  IsnotsurethereisaGod      Male    White
## 683             1                  IsnotsurethereisaGod    Female    Black
## 684             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 685             1                             Christian    Female Hispanic
## 686             0        Attendsreligiousservicesweekly    Female    Black
## 687             0 Doesnotcurrentlyidentifywithareligion      Male    Black
## 688             1                  IsnotsurethereisaGod    Female    Black
## 689             1        Attendsreligiousservicesweekly    Female    Black
## 690             0                             Christian    Female    Asian
## 691             0                               Atheist      Male    Black
## 692             1                             Christian    Female    Black
## 693             0                  IsnotsurethereisaGod    Female    White
## 694             1        Attendsreligiousservicesweekly      Male    White
## 695             0                               Atheist      Male    Asian
## 696             1                             Christian      Male    Asian
## 697             1                             Christian      Male    White
## 698             0                               Atheist      Male    Black
## 699             1                             Christian    Female    Asian
## 700             0                  IsnotsurethereisaGod    Female    White
## 701             0        Attendsreligiousservicesweekly    Female    Asian
## 702             1        Attendsreligiousservicesweekly    Female    Asian
## 703             1                               Atheist    Female    Black
## 704             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 705             1                  IsnotsurethereisaGod      Male Hispanic
## 706             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 707             0                  IsnotsurethereisaGod      Male    Black
## 708             1                             Christian    Female    Black
## 709             0                               Atheist      Male Hispanic
## 710             1                  IsnotsurethereisaGod      Male Hispanic
## 711             0                               Atheist    Female    Asian
## 712             1                             Christian    Female    White
## 713             0                  IsnotsurethereisaGod      Male    Black
## 714             1                             Christian      Male    White
## 715             1                  IsnotsurethereisaGod      Male    White
## 716             0        Attendsreligiousservicesweekly    Female    Asian
## 717             1                  IsnotsurethereisaGod    Female    White
## 718             0                  IsnotsurethereisaGod      Male Hispanic
## 719             0                               Atheist      Male    White
## 720             1                  IsnotsurethereisaGod      Male    White
## 721             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 722             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 723             1                               Atheist    Female    Asian
## 724             0                               Atheist      Male    Black
## 725             1        Attendsreligiousservicesweekly      Male Hispanic
## 726             0                               Atheist    Female    White
## 727             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 728             1                             Christian      Male    White
## 729             1                               Atheist    Female Hispanic
## 730             0                  IsnotsurethereisaGod      Male Hispanic
## 731             1                             Christian      Male Hispanic
## 732             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 733             1                               Atheist      Male    Asian
## 734             0                  IsnotsurethereisaGod    Female Hispanic
## 735             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 736             1                             Christian      Male    White
## 737             1                             Christian    Female    White
## 738             0                  IsnotsurethereisaGod      Male Hispanic
## 739             0        Attendsreligiousservicesweekly      Male    Asian
## 740             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 741             0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 742             1                             Christian      Male    White
## 743             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 744             0                               Atheist    Female    Asian
## 745             1        Attendsreligiousservicesweekly    Female Hispanic
## 746             0                  IsnotsurethereisaGod      Male    White
## 747             0        Attendsreligiousservicesweekly    Female    Black
## 748             1                             Christian    Female    Black
## 749             1                  IsnotsurethereisaGod      Male Hispanic
## 750             0                               Atheist      Male    White
## 751             0                             Christian    Female    White
## 752             1                             Christian    Female Hispanic
## 753             1                  IsnotsurethereisaGod    Female    White
## 754             0        Attendsreligiousservicesweekly    Female    Asian
## 755             1                  IsnotsurethereisaGod    Female    White
## 756             0                  IsnotsurethereisaGod    Female    Black
## 757             0                               Atheist      Male    Black
## 758             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 759             0                               Atheist    Female    White
## 760             1                               Atheist    Female    Black
## 761             1                             Christian    Female    Asian
## 762             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 763             1        Attendsreligiousservicesweekly    Female Hispanic
## 764             0                               Atheist      Male    White
## 765             1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 766             0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 767             0        Attendsreligiousservicesweekly    Female    White
## 768             1                               Atheist      Male    Asian
## 769             1                               Atheist      Male Hispanic
## 770             0                  IsnotsurethereisaGod    Female    Asian
## 771             1                             Christian    Female Hispanic
## 772             0        Attendsreligiousservicesweekly      Male    Asian
## 773             0                  IsnotsurethereisaGod    Female    White
## 774             1        Attendsreligiousservicesweekly    Female    Asian
## 775             1                  IsnotsurethereisaGod    Female    White
## 776             0                  IsnotsurethereisaGod    Female    Black
## 777             0                               Atheist      Male    Black
## 778             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 779             1                               Atheist    Female    White
## 780             0                               Atheist    Female    Black
## 781             1                             Christian    Female    Asian
## 782             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 783             1        Attendsreligiousservicesweekly    Female Hispanic
## 784             0                               Atheist      Male    White
## 785             0                               Atheist    Female Hispanic
## 786             1                               Atheist      Male    Black
## 787             0        Attendsreligiousservicesweekly    Female    Black
## 788             1                  IsnotsurethereisaGod    Female    White
## 789             0                               Atheist      Male    White
## 790             1                               Atheist      Male    White
## 791             0        Attendsreligiousservicesweekly    Female    Black
## 792             1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 793             0                               Atheist    Female    White
## 794             1                  IsnotsurethereisaGod      Male    Asian
## 795             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 796             0                  IsnotsurethereisaGod      Male Hispanic
## 797             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 798             1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 799             1                  IsnotsurethereisaGod      Male    White
## 800             0                             Christian      Male    Asian
## 801             0                               Atheist    Female    Black
## 802             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 803             1                  IsnotsurethereisaGod    Female    Asian
## 804             0                             Christian    Female    White
## 805             0                             Christian      Male Hispanic
## 806             1        Attendsreligiousservicesweekly      Male    White
## 807             1                             Christian      Male    White
## 808             0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 809             0        Attendsreligiousservicesweekly    Female Hispanic
## 810             1                               Atheist    Female Hispanic
## 811             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 812             0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 813             1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 814             0                               Atheist      Male Hispanic
## 815             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 816             1                  IsnotsurethereisaGod    Female    White
## 817             0                               Atheist    Female Hispanic
## 818             1                  IsnotsurethereisaGod      Male    Asian
## 819             0                               Atheist      Male    Asian
## 820             1        Attendsreligiousservicesweekly    Female Hispanic
## 821             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 822             1                  IsnotsurethereisaGod      Male    Black
## 823             1                  IsnotsurethereisaGod      Male    Asian
## 824             0                             Christian      Male    Black
## 825             1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 826             0 Doesnotcurrentlyidentifywithareligion    Female    White
## 827             0                  IsnotsurethereisaGod    Female    Black
## 828             1                  IsnotsurethereisaGod    Female    White
## 829             1                               Atheist    Female    White
## 830             0        Attendsreligiousservicesweekly    Female    Black
## 831             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 832             0                               Atheist    Female    Asian
## 833             1                               Atheist    Female    White
## 834             0                               Atheist    Female    Black
## 835             1                             Christian    Female    Asian
## 836             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 837             0        Attendsreligiousservicesweekly    Female Hispanic
## 838             1                               Atheist      Male    White
## 839             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 840             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 841             1        Attendsreligiousservicesweekly    Female    White
## 842             0                               Atheist      Male    Asian
## 843             0                  IsnotsurethereisaGod      Male Hispanic
## 844             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 845             0                  IsnotsurethereisaGod      Male    Black
## 846             1                             Christian    Female    Black
## 847             0                               Atheist      Male Hispanic
## 848             1                  IsnotsurethereisaGod      Male Hispanic
## 849             0                               Atheist    Female    White
## 850             1                               Atheist    Female    Asian
## 851             0        Attendsreligiousservicesweekly      Male    White
## 852             1                             Christian      Male    Asian
## 853             1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 854             0                               Atheist    Female    Black
## 855             1 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 856             0                               Atheist      Male    Asian
## 857             0        Attendsreligiousservicesweekly    Female Hispanic
## 858             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 859             1                               Atheist      Male    White
## 860             0                               Atheist    Female    White
## 861             1        Attendsreligiousservicesweekly      Male    Asian
## 862             0                  IsnotsurethereisaGod    Female Hispanic
## 863             1                               Atheist    Female    White
## 864             0                               Atheist      Male Hispanic
## 865             1        Attendsreligiousservicesweekly    Female Hispanic
## 866             0                               Atheist      Male    White
## 867             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 868             1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 869             1        Attendsreligiousservicesweekly    Female    White
## 870             0                               Atheist      Male    Asian
## 871             0                  IsnotsurethereisaGod      Male Hispanic
## 872             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 873             1                  IsnotsurethereisaGod      Male    Black
## 874             0                             Christian    Female    Black
## 875             1                               Atheist      Male Hispanic
## 876             0                  IsnotsurethereisaGod      Male Hispanic
## 877             0                               Atheist    Female    Asian
## 878             1                             Christian    Female    White
## 879             0                  IsnotsurethereisaGod      Male    Black
## 880             1                             Christian      Male    White
## 881             1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 882             0                               Atheist    Female    Asian
## 883             0                             Christian    Female    Asian
## 884             1                             Christian      Male Hispanic
## 885             0                             Christian      Male    White
## 886             1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 887             0        Attendsreligiousservicesweekly      Male Hispanic
## 888             1        Attendsreligiousservicesweekly    Female    Black
## 889             0                               Atheist    Female    White
## 890             1                               Atheist    Female Hispanic
## 891             1                  IsnotsurethereisaGod      Male    White
## 892             0                             Christian      Male Hispanic
## 893             1                             Christian      Male    Asian
## 894             0                               Atheist    Female    Black
## 895             1        Attendsreligiousservicesweekly    Female    Black
## 896             0                             Christian      Male Hispanic
## 897             1                             Christian    Female    Asian
## 898             0 Doesnotcurrentlyidentifywithareligion      Male    White
## 899             1                  IsnotsurethereisaGod      Male    White
## 900             0                               Atheist      Male Hispanic
## 901             1        Attendsreligiousservicesweekly    Female    Asian
## 902             0                  IsnotsurethereisaGod    Female Hispanic
## 903             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 904             1                             Christian      Male Hispanic
## 905             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 906             0                               Atheist      Male Hispanic
## 907             0                             Christian      Male    Asian
## 908             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 909             0                             Christian    Female    White
## 910             1                             Christian      Male Hispanic
## 911             1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 912             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 913             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 914             0                               Atheist      Male Hispanic
## 915             0                             Christian      Male    Asian
## 916             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 917             0                             Christian    Female    White
## 918             1                             Christian      Male Hispanic
## 919             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 920             1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 921             0                               Atheist    Female Hispanic
## 922             1                  IsnotsurethereisaGod      Male    Asian
## 923             0                               Atheist      Male    Asian
## 924             1        Attendsreligiousservicesweekly    Female Hispanic
## 925             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 926             0                  IsnotsurethereisaGod      Male    Black
## 927             1                  IsnotsurethereisaGod      Male    Asian
## 928             0                             Christian      Male    Black
## 929             1                  IsnotsurethereisaGod      Male    White
## 930             0                               Atheist      Male Hispanic
## 931             1        Attendsreligiousservicesweekly    Female    Asian
## 932             0                  IsnotsurethereisaGod    Female Hispanic
## 933             0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 934             1                             Christian      Male Hispanic
## 935             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 936             0                               Atheist      Male Hispanic
## 937             1                             Christian      Male    Asian
## 938             0 Doesnotcurrentlyidentifywithareligion    Female    White
## 939             1                             Christian    Female    White
## 940             0                             Christian      Male Hispanic
## 941             1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 942             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 943             1                               Atheist    Female Hispanic
## 944             0                  IsnotsurethereisaGod      Male    Asian
## 945             0                  IsnotsurethereisaGod      Male    Black
## 946             1                             Christian    Female    Black
## 947             1                               Atheist      Male Hispanic
## 948             0                  IsnotsurethereisaGod      Male Hispanic
## 949             0                               Atheist    Female    Asian
## 950             1                             Christian    Female    White
## 951             0                  IsnotsurethereisaGod      Male    Black
## 952             1                             Christian      Male    White
## 953             0                  IsnotsurethereisaGod      Male    White
## 954             1        Attendsreligiousservicesweekly    Female    Asian
## 955             0                  IsnotsurethereisaGod    Female    White
## 956             1                  IsnotsurethereisaGod      Male Hispanic
## 957             1                               Atheist      Male    White
## 958             0                  IsnotsurethereisaGod      Male    White
## 959             1        Attendsreligiousservicesweekly      Male Hispanic
## 960             0        Attendsreligiousservicesweekly      Male    Black
## 961             1                             Christian      Male Hispanic
## 962             0                               Atheist    Female Hispanic
## 963             1                             Christian    Female Hispanic
## 964             0        Attendsreligiousservicesweekly    Female    Asian
## 965             1                  IsnotsurethereisaGod      Male    White
## 966             0                  IsnotsurethereisaGod      Male    White
## 967             0                               Atheist    Female Hispanic
## 968             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 969             0                               Atheist      Male Hispanic
## 970             1                  IsnotsurethereisaGod      Male    White
## 971             0                  IsnotsurethereisaGod      Male    Asian
## 972             1        Attendsreligiousservicesweekly      Male Hispanic
## 973             1                             Christian      Male Hispanic
## 974             0                             Christian      Male Hispanic
## 975             1                               Atheist    Female    Black
## 976             0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 977             1 Doesnotcurrentlyidentifywithareligion      Male    White
## 978             0                               Atheist    Female    Black
## 979             1 Doesnotcurrentlyidentifywithareligion    Female    White
## 980             0                               Atheist    Female Hispanic
## 981             0 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 982             1                  IsnotsurethereisaGod      Male    White
## 983             0                  IsnotsurethereisaGod    Female    Black
## 984             1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 985             1                             Christian    Female Hispanic
## 986             0        Attendsreligiousservicesweekly    Female    Black
## 987             1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 988             0                  IsnotsurethereisaGod    Female    Black
## 989             0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 990             1                             Christian      Male    White
## 991             0        Attendsreligiousservicesweekly    Female Hispanic
## 992             1        Attendsreligiousservicesweekly    Female    Black
## 993             1                               Atheist      Male Hispanic
## 994             0        Attendsreligiousservicesweekly    Female    Black
## 995             1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 996             0                             Christian    Female    White
## 997             0                  IsnotsurethereisaGod      Male Hispanic
## 998             1                             Christian    Female    Asian
## 999             0                               Atheist    Female    Black
## 1000            1                               Atheist    Female    Black
## 1001            0                             Christian      Male    Black
## 1002            1 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 1003            0                  IsnotsurethereisaGod    Female    Asian
## 1004            1                  IsnotsurethereisaGod    Female Hispanic
## 1005            1        Attendsreligiousservicesweekly    Female    White
## 1006            0                               Atheist      Male    Asian
## 1007            1                               Atheist    Female    White
## 1008            0                             Christian      Male Hispanic
## 1009            1                  IsnotsurethereisaGod      Male    White
## 1010            0        Attendsreligiousservicesweekly    Female    Asian
## 1011            1                  IsnotsurethereisaGod    Female    White
## 1012            0                  IsnotsurethereisaGod      Male Hispanic
## 1013            0                               Atheist      Male    White
## 1014            1                  IsnotsurethereisaGod      Male    White
## 1015            1        Attendsreligiousservicesweekly      Male Hispanic
## 1016            0        Attendsreligiousservicesweekly      Male    Black
## 1017            1                             Christian      Male Hispanic
## 1018            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1019            1                               Atheist    Female    White
## 1020            0                  IsnotsurethereisaGod      Male    Black
## 1021            0                               Atheist      Male    White
## 1022            1                               Atheist      Male    Black
## 1023            0                  IsnotsurethereisaGod      Male    White
## 1024            1                               Atheist    Female    Asian
## 1025            0                  IsnotsurethereisaGod    Female    Asian
## 1026            1        Attendsreligiousservicesweekly    Female    Black
## 1027            0                  IsnotsurethereisaGod      Male    White
## 1028            1                             Christian      Male    Asian
## 1029            1                               Atheist    Female Hispanic
## 1030            0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 1031            1                               Atheist    Female    White
## 1032            0                             Christian      Male    White
## 1033            1                               Atheist      Male Hispanic
## 1034            0        Attendsreligiousservicesweekly    Female Hispanic
## 1035            1                               Atheist    Female    Asian
## 1036            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1037            1        Attendsreligiousservicesweekly      Male Hispanic
## 1038            0                               Atheist    Female    Black
## 1039            0        Attendsreligiousservicesweekly      Male Hispanic
## 1040            1        Attendsreligiousservicesweekly      Male    Asian
## 1041            1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 1042            0                             Christian      Male    White
## 1043            0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 1044            1                               Atheist    Female    Asian
## 1045            0        Attendsreligiousservicesweekly    Female Hispanic
## 1046            1                  IsnotsurethereisaGod      Male    White
## 1047            0        Attendsreligiousservicesweekly    Female    Black
## 1048            1                             Christian    Female    Black
## 1049            0                  IsnotsurethereisaGod      Male Hispanic
## 1050            1                               Atheist      Male    White
## 1051            1                             Christian    Female    White
## 1052            0                             Christian    Female Hispanic
## 1053            1                  IsnotsurethereisaGod    Female    Black
## 1054            0                  IsnotsurethereisaGod      Male    White
## 1055            0        Attendsreligiousservicesweekly      Male    Black
## 1056            1                               Atheist      Male    Asian
## 1057            0                  IsnotsurethereisaGod      Male    White
## 1058            1                             Christian    Female    Black
## 1059            1                             Christian    Female    Asian
## 1060            0        Attendsreligiousservicesweekly      Male    Black
## 1061            1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1062            0                               Atheist      Male    Asian
## 1063            1        Attendsreligiousservicesweekly    Female    Black
## 1064            0                  IsnotsurethereisaGod      Male    White
## 1065            1 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 1066            0        Attendsreligiousservicesweekly      Male    Asian
## 1067            0                             Christian    Female Hispanic
## 1068            1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 1069            1                  IsnotsurethereisaGod      Male    Asian
## 1070            0                             Christian      Male Hispanic
## 1071            0                             Christian    Female    White
## 1072            1                  IsnotsurethereisaGod      Male Hispanic
## 1073            0                  IsnotsurethereisaGod      Male    Asian
## 1074            1                             Christian      Male    White
## 1075            1                             Christian    Female    Asian
## 1076            0 Doesnotcurrentlyidentifywithareligion      Male    White
## 1077            1                  IsnotsurethereisaGod      Male    White
## 1078            0                               Atheist      Male Hispanic
## 1079            1        Attendsreligiousservicesweekly    Female    Asian
## 1080            0                  IsnotsurethereisaGod    Female Hispanic
## 1081            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1082            1                             Christian      Male Hispanic
## 1083            1 Doesnotcurrentlyidentifywithareligion      Male    White
## 1084            0                               Atheist      Male Hispanic
## 1085            1                             Christian      Male    Asian
## 1086            0 Doesnotcurrentlyidentifywithareligion    Female    White
## 1087            0                             Christian    Female    White
## 1088            1                             Christian      Male Hispanic
## 1089            0                               Atheist      Male    White
## 1090            1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 1091            0        Attendsreligiousservicesweekly    Female    Asian
## 1092            1                             Christian      Male    White
## 1093            0                               Atheist      Male    Black
## 1094            1                  IsnotsurethereisaGod    Female Hispanic
## 1095            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1096            1 Doesnotcurrentlyidentifywithareligion      Male    White
## 1097            0                               Atheist      Male    White
## 1098            1 Doesnotcurrentlyidentifywithareligion      Male    Black
## 1099            1        Attendsreligiousservicesweekly    Female Hispanic
## 1100            0                             Christian      Male    Asian
## 1101            1                             Christian      Male    White
## 1102            0                  IsnotsurethereisaGod    Female Hispanic
## 1103            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1104            1                             Christian    Female    Asian
## 1105            0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 1106            1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 1107            0                               Atheist    Female Hispanic
## 1108            1                  IsnotsurethereisaGod      Male    Asian
## 1109            0                               Atheist      Male    Asian
## 1110            1        Attendsreligiousservicesweekly    Female Hispanic
## 1111            0 Doesnotcurrentlyidentifywithareligion      Male    White
## 1112            1                  IsnotsurethereisaGod      Male    Black
## 1113            1                  IsnotsurethereisaGod      Male    Asian
## 1114            0                             Christian      Male    Black
## 1115            0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1116            1 Doesnotcurrentlyidentifywithareligion    Female    White
## 1117            1                  IsnotsurethereisaGod    Female    Black
## 1118            0                  IsnotsurethereisaGod    Female    White
## 1119            0                               Atheist    Female    White
## 1120            1        Attendsreligiousservicesweekly    Female    Black
## 1121            1        Attendsreligiousservicesweekly    Female Hispanic
## 1122            0                             Christian      Male    Asian
## 1123            1                             Christian      Male    White
## 1124            0                  IsnotsurethereisaGod    Female Hispanic
## 1125            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1126            1                             Christian    Female    Asian
## 1127            1                               Atheist      Male    White
## 1128            0                               Atheist    Female    Black
## 1129            1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 1130            0        Attendsreligiousservicesweekly    Female    White
## 1131            0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 1132            1        Attendsreligiousservicesweekly      Male    White
## 1133            1                             Christian      Male Hispanic
## 1134            0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 1135            0 Doesnotcurrentlyidentifywithareligion      Male    Black
## 1136            1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1137            1                  IsnotsurethereisaGod    Female    White
## 1138            0                  IsnotsurethereisaGod      Male Hispanic
## 1139            0                               Atheist      Male    White
## 1140            1                  IsnotsurethereisaGod      Male    White
## 1141            1        Attendsreligiousservicesweekly      Male Hispanic
## 1142            0        Attendsreligiousservicesweekly      Male    Black
## 1143            1                             Christian      Male Hispanic
## 1144            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1145            1                               Atheist    Female    White
## 1146            0                  IsnotsurethereisaGod      Male    Black
## 1147            0                               Atheist      Male    White
## 1148            1                               Atheist      Male    Black
## 1149            1                  IsnotsurethereisaGod      Male    White
## 1150            0                               Atheist    Female    Asian
## 1151            0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1152            1 Doesnotcurrentlyidentifywithareligion    Female    White
## 1153            0                               Atheist    Female Hispanic
## 1154            1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1155            0                  IsnotsurethereisaGod      Male    Black
## 1156            1                             Christian    Female    Black
## 1157            0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1158            1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1159            1                  IsnotsurethereisaGod    Female    Black
## 1160            0                               Atheist      Male Hispanic
## 1161            1        Attendsreligiousservicesweekly      Male Hispanic
## 1162            0                               Atheist    Female    White
## 1163            1                  IsnotsurethereisaGod      Male    Asian
## 1164            0                             Christian      Male    White
## 1165            1                             Christian    Female    Asian
## 1166            0 Doesnotcurrentlyidentifywithareligion      Male    White
## 1167            1                  IsnotsurethereisaGod      Male    White
## 1168            0                               Atheist      Male Hispanic
## 1169            0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1170            1 Doesnotcurrentlyidentifywithareligion    Female    White
## 1171            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1172            1        Attendsreligiousservicesweekly      Male    White
## 1173            1                               Atheist    Female Hispanic
## 1174            0 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 1175            0                               Atheist    Female Hispanic
## 1176            1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1177            0                  IsnotsurethereisaGod      Male    Black
## 1178            1                             Christian    Female    Black
## 1179            0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1180            1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1181            0                  IsnotsurethereisaGod    Female    Black
## 1182            1                               Atheist      Male Hispanic
## 1183            1        Attendsreligiousservicesweekly      Male Hispanic
## 1184            0                               Atheist    Female    White
## 1185            0        Attendsreligiousservicesweekly      Male Hispanic
## 1186            1        Attendsreligiousservicesweekly      Male    Black
## 1187            0                             Christian      Male Hispanic
## 1188            1 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1189            1                               Atheist    Female    White
## 1190            0                  IsnotsurethereisaGod      Male    Black
## 1191            1                               Atheist      Male    White
## 1192            0                               Atheist      Male    Black
## 1193            1                  IsnotsurethereisaGod      Male    White
## 1194            0                               Atheist    Female    Asian
## 1195            0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1196            1 Doesnotcurrentlyidentifywithareligion    Female    White
## 1197            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1198            1        Attendsreligiousservicesweekly      Male    White
## 1199            1                               Atheist    Female Hispanic
## 1200            0 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 1201            0                               Atheist      Male    Black
## 1202            1 Doesnotcurrentlyidentifywithareligion    Female    White
## 1203            1                               Atheist    Female    White
## 1204            0                               Atheist    Female    Black
## 1205            1                             Christian    Female    Asian
## 1206            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1207            1        Attendsreligiousservicesweekly    Female Hispanic
## 1208            0                               Atheist      Male    White
## 1209            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1210            1 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 1211            1        Attendsreligiousservicesweekly    Female    White
## 1212            0                               Atheist      Male    Asian
## 1213            0                  IsnotsurethereisaGod      Male Hispanic
## 1214            1 Doesnotcurrentlyidentifywithareligion      Male    White
## 1215            0                  IsnotsurethereisaGod      Male    Black
## 1216            1                             Christian    Female    Black
## 1217            1                  IsnotsurethereisaGod      Male    Asian
## 1218            0                             Christian      Male    Black
## 1219            0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1220            1 Doesnotcurrentlyidentifywithareligion    Female    White
## 1221            0                  IsnotsurethereisaGod    Female    Black
## 1222            1                  IsnotsurethereisaGod    Female    White
## 1223            1                               Atheist    Female    White
## 1224            0        Attendsreligiousservicesweekly    Female    Black
## 1225            0 Doesnotcurrentlyidentifywithareligion      Male Hispanic
## 1226            1                               Atheist    Female    Asian
## 1227            1        Attendsreligiousservicesweekly    Female    White
## 1228            0                             Christian    Female    Black
## 1229            0 Doesnotcurrentlyidentifywithareligion      Male    Black
## 1230            1                               Atheist    Female    Asian
## 1231            0                             Christian    Female    Asian
## 1232            1                             Christian      Male Hispanic
## 1233            0        Attendsreligiousservicesweekly    Female    White
## 1234            1                             Christian      Male    Asian
## 1235            1 Doesnotcurrentlyidentifywithareligion      Male    White
## 1236            0                               Atheist      Male    Black
## 1237            0 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 1238            1                             Christian    Female    Asian
## 1239            1 Doesnotcurrentlyidentifywithareligion    Female    White
## 1240            0                  IsnotsurethereisaGod      Male Hispanic
## 1241            1                             Christian      Male    Asian
## 1242            0        Attendsreligiousservicesweekly    Female    Black
## 1243            0                             Christian      Male    White
## 1244            1                             Christian      Male    White
## 1245            0                               Atheist    Female    Asian
## 1246            1                             Christian      Male Hispanic
## 1247            1                  IsnotsurethereisaGod    Female    Asian
## 1248            0                               Atheist      Male    Asian
## 1249            0                  IsnotsurethereisaGod      Male    Black
## 1250            1                             Christian      Male    White
## 1251            0                  IsnotsurethereisaGod      Male    White
## 1252            1        Attendsreligiousservicesweekly    Female    Asian
## 1253            0                  IsnotsurethereisaGod    Female    White
## 1254            1                  IsnotsurethereisaGod      Male Hispanic
## 1255            0                               Atheist      Male    White
## 1256            1                  IsnotsurethereisaGod      Male    White
## 1257            1        Attendsreligiousservicesweekly      Male Hispanic
## 1258            0        Attendsreligiousservicesweekly      Male    Black
## 1259            1                             Christian      Male Hispanic
## 1260            0 Doesnotcurrentlyidentifywithareligion    Female    Black
## 1261            0                               Atheist    Female    White
## 1262            1                  IsnotsurethereisaGod      Male    Black
## 1263            1                               Atheist      Male    White
## 1264            0                               Atheist      Male    Black
## 1265            1        Attendsreligiousservicesweekly    Female    Black
## 1266            0                             Christian      Male Hispanic
## 1267            0        Attendsreligiousservicesweekly    Female Hispanic
## 1268            1        Attendsreligiousservicesweekly    Female    Black
## 1269            1                  IsnotsurethereisaGod      Male    White
## 1270            0                               Atheist      Male Hispanic
## 1271            1                               Atheist    Female    Black
## 1272            0                             Christian    Female    White
## 1273            1                               Atheist    Female    Black
## 1274            0        Attendsreligiousservicesweekly    Female    Black
## 1275            1 Doesnotcurrentlyidentifywithareligion      Male    White
## 1276            0                               Atheist    Female    Black
## 1277            1 Doesnotcurrentlyidentifywithareligion    Female    White
## 1278            0                               Atheist    Female Hispanic
## 1279            1 Doesnotcurrentlyidentifywithareligion    Female Hispanic
## 1280            0                  IsnotsurethereisaGod      Male    White
## 1281            1                             Christian      Male    Asian
## 1282            0 Doesnotcurrentlyidentifywithareligion      Male    Black
## 1283            0                             Christian    Female Hispanic
## 1284            1 Doesnotcurrentlyidentifywithareligion      Male    Asian
## 1285            0        Attendsreligiousservicesweekly    Female    Asian
## 1286            1        Attendsreligiousservicesweekly    Female    Black
## 1287            0                  IsnotsurethereisaGod      Male    White
## 1288            1                  IsnotsurethereisaGod      Male Hispanic
## 1289            0                               Atheist    Female Hispanic
## 1290            1                             Christian    Female    Black
## 1291            1                               Atheist      Male    White
## 1292            0                               Atheist    Female    Black
## 1293            0 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1294            1                               Atheist      Male    Asian
## 1295            0        Attendsreligiousservicesweekly    Female    White
## 1296            1        Attendsreligiousservicesweekly      Male Hispanic
## 1297            1                               Atheist      Male    Black
## 1298            0                               Atheist    Female    Asian
## 1299            0                  IsnotsurethereisaGod      Male    White
## 1300            1                  IsnotsurethereisaGod      Male    Asian
## 1301            1        Attendsreligiousservicesweekly      Male    Black
## 1302            0                               Atheist    Female    Black
## 1303            0                               Atheist    Female Hispanic
## 1304            1                               Atheist      Male    Black
## 1305            0        Attendsreligiousservicesweekly    Female    Black
## 1306            1                  IsnotsurethereisaGod    Female    White
## 1307            0                               Atheist      Male    White
## 1308            1                               Atheist      Male    White
## 1309            0        Attendsreligiousservicesweekly    Female    Black
## 1310            1 Doesnotcurrentlyidentifywithareligion    Female    Asian
## 1311            0                               Atheist    Female    White
## 1312            1                  IsnotsurethereisaGod      Male    Asian
## 1313            0                               Atheist    Female    White
## 1314            1                  IsnotsurethereisaGod      Male    Black
## 1315            0                               Atheist      Male    White
##      EducationAtt AgeAtt ExperienceAtt   PartyAtt     PolicyAtt
## 1      HighSchool     47        8years   Democrat      Economic
## 2      HighSchool     35  NoExperience   Democrat Environmental
## 3     SomeCollege     71        4years Republican       Foreign
## 4     CollegeGrad     47        4years Republican    HealthCare
## 5     SomeCollege     71       12years   Democrat Environmental
## 6      GradDegree     35  NoExperience Republican Environmental
## 7     SomeCollege     71       12years Republican      Economic
## 8     SomeCollege     47        4years   Democrat    HealthCare
## 9      HighSchool     35        8years   Democrat Environmental
## 10    SomeCollege     71  NoExperience Republican      Economic
## 11     GradDegree     35        4years   Democrat    HealthCare
## 12     GradDegree     47  NoExperience Republican    HealthCare
## 13     HighSchool     47        4years Republican Environmental
## 14    CollegeGrad     47  NoExperience Republican       Foreign
## 15     HighSchool     59        4years Republican       Foreign
## 16    SomeCollege     35        8years   Democrat     Education
## 17     GradDegree     71       12years Republican     Education
## 18     GradDegree     59  NoExperience   Democrat     Education
## 19     GradDegree     59       12years   Democrat      Economic
## 20    SomeCollege     59  NoExperience Republican       Foreign
## 21     HighSchool     47       12years   Democrat      Economic
## 22     HighSchool     59  NoExperience   Democrat       Foreign
## 23    SomeCollege     59        4years   Democrat       Foreign
## 24     GradDegree     59        8years Republican     Education
## 25     HighSchool     35        4years Republican     Education
## 26     GradDegree     47  NoExperience   Democrat Environmental
## 27    CollegeGrad     71        4years Republican      Economic
## 28    CollegeGrad     47        8years Republican Environmental
## 29     HighSchool     35  NoExperience Republican    HealthCare
## 30     HighSchool     71        4years   Democrat    HealthCare
## 31    CollegeGrad     71        8years   Democrat       Foreign
## 32     GradDegree     71  NoExperience   Democrat    HealthCare
## 33     GradDegree     71  NoExperience Republican    HealthCare
## 34     GradDegree     47  NoExperience   Democrat      Economic
## 35     HighSchool     47  NoExperience   Democrat       Foreign
## 36     GradDegree     35        4years   Democrat    HealthCare
## 37    SomeCollege     59        4years Republican Environmental
## 38     HighSchool     47  NoExperience   Democrat       Foreign
## 39     HighSchool     71        4years   Democrat Environmental
## 40     GradDegree     71        8years   Democrat    HealthCare
## 41    CollegeGrad     35        8years Republican Environmental
## 42     HighSchool     71       12years   Democrat      Economic
## 43    SomeCollege     35        8years   Democrat    HealthCare
## 44    CollegeGrad     47        8years   Democrat    HealthCare
## 45     HighSchool     35  NoExperience   Democrat       Foreign
## 46     GradDegree     47        4years Republican Environmental
## 47     HighSchool     59        8years   Democrat      Economic
## 48    SomeCollege     47        8years Republican    HealthCare
## 49     HighSchool     35        8years   Democrat      Economic
## 50    CollegeGrad     59  NoExperience Republican     Education
## 51    SomeCollege     47        4years   Democrat Environmental
## 52    CollegeGrad     47       12years Republican      Economic
## 53    SomeCollege     59       12years Republican    HealthCare
## 54    SomeCollege     71       12years Republican     Education
## 55    CollegeGrad     47       12years Republican       Foreign
## 56     GradDegree     71  NoExperience Republican    HealthCare
## 57     GradDegree     35        8years Republican     Education
## 58     GradDegree     47  NoExperience Republican     Education
## 59     GradDegree     71       12years   Democrat Environmental
## 60    SomeCollege     59       12years Republican       Foreign
## 61     HighSchool     47        4years   Democrat Environmental
## 62    SomeCollege     47        8years   Democrat    HealthCare
## 63    CollegeGrad     59        4years Republican       Foreign
## 64     GradDegree     71        4years   Democrat     Education
## 65    SomeCollege     47  NoExperience   Democrat      Economic
## 66    CollegeGrad     59        4years Republican    HealthCare
## 67    SomeCollege     47        8years   Democrat      Economic
## 68    CollegeGrad     71       12years Republican      Economic
## 69     HighSchool     59        4years Republican    HealthCare
## 70    SomeCollege     59  NoExperience Republican     Education
## 71     HighSchool     47        8years   Democrat      Economic
## 72     HighSchool     35  NoExperience   Democrat Environmental
## 73    SomeCollege     71        4years Republican       Foreign
## 74    CollegeGrad     47        4years Republican    HealthCare
## 75    SomeCollege     71       12years   Democrat Environmental
## 76     GradDegree     35  NoExperience Republican Environmental
## 77    SomeCollege     71       12years Republican      Economic
## 78    SomeCollege     47        4years   Democrat    HealthCare
## 79     HighSchool     35        8years   Democrat Environmental
## 80    SomeCollege     71  NoExperience Republican      Economic
## 81     HighSchool     59        8years   Democrat     Education
## 82     HighSchool     35        8years   Democrat     Education
## 83     GradDegree     35  NoExperience Republican     Education
## 84     GradDegree     71        4years Republican    HealthCare
## 85    CollegeGrad     35        8years   Democrat     Education
## 86    CollegeGrad     71       12years Republican Environmental
## 87    CollegeGrad     59  NoExperience Republican     Education
## 88     GradDegree     59        4years   Democrat       Foreign
## 89     GradDegree     59        8years   Democrat      Economic
## 90    CollegeGrad     35       12years   Democrat     Education
## 91     GradDegree     35        4years   Democrat      Economic
## 92     GradDegree     59       12years Republican      Economic
## 93     HighSchool     47  NoExperience Republican    HealthCare
## 94    SomeCollege     47        4years Republican       Foreign
## 95    CollegeGrad     59       12years Republican     Education
## 96     HighSchool     71       12years   Democrat       Foreign
## 97    SomeCollege     59        4years Republican Environmental
## 98     HighSchool     47  NoExperience   Democrat       Foreign
## 99     HighSchool     71        4years   Democrat Environmental
## 100    GradDegree     71        8years   Democrat    HealthCare
## 101   CollegeGrad     35        8years Republican Environmental
## 102    HighSchool     71       12years   Democrat      Economic
## 103   SomeCollege     35        8years   Democrat    HealthCare
## 104   CollegeGrad     47        8years   Democrat    HealthCare
## 105    HighSchool     35  NoExperience   Democrat       Foreign
## 106    GradDegree     47        4years Republican Environmental
## 107    HighSchool     59        8years   Democrat      Economic
## 108   SomeCollege     47        8years Republican    HealthCare
## 109    HighSchool     59        8years   Democrat     Education
## 110    HighSchool     35        8years   Democrat     Education
## 111    GradDegree     35  NoExperience Republican     Education
## 112    GradDegree     71        4years Republican    HealthCare
## 113   SomeCollege     47        8years   Democrat      Economic
## 114   CollegeGrad     71       12years Republican      Economic
## 115    HighSchool     59        4years Republican    HealthCare
## 116   SomeCollege     59  NoExperience Republican     Education
## 117    HighSchool     47        8years   Democrat      Economic
## 118    HighSchool     35  NoExperience   Democrat Environmental
## 119   SomeCollege     71        4years Republican       Foreign
## 120   CollegeGrad     47        4years Republican    HealthCare
## 121   SomeCollege     71       12years   Democrat Environmental
## 122    GradDegree     35  NoExperience Republican Environmental
## 123   SomeCollege     71       12years Republican      Economic
## 124   SomeCollege     47        4years   Democrat    HealthCare
## 125    HighSchool     35        8years   Democrat Environmental
## 126   SomeCollege     71  NoExperience Republican      Economic
## 127    GradDegree     35        4years   Democrat    HealthCare
## 128    GradDegree     47  NoExperience Republican    HealthCare
## 129   CollegeGrad     59        8years Republican     Education
## 130    HighSchool     59        8years Republican      Economic
## 131   SomeCollege     35        4years Republican     Education
## 132    GradDegree     71  NoExperience   Democrat       Foreign
## 133    HighSchool     35        8years   Democrat       Foreign
## 134   CollegeGrad     59  NoExperience Republican       Foreign
## 135    GradDegree     35        8years   Democrat      Economic
## 136    GradDegree     71        8years Republican Environmental
## 137    HighSchool     59  NoExperience   Democrat       Foreign
## 138    HighSchool     71        4years   Democrat    HealthCare
## 139   SomeCollege     59  NoExperience Republican       Foreign
## 140    GradDegree     71        8years Republican Environmental
## 141    GradDegree     35        8years   Democrat     Education
## 142    HighSchool     71  NoExperience Republican      Economic
## 143    GradDegree     47        8years   Democrat     Education
## 144    GradDegree     59       12years   Democrat Environmental
## 145   SomeCollege     71  NoExperience   Democrat Environmental
## 146    GradDegree     35  NoExperience   Democrat    HealthCare
## 147   SomeCollege     47        8years Republican Environmental
## 148   SomeCollege     35        8years   Democrat      Economic
## 149    HighSchool     35       12years   Democrat Environmental
## 150    HighSchool     71  NoExperience   Democrat Environmental
## 151    GradDegree     35  NoExperience Republican Environmental
## 152   SomeCollege     59  NoExperience   Democrat     Education
## 153   CollegeGrad     35       12years Republican       Foreign
## 154    GradDegree     35       12years Republican     Education
## 155   SomeCollege     59  NoExperience   Democrat     Education
## 156   SomeCollege     47  NoExperience   Democrat       Foreign
## 157   SomeCollege     59        4years Republican Environmental
## 158    GradDegree     47  NoExperience   Democrat     Education
## 159   SomeCollege     35       12years Republican Environmental
## 160    HighSchool     47        4years   Democrat      Economic
## 161    HighSchool     35       12years   Democrat       Foreign
## 162    HighSchool     35       12years   Democrat     Education
## 163    GradDegree     47       12years   Democrat       Foreign
## 164    HighSchool     47  NoExperience   Democrat Environmental
## 165    HighSchool     47       12years Republican    HealthCare
## 166    GradDegree     59       12years Republican      Economic
## 167   SomeCollege     59       12years Republican Environmental
## 168   CollegeGrad     47       12years Republican      Economic
## 169    HighSchool     35  NoExperience Republican    HealthCare
## 170   SomeCollege     59       12years   Democrat     Education
## 171    GradDegree     71        4years Republican Environmental
## 172   SomeCollege     47       12years   Democrat       Foreign
## 173   CollegeGrad     47        4years Republican       Foreign
## 174   CollegeGrad     59        4years   Democrat    HealthCare
## 175    GradDegree     47       12years   Democrat     Education
## 176    GradDegree     71        8years Republican      Economic
## 177    HighSchool     47  NoExperience   Democrat       Foreign
## 178    GradDegree     35        4years   Democrat    HealthCare
## 179   SomeCollege     59        4years Republican Environmental
## 180    HighSchool     47  NoExperience   Democrat       Foreign
## 181    HighSchool     71        4years   Democrat Environmental
## 182    GradDegree     71        8years   Democrat    HealthCare
## 183   CollegeGrad     35        8years Republican Environmental
## 184    HighSchool     71       12years   Democrat      Economic
## 185   SomeCollege     35        8years   Democrat    HealthCare
## 186   CollegeGrad     47        8years   Democrat    HealthCare
## 187    HighSchool     35  NoExperience   Democrat       Foreign
## 188    GradDegree     47        4years Republican Environmental
## 189    HighSchool     59        8years   Democrat      Economic
## 190   SomeCollege     47        8years Republican    HealthCare
## 191    HighSchool     59        8years   Democrat     Education
## 192    HighSchool     35        8years   Democrat     Education
## 193    GradDegree     71       12years   Democrat Environmental
## 194    HighSchool     47       12years   Democrat      Economic
## 195   CollegeGrad     59        4years Republican     Education
## 196    HighSchool     59        4years Republican     Education
## 197   SomeCollege     59  NoExperience Republican       Foreign
## 198   CollegeGrad     71       12years   Democrat    HealthCare
## 199    GradDegree     59        4years Republican Environmental
## 200   SomeCollege     47  NoExperience Republican Environmental
## 201    GradDegree     59       12years   Democrat    HealthCare
## 202   SomeCollege     35        8years   Democrat Environmental
## 203   SomeCollege     35        8years   Democrat      Economic
## 204    HighSchool     35        8years   Democrat      Economic
## 205    GradDegree     71       12years   Democrat      Economic
## 206    HighSchool     47  NoExperience Republican    HealthCare
## 207   CollegeGrad     35  NoExperience Republican      Economic
## 208   SomeCollege     47       12years   Democrat      Economic
## 209   SomeCollege     71       12years Republican      Economic
## 210   SomeCollege     47        4years   Democrat    HealthCare
## 211    HighSchool     35        8years   Democrat Environmental
## 212   SomeCollege     71  NoExperience Republican      Economic
## 213    GradDegree     35        4years   Democrat    HealthCare
## 214    GradDegree     47  NoExperience Republican    HealthCare
## 215    HighSchool     47        4years Republican Environmental
## 216   CollegeGrad     47  NoExperience Republican       Foreign
## 217    HighSchool     59        4years Republican       Foreign
## 218   SomeCollege     35        8years   Democrat     Education
## 219    HighSchool     59       12years   Democrat    HealthCare
## 220    HighSchool     59       12years Republican     Education
## 221   SomeCollege     71        4years Republican       Foreign
## 222    HighSchool     47        8years Republican      Economic
## 223   CollegeGrad     59        4years   Democrat       Foreign
## 224   CollegeGrad     35       12years   Democrat      Economic
## 225   CollegeGrad     35        8years   Democrat     Education
## 226   CollegeGrad     71       12years Republican Environmental
## 227   CollegeGrad     59  NoExperience Republican     Education
## 228    GradDegree     59        4years   Democrat       Foreign
## 229    GradDegree     59        8years   Democrat      Economic
## 230   CollegeGrad     35       12years   Democrat     Education
## 231    GradDegree     35        4years   Democrat      Economic
## 232    GradDegree     59       12years Republican      Economic
## 233    HighSchool     47  NoExperience Republican    HealthCare
## 234   SomeCollege     47        4years Republican       Foreign
## 235   CollegeGrad     59       12years Republican     Education
## 236    HighSchool     71       12years   Democrat       Foreign
## 237   CollegeGrad     35        4years   Democrat Environmental
## 238   SomeCollege     59       12years   Democrat    HealthCare
## 239    GradDegree     35        8years Republican      Economic
## 240    HighSchool     71       12years   Democrat     Education
## 241   SomeCollege     59  NoExperience   Democrat    HealthCare
## 242    HighSchool     47  NoExperience   Democrat       Foreign
## 243    GradDegree     35        8years   Democrat     Education
## 244    HighSchool     35  NoExperience Republican      Economic
## 245   SomeCollege     35  NoExperience   Democrat      Economic
## 246    HighSchool     35        4years Republican     Education
## 247    HighSchool     47        4years   Democrat    HealthCare
## 248   CollegeGrad     59       12years   Democrat    HealthCare
## 249   SomeCollege     59  NoExperience   Democrat      Economic
## 250    HighSchool     35        8years Republican    HealthCare
## 251    GradDegree     71        4years Republican Environmental
## 252   SomeCollege     71        4years   Democrat     Education
## 253   CollegeGrad     71        8years   Democrat      Economic
## 254   CollegeGrad     35        4years   Democrat       Foreign
## 255   CollegeGrad     59        8years   Democrat     Education
## 256    HighSchool     35  NoExperience Republican Environmental
## 257   CollegeGrad     71        4years Republican      Economic
## 258   CollegeGrad     47        8years Republican Environmental
## 259    HighSchool     35  NoExperience Republican    HealthCare
## 260    HighSchool     71        4years   Democrat    HealthCare
## 261   CollegeGrad     71        8years   Democrat       Foreign
## 262    GradDegree     71  NoExperience   Democrat    HealthCare
## 263   SomeCollege     47        8years Republican    HealthCare
## 264    GradDegree     47        4years   Democrat    HealthCare
## 265    HighSchool     59  NoExperience   Democrat Environmental
## 266   SomeCollege     35        4years   Democrat       Foreign
## 267   CollegeGrad     35        8years   Democrat      Economic
## 268    GradDegree     59  NoExperience   Democrat    HealthCare
## 269    HighSchool     71  NoExperience   Democrat     Education
## 270    HighSchool     47        4years   Democrat Environmental
## 271   CollegeGrad     47  NoExperience Republican      Economic
## 272   CollegeGrad     71        4years   Democrat    HealthCare
## 273    HighSchool     35        8years   Democrat Environmental
## 274   SomeCollege     71  NoExperience Republican      Economic
## 275    GradDegree     35        4years   Democrat    HealthCare
## 276    GradDegree     47  NoExperience Republican    HealthCare
## 277    HighSchool     47        4years Republican Environmental
## 278   CollegeGrad     47  NoExperience Republican       Foreign
## 279    HighSchool     59        4years Republican       Foreign
## 280   SomeCollege     35        8years   Democrat     Education
## 281    HighSchool     59       12years   Democrat    HealthCare
## 282    HighSchool     59       12years Republican     Education
## 283   SomeCollege     71        4years Republican       Foreign
## 284    HighSchool     47        8years Republican      Economic
## 285   CollegeGrad     59        4years   Democrat       Foreign
## 286   CollegeGrad     35       12years   Democrat      Economic
## 287   CollegeGrad     47       12years   Democrat      Economic
## 288    GradDegree     59        8years   Democrat    HealthCare
## 289   SomeCollege     71  NoExperience   Democrat    HealthCare
## 290   CollegeGrad     35        8years   Democrat     Education
## 291    HighSchool     47        4years   Democrat     Education
## 292   SomeCollege     59        4years Republican      Economic
## 293   CollegeGrad     35  NoExperience Republican    HealthCare
## 294    HighSchool     59        4years   Democrat    HealthCare
## 295    HighSchool     71       12years   Democrat       Foreign
## 296    GradDegree     59  NoExperience   Democrat      Economic
## 297   CollegeGrad     35       12years Republican    HealthCare
## 298    GradDegree     47  NoExperience Republican    HealthCare
## 299    GradDegree     59        4years Republican    HealthCare
## 300   CollegeGrad     35       12years Republican      Economic
## 301    HighSchool     47        4years   Democrat    HealthCare
## 302   CollegeGrad     35        4years Republican Environmental
## 303    HighSchool     35        4years Republican Environmental
## 304   SomeCollege     35        8years   Democrat      Economic
## 305    HighSchool     59        4years Republican       Foreign
## 306   SomeCollege     35        8years   Democrat     Education
## 307    HighSchool     59       12years   Democrat    HealthCare
## 308    HighSchool     59       12years Republican     Education
## 309   SomeCollege     71        4years Republican       Foreign
## 310    HighSchool     47        8years Republican      Economic
## 311   CollegeGrad     59        4years   Democrat       Foreign
## 312   CollegeGrad     35       12years   Democrat      Economic
## 313   CollegeGrad     47       12years   Democrat      Economic
## 314    GradDegree     59        8years   Democrat    HealthCare
## 315    HighSchool     35       12years Republican    HealthCare
## 316   CollegeGrad     47        8years   Democrat     Education
## 317    HighSchool     59  NoExperience   Democrat    HealthCare
## 318   CollegeGrad     47        8years   Democrat     Education
## 319   SomeCollege     71  NoExperience Republican     Education
## 320    GradDegree     47        8years Republican     Education
## 321   CollegeGrad     71        8years   Democrat    HealthCare
## 322   CollegeGrad     35       12years   Democrat       Foreign
## 323   SomeCollege     71        8years   Democrat       Foreign
## 324    GradDegree     71       12years   Democrat       Foreign
## 325   CollegeGrad     47        4years Republican    HealthCare
## 326   CollegeGrad     47       12years   Democrat    HealthCare
## 327    GradDegree     35  NoExperience Republican       Foreign
## 328   SomeCollege     59        4years Republican    HealthCare
## 329    GradDegree     35        4years   Democrat     Education
## 330    HighSchool     47        4years Republican      Economic
## 331   CollegeGrad     35        8years Republican     Education
## 332    HighSchool     35        4years Republican Environmental
## 333    GradDegree     71       12years   Democrat       Foreign
## 334   CollegeGrad     47       12years Republican       Foreign
## 335    GradDegree     59  NoExperience   Democrat     Education
## 336   SomeCollege     35        4years   Democrat    HealthCare
## 337   CollegeGrad     59        8years   Democrat Environmental
## 338   CollegeGrad     59        8years   Democrat      Economic
## 339    GradDegree     59       12years   Democrat    HealthCare
## 340   SomeCollege     35        4years Republican       Foreign
## 341   SomeCollege     59  NoExperience Republican Environmental
## 342    GradDegree     71        4years Republican    HealthCare
## 343   SomeCollege     35        4years Republican     Education
## 344    GradDegree     35        8years   Democrat      Economic
## 345    HighSchool     59       12years Republican      Economic
## 346   CollegeGrad     59        4years Republican     Education
## 347   SomeCollege     71        8years Republican      Economic
## 348    GradDegree     47  NoExperience   Democrat Environmental
## 349    GradDegree     71       12years Republican     Education
## 350   SomeCollege     35  NoExperience   Democrat Environmental
## 351    GradDegree     59       12years   Democrat       Foreign
## 352   SomeCollege     47        8years Republican       Foreign
## 353    HighSchool     71        8years Republican       Foreign
## 354   CollegeGrad     35        8years   Democrat      Economic
## 355    HighSchool     59        8years Republican     Education
## 356    HighSchool     59       12years   Democrat    HealthCare
## 357   CollegeGrad     35  NoExperience Republican Environmental
## 358   CollegeGrad     71       12years Republican    HealthCare
## 359   SomeCollege     59        4years   Democrat       Foreign
## 360   CollegeGrad     59        8years Republican     Education
## 361    HighSchool     47  NoExperience   Democrat    HealthCare
## 362   SomeCollege     71  NoExperience   Democrat Environmental
## 363    HighSchool     35        8years Republican     Education
## 364   SomeCollege     47        4years   Democrat Environmental
## 365   CollegeGrad     59  NoExperience   Democrat    HealthCare
## 366    HighSchool     35        8years   Democrat       Foreign
## 367   CollegeGrad     71  NoExperience Republican      Economic
## 368    GradDegree     71        8years Republican      Economic
## 369   CollegeGrad     47        4years Republican    HealthCare
## 370    HighSchool     47       12years Republican      Economic
## 371   CollegeGrad     35  NoExperience   Democrat    HealthCare
## 372   SomeCollege     71       12years Republican      Economic
## 373   SomeCollege     59        4years Republican      Economic
## 374   SomeCollege     71        4years   Democrat    HealthCare
## 375   CollegeGrad     71        4years   Democrat Environmental
## 376   SomeCollege     71       12years Republican    HealthCare
## 377   SomeCollege     59        4years   Democrat Environmental
## 378   CollegeGrad     47  NoExperience   Democrat       Foreign
## 379    HighSchool     71        4years   Democrat     Education
## 380    GradDegree     47       12years   Democrat    HealthCare
## 381   SomeCollege     59       12years   Democrat      Economic
## 382    HighSchool     35  NoExperience Republican    HealthCare
## 383   CollegeGrad     47  NoExperience Republican     Education
## 384   SomeCollege     47        8years Republican    HealthCare
## 385   CollegeGrad     71  NoExperience Republican      Economic
## 386    GradDegree     71        8years Republican      Economic
## 387   CollegeGrad     59       12years   Democrat     Education
## 388   CollegeGrad     35        4years Republican       Foreign
## 389   SomeCollege     71        8years   Democrat       Foreign
## 390   CollegeGrad     59  NoExperience Republican     Education
## 391    HighSchool     71        4years   Democrat      Economic
## 392   SomeCollege     59        4years Republican       Foreign
## 393   CollegeGrad     35        4years Republican Environmental
## 394   SomeCollege     35       12years Republican Environmental
## 395    HighSchool     35        8years   Democrat      Economic
## 396   CollegeGrad     59  NoExperience Republican     Education
## 397   SomeCollege     47        4years   Democrat Environmental
## 398   CollegeGrad     47       12years Republican      Economic
## 399   SomeCollege     59       12years Republican    HealthCare
## 400   SomeCollege     71       12years Republican     Education
## 401   SomeCollege     71  NoExperience Republican     Education
## 402    GradDegree     47        8years Republican     Education
## 403   CollegeGrad     71  NoExperience   Democrat     Education
## 404   CollegeGrad     71        4years   Democrat Environmental
## 405   SomeCollege     59  NoExperience   Democrat    HealthCare
## 406    HighSchool     47  NoExperience   Democrat       Foreign
## 407    GradDegree     35        8years   Democrat     Education
## 408    HighSchool     35  NoExperience Republican      Economic
## 409   SomeCollege     35  NoExperience   Democrat      Economic
## 410    HighSchool     35        4years Republican     Education
## 411    HighSchool     47        4years   Democrat    HealthCare
## 412   CollegeGrad     59       12years   Democrat    HealthCare
## 413   SomeCollege     59  NoExperience   Democrat      Economic
## 414    HighSchool     35        8years Republican    HealthCare
## 415    GradDegree     71        4years Republican Environmental
## 416   SomeCollege     71        4years   Democrat     Education
## 417   CollegeGrad     35        4years Republican       Foreign
## 418    HighSchool     59       12years Republican     Education
## 419   SomeCollege     59  NoExperience Republican    HealthCare
## 420    GradDegree     35  NoExperience Republican    HealthCare
## 421    GradDegree     59        4years Republican Environmental
## 422    GradDegree     71  NoExperience Republican     Education
## 423   SomeCollege     47       12years Republican      Economic
## 424   CollegeGrad     35        8years Republican Environmental
## 425   SomeCollege     71        8years   Democrat      Economic
## 426    HighSchool     35       12years   Democrat Environmental
## 427   CollegeGrad     71  NoExperience Republican Environmental
## 428    GradDegree     47        8years   Democrat    HealthCare
## 429   CollegeGrad     35  NoExperience Republican      Economic
## 430   SomeCollege     47  NoExperience   Democrat      Economic
## 431   SomeCollege     59        4years   Democrat      Economic
## 432    GradDegree     59        8years Republican     Education
## 433    GradDegree     35        8years Republican     Education
## 434   CollegeGrad     47  NoExperience Republican     Education
## 435    HighSchool     47        8years Republican       Foreign
## 436    HighSchool     35       12years   Democrat    HealthCare
## 437   CollegeGrad     47        8years   Democrat      Economic
## 438    GradDegree     35        8years   Democrat    HealthCare
## 439   SomeCollege     35       12years Republican Environmental
## 440    GradDegree     71  NoExperience   Democrat     Education
## 441    HighSchool     71        8years   Democrat Environmental
## 442   SomeCollege     71  NoExperience   Democrat      Economic
## 443    HighSchool     47        8years   Democrat       Foreign
## 444    HighSchool     71        8years   Democrat Environmental
## 445   CollegeGrad     35  NoExperience   Democrat    HealthCare
## 446   CollegeGrad     71        4years Republican Environmental
## 447    HighSchool     35        4years   Democrat Environmental
## 448    GradDegree     47  NoExperience Republican    HealthCare
## 449    HighSchool     35       12years Republican    HealthCare
## 450   CollegeGrad     47        8years   Democrat     Education
## 451    HighSchool     59  NoExperience   Democrat    HealthCare
## 452   CollegeGrad     47        8years   Democrat     Education
## 453   SomeCollege     71  NoExperience Republican     Education
## 454    GradDegree     47        8years Republican     Education
## 455   CollegeGrad     71  NoExperience   Democrat     Education
## 456   CollegeGrad     71        4years   Democrat Environmental
## 457   SomeCollege     59  NoExperience   Democrat    HealthCare
## 458    HighSchool     47  NoExperience   Democrat       Foreign
## 459    GradDegree     35        8years   Democrat     Education
## 460    HighSchool     35  NoExperience Republican      Economic
## 461   SomeCollege     35  NoExperience   Democrat      Economic
## 462    HighSchool     35        4years Republican     Education
## 463    HighSchool     47        4years   Democrat    HealthCare
## 464   CollegeGrad     59       12years   Democrat    HealthCare
## 465   CollegeGrad     59        4years   Democrat       Foreign
## 466   CollegeGrad     35       12years   Democrat      Economic
## 467   CollegeGrad     47       12years   Democrat      Economic
## 468    GradDegree     59        8years   Democrat    HealthCare
## 469    HighSchool     35       12years Republican    HealthCare
## 470   CollegeGrad     47        8years   Democrat     Education
## 471    HighSchool     59  NoExperience   Democrat    HealthCare
## 472   CollegeGrad     47        8years   Democrat     Education
## 473   SomeCollege     71  NoExperience Republican     Education
## 474    GradDegree     47        8years Republican     Education
## 475   CollegeGrad     71  NoExperience   Democrat     Education
## 476   CollegeGrad     71        4years   Democrat Environmental
## 477   SomeCollege     59  NoExperience   Democrat    HealthCare
## 478    HighSchool     47  NoExperience   Democrat       Foreign
## 479    GradDegree     35        8years   Democrat     Education
## 480    HighSchool     35  NoExperience Republican      Economic
## 481    HighSchool     47       12years Republican      Economic
## 482    GradDegree     71        8years Republican    HealthCare
## 483   SomeCollege     59       12years Republican      Economic
## 484    GradDegree     47  NoExperience   Democrat      Economic
## 485    HighSchool     35        8years Republican     Education
## 486   SomeCollege     59       12years Republican     Education
## 487   SomeCollege     71        8years Republican     Education
## 488    HighSchool     71       12years Republican Environmental
## 489    GradDegree     47  NoExperience   Democrat      Economic
## 490   SomeCollege     71  NoExperience   Democrat Environmental
## 491    GradDegree     47       12years   Democrat Environmental
## 492    GradDegree     47       12years   Democrat       Foreign
## 493    HighSchool     71        8years Republican       Foreign
## 494   CollegeGrad     35        8years   Democrat      Economic
## 495    HighSchool     59        8years Republican     Education
## 496    HighSchool     59       12years   Democrat    HealthCare
## 497   CollegeGrad     35  NoExperience Republican       Foreign
## 498   CollegeGrad     35        8years   Democrat       Foreign
## 499    GradDegree     59        8years Republican    HealthCare
## 500   CollegeGrad     35  NoExperience Republican     Education
## 501   SomeCollege     71  NoExperience Republican       Foreign
## 502   CollegeGrad     35  NoExperience Republican    HealthCare
## 503    GradDegree     47        8years   Democrat      Economic
## 504   SomeCollege     47        4years Republican     Education
## 505   SomeCollege     59       12years   Democrat Environmental
## 506    GradDegree     71        4years Republican       Foreign
## 507   SomeCollege     71  NoExperience Republican    HealthCare
## 508   CollegeGrad     71       12years   Democrat    HealthCare
## 509   SomeCollege     71        8years   Democrat     Education
## 510   CollegeGrad     71        4years Republican Environmental
## 511   CollegeGrad     71  NoExperience   Democrat      Economic
## 512    GradDegree     59  NoExperience Republican    HealthCare
## 513   SomeCollege     35        4years Republican       Foreign
## 514    HighSchool     71  NoExperience Republican Environmental
## 515    HighSchool     71       12years Republican       Foreign
## 516   SomeCollege     47  NoExperience   Democrat      Economic
## 517    HighSchool     35        8years   Democrat     Education
## 518    GradDegree     35        4years   Democrat     Education
## 519   CollegeGrad     71       12years Republican    HealthCare
## 520    HighSchool     71        8years Republican    HealthCare
## 521   CollegeGrad     71        4years   Democrat       Foreign
## 522    HighSchool     47  NoExperience   Democrat      Economic
## 523   CollegeGrad     59        8years   Democrat    HealthCare
## 524   SomeCollege     71        4years   Democrat       Foreign
## 525   SomeCollege     35        8years   Democrat    HealthCare
## 526   CollegeGrad     59  NoExperience   Democrat Environmental
## 527    HighSchool     47        4years   Democrat      Economic
## 528    GradDegree     71        4years   Democrat    HealthCare
## 529    GradDegree     35        8years   Democrat    HealthCare
## 530    GradDegree     59  NoExperience   Democrat      Economic
## 531   SomeCollege     47        4years Republican     Education
## 532   SomeCollege     59        8years Republican      Economic
## 533    GradDegree     71        4years Republican Environmental
## 534   SomeCollege     35        4years Republican     Education
## 535   CollegeGrad     59       12years Republican      Economic
## 536   SomeCollege     59       12years   Democrat       Foreign
## 537    HighSchool     35        4years   Democrat Environmental
## 538   SomeCollege     71        8years   Democrat      Economic
## 539   SomeCollege     47  NoExperience Republican Environmental
## 540   SomeCollege     59  NoExperience   Democrat     Education
## 541   CollegeGrad     35        4years Republican Environmental
## 542   SomeCollege     59        8years   Democrat      Economic
## 543   CollegeGrad     59        4years   Democrat    HealthCare
## 544    GradDegree     47       12years   Democrat Environmental
## 545    HighSchool     59  NoExperience   Democrat    HealthCare
## 546   CollegeGrad     47        8years   Democrat     Education
## 547   SomeCollege     71  NoExperience Republican     Education
## 548    GradDegree     47        8years Republican     Education
## 549   CollegeGrad     71  NoExperience   Democrat     Education
## 550   CollegeGrad     71        4years   Democrat Environmental
## 551   SomeCollege     59  NoExperience   Democrat    HealthCare
## 552    HighSchool     47  NoExperience   Democrat       Foreign
## 553    GradDegree     35        8years   Democrat     Education
## 554    HighSchool     35  NoExperience Republican      Economic
## 555   SomeCollege     35  NoExperience   Democrat      Economic
## 556    HighSchool     35        4years Republican     Education
## 557    HighSchool     47        4years   Democrat    HealthCare
## 558   CollegeGrad     59       12years   Democrat    HealthCare
## 559   SomeCollege     59  NoExperience   Democrat      Economic
## 560    HighSchool     35        8years Republican    HealthCare
## 561    HighSchool     59       12years   Democrat    HealthCare
## 562    HighSchool     59       12years Republican     Education
## 563   SomeCollege     71        4years Republican       Foreign
## 564    HighSchool     47        8years Republican      Economic
## 565   CollegeGrad     59        4years   Democrat       Foreign
## 566   CollegeGrad     35       12years   Democrat      Economic
## 567   CollegeGrad     47       12years   Democrat      Economic
## 568    GradDegree     59        8years   Democrat    HealthCare
## 569    HighSchool     35       12years Republican    HealthCare
## 570   CollegeGrad     47        8years   Democrat     Education
## 571    HighSchool     59  NoExperience   Democrat    HealthCare
## 572   CollegeGrad     47        8years   Democrat     Education
## 573   SomeCollege     71  NoExperience Republican     Education
## 574    GradDegree     47        8years Republican     Education
## 575   CollegeGrad     71  NoExperience   Democrat     Education
## 576   CollegeGrad     71        4years   Democrat Environmental
## 577    GradDegree     47       12years   Democrat Environmental
## 578    HighSchool     59  NoExperience Republican      Economic
## 579   SomeCollege     47       12years Republican     Education
## 580   CollegeGrad     59  NoExperience   Democrat     Education
## 581    HighSchool     47  NoExperience Republican       Foreign
## 582    GradDegree     35       12years   Democrat    HealthCare
## 583   SomeCollege     35        4years Republican       Foreign
## 584    HighSchool     71  NoExperience Republican       Foreign
## 585    HighSchool     71       12years Republican       Foreign
## 586   SomeCollege     35       12years   Democrat      Economic
## 587    HighSchool     71        8years   Democrat Environmental
## 588   CollegeGrad     35  NoExperience Republican    HealthCare
## 589   SomeCollege     47        8years   Democrat    HealthCare
## 590    HighSchool     71        8years   Democrat    HealthCare
## 591    HighSchool     71  NoExperience Republican Environmental
## 592   CollegeGrad     47  NoExperience Republican Environmental
## 593    GradDegree     35        4years   Democrat      Economic
## 594    GradDegree     59       12years Republican      Economic
## 595    HighSchool     47  NoExperience Republican    HealthCare
## 596   SomeCollege     47        4years Republican       Foreign
## 597   CollegeGrad     59       12years Republican     Education
## 598    HighSchool     71       12years   Democrat       Foreign
## 599   CollegeGrad     35        4years   Democrat Environmental
## 600   SomeCollege     59       12years   Democrat    HealthCare
## 601    GradDegree     35        8years Republican      Economic
## 602    HighSchool     71       12years   Democrat     Education
## 603   CollegeGrad     59  NoExperience Republican       Foreign
## 604   SomeCollege     59  NoExperience Republican    HealthCare
## 605    HighSchool     47       12years   Democrat      Economic
## 606    GradDegree     71       12years   Democrat Environmental
## 607    HighSchool     59        4years Republican     Education
## 608   SomeCollege     47       12years   Democrat    HealthCare
## 609   CollegeGrad     59  NoExperience Republican Environmental
## 610   SomeCollege     59        4years   Democrat    HealthCare
## 611    GradDegree     71        8years   Democrat    HealthCare
## 612    GradDegree     35       12years   Democrat      Economic
## 613    HighSchool     35       12years Republican    HealthCare
## 614    HighSchool     35       12years   Democrat    HealthCare
## 615   SomeCollege     59  NoExperience Republican Environmental
## 616    HighSchool     71        8years   Democrat    HealthCare
## 617    HighSchool     35  NoExperience Republican      Economic
## 618   CollegeGrad     59        4years   Democrat     Education
## 619   SomeCollege     59  NoExperience   Democrat Environmental
## 620   CollegeGrad     59       12years Republican       Foreign
## 621    GradDegree     35        8years   Democrat      Economic
## 622   SomeCollege     35  NoExperience   Democrat Environmental
## 623    HighSchool     47       12years Republican      Economic
## 624    GradDegree     71        8years Republican    HealthCare
## 625   SomeCollege     47        4years Republican     Education
## 626   SomeCollege     59        4years Republican Environmental
## 627    GradDegree     59        4years   Democrat       Foreign
## 628   SomeCollege     47  NoExperience   Democrat       Foreign
## 629   CollegeGrad     35        8years   Democrat Environmental
## 630    HighSchool     59  NoExperience Republican      Economic
## 631   SomeCollege     47       12years Republican       Foreign
## 632    HighSchool     35       12years   Democrat       Foreign
## 633    HighSchool     47        4years Republican       Foreign
## 634    GradDegree     47       12years   Democrat       Foreign
## 635   CollegeGrad     35        4years Republican Environmental
## 636    HighSchool     47       12years Republican    HealthCare
## 637    HighSchool     35  NoExperience Republican       Foreign
## 638   SomeCollege     59       12years Republican Environmental
## 639    GradDegree     59        4years Republican       Foreign
## 640    HighSchool     35  NoExperience Republican    HealthCare
## 641    HighSchool     59        4years Republican    HealthCare
## 642   SomeCollege     59  NoExperience Republican     Education
## 643    HighSchool     47        8years   Democrat      Economic
## 644    HighSchool     35  NoExperience   Democrat Environmental
## 645   SomeCollege     71        4years Republican       Foreign
## 646   CollegeGrad     47        4years Republican    HealthCare
## 647   SomeCollege     71       12years   Democrat Environmental
## 648    GradDegree     35  NoExperience Republican Environmental
## 649   SomeCollege     71       12years Republican      Economic
## 650   SomeCollege     47        4years   Democrat    HealthCare
## 651    HighSchool     35        8years   Democrat Environmental
## 652   SomeCollege     71  NoExperience Republican      Economic
## 653    GradDegree     35        4years   Democrat    HealthCare
## 654    GradDegree     47  NoExperience Republican    HealthCare
## 655    HighSchool     47        4years Republican Environmental
## 656   CollegeGrad     47  NoExperience Republican       Foreign
## 657   SomeCollege     47        4years   Democrat       Foreign
## 658   CollegeGrad     59       12years   Democrat     Education
## 659   CollegeGrad     71        4years Republican       Foreign
## 660   SomeCollege     35  NoExperience   Democrat      Economic
## 661    GradDegree     35       12years Republican       Foreign
## 662    HighSchool     35       12years   Democrat     Education
## 663    GradDegree     47  NoExperience Republican    HealthCare
## 664    HighSchool     47        4years Republican      Economic
## 665   CollegeGrad     47        4years Republican    HealthCare
## 666    HighSchool     59       12years Republican     Education
## 667   SomeCollege     47        4years Republican    HealthCare
## 668   CollegeGrad     71       12years Republican      Economic
## 669    HighSchool     35       12years Republican    HealthCare
## 670   SomeCollege     71       12years   Democrat     Education
## 671   SomeCollege     47  NoExperience   Democrat       Foreign
## 672   CollegeGrad     35       12years   Democrat       Foreign
## 673   SomeCollege     71        8years   Democrat       Foreign
## 674   CollegeGrad     59  NoExperience Republican     Education
## 675    HighSchool     71        4years   Democrat      Economic
## 676   SomeCollege     59        4years Republican       Foreign
## 677   CollegeGrad     35        4years Republican Environmental
## 678   SomeCollege     35       12years Republican Environmental
## 679    HighSchool     35        8years   Democrat      Economic
## 680   CollegeGrad     59  NoExperience Republican     Education
## 681   SomeCollege     47        4years   Democrat Environmental
## 682   CollegeGrad     47       12years Republican      Economic
## 683   SomeCollege     59       12years Republican    HealthCare
## 684   SomeCollege     71       12years Republican     Education
## 685   CollegeGrad     47       12years Republican       Foreign
## 686    GradDegree     71  NoExperience Republican    HealthCare
## 687    GradDegree     35        8years Republican     Education
## 688    GradDegree     47  NoExperience Republican     Education
## 689   CollegeGrad     71        4years   Democrat     Education
## 690    GradDegree     71       12years   Democrat       Foreign
## 691   CollegeGrad     35  NoExperience Republican       Foreign
## 692   CollegeGrad     35        8years   Democrat       Foreign
## 693    GradDegree     59        8years Republican    HealthCare
## 694   CollegeGrad     35  NoExperience Republican     Education
## 695   SomeCollege     71  NoExperience Republican       Foreign
## 696   CollegeGrad     35  NoExperience Republican    HealthCare
## 697    GradDegree     47        8years   Democrat      Economic
## 698   SomeCollege     47        4years Republican     Education
## 699   SomeCollege     59       12years   Democrat Environmental
## 700    GradDegree     71        4years Republican       Foreign
## 701   SomeCollege     71  NoExperience Republican    HealthCare
## 702   CollegeGrad     71       12years   Democrat    HealthCare
## 703   SomeCollege     71        8years   Democrat     Education
## 704   CollegeGrad     71        4years Republican Environmental
## 705    HighSchool     47  NoExperience Republican    HealthCare
## 706   SomeCollege     59        4years   Democrat      Economic
## 707    HighSchool     59        4years   Democrat Environmental
## 708    GradDegree     47        8years Republican Environmental
## 709   CollegeGrad     47  NoExperience Republican       Foreign
## 710   SomeCollege     71        4years Republican      Economic
## 711   SomeCollege     35        4years   Democrat Environmental
## 712    GradDegree     47       12years Republican      Economic
## 713   CollegeGrad     35  NoExperience Republican    HealthCare
## 714   CollegeGrad     59        4years   Democrat Environmental
## 715   SomeCollege     59        4years Republican    HealthCare
## 716   SomeCollege     59        4years   Democrat    HealthCare
## 717    HighSchool     35  NoExperience Republican Environmental
## 718    GradDegree     35        4years   Democrat     Education
## 719   CollegeGrad     59        8years   Democrat      Economic
## 720    HighSchool     47        4years Republican      Economic
## 721    GradDegree     59        4years Republican    HealthCare
## 722    HighSchool     35       12years Republican       Foreign
## 723    GradDegree     47        4years Republican Environmental
## 724   SomeCollege     59        4years Republican       Foreign
## 725   CollegeGrad     35       12years   Democrat     Education
## 726    HighSchool     59        4years   Democrat Environmental
## 727   CollegeGrad     71        4years Republican Environmental
## 728   SomeCollege     59        4years   Democrat    HealthCare
## 729    GradDegree     35        4years Republican      Economic
## 730    HighSchool     71       12years Republican     Education
## 731   CollegeGrad     59        4years Republican       Foreign
## 732   SomeCollege     47  NoExperience Republican    HealthCare
## 733   CollegeGrad     47       12years   Democrat    HealthCare
## 734    HighSchool     71       12years   Democrat      Economic
## 735    HighSchool     59        4years   Democrat     Education
## 736   SomeCollege     71       12years   Democrat    HealthCare
## 737   CollegeGrad     59        8years   Democrat Environmental
## 738   CollegeGrad     35        8years   Democrat      Economic
## 739   SomeCollege     59       12years   Democrat    HealthCare
## 740    GradDegree     35  NoExperience Republican      Economic
## 741    HighSchool     59        8years   Democrat    HealthCare
## 742   SomeCollege     71  NoExperience Republican    HealthCare
## 743   SomeCollege     35        4years Republican     Education
## 744   CollegeGrad     35        8years   Democrat      Economic
## 745   CollegeGrad     59        4years   Democrat      Economic
## 746   CollegeGrad     59        8years   Democrat     Education
## 747   SomeCollege     71        4years   Democrat      Economic
## 748    GradDegree     47        8years   Democrat Environmental
## 749    GradDegree     71       12years Republican     Education
## 750    GradDegree     59  NoExperience   Democrat     Education
## 751    GradDegree     59       12years   Democrat      Economic
## 752   SomeCollege     59  NoExperience Republican       Foreign
## 753    HighSchool     47        4years   Democrat    HealthCare
## 754   CollegeGrad     59       12years   Democrat    HealthCare
## 755   SomeCollege     59  NoExperience   Democrat      Economic
## 756    HighSchool     35        8years Republican    HealthCare
## 757    GradDegree     71        4years Republican Environmental
## 758   SomeCollege     71        4years   Democrat     Education
## 759   CollegeGrad     71        8years   Democrat      Economic
## 760   CollegeGrad     35        4years   Democrat       Foreign
## 761   CollegeGrad     59        8years   Democrat     Education
## 762    HighSchool     35  NoExperience Republican Environmental
## 763   CollegeGrad     35        4years Republican    HealthCare
## 764   CollegeGrad     59       12years Republican       Foreign
## 765    HighSchool     47  NoExperience   Democrat    HealthCare
## 766   SomeCollege     59        8years   Democrat     Education
## 767   CollegeGrad     71        4years   Democrat Environmental
## 768   CollegeGrad     59  NoExperience Republican     Education
## 769    GradDegree     35        8years   Democrat     Education
## 770    HighSchool     35  NoExperience Republican      Economic
## 771   SomeCollege     35  NoExperience   Democrat      Economic
## 772    HighSchool     35        4years Republican     Education
## 773    HighSchool     47        4years   Democrat    HealthCare
## 774   CollegeGrad     59       12years   Democrat    HealthCare
## 775   SomeCollege     59  NoExperience   Democrat      Economic
## 776    HighSchool     35        8years Republican    HealthCare
## 777    GradDegree     71        4years Republican Environmental
## 778   SomeCollege     71        4years   Democrat     Education
## 779   CollegeGrad     71        8years   Democrat      Economic
## 780   CollegeGrad     35        4years   Democrat       Foreign
## 781   CollegeGrad     59        8years   Democrat     Education
## 782    HighSchool     35  NoExperience Republican Environmental
## 783   CollegeGrad     35        4years Republican    HealthCare
## 784   CollegeGrad     59       12years Republican       Foreign
## 785   CollegeGrad     71        4years Republican       Foreign
## 786    GradDegree     47        4years   Democrat      Economic
## 787   CollegeGrad     71        8years   Democrat       Foreign
## 788   CollegeGrad     71        4years   Democrat      Economic
## 789   SomeCollege     47        8years   Democrat       Foreign
## 790    GradDegree     47       12years Republican       Foreign
## 791   CollegeGrad     35  NoExperience Republican    HealthCare
## 792   SomeCollege     47        4years   Democrat    HealthCare
## 793    GradDegree     35        4years Republican    HealthCare
## 794   CollegeGrad     59        8years Republican    HealthCare
## 795   CollegeGrad     47        4years Republican Environmental
## 796   CollegeGrad     59        4years Republican    HealthCare
## 797   CollegeGrad     35        8years   Democrat    HealthCare
## 798    HighSchool     71       12years Republican Environmental
## 799    GradDegree     59        4years   Democrat    HealthCare
## 800   SomeCollege     35       12years   Democrat       Foreign
## 801    HighSchool     35        4years   Democrat      Economic
## 802    GradDegree     35       12years   Democrat Environmental
## 803   CollegeGrad     47  NoExperience Republican       Foreign
## 804    GradDegree     71       12years   Democrat    HealthCare
## 805    GradDegree     71  NoExperience Republican       Foreign
## 806    HighSchool     35        8years   Democrat      Economic
## 807   SomeCollege     59        8years Republican    HealthCare
## 808    GradDegree     71       12years   Democrat       Foreign
## 809    HighSchool     35        8years   Democrat     Education
## 810   CollegeGrad     35  NoExperience Republican      Economic
## 811    HighSchool     47        4years Republican    HealthCare
## 812    GradDegree     71       12years Republican     Education
## 813   CollegeGrad     35        8years Republican       Foreign
## 814   CollegeGrad     71  NoExperience   Democrat    HealthCare
## 815    GradDegree     35  NoExperience Republican       Foreign
## 816    GradDegree     47       12years Republican    HealthCare
## 817   SomeCollege     59  NoExperience Republican Environmental
## 818    HighSchool     71        8years   Democrat    HealthCare
## 819    HighSchool     35  NoExperience Republican      Economic
## 820   CollegeGrad     59        4years   Democrat     Education
## 821   SomeCollege     59  NoExperience   Democrat Environmental
## 822   CollegeGrad     59       12years Republican       Foreign
## 823    GradDegree     35        8years   Democrat      Economic
## 824   SomeCollege     35  NoExperience   Democrat Environmental
## 825    HighSchool     47       12years Republican      Economic
## 826    GradDegree     71        8years Republican    HealthCare
## 827   SomeCollege     59       12years Republican      Economic
## 828    GradDegree     47  NoExperience   Democrat      Economic
## 829    HighSchool     35        8years Republican     Education
## 830   SomeCollege     59       12years Republican     Education
## 831   SomeCollege     71        8years Republican     Education
## 832    HighSchool     71       12years Republican Environmental
## 833   CollegeGrad     71        8years   Democrat      Economic
## 834   CollegeGrad     35        4years   Democrat       Foreign
## 835   CollegeGrad     59        8years   Democrat     Education
## 836    HighSchool     35  NoExperience Republican Environmental
## 837   CollegeGrad     35        4years Republican    HealthCare
## 838   CollegeGrad     59       12years Republican       Foreign
## 839    HighSchool     47  NoExperience   Democrat    HealthCare
## 840   SomeCollege     59        8years   Democrat     Education
## 841   CollegeGrad     71        4years   Democrat Environmental
## 842   CollegeGrad     59  NoExperience Republican     Education
## 843    HighSchool     47  NoExperience Republican    HealthCare
## 844   SomeCollege     59        4years   Democrat      Economic
## 845    HighSchool     59        4years   Democrat Environmental
## 846    GradDegree     47        8years Republican Environmental
## 847   CollegeGrad     47  NoExperience Republican       Foreign
## 848   SomeCollege     71        4years Republican      Economic
## 849    GradDegree     47       12years   Democrat      Economic
## 850   CollegeGrad     35  NoExperience Republican      Economic
## 851   CollegeGrad     35        4years   Democrat     Education
## 852   CollegeGrad     59  NoExperience   Democrat    HealthCare
## 853    GradDegree     71  NoExperience   Democrat      Economic
## 854   SomeCollege     71  NoExperience   Democrat       Foreign
## 855   CollegeGrad     71        4years Republican Environmental
## 856    GradDegree     47        4years   Democrat     Education
## 857   CollegeGrad     71        8years   Democrat      Economic
## 858   CollegeGrad     35        4years   Democrat       Foreign
## 859   CollegeGrad     47        8years   Democrat    HealthCare
## 860    GradDegree     59  NoExperience   Democrat       Foreign
## 861   CollegeGrad     35  NoExperience Republican       Foreign
## 862   SomeCollege     71        4years   Democrat      Economic
## 863   SomeCollege     47        4years Republican      Economic
## 864   CollegeGrad     47        4years Republican     Education
## 865   CollegeGrad     35        4years Republican    HealthCare
## 866   CollegeGrad     59       12years Republican       Foreign
## 867    HighSchool     47  NoExperience   Democrat    HealthCare
## 868   SomeCollege     59        8years   Democrat     Education
## 869   CollegeGrad     71        4years   Democrat Environmental
## 870   CollegeGrad     59  NoExperience Republican     Education
## 871    HighSchool     47  NoExperience Republican    HealthCare
## 872   SomeCollege     59        4years   Democrat      Economic
## 873    HighSchool     59        4years   Democrat Environmental
## 874    GradDegree     47        8years Republican Environmental
## 875   CollegeGrad     47  NoExperience Republican       Foreign
## 876   SomeCollege     71        4years Republican      Economic
## 877   SomeCollege     35        4years   Democrat Environmental
## 878    GradDegree     47       12years Republican      Economic
## 879   CollegeGrad     35  NoExperience Republican    HealthCare
## 880   CollegeGrad     59        4years   Democrat Environmental
## 881    GradDegree     47       12years   Democrat Environmental
## 882    GradDegree     47       12years   Democrat       Foreign
## 883    HighSchool     71        8years Republican       Foreign
## 884   CollegeGrad     35        8years   Democrat      Economic
## 885    HighSchool     59        8years Republican     Education
## 886    HighSchool     59       12years   Democrat    HealthCare
## 887   CollegeGrad     35  NoExperience Republican Environmental
## 888   CollegeGrad     71       12years Republican    HealthCare
## 889   SomeCollege     59        4years   Democrat       Foreign
## 890   CollegeGrad     59        8years Republican     Education
## 891    HighSchool     47  NoExperience   Democrat    HealthCare
## 892   SomeCollege     71  NoExperience   Democrat Environmental
## 893    HighSchool     35        8years Republican     Education
## 894   SomeCollege     47        4years   Democrat Environmental
## 895   CollegeGrad     59  NoExperience   Democrat    HealthCare
## 896    HighSchool     35        8years   Democrat       Foreign
## 897   CollegeGrad     71        4years   Democrat       Foreign
## 898    HighSchool     47  NoExperience   Democrat      Economic
## 899   CollegeGrad     59        8years   Democrat    HealthCare
## 900   SomeCollege     71        4years   Democrat       Foreign
## 901   SomeCollege     35        8years   Democrat    HealthCare
## 902   CollegeGrad     59  NoExperience   Democrat Environmental
## 903    HighSchool     47        4years   Democrat      Economic
## 904    GradDegree     71        4years   Democrat    HealthCare
## 905   CollegeGrad     71        4years Republican Environmental
## 906   SomeCollege     71  NoExperience Republican       Foreign
## 907   CollegeGrad     59  NoExperience Republican Environmental
## 908   SomeCollege     59        4years   Democrat    HealthCare
## 909    GradDegree     71        8years   Democrat    HealthCare
## 910    GradDegree     35       12years   Democrat      Economic
## 911    HighSchool     35       12years Republican    HealthCare
## 912    HighSchool     35       12years   Democrat    HealthCare
## 913   CollegeGrad     71        4years Republican Environmental
## 914   SomeCollege     71  NoExperience Republican       Foreign
## 915   CollegeGrad     59  NoExperience Republican Environmental
## 916   SomeCollege     59        4years   Democrat    HealthCare
## 917    GradDegree     71        8years   Democrat    HealthCare
## 918    GradDegree     35       12years   Democrat      Economic
## 919    HighSchool     35       12years Republican    HealthCare
## 920    HighSchool     35       12years   Democrat    HealthCare
## 921   SomeCollege     59  NoExperience Republican Environmental
## 922    HighSchool     71        8years   Democrat    HealthCare
## 923    HighSchool     35  NoExperience Republican      Economic
## 924   CollegeGrad     59        4years   Democrat     Education
## 925   SomeCollege     59  NoExperience   Democrat Environmental
## 926   CollegeGrad     59       12years Republican       Foreign
## 927    GradDegree     35        8years   Democrat      Economic
## 928   SomeCollege     35  NoExperience   Democrat Environmental
## 929   CollegeGrad     59        8years   Democrat    HealthCare
## 930   SomeCollege     71        4years   Democrat       Foreign
## 931   SomeCollege     35        8years   Democrat    HealthCare
## 932   CollegeGrad     59  NoExperience   Democrat Environmental
## 933    HighSchool     47        4years   Democrat      Economic
## 934    GradDegree     71        4years   Democrat    HealthCare
## 935   CollegeGrad     71        4years Republican Environmental
## 936   SomeCollege     71  NoExperience Republican       Foreign
## 937   CollegeGrad     59  NoExperience Republican Environmental
## 938   SomeCollege     59        4years   Democrat    HealthCare
## 939    GradDegree     71        8years   Democrat    HealthCare
## 940    GradDegree     35       12years   Democrat      Economic
## 941    HighSchool     35       12years Republican    HealthCare
## 942    HighSchool     35       12years   Democrat    HealthCare
## 943   SomeCollege     59  NoExperience Republican Environmental
## 944    HighSchool     71        8years   Democrat    HealthCare
## 945    HighSchool     59        4years   Democrat Environmental
## 946    GradDegree     47        8years Republican Environmental
## 947   CollegeGrad     47  NoExperience Republican       Foreign
## 948   SomeCollege     71        4years Republican      Economic
## 949   SomeCollege     35        4years   Democrat Environmental
## 950    GradDegree     47       12years Republican      Economic
## 951   CollegeGrad     35  NoExperience Republican    HealthCare
## 952   CollegeGrad     59        4years   Democrat Environmental
## 953   SomeCollege     59        4years Republican    HealthCare
## 954   SomeCollege     59        4years   Democrat    HealthCare
## 955    HighSchool     35  NoExperience Republican Environmental
## 956    GradDegree     35        4years   Democrat     Education
## 957   CollegeGrad     59        8years   Democrat      Economic
## 958    HighSchool     47        4years Republican      Economic
## 959    GradDegree     35       12years   Democrat Environmental
## 960   SomeCollege     35        8years   Democrat    HealthCare
## 961    HighSchool     47       12years   Democrat      Economic
## 962    GradDegree     71       12years   Democrat Environmental
## 963    HighSchool     59        4years Republican     Education
## 964   SomeCollege     47       12years   Democrat    HealthCare
## 965   CollegeGrad     71       12years   Democrat    HealthCare
## 966    HighSchool     71        8years   Democrat Environmental
## 967   SomeCollege     47  NoExperience Republican Environmental
## 968   SomeCollege     35        4years Republican      Economic
## 969   SomeCollege     35        8years   Democrat Environmental
## 970   SomeCollege     47       12years   Democrat       Foreign
## 971    HighSchool     35        8years   Democrat      Economic
## 972   CollegeGrad     35        8years Republican      Economic
## 973    HighSchool     47  NoExperience Republican    HealthCare
## 974   SomeCollege     59        8years   Democrat    HealthCare
## 975   SomeCollege     47       12years   Democrat      Economic
## 976   CollegeGrad     71        4years   Democrat       Foreign
## 977   CollegeGrad     35        4years Republican Environmental
## 978   SomeCollege     35       12years Republican Environmental
## 979    HighSchool     35        8years   Democrat      Economic
## 980   CollegeGrad     59  NoExperience Republican     Education
## 981   SomeCollege     47        4years   Democrat Environmental
## 982   CollegeGrad     47       12years Republican      Economic
## 983   SomeCollege     59       12years Republican    HealthCare
## 984   SomeCollege     71       12years Republican     Education
## 985   CollegeGrad     47       12years Republican       Foreign
## 986    GradDegree     71  NoExperience Republican    HealthCare
## 987    GradDegree     35        8years Republican     Education
## 988    GradDegree     47  NoExperience Republican     Education
## 989    GradDegree     71       12years   Democrat Environmental
## 990   SomeCollege     59       12years Republican       Foreign
## 991    HighSchool     47        4years   Democrat Environmental
## 992   SomeCollege     47        8years   Democrat    HealthCare
## 993    GradDegree     47       12years   Democrat Environmental
## 994   SomeCollege     47  NoExperience   Democrat      Economic
## 995    GradDegree     35        4years Republican     Education
## 996    GradDegree     47       12years Republican      Economic
## 997    HighSchool     47       12years Republican    HealthCare
## 998   CollegeGrad     59        8years Republican    HealthCare
## 999   CollegeGrad     71       12years Republican      Economic
## 1000   GradDegree     47        8years   Democrat    HealthCare
## 1001  SomeCollege     47  NoExperience Republican       Foreign
## 1002   GradDegree     71        4years Republican       Foreign
## 1003   HighSchool     71        8years   Democrat     Education
## 1004  SomeCollege     71        8years   Democrat       Foreign
## 1005   GradDegree     47        4years   Democrat       Foreign
## 1006  SomeCollege     71       12years Republican      Economic
## 1007   GradDegree     35       12years Republican    HealthCare
## 1008   HighSchool     71  NoExperience   Democrat Environmental
## 1009  SomeCollege     59        4years Republican    HealthCare
## 1010  SomeCollege     59        4years   Democrat    HealthCare
## 1011   HighSchool     35  NoExperience Republican Environmental
## 1012   GradDegree     35        4years   Democrat     Education
## 1013  CollegeGrad     59        8years   Democrat      Economic
## 1014   HighSchool     47        4years Republican      Economic
## 1015   GradDegree     35       12years   Democrat Environmental
## 1016  SomeCollege     35        8years   Democrat    HealthCare
## 1017  CollegeGrad     59        8years Republican     Education
## 1018   HighSchool     59        8years Republican      Economic
## 1019  SomeCollege     35        4years Republican     Education
## 1020   GradDegree     71  NoExperience   Democrat       Foreign
## 1021   HighSchool     35        8years   Democrat       Foreign
## 1022  CollegeGrad     59  NoExperience Republican       Foreign
## 1023   GradDegree     35        8years   Democrat      Economic
## 1024   GradDegree     71        8years Republican Environmental
## 1025   HighSchool     59        4years Republican      Economic
## 1026   HighSchool     71        8years   Democrat Environmental
## 1027   GradDegree     35        4years Republican       Foreign
## 1028  SomeCollege     47        8years   Democrat    HealthCare
## 1029   HighSchool     47       12years   Democrat      Economic
## 1030   HighSchool     71  NoExperience Republican Environmental
## 1031   GradDegree     35        8years   Democrat      Economic
## 1032  CollegeGrad     59        8years   Democrat    HealthCare
## 1033   HighSchool     59  NoExperience   Democrat     Education
## 1034  SomeCollege     35        8years   Democrat Environmental
## 1035  CollegeGrad     71        4years   Democrat       Foreign
## 1036  SomeCollege     47  NoExperience   Democrat    HealthCare
## 1037  CollegeGrad     47        4years   Democrat      Economic
## 1038  CollegeGrad     59        4years Republican       Foreign
## 1039  SomeCollege     35       12years   Democrat       Foreign
## 1040  CollegeGrad     59        8years Republican      Economic
## 1041   HighSchool     59        8years   Democrat    HealthCare
## 1042  SomeCollege     71  NoExperience Republican    HealthCare
## 1043  SomeCollege     35        4years Republican     Education
## 1044  CollegeGrad     35        8years   Democrat      Economic
## 1045  CollegeGrad     59        4years   Democrat      Economic
## 1046  CollegeGrad     59        8years   Democrat     Education
## 1047  SomeCollege     71        4years   Democrat      Economic
## 1048   GradDegree     47        8years   Democrat Environmental
## 1049   GradDegree     71       12years Republican     Education
## 1050   GradDegree     59  NoExperience   Democrat     Education
## 1051   GradDegree     59       12years   Democrat      Economic
## 1052  SomeCollege     59  NoExperience Republican       Foreign
## 1053   HighSchool     47       12years   Democrat      Economic
## 1054   HighSchool     59  NoExperience   Democrat       Foreign
## 1055  SomeCollege     59        4years   Democrat       Foreign
## 1056   GradDegree     59        8years Republican     Education
## 1057   HighSchool     47       12years   Democrat Environmental
## 1058  CollegeGrad     59        4years   Democrat    HealthCare
## 1059   HighSchool     47       12years   Democrat     Education
## 1060   HighSchool     71        4years Republican       Foreign
## 1061   HighSchool     59       12years Republican     Education
## 1062   HighSchool     71        4years Republican Environmental
## 1063   GradDegree     71  NoExperience   Democrat    HealthCare
## 1064   GradDegree     59  NoExperience Republican       Foreign
## 1065  CollegeGrad     71  NoExperience Republican     Education
## 1066  CollegeGrad     59       12years Republican    HealthCare
## 1067  SomeCollege     35        4years   Democrat Environmental
## 1068   GradDegree     59        8years   Democrat Environmental
## 1069  CollegeGrad     59        4years   Democrat      Economic
## 1070  SomeCollege     47        4years Republican    HealthCare
## 1071  CollegeGrad     59        8years   Democrat Environmental
## 1072  CollegeGrad     35        8years   Democrat      Economic
## 1073  CollegeGrad     71       12years Republican    HealthCare
## 1074   HighSchool     71        8years Republican    HealthCare
## 1075  CollegeGrad     71        4years   Democrat       Foreign
## 1076   HighSchool     47  NoExperience   Democrat      Economic
## 1077  CollegeGrad     59        8years   Democrat    HealthCare
## 1078  SomeCollege     71        4years   Democrat       Foreign
## 1079  SomeCollege     35        8years   Democrat    HealthCare
## 1080  CollegeGrad     59  NoExperience   Democrat Environmental
## 1081   HighSchool     47        4years   Democrat      Economic
## 1082   GradDegree     71        4years   Democrat    HealthCare
## 1083  CollegeGrad     71        4years Republican Environmental
## 1084  SomeCollege     71  NoExperience Republican       Foreign
## 1085  CollegeGrad     59  NoExperience Republican Environmental
## 1086  SomeCollege     59        4years   Democrat    HealthCare
## 1087   GradDegree     71        8years   Democrat    HealthCare
## 1088   GradDegree     35       12years   Democrat      Economic
## 1089   HighSchool     35  NoExperience   Democrat       Foreign
## 1090   GradDegree     47        4years Republican Environmental
## 1091   HighSchool     59        8years   Democrat      Economic
## 1092  SomeCollege     47        8years Republican    HealthCare
## 1093   HighSchool     59        8years   Democrat     Education
## 1094   HighSchool     35        8years   Democrat     Education
## 1095   GradDegree     35  NoExperience Republican     Education
## 1096   GradDegree     71        4years Republican    HealthCare
## 1097  CollegeGrad     35        8years   Democrat     Education
## 1098  CollegeGrad     71       12years Republican Environmental
## 1099  CollegeGrad     59  NoExperience Republican     Education
## 1100   GradDegree     59        4years   Democrat       Foreign
## 1101   GradDegree     59        8years   Democrat      Economic
## 1102  CollegeGrad     35       12years   Democrat     Education
## 1103   GradDegree     35        4years   Democrat      Economic
## 1104   GradDegree     59       12years Republican      Economic
## 1105   HighSchool     35       12years Republican    HealthCare
## 1106   HighSchool     35       12years   Democrat    HealthCare
## 1107  SomeCollege     59  NoExperience Republican Environmental
## 1108   HighSchool     71        8years   Democrat    HealthCare
## 1109   HighSchool     35  NoExperience Republican      Economic
## 1110  CollegeGrad     59        4years   Democrat     Education
## 1111  SomeCollege     59  NoExperience   Democrat Environmental
## 1112  CollegeGrad     59       12years Republican       Foreign
## 1113   GradDegree     35        8years   Democrat      Economic
## 1114  SomeCollege     35  NoExperience   Democrat Environmental
## 1115   HighSchool     47       12years Republican      Economic
## 1116   GradDegree     71        8years Republican    HealthCare
## 1117  SomeCollege     59       12years Republican      Economic
## 1118   GradDegree     47  NoExperience   Democrat      Economic
## 1119   HighSchool     35        8years Republican     Education
## 1120  SomeCollege     59       12years Republican     Education
## 1121  CollegeGrad     59  NoExperience Republican     Education
## 1122   GradDegree     59        4years   Democrat       Foreign
## 1123   GradDegree     59        8years   Democrat      Economic
## 1124  CollegeGrad     35       12years   Democrat     Education
## 1125   GradDegree     35        4years   Democrat      Economic
## 1126   GradDegree     59       12years Republican      Economic
## 1127   HighSchool     47  NoExperience Republican    HealthCare
## 1128  SomeCollege     47        4years Republican       Foreign
## 1129  CollegeGrad     59       12years Republican     Education
## 1130   HighSchool     71       12years   Democrat       Foreign
## 1131  CollegeGrad     35        4years   Democrat Environmental
## 1132  SomeCollege     59       12years   Democrat    HealthCare
## 1133   GradDegree     35        8years Republican      Economic
## 1134   HighSchool     71       12years   Democrat     Education
## 1135  CollegeGrad     59  NoExperience Republican       Foreign
## 1136  SomeCollege     59  NoExperience Republican    HealthCare
## 1137   HighSchool     35  NoExperience Republican Environmental
## 1138   GradDegree     35        4years   Democrat     Education
## 1139  CollegeGrad     59        8years   Democrat      Economic
## 1140   HighSchool     47        4years Republican      Economic
## 1141   GradDegree     35       12years   Democrat Environmental
## 1142  SomeCollege     35        8years   Democrat    HealthCare
## 1143  CollegeGrad     59        8years Republican     Education
## 1144   HighSchool     59        8years Republican      Economic
## 1145  SomeCollege     35        4years Republican     Education
## 1146   GradDegree     71  NoExperience   Democrat       Foreign
## 1147   HighSchool     35        8years   Democrat       Foreign
## 1148  CollegeGrad     59  NoExperience Republican       Foreign
## 1149   GradDegree     35        8years   Democrat      Economic
## 1150   GradDegree     71        8years Republican Environmental
## 1151   HighSchool     59  NoExperience   Democrat       Foreign
## 1152   HighSchool     71        4years   Democrat    HealthCare
## 1153   GradDegree     47        8years   Democrat     Education
## 1154   GradDegree     59       12years   Democrat Environmental
## 1155   GradDegree     47        8years   Democrat      Economic
## 1156   GradDegree     35       12years   Democrat    HealthCare
## 1157  SomeCollege     35        4years Republican       Foreign
## 1158   HighSchool     71  NoExperience Republican Environmental
## 1159   HighSchool     71       12years Republican       Foreign
## 1160  SomeCollege     47  NoExperience   Democrat      Economic
## 1161   HighSchool     35        8years   Democrat     Education
## 1162   GradDegree     35        4years   Democrat     Education
## 1163  CollegeGrad     71       12years Republican    HealthCare
## 1164   HighSchool     71        8years Republican    HealthCare
## 1165  CollegeGrad     71        4years   Democrat       Foreign
## 1166   HighSchool     47  NoExperience   Democrat      Economic
## 1167  CollegeGrad     59        8years   Democrat    HealthCare
## 1168  SomeCollege     71        4years   Democrat       Foreign
## 1169   HighSchool     59  NoExperience   Democrat       Foreign
## 1170   HighSchool     71        4years   Democrat    HealthCare
## 1171  SomeCollege     59  NoExperience Republican       Foreign
## 1172   GradDegree     71        8years Republican Environmental
## 1173   GradDegree     35        8years   Democrat     Education
## 1174   HighSchool     71  NoExperience Republican      Economic
## 1175   GradDegree     47        8years   Democrat     Education
## 1176   GradDegree     59       12years   Democrat Environmental
## 1177   GradDegree     47        8years   Democrat      Economic
## 1178   GradDegree     35       12years   Democrat    HealthCare
## 1179  SomeCollege     35        4years Republican       Foreign
## 1180   HighSchool     71  NoExperience Republican Environmental
## 1181   HighSchool     71       12years Republican       Foreign
## 1182  SomeCollege     47  NoExperience   Democrat      Economic
## 1183   HighSchool     35        8years   Democrat     Education
## 1184   GradDegree     35        4years   Democrat     Education
## 1185   GradDegree     35       12years   Democrat Environmental
## 1186  SomeCollege     35        8years   Democrat    HealthCare
## 1187  CollegeGrad     59        8years Republican     Education
## 1188   HighSchool     59        8years Republican      Economic
## 1189  SomeCollege     35        4years Republican     Education
## 1190   GradDegree     71  NoExperience   Democrat       Foreign
## 1191   HighSchool     35        8years   Democrat       Foreign
## 1192  CollegeGrad     59  NoExperience Republican       Foreign
## 1193   GradDegree     35        8years   Democrat      Economic
## 1194   GradDegree     71        8years Republican Environmental
## 1195   HighSchool     59  NoExperience   Democrat       Foreign
## 1196   HighSchool     71        4years   Democrat    HealthCare
## 1197  SomeCollege     59  NoExperience Republican       Foreign
## 1198   GradDegree     71        8years Republican Environmental
## 1199   GradDegree     35        8years   Democrat     Education
## 1200   HighSchool     71  NoExperience Republican      Economic
## 1201   GradDegree     71        4years Republican Environmental
## 1202  SomeCollege     71        4years   Democrat     Education
## 1203  CollegeGrad     71        8years   Democrat      Economic
## 1204  CollegeGrad     35        4years   Democrat       Foreign
## 1205  CollegeGrad     59        8years   Democrat     Education
## 1206   HighSchool     35  NoExperience Republican Environmental
## 1207  CollegeGrad     35        4years Republican    HealthCare
## 1208  CollegeGrad     59       12years Republican       Foreign
## 1209   HighSchool     47  NoExperience   Democrat    HealthCare
## 1210  SomeCollege     59        8years   Democrat     Education
## 1211  CollegeGrad     71        4years   Democrat Environmental
## 1212  CollegeGrad     59  NoExperience Republican     Education
## 1213   HighSchool     47  NoExperience Republican    HealthCare
## 1214  SomeCollege     59        4years   Democrat      Economic
## 1215   HighSchool     59        4years   Democrat Environmental
## 1216   GradDegree     47        8years Republican Environmental
## 1217   GradDegree     35        8years   Democrat      Economic
## 1218  SomeCollege     35  NoExperience   Democrat Environmental
## 1219   HighSchool     47       12years Republican      Economic
## 1220   GradDegree     71        8years Republican    HealthCare
## 1221  SomeCollege     59       12years Republican      Economic
## 1222   GradDegree     47  NoExperience   Democrat      Economic
## 1223   HighSchool     35        8years Republican     Education
## 1224  SomeCollege     59       12years Republican     Education
## 1225  SomeCollege     71        8years Republican     Education
## 1226   HighSchool     71       12years Republican Environmental
## 1227   GradDegree     47  NoExperience   Democrat      Economic
## 1228  SomeCollege     71  NoExperience   Democrat Environmental
## 1229   GradDegree     47       12years   Democrat Environmental
## 1230   GradDegree     47       12years   Democrat       Foreign
## 1231   HighSchool     71        8years Republican       Foreign
## 1232  CollegeGrad     35        8years   Democrat      Economic
## 1233   GradDegree     35        4years   Democrat    HealthCare
## 1234   GradDegree     47  NoExperience Republican    HealthCare
## 1235   HighSchool     47        4years Republican Environmental
## 1236  CollegeGrad     47  NoExperience Republican       Foreign
## 1237   HighSchool     59        4years Republican       Foreign
## 1238  SomeCollege     35        8years   Democrat     Education
## 1239   HighSchool     59       12years   Democrat    HealthCare
## 1240   HighSchool     59       12years Republican     Education
## 1241  SomeCollege     71        4years Republican       Foreign
## 1242   HighSchool     47        8years Republican      Economic
## 1243  CollegeGrad     59        4years   Democrat       Foreign
## 1244  CollegeGrad     35       12years   Democrat      Economic
## 1245  CollegeGrad     47       12years   Democrat      Economic
## 1246   GradDegree     59        8years   Democrat    HealthCare
## 1247   HighSchool     35       12years Republican    HealthCare
## 1248  CollegeGrad     47        8years   Democrat     Education
## 1249  CollegeGrad     35  NoExperience Republican    HealthCare
## 1250  CollegeGrad     59        4years   Democrat Environmental
## 1251  SomeCollege     59        4years Republican    HealthCare
## 1252  SomeCollege     59        4years   Democrat    HealthCare
## 1253   HighSchool     35  NoExperience Republican Environmental
## 1254   GradDegree     35        4years   Democrat     Education
## 1255  CollegeGrad     59        8years   Democrat      Economic
## 1256   HighSchool     47        4years Republican      Economic
## 1257   GradDegree     35       12years   Democrat Environmental
## 1258  SomeCollege     35        8years   Democrat    HealthCare
## 1259  CollegeGrad     59        8years Republican     Education
## 1260   HighSchool     59        8years Republican      Economic
## 1261  SomeCollege     35        4years Republican     Education
## 1262   GradDegree     71  NoExperience   Democrat       Foreign
## 1263   HighSchool     35        8years   Democrat       Foreign
## 1264  CollegeGrad     59  NoExperience Republican       Foreign
## 1265  CollegeGrad     59  NoExperience   Democrat    HealthCare
## 1266   HighSchool     35        8years   Democrat       Foreign
## 1267  CollegeGrad     71  NoExperience Republican      Economic
## 1268   GradDegree     71        8years Republican      Economic
## 1269  CollegeGrad     59       12years   Democrat     Education
## 1270  CollegeGrad     35        4years Republican       Foreign
## 1271  SomeCollege     71        8years   Democrat       Foreign
## 1272  CollegeGrad     59  NoExperience Republican     Education
## 1273   HighSchool     71        4years   Democrat      Economic
## 1274  SomeCollege     59        4years Republican       Foreign
## 1275  CollegeGrad     35        4years Republican Environmental
## 1276  SomeCollege     35       12years Republican Environmental
## 1277   HighSchool     35        8years   Democrat      Economic
## 1278  CollegeGrad     59  NoExperience Republican     Education
## 1279  SomeCollege     47        4years   Democrat Environmental
## 1280  CollegeGrad     47       12years Republican      Economic
## 1281   GradDegree     71        8years   Democrat    HealthCare
## 1282   HighSchool     35        4years Republican Environmental
## 1283  CollegeGrad     35        8years Republican    HealthCare
## 1284  CollegeGrad     47       12years   Democrat       Foreign
## 1285   HighSchool     71        8years   Democrat Environmental
## 1286  SomeCollege     47        4years   Democrat Environmental
## 1287   HighSchool     71       12years   Democrat    HealthCare
## 1288  CollegeGrad     35  NoExperience Republican     Education
## 1289   HighSchool     59  NoExperience Republican       Foreign
## 1290  SomeCollege     71        4years Republican      Economic
## 1291  CollegeGrad     35        8years   Democrat       Foreign
## 1292   GradDegree     59        8years   Democrat Environmental
## 1293  SomeCollege     59        4years   Democrat Environmental
## 1294   GradDegree     59        4years Republican Environmental
## 1295   HighSchool     35        8years Republican      Economic
## 1296  CollegeGrad     59  NoExperience   Democrat      Economic
## 1297   GradDegree     47        4years Republican     Education
## 1298   GradDegree     59        4years   Democrat      Economic
## 1299  CollegeGrad     35        4years   Democrat       Foreign
## 1300   HighSchool     59       12years   Democrat    HealthCare
## 1301   GradDegree     35        8years   Democrat      Economic
## 1302  SomeCollege     71        4years   Democrat Environmental
## 1303  CollegeGrad     71        4years Republican       Foreign
## 1304   GradDegree     47        4years   Democrat      Economic
## 1305  CollegeGrad     71        8years   Democrat       Foreign
## 1306  CollegeGrad     71        4years   Democrat      Economic
## 1307  SomeCollege     47        8years   Democrat       Foreign
## 1308   GradDegree     47       12years Republican       Foreign
## 1309  CollegeGrad     35  NoExperience Republican    HealthCare
## 1310  SomeCollege     47        4years   Democrat    HealthCare
## 1311   GradDegree     35        4years Republican    HealthCare
## 1312  CollegeGrad     59        8years Republican    HealthCare
## 1313  SomeCollege     35        4years Republican     Education
## 1314   GradDegree     71  NoExperience   Democrat       Foreign
## 1315   HighSchool     35        8years   Democrat       Foreign
##           PartisanComp    Office
## 1    DemocraticPrimary     Mayor
## 2    DemocraticPrimary     Mayor
## 3    RepublicanPrimary     Mayor
## 4    RepublicanPrimary     Mayor
## 5      GeneralElection     Mayor
## 6      GeneralElection     Mayor
## 7      GeneralElection     Mayor
## 8      GeneralElection     Mayor
## 9      GeneralElection President
## 10     GeneralElection President
## 11     GeneralElection President
## 12     GeneralElection President
## 13   RepublicanPrimary President
## 14   RepublicanPrimary President
## 15     GeneralElection President
## 16     GeneralElection President
## 17     GeneralElection     Mayor
## 18     GeneralElection     Mayor
## 19     GeneralElection     Mayor
## 20     GeneralElection     Mayor
## 21   DemocraticPrimary     Mayor
## 22   DemocraticPrimary     Mayor
## 23     GeneralElection     Mayor
## 24     GeneralElection     Mayor
## 25     GeneralElection President
## 26     GeneralElection President
## 27   RepublicanPrimary President
## 28   RepublicanPrimary President
## 29     GeneralElection President
## 30     GeneralElection President
## 31   DemocraticPrimary President
## 32   DemocraticPrimary President
## 33     GeneralElection     Mayor
## 34     GeneralElection     Mayor
## 35   DemocraticPrimary     Mayor
## 36   DemocraticPrimary     Mayor
## 37     GeneralElection     Mayor
## 38     GeneralElection     Mayor
## 39   DemocraticPrimary     Mayor
## 40   DemocraticPrimary     Mayor
## 41     GeneralElection President
## 42     GeneralElection President
## 43   DemocraticPrimary President
## 44   DemocraticPrimary President
## 45     GeneralElection President
## 46     GeneralElection President
## 47     GeneralElection President
## 48     GeneralElection President
## 49     GeneralElection     Mayor
## 50     GeneralElection     Mayor
## 51     GeneralElection     Mayor
## 52     GeneralElection     Mayor
## 53   RepublicanPrimary     Mayor
## 54   RepublicanPrimary     Mayor
## 55   RepublicanPrimary     Mayor
## 56   RepublicanPrimary     Mayor
## 57   RepublicanPrimary President
## 58   RepublicanPrimary President
## 59     GeneralElection President
## 60     GeneralElection President
## 61   DemocraticPrimary President
## 62   DemocraticPrimary President
## 63     GeneralElection President
## 64     GeneralElection President
## 65     GeneralElection     Mayor
## 66     GeneralElection     Mayor
## 67     GeneralElection     Mayor
## 68     GeneralElection     Mayor
## 69   RepublicanPrimary     Mayor
## 70   RepublicanPrimary     Mayor
## 71   DemocraticPrimary     Mayor
## 72   DemocraticPrimary     Mayor
## 73   RepublicanPrimary President
## 74   RepublicanPrimary President
## 75     GeneralElection President
## 76     GeneralElection President
## 77     GeneralElection President
## 78     GeneralElection President
## 79     GeneralElection President
## 80     GeneralElection President
## 81   DemocraticPrimary     Mayor
## 82   DemocraticPrimary     Mayor
## 83   RepublicanPrimary     Mayor
## 84   RepublicanPrimary     Mayor
## 85     GeneralElection     Mayor
## 86     GeneralElection     Mayor
## 87     GeneralElection     Mayor
## 88     GeneralElection     Mayor
## 89   DemocraticPrimary President
## 90   DemocraticPrimary President
## 91     GeneralElection President
## 92     GeneralElection President
## 93   RepublicanPrimary President
## 94   RepublicanPrimary President
## 95     GeneralElection President
## 96     GeneralElection President
## 97     GeneralElection     Mayor
## 98     GeneralElection     Mayor
## 99   DemocraticPrimary     Mayor
## 100  DemocraticPrimary     Mayor
## 101    GeneralElection     Mayor
## 102    GeneralElection     Mayor
## 103  DemocraticPrimary     Mayor
## 104  DemocraticPrimary     Mayor
## 105    GeneralElection President
## 106    GeneralElection President
## 107    GeneralElection President
## 108    GeneralElection President
## 109  DemocraticPrimary President
## 110  DemocraticPrimary President
## 111  RepublicanPrimary President
## 112  RepublicanPrimary President
## 113    GeneralElection     Mayor
## 114    GeneralElection     Mayor
## 115  RepublicanPrimary     Mayor
## 116  RepublicanPrimary     Mayor
## 117  DemocraticPrimary     Mayor
## 118  DemocraticPrimary     Mayor
## 119  RepublicanPrimary     Mayor
## 120  RepublicanPrimary     Mayor
## 121    GeneralElection President
## 122    GeneralElection President
## 123    GeneralElection President
## 124    GeneralElection President
## 125    GeneralElection President
## 126    GeneralElection President
## 127    GeneralElection President
## 128    GeneralElection President
## 129  RepublicanPrimary     Mayor
## 130  RepublicanPrimary     Mayor
## 131    GeneralElection     Mayor
## 132    GeneralElection     Mayor
## 133    GeneralElection     Mayor
## 134    GeneralElection     Mayor
## 135    GeneralElection     Mayor
## 136    GeneralElection     Mayor
## 137  DemocraticPrimary President
## 138  DemocraticPrimary President
## 139  RepublicanPrimary President
## 140  RepublicanPrimary President
## 141    GeneralElection President
## 142    GeneralElection President
## 143  DemocraticPrimary President
## 144  DemocraticPrimary President
## 145  DemocraticPrimary     Mayor
## 146  DemocraticPrimary     Mayor
## 147    GeneralElection     Mayor
## 148    GeneralElection     Mayor
## 149  DemocraticPrimary     Mayor
## 150  DemocraticPrimary     Mayor
## 151    GeneralElection     Mayor
## 152    GeneralElection     Mayor
## 153  RepublicanPrimary President
## 154  RepublicanPrimary President
## 155  DemocraticPrimary President
## 156  DemocraticPrimary President
## 157    GeneralElection President
## 158    GeneralElection President
## 159    GeneralElection President
## 160    GeneralElection President
## 161  DemocraticPrimary     Mayor
## 162  DemocraticPrimary     Mayor
## 163  DemocraticPrimary     Mayor
## 164  DemocraticPrimary     Mayor
## 165  RepublicanPrimary     Mayor
## 166  RepublicanPrimary     Mayor
## 167  RepublicanPrimary     Mayor
## 168  RepublicanPrimary     Mayor
## 169    GeneralElection President
## 170    GeneralElection President
## 171    GeneralElection President
## 172    GeneralElection President
## 173    GeneralElection President
## 174    GeneralElection President
## 175    GeneralElection President
## 176    GeneralElection President
## 177  DemocraticPrimary     Mayor
## 178  DemocraticPrimary     Mayor
## 179    GeneralElection     Mayor
## 180    GeneralElection     Mayor
## 181  DemocraticPrimary     Mayor
## 182  DemocraticPrimary     Mayor
## 183    GeneralElection     Mayor
## 184    GeneralElection     Mayor
## 185  DemocraticPrimary President
## 186  DemocraticPrimary President
## 187    GeneralElection President
## 188    GeneralElection President
## 189    GeneralElection President
## 190    GeneralElection President
## 191  DemocraticPrimary President
## 192  DemocraticPrimary President
## 193  DemocraticPrimary     Mayor
## 194  DemocraticPrimary     Mayor
## 195  RepublicanPrimary     Mayor
## 196  RepublicanPrimary     Mayor
## 197    GeneralElection     Mayor
## 198    GeneralElection     Mayor
## 199  RepublicanPrimary     Mayor
## 200  RepublicanPrimary     Mayor
## 201  DemocraticPrimary President
## 202  DemocraticPrimary President
## 203  DemocraticPrimary President
## 204  DemocraticPrimary President
## 205    GeneralElection President
## 206    GeneralElection President
## 207    GeneralElection President
## 208    GeneralElection President
## 209    GeneralElection     Mayor
## 210    GeneralElection     Mayor
## 211    GeneralElection     Mayor
## 212    GeneralElection     Mayor
## 213    GeneralElection     Mayor
## 214    GeneralElection     Mayor
## 215  RepublicanPrimary     Mayor
## 216  RepublicanPrimary     Mayor
## 217    GeneralElection President
## 218    GeneralElection President
## 219    GeneralElection President
## 220    GeneralElection President
## 221  RepublicanPrimary President
## 222  RepublicanPrimary President
## 223  DemocraticPrimary President
## 224  DemocraticPrimary President
## 225    GeneralElection     Mayor
## 226    GeneralElection     Mayor
## 227    GeneralElection     Mayor
## 228    GeneralElection     Mayor
## 229  DemocraticPrimary     Mayor
## 230  DemocraticPrimary     Mayor
## 231    GeneralElection     Mayor
## 232    GeneralElection     Mayor
## 233  RepublicanPrimary President
## 234  RepublicanPrimary President
## 235    GeneralElection President
## 236    GeneralElection President
## 237  DemocraticPrimary President
## 238  DemocraticPrimary President
## 239    GeneralElection President
## 240    GeneralElection President
## 241  DemocraticPrimary     Mayor
## 242  DemocraticPrimary     Mayor
## 243    GeneralElection     Mayor
## 244    GeneralElection     Mayor
## 245    GeneralElection     Mayor
## 246    GeneralElection     Mayor
## 247  DemocraticPrimary     Mayor
## 248  DemocraticPrimary     Mayor
## 249    GeneralElection President
## 250    GeneralElection President
## 251    GeneralElection President
## 252    GeneralElection President
## 253  DemocraticPrimary President
## 254  DemocraticPrimary President
## 255    GeneralElection President
## 256    GeneralElection President
## 257  RepublicanPrimary     Mayor
## 258  RepublicanPrimary     Mayor
## 259    GeneralElection     Mayor
## 260    GeneralElection     Mayor
## 261  DemocraticPrimary     Mayor
## 262  DemocraticPrimary     Mayor
## 263    GeneralElection     Mayor
## 264    GeneralElection     Mayor
## 265  DemocraticPrimary President
## 266  DemocraticPrimary President
## 267  DemocraticPrimary President
## 268  DemocraticPrimary President
## 269  DemocraticPrimary President
## 270  DemocraticPrimary President
## 271    GeneralElection President
## 272    GeneralElection President
## 273    GeneralElection     Mayor
## 274    GeneralElection     Mayor
## 275    GeneralElection     Mayor
## 276    GeneralElection     Mayor
## 277  RepublicanPrimary     Mayor
## 278  RepublicanPrimary     Mayor
## 279    GeneralElection     Mayor
## 280    GeneralElection     Mayor
## 281    GeneralElection President
## 282    GeneralElection President
## 283  RepublicanPrimary President
## 284  RepublicanPrimary President
## 285  DemocraticPrimary President
## 286  DemocraticPrimary President
## 287  DemocraticPrimary President
## 288  DemocraticPrimary President
## 289  DemocraticPrimary     Mayor
## 290  DemocraticPrimary     Mayor
## 291    GeneralElection     Mayor
## 292    GeneralElection     Mayor
## 293    GeneralElection     Mayor
## 294    GeneralElection     Mayor
## 295  DemocraticPrimary     Mayor
## 296  DemocraticPrimary     Mayor
## 297  RepublicanPrimary President
## 298  RepublicanPrimary President
## 299  RepublicanPrimary President
## 300  RepublicanPrimary President
## 301    GeneralElection President
## 302    GeneralElection President
## 303    GeneralElection President
## 304    GeneralElection President
## 305    GeneralElection     Mayor
## 306    GeneralElection     Mayor
## 307    GeneralElection     Mayor
## 308    GeneralElection     Mayor
## 309  RepublicanPrimary     Mayor
## 310  RepublicanPrimary     Mayor
## 311  DemocraticPrimary     Mayor
## 312  DemocraticPrimary     Mayor
## 313  DemocraticPrimary President
## 314  DemocraticPrimary President
## 315    GeneralElection President
## 316    GeneralElection President
## 317  DemocraticPrimary President
## 318  DemocraticPrimary President
## 319  RepublicanPrimary President
## 320  RepublicanPrimary President
## 321  DemocraticPrimary     Mayor
## 322  DemocraticPrimary     Mayor
## 323  DemocraticPrimary     Mayor
## 324  DemocraticPrimary     Mayor
## 325    GeneralElection     Mayor
## 326    GeneralElection     Mayor
## 327  RepublicanPrimary     Mayor
## 328  RepublicanPrimary     Mayor
## 329    GeneralElection President
## 330    GeneralElection President
## 331  RepublicanPrimary President
## 332  RepublicanPrimary President
## 333    GeneralElection President
## 334    GeneralElection President
## 335  DemocraticPrimary President
## 336  DemocraticPrimary President
## 337  DemocraticPrimary     Mayor
## 338  DemocraticPrimary     Mayor
## 339    GeneralElection     Mayor
## 340    GeneralElection     Mayor
## 341  RepublicanPrimary     Mayor
## 342  RepublicanPrimary     Mayor
## 343    GeneralElection     Mayor
## 344    GeneralElection     Mayor
## 345  RepublicanPrimary President
## 346  RepublicanPrimary President
## 347    GeneralElection President
## 348    GeneralElection President
## 349    GeneralElection President
## 350    GeneralElection President
## 351    GeneralElection President
## 352    GeneralElection President
## 353    GeneralElection     Mayor
## 354    GeneralElection     Mayor
## 355    GeneralElection     Mayor
## 356    GeneralElection     Mayor
## 357  RepublicanPrimary     Mayor
## 358  RepublicanPrimary     Mayor
## 359    GeneralElection     Mayor
## 360    GeneralElection     Mayor
## 361  DemocraticPrimary President
## 362  DemocraticPrimary President
## 363    GeneralElection President
## 364    GeneralElection President
## 365  DemocraticPrimary President
## 366  DemocraticPrimary President
## 367  RepublicanPrimary President
## 368  RepublicanPrimary President
## 369  RepublicanPrimary     Mayor
## 370  RepublicanPrimary     Mayor
## 371    GeneralElection     Mayor
## 372    GeneralElection     Mayor
## 373    GeneralElection     Mayor
## 374    GeneralElection     Mayor
## 375    GeneralElection     Mayor
## 376    GeneralElection     Mayor
## 377  DemocraticPrimary President
## 378  DemocraticPrimary President
## 379  DemocraticPrimary President
## 380  DemocraticPrimary President
## 381    GeneralElection President
## 382    GeneralElection President
## 383  RepublicanPrimary President
## 384  RepublicanPrimary President
## 385  RepublicanPrimary     Mayor
## 386  RepublicanPrimary     Mayor
## 387    GeneralElection     Mayor
## 388    GeneralElection     Mayor
## 389    GeneralElection     Mayor
## 390    GeneralElection     Mayor
## 391    GeneralElection     Mayor
## 392    GeneralElection     Mayor
## 393  RepublicanPrimary President
## 394  RepublicanPrimary President
## 395    GeneralElection President
## 396    GeneralElection President
## 397    GeneralElection President
## 398    GeneralElection President
## 399  RepublicanPrimary President
## 400  RepublicanPrimary President
## 401  RepublicanPrimary     Mayor
## 402  RepublicanPrimary     Mayor
## 403  DemocraticPrimary     Mayor
## 404  DemocraticPrimary     Mayor
## 405  DemocraticPrimary     Mayor
## 406  DemocraticPrimary     Mayor
## 407    GeneralElection     Mayor
## 408    GeneralElection     Mayor
## 409    GeneralElection President
## 410    GeneralElection President
## 411  DemocraticPrimary President
## 412  DemocraticPrimary President
## 413    GeneralElection President
## 414    GeneralElection President
## 415    GeneralElection President
## 416    GeneralElection President
## 417  RepublicanPrimary     Mayor
## 418  RepublicanPrimary     Mayor
## 419  RepublicanPrimary     Mayor
## 420  RepublicanPrimary     Mayor
## 421  RepublicanPrimary     Mayor
## 422  RepublicanPrimary     Mayor
## 423  RepublicanPrimary     Mayor
## 424  RepublicanPrimary     Mayor
## 425  DemocraticPrimary President
## 426  DemocraticPrimary President
## 427    GeneralElection President
## 428    GeneralElection President
## 429    GeneralElection President
## 430    GeneralElection President
## 431    GeneralElection President
## 432    GeneralElection President
## 433  RepublicanPrimary     Mayor
## 434  RepublicanPrimary     Mayor
## 435    GeneralElection     Mayor
## 436    GeneralElection     Mayor
## 437  DemocraticPrimary     Mayor
## 438  DemocraticPrimary     Mayor
## 439    GeneralElection     Mayor
## 440    GeneralElection     Mayor
## 441  DemocraticPrimary President
## 442  DemocraticPrimary President
## 443  DemocraticPrimary President
## 444  DemocraticPrimary President
## 445    GeneralElection President
## 446    GeneralElection President
## 447    GeneralElection President
## 448    GeneralElection President
## 449    GeneralElection     Mayor
## 450    GeneralElection     Mayor
## 451  DemocraticPrimary     Mayor
## 452  DemocraticPrimary     Mayor
## 453  RepublicanPrimary     Mayor
## 454  RepublicanPrimary     Mayor
## 455  DemocraticPrimary     Mayor
## 456  DemocraticPrimary     Mayor
## 457  DemocraticPrimary President
## 458  DemocraticPrimary President
## 459    GeneralElection President
## 460    GeneralElection President
## 461    GeneralElection President
## 462    GeneralElection President
## 463  DemocraticPrimary President
## 464  DemocraticPrimary President
## 465  DemocraticPrimary     Mayor
## 466  DemocraticPrimary     Mayor
## 467  DemocraticPrimary     Mayor
## 468  DemocraticPrimary     Mayor
## 469    GeneralElection     Mayor
## 470    GeneralElection     Mayor
## 471  DemocraticPrimary     Mayor
## 472  DemocraticPrimary     Mayor
## 473  RepublicanPrimary President
## 474  RepublicanPrimary President
## 475  DemocraticPrimary President
## 476  DemocraticPrimary President
## 477  DemocraticPrimary President
## 478  DemocraticPrimary President
## 479    GeneralElection President
## 480    GeneralElection President
## 481  RepublicanPrimary     Mayor
## 482  RepublicanPrimary     Mayor
## 483    GeneralElection     Mayor
## 484    GeneralElection     Mayor
## 485  RepublicanPrimary     Mayor
## 486  RepublicanPrimary     Mayor
## 487  RepublicanPrimary     Mayor
## 488  RepublicanPrimary     Mayor
## 489  DemocraticPrimary President
## 490  DemocraticPrimary President
## 491  DemocraticPrimary President
## 492  DemocraticPrimary President
## 493    GeneralElection President
## 494    GeneralElection President
## 495    GeneralElection President
## 496    GeneralElection President
## 497    GeneralElection     Mayor
## 498    GeneralElection     Mayor
## 499  RepublicanPrimary     Mayor
## 500  RepublicanPrimary     Mayor
## 501  RepublicanPrimary     Mayor
## 502  RepublicanPrimary     Mayor
## 503    GeneralElection     Mayor
## 504    GeneralElection     Mayor
## 505    GeneralElection President
## 506    GeneralElection President
## 507    GeneralElection President
## 508    GeneralElection President
## 509    GeneralElection President
## 510    GeneralElection President
## 511    GeneralElection President
## 512    GeneralElection President
## 513  RepublicanPrimary     Mayor
## 514  RepublicanPrimary     Mayor
## 515    GeneralElection     Mayor
## 516    GeneralElection     Mayor
## 517  DemocraticPrimary     Mayor
## 518  DemocraticPrimary     Mayor
## 519  RepublicanPrimary     Mayor
## 520  RepublicanPrimary     Mayor
## 521  DemocraticPrimary President
## 522  DemocraticPrimary President
## 523  DemocraticPrimary President
## 524  DemocraticPrimary President
## 525  DemocraticPrimary President
## 526  DemocraticPrimary President
## 527  DemocraticPrimary President
## 528  DemocraticPrimary President
## 529  DemocraticPrimary     Mayor
## 530  DemocraticPrimary     Mayor
## 531  RepublicanPrimary     Mayor
## 532  RepublicanPrimary     Mayor
## 533  RepublicanPrimary     Mayor
## 534  RepublicanPrimary     Mayor
## 535    GeneralElection     Mayor
## 536    GeneralElection     Mayor
## 537  DemocraticPrimary President
## 538  DemocraticPrimary President
## 539    GeneralElection President
## 540    GeneralElection President
## 541    GeneralElection President
## 542    GeneralElection President
## 543  DemocraticPrimary President
## 544  DemocraticPrimary President
## 545  DemocraticPrimary     Mayor
## 546  DemocraticPrimary     Mayor
## 547  RepublicanPrimary     Mayor
## 548  RepublicanPrimary     Mayor
## 549  DemocraticPrimary     Mayor
## 550  DemocraticPrimary     Mayor
## 551  DemocraticPrimary     Mayor
## 552  DemocraticPrimary     Mayor
## 553    GeneralElection President
## 554    GeneralElection President
## 555    GeneralElection President
## 556    GeneralElection President
## 557  DemocraticPrimary President
## 558  DemocraticPrimary President
## 559    GeneralElection President
## 560    GeneralElection President
## 561    GeneralElection     Mayor
## 562    GeneralElection     Mayor
## 563  RepublicanPrimary     Mayor
## 564  RepublicanPrimary     Mayor
## 565  DemocraticPrimary     Mayor
## 566  DemocraticPrimary     Mayor
## 567  DemocraticPrimary     Mayor
## 568  DemocraticPrimary     Mayor
## 569    GeneralElection President
## 570    GeneralElection President
## 571  DemocraticPrimary President
## 572  DemocraticPrimary President
## 573  RepublicanPrimary President
## 574  RepublicanPrimary President
## 575  DemocraticPrimary President
## 576  DemocraticPrimary President
## 577    GeneralElection     Mayor
## 578    GeneralElection     Mayor
## 579    GeneralElection     Mayor
## 580    GeneralElection     Mayor
## 581    GeneralElection     Mayor
## 582    GeneralElection     Mayor
## 583  RepublicanPrimary     Mayor
## 584  RepublicanPrimary     Mayor
## 585    GeneralElection President
## 586    GeneralElection President
## 587    GeneralElection President
## 588    GeneralElection President
## 589  DemocraticPrimary President
## 590  DemocraticPrimary President
## 591  RepublicanPrimary President
## 592  RepublicanPrimary President
## 593    GeneralElection     Mayor
## 594    GeneralElection     Mayor
## 595  RepublicanPrimary     Mayor
## 596  RepublicanPrimary     Mayor
## 597    GeneralElection     Mayor
## 598    GeneralElection     Mayor
## 599  DemocraticPrimary     Mayor
## 600  DemocraticPrimary     Mayor
## 601    GeneralElection President
## 602    GeneralElection President
## 603  RepublicanPrimary President
## 604  RepublicanPrimary President
## 605  DemocraticPrimary President
## 606  DemocraticPrimary President
## 607    GeneralElection President
## 608    GeneralElection President
## 609    GeneralElection     Mayor
## 610    GeneralElection     Mayor
## 611  DemocraticPrimary     Mayor
## 612  DemocraticPrimary     Mayor
## 613    GeneralElection     Mayor
## 614    GeneralElection     Mayor
## 615    GeneralElection     Mayor
## 616    GeneralElection     Mayor
## 617    GeneralElection President
## 618    GeneralElection President
## 619    GeneralElection President
## 620    GeneralElection President
## 621  DemocraticPrimary President
## 622  DemocraticPrimary President
## 623  RepublicanPrimary President
## 624  RepublicanPrimary President
## 625  RepublicanPrimary     Mayor
## 626  RepublicanPrimary     Mayor
## 627  DemocraticPrimary     Mayor
## 628  DemocraticPrimary     Mayor
## 629    GeneralElection     Mayor
## 630    GeneralElection     Mayor
## 631    GeneralElection     Mayor
## 632    GeneralElection     Mayor
## 633    GeneralElection President
## 634    GeneralElection President
## 635  RepublicanPrimary President
## 636  RepublicanPrimary President
## 637  RepublicanPrimary President
## 638  RepublicanPrimary President
## 639  RepublicanPrimary President
## 640  RepublicanPrimary President
## 641  RepublicanPrimary     Mayor
## 642  RepublicanPrimary     Mayor
## 643  DemocraticPrimary     Mayor
## 644  DemocraticPrimary     Mayor
## 645  RepublicanPrimary     Mayor
## 646  RepublicanPrimary     Mayor
## 647    GeneralElection     Mayor
## 648    GeneralElection     Mayor
## 649    GeneralElection President
## 650    GeneralElection President
## 651    GeneralElection President
## 652    GeneralElection President
## 653    GeneralElection President
## 654    GeneralElection President
## 655  RepublicanPrimary President
## 656  RepublicanPrimary President
## 657  DemocraticPrimary     Mayor
## 658  DemocraticPrimary     Mayor
## 659    GeneralElection     Mayor
## 660    GeneralElection     Mayor
## 661    GeneralElection     Mayor
## 662    GeneralElection     Mayor
## 663  RepublicanPrimary     Mayor
## 664  RepublicanPrimary     Mayor
## 665  RepublicanPrimary President
## 666  RepublicanPrimary President
## 667  RepublicanPrimary President
## 668  RepublicanPrimary President
## 669    GeneralElection President
## 670    GeneralElection President
## 671  DemocraticPrimary President
## 672  DemocraticPrimary President
## 673    GeneralElection     Mayor
## 674    GeneralElection     Mayor
## 675    GeneralElection     Mayor
## 676    GeneralElection     Mayor
## 677  RepublicanPrimary     Mayor
## 678  RepublicanPrimary     Mayor
## 679    GeneralElection     Mayor
## 680    GeneralElection     Mayor
## 681    GeneralElection President
## 682    GeneralElection President
## 683  RepublicanPrimary President
## 684  RepublicanPrimary President
## 685  RepublicanPrimary President
## 686  RepublicanPrimary President
## 687  RepublicanPrimary President
## 688  RepublicanPrimary President
## 689  DemocraticPrimary     Mayor
## 690  DemocraticPrimary     Mayor
## 691    GeneralElection     Mayor
## 692    GeneralElection     Mayor
## 693  RepublicanPrimary     Mayor
## 694  RepublicanPrimary     Mayor
## 695  RepublicanPrimary     Mayor
## 696  RepublicanPrimary     Mayor
## 697    GeneralElection President
## 698    GeneralElection President
## 699    GeneralElection President
## 700    GeneralElection President
## 701    GeneralElection President
## 702    GeneralElection President
## 703    GeneralElection President
## 704    GeneralElection President
## 705    GeneralElection     Mayor
## 706    GeneralElection     Mayor
## 707    GeneralElection     Mayor
## 708    GeneralElection     Mayor
## 709  RepublicanPrimary     Mayor
## 710  RepublicanPrimary     Mayor
## 711    GeneralElection     Mayor
## 712    GeneralElection     Mayor
## 713    GeneralElection President
## 714    GeneralElection President
## 715    GeneralElection President
## 716    GeneralElection President
## 717    GeneralElection President
## 718    GeneralElection President
## 719    GeneralElection President
## 720    GeneralElection President
## 721  RepublicanPrimary     Mayor
## 722  RepublicanPrimary     Mayor
## 723  RepublicanPrimary     Mayor
## 724  RepublicanPrimary     Mayor
## 725  DemocraticPrimary     Mayor
## 726  DemocraticPrimary     Mayor
## 727    GeneralElection     Mayor
## 728    GeneralElection     Mayor
## 729  RepublicanPrimary President
## 730  RepublicanPrimary President
## 731  RepublicanPrimary President
## 732  RepublicanPrimary President
## 733  DemocraticPrimary President
## 734  DemocraticPrimary President
## 735  DemocraticPrimary President
## 736  DemocraticPrimary President
## 737  DemocraticPrimary     Mayor
## 738  DemocraticPrimary     Mayor
## 739    GeneralElection     Mayor
## 740    GeneralElection     Mayor
## 741    GeneralElection     Mayor
## 742    GeneralElection     Mayor
## 743    GeneralElection     Mayor
## 744    GeneralElection     Mayor
## 745  DemocraticPrimary President
## 746  DemocraticPrimary President
## 747  DemocraticPrimary President
## 748  DemocraticPrimary President
## 749    GeneralElection President
## 750    GeneralElection President
## 751    GeneralElection President
## 752    GeneralElection President
## 753  DemocraticPrimary     Mayor
## 754  DemocraticPrimary     Mayor
## 755    GeneralElection     Mayor
## 756    GeneralElection     Mayor
## 757    GeneralElection     Mayor
## 758    GeneralElection     Mayor
## 759  DemocraticPrimary     Mayor
## 760  DemocraticPrimary     Mayor
## 761    GeneralElection President
## 762    GeneralElection President
## 763  RepublicanPrimary President
## 764  RepublicanPrimary President
## 765  DemocraticPrimary President
## 766  DemocraticPrimary President
## 767    GeneralElection President
## 768    GeneralElection President
## 769    GeneralElection     Mayor
## 770    GeneralElection     Mayor
## 771    GeneralElection     Mayor
## 772    GeneralElection     Mayor
## 773  DemocraticPrimary     Mayor
## 774  DemocraticPrimary     Mayor
## 775    GeneralElection     Mayor
## 776    GeneralElection     Mayor
## 777    GeneralElection President
## 778    GeneralElection President
## 779  DemocraticPrimary President
## 780  DemocraticPrimary President
## 781    GeneralElection President
## 782    GeneralElection President
## 783  RepublicanPrimary President
## 784  RepublicanPrimary President
## 785    GeneralElection     Mayor
## 786    GeneralElection     Mayor
## 787  DemocraticPrimary     Mayor
## 788  DemocraticPrimary     Mayor
## 789    GeneralElection     Mayor
## 790    GeneralElection     Mayor
## 791    GeneralElection     Mayor
## 792    GeneralElection     Mayor
## 793  RepublicanPrimary President
## 794  RepublicanPrimary President
## 795  RepublicanPrimary President
## 796  RepublicanPrimary President
## 797    GeneralElection President
## 798    GeneralElection President
## 799  DemocraticPrimary President
## 800  DemocraticPrimary President
## 801  DemocraticPrimary     Mayor
## 802  DemocraticPrimary     Mayor
## 803    GeneralElection     Mayor
## 804    GeneralElection     Mayor
## 805    GeneralElection     Mayor
## 806    GeneralElection     Mayor
## 807    GeneralElection     Mayor
## 808    GeneralElection     Mayor
## 809    GeneralElection President
## 810    GeneralElection President
## 811  RepublicanPrimary President
## 812  RepublicanPrimary President
## 813    GeneralElection President
## 814    GeneralElection President
## 815  RepublicanPrimary President
## 816  RepublicanPrimary President
## 817    GeneralElection     Mayor
## 818    GeneralElection     Mayor
## 819    GeneralElection     Mayor
## 820    GeneralElection     Mayor
## 821    GeneralElection     Mayor
## 822    GeneralElection     Mayor
## 823  DemocraticPrimary     Mayor
## 824  DemocraticPrimary     Mayor
## 825  RepublicanPrimary President
## 826  RepublicanPrimary President
## 827    GeneralElection President
## 828    GeneralElection President
## 829  RepublicanPrimary President
## 830  RepublicanPrimary President
## 831  RepublicanPrimary President
## 832  RepublicanPrimary President
## 833  DemocraticPrimary     Mayor
## 834  DemocraticPrimary     Mayor
## 835    GeneralElection     Mayor
## 836    GeneralElection     Mayor
## 837  RepublicanPrimary     Mayor
## 838  RepublicanPrimary     Mayor
## 839  DemocraticPrimary     Mayor
## 840  DemocraticPrimary     Mayor
## 841    GeneralElection President
## 842    GeneralElection President
## 843    GeneralElection President
## 844    GeneralElection President
## 845    GeneralElection President
## 846    GeneralElection President
## 847  RepublicanPrimary President
## 848  RepublicanPrimary President
## 849    GeneralElection     Mayor
## 850    GeneralElection     Mayor
## 851  DemocraticPrimary     Mayor
## 852  DemocraticPrimary     Mayor
## 853  DemocraticPrimary     Mayor
## 854  DemocraticPrimary     Mayor
## 855    GeneralElection     Mayor
## 856    GeneralElection     Mayor
## 857  DemocraticPrimary President
## 858  DemocraticPrimary President
## 859  DemocraticPrimary President
## 860  DemocraticPrimary President
## 861    GeneralElection President
## 862    GeneralElection President
## 863  RepublicanPrimary President
## 864  RepublicanPrimary President
## 865  RepublicanPrimary     Mayor
## 866  RepublicanPrimary     Mayor
## 867  DemocraticPrimary     Mayor
## 868  DemocraticPrimary     Mayor
## 869    GeneralElection     Mayor
## 870    GeneralElection     Mayor
## 871    GeneralElection     Mayor
## 872    GeneralElection     Mayor
## 873    GeneralElection President
## 874    GeneralElection President
## 875  RepublicanPrimary President
## 876  RepublicanPrimary President
## 877    GeneralElection President
## 878    GeneralElection President
## 879    GeneralElection President
## 880    GeneralElection President
## 881  DemocraticPrimary     Mayor
## 882  DemocraticPrimary     Mayor
## 883    GeneralElection     Mayor
## 884    GeneralElection     Mayor
## 885    GeneralElection     Mayor
## 886    GeneralElection     Mayor
## 887  RepublicanPrimary     Mayor
## 888  RepublicanPrimary     Mayor
## 889    GeneralElection President
## 890    GeneralElection President
## 891  DemocraticPrimary President
## 892  DemocraticPrimary President
## 893    GeneralElection President
## 894    GeneralElection President
## 895  DemocraticPrimary President
## 896  DemocraticPrimary President
## 897  DemocraticPrimary     Mayor
## 898  DemocraticPrimary     Mayor
## 899  DemocraticPrimary     Mayor
## 900  DemocraticPrimary     Mayor
## 901  DemocraticPrimary     Mayor
## 902  DemocraticPrimary     Mayor
## 903  DemocraticPrimary     Mayor
## 904  DemocraticPrimary     Mayor
## 905  RepublicanPrimary President
## 906  RepublicanPrimary President
## 907    GeneralElection President
## 908    GeneralElection President
## 909  DemocraticPrimary President
## 910  DemocraticPrimary President
## 911    GeneralElection President
## 912    GeneralElection President
## 913  RepublicanPrimary     Mayor
## 914  RepublicanPrimary     Mayor
## 915    GeneralElection     Mayor
## 916    GeneralElection     Mayor
## 917  DemocraticPrimary     Mayor
## 918  DemocraticPrimary     Mayor
## 919    GeneralElection     Mayor
## 920    GeneralElection     Mayor
## 921    GeneralElection President
## 922    GeneralElection President
## 923    GeneralElection President
## 924    GeneralElection President
## 925    GeneralElection President
## 926    GeneralElection President
## 927  DemocraticPrimary President
## 928  DemocraticPrimary President
## 929  DemocraticPrimary     Mayor
## 930  DemocraticPrimary     Mayor
## 931  DemocraticPrimary     Mayor
## 932  DemocraticPrimary     Mayor
## 933  DemocraticPrimary     Mayor
## 934  DemocraticPrimary     Mayor
## 935  RepublicanPrimary     Mayor
## 936  RepublicanPrimary     Mayor
## 937    GeneralElection President
## 938    GeneralElection President
## 939  DemocraticPrimary President
## 940  DemocraticPrimary President
## 941    GeneralElection President
## 942    GeneralElection President
## 943    GeneralElection President
## 944    GeneralElection President
## 945    GeneralElection     Mayor
## 946    GeneralElection     Mayor
## 947  RepublicanPrimary     Mayor
## 948  RepublicanPrimary     Mayor
## 949    GeneralElection     Mayor
## 950    GeneralElection     Mayor
## 951    GeneralElection     Mayor
## 952    GeneralElection     Mayor
## 953    GeneralElection President
## 954    GeneralElection President
## 955    GeneralElection President
## 956    GeneralElection President
## 957    GeneralElection President
## 958    GeneralElection President
## 959  DemocraticPrimary President
## 960  DemocraticPrimary President
## 961  DemocraticPrimary     Mayor
## 962  DemocraticPrimary     Mayor
## 963    GeneralElection     Mayor
## 964    GeneralElection     Mayor
## 965  DemocraticPrimary     Mayor
## 966  DemocraticPrimary     Mayor
## 967  RepublicanPrimary     Mayor
## 968  RepublicanPrimary     Mayor
## 969  DemocraticPrimary President
## 970  DemocraticPrimary President
## 971    GeneralElection President
## 972    GeneralElection President
## 973    GeneralElection President
## 974    GeneralElection President
## 975  DemocraticPrimary President
## 976  DemocraticPrimary President
## 977  RepublicanPrimary     Mayor
## 978  RepublicanPrimary     Mayor
## 979    GeneralElection     Mayor
## 980    GeneralElection     Mayor
## 981    GeneralElection     Mayor
## 982    GeneralElection     Mayor
## 983  RepublicanPrimary     Mayor
## 984  RepublicanPrimary     Mayor
## 985  RepublicanPrimary President
## 986  RepublicanPrimary President
## 987  RepublicanPrimary President
## 988  RepublicanPrimary President
## 989    GeneralElection President
## 990    GeneralElection President
## 991  DemocraticPrimary President
## 992  DemocraticPrimary President
## 993  DemocraticPrimary     Mayor
## 994  DemocraticPrimary     Mayor
## 995  RepublicanPrimary     Mayor
## 996  RepublicanPrimary     Mayor
## 997  RepublicanPrimary     Mayor
## 998  RepublicanPrimary     Mayor
## 999    GeneralElection     Mayor
## 1000   GeneralElection     Mayor
## 1001 RepublicanPrimary President
## 1002 RepublicanPrimary President
## 1003 DemocraticPrimary President
## 1004 DemocraticPrimary President
## 1005   GeneralElection President
## 1006   GeneralElection President
## 1007   GeneralElection President
## 1008   GeneralElection President
## 1009   GeneralElection     Mayor
## 1010   GeneralElection     Mayor
## 1011   GeneralElection     Mayor
## 1012   GeneralElection     Mayor
## 1013   GeneralElection     Mayor
## 1014   GeneralElection     Mayor
## 1015 DemocraticPrimary     Mayor
## 1016 DemocraticPrimary     Mayor
## 1017 RepublicanPrimary President
## 1018 RepublicanPrimary President
## 1019   GeneralElection President
## 1020   GeneralElection President
## 1021   GeneralElection President
## 1022   GeneralElection President
## 1023   GeneralElection President
## 1024   GeneralElection President
## 1025   GeneralElection     Mayor
## 1026   GeneralElection     Mayor
## 1027   GeneralElection     Mayor
## 1028   GeneralElection     Mayor
## 1029   GeneralElection     Mayor
## 1030   GeneralElection     Mayor
## 1031 DemocraticPrimary     Mayor
## 1032 DemocraticPrimary     Mayor
## 1033 DemocraticPrimary President
## 1034 DemocraticPrimary President
## 1035 DemocraticPrimary President
## 1036 DemocraticPrimary President
## 1037   GeneralElection President
## 1038   GeneralElection President
## 1039   GeneralElection President
## 1040   GeneralElection President
## 1041   GeneralElection     Mayor
## 1042   GeneralElection     Mayor
## 1043   GeneralElection     Mayor
## 1044   GeneralElection     Mayor
## 1045 DemocraticPrimary     Mayor
## 1046 DemocraticPrimary     Mayor
## 1047 DemocraticPrimary     Mayor
## 1048 DemocraticPrimary     Mayor
## 1049   GeneralElection President
## 1050   GeneralElection President
## 1051   GeneralElection President
## 1052   GeneralElection President
## 1053 DemocraticPrimary President
## 1054 DemocraticPrimary President
## 1055   GeneralElection President
## 1056   GeneralElection President
## 1057 DemocraticPrimary     Mayor
## 1058 DemocraticPrimary     Mayor
## 1059   GeneralElection     Mayor
## 1060   GeneralElection     Mayor
## 1061 RepublicanPrimary     Mayor
## 1062 RepublicanPrimary     Mayor
## 1063   GeneralElection     Mayor
## 1064   GeneralElection     Mayor
## 1065 RepublicanPrimary President
## 1066 RepublicanPrimary President
## 1067 DemocraticPrimary President
## 1068 DemocraticPrimary President
## 1069   GeneralElection President
## 1070   GeneralElection President
## 1071 DemocraticPrimary President
## 1072 DemocraticPrimary President
## 1073 RepublicanPrimary     Mayor
## 1074 RepublicanPrimary     Mayor
## 1075 DemocraticPrimary     Mayor
## 1076 DemocraticPrimary     Mayor
## 1077 DemocraticPrimary     Mayor
## 1078 DemocraticPrimary     Mayor
## 1079 DemocraticPrimary     Mayor
## 1080 DemocraticPrimary     Mayor
## 1081 DemocraticPrimary President
## 1082 DemocraticPrimary President
## 1083 RepublicanPrimary President
## 1084 RepublicanPrimary President
## 1085   GeneralElection President
## 1086   GeneralElection President
## 1087 DemocraticPrimary President
## 1088 DemocraticPrimary President
## 1089   GeneralElection     Mayor
## 1090   GeneralElection     Mayor
## 1091   GeneralElection     Mayor
## 1092   GeneralElection     Mayor
## 1093 DemocraticPrimary     Mayor
## 1094 DemocraticPrimary     Mayor
## 1095 RepublicanPrimary     Mayor
## 1096 RepublicanPrimary     Mayor
## 1097   GeneralElection President
## 1098   GeneralElection President
## 1099   GeneralElection President
## 1100   GeneralElection President
## 1101 DemocraticPrimary President
## 1102 DemocraticPrimary President
## 1103   GeneralElection President
## 1104   GeneralElection President
## 1105   GeneralElection     Mayor
## 1106   GeneralElection     Mayor
## 1107   GeneralElection     Mayor
## 1108   GeneralElection     Mayor
## 1109   GeneralElection     Mayor
## 1110   GeneralElection     Mayor
## 1111   GeneralElection     Mayor
## 1112   GeneralElection     Mayor
## 1113 DemocraticPrimary President
## 1114 DemocraticPrimary President
## 1115 RepublicanPrimary President
## 1116 RepublicanPrimary President
## 1117   GeneralElection President
## 1118   GeneralElection President
## 1119 RepublicanPrimary President
## 1120 RepublicanPrimary President
## 1121   GeneralElection     Mayor
## 1122   GeneralElection     Mayor
## 1123 DemocraticPrimary     Mayor
## 1124 DemocraticPrimary     Mayor
## 1125   GeneralElection     Mayor
## 1126   GeneralElection     Mayor
## 1127 RepublicanPrimary     Mayor
## 1128 RepublicanPrimary     Mayor
## 1129   GeneralElection President
## 1130   GeneralElection President
## 1131 DemocraticPrimary President
## 1132 DemocraticPrimary President
## 1133   GeneralElection President
## 1134   GeneralElection President
## 1135 RepublicanPrimary President
## 1136 RepublicanPrimary President
## 1137   GeneralElection     Mayor
## 1138   GeneralElection     Mayor
## 1139   GeneralElection     Mayor
## 1140   GeneralElection     Mayor
## 1141 DemocraticPrimary     Mayor
## 1142 DemocraticPrimary     Mayor
## 1143 RepublicanPrimary     Mayor
## 1144 RepublicanPrimary     Mayor
## 1145   GeneralElection President
## 1146   GeneralElection President
## 1147   GeneralElection President
## 1148   GeneralElection President
## 1149   GeneralElection President
## 1150   GeneralElection President
## 1151 DemocraticPrimary President
## 1152 DemocraticPrimary President
## 1153 DemocraticPrimary     Mayor
## 1154 DemocraticPrimary     Mayor
## 1155 DemocraticPrimary     Mayor
## 1156 DemocraticPrimary     Mayor
## 1157 RepublicanPrimary     Mayor
## 1158 RepublicanPrimary     Mayor
## 1159   GeneralElection     Mayor
## 1160   GeneralElection     Mayor
## 1161 DemocraticPrimary President
## 1162 DemocraticPrimary President
## 1163 RepublicanPrimary President
## 1164 RepublicanPrimary President
## 1165 DemocraticPrimary President
## 1166 DemocraticPrimary President
## 1167 DemocraticPrimary President
## 1168 DemocraticPrimary President
## 1169 DemocraticPrimary     Mayor
## 1170 DemocraticPrimary     Mayor
## 1171 RepublicanPrimary     Mayor
## 1172 RepublicanPrimary     Mayor
## 1173   GeneralElection     Mayor
## 1174   GeneralElection     Mayor
## 1175 DemocraticPrimary     Mayor
## 1176 DemocraticPrimary     Mayor
## 1177 DemocraticPrimary President
## 1178 DemocraticPrimary President
## 1179 RepublicanPrimary President
## 1180 RepublicanPrimary President
## 1181   GeneralElection President
## 1182   GeneralElection President
## 1183 DemocraticPrimary President
## 1184 DemocraticPrimary President
## 1185 DemocraticPrimary     Mayor
## 1186 DemocraticPrimary     Mayor
## 1187 RepublicanPrimary     Mayor
## 1188 RepublicanPrimary     Mayor
## 1189   GeneralElection     Mayor
## 1190   GeneralElection     Mayor
## 1191   GeneralElection     Mayor
## 1192   GeneralElection     Mayor
## 1193   GeneralElection President
## 1194   GeneralElection President
## 1195 DemocraticPrimary President
## 1196 DemocraticPrimary President
## 1197 RepublicanPrimary President
## 1198 RepublicanPrimary President
## 1199   GeneralElection President
## 1200   GeneralElection President
## 1201   GeneralElection     Mayor
## 1202   GeneralElection     Mayor
## 1203 DemocraticPrimary     Mayor
## 1204 DemocraticPrimary     Mayor
## 1205   GeneralElection     Mayor
## 1206   GeneralElection     Mayor
## 1207 RepublicanPrimary     Mayor
## 1208 RepublicanPrimary     Mayor
## 1209 DemocraticPrimary President
## 1210 DemocraticPrimary President
## 1211   GeneralElection President
## 1212   GeneralElection President
## 1213   GeneralElection President
## 1214   GeneralElection President
## 1215   GeneralElection President
## 1216   GeneralElection President
## 1217 DemocraticPrimary     Mayor
## 1218 DemocraticPrimary     Mayor
## 1219 RepublicanPrimary     Mayor
## 1220 RepublicanPrimary     Mayor
## 1221   GeneralElection     Mayor
## 1222   GeneralElection     Mayor
## 1223 RepublicanPrimary     Mayor
## 1224 RepublicanPrimary     Mayor
## 1225 RepublicanPrimary President
## 1226 RepublicanPrimary President
## 1227 DemocraticPrimary President
## 1228 DemocraticPrimary President
## 1229 DemocraticPrimary President
## 1230 DemocraticPrimary President
## 1231   GeneralElection President
## 1232   GeneralElection President
## 1233   GeneralElection     Mayor
## 1234   GeneralElection     Mayor
## 1235 RepublicanPrimary     Mayor
## 1236 RepublicanPrimary     Mayor
## 1237   GeneralElection     Mayor
## 1238   GeneralElection     Mayor
## 1239   GeneralElection     Mayor
## 1240   GeneralElection     Mayor
## 1241 RepublicanPrimary President
## 1242 RepublicanPrimary President
## 1243 DemocraticPrimary President
## 1244 DemocraticPrimary President
## 1245 DemocraticPrimary President
## 1246 DemocraticPrimary President
## 1247   GeneralElection President
## 1248   GeneralElection President
## 1249   GeneralElection     Mayor
## 1250   GeneralElection     Mayor
## 1251   GeneralElection     Mayor
## 1252   GeneralElection     Mayor
## 1253   GeneralElection     Mayor
## 1254   GeneralElection     Mayor
## 1255   GeneralElection     Mayor
## 1256   GeneralElection     Mayor
## 1257 DemocraticPrimary President
## 1258 DemocraticPrimary President
## 1259 RepublicanPrimary President
## 1260 RepublicanPrimary President
## 1261   GeneralElection President
## 1262   GeneralElection President
## 1263   GeneralElection President
## 1264   GeneralElection President
## 1265 DemocraticPrimary     Mayor
## 1266 DemocraticPrimary     Mayor
## 1267 RepublicanPrimary     Mayor
## 1268 RepublicanPrimary     Mayor
## 1269   GeneralElection     Mayor
## 1270   GeneralElection     Mayor
## 1271   GeneralElection     Mayor
## 1272   GeneralElection     Mayor
## 1273   GeneralElection President
## 1274   GeneralElection President
## 1275 RepublicanPrimary President
## 1276 RepublicanPrimary President
## 1277   GeneralElection President
## 1278   GeneralElection President
## 1279   GeneralElection President
## 1280   GeneralElection President
## 1281   GeneralElection     Mayor
## 1282   GeneralElection     Mayor
## 1283   GeneralElection     Mayor
## 1284   GeneralElection     Mayor
## 1285 DemocraticPrimary     Mayor
## 1286 DemocraticPrimary     Mayor
## 1287   GeneralElection     Mayor
## 1288   GeneralElection     Mayor
## 1289 RepublicanPrimary President
## 1290 RepublicanPrimary President
## 1291 DemocraticPrimary President
## 1292 DemocraticPrimary President
## 1293   GeneralElection President
## 1294   GeneralElection President
## 1295   GeneralElection President
## 1296   GeneralElection President
## 1297   GeneralElection     Mayor
## 1298   GeneralElection     Mayor
## 1299 DemocraticPrimary     Mayor
## 1300 DemocraticPrimary     Mayor
## 1301 DemocraticPrimary     Mayor
## 1302 DemocraticPrimary     Mayor
## 1303   GeneralElection     Mayor
## 1304   GeneralElection     Mayor
## 1305 DemocraticPrimary President
## 1306 DemocraticPrimary President
## 1307   GeneralElection President
## 1308   GeneralElection President
## 1309   GeneralElection President
## 1310   GeneralElection President
## 1311 RepublicanPrimary President
## 1312 RepublicanPrimary President
## 1313   GeneralElection     Mayor
## 1314   GeneralElection     Mayor
## 1315   GeneralElection     Mayor
##  [ reached 'max' / getOption("max.print") -- omitted 19069 rows ]
## 
## attr(,"class")
## [1] "amce"