Follow me on ResearchGate

Connect with me on Open Science Framework | Contact me via LinkedIn


1 Load packages

#load("Workspace.RData")

#rm(list = ls())


if ("readxl" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(readxl))
} else {
  install.packages("readxl", repos = "https://cloud.r-project.org")
}

if ("ClustVarLV" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(ClustVarLV))
} else {
  install.packages("ClustVarLV", repos = "https://cloud.r-project.org")
}

if ("tableone" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(tableone))
} else {
  install.packages("tableone", repos = "https://cloud.r-project.org")
}

if ("dplyr" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(dplyr))
} else {
  install.packages("dplyr", repos = "https://cloud.r-project.org")
}

if ("foreign" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(foreign))
} else {
  install.packages("foreign", repos = "https://cloud.r-project.org")
}


if ("psych" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(psych))
} else {
  install.packages("psych", repos = "https://cloud.r-project.org")
}

if ("tidyverse" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(tidyverse))
} else {
  install.packages("tidyverse", repos = "https://cloud.r-project.org")
}


if(!"papaja" %in% rownames(installed.packages())) devtools::install_github("crsh/papaja@devel")

suppressPackageStartupMessages(require(papaja))


if ("ggbeeswarm" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(ggbeeswarm))
} else {
  install.packages("ggbeeswarm", repos = "https://cloud.r-project.org")
}

if ("data.table" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(data.table))
} else {
  install.packages("data.table", repos = "https://cloud.r-project.org")
}

if ("sp" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(sp))
} else {
  install.packages("sp", repos = "https://cloud.r-project.org")
}

if ("stringr" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(stringr))
} else {
  install.packages("stringr", repos = "https://cloud.r-project.org")
}

if ("ConsensusClusterPlus" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(ConsensusClusterPlus))
} else {
  
  if (!requireNamespace("BiocManager", quietly = TRUE))
  install.packages("BiocManager")
BiocManager::install()
BiocManager::install(c("ConsensusClusterPlus"))

  
}

if ("knitr" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(knitr))
} else {
  install.packages("knitr", repos = "https://cloud.r-project.org")
}

if ("kableExtra" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(kableExtra))
} else {
  install.packages("kableExtra", repos = "https://cloud.r-project.org")
}

if ("openxlsx" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(openxlsx))
} else {
  install.packages("openxlsx", repos = "https://cloud.r-project.org")
}

if ("ez" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(ez))
} else {
  install.packages("ez", repos = "https://cloud.r-project.org")
}

if ("car" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(car))
} else {
  install.packages("car", repos = "https://cloud.r-project.org")
}

if ("DescTools" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(DescTools))
} else {
  install.packages("DescTools", repos = "https://cloud.r-project.org")
}

if ("haven" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(haven))
} else {
  install.packages("haven", repos = "https://cloud.r-project.org")
}

if ("factoextra" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(factoextra))
} else {
  install.packages("factoextra", repos = "https://cloud.r-project.org")
}


if ("ChoiceModelR" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(ChoiceModelR))
} else {
  install.packages("ChoiceModelR", repos = "https://cloud.r-project.org")
}

if ("userfriendlyscience" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(userfriendlyscience))
} else {
  install.packages("userfriendlyscience", repos = "https://cloud.r-project.org")
}

if ("viridis" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(viridis))
} else {
  install.packages("viridis", repos = "https://cloud.r-project.org")
}


if ("tableone" %in% rownames(installed.packages())) {
  suppressPackageStartupMessages(library(tableone))
} else {
  install.packages("tableone", repos = "https://cloud.r-project.org")
}

2 Einlesen der Daten zu Hospital aus csv

So bin ich vorgegangen:

  1. Zuvor single format *csv export aus Sawtooth Lighthouse studio)

  2. Einlesen der Daten

Hospital_Sawtooth<-read.csv("Design1_completes.csv")

Check der Daten

head(Hospital_Sawtooth)
##   sys_RespNum Task Concept Entfernung Information Fallzahl Komplikationsrate Response
## 1           1    1       1          2           2        1                 1        1
## 2           1    1       2          1           1        1                 2        0
## 3           1    2       1          2           2        2                 2        1
## 4           1    2       2          1           1        1                 1        0
## 5           1    3       1          2           1        1                 2        0
## 6           1    3       2          1           2        2                 1        1
names(Hospital_Sawtooth)
## [1] "sys_RespNum"       "Task"              "Concept"           "Entfernung"        "Information"       "Fallzahl"          "Komplikationsrate" "Response"
for(i in 2:ncol(Hospital_Sawtooth)){

print(freq(Hospital_Sawtooth[,i]))

}
##             Frequencies Perc.Total Perc.Valid Cumulative
## 1                   992       12.5       12.5       12.5
## 2                   992       12.5       12.5       25.0
## 3                   992       12.5       12.5       37.5
## 4                   992       12.5       12.5       50.0
## 5                   992       12.5       12.5       62.5
## 6                   992       12.5       12.5       75.0
## 7                   992       12.5       12.5       87.5
## 8                   992       12.5       12.5      100.0
## Total valid        7936      100.0      100.0           
##             Frequencies Perc.Total Perc.Valid Cumulative
## 1                  3968       50.0       50.0       50.0
## 2                  3968       50.0       50.0      100.0
## Total valid        7936      100.0      100.0           
##             Frequencies Perc.Total Perc.Valid Cumulative
## 1                  3974       50.1       50.1       50.1
## 2                  3962       49.9       49.9      100.0
## Total valid        7936      100.0      100.0           
##             Frequencies Perc.Total Perc.Valid Cumulative
## 1                  3965       50.0       50.0       50.0
## 2                  3971       50.0       50.0      100.0
## Total valid        7936      100.0      100.0           
##             Frequencies Perc.Total Perc.Valid Cumulative
## 1                  3934       49.6       49.6       49.6
## 2                  4002       50.4       50.4      100.0
## Total valid        7936      100.0      100.0           
##             Frequencies Perc.Total Perc.Valid Cumulative
## 1                  3943       49.7       49.7       49.7
## 2                  3993       50.3       50.3      100.0
## Total valid        7936      100.0      100.0           
##             Frequencies Perc.Total Perc.Valid Cumulative
## 0                  3968       50.0       50.0       50.0
## 1                  3968       50.0       50.0      100.0
## Total valid        7936      100.0      100.0

3 Vorbereiten der Daten für ChoiceModelR

Response Variable umkodieren so das Nummer der gewählten Aternative immer in erster Zeile des Choice Tasks steht

Weil wir dass gewiss öfter brauchen, schreibe ich eine wiederverwertbare Funktion

Sawtooth_Single_Format_CSV_To_ChoiceModelR <- function(CSV_file=NULL) {
  
  d <- CSV_file
  
  
Alternatives_Choice_Task <- max(d$Concept)


for (i in 1:nrow(d)) {
  
  if (d$Concept[i]==1 && d$Response[i]==0) {
    
    for (k in 1:(Alternatives_Choice_Task-1)) {
      
      if (d$Response[i+k]!=0) {
        
        d$Response[i] <- d$Concept[i+k]
        
      }
      
    }
    
    
  } else if (d$Concept[i]!=1) {
    
    d$Response[i]<-0
    
  }
  
  
}
  
return(d)
  
}
Hospital_Sawtooth <- Sawtooth_Single_Format_CSV_To_ChoiceModelR(Hospital_Sawtooth)


table(Hospital_Sawtooth$Concept, Hospital_Sawtooth$Response)
##    
##        0    1    2
##   1    0 2030 1938
##   2 3968    0    0

4 Schätzung der Daten in ChoiceModelR (nicht gleiche Settings wie Sawtooth)

precision parameter (default is 0.01)

prior degrees of freedom (default is 5, must be ≥ 2), Sawtooth: 5

v = prior variance (default is 2, must be ≥ 0), Sawtooth: 1

Furthermore same settings as in Sawtooth: no Constraints, 125000 iterations with 50000 Burn-In

xcoding = c(0, 0, 0, 0 )
mcmc = list(R = 125000, use = 75000)
options = list(none=FALSE, save=TRUE, keep=1)
attlevels = c(2, 2, 2, 2)
out = choicemodelr(Hospital_Sawtooth, xcoding, mcmc = mcmc, options = options)
##                     Logit Data                    
## ==================================================
## Attribute       Type         Levels
## -----------------------------------
## Attribute 1    Part Worth      2
## Attribute 2    Part Worth      2
## Attribute 3    Part Worth      2
## Attribute 4    Part Worth      2
## 
## 4 parameters to be estimated.
## 
## 496 total units.
## Average of 2 alternatives in each of 8 sets per unit.
## 3968 tasks in total.
## 
## Table of choice data pooled across units:
## Choice  Count   Pct.
## --------------------
##    1    2030   51.16%
##    2    1938   48.84%
## 
##       MCMC Inference for Hierarchical Logit       
## ==================================================
## Total Iterations:          125000
## Draws used in estimation:  75000
## Units:                     496
## Parameters per unit:       4
## Constraints not in effect.
## Draws are to be saved.
## Prior degrees of freedom:  5
## Prior variance:            2
## 
## MCMC Iteration Beginning...

## Iteration  Acceptance   RLH     Pct. Cert.   Avg. Var.   RMS     Time to End
##       100  0.409        0.608   0.261        0.08        0.33    5:12

##       200  0.302        0.717   0.502        0.25        0.87    5:12  
##       300  0.301        0.774   0.621        0.52        1.33    4:47  
##       400  0.304        0.803   0.679        0.77        1.68    5:30

##       500  0.302        0.816   0.706        1.01        1.93    5:24  
##       600  0.306        0.825   0.722        1.27        2.13    5:11  
##       700  0.304        0.832   0.735        1.47        2.27    5:02  
##       800  0.303        0.832   0.734        1.52        2.31    4:57  
##       900  0.308        0.833   0.736        1.61        2.37    4:48  
##      1000  0.309        0.835   0.740        1.66        2.39    4:43  
##      1100  0.304        0.837   0.743        1.72        2.41    4:38  
##      1200  0.307        0.838   0.745        1.72        2.45    4:35  
##      1300  0.300        0.839   0.746        1.63        2.42    4:32  
##      1400  0.302        0.836   0.742        1.58        2.36    4:29  
##      1500  0.306        0.840   0.749        1.78        2.49    4:27

##      1600  0.305        0.844   0.756        1.89        2.55    4:32  
##      1700  0.303        0.843   0.754        1.85        2.51    4:31  
##      1800  0.310        0.843   0.753        1.79        2.46    4:28  
##      1900  0.301        0.842   0.752        1.79        2.46    4:26  
##      2000  0.307        0.845   0.757        2.01        2.58    4:24  
##      2100  0.303        0.846   0.758        2.04        2.62    4:23  
##      2200  0.303        0.846   0.758        2.06        2.62    4:22  
##      2300  0.299        0.841   0.750        1.87        2.52    4:20  
##      2400  0.300        0.840   0.749        1.82        2.50    4:18  
##      2500  0.304        0.840   0.748        1.92        2.55    4:17  
##      2600  0.302        0.841   0.750        1.86        2.49    4:17  
##      2700  0.302        0.841   0.750        1.87        2.49    4:15  
##      2800  0.304        0.840   0.749        1.80        2.46    4:15  
##      2900  0.304        0.839   0.747        1.68        2.38    4:14  
##      3000  0.302        0.838   0.745        1.71        2.40    4:13  
##      3100  0.298        0.840   0.749        1.78        2.43    4:12  
##      3200  0.306        0.841   0.751        1.76        2.42    4:11  
##      3300  0.302        0.836   0.741        1.51        2.28    4:11  
##      3400  0.301        0.837   0.743        1.66        2.39    4:10  
##      3500  0.300        0.839   0.746        1.70        2.43    4:09  
##      3600  0.299        0.837   0.744        1.57        2.37    4:08  
##      3700  0.299        0.840   0.748        1.70        2.44    4:08  
##      3800  0.302        0.842   0.752        1.81        2.49    4:07  
##      3900  0.300        0.843   0.754        1.92        2.54    4:07  
##      4000  0.306        0.842   0.752        1.90        2.53    4:06  
##      4100  0.305        0.844   0.755        1.98        2.58    4:06  
##      4200  0.303        0.847   0.760        2.08        2.65    4:05  
##      4300  0.297        0.850   0.766        2.26        2.73    4:05  
##      4400  0.298        0.852   0.769        2.31        2.76    4:04  
##      4500  0.302        0.853   0.770        2.54        2.88    4:04  
##      4600  0.301        0.853   0.770        2.74        2.98    4:03  
##      4700  0.302        0.851   0.768        2.64        2.95    4:03  
##      4800  0.299        0.852   0.769        2.51        2.91    4:03  
##      4900  0.308        0.852   0.768        2.42        2.84    4:02  
##      5000  0.302        0.849   0.764        2.17        2.71    4:01  
##      5100  0.303        0.847   0.760        1.95        2.58    4:01  
##      5200  0.299        0.845   0.757        1.95        2.57    4:01  
##      5300  0.304        0.844   0.755        1.99        2.59    4:00  
##      5400  0.302        0.841   0.750        1.78        2.47    3:60  
##      5500  0.306        0.838   0.746        1.66        2.41    3:59  
##      5600  0.301        0.835   0.740        1.56        2.33    3:59  
##      5700  0.300        0.836   0.742        1.62        2.36    3:59  
##      5800  0.301        0.841   0.750        1.73        2.41    3:58  
##      5900  0.301        0.839   0.746        1.67        2.38    3:58  
##      6000  0.306        0.836   0.742        1.58        2.35    3:58  
##      6100  0.301        0.835   0.740        1.60        2.38    3:57  
##      6200  0.303        0.838   0.744        1.62        2.39    3:57  
##      6300  0.302        0.840   0.748        1.65        2.38    3:57  
##      6400  0.305        0.839   0.746        1.60        2.35    3:56  
##      6500  0.304        0.839   0.747        1.76        2.45    3:56  
##      6600  0.304        0.840   0.749        1.81        2.47    3:56  
##      6700  0.298        0.839   0.747        1.68        2.41    3:55  
##      6800  0.300        0.837   0.742        1.56        2.36    3:55  
##      6900  0.303        0.838   0.745        1.54        2.33    3:55  
##      7000  0.306        0.835   0.739        1.45        2.26    3:54  
##      7100  0.305        0.837   0.742        1.64        2.37    3:54  
##      7200  0.302        0.840   0.749        1.80        2.49    3:54  
##      7300  0.303        0.845   0.757        1.96        2.57    3:54  
##      7400  0.297        0.847   0.761        2.06        2.63    3:53  
##      7500  0.304        0.848   0.761        2.14        2.65    3:53  
##      7600  0.303        0.850   0.765        2.31        2.74    3:52  
##      7700  0.304        0.852   0.768        2.33        2.77    3:52  
##      7800  0.307        0.848   0.763        2.22        2.72    3:52  
##      7900  0.303        0.847   0.760        1.97        2.60    3:52  
##      8000  0.303        0.846   0.759        1.86        2.52    3:52  
##      8100  0.303        0.843   0.754        1.74        2.44    3:51  
##      8200  0.303        0.845   0.757        1.86        2.51    3:51  
##      8300  0.297        0.842   0.752        1.70        2.42    3:50  
##      8400  0.301        0.839   0.747        1.61        2.37    3:50  
##      8500  0.298        0.842   0.752        1.71        2.42    3:50  
##      8600  0.300        0.846   0.760        2.10        2.62    3:50  
##      8700  0.302        0.847   0.760        2.05        2.61    3:49  
##      8800  0.304        0.845   0.758        2.12        2.67    3:49  
##      8900  0.299        0.847   0.760        2.22        2.71    3:49  
##      9000  0.304        0.849   0.763        2.40        2.79    3:49  
##      9100  0.305        0.847   0.760        2.35        2.78    3:48  
##      9200  0.304        0.848   0.762        2.25        2.74    3:48  
##      9300  0.302        0.846   0.760        2.16        2.69    3:48  
##      9400  0.300        0.847   0.761        2.20        2.71    3:48  
##      9500  0.307        0.850   0.765        2.39        2.83    3:47  
##      9600  0.304        0.852   0.768        2.47        2.88    3:47  
##      9700  0.302        0.854   0.772        2.67        2.96    3:47  
##      9800  0.298        0.853   0.771        2.51        2.86    3:47  
##      9900  0.299        0.850   0.766        2.21        2.71    3:47  
##     10000  0.304        0.849   0.763        2.02        2.61    3:46  
##     10100  0.299        0.844   0.755        1.85        2.51    3:46  
##     10200  0.304        0.844   0.754        1.85        2.50    3:46  
##     10300  0.303        0.844   0.756        2.03        2.63    3:46  
##     10400  0.302        0.843   0.754        1.80        2.51    3:45  
##     10500  0.298        0.842   0.753        1.85        2.52    3:45  
##     10600  0.303        0.841   0.751        1.79        2.50    3:45  
##     10700  0.305        0.840   0.748        1.87        2.53    3:45  
##     10800  0.302        0.840   0.748        1.85        2.51    3:44  
##     10900  0.302        0.839   0.746        1.71        2.42    3:44  
##     11000  0.301        0.842   0.753        1.73        2.44    3:44  
##     11100  0.305        0.844   0.755        1.84        2.52    3:44  
##     11200  0.301        0.846   0.759        1.94        2.57    3:44  
##     11300  0.306        0.847   0.760        1.97        2.60    3:43  
##     11400  0.305        0.845   0.757        2.05        2.65    3:43  
##     11500  0.301        0.845   0.757        2.08        2.67    3:43  
##     11600  0.304        0.849   0.764        2.17        2.72    3:43  
##     11700  0.305        0.849   0.765        2.19        2.69    3:43  
##     11800  0.306        0.845   0.757        1.95        2.55    3:43  
##     11900  0.299        0.845   0.756        1.97        2.56    3:42  
##     12000  0.301        0.843   0.754        1.82        2.48    3:42  
##     12100  0.305        0.844   0.755        1.72        2.43    3:42  
##     12200  0.300        0.841   0.751        1.61        2.37    3:42  
##     12300  0.300        0.838   0.746        1.62        2.43    3:41  
##     12400  0.302        0.839   0.746        1.63        2.42    3:41  
##     12500  0.302        0.840   0.749        1.69        2.44    3:41  
##     12600  0.302        0.842   0.752        1.76        2.47    3:41  
##     12700  0.303        0.844   0.756        1.97        2.57    3:41  
##     12800  0.305        0.845   0.757        2.11        2.64    3:40  
##     12900  0.302        0.844   0.755        2.12        2.66    3:40  
##     13000  0.303        0.840   0.748        1.82        2.49    3:40  
##     13100  0.304        0.840   0.748        1.86        2.50    3:40  
##     13200  0.298        0.842   0.753        1.97        2.55    3:40  
##     13300  0.305        0.845   0.757        2.11        2.63    3:39  
##     13400  0.304        0.844   0.756        2.00        2.58    3:39  
##     13500  0.302        0.841   0.750        1.77        2.45    3:39  
##     13600  0.304        0.835   0.740        1.49        2.29    3:39  
##     13700  0.301        0.833   0.737        1.47        2.29    3:38  
##     13800  0.302        0.835   0.740        1.47        2.29    3:38  
##     13900  0.308        0.836   0.742        1.48        2.26    3:38  
##     14000  0.302        0.838   0.745        1.66        2.36    3:38  
##     14100  0.302        0.842   0.752        1.94        2.53    3:38  
##     14200  0.304        0.844   0.755        2.05        2.60    3:37  
##     14300  0.307        0.844   0.755        1.96        2.59    3:37  
##     14400  0.302        0.839   0.746        1.76        2.44    3:37  
##     14500  0.306        0.840   0.749        1.75        2.46    3:37  
##     14600  0.300        0.839   0.747        1.62        2.39    3:36  
##     14700  0.300        0.838   0.746        1.68        2.42    3:36  
##     14800  0.306        0.837   0.743        1.63        2.39    3:36  
##     14900  0.307        0.836   0.742        1.59        2.35    3:36  
##     15000  0.303        0.837   0.744        1.55        2.32    3:35  
##     15100  0.299        0.835   0.740        1.44        2.23    3:35  
##     15200  0.305        0.834   0.737        1.45        2.25    3:35  
##     15300  0.306        0.833   0.736        1.39        2.23    3:35  
##     15400  0.303        0.832   0.734        1.38        2.20    3:35  
##     15500  0.297        0.835   0.740        1.52        2.30    3:34  
##     15600  0.299        0.837   0.743        1.57        2.35    3:34  
##     15700  0.301        0.837   0.744        1.61        2.38    3:34  
##     15800  0.298        0.838   0.745        1.66        2.37    3:34  
##     15900  0.305        0.836   0.742        1.59        2.33    3:33  
##     16000  0.304        0.835   0.739        1.52        2.31    3:33  
##     16100  0.305        0.837   0.744        1.67        2.40    3:33  
##     16200  0.302        0.843   0.753        1.82        2.50    3:33  
##     16300  0.303        0.842   0.752        1.83        2.50    3:32  
##     16400  0.304        0.842   0.752        1.86        2.55    3:32  
##     16500  0.301        0.844   0.755        1.86        2.56    3:32  
##     16600  0.302        0.843   0.754        1.78        2.48    3:32  
##     16700  0.302        0.845   0.756        1.83        2.53    3:32  
##     16800  0.299        0.845   0.756        1.92        2.56    3:31  
##     16900  0.305        0.845   0.757        2.11        2.68    3:31  
##     17000  0.300        0.845   0.757        2.04        2.64    3:31  
##     17100  0.302        0.849   0.763        2.19        2.73    3:31  
##     17200  0.298        0.848   0.763        2.20        2.71    3:31  
##     17300  0.301        0.851   0.767        2.26        2.73    3:30  
##     17400  0.305        0.848   0.762        2.11        2.66    3:30  
##     17500  0.303        0.849   0.764        1.99        2.60    3:30  
##     17600  0.301        0.847   0.760        1.91        2.54    3:30  
##     17700  0.295        0.844   0.756        1.85        2.48    3:30  
##     17800  0.303        0.844   0.756        1.77        2.42    3:29  
##     17900  0.305        0.842   0.752        1.79        2.47    3:29  
##     18000  0.300        0.843   0.753        1.89        2.54    3:29  
##     18100  0.306        0.844   0.756        1.91        2.56    3:29  
##     18200  0.305        0.843   0.753        1.85        2.53    3:28  
##     18300  0.303        0.845   0.757        1.94        2.59    3:28  
##     18400  0.297        0.851   0.766        2.41        2.82    3:28  
##     18500  0.306        0.854   0.772        2.72        2.95    3:28  
##     18600  0.306        0.851   0.767        2.42        2.83    3:28  
##     18700  0.300        0.848   0.762        2.36        2.79    3:27  
##     18800  0.304        0.849   0.763        2.41        2.83    3:27  
##     18900  0.305        0.849   0.763        2.39        2.82    3:27  
##     19000  0.297        0.848   0.762        2.22        2.74    3:27  
##     19100  0.307        0.847   0.760        2.06        2.64    3:27  
##     19200  0.305        0.847   0.761        1.99        2.59    3:26  
##     19300  0.304        0.846   0.759        1.93        2.58    3:26  
##     19400  0.302        0.845   0.758        2.00        2.60    3:26  
##     19500  0.307        0.844   0.755        1.89        2.52    3:26  
##     19600  0.306        0.845   0.757        1.98        2.55    3:26  
##     19700  0.297        0.845   0.756        1.95        2.52    3:25  
##     19800  0.298        0.842   0.751        1.80        2.48    3:25  
##     19900  0.306        0.838   0.746        1.63        2.39    3:25  
##     20000  0.306        0.837   0.744        1.64        2.38    3:25  
##     20100  0.301        0.835   0.740        1.64        2.37    3:24  
##     20200  0.302        0.833   0.737        1.44        2.24    3:24  
##     20300  0.298        0.835   0.739        1.50        2.29    3:24  
##     20400  0.306        0.839   0.747        1.73        2.43    3:24  
##     20500  0.297        0.839   0.747        1.91        2.53    3:24  
##     20600  0.300        0.840   0.748        1.82        2.50    3:23  
##     20700  0.300        0.835   0.740        1.58        2.35    3:23  
##     20800  0.305        0.835   0.740        1.60        2.36    3:23  
##     20900  0.306        0.836   0.742        1.67        2.40    3:23  
##     21000  0.303        0.837   0.743        1.77        2.46    3:22  
##     21100  0.302        0.839   0.746        1.72        2.42    3:22  
##     21200  0.301        0.836   0.741        1.57        2.32    3:22  
##     21300  0.301        0.838   0.746        1.64        2.37    3:22  
##     21400  0.302        0.841   0.750        1.83        2.50    3:22  
##     21500  0.304        0.843   0.754        1.80        2.49    3:21  
##     21600  0.300        0.845   0.756        1.83        2.50    3:21  
##     21700  0.298        0.845   0.756        2.01        2.60    3:21  
##     21800  0.306        0.840   0.748        1.78        2.48    3:21  
##     21900  0.301        0.843   0.753        1.84        2.54    3:21  
##     22000  0.304        0.845   0.756        1.94        2.59    3:20  
##     22100  0.301        0.842   0.752        1.92        2.58    3:20  
##     22200  0.307        0.841   0.750        1.75        2.49    3:20  
##     22300  0.297        0.837   0.743        1.66        2.42    3:20  
##     22400  0.304        0.837   0.744        1.65        2.38    3:20  
##     22500  0.305        0.836   0.741        1.59        2.35    3:19  
##     22600  0.303        0.838   0.744        1.70        2.42    3:19  
##     22700  0.304        0.839   0.747        1.75        2.47    3:19  
##     22800  0.308        0.840   0.748        1.79        2.47    3:19  
##     22900  0.302        0.840   0.748        1.77        2.47    3:18  
##     23000  0.304        0.839   0.747        1.64        2.38    3:18  
##     23100  0.298        0.836   0.741        1.54        2.32    3:18  
##     23200  0.305        0.833   0.736        1.49        2.30    3:18  
##     23300  0.302        0.831   0.733        1.53        2.33    3:18  
##     23400  0.300        0.836   0.741        1.64        2.37    3:18  
##     23500  0.300        0.837   0.744        1.59        2.34    3:17  
##     23600  0.304        0.837   0.744        1.59        2.34    3:17  
##     23700  0.304        0.839   0.747        1.63        2.35    3:17  
##     23800  0.300        0.836   0.742        1.61        2.35    3:17  
##     23900  0.302        0.832   0.735        1.39        2.22    3:16  
##     24000  0.303        0.833   0.737        1.42        2.22    3:16  
##     24100  0.302        0.837   0.744        1.46        2.27    3:16  
##     24200  0.303        0.836   0.742        1.52        2.30    3:16  
##     24300  0.301        0.840   0.748        1.62        2.36    3:16  
##     24400  0.307        0.843   0.753        1.83        2.48    3:15  
##     24500  0.310        0.845   0.758        1.97        2.57    3:15  
##     24600  0.304        0.846   0.758        2.07        2.63    3:15  
##     24700  0.302        0.842   0.753        1.90        2.51    3:15  
##     24800  0.301        0.844   0.755        1.93        2.55    3:15  
##     24900  0.301        0.842   0.752        1.98        2.60    3:14  
##     25000  0.303        0.842   0.753        2.01        2.60    3:14  
##     25100  0.305        0.843   0.754        2.00        2.56    3:14  
##     25200  0.301        0.842   0.752        1.99        2.56    3:14  
##     25300  0.305        0.842   0.752        1.92        2.55    3:14  
##     25400  0.305        0.843   0.754        1.85        2.54    3:13  
##     25500  0.301        0.844   0.755        1.92        2.57    3:13  
##     25600  0.299        0.843   0.754        1.91        2.56    3:13  
##     25700  0.303        0.846   0.758        1.99        2.58    3:13  
##     25800  0.303        0.842   0.751        1.94        2.53    3:13  
##     25900  0.307        0.842   0.752        1.88        2.52    3:12  
##     26000  0.304        0.841   0.751        1.84        2.49    3:12  
##     26100  0.303        0.839   0.748        1.70        2.39    3:12  
##     26200  0.306        0.841   0.751        1.71        2.43    3:12  
##     26300  0.307        0.840   0.748        1.76        2.48    3:12  
##     26400  0.304        0.841   0.750        1.92        2.56    3:11  
##     26500  0.302        0.844   0.755        2.00        2.61    3:11  
##     26600  0.303        0.840   0.749        1.77        2.46    3:11  
##     26700  0.304        0.839   0.747        1.72        2.43    3:11  
##     26800  0.302        0.841   0.750        1.93        2.53    3:11  
##     26900  0.302        0.844   0.755        2.00        2.59    3:10  
##     27000  0.298        0.844   0.756        1.97        2.57    3:10  
##     27100  0.302        0.841   0.751        1.92        2.54    3:10  
##     27200  0.303        0.838   0.745        1.79        2.46    3:10  
##     27300  0.298        0.840   0.749        1.83        2.48    3:10  
##     27400  0.298        0.842   0.752        1.83        2.47    3:10  
##     27500  0.304        0.845   0.756        1.84        2.51    3:09  
##     27600  0.300        0.847   0.760        1.90        2.53    3:09  
##     27700  0.300        0.844   0.755        1.91        2.51    3:09  
##     27800  0.303        0.842   0.752        1.78        2.45    3:09  
##     27900  0.304        0.841   0.749        1.71        2.41    3:09  
##     28000  0.302        0.839   0.746        1.60        2.36    3:08  
##     28100  0.303        0.836   0.742        1.53        2.32    3:08  
##     28200  0.295        0.835   0.739        1.46        2.28    3:08  
##     28300  0.302        0.836   0.742        1.54        2.29    3:08  
##     28400  0.302        0.836   0.741        1.55        2.33    3:08  
##     28500  0.304        0.840   0.748        1.74        2.44    3:07  
##     28600  0.304        0.843   0.753        1.94        2.56    3:07  
##     28700  0.303        0.846   0.760        2.14        2.65    3:07  
##     28800  0.302        0.845   0.757        2.01        2.59    3:07  
##     28900  0.302        0.843   0.754        1.87        2.52    3:07  
##     29000  0.307        0.843   0.753        1.77        2.46    3:06  
##     29100  0.302        0.847   0.760        1.85        2.52    3:06  
##     29200  0.306        0.845   0.756        1.83        2.53    3:06  
##     29300  0.302        0.846   0.758        1.95        2.56    3:06  
##     29400  0.303        0.847   0.761        2.09        2.62    3:06  
##     29500  0.300        0.850   0.766        2.22        2.70    3:05  
##     29600  0.302        0.852   0.768        2.30        2.76    3:05  
##     29700  0.306        0.846   0.758        2.19        2.71    3:05  
##     29800  0.300        0.849   0.763        2.16        2.71    3:05  
##     29900  0.300        0.848   0.763        2.21        2.73    3:05  
##     30000  0.301        0.848   0.762        2.16        2.71    3:04  
##     30100  0.306        0.844   0.756        2.00        2.61    3:04  
##     30200  0.301        0.844   0.755        1.91        2.57    3:04  
##     30300  0.305        0.842   0.752        1.91        2.56    3:04  
##     30400  0.302        0.843   0.753        1.88        2.56    3:04  
##     30500  0.303        0.843   0.753        1.78        2.47    3:03  
##     30600  0.308        0.843   0.754        1.68        2.40    3:03  
##     30700  0.302        0.839   0.747        1.65        2.36    3:03  
##     30800  0.305        0.836   0.741        1.54        2.31    3:03  
##     30900  0.302        0.834   0.738        1.41        2.24    3:03  
##     31000  0.305        0.836   0.742        1.45        2.25    3:02  
##     31100  0.303        0.837   0.744        1.48        2.27    3:02  
##     31200  0.307        0.833   0.737        1.33        2.17    3:02  
##     31300  0.299        0.835   0.740        1.45        2.26    3:02  
##     31400  0.298        0.837   0.744        1.49        2.31    3:02  
##     31500  0.304        0.838   0.744        1.63        2.37    3:01  
##     31600  0.300        0.839   0.747        1.71        2.45    3:01  
##     31700  0.305        0.843   0.753        1.81        2.51    3:01  
##     31800  0.299        0.840   0.749        1.86        2.52    3:01  
##     31900  0.305        0.837   0.742        1.65        2.38    3:01  
##     32000  0.302        0.838   0.744        1.66        2.39    3:00  
##     32100  0.305        0.839   0.747        1.74        2.43    3:00  
##     32200  0.308        0.838   0.745        1.61        2.35    2:60  
##     32300  0.300        0.840   0.749        1.68        2.40    2:60  
##     32400  0.304        0.843   0.753        1.81        2.47    2:60  
##     32500  0.303        0.845   0.757        1.94        2.58    2:59  
##     32600  0.301        0.841   0.750        1.86        2.51    2:59  
##     32700  0.304        0.838   0.746        1.79        2.46    2:59  
##     32800  0.305        0.835   0.740        1.68        2.40    2:59  
##     32900  0.304        0.837   0.743        1.69        2.41    2:59  
##     33000  0.303        0.841   0.749        1.72        2.42    2:58  
##     33100  0.304        0.840   0.748        1.68        2.40    2:58  
##     33200  0.303        0.841   0.749        1.79        2.45    2:58  
##     33300  0.300        0.844   0.756        1.89        2.52    2:58  
##     33400  0.305        0.842   0.752        1.78        2.47    2:58  
##     33500  0.302        0.838   0.745        1.61        2.33    2:57  
##     33600  0.302        0.840   0.748        1.68        2.40    2:57  
##     33700  0.303        0.838   0.745        1.69        2.40    2:57  
##     33800  0.297        0.837   0.742        1.61        2.34    2:57  
##     33900  0.303        0.839   0.747        1.81        2.44    2:57  
##     34000  0.299        0.838   0.746        1.62        2.35    2:56  
##     34100  0.303        0.837   0.743        1.48        2.27    2:56  
##     34200  0.302        0.839   0.747        1.56        2.30    2:56  
##     34300  0.305        0.841   0.749        1.67        2.36    2:56  
##     34400  0.306        0.839   0.747        1.66        2.37    2:56  
##     34500  0.300        0.840   0.748        1.74        2.44    2:55  
##     34600  0.303        0.843   0.754        1.81        2.49    2:55  
##     34700  0.301        0.843   0.754        1.91        2.54    2:55  
##     34800  0.307        0.840   0.748        1.83        2.50    2:55  
##     34900  0.298        0.837   0.743        1.73        2.41    2:55  
##     35000  0.303        0.833   0.737        1.48        2.26    2:54  
##     35100  0.303        0.837   0.743        1.49        2.27    2:54  
##     35200  0.301        0.842   0.751        1.67        2.39    2:54  
##     35300  0.305        0.838   0.745        1.66        2.38    2:54  
##     35400  0.301        0.838   0.745        1.63        2.33    2:54  
##     35500  0.301        0.837   0.743        1.48        2.27    2:53  
##     35600  0.304        0.838   0.745        1.57        2.34    2:53  
##     35700  0.300        0.840   0.748        1.62        2.34    2:53  
##     35800  0.301        0.842   0.751        1.81        2.45    2:53  
##     35900  0.305        0.844   0.756        1.99        2.57    2:53  
##     36000  0.300        0.851   0.767        2.30        2.77    2:52  
##     36100  0.306        0.851   0.767        2.28        2.75    2:52  
##     36200  0.303        0.848   0.761        1.96        2.56    2:52  
##     36300  0.298        0.845   0.757        1.82        2.47    2:52  
##     36400  0.304        0.844   0.755        1.73        2.43    2:52  
##     36500  0.304        0.844   0.756        1.80        2.50    2:51  
##     36600  0.301        0.843   0.753        1.80        2.49    2:51  
##     36700  0.299        0.839   0.747        1.65        2.40    2:51  
##     36800  0.302        0.835   0.739        1.57        2.34    2:51  
##     36900  0.301        0.836   0.741        1.62        2.34    2:51  
##     37000  0.301        0.838   0.745        1.65        2.36    2:50  
##     37100  0.306        0.838   0.744        1.63        2.37    2:50  
##     37200  0.303        0.841   0.750        1.67        2.37    2:50  
##     37300  0.309        0.843   0.754        1.87        2.50    2:50  
##     37400  0.299        0.845   0.756        2.00        2.59    2:50  
##     37500  0.306        0.845   0.756        1.90        2.56    2:49  
##     37600  0.300        0.841   0.751        1.83        2.50    2:49  
##     37700  0.302        0.840   0.748        1.73        2.41    2:49  
##     37800  0.301        0.841   0.751        1.77        2.44    2:49  
##     37900  0.302        0.841   0.750        1.93        2.56    2:49  
##     38000  0.303        0.844   0.755        2.03        2.63    2:48  
##     38100  0.298        0.841   0.751        2.01        2.60    2:48  
##     38200  0.295        0.843   0.754        1.86        2.50    2:48  
##     38300  0.299        0.846   0.758        2.07        2.63    2:48  
##     38400  0.303        0.846   0.759        2.27        2.72    2:48  
##     38500  0.305        0.844   0.755        2.02        2.61    2:47  
##     38600  0.307        0.841   0.749        1.85        2.52    2:47  
##     38700  0.300        0.839   0.747        1.83        2.49    2:47  
##     38800  0.299        0.842   0.751        1.84        2.52    2:47  
##     38900  0.300        0.838   0.745        1.75        2.43    2:47  
##     39000  0.305        0.839   0.747        1.72        2.41    2:46  
##     39100  0.304        0.838   0.745        1.65        2.38    2:46  
##     39200  0.306        0.839   0.746        1.71        2.44    2:46  
##     39300  0.303        0.843   0.754        1.86        2.53    2:46  
##     39400  0.306        0.845   0.757        1.87        2.53    2:46  
##     39500  0.305        0.841   0.749        1.75        2.45    2:45  
##     39600  0.297        0.843   0.754        1.88        2.54    2:45  
##     39700  0.298        0.842   0.751        1.89        2.55    2:45  
##     39800  0.301        0.842   0.752        1.91        2.55    2:45  
##     39900  0.303        0.841   0.750        1.77        2.45    2:45  
##     40000  0.304        0.840   0.749        1.83        2.48    2:45  
##     40100  0.301        0.839   0.748        1.67        2.39    2:44  
##     40200  0.301        0.838   0.745        1.58        2.32    2:44  
##     40300  0.305        0.834   0.738        1.37        2.18    2:44  
##     40400  0.306        0.834   0.738        1.41        2.21    2:44  
##     40500  0.305        0.837   0.744        1.52        2.28    2:44  
##     40600  0.306        0.841   0.749        1.67        2.36    2:43  
##     40700  0.304        0.839   0.747        1.54        2.31    2:43  
##     40800  0.299        0.839   0.746        1.61        2.36    2:43  
##     40900  0.300        0.839   0.747        1.70        2.43    2:43  
##     41000  0.301        0.843   0.754        1.89        2.52    2:43  
##     41100  0.305        0.843   0.754        1.86        2.50    2:42  
##     41200  0.302        0.838   0.745        1.67        2.39    2:42  
##     41300  0.299        0.838   0.745        1.64        2.37    2:42  
##     41400  0.301        0.840   0.748        1.77        2.46    2:42  
##     41500  0.300        0.845   0.757        1.98        2.58    2:42  
##     41600  0.304        0.840   0.749        1.94        2.57    2:41  
##     41700  0.300        0.841   0.751        1.84        2.49    2:41  
##     41800  0.301        0.843   0.753        1.82        2.49    2:41  
##     41900  0.299        0.844   0.755        1.88        2.54    2:41  
##     42000  0.302        0.841   0.750        1.82        2.47    2:41  
##     42100  0.303        0.837   0.743        1.64        2.36    2:40  
##     42200  0.299        0.833   0.737        1.60        2.36    2:40  
##     42300  0.305        0.832   0.735        1.54        2.31    2:40  
##     42400  0.305        0.834   0.738        1.52        2.30    2:40  
##     42500  0.301        0.837   0.743        1.65        2.39    2:40  
##     42600  0.299        0.842   0.753        1.79        2.47    2:39  
##     42700  0.302        0.844   0.755        1.98        2.59    2:39  
##     42800  0.297        0.844   0.755        1.96        2.57    2:39  
##     42900  0.300        0.841   0.751        1.80        2.47    2:39  
##     43000  0.301        0.839   0.747        1.66        2.39    2:39  
##     43100  0.297        0.839   0.746        1.70        2.38    2:38  
##     43200  0.301        0.844   0.755        1.75        2.45    2:38  
##     43300  0.305        0.844   0.755        1.79        2.49    2:38  
##     43400  0.304        0.843   0.754        1.81        2.52    2:38  
##     43500  0.298        0.843   0.754        1.86        2.53    2:38  
##     43600  0.305        0.843   0.753        1.92        2.56    2:37  
##     43700  0.305        0.841   0.751        1.88        2.51    2:37  
##     43800  0.299        0.839   0.746        1.68        2.39    2:37  
##     43900  0.301        0.842   0.752        1.80        2.47    2:37  
##     44000  0.301        0.845   0.756        1.89        2.52    2:37  
##     44100  0.304        0.842   0.751        1.68        2.42    2:37  
##     44200  0.305        0.839   0.746        1.54        2.34    2:36  
##     44300  0.302        0.839   0.747        1.52        2.32    2:36  
##     44400  0.303        0.841   0.749        1.70        2.43    2:36  
##     44500  0.300        0.841   0.751        1.84        2.54    2:36  
##     44600  0.301        0.844   0.755        2.04        2.64    2:35  
##     44700  0.304        0.851   0.768        2.41        2.81    2:35  
##     44800  0.301        0.851   0.768        2.43        2.82    2:35  
##     44900  0.304        0.847   0.760        2.28        2.74    2:35  
##     45000  0.301        0.840   0.749        1.87        2.50    2:35  
##     45100  0.297        0.841   0.750        1.92        2.55    2:35  
##     45200  0.306        0.842   0.752        1.90        2.53    2:34  
##     45300  0.303        0.843   0.754        1.86        2.53    2:34  
##     45400  0.304        0.845   0.756        1.87        2.56    2:34  
##     45500  0.299        0.844   0.755        1.97        2.60    2:34  
##     45600  0.305        0.846   0.759        1.97        2.59    2:34  
##     45700  0.302        0.845   0.757        2.00        2.63    2:33  
##     45800  0.303        0.843   0.753        1.90        2.54    2:33  
##     45900  0.304        0.842   0.752        1.86        2.49    2:33  
##     46000  0.302        0.841   0.751        1.85        2.50    2:33  
##     46100  0.306        0.839   0.746        1.66        2.40    2:33  
##     46200  0.298        0.839   0.747        1.61        2.38    2:32  
##     46300  0.301        0.841   0.750        1.71        2.44    2:32  
##     46400  0.309        0.841   0.750        1.87        2.53    2:32  
##     46500  0.303        0.843   0.753        1.95        2.57    2:32  
##     46600  0.308        0.844   0.756        1.99        2.56    2:32  
##     46700  0.306        0.841   0.750        1.82        2.46    2:31  
##     46800  0.301        0.837   0.744        1.58        2.33    2:31  
##     46900  0.298        0.836   0.742        1.49        2.29    2:31  
##     47000  0.303        0.842   0.752        1.74        2.46    2:31  
##     47100  0.300        0.844   0.755        1.91        2.55    2:31  
##     47200  0.303        0.843   0.754        1.83        2.52    2:30  
##     47300  0.300        0.841   0.751        1.75        2.45    2:30  
##     47400  0.303        0.840   0.748        1.84        2.50    2:30  
##     47500  0.301        0.840   0.749        1.73        2.44    2:30  
##     47600  0.304        0.838   0.744        1.73        2.45    2:30  
##     47700  0.304        0.843   0.754        1.95        2.59    2:29  
##     47800  0.300        0.845   0.757        2.03        2.61    2:29  
##     47900  0.303        0.844   0.755        2.11        2.64    2:29  
##     48000  0.303        0.843   0.753        1.92        2.52    2:29  
##     48100  0.304        0.840   0.748        1.78        2.44    2:29  
##     48200  0.303        0.843   0.753        1.91        2.53    2:29  
##     48300  0.299        0.845   0.756        1.95        2.55    2:29  
##     48400  0.305        0.846   0.759        2.06        2.62    2:28  
##     48500  0.301        0.845   0.756        2.19        2.68    2:28  
##     48600  0.302        0.840   0.749        1.85        2.50    2:28  
##     48700  0.304        0.836   0.742        1.61        2.35    2:28  
##     48800  0.298        0.841   0.749        1.65        2.36    2:28  
##     48900  0.303        0.841   0.750        1.78        2.42    2:27  
##     49000  0.299        0.841   0.750        1.90        2.49    2:27  
##     49100  0.298        0.843   0.753        1.85        2.49    2:27  
##     49200  0.302        0.839   0.747        1.72        2.43    2:27  
##     49300  0.305        0.841   0.750        1.83        2.51    2:27  
##     49400  0.300        0.841   0.751        2.06        2.63    2:26  
##     49500  0.306        0.842   0.752        2.07        2.62    2:26  
##     49600  0.302        0.840   0.749        1.87        2.52    2:26  
##     49700  0.304        0.841   0.751        1.79        2.48    2:26  
##     49800  0.301        0.841   0.750        1.81        2.47    2:26  
##     49900  0.299        0.842   0.752        1.86        2.51    2:25  
##     50000  0.307        0.846   0.759        2.02        2.60    2:25  
##     50100  0.301        0.846   0.758        2.03        2.61    2:25  
##     50200  0.302        0.844   0.756        2.16        2.67    2:25  
##     50300  0.300        0.844   0.755        2.09        2.64    2:25  
##     50400  0.306        0.840   0.748        1.82        2.49    2:24  
##     50500  0.303        0.842   0.752        1.79        2.49    2:24  
##     50600  0.301        0.841   0.751        1.78        2.45    2:24  
##     50700  0.307        0.840   0.749        1.80        2.47    2:24  
##     50800  0.301        0.837   0.744        1.72        2.44    2:24  
##     50900  0.299        0.835   0.739        1.57        2.36    2:23  
##     51000  0.300        0.833   0.736        1.47        2.30    2:23  
##     51100  0.305        0.833   0.736        1.51        2.32    2:23  
##     51200  0.301        0.836   0.741        1.58        2.36    2:23  
##     51300  0.303        0.837   0.744        1.52        2.30    2:23  
##     51400  0.300        0.835   0.740        1.52        2.29    2:23  
##     51500  0.302        0.837   0.743        1.55        2.32    2:22  
##     51600  0.304        0.837   0.744        1.71        2.41    2:22  
##     51700  0.299        0.841   0.751        1.76        2.44    2:22  
##     51800  0.305        0.842   0.752        1.81        2.50    2:22  
##     51900  0.304        0.841   0.751        1.84        2.49    2:22  
##     52000  0.303        0.844   0.755        1.84        2.48    2:21  
##     52100  0.303        0.843   0.754        1.94        2.54    2:21  
##     52200  0.298        0.842   0.752        1.87        2.55    2:21  
##     52300  0.302        0.841   0.750        1.85        2.52    2:21  
##     52400  0.304        0.839   0.746        1.77        2.46    2:21  
##     52500  0.306        0.842   0.751        1.86        2.50    2:20  
##     52600  0.303        0.839   0.747        1.77        2.44    2:20  
##     52700  0.302        0.838   0.745        1.75        2.44    2:20  
##     52800  0.300        0.838   0.745        1.69        2.41    2:20  
##     52900  0.301        0.841   0.751        1.76        2.46    2:20  
##     53000  0.305        0.839   0.747        1.71        2.42    2:19  
##     53100  0.306        0.838   0.745        1.60        2.37    2:19  
##     53200  0.296        0.841   0.750        1.79        2.48    2:19  
##     53300  0.298        0.842   0.752        1.84        2.50    2:19  
##     53400  0.298        0.844   0.756        1.98        2.58    2:19  
##     53500  0.301        0.844   0.755        1.96        2.58    2:18  
##     53600  0.302        0.843   0.754        1.99        2.57    2:18  
##     53700  0.300        0.848   0.762        2.19        2.68    2:18  
##     53800  0.305        0.847   0.761        2.16        2.66    2:18  
##     53900  0.299        0.847   0.760        2.23        2.69    2:18  
##     54000  0.299        0.842   0.752        1.93        2.53    2:17  
##     54100  0.298        0.839   0.746        1.80        2.46    2:17  
##     54200  0.303        0.839   0.746        1.75        2.42    2:17  
##     54300  0.300        0.834   0.738        1.46        2.25    2:17  
##     54400  0.308        0.836   0.742        1.54        2.32    2:17  
##     54500  0.303        0.842   0.751        1.78        2.44    2:17  
##     54600  0.304        0.846   0.759        2.00        2.57    2:16  
##     54700  0.301        0.848   0.761        2.07        2.61    2:16  
##     54800  0.298        0.848   0.762        2.20        2.70    2:16  
##     54900  0.307        0.846   0.759        1.99        2.59    2:16  
##     55000  0.303        0.843   0.754        1.88        2.53    2:16  
##     55100  0.300        0.842   0.752        1.78        2.48    2:15  
##     55200  0.303        0.842   0.752        1.87        2.55    2:15  
##     55300  0.300        0.845   0.757        2.11        2.66    2:15  
##     55400  0.302        0.849   0.763        2.36        2.79    2:15  
##     55500  0.303        0.848   0.762        2.14        2.69    2:15  
##     55600  0.302        0.849   0.764        2.16        2.70    2:14  
##     55700  0.301        0.849   0.765        2.18        2.70    2:14  
##     55800  0.301        0.849   0.765        2.16        2.70    2:14  
##     55900  0.299        0.844   0.756        2.01        2.61    2:14  
##     56000  0.302        0.841   0.750        1.86        2.51    2:14  
##     56100  0.305        0.840   0.749        1.63        2.38    2:13  
##     56200  0.302        0.839   0.747        1.54        2.29    2:13  
##     56300  0.297        0.836   0.741        1.52        2.30    2:13  
##     56400  0.300        0.836   0.742        1.53        2.31    2:13  
##     56500  0.304        0.841   0.750        1.64        2.38    2:13  
##     56600  0.301        0.842   0.753        1.76        2.47    2:12  
##     56700  0.300        0.842   0.751        1.85        2.53    2:12  
##     56800  0.302        0.842   0.751        1.92        2.55    2:12  
##     56900  0.303        0.842   0.752        1.87        2.53    2:12  
##     57000  0.299        0.841   0.750        1.76        2.45    2:12  
##     57100  0.300        0.839   0.747        1.64        2.39    2:12  
##     57200  0.304        0.836   0.742        1.60        2.32    2:11  
##     57300  0.303        0.833   0.736        1.47        2.24    2:11  
##     57400  0.303        0.836   0.742        1.53        2.31    2:11  
##     57500  0.307        0.841   0.750        1.66        2.39    2:11  
##     57600  0.300        0.843   0.753        1.73        2.43    2:11  
##     57700  0.299        0.840   0.748        1.82        2.48    2:10  
##     57800  0.302        0.839   0.747        1.80        2.48    2:10  
##     57900  0.301        0.838   0.746        1.74        2.44    2:10  
##     58000  0.304        0.837   0.744        1.63        2.39    2:10  
##     58100  0.303        0.837   0.743        1.61        2.39    2:10  
##     58200  0.304        0.834   0.738        1.51        2.32    2:09  
##     58300  0.304        0.832   0.734        1.36        2.20    2:09  
##     58400  0.303        0.831   0.733        1.34        2.18    2:09  
##     58500  0.300        0.834   0.739        1.47        2.28    2:09  
##     58600  0.300        0.836   0.742        1.49        2.30    2:09  
##     58700  0.304        0.839   0.747        1.68        2.40    2:08  
##     58800  0.302        0.837   0.743        1.61        2.35    2:08  
##     58900  0.300        0.837   0.743        1.60        2.35    2:08  
##     59000  0.304        0.839   0.747        1.57        2.34    2:08  
##     59100  0.301        0.840   0.749        1.61        2.34    2:08  
##     59200  0.302        0.838   0.746        1.64        2.37    2:07  
##     59300  0.302        0.839   0.747        1.65        2.41    2:07  
##     59400  0.303        0.839   0.746        1.60        2.37    2:07  
##     59500  0.300        0.839   0.746        1.61        2.37    2:07  
##     59600  0.302        0.839   0.746        1.77        2.44    2:07  
##     59700  0.300        0.839   0.747        1.69        2.39    2:07  
##     59800  0.302        0.834   0.738        1.65        2.39    2:06  
##     59900  0.302        0.830   0.731        1.54        2.33    2:06  
##     60000  0.307        0.832   0.735        1.53        2.31    2:06  
##     60100  0.301        0.833   0.737        1.43        2.25    2:06  
##     60200  0.300        0.833   0.737        1.36        2.20    2:06  
##     60300  0.308        0.832   0.735        1.32        2.17    2:05  
##     60400  0.304        0.834   0.739        1.39        2.21    2:05  
##     60500  0.304        0.836   0.741        1.50        2.30    2:05  
##     60600  0.300        0.840   0.749        1.64        2.39    2:05  
##     60700  0.302        0.842   0.753        1.96        2.55    2:05  
##     60800  0.307        0.841   0.750        1.85        2.49    2:04  
##     60900  0.302        0.840   0.748        1.72        2.42    2:04  
##     61000  0.303        0.841   0.749        1.75        2.43    2:04  
##     61100  0.303        0.843   0.753        1.87        2.52    2:04  
##     61200  0.303        0.845   0.758        1.99        2.60    2:04  
##     61300  0.304        0.844   0.756        1.99        2.60    2:03  
##     61400  0.302        0.848   0.762        2.08        2.67    2:03  
##     61500  0.304        0.851   0.767        2.24        2.74    2:03  
##     61600  0.302        0.847   0.761        2.07        2.64    2:03  
##     61700  0.301        0.847   0.761        2.16        2.65    2:03  
##     61800  0.305        0.845   0.758        2.04        2.60    2:02  
##     61900  0.305        0.845   0.757        1.99        2.58    2:02  
##     62000  0.304        0.843   0.754        1.98        2.57    2:02  
##     62100  0.301        0.841   0.750        1.80        2.47    2:02  
##     62200  0.305        0.840   0.749        1.80        2.48    2:02  
##     62300  0.300        0.841   0.749        1.86        2.50    2:01  
##     62400  0.305        0.842   0.753        1.84        2.49    2:01  
##     62500  0.302        0.843   0.753        1.86        2.53    2:01  
##     62600  0.302        0.840   0.748        1.75        2.47    2:01  
##     62700  0.303        0.840   0.748        1.68        2.42    2:01  
##     62800  0.303        0.842   0.753        1.94        2.54    2:00  
##     62900  0.304        0.839   0.747        1.86        2.52    2:00  
##     63000  0.306        0.841   0.751        1.82        2.49    2:00  
##     63100  0.301        0.843   0.753        1.79        2.50    1:60  
##     63200  0.297        0.842   0.751        1.76        2.48    1:60  
##     63300  0.301        0.843   0.753        1.85        2.54    1:59  
##     63400  0.300        0.844   0.756        1.98        2.60    1:59  
##     63500  0.298        0.845   0.757        1.92        2.56    1:59  
##     63600  0.299        0.845   0.757        1.95        2.59    1:59  
##     63700  0.302        0.845   0.758        1.88        2.54    1:59  
##     63800  0.301        0.843   0.753        1.69        2.44    1:58  
##     63900  0.303        0.841   0.751        1.69        2.44    1:58  
##     64000  0.303        0.840   0.749        1.68        2.42    1:58  
##     64100  0.299        0.842   0.752        1.73        2.43    1:58  
##     64200  0.304        0.844   0.754        2.08        2.62    1:58  
##     64300  0.300        0.848   0.763        2.25        2.71    1:58  
##     64400  0.304        0.847   0.761        2.29        2.74    1:57  
##     64500  0.302        0.845   0.757        2.15        2.65    1:57  
##     64600  0.302        0.842   0.751        1.94        2.53    1:57  
##     64700  0.301        0.838   0.745        1.69        2.42    1:57  
##     64800  0.304        0.839   0.747        1.67        2.39    1:57  
##     64900  0.301        0.841   0.750        1.92        2.53    1:56  
##     65000  0.304        0.845   0.756        2.04        2.60    1:56  
##     65100  0.308        0.845   0.756        2.00        2.61    1:56  
##     65200  0.307        0.843   0.754        1.89        2.55    1:56  
##     65300  0.299        0.843   0.753        1.83        2.51    1:56  
##     65400  0.299        0.839   0.747        1.70        2.42    1:55  
##     65500  0.301        0.837   0.744        1.66        2.38    1:55  
##     65600  0.307        0.839   0.746        1.76        2.43    1:55  
##     65700  0.305        0.837   0.744        1.69        2.39    1:55  
##     65800  0.298        0.837   0.743        1.63        2.36    1:55  
##     65900  0.307        0.840   0.749        1.83        2.46    1:54  
##     66000  0.306        0.844   0.755        2.00        2.57    1:54  
##     66100  0.304        0.849   0.763        2.17        2.65    1:54  
##     66200  0.300        0.849   0.764        2.32        2.72    1:54  
##     66300  0.303        0.850   0.765        2.25        2.73    1:54  
##     66400  0.302        0.847   0.761        2.04        2.64    1:53  
##     66500  0.307        0.847   0.760        2.01        2.60    1:53  
##     66600  0.299        0.845   0.758        1.90        2.53    1:53  
##     66700  0.304        0.841   0.751        1.72        2.44    1:53  
##     66800  0.302        0.844   0.755        1.76        2.46    1:53  
##     66900  0.301        0.844   0.755        1.92        2.55    1:52  
##     67000  0.300        0.842   0.752        1.82        2.49    1:52  
##     67100  0.302        0.842   0.751        1.82        2.49    1:52  
##     67200  0.304        0.842   0.751        1.77        2.49    1:52  
##     67300  0.306        0.840   0.748        1.67        2.42    1:52  
##     67400  0.303        0.838   0.745        1.76        2.46    1:52  
##     67500  0.302        0.841   0.749        1.72        2.47    1:51  
##     67600  0.304        0.836   0.742        1.70        2.46    1:51  
##     67700  0.297        0.841   0.750        1.84        2.51    1:51  
##     67800  0.303        0.844   0.756        2.08        2.63    1:51  
##     67900  0.306        0.846   0.758        2.09        2.63    1:51  
##     68000  0.302        0.842   0.752        1.92        2.54    1:50  
##     68100  0.301        0.845   0.758        1.92        2.54    1:50  
##     68200  0.307        0.843   0.754        1.81        2.46    1:50  
##     68300  0.304        0.838   0.746        1.64        2.39    1:50  
##     68400  0.302        0.834   0.739        1.50        2.31    1:50  
##     68500  0.304        0.836   0.741        1.64        2.39    1:49  
##     68600  0.308        0.837   0.743        1.70        2.39    1:49  
##     68700  0.302        0.839   0.747        1.73        2.44    1:49  
##     68800  0.301        0.844   0.756        1.97        2.60    1:49  
##     68900  0.303        0.845   0.757        2.08        2.64    1:49  
##     69000  0.300        0.844   0.755        2.03        2.63    1:48  
##     69100  0.305        0.849   0.765        2.27        2.76    1:48  
##     69200  0.294        0.852   0.769        2.37        2.79    1:48  
##     69300  0.298        0.847   0.760        2.25        2.72    1:48  
##     69400  0.305        0.845   0.757        2.12        2.67    1:48  
##     69500  0.302        0.846   0.759        2.14        2.67    1:47  
##     69600  0.297        0.846   0.759        2.03        2.59    1:47  
##     69700  0.300        0.848   0.761        2.08        2.65    1:47  
##     69800  0.305        0.849   0.764        2.12        2.67    1:47  
##     69900  0.306        0.850   0.766        2.24        2.72    1:47  
##     70000  0.299        0.847   0.761        2.08        2.66    1:46  
##     70100  0.298        0.845   0.758        2.05        2.65    1:46  
##     70200  0.306        0.845   0.756        1.97        2.57    1:46  
##     70300  0.301        0.842   0.752        1.75        2.45    1:46  
##     70400  0.300        0.838   0.745        1.56        2.32    1:46  
##     70500  0.304        0.837   0.744        1.47        2.25    1:46  
##     70600  0.303        0.840   0.748        1.56        2.33    1:45  
##     70700  0.298        0.841   0.751        1.69        2.39    1:45  
##     70800  0.300        0.844   0.755        1.87        2.52    1:45  
##     70900  0.299        0.846   0.758        2.02        2.62    1:45  
##     71000  0.304        0.846   0.759        2.10        2.66    1:45  
##     71100  0.305        0.842   0.753        1.87        2.56    1:44  
##     71200  0.302        0.840   0.748        1.76        2.48    1:44  
##     71300  0.302        0.839   0.747        1.66        2.39    1:44  
##     71400  0.303        0.839   0.747        1.70        2.46    1:44  
##     71500  0.303        0.841   0.750        1.69        2.42    1:44  
##     71600  0.304        0.840   0.748        1.75        2.46    1:43  
##     71700  0.306        0.844   0.756        1.90        2.56    1:43  
##     71800  0.303        0.845   0.757        1.91        2.58    1:43  
##     71900  0.304        0.840   0.749        1.67        2.44    1:43  
##     72000  0.299        0.840   0.749        1.63        2.39    1:43  
##     72100  0.301        0.840   0.749        1.75        2.46    1:42  
##     72200  0.301        0.838   0.746        1.64        2.41    1:42  
##     72300  0.301        0.836   0.741        1.51        2.33    1:42  
##     72400  0.300        0.831   0.733        1.37        2.25    1:42  
##     72500  0.303        0.832   0.735        1.32        2.19    1:42  
##     72600  0.298        0.835   0.740        1.44        2.30    1:41  
##     72700  0.299        0.837   0.744        1.63        2.39    1:41  
##     72800  0.300        0.839   0.748        1.71        2.43    1:41  
##     72900  0.300        0.840   0.748        1.75        2.44    1:41  
##     73000  0.301        0.842   0.752        1.84        2.49    1:41  
##     73100  0.299        0.843   0.754        1.83        2.49    1:41  
##     73200  0.301        0.844   0.755        1.89        2.51    1:40  
##     73300  0.303        0.842   0.751        1.86        2.47    1:40  
##     73400  0.308        0.840   0.749        1.70        2.40    1:40  
##     73500  0.300        0.848   0.762        1.95        2.56    1:40  
##     73600  0.306        0.849   0.764        1.97        2.58    1:40  
##     73700  0.302        0.848   0.761        1.90        2.56    1:39  
##     73800  0.300        0.847   0.760        1.87        2.53    1:39  
##     73900  0.306        0.842   0.753        1.89        2.53    1:39  
##     74000  0.299        0.840   0.749        1.76        2.48    1:39  
##     74100  0.301        0.838   0.745        1.70        2.43    1:39  
##     74200  0.299        0.837   0.743        1.61        2.36    1:38  
##     74300  0.304        0.837   0.743        1.60        2.32    1:38  
##     74400  0.306        0.837   0.744        1.63        2.36    1:38  
##     74500  0.303        0.840   0.748        1.86        2.50    1:38  
##     74600  0.297        0.840   0.749        1.84        2.51    1:38  
##     74700  0.298        0.840   0.749        1.84        2.51    1:37  
##     74800  0.300        0.843   0.754        1.96        2.58    1:37  
##     74900  0.306        0.845   0.756        1.95        2.56    1:37  
##     75000  0.302        0.843   0.754        1.82        2.50    1:37  
##     75100  0.300        0.843   0.754        1.80        2.48    1:37  
##     75200  0.303        0.843   0.753        1.72        2.44    1:36  
##     75300  0.303        0.848   0.762        1.97        2.57    1:36  
##     75400  0.300        0.848   0.762        2.11        2.70    1:36  
##     75500  0.303        0.847   0.761        2.17        2.73    1:36  
##     75600  0.303        0.844   0.755        1.98        2.61    1:36  
##     75700  0.304        0.844   0.755        1.90        2.54    1:35  
##     75800  0.299        0.843   0.754        1.93        2.56    1:35  
##     75900  0.299        0.846   0.758        1.97        2.60    1:35  
##     76000  0.301        0.846   0.759        1.93        2.56    1:35  
##     76100  0.302        0.843   0.754        1.94        2.55    1:35  
##     76200  0.304        0.844   0.754        1.99        2.62    1:35  
##     76300  0.306        0.842   0.751        1.80        2.49    1:34  
##     76400  0.303        0.840   0.749        1.72        2.44    1:34  
##     76500  0.305        0.842   0.752        1.74        2.44    1:34  
##     76600  0.297        0.844   0.756        1.88        2.52    1:34  
##     76700  0.302        0.843   0.753        1.91        2.52    1:34  
##     76800  0.303        0.842   0.751        1.83        2.51    1:33  
##     76900  0.303        0.841   0.751        1.77        2.49    1:33  
##     77000  0.303        0.840   0.748        1.83        2.53    1:33  
##     77100  0.305        0.846   0.758        2.00        2.62    1:33  
##     77200  0.305        0.846   0.758        1.91        2.57    1:33  
##     77300  0.300        0.841   0.751        1.85        2.49    1:32  
##     77400  0.302        0.840   0.748        1.67        2.38    1:32  
##     77500  0.304        0.837   0.743        1.63        2.38    1:32  
##     77600  0.302        0.839   0.748        1.71        2.43    1:32  
##     77700  0.305        0.845   0.757        1.99        2.58    1:32  
##     77800  0.300        0.843   0.754        1.93        2.56    1:32  
##     77900  0.306        0.840   0.748        1.79        2.50    1:31  
##     78000  0.298        0.841   0.750        1.75        2.46    1:31  
##     78100  0.301        0.838   0.745        1.60        2.38    1:31  
##     78200  0.301        0.837   0.743        1.60        2.37    1:31  
##     78300  0.307        0.839   0.746        1.71        2.44    1:31  
##     78400  0.307        0.838   0.744        1.71        2.44    1:30  
##     78500  0.305        0.838   0.746        1.69        2.41    1:30  
##     78600  0.306        0.841   0.750        1.71        2.41    1:30  
##     78700  0.304        0.841   0.751        1.77        2.46    1:30  
##     78800  0.306        0.842   0.752        1.79        2.47    1:30  
##     78900  0.305        0.846   0.758        1.95        2.56    1:29  
##     79000  0.304        0.845   0.757        1.84        2.50    1:29  
##     79100  0.295        0.845   0.758        1.83        2.52    1:29  
##     79200  0.301        0.845   0.757        1.95        2.57    1:29  
##     79300  0.302        0.844   0.756        1.92        2.55    1:29  
##     79400  0.304        0.843   0.753        1.88        2.50    1:28  
##     79500  0.303        0.843   0.753        1.85        2.51    1:28  
##     79600  0.306        0.846   0.759        1.89        2.54    1:28  
##     79700  0.304        0.845   0.758        2.11        2.62    1:28  
##     79800  0.303        0.850   0.765        2.25        2.72    1:28  
##     79900  0.303        0.846   0.759        2.21        2.70    1:27  
##     80000  0.303        0.845   0.757        2.09        2.67    1:27  
##     80100  0.303        0.849   0.763        2.21        2.73    1:27  
##     80200  0.304        0.844   0.756        2.09        2.66    1:27  
##     80300  0.303        0.848   0.762        2.12        2.65    1:27  
##     80400  0.303        0.848   0.762        2.14        2.66    1:26  
##     80500  0.302        0.845   0.757        2.17        2.66    1:26  
##     80600  0.298        0.844   0.755        1.98        2.60    1:26  
##     80700  0.305        0.842   0.752        1.89        2.55    1:26  
##     80800  0.305        0.844   0.755        2.04        2.65    1:26  
##     80900  0.302        0.846   0.759        2.12        2.69    1:26  
##     81000  0.296        0.848   0.762        2.14        2.68    1:25  
##     81100  0.302        0.845   0.756        1.91        2.55    1:25  
##     81200  0.300        0.842   0.752        1.95        2.55    1:25  
##     81300  0.301        0.843   0.753        1.99        2.57    1:25  
##     81400  0.304        0.844   0.755        1.93        2.57    1:25  
##     81500  0.305        0.843   0.754        1.83        2.52    1:24  
##     81600  0.304        0.839   0.748        1.65        2.39    1:24  
##     81700  0.301        0.838   0.744        1.55        2.32    1:24  
##     81800  0.305        0.839   0.746        1.59        2.32    1:24  
##     81900  0.303        0.841   0.751        1.89        2.52    1:24  
##     82000  0.297        0.847   0.761        2.04        2.58    1:23  
##     82100  0.305        0.843   0.753        1.80        2.43    1:23  
##     82200  0.299        0.842   0.752        1.75        2.41    1:23  
##     82300  0.308        0.839   0.746        1.59        2.32    1:23  
##     82400  0.300        0.837   0.744        1.57        2.33    1:23  
##     82500  0.299        0.840   0.749        1.72        2.42    1:22  
##     82600  0.302        0.839   0.747        1.77        2.47    1:22  
##     82700  0.302        0.838   0.745        1.65        2.37    1:22  
##     82800  0.302        0.836   0.741        1.59        2.35    1:22  
##     82900  0.307        0.838   0.745        1.73        2.44    1:22  
##     83000  0.303        0.842   0.752        2.00        2.58    1:21  
##     83100  0.308        0.842   0.752        1.83        2.52    1:21  
##     83200  0.297        0.838   0.745        1.57        2.36    1:21  
##     83300  0.302        0.836   0.741        1.55        2.34    1:21  
##     83400  0.301        0.838   0.745        1.65        2.39    1:21  
##     83500  0.300        0.835   0.740        1.66        2.39    1:20  
##     83600  0.302        0.836   0.742        1.61        2.36    1:20  
##     83700  0.303        0.838   0.745        1.56        2.35    1:20  
##     83800  0.301        0.842   0.751        1.74        2.45    1:20  
##     83900  0.301        0.840   0.749        1.76        2.46    1:20  
##     84000  0.304        0.838   0.746        1.73        2.45    1:20  
##     84100  0.304        0.834   0.738        1.61        2.36    1:19  
##     84200  0.303        0.836   0.741        1.57        2.34    1:19  
##     84300  0.305        0.838   0.744        1.59        2.35    1:19  
##     84400  0.301        0.839   0.746        1.55        2.33    1:19  
##     84500  0.304        0.838   0.745        1.61        2.36    1:19  
##     84600  0.300        0.838   0.745        1.61        2.36    1:18  
##     84700  0.302        0.837   0.744        1.60        2.35    1:18  
##     84800  0.301        0.838   0.745        1.68        2.43    1:18  
##     84900  0.301        0.841   0.750        1.92        2.56    1:18  
##     85000  0.303        0.839   0.747        1.85        2.50    1:18  
##     85100  0.302        0.840   0.749        1.74        2.45    1:17  
##     85200  0.299        0.834   0.739        1.54        2.33    1:17  
##     85300  0.300        0.838   0.746        1.64        2.39    1:17  
##     85400  0.304        0.839   0.747        1.73        2.43    1:17  
##     85500  0.302        0.837   0.744        1.66        2.39    1:17  
##     85600  0.301        0.839   0.746        1.71        2.43    1:16  
##     85700  0.301        0.842   0.751        1.88        2.52    1:16  
##     85800  0.302        0.839   0.746        1.74        2.42    1:16  
##     85900  0.302        0.838   0.744        1.59        2.34    1:16  
##     86000  0.306        0.837   0.742        1.52        2.29    1:16  
##     86100  0.297        0.839   0.747        1.57        2.30    1:15  
##     86200  0.301        0.842   0.751        1.61        2.35    1:15  
##     86300  0.303        0.840   0.748        1.60        2.38    1:15  
##     86400  0.304        0.840   0.748        1.70        2.43    1:15  
##     86500  0.306        0.841   0.751        1.73        2.45    1:15  
##     86600  0.302        0.844   0.755        1.96        2.57    1:14  
##     86700  0.303        0.842   0.752        1.98        2.56    1:14  
##     86800  0.298        0.837   0.744        1.80        2.49    1:14  
##     86900  0.301        0.841   0.750        1.69        2.41    1:14  
##     87000  0.303        0.841   0.750        1.77        2.46    1:14  
##     87100  0.299        0.840   0.748        1.80        2.47    1:13  
##     87200  0.298        0.840   0.748        1.76        2.45    1:13  
##     87300  0.301        0.846   0.759        1.89        2.56    1:13  
##     87400  0.302        0.842   0.752        1.81        2.52    1:13  
##     87500  0.301        0.842   0.751        1.76        2.48    1:13  
##     87600  0.304        0.844   0.755        1.80        2.48    1:13  
##     87700  0.304        0.847   0.760        1.90        2.56    1:12  
##     87800  0.306        0.845   0.758        1.88        2.55    1:12  
##     87900  0.301        0.844   0.755        1.89        2.54    1:12  
##     88000  0.304        0.840   0.748        1.71        2.42    1:12  
##     88100  0.300        0.840   0.748        1.68        2.43    1:12  
##     88200  0.305        0.839   0.746        1.68        2.43    1:11  
##     88300  0.306        0.841   0.749        1.84        2.50    1:11  
##     88400  0.299        0.841   0.750        1.88        2.51    1:11  
##     88500  0.301        0.842   0.752        1.95        2.56    1:11  
##     88600  0.301        0.845   0.757        2.01        2.60    1:11  
##     88700  0.297        0.846   0.759        2.11        2.62    1:10  
##     88800  0.302        0.849   0.764        2.28        2.71    1:10  
##     88900  0.304        0.846   0.759        2.09        2.64    1:10  
##     89000  0.302        0.847   0.761        2.00        2.59    1:10  
##     89100  0.303        0.848   0.762        2.13        2.67    1:10  
##     89200  0.301        0.848   0.761        2.13        2.70    1:09  
##     89300  0.299        0.846   0.759        2.02        2.65    1:09  
##     89400  0.301        0.848   0.762        2.22        2.71    1:09  
##     89500  0.306        0.848   0.762        2.19        2.73    1:09  
##     89600  0.301        0.846   0.758        2.11        2.69    1:09  
##     89700  0.303        0.843   0.754        1.99        2.62    1:08  
##     89800  0.305        0.842   0.752        1.85        2.52    1:08  
##     89900  0.301        0.841   0.749        1.93        2.53    1:08  
##     90000  0.304        0.840   0.748        1.90        2.53    1:08  
##     90100  0.301        0.841   0.750        1.87        2.52    1:08  
##     90200  0.302        0.838   0.745        1.68        2.42    1:07  
##     90300  0.300        0.836   0.742        1.62        2.39    1:07  
##     90400  0.306        0.836   0.742        1.54        2.36    1:07  
##     90500  0.298        0.837   0.744        1.54        2.36    1:07  
##     90600  0.299        0.841   0.749        1.72        2.43    1:07  
##     90700  0.306        0.843   0.753        1.76        2.45    1:07  
##     90800  0.305        0.845   0.757        1.73        2.44    1:06  
##     90900  0.304        0.842   0.751        1.63        2.35    1:06  
##     91000  0.307        0.838   0.745        1.51        2.31    1:06  
##     91100  0.309        0.837   0.744        1.48        2.29    1:06  
##     91200  0.305        0.837   0.744        1.63        2.38    1:06  
##     91300  0.302        0.840   0.748        1.86        2.53    1:05  
##     91400  0.307        0.844   0.755        1.85        2.51    1:05  
##     91500  0.302        0.842   0.752        1.81        2.51    1:05  
##     91600  0.300        0.843   0.754        1.83        2.51    1:05  
##     91700  0.302        0.840   0.748        1.74        2.47    1:05  
##     91800  0.302        0.839   0.746        1.86        2.51    1:04  
##     91900  0.308        0.839   0.747        1.71        2.42    1:04  
##     92000  0.301        0.837   0.743        1.58        2.34    1:04  
##     92100  0.300        0.838   0.745        1.68        2.40    1:04  
##     92200  0.304        0.839   0.747        1.71        2.42    1:04  
##     92300  0.301        0.838   0.746        1.67        2.41    1:03  
##     92400  0.301        0.839   0.747        1.79        2.47    1:03  
##     92500  0.298        0.840   0.749        1.76        2.42    1:03  
##     92600  0.295        0.838   0.745        1.71        2.40    1:03  
##     92700  0.302        0.834   0.739        1.55        2.33    1:03  
##     92800  0.304        0.835   0.740        1.50        2.31    1:02  
##     92900  0.300        0.833   0.736        1.40        2.23    1:02  
##     93000  0.303        0.831   0.733        1.32        2.17    1:02  
##     93100  0.304        0.832   0.735        1.34        2.16    1:02  
##     93200  0.300        0.834   0.739        1.46        2.25    1:02  
##     93300  0.306        0.834   0.738        1.42        2.23    1:01  
##     93400  0.299        0.837   0.744        1.47        2.25    1:01  
##     93500  0.302        0.837   0.743        1.55        2.31    1:01  
##     93600  0.303        0.837   0.744        1.61        2.38    1:01  
##     93700  0.301        0.837   0.744        1.73        2.43    1:01  
##     93800  0.300        0.839   0.748        1.68        2.39    1:01  
##     93900  0.305        0.839   0.747        1.66        2.37    1:00  
##     94000  0.307        0.837   0.743        1.76        2.42    1:00  
##     94100  0.301        0.840   0.748        1.81        2.46    0:60  
##     94200  0.305        0.841   0.750        1.80        2.48    0:60  
##     94300  0.305        0.839   0.746        1.80        2.48    0:60  
##     94400  0.310        0.840   0.749        1.81        2.50    0:59  
##     94500  0.303        0.840   0.749        1.87        2.52    0:59  
##     94600  0.301        0.839   0.746        1.73        2.44    0:59  
##     94700  0.300        0.843   0.753        1.86        2.50    0:59  
##     94800  0.305        0.842   0.751        1.73        2.42    0:59  
##     94900  0.302        0.838   0.746        1.51        2.29    0:58  
##     95000  0.303        0.834   0.738        1.44        2.26    0:58  
##     95100  0.303        0.831   0.733        1.43        2.24    0:58  
##     95200  0.303        0.836   0.741        1.52        2.30    0:58  
##     95300  0.299        0.838   0.746        1.61        2.37    0:58  
##     95400  0.299        0.841   0.751        1.68        2.40    0:57  
##     95500  0.304        0.844   0.755        1.71        2.44    0:57  
##     95600  0.302        0.842   0.752        1.73        2.44    0:57  
##     95700  0.301        0.840   0.748        1.74        2.43    0:57  
##     95800  0.300        0.843   0.754        1.89        2.49    0:57  
##     95900  0.301        0.843   0.753        2.07        2.63    0:56  
##     96000  0.306        0.844   0.755        2.02        2.61    0:56  
##     96100  0.305        0.846   0.759        2.00        2.59    0:56  
##     96200  0.305        0.850   0.765        2.30        2.73    0:56  
##     96300  0.302        0.850   0.766        2.29        2.72    0:56  
##     96400  0.301        0.845   0.757        2.01        2.61    0:55  
##     96500  0.299        0.843   0.754        1.94        2.57    0:55  
##     96600  0.305        0.840   0.749        1.82        2.50    0:55  
##     96700  0.304        0.840   0.748        1.73        2.44    0:55  
##     96800  0.305        0.839   0.747        1.69        2.44    0:55  
##     96900  0.303        0.840   0.749        1.78        2.50    0:55  
##     97000  0.298        0.844   0.756        1.99        2.60    0:54  
##     97100  0.300        0.841   0.751        1.90        2.56    0:54  
##     97200  0.300        0.842   0.751        1.86        2.52    0:54  
##     97300  0.303        0.842   0.752        1.67        2.40    0:54  
##     97400  0.304        0.844   0.755        1.75        2.45    0:54  
##     97500  0.303        0.841   0.750        1.79        2.47    0:53  
##     97600  0.301        0.840   0.749        1.70        2.41    0:53  
##     97700  0.304        0.837   0.743        1.61        2.35    0:53  
##     97800  0.305        0.837   0.743        1.66        2.38    0:53  
##     97900  0.300        0.836   0.742        1.57        2.36    0:53  
##     98000  0.299        0.835   0.740        1.48        2.29    0:52  
##     98100  0.306        0.833   0.737        1.47        2.27    0:52  
##     98200  0.304        0.835   0.740        1.51        2.31    0:52  
##     98300  0.300        0.838   0.745        1.58        2.35    0:52  
##     98400  0.304        0.841   0.751        1.78        2.45    0:52  
##     98500  0.303        0.840   0.749        1.72        2.39    0:51  
##     98600  0.305        0.841   0.750        1.76        2.45    0:51  
##     98700  0.307        0.840   0.748        1.76        2.47    0:51  
##     98800  0.302        0.837   0.743        1.67        2.41    0:51  
##     98900  0.302        0.839   0.746        1.70        2.43    0:51  
##     99000  0.299        0.840   0.748        1.72        2.45    0:51  
##     99100  0.302        0.841   0.750        1.76        2.47    0:50  
##     99200  0.303        0.843   0.754        1.81        2.49    0:50  
##     99300  0.306        0.845   0.756        1.90        2.57    0:50  
##     99400  0.301        0.847   0.761        2.17        2.71    0:50  
##     99500  0.300        0.847   0.761        2.04        2.66    0:50  
##     99600  0.305        0.847   0.760        2.01        2.61    0:49  
##     99700  0.303        0.841   0.751        1.80        2.47    0:49  
##     99800  0.301        0.838   0.746        1.64        2.40    0:49  
##     99900  0.299        0.839   0.748        1.68        2.39    0:49  
##    100000  0.300        0.838   0.746        1.59        2.35    0:49  
##    100100  0.303        0.840   0.749        1.71        2.42    0:48  
##    100200  0.304        0.840   0.748        1.74        2.44    0:48  
##    100300  0.306        0.838   0.745        1.66        2.43    0:48  
##    100400  0.307        0.839   0.747        1.71        2.42    0:48  
##    100500  0.306        0.840   0.748        1.67        2.40    0:48  
##    100600  0.307        0.840   0.749        1.65        2.39    0:47  
##    100700  0.298        0.839   0.747        1.65        2.38    0:47  
##    100800  0.306        0.841   0.750        1.70        2.40    0:47  
##    100900  0.300        0.841   0.751        1.78        2.44    0:47  
##    101000  0.302        0.843   0.753        1.94        2.53    0:47  
##    101100  0.297        0.840   0.749        1.82        2.47    0:46  
##    101200  0.304        0.838   0.745        1.71        2.41    0:46  
##    101300  0.303        0.838   0.745        1.73        2.43    0:46  
##    101400  0.299        0.839   0.746        1.64        2.37    0:46  
##    101500  0.300        0.836   0.742        1.55        2.32    0:46  
##    101600  0.302        0.837   0.743        1.53        2.31    0:45  
##    101700  0.304        0.837   0.744        1.49        2.27    0:45  
##    101800  0.302        0.835   0.739        1.36        2.20    0:45  
##    101900  0.301        0.829   0.730        1.26        2.11    0:45  
##    102000  0.304        0.830   0.731        1.27        2.13    0:45  
##    102100  0.306        0.832   0.734        1.33        2.18    0:45  
##    102200  0.302        0.834   0.739        1.55        2.31    0:44  
##    102300  0.306        0.837   0.744        1.59        2.32    0:44  
##    102400  0.305        0.838   0.745        1.65        2.37    0:44  
##    102500  0.299        0.839   0.747        1.70        2.43    0:44  
##    102600  0.300        0.842   0.751        1.88        2.53    0:44  
##    102700  0.305        0.842   0.752        1.84        2.51    0:43  
##    102800  0.301        0.843   0.753        1.84        2.51    0:43  
##    102900  0.302        0.845   0.757        1.92        2.55    0:43  
##    103000  0.301        0.841   0.751        1.81        2.50    0:43  
##    103100  0.297        0.842   0.751        1.81        2.50    0:43  
##    103200  0.301        0.841   0.749        1.74        2.46    0:42  
##    103300  0.300        0.841   0.751        1.82        2.47    0:42  
##    103400  0.304        0.846   0.758        2.01        2.59    0:42  
##    103500  0.301        0.848   0.762        2.06        2.61    0:42  
##    103600  0.299        0.843   0.753        2.00        2.59    0:42  
##    103700  0.300        0.843   0.753        1.96        2.58    0:41  
##    103800  0.303        0.845   0.758        2.10        2.67    0:41  
##    103900  0.305        0.845   0.757        2.01        2.62    0:41  
##    104000  0.301        0.846   0.758        1.98        2.58    0:41  
##    104100  0.307        0.843   0.753        1.95        2.56    0:41  
##    104200  0.304        0.845   0.757        2.01        2.60    0:40  
##    104300  0.303        0.847   0.760        2.10        2.67    0:40  
##    104400  0.303        0.846   0.758        2.07        2.67    0:40  
##    104500  0.301        0.842   0.752        1.96        2.58    0:40  
##    104600  0.304        0.840   0.749        1.77        2.45    0:40  
##    104700  0.300        0.842   0.751        1.82        2.49    0:39  
##    104800  0.302        0.838   0.746        1.87        2.53    0:39  
##    104900  0.302        0.839   0.747        1.76        2.45    0:39  
##    105000  0.305        0.842   0.752        1.80        2.50    0:39  
##    105100  0.306        0.842   0.752        1.77        2.46    0:39  
##    105200  0.301        0.838   0.746        1.75        2.41    0:38  
##    105300  0.306        0.838   0.745        1.64        2.36    0:38  
##    105400  0.305        0.839   0.746        1.64        2.36    0:38  
##    105500  0.301        0.837   0.744        1.61        2.36    0:38  
##    105600  0.300        0.839   0.746        1.73        2.44    0:38  
##    105700  0.301        0.842   0.751        1.85        2.52    0:38  
##    105800  0.303        0.840   0.748        1.74        2.42    0:37  
##    105900  0.302        0.839   0.747        1.69        2.37    0:37  
##    106000  0.301        0.841   0.750        1.74        2.44    0:37  
##    106100  0.305        0.845   0.757        1.95        2.54    0:37  
##    106200  0.303        0.847   0.760        2.01        2.56    0:37  
##    106300  0.302        0.844   0.755        1.89        2.49    0:36  
##    106400  0.303        0.841   0.750        1.77        2.44    0:36  
##    106500  0.298        0.841   0.750        1.76        2.45    0:36  
##    106600  0.301        0.839   0.747        1.69        2.42    0:36  
##    106700  0.298        0.838   0.745        1.78        2.44    0:36  
##    106800  0.301        0.839   0.747        1.70        2.40    0:35  
##    106900  0.299        0.840   0.748        1.65        2.39    0:35  
##    107000  0.297        0.839   0.747        1.69        2.40    0:35  
##    107100  0.303        0.841   0.749        1.70        2.40    0:35  
##    107200  0.306        0.841   0.749        1.69        2.41    0:35  
##    107300  0.301        0.842   0.753        1.94        2.51    0:34  
##    107400  0.302        0.842   0.752        1.93        2.54    0:34  
##    107500  0.300        0.843   0.754        1.81        2.47    0:34  
##    107600  0.305        0.844   0.755        1.77        2.45    0:34  
##    107700  0.304        0.842   0.753        1.78        2.46    0:34  
##    107800  0.307        0.839   0.746        1.52        2.33    0:33  
##    107900  0.301        0.839   0.747        1.66        2.40    0:33  
##    108000  0.305        0.838   0.744        1.64        2.40    0:33  
##    108100  0.303        0.835   0.739        1.46        2.28    0:33  
##    108200  0.300        0.830   0.732        1.43        2.25    0:33  
##    108300  0.306        0.830   0.731        1.44        2.25    0:32  
##    108400  0.305        0.828   0.727        1.37        2.20    0:32  
##    108500  0.305        0.829   0.730        1.36        2.19    0:32  
##    108600  0.309        0.831   0.732        1.30        2.15    0:32  
##    108700  0.302        0.831   0.733        1.29        2.14    0:32  
##    108800  0.305        0.831   0.732        1.38        2.20    0:31  
##    108900  0.301        0.832   0.734        1.36        2.18    0:31  
##    109000  0.297        0.833   0.737        1.38        2.18    0:31  
##    109100  0.297        0.833   0.737        1.47        2.23    0:31  
##    109200  0.300        0.832   0.735        1.48        2.26    0:31  
##    109300  0.298        0.833   0.736        1.44        2.25    0:31  
##    109400  0.305        0.837   0.742        1.49        2.29    0:30  
##    109500  0.303        0.839   0.747        1.60        2.36    0:30  
##    109600  0.304        0.842   0.752        1.76        2.43    0:30  
##    109700  0.302        0.841   0.750        1.66        2.38    0:30  
##    109800  0.306        0.833   0.737        1.53        2.29    0:30  
##    109900  0.304        0.829   0.729        1.32        2.14    0:29  
##    110000  0.300        0.830   0.732        1.31        2.13    0:29  
##    110100  0.302        0.835   0.740        1.43        2.21    0:29  
##    110200  0.301        0.834   0.739        1.45        2.27    0:29  
##    110300  0.306        0.832   0.735        1.40        2.24    0:29  
##    110400  0.304        0.833   0.737        1.39        2.21    0:28  
##    110500  0.303        0.835   0.739        1.42        2.25    0:28  
##    110600  0.300        0.837   0.743        1.56        2.34    0:28  
##    110700  0.303        0.839   0.746        1.68        2.38    0:28  
##    110800  0.304        0.836   0.741        1.55        2.32    0:28  
##    110900  0.302        0.840   0.748        1.65        2.38    0:27  
##    111000  0.299        0.838   0.746        1.66        2.37    0:27  
##    111100  0.307        0.836   0.742        1.54        2.29    0:27  
##    111200  0.302        0.834   0.739        1.43        2.22    0:27  
##    111300  0.297        0.837   0.744        1.63        2.35    0:27  
##    111400  0.307        0.840   0.749        1.88        2.50    0:26  
##    111500  0.304        0.838   0.745        1.82        2.47    0:26  
##    111600  0.303        0.835   0.740        1.53        2.29    0:26  
##    111700  0.305        0.833   0.737        1.40        2.21    0:26  
##    111800  0.307        0.831   0.732        1.46        2.25    0:26  
##    111900  0.303        0.832   0.735        1.47        2.28    0:25  
##    112000  0.299        0.837   0.743        1.57        2.34    0:25  
##    112100  0.301        0.838   0.745        1.63        2.35    0:25  
##    112200  0.302        0.839   0.746        1.63        2.36    0:25  
##    112300  0.304        0.841   0.751        1.67        2.39    0:25  
##    112400  0.302        0.839   0.746        1.62        2.37    0:24  
##    112500  0.302        0.841   0.750        1.65        2.38    0:24  
##    112600  0.305        0.845   0.758        1.78        2.49    0:24  
##    112700  0.299        0.844   0.756        1.98        2.60    0:24  
##    112800  0.306        0.847   0.760        2.05        2.64    0:24  
##    112900  0.301        0.847   0.761        1.97        2.61    0:24  
##    113000  0.304        0.844   0.755        1.85        2.54    0:23  
##    113100  0.301        0.841   0.751        1.75        2.48    0:23  
##    113200  0.306        0.841   0.750        1.67        2.43    0:23  
##    113300  0.306        0.839   0.747        1.67        2.40    0:23  
##    113400  0.302        0.837   0.743        1.65        2.36    0:23  
##    113500  0.301        0.838   0.744        1.66        2.38    0:22  
##    113600  0.299        0.839   0.746        1.76        2.43    0:22  
##    113700  0.305        0.836   0.741        1.58        2.33    0:22  
##    113800  0.302        0.839   0.747        1.70        2.43    0:22  
##    113900  0.300        0.846   0.759        2.12        2.65    0:22  
##    114000  0.305        0.847   0.760        2.21        2.71    0:21  
##    114100  0.298        0.846   0.758        1.94        2.57    0:21  
##    114200  0.302        0.841   0.751        1.72        2.43    0:21  
##    114300  0.302        0.839   0.746        1.59        2.34    0:21  
##    114400  0.303        0.840   0.748        1.54        2.32    0:21  
##    114500  0.303        0.841   0.750        1.71        2.43    0:20  
##    114600  0.300        0.842   0.753        1.81        2.49    0:20  
##    114700  0.302        0.843   0.754        1.82        2.47    0:20  
##    114800  0.305        0.838   0.746        1.67        2.37    0:20  
##    114900  0.306        0.835   0.741        1.47        2.27    0:20  
##    115000  0.303        0.836   0.741        1.54        2.32    0:19  
##    115100  0.297        0.838   0.746        1.66        2.41    0:19  
##    115200  0.301        0.839   0.746        1.64        2.41    0:19  
##    115300  0.303        0.839   0.746        1.67        2.40    0:19  
##    115400  0.301        0.836   0.742        1.60        2.33    0:19  
##    115500  0.299        0.837   0.743        1.64        2.36    0:18  
##    115600  0.304        0.841   0.750        1.76        2.44    0:18  
##    115700  0.299        0.842   0.752        1.84        2.49    0:18  
##    115800  0.301        0.844   0.755        1.97        2.57    0:18  
##    115900  0.307        0.843   0.754        1.93        2.56    0:18  
##    116000  0.303        0.841   0.750        1.75        2.42    0:17  
##    116100  0.305        0.838   0.746        1.67        2.39    0:17  
##    116200  0.302        0.837   0.744        1.75        2.44    0:17  
##    116300  0.301        0.836   0.742        1.63        2.33    0:17  
##    116400  0.299        0.836   0.741        1.49        2.26    0:17  
##    116500  0.310        0.833   0.736        1.62        2.34    0:17  
##    116600  0.300        0.836   0.742        1.65        2.37    0:16  
##    116700  0.300        0.838   0.745        1.63        2.37    0:16  
##    116800  0.304        0.836   0.741        1.65        2.38    0:16  
##    116900  0.306        0.837   0.744        1.56        2.32    0:16  
##    117000  0.303        0.835   0.739        1.42        2.21    0:16  
##    117100  0.301        0.831   0.732        1.38        2.21    0:15  
##    117200  0.303        0.832   0.734        1.52        2.31    0:15  
##    117300  0.302        0.834   0.738        1.53        2.33    0:15  
##    117400  0.303        0.835   0.740        1.64        2.39    0:15  
##    117500  0.295        0.839   0.747        1.70        2.42    0:15  
##    117600  0.305        0.838   0.745        1.61        2.38    0:14  
##    117700  0.304        0.835   0.739        1.59        2.35    0:14  
##    117800  0.301        0.832   0.734        1.59        2.35    0:14  
##    117900  0.303        0.836   0.742        1.64        2.40    0:14  
##    118000  0.302        0.838   0.745        1.72        2.44    0:14  
##    118100  0.305        0.840   0.748        1.89        2.54    0:13  
##    118200  0.302        0.845   0.758        2.08        2.62    0:13  
##    118300  0.305        0.846   0.759        2.13        2.65    0:13  
##    118400  0.306        0.848   0.762        2.16        2.67    0:13  
##    118500  0.302        0.847   0.761        2.20        2.69    0:13  
##    118600  0.299        0.846   0.758        1.94        2.55    0:12  
##    118700  0.302        0.842   0.753        1.91        2.53    0:12  
##    118800  0.298        0.844   0.755        1.99        2.58    0:12  
##    118900  0.302        0.841   0.750        1.92        2.56    0:12  
##    119000  0.304        0.837   0.742        1.67        2.42    0:12  
##    119100  0.305        0.835   0.739        1.56        2.34    0:11  
##    119200  0.302        0.837   0.743        1.54        2.34    0:11  
##    119300  0.297        0.838   0.746        1.72        2.43    0:11  
##    119400  0.302        0.837   0.743        1.70        2.46    0:11  
##    119500  0.303        0.840   0.748        1.86        2.52    0:11  
##    119600  0.298        0.841   0.750        1.93        2.54    0:10  
##    119700  0.300        0.839   0.747        1.76        2.45    0:10  
##    119800  0.302        0.841   0.749        1.66        2.39    0:10  
##    119900  0.301        0.844   0.755        1.77        2.45    0:10  
##    120000  0.302        0.843   0.753        1.84        2.47    0:10  
##    120100  0.302        0.840   0.749        1.74        2.44    0:10  
##    120200  0.302        0.841   0.749        1.63        2.39    0:09  
##    120300  0.305        0.839   0.746        1.65        2.38    0:09  
##    120400  0.301        0.838   0.745        1.63        2.37    0:09  
##    120500  0.306        0.836   0.742        1.63        2.36    0:09  
##    120600  0.302        0.835   0.740        1.53        2.30    0:09  
##    120700  0.302        0.831   0.733        1.39        2.21    0:08  
##    120800  0.301        0.832   0.735        1.43        2.22    0:08  
##    120900  0.307        0.830   0.731        1.31        2.14    0:08  
##    121000  0.299        0.830   0.731        1.27        2.11    0:08  
##    121100  0.301        0.832   0.735        1.31        2.13    0:08  
##    121200  0.304        0.834   0.738        1.45        2.24    0:07  
##    121300  0.305        0.832   0.735        1.48        2.24    0:07  
##    121400  0.306        0.836   0.741        1.49        2.25    0:07  
##    121500  0.295        0.835   0.740        1.44        2.26    0:07  
##    121600  0.302        0.834   0.739        1.52        2.32    0:07  
##    121700  0.296        0.832   0.734        1.43        2.26    0:06  
##    121800  0.302        0.836   0.741        1.44        2.25    0:06  
##    121900  0.303        0.836   0.742        1.53        2.29    0:06  
##    122000  0.307        0.835   0.740        1.53        2.30    0:06  
##    122100  0.302        0.836   0.742        1.65        2.40    0:06  
##    122200  0.307        0.841   0.750        1.75        2.46    0:05  
##    122300  0.305        0.841   0.750        1.70        2.43    0:05  
##    122400  0.301        0.839   0.746        1.85        2.52    0:05  
##    122500  0.301        0.840   0.749        1.95        2.58    0:05  
##    122600  0.299        0.843   0.753        1.91        2.57    0:05  
##    122700  0.302        0.841   0.750        1.74        2.47    0:04  
##    122800  0.304        0.838   0.744        1.71        2.43    0:04  
##    122900  0.307        0.838   0.744        1.65        2.38    0:04  
##    123000  0.304        0.836   0.741        1.51        2.27    0:04  
##    123100  0.302        0.836   0.742        1.54        2.31    0:04  
##    123200  0.299        0.835   0.739        1.52        2.32    0:04  
##    123300  0.307        0.835   0.740        1.51        2.31    0:03  
##    123400  0.302        0.835   0.739        1.53        2.33    0:03  
##    123500  0.298        0.838   0.745        1.65        2.40    0:03  
##    123600  0.302        0.837   0.744        1.61        2.35    0:03  
##    123700  0.296        0.838   0.744        1.67        2.39    0:03  
##    123800  0.302        0.840   0.749        1.79        2.44    0:02  
##    123900  0.300        0.843   0.754        1.84        2.49    0:02  
##    124000  0.304        0.846   0.759        2.08        2.64    0:02  
##    124100  0.302        0.845   0.758        2.19        2.71    0:02  
##    124200  0.303        0.844   0.755        2.19        2.70    0:02  
##    124300  0.303        0.848   0.762        2.32        2.78    0:01  
##    124400  0.304        0.845   0.756        2.09        2.64    0:01  
##    124500  0.305        0.844   0.755        1.99        2.56    0:01  
##    124600  0.307        0.842   0.751        1.79        2.44    0:01  
##    124700  0.306        0.838   0.744        1.67        2.36    0:01  
##    124800  0.302        0.839   0.747        1.68        2.39    0:00  
##    124900  0.300        0.846   0.758        1.86        2.50    0:00  
##    125000  0.303        0.845   0.757        1.95        2.55    0:00  
## 
## Total Time Elapsed: 4:03
## 
## Writing estimated unit-level betas to Rbetas.csv in the working directory

5 Ergebnisse anschauen

5.1 Trace plot

dev.copy(png,'Trace.png')
## png 
##   3
dev.off()
## png 
##   2
knitr::include_graphics('Trace.png')

5.2 Means of posterior draws as point estimate from ChoiceModelR

Create point estimates

beta.post.mean <- apply(out$betadraw , 1:2, mean)
head(beta.post.mean)
##            [,1]      [,2]       [,3]      [,4]
## [1,] 0.40659444 0.3794244 -0.5405750 0.5269146
## [2,] 1.14610215 1.7647387  1.3626259 4.0702864
## [3,] 0.02619262 1.7017979  2.2734513 3.0824986
## [4,] 0.20540261 0.1609594  0.3106637 1.2613420
## [5,] 0.76901090 1.9102543  1.4430890 4.9217242
## [6,] 0.75760967 2.1934208  1.2841729 2.4939413
Ids <- freq(Hospital_Sawtooth$sys_RespNum)

Ids <- as.numeric(Ids$intermediate$categoryNames)

beta.post.mean <- as.data.frame(cbind(Ids, beta.post.mean))

names(beta.post.mean) <- c(names(Hospital_Sawtooth)[1], "1km", "gruendlich", "100 Faelle", "niedrig")

Visualize point estimates

beta.post.mean_stacked<- beta.post.mean %>% 
  gather(Attribute_Level, Part_Worth_Beta, names(beta.post.mean)[2]:names(beta.post.mean)[(ncol(beta.post.mean))])



beta.post.mean_stacked[,2:ncol(beta.post.mean_stacked)] %>%
  ggplot( aes(x=Attribute_Level, y=Part_Worth_Beta, fill=Attribute_Level)) +
    geom_boxplot() +
    scale_fill_viridis(discrete = TRUE, alpha=0.4) +
    geom_jitter(color="black", size=0.6, alpha=0.99, width=0.15) +
     theme_apa() +
    theme(
      legend.position="none",
      plot.title = element_text(size=11)
    ) +
    ggtitle("Mean Part-worth utilities ChoiceModelR") +
    xlab("")+
   geom_hline(aes(yintercept = 0),
    color = "red",  size = 1)

5.3 Means of posterior draws as point estimate from Sawtooth Software Lighthouse Studio

beta.post.mean_Sawtooth <- read.csv( file= 'Utilities HB_completes raw.csv', header = TRUE, sep = ";")

beta.post.mean_Sawtooth <- beta.post.mean_Sawtooth[,c(1,3,5,7,9)]

names(beta.post.mean_Sawtooth) <- names(beta.post.mean)

Visualize point estimates

beta.post.mean_Sawtooth_stacked<- beta.post.mean_Sawtooth %>% 
  gather(Attribute_Level, Part_Worth_Beta, names(beta.post.mean_Sawtooth)[2]:names(beta.post.mean_Sawtooth)[(ncol(beta.post.mean_Sawtooth))])



beta.post.mean_Sawtooth_stacked[,2:ncol(beta.post.mean_Sawtooth_stacked)] %>%
  ggplot( aes(x=Attribute_Level, y=Part_Worth_Beta, fill=Attribute_Level)) +
    geom_boxplot() +
    scale_fill_viridis(discrete = TRUE, alpha=0.4) +
    geom_jitter(color="black", size=0.6, alpha=0.99, width=0.15) +
     theme_apa() +
    theme(
      legend.position="none",
      plot.title = element_text(size=11)
    ) +
    ggtitle("Mean Part-worth utilities Sawtooth Lighthouse") +
    xlab("")+
   geom_hline(aes(yintercept = 0),
    color = "red",  size = 1)

5.4 Comparing both estimations

temp <- as.data.frame(cbind(beta.post.mean_stacked, beta.post.mean_Sawtooth_stacked[,3]))

names(temp) <- c("sys_RespNum", "Attribute_Level", "Utility_ChoiceModelR", "Utility_Sawtooth")



Variable_Names <- colnames(temp[,3:(ncol(temp))])


Utilities_by_software <- CreateContTable(vars = Variable_Names,  strata="Attribute_Level" , data = temp, test = FALSE )



kableone(Utilities_by_software, caption = 'Part worth utilities by software')
Part worth utilities by software
100 Faelle 1km gruendlich niedrig
n 496 496 496 496
Utility_ChoiceModelR (mean (SD)) 1.35 (0.61) 0.76 (0.52) 1.59 (0.46) 3.48 (1.49)
Utility_Sawtooth (mean (SD)) 1.27 (0.55) 0.70 (0.47) 1.48 (0.40) 3.26 (1.39)
ggplot(temp, aes(x=Utility_ChoiceModelR, y=Utility_Sawtooth, color=Attribute_Level)) + 
    geom_point(size=0.6)+
  geom_smooth(method=lm , color="black", fill="#69b3a2", se=TRUE)+
  theme_apa()