Skip to content

Latest commit

 

History

History
843 lines (633 loc) · 340 KB

simulations.md

File metadata and controls

843 lines (633 loc) · 340 KB
title author date output editor_options
Tutorial on statistical power analysis via simulations in R
Andrey Chetverikov
January 28, 2020
html_document word_document pdf_document
df_print keep_md
paged
true
fig_height fig_width
12
12
default
chunk_output_type
console
# this chunk loads the libraries and sets up ggplot theme
library(apastats)
library(ggplot2)
library(data.table)
library(Hmisc)
library(patchwork)
library(MASS)
library(knitr)
library(ez)
library(pwr)

# packages from github
library(apastats) # devtools::install_github('achetverikov/apastats',subdir='apastats')
library(patchwork) # devtools::install_github("thomasp85/patchwork")
library(Superpower) # devtools::install_github("arcaldwell49/Superpower")

default_font <- 'sans'
default_font_size <- 12
default_font_size_mm <- default_font_size/ggplot2:::.pt

default_theme<-theme_light(base_size = default_font_size, base_family = default_font)+theme(
  axis.line=element_line(size=I(0.5)), 
  axis.ticks= element_line(size=I(0.25), colour = 'gray'),
  axis.line.x=element_line(),
  axis.line.y=element_line(),
  panel.grid=element_line(colour = 'gray',size = I(0.5)), 
  panel.grid.minor = element_blank(),
  legend.title=element_text(size=rel(1)), 
  strip.text=element_text(size=rel(1), color = 'black'), 
  axis.text=element_text(size=rel(0.9)), 
  axis.title=element_text(size=rel(1)), 
  panel.border= element_blank(),
  strip.background = element_blank(),
  legend.position	='right', 
  plot.title=element_text(size=rel(1), hjust = 0.5),
  text=element_text(size=default_font_size), 
  legend.text=element_text(size=rel(1)), 
  axis.line.x.bottom = element_blank(), 
  axis.line.y.left = element_blank())
theme_set(default_theme)

opts_chunk$set(cache = T)


# n_reps sets the simulation N
max_n_reps = 1000

This notebooks aims to demonstrate how to do simulations in R to estimate required sample size and number of trials. First, I'll show how to do simulations for a simple t-test or ANOVA using means and SDs often reported in papers. Then, I'll show how to obtain power estimates by estimating the parameters of within-subject design from existing data and then using it to simulate new datasets.

Simulating data for the one-sample t-test

Let's start with a very simple example. Say, you want to know how many subjects are needed to test a hypothesis that some parameter value (for example, bias in an orientation estimation task) is different from zero with a simple t-test. Here, your data model is that in the population you have a normal distribution of biases with a certain mean and standard deviation.

set.seed(512)

mu = 3
sigma = 5
n = 20

p <- ggplot(data.frame(x = seq(-10, 15)), aes(x = x))+
  stat_function(fun = dnorm, args = list(mean = mu, sd = sigma))+
  geom_vline(xintercept = 0, linetype = 2)+
  labs(x = 'Bias', y = 'Probability', title = 'Distribution of a parameter (bias) in the population')

p

How many subjects do you need to make sure that you will find your effect if the population is what you assume it is? For example, what if you collect data from 10 participants?

# generate the sample
sample_data <- rnorm(10, mean = mu, sd = sigma)

# get mean and sd
smean.sd(sample_data)
##     Mean       SD 
## 2.975088 4.911560
# plot them together with the population distribution
p + geom_rug(data = data.frame(x = sample_data))

# compute t-value and degrees of freedom
t_value <- (mean(sample_data))/(sd(sample_data)/sqrt(length(sample_data)))
df <- length(sample_data)-1

# compute p-value 
round.p(2*pt(abs(t_value), df, lower=F))
## [1] "= .088"

For this sample, the effect is not significant. But of course, no one can guarantee that you will get exactly this sample. What you are interested in is the average probability of getting a significant result from your data, also called the "power" of your test.

# create a "simulation grid" defining the values for the number of subjects you want to see the power for and the number of replications over which you will aggregate

sim_dt <- data.table(expand.grid(n_subjects = 2:100, n_reps = 1:max_n_reps)) 

# for each replication and each number of subjects, create the sample and compute its mean and SD
# rnorm(...) generates the data for n_subjects
# data.frame(t(...)) transforms the vector output of smean.sd to a one-row data.frame that is easy to combine for data.table
sim_dt <- sim_dt[, data.frame(t(smean.sd(rnorm(n_subjects, mean = mu, sd = sigma)))), by = .(n_subjects, n_reps)]

# then get the t and p like it was done above
sim_dt[, t_value := (Mean)/(SD/sqrt(n_subjects))]
sim_dt[, p_val := 2*pt(abs(t_value), n_subjects-1, lower=F)]

# compute the average probability of getting a significant result
sim_dt_avg<-sim_dt[,.(power = mean(as.numeric(p_val<0.05))), by = n_subjects]

# plot power as a function of the number of subjects
p_power <- ggplot(sim_dt_avg, aes(x = n_subjects, y = power))+
  geom_line(stat='summary', fun.y = mean)+
  labs(y = 'Power', x = 'N subjects')

p_power

By convention, people often want to know the number of participants to achieve 80% power. Here, in this example, 25 subjects are going to be enough.

sim_dt_avg[power>=0.8, min(n_subjects)] # minimal number of subjects needed to achieve 80% power 
## [1] 25
p_power + geom_hline(yintercept = 0.8, linetype = 2, color = 'red') + geom_vline(xintercept = sim_dt_avg[power>=0.8, min(n_subjects)], linetype = 2, color = 'red')

Exercise 1: Simulate and compare the power curves and estimate minimal N for $\sigma = 15$ and $\sigma = 3$.

Of course, power depends on the effect size which (if we use Cohen's d) is just a ratio of mean and SD. So for this example, we used small to medium effect size. We can check how the power differs for different effect sizes.

# we are going to check three effect sizes, "small", "medium" and "large"
es_values <- c(0.2, 0.6, 1) 

# assuming the same mean (mu = 3), we can get the sigmas for these levels of effect sizes
sigma_values <- mu/es_values

# create a new simulation grid this time varying sigma (SD) of the population distribution
sim_dt <- data.table(expand.grid(n_subjects = 2:100, n_reps = 1:max_n_reps, sigma = sigma_values)) 

# repeat the power calculations, but this time for different sigma
sim_dt <- sim_dt[, data.frame(t(smean.sd(rnorm(n_subjects, mean = mu, sd = sigma)))), by = .(n_subjects, n_reps, sigma)]

# then get the t and p 
sim_dt[, t_value := (Mean)/(SD/sqrt(n_subjects))]
sim_dt[, p_val:=2*pt(abs(t_value), n_subjects-1, lower=F)]

# compute the average probability of getting a significant result
sim_dt_avg<-sim_dt[,.(power = mean(as.numeric(p_val<0.05))), by = .(n_subjects, sigma)]

sim_dt_avg[,es_labels := factor(mu/sigma, labels = c('small','medium','large'))]
# plot power as a function of the number of subjects
p_power <- ggplot(sim_dt_avg, aes(x = n_subjects, y = power, color = es_labels))+
  geom_line(stat='summary', fun.y = mean)+
  labs(y = 'Power', x = 'N subjects', color = 'Effect size')+
  theme(legend.position = c(1,0), legend.justification = c(1,0))+ 
  geom_hline(yintercept = 0.8, linetype = 2, color = 'black')

p_power

# get the minimal number of subjects needed to achieve 80% power 
sim_dt_avg[power>=0.8, min(n_subjects), by = .(es_labels)]
<script data-pagedtable-source type="application/json"> {"columns":[{"label":["es_labels"],"name":[1],"type":["fctr"],"align":["left"]},{"label":["V1"],"name":[2],"type":["int"],"align":["right"]}],"data":[{"1":"medium","2":"23"},{"1":"large","2":"10"}],"options":{"columns":{"min":{},"max":[10]},"rows":{"min":[10],"max":[10]},"pages":{}}} </script>
# compare with the results from stats::power.t.test
sapply(sigma_values, function(x) power.t.test(delta = mu, sd = x, power = 0.8, type = 'one.sample' ))
##             [,1]                                 
## n           198.1513                             
## delta       3                                    
## sd          15                                   
## sig.level   0.05                                 
## power       0.8                                  
## alternative "two.sided"                          
## note        NULL                                 
## method      "One-sample t test power calculation"
##             [,2]                                 
## n           23.79457                             
## delta       3                                    
## sd          5                                    
## sig.level   0.05                                 
## power       0.8                                  
## alternative "two.sided"                          
## note        NULL                                 
## method      "One-sample t test power calculation"
##             [,3]                                 
## n           9.937864                             
## delta       3                                    
## sd          3                                    
## sig.level   0.05                                 
## power       0.8                                  
## alternative "two.sided"                          
## note        NULL                                 
## method      "One-sample t test power calculation"

For a small effect size even one hundred subjects is not enough!

ANOVA

The same logic can be applied to any other test. Let's do it for a between-subject ANOVA just for practice. Say, we have three equally-sized groups with different means and SDs. What is the sample size needed?

group_labels <- c('A','B','C')
means <- c(0, 0.5, 1) 
sds <- c(1, 2, 3)

conditions <- data.table(label = group_labels, mu = means, sigma = sds)

# lets try to run ANOVA with N = 20 per group 
n_subjects <- 20

# generate the data
data <- conditions[,.( dv = rnorm(n_subjects, mu, sigma)), by = .(label)]
# compute ANOVA
aov_res <- aov(dv~label, conditions[,.( dv = rnorm(n_subjects, mu, sigma)), by = .(label)])
aov_summary <- summary(aov_res)

# for the power simulations, we need to extract p-value. How to do this?
# it's useful to look at the structure of the summary using the str function
str(aov_summary)
## List of 1
##  $ :Classes 'anova' and 'data.frame':	2 obs. of  5 variables:
##   ..$ Df     : num [1:2] 2 57
##   ..$ Sum Sq : num [1:2] 32.3 345.8
##   ..$ Mean Sq: num [1:2] 16.14 6.07
##   ..$ F value: num [1:2] 2.66 NA
##   ..$ Pr(>F) : num [1:2] 0.0786 NA
##  - attr(*, "class")= chr [1:2] "summary.aov" "listof"
# we see that it's a list of length 1 with a data.frame inside
# so to get p_value we first extract the data.frame from a list and then take the first value from `Pr(>F)` column (if this sounds complicated, try to see just the extracted data.frame)
aov_summary[[1]]$`Pr(>F)`[1]
## [1] 0.07858322
# now, we'll wrap this code in a function for the power calculations
get_sim_anova_p <- function(n_subjects, conditions){
  aov_res <- aov(dv~label, conditions[,.( dv = rnorm(n_subjects, mu, sigma)), by = .(label)])
  summary(aov_res)[[1]]$`Pr(>F)`[1]
}

# create a new simulation grid (the group parameters are fixed, and the n_subjects here is the number of subjects per group)
sim_dt <- data.table(expand.grid(n_subjects = 2:100, n_reps = 1:max_n_reps)) 

sim_dt <- sim_dt[, p_val:=get_sim_anova_p(n_subjects, conditions ), by = .(n_subjects, n_reps)]

# compute the average probability of getting a significant result
sim_dt_avg<-sim_dt[,.(power = mean(as.numeric(p_val<0.05))), by = .(n_subjects)]

# plot power as a function of the number of subjects
p_power <- ggplot(sim_dt_avg, aes(x = n_subjects, y = power))+
  geom_line(stat='summary', fun.y = mean)+
  labs(y = 'Power', x = 'N subjects')+
  theme(legend.position = c(1,0), legend.justification = c(1,0))+ 
  geom_hline(yintercept = 0.8, linetype = 2, color = 'black')

p_power

# get the minimal number of subjects needed to achieve 80% power 
sim_dt_avg[power>=0.8, min(n_subjects)]
## [1] 92
# compare with the results from Superpower
anovapower_res <- plot_power((ANOVA_design('3b', 30, means, sds)), alpha_level = 0.05, min_n = 7, max_n = 100, plot = TRUE)

anovapower_res$power_df[anovapower_res$power_df$a>=80,][1,]
<script data-pagedtable-source type="application/json"> {"columns":[{"label":[""],"name":["_rn_"],"type":[""],"align":["left"]},{"label":["n"],"name":[1],"type":["int"],"align":["right"]},{"label":["a"],"name":[2],"type":["dbl"],"align":["right"]}],"data":[{"1":"88","2":"80.03808","_rn_":"82"}],"options":{"columns":{"min":{},"max":[10]},"rows":{"min":[10],"max":[10]},"pages":{}}} </script>

Exercise 2: Simulate and compare the power curves and estimate minimal N for a two-sample t-test with $\mu = 5$, $\sigma = 10$ and $\mu = 15$, $\sigma = 10$.

group_labels <- c('A','B')
means <- c(5, 15) 
sds <- c(10, 10)

conditions <- data.table(label = group_labels, mu = means, sigma = sds)

# how to get p-value from t-test? check the structure of t-test object
str(t.test(rnorm(5000)))
## List of 9
##  $ statistic  : Named num 0.511
##   ..- attr(*, "names")= chr "t"
##  $ parameter  : Named num 4999
##   ..- attr(*, "names")= chr "df"
##  $ p.value    : num 0.609
##  $ conf.int   : num [1:2] -0.0207 0.0353
##   ..- attr(*, "conf.level")= num 0.95
##  $ estimate   : Named num 0.00731
##   ..- attr(*, "names")= chr "mean of x"
##  $ null.value : Named num 0
##   ..- attr(*, "names")= chr "mean"
##  $ alternative: chr "two.sided"
##  $ method     : chr "One Sample t-test"
##  $ data.name  : chr "rnorm(5000)"
##  - attr(*, "class")= chr "htest"
t.test(rnorm(5000))$p.value
## [1] 0.6356334
# now, we'll wrap this code in a function for the power calculations
get_sim_ttest_p <- function(n_subjects, conditions){
  t_res <- t.test(dv~label, conditions[,.( dv = rnorm(n_subjects, mu, sigma)), by = .(label)])
  t_res$p.value
}

# create a new simulation grid (the group parameters are fixed, and the n_subjects here is the number of subjects per group)
sim_dt <- data.table(expand.grid(n_subjects = 2:100, n_reps = 1:max_n_reps)) 

sim_dt <- sim_dt[, p_val:=get_sim_ttest_p(n_subjects, conditions ), by = .(n_subjects, n_reps)]

# compute the average probability of getting a significant result
sim_dt_avg<-sim_dt[,.(power = mean(as.numeric(p_val<0.05))), by = .(n_subjects)]

# plot power as a function of the number of subjects
p_power <- ggplot(sim_dt_avg, aes(x = n_subjects, y = power))+
  geom_line(stat='summary', fun.y = mean)+
  labs(y = 'Power', x = 'N subjects')+
  theme(legend.position = c(1,0), legend.justification = c(1,0))+ 
  geom_hline(yintercept = 0.8, linetype = 2, color = 'black')

p_power

# get the minimal number of subjects needed to achieve 80% power 
sim_dt_avg[power>=0.8, min(n_subjects)]
## [1] 17
# compare with the results from pwr::pwr.t.test
pwr.t.test(d = (means[2]-means[1])/sqrt(sum(sds^2)/2), power = 0.8, type = 'two.sample' )
## 
##      Two-sample t test power calculation 
## 
##               n = 16.71472
##               d = 1
##       sig.level = 0.05
##           power = 0.8
##     alternative = two.sided
## 
## NOTE: n is number in *each* group

For simple designs, it is easy to estimate power from summary statistics (e.g., means and variances by group) reported in previous papers. On the other hand, for more complex designs this is not always the case.

Mixed designs

For more complex designs things become funnier. As you probably know, within-subject designs allow accounting for between-subject variability by measuring the same parameter repeatedly for each subject. This means that if you want to estimate the power of such designs, you need to simulate not only the distribution of parameter values between subjects, but also their distribution within the subjects.

We will use face recognition data from the "apastats" package. From the manual (? faces): "This dataset contains data on response times in a face identification task. The faces were presented for a short time, then two faces (old and new) appeared and participants were asked to choose the old one. The data contains the information about gender (both stimuli gender and participants gender) and answer accuracy ...".

data("faces")

# we'll analyze only the correct answers
faces <- faces[correct==1]

# we'll use log-transformed data to make normal approximation more appropriate
faces[,logRT:=log(answerTime)]
faces[,stim_gender:=factor(stim_gender, levels = c('F','M'))]

# first, we'll just plot the means; plot.pointrange is a ggplot wrapper that allows plotting the means and confidence intervals accounting for within-subject variability

plot.pointrange(faces, aes(x = stim_gender, y = logRT), wid = 'uid', within_subj = T, do_aggregate = T)+labs(x = 'Stimulus (Male/Female face)', y = 'log RT')

# response times differ (ns.) by condition; to test the significance of the difference we again use just a t-test, but we aggregate the data by subject x condition before testing

faces_aggr <- faces[,.(logRT = mean(logRT)), by = .(uid, stim_gender)]
(t.test(logRT~stim_gender, faces_aggr, paired = T))
## 
## 	Paired t-test
## 
## data:  logRT by stim_gender
## t = -3.6861, df = 59, p-value = 0.0004971
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  -0.1536453 -0.0455256
## sample estimates:
## mean of the differences 
##             -0.09958547
mean_sd_by_subj <- faces[,data.frame(t(smean.sd(logRT))), keyby = .(uid, stim_gender)]

# reshaping to get mean for each subject in rows
mean_sd_by_subj_re <- dcast(mean_sd_by_subj, uid~stim_gender, value.var = 'Mean')

# plot the results
ggplot(mean_sd_by_subj, aes(x = Mean, y = SD))+geom_point()+stat_density2d()+labs(x = 'Mean of logRT', y ='SD of logRT')

ggplot(mean_sd_by_subj_re, aes(x = M, y = F))+geom_point()+stat_density2d()+labs(x = 'logRT for male faces', y ='logRT for female faces')

As you can see, the parameters of the RT distribution by subject are correlated. To simulate the distribution of these parameters, we will need a covariance matrix. A covariance matrix contains variances of the distribution on the diagonal and covariances off the diagonal.

# means 
mean_est <- mean_sd_by_subj[,mean(Mean), keyby = stim_gender]$V1

# covariance matrix
cov_mat <- var(mean_sd_by_subj_re[,.(F, M)])

cov_mat
##            F          M
## F 0.09722490 0.08575558
## M 0.08575558 0.11807971
# generate multivariate normal data and check its covariance and means
sim_data <- data.frame(mvrnorm(n = 1000, mean_est, cov_mat))
var(sim_data)
##            F          M
## F 0.09898578 0.08672101
## M 0.08672101 0.11725607
colMeans(sim_data)
##           F           M 
## -0.15428201 -0.05563457
# plot the simulated data
ggplot(sim_data, aes(x = M, y = F))+geom_point()+stat_density2d()+labs(x = 'logRT for male faces', y ='logRT for female faces')

For simplicity, we will assume that SDs are the same for all subjects (which they aren't). Otherwise we'll have to make a 4D distribution accounting for covariances in means and SDs in each condition and/or define SD as a function of the mean.

# now we again create a function that will do the simulation for a given number of subjects & trials, covariance of means by condition, and the average SD

avg_sd <- mean_sd_by_subj[,mean(SD)]

# note that the design is not balanced
faces[,.N, by =.(uid, stim_gender)][,mean(N),by=.(stim_gender)]
<script data-pagedtable-source type="application/json"> {"columns":[{"label":["stim_gender"],"name":[1],"type":["fctr"],"align":["left"]},{"label":["V1"],"name":[2],"type":["dbl"],"align":["right"]}],"data":[{"1":"M","2":"20.11667"},{"1":"F","2":"9.55000"}],"options":{"columns":{"min":{},"max":[10]},"rows":{"min":[10],"max":[10]},"pages":{}}} </script>
# accordingly, we'll use uneven number of trials per condition
n_trials <- round(faces[,.N, by =.(uid, stim_gender)][,mean(N),by=.(stim_gender)]$V1)

simulate_mix <- function (n_subjects, n_trials, mean_est, cov_mat, avg_sd){
  # generate means by subject
  sim_data <- data.table(mvrnorm(n = n_subjects, mean_est, cov_mat))
  # create subject IDs
  sim_data[,uid:=1:.N]
  # for each condition, generate trials
  sim_data[,rbind(
    data.frame(stim_gender = 'M', logRT = rnorm(n_trials[1], M, avg_sd)),
    data.frame(stim_gender = 'F', logRT = rnorm(n_trials[2], F, avg_sd))), by = .(uid)]
}


# example: simulate data with the original number of trials and subjects
ex_sim <- simulate_mix(n_subjects = 60, n_trials = c(20, 10), mean_est = mean_est, cov_mat = cov_mat, avg_sd = avg_sd)
ex_sim[,.N, by = .(uid, stim_gender)]
<script data-pagedtable-source type="application/json"> {"columns":[{"label":["uid"],"name":[1],"type":["int"],"align":["right"]},{"label":["stim_gender"],"name":[2],"type":["fctr"],"align":["left"]},{"label":["N"],"name":[3],"type":["int"],"align":["right"]}],"data":[{"1":"1","2":"M","3":"20"},{"1":"1","2":"F","3":"10"},{"1":"2","2":"M","3":"20"},{"1":"2","2":"F","3":"10"},{"1":"3","2":"M","3":"20"},{"1":"3","2":"F","3":"10"},{"1":"4","2":"M","3":"20"},{"1":"4","2":"F","3":"10"},{"1":"5","2":"M","3":"20"},{"1":"5","2":"F","3":"10"},{"1":"6","2":"M","3":"20"},{"1":"6","2":"F","3":"10"},{"1":"7","2":"M","3":"20"},{"1":"7","2":"F","3":"10"},{"1":"8","2":"M","3":"20"},{"1":"8","2":"F","3":"10"},{"1":"9","2":"M","3":"20"},{"1":"9","2":"F","3":"10"},{"1":"10","2":"M","3":"20"},{"1":"10","2":"F","3":"10"},{"1":"11","2":"M","3":"20"},{"1":"11","2":"F","3":"10"},{"1":"12","2":"M","3":"20"},{"1":"12","2":"F","3":"10"},{"1":"13","2":"M","3":"20"},{"1":"13","2":"F","3":"10"},{"1":"14","2":"M","3":"20"},{"1":"14","2":"F","3":"10"},{"1":"15","2":"M","3":"20"},{"1":"15","2":"F","3":"10"},{"1":"16","2":"M","3":"20"},{"1":"16","2":"F","3":"10"},{"1":"17","2":"M","3":"20"},{"1":"17","2":"F","3":"10"},{"1":"18","2":"M","3":"20"},{"1":"18","2":"F","3":"10"},{"1":"19","2":"M","3":"20"},{"1":"19","2":"F","3":"10"},{"1":"20","2":"M","3":"20"},{"1":"20","2":"F","3":"10"},{"1":"21","2":"M","3":"20"},{"1":"21","2":"F","3":"10"},{"1":"22","2":"M","3":"20"},{"1":"22","2":"F","3":"10"},{"1":"23","2":"M","3":"20"},{"1":"23","2":"F","3":"10"},{"1":"24","2":"M","3":"20"},{"1":"24","2":"F","3":"10"},{"1":"25","2":"M","3":"20"},{"1":"25","2":"F","3":"10"},{"1":"26","2":"M","3":"20"},{"1":"26","2":"F","3":"10"},{"1":"27","2":"M","3":"20"},{"1":"27","2":"F","3":"10"},{"1":"28","2":"M","3":"20"},{"1":"28","2":"F","3":"10"},{"1":"29","2":"M","3":"20"},{"1":"29","2":"F","3":"10"},{"1":"30","2":"M","3":"20"},{"1":"30","2":"F","3":"10"},{"1":"31","2":"M","3":"20"},{"1":"31","2":"F","3":"10"},{"1":"32","2":"M","3":"20"},{"1":"32","2":"F","3":"10"},{"1":"33","2":"M","3":"20"},{"1":"33","2":"F","3":"10"},{"1":"34","2":"M","3":"20"},{"1":"34","2":"F","3":"10"},{"1":"35","2":"M","3":"20"},{"1":"35","2":"F","3":"10"},{"1":"36","2":"M","3":"20"},{"1":"36","2":"F","3":"10"},{"1":"37","2":"M","3":"20"},{"1":"37","2":"F","3":"10"},{"1":"38","2":"M","3":"20"},{"1":"38","2":"F","3":"10"},{"1":"39","2":"M","3":"20"},{"1":"39","2":"F","3":"10"},{"1":"40","2":"M","3":"20"},{"1":"40","2":"F","3":"10"},{"1":"41","2":"M","3":"20"},{"1":"41","2":"F","3":"10"},{"1":"42","2":"M","3":"20"},{"1":"42","2":"F","3":"10"},{"1":"43","2":"M","3":"20"},{"1":"43","2":"F","3":"10"},{"1":"44","2":"M","3":"20"},{"1":"44","2":"F","3":"10"},{"1":"45","2":"M","3":"20"},{"1":"45","2":"F","3":"10"},{"1":"46","2":"M","3":"20"},{"1":"46","2":"F","3":"10"},{"1":"47","2":"M","3":"20"},{"1":"47","2":"F","3":"10"},{"1":"48","2":"M","3":"20"},{"1":"48","2":"F","3":"10"},{"1":"49","2":"M","3":"20"},{"1":"49","2":"F","3":"10"},{"1":"50","2":"M","3":"20"},{"1":"50","2":"F","3":"10"},{"1":"51","2":"M","3":"20"},{"1":"51","2":"F","3":"10"},{"1":"52","2":"M","3":"20"},{"1":"52","2":"F","3":"10"},{"1":"53","2":"M","3":"20"},{"1":"53","2":"F","3":"10"},{"1":"54","2":"M","3":"20"},{"1":"54","2":"F","3":"10"},{"1":"55","2":"M","3":"20"},{"1":"55","2":"F","3":"10"},{"1":"56","2":"M","3":"20"},{"1":"56","2":"F","3":"10"},{"1":"57","2":"M","3":"20"},{"1":"57","2":"F","3":"10"},{"1":"58","2":"M","3":"20"},{"1":"58","2":"F","3":"10"},{"1":"59","2":"M","3":"20"},{"1":"59","2":"F","3":"10"},{"1":"60","2":"M","3":"20"},{"1":"60","2":"F","3":"10"}],"options":{"columns":{"min":{},"max":[10]},"rows":{"min":[10],"max":[10]},"pages":{}}} </script>
ex_sim[,stim_gender:=factor(stim_gender, levels = c('F','M'))]

# compare original and simulated data
p1 <- plot.pointrange(ex_sim, aes(x = stim_gender, y = logRT), wid = 'uid', do_aggregate = T) + labs(x = 'Stimulus (Male/Female face)', y = 'log RT', title = 'Simulated')
p2 <- plot.pointrange(faces, aes(x = stim_gender, y = logRT), wid = 'uid', within_subj = T, do_aggregate = T) + labs(x = 'Stimulus (Male/Female face)', y = 'log RT', title = 'Original')

(p1+p2)*coord_cartesian(ylim = c(-0.3, 0.1))

The original and the simulated data should look relatively similar (note that we have made simplifications when approximating the data model so they won't be exactly similar; besides, it is simulated data).

# to make things easier, we will make another function that will aggregate the output of simulate_mix and compute p-value
simulate_mix_aggr <-  function (n_subjects, n_trials, mean_est, cov_mat, avg_sd){
  sim_data <- simulate_mix(n_subjects = n_subjects, n_trials = n_trials, mean_est = mean_est, cov_mat = cov_mat, avg_sd = avg_sd)
  
  sim_data_aggr <- sim_data[,.(logRT = mean(logRT)), by = .(uid, stim_gender)]
  (t.test(logRT~stim_gender, sim_data_aggr, paired = T))$p.value 
}

# now we will simulate data for different numbers of subjects like we did before
# to speed up simulations, we will generate n_subjects in steps of five

sim_dt <- data.table(expand.grid(n_subjects = seq(2,100,5), n_reps = 1:max_n_reps)) 

# compute p-value for each replication and each sample size
sim_dt[, p_val:= simulate_mix_aggr(n_subjects, n_trials, mean_est, cov_mat, avg_sd), by = .(n_subjects, n_reps)]

# compute the average probability of getting a significant result
sim_dt_avg<-sim_dt[,.(power = mean(as.numeric(p_val<0.05))), by = n_subjects]

ggplot(sim_dt_avg, aes(x = n_subjects, y = power))+
  geom_line(stat='summary', fun.y = mean) +
  geom_hline(yintercept = 0.8, linetype = 2, color = 'red') +
  labs(y = 'Power', x = 'N subjects')

An alternative to changing the number of subjects is changing the number of trials. So how do trial numbers affect study power?

# we will keep the same proportion of trials by condition, so we only need to set the number of trials in one of them
# we will also check three sample sizes 

sim_dt_by_trial <- data.table(expand.grid(n_subjects = c(10,40,60), n_reps = 1:max_n_reps, n_trials_f = c(1, 5, 10, 20, 40))) 

# compute p-value for each replication and each sample size and trial number
sim_dt_by_trial[, p_val:= simulate_mix_aggr(n_subjects, n_trials = c(n_trials_f*2, n_trials_f), mean_est, cov_mat, avg_sd), by = .(n_subjects, n_reps, n_trials_f)]

# compute the average probability of getting a significant result
sim_dt_by_trial_avg<-sim_dt_by_trial[,.(power = mean(as.numeric(p_val<0.05))), by = .(n_subjects,n_trials_f) ]

ggplot(sim_dt_by_trial_avg, aes(x = n_trials_f, color = factor(n_subjects), y = power))+
  geom_line(stat='summary', fun.y = mean)+
  labs(y = 'Power', x = 'N trials', color = 'N subjects')+
   geom_hline(yintercept = 0.8, linetype = 2, color = 'red') 

Depending on between- and within-subject variability, trial number can be more or less important compared to the sample size. In the current data, power plateaued at about 20 trials in the smaller condition.

Exercise 3: Read the data from Raifei et al. (2020) study (Raifei_2020_simplified.csv) and estimate the power for 10, 20, 40, and 100 subjects for the average trial N from 100 to 500 in steps of 100 (in both conditions).

Raifei et al. (2020, https://psyarxiv.com/m79nu/) estimated biases in perceived orientation of visual search targets as a function of distractor orientation (clockwise or counterclockwise relative to the target) among other questions

data_raifei <- fread(file = 'Raifei_2020_simplified.csv')
# participant - participant ID
# target_distr_rel - a target is oriented clockwise (T>D) or counterclockwise (T<D) relative to distractors
# be_c - error in the adjustment task

str(data_raifei)
## Classes 'data.table' and 'data.frame':	4160 obs. of  3 variables:
##  $ participant     : chr  "S1" "S1" "S1" "S1" ...
##  $ target_distr_rel: chr  "T>D" "T>D" "T>D" "T<D" ...
##  $ be_c            : num  17.35 20.53 -7.37 7.19 -12.56 ...
##  - attr(*, ".internal.selfref")=<externalptr>
plot_raifei <- plot.pointrange(data_raifei, aes(x = target_distr_rel, y = be_c), wid = 'participant', do_aggregate = T)+labs(y = 'Bias', x = 'Target Orientation Relative to Distractors')

plot_raifei

# for tests, you can use ANOVA 
ezANOVA(data = data_raifei, dv = be_c, wid = participant, within = target_distr_rel )
## Warning: Converting "participant" to factor for ANOVA.
## Warning: Converting "target_distr_rel" to factor for ANOVA.
## Warning: Collapsing data to cell means. *IF* the requested effects are a subset
## of the full design, you must use the "within_full" argument, else results may be
## inaccurate.
## $ANOVA
##             Effect DFn DFd       F         p p<.05       ges
## 2 target_distr_rel   1  19 6.72895 0.0178109     * 0.1648493
# or just a t-test
t.test(be_c~target_distr_rel, data_raifei[,.(be_c = mymean(be_c)), by = .(participant, target_distr_rel)])
## 
## 	Welch Two Sample t-test
## 
## data:  be_c by target_distr_rel
## t = -2.7388, df = 32.754, p-value = 0.009896
## alternative hypothesis: true difference in means is not equal to 0
## 95 percent confidence interval:
##  -1.8646446 -0.2748452
## sample estimates:
## mean in group T<D mean in group T>D 
##        -0.7388362         0.3309087

As you can see, when targets are oriented clockwise to distractors (T>D) the error ("bias") is counterclockwise (negative) while when targets are oriented counter-clockwise to distractors (T<D) the error ("bias") is clockwise (positive). The question is, was the number of subjects or trials really enough? Or did the authors just get lucky?

# write the function to simulate the data by condition
simulate_mix_raifei <- function (n_subjects, n_trials, mean_est, cov_mat, avg_sd){
  # generate means by subject
  sim_data <- data.table(mvrnorm(n = n_subjects, mean_est, cov_mat))
  # create subject IDs
  sim_data[, participant := 1:.N]
  # for each condition, generate trials
  sim_data[,rbind(
    data.frame(target_distr_rel = 'T<D', be_c = rnorm(n_trials, `T<D`, avg_sd)),
    data.frame(target_distr_rel = 'T>D', be_c = rnorm(n_trials, `T>D`, avg_sd))), by = .(participant)]
}

# get the distribution of means and sds 
mean_sd_by_subj <- data_raifei[,data.frame(t(smean.sd(be_c))), keyby = .(participant, target_distr_rel)]

# reshaping to get mean for each subject in rows
mean_sd_by_subj_re <- dcast(mean_sd_by_subj, participant ~ target_distr_rel, value.var = 'Mean')

# get means by conditon
mean_est <- mean_sd_by_subj[, mean(Mean), by = .(target_distr_rel)]$V1

# get covariance matrix
cov_mat <- var(mean_sd_by_subj_re[,.(`T<D`, `T>D`)])

# get average SD
avg_sd <- mean_sd_by_subj[,mymean(SD)]

n_trials <- data_raifei[,.N, keyby = .(participant, target_distr_rel)][,mean(N)]

# example: simulate data with the original number of trials and subjects
ex_sim <- simulate_mix_raifei(n_subjects = 20, n_trials = round(n_trials), mean_est = mean_est, cov_mat = cov_mat, avg_sd = avg_sd)

ex_sim[,.N, by = .(participant, target_distr_rel)]
<script data-pagedtable-source type="application/json"> {"columns":[{"label":["participant"],"name":[1],"type":["int"],"align":["right"]},{"label":["target_distr_rel"],"name":[2],"type":["fctr"],"align":["left"]},{"label":["N"],"name":[3],"type":["int"],"align":["right"]}],"data":[{"1":"1","2":"TD","3":"104"},{"1":"2","2":"TD","3":"104"},{"1":"3","2":"TD","3":"104"},{"1":"4","2":"TD","3":"104"},{"1":"5","2":"TD","3":"104"},{"1":"6","2":"TD","3":"104"},{"1":"7","2":"TD","3":"104"},{"1":"8","2":"TD","3":"104"},{"1":"9","2":"TD","3":"104"},{"1":"10","2":"TD","3":"104"},{"1":"11","2":"TD","3":"104"},{"1":"12","2":"TD","3":"104"},{"1":"13","2":"TD","3":"104"},{"1":"14","2":"TD","3":"104"},{"1":"15","2":"TD","3":"104"},{"1":"16","2":"TD","3":"104"},{"1":"17","2":"TD","3":"104"},{"1":"18","2":"TD","3":"104"},{"1":"19","2":"TD","3":"104"},{"1":"20","2":"TD","3":"104"}],"options":{"columns":{"min":{},"max":[10]},"rows":{"min":[10],"max":[10]},"pages":{}}} </script>
# compare original and simulated data
p_sim <- plot.pointrange(ex_sim, aes(x = target_distr_rel, y = be_c), wid = 'participant', do_aggregate = T) +labs(y = 'Bias', x = 'Target Orientation Relative to Distractors', title = 'Simulated data')

(plot_raifei+ggtitle('Original data')+p_sim)*coord_cartesian(ylim = c(-1.5, 1.5))

# create the second function to compute the power
simulate_mix_raifei_aggr <- function (n_subjects, n_trials, mean_est, cov_mat, avg_sd){
  sim_data <- simulate_mix_raifei(n_subjects, n_trials, mean_est, cov_mat, avg_sd)

  # average by condition x subject, compute p value
  sim_data[,.(be_c = mean(be_c)), by = .(participant, target_distr_rel)][,t.test(be_c~target_distr_rel, paired = T)$p.value]
}

sim_dt_by_trial_raifei <- data.table(expand.grid(n_subjects = c(10,20,40,100), n_reps = 1:max_n_reps, n_trials = seq(100, 500, 100)))
sim_dt_by_trial_raifei
<script data-pagedtable-source type="application/json"> {"columns":[{"label":["n_subjects"],"name":[1],"type":["dbl"],"align":["right"]},{"label":["n_reps"],"name":[2],"type":["int"],"align":["right"]},{"label":["n_trials"],"name":[3],"type":["dbl"],"align":["right"]}],"data":[{"1":"10","2":"1","3":"100"},{"1":"20","2":"1","3":"100"},{"1":"40","2":"1","3":"100"},{"1":"100","2":"1","3":"100"},{"1":"10","2":"2","3":"100"},{"1":"20","2":"2","3":"100"},{"1":"40","2":"2","3":"100"},{"1":"100","2":"2","3":"100"},{"1":"10","2":"3","3":"100"},{"1":"20","2":"3","3":"100"},{"1":"40","2":"3","3":"100"},{"1":"100","2":"3","3":"100"},{"1":"10","2":"4","3":"100"},{"1":"20","2":"4","3":"100"},{"1":"40","2":"4","3":"100"},{"1":"100","2":"4","3":"100"},{"1":"10","2":"5","3":"100"},{"1":"20","2":"5","3":"100"},{"1":"40","2":"5","3":"100"},{"1":"100","2":"5","3":"100"},{"1":"10","2":"6","3":"100"},{"1":"20","2":"6","3":"100"},{"1":"40","2":"6","3":"100"},{"1":"100","2":"6","3":"100"},{"1":"10","2":"7","3":"100"},{"1":"20","2":"7","3":"100"},{"1":"40","2":"7","3":"100"},{"1":"100","2":"7","3":"100"},{"1":"10","2":"8","3":"100"},{"1":"20","2":"8","3":"100"},{"1":"40","2":"8","3":"100"},{"1":"100","2":"8","3":"100"},{"1":"10","2":"9","3":"100"},{"1":"20","2":"9","3":"100"},{"1":"40","2":"9","3":"100"},{"1":"100","2":"9","3":"100"},{"1":"10","2":"10","3":"100"},{"1":"20","2":"10","3":"100"},{"1":"40","2":"10","3":"100"},{"1":"100","2":"10","3":"100"},{"1":"10","2":"11","3":"100"},{"1":"20","2":"11","3":"100"},{"1":"40","2":"11","3":"100"},{"1":"100","2":"11","3":"100"},{"1":"10","2":"12","3":"100"},{"1":"20","2":"12","3":"100"},{"1":"40","2":"12","3":"100"},{"1":"100","2":"12","3":"100"},{"1":"10","2":"13","3":"100"},{"1":"20","2":"13","3":"100"},{"1":"40","2":"13","3":"100"},{"1":"100","2":"13","3":"100"},{"1":"10","2":"14","3":"100"},{"1":"20","2":"14","3":"100"},{"1":"40","2":"14","3":"100"},{"1":"100","2":"14","3":"100"},{"1":"10","2":"15","3":"100"},{"1":"20","2":"15","3":"100"},{"1":"40","2":"15","3":"100"},{"1":"100","2":"15","3":"100"},{"1":"10","2":"16","3":"100"},{"1":"20","2":"16","3":"100"},{"1":"40","2":"16","3":"100"},{"1":"100","2":"16","3":"100"},{"1":"10","2":"17","3":"100"},{"1":"20","2":"17","3":"100"},{"1":"40","2":"17","3":"100"},{"1":"100","2":"17","3":"100"},{"1":"10","2":"18","3":"100"},{"1":"20","2":"18","3":"100"},{"1":"40","2":"18","3":"100"},{"1":"100","2":"18","3":"100"},{"1":"10","2":"19","3":"100"},{"1":"20","2":"19","3":"100"},{"1":"40","2":"19","3":"100"},{"1":"100","2":"19","3":"100"},{"1":"10","2":"20","3":"100"},{"1":"20","2":"20","3":"100"},{"1":"40","2":"20","3":"100"},{"1":"100","2":"20","3":"100"},{"1":"10","2":"21","3":"100"},{"1":"20","2":"21","3":"100"},{"1":"40","2":"21","3":"100"},{"1":"100","2":"21","3":"100"},{"1":"10","2":"22","3":"100"},{"1":"20","2":"22","3":"100"},{"1":"40","2":"22","3":"100"},{"1":"100","2":"22","3":"100"},{"1":"10","2":"23","3":"100"},{"1":"20","2":"23","3":"100"},{"1":"40","2":"23","3":"100"},{"1":"100","2":"23","3":"100"},{"1":"10","2":"24","3":"100"},{"1":"20","2":"24","3":"100"},{"1":"40","2":"24","3":"100"},{"1":"100","2":"24","3":"100"},{"1":"10","2":"25","3":"100"},{"1":"20","2":"25","3":"100"},{"1":"40","2":"25","3":"100"},{"1":"100","2":"25","3":"100"},{"1":"10","2":"26","3":"100"},{"1":"20","2":"26","3":"100"},{"1":"40","2":"26","3":"100"},{"1":"100","2":"26","3":"100"},{"1":"10","2":"27","3":"100"},{"1":"20","2":"27","3":"100"},{"1":"40","2":"27","3":"100"},{"1":"100","2":"27","3":"100"},{"1":"10","2":"28","3":"100"},{"1":"20","2":"28","3":"100"},{"1":"40","2":"28","3":"100"},{"1":"100","2":"28","3":"100"},{"1":"10","2":"29","3":"100"},{"1":"20","2":"29","3":"100"},{"1":"40","2":"29","3":"100"},{"1":"100","2":"29","3":"100"},{"1":"10","2":"30","3":"100"},{"1":"20","2":"30","3":"100"},{"1":"40","2":"30","3":"100"},{"1":"100","2":"30","3":"100"},{"1":"10","2":"31","3":"100"},{"1":"20","2":"31","3":"100"},{"1":"40","2":"31","3":"100"},{"1":"100","2":"31","3":"100"},{"1":"10","2":"32","3":"100"},{"1":"20","2":"32","3":"100"},{"1":"40","2":"32","3":"100"},{"1":"100","2":"32","3":"100"},{"1":"10","2":"33","3":"100"},{"1":"20","2":"33","3":"100"},{"1":"40","2":"33","3":"100"},{"1":"100","2":"33","3":"100"},{"1":"10","2":"34","3":"100"},{"1":"20","2":"34","3":"100"},{"1":"40","2":"34","3":"100"},{"1":"100","2":"34","3":"100"},{"1":"10","2":"35","3":"100"},{"1":"20","2":"35","3":"100"},{"1":"40","2":"35","3":"100"},{"1":"100","2":"35","3":"100"},{"1":"10","2":"36","3":"100"},{"1":"20","2":"36","3":"100"},{"1":"40","2":"36","3":"100"},{"1":"100","2":"36","3":"100"},{"1":"10","2":"37","3":"100"},{"1":"20","2":"37","3":"100"},{"1":"40","2":"37","3":"100"},{"1":"100","2":"37","3":"100"},{"1":"10","2":"38","3":"100"},{"1":"20","2":"38","3":"100"},{"1":"40","2":"38","3":"100"},{"1":"100","2":"38","3":"100"},{"1":"10","2":"39","3":"100"},{"1":"20","2":"39","3":"100"},{"1":"40","2":"39","3":"100"},{"1":"100","2":"39","3":"100"},{"1":"10","2":"40","3":"100"},{"1":"20","2":"40","3":"100"},{"1":"40","2":"40","3":"100"},{"1":"100","2":"40","3":"100"},{"1":"10","2":"41","3":"100"},{"1":"20","2":"41","3":"100"},{"1":"40","2":"41","3":"100"},{"1":"100","2":"41","3":"100"},{"1":"10","2":"42","3":"100"},{"1":"20","2":"42","3":"100"},{"1":"40","2":"42","3":"100"},{"1":"100","2":"42","3":"100"},{"1":"10","2":"43","3":"100"},{"1":"20","2":"43","3":"100"},{"1":"40","2":"43","3":"100"},{"1":"100","2":"43","3":"100"},{"1":"10","2":"44","3":"100"},{"1":"20","2":"44","3":"100"},{"1":"40","2":"44","3":"100"},{"1":"100","2":"44","3":"100"},{"1":"10","2":"45","3":"100"},{"1":"20","2":"45","3":"100"},{"1":"40","2":"45","3":"100"},{"1":"100","2":"45","3":"100"},{"1":"10","2":"46","3":"100"},{"1":"20","2":"46","3":"100"},{"1":"40","2":"46","3":"100"},{"1":"100","2":"46","3":"100"},{"1":"10","2":"47","3":"100"},{"1":"20","2":"47","3":"100"},{"1":"40","2":"47","3":"100"},{"1":"100","2":"47","3":"100"},{"1":"10","2":"48","3":"100"},{"1":"20","2":"48","3":"100"},{"1":"40","2":"48","3":"100"},{"1":"100","2":"48","3":"100"},{"1":"10","2":"49","3":"100"},{"1":"20","2":"49","3":"100"},{"1":"40","2":"49","3":"100"},{"1":"100","2":"49","3":"100"},{"1":"10","2":"50","3":"100"},{"1":"20","2":"50","3":"100"},{"1":"40","2":"50","3":"100"},{"1":"100","2":"50","3":"100"},{"1":"10","2":"51","3":"100"},{"1":"20","2":"51","3":"100"},{"1":"40","2":"51","3":"100"},{"1":"100","2":"51","3":"100"},{"1":"10","2":"52","3":"100"},{"1":"20","2":"52","3":"100"},{"1":"40","2":"52","3":"100"},{"1":"100","2":"52","3":"100"},{"1":"10","2":"53","3":"100"},{"1":"20","2":"53","3":"100"},{"1":"40","2":"53","3":"100"},{"1":"100","2":"53","3":"100"},{"1":"10","2":"54","3":"100"},{"1":"20","2":"54","3":"100"},{"1":"40","2":"54","3":"100"},{"1":"100","2":"54","3":"100"},{"1":"10","2":"55","3":"100"},{"1":"20","2":"55","3":"100"},{"1":"40","2":"55","3":"100"},{"1":"100","2":"55","3":"100"},{"1":"10","2":"56","3":"100"},{"1":"20","2":"56","3":"100"},{"1":"40","2":"56","3":"100"},{"1":"100","2":"56","3":"100"},{"1":"10","2":"57","3":"100"},{"1":"20","2":"57","3":"100"},{"1":"40","2":"57","3":"100"},{"1":"100","2":"57","3":"100"},{"1":"10","2":"58","3":"100"},{"1":"20","2":"58","3":"100"},{"1":"40","2":"58","3":"100"},{"1":"100","2":"58","3":"100"},{"1":"10","2":"59","3":"100"},{"1":"20","2":"59","3":"100"},{"1":"40","2":"59","3":"100"},{"1":"100","2":"59","3":"100"},{"1":"10","2":"60","3":"100"},{"1":"20","2":"60","3":"100"},{"1":"40","2":"60","3":"100"},{"1":"100","2":"60","3":"100"},{"1":"10","2":"61","3":"100"},{"1":"20","2":"61","3":"100"},{"1":"40","2":"61","3":"100"},{"1":"100","2":"61","3":"100"},{"1":"10","2":"62","3":"100"},{"1":"20","2":"62","3":"100"},{"1":"40","2":"62","3":"100"},{"1":"100","2":"62","3":"100"},{"1":"10","2":"63","3":"100"},{"1":"20","2":"63","3":"100"},{"1":"40","2":"63","3":"100"},{"1":"100","2":"63","3":"100"},{"1":"10","2":"64","3":"100"},{"1":"20","2":"64","3":"100"},{"1":"40","2":"64","3":"100"},{"1":"100","2":"64","3":"100"},{"1":"10","2":"65","3":"100"},{"1":"20","2":"65","3":"100"},{"1":"40","2":"65","3":"100"},{"1":"100","2":"65","3":"100"},{"1":"10","2":"66","3":"100"},{"1":"20","2":"66","3":"100"},{"1":"40","2":"66","3":"100"},{"1":"100","2":"66","3":"100"},{"1":"10","2":"67","3":"100"},{"1":"20","2":"67","3":"100"},{"1":"40","2":"67","3":"100"},{"1":"100","2":"67","3":"100"},{"1":"10","2":"68","3":"100"},{"1":"20","2":"68","3":"100"},{"1":"40","2":"68","3":"100"},{"1":"100","2":"68","3":"100"},{"1":"10","2":"69","3":"100"},{"1":"20","2":"69","3":"100"},{"1":"40","2":"69","3":"100"},{"1":"100","2":"69","3":"100"},{"1":"10","2":"70","3":"100"},{"1":"20","2":"70","3":"100"},{"1":"40","2":"70","3":"100"},{"1":"100","2":"70","3":"100"},{"1":"10","2":"71","3":"100"},{"1":"20","2":"71","3":"100"},{"1":"40","2":"71","3":"100"},{"1":"100","2":"71","3":"100"},{"1":"10","2":"72","3":"100"},{"1":"20","2":"72","3":"100"},{"1":"40","2":"72","3":"100"},{"1":"100","2":"72","3":"100"},{"1":"10","2":"73","3":"100"},{"1":"20","2":"73","3":"100"},{"1":"40","2":"73","3":"100"},{"1":"100","2":"73","3":"100"},{"1":"10","2":"74","3":"100"},{"1":"20","2":"74","3":"100"},{"1":"40","2":"74","3":"100"},{"1":"100","2":"74","3":"100"},{"1":"10","2":"75","3":"100"},{"1":"20","2":"75","3":"100"},{"1":"40","2":"75","3":"100"},{"1":"100","2":"75","3":"100"},{"1":"10","2":"76","3":"100"},{"1":"20","2":"76","3":"100"},{"1":"40","2":"76","3":"100"},{"1":"100","2":"76","3":"100"},{"1":"10","2":"77","3":"100"},{"1":"20","2":"77","3":"100"},{"1":"40","2":"77","3":"100"},{"1":"100","2":"77","3":"100"},{"1":"10","2":"78","3":"100"},{"1":"20","2":"78","3":"100"},{"1":"40","2":"78","3":"100"},{"1":"100","2":"78","3":"100"},{"1":"10","2":"79","3":"100"},{"1":"20","2":"79","3":"100"},{"1":"40","2":"79","3":"100"},{"1":"100","2":"79","3":"100"},{"1":"10","2":"80","3":"100"},{"1":"20","2":"80","3":"100"},{"1":"40","2":"80","3":"100"},{"1":"100","2":"80","3":"100"},{"1":"10","2":"81","3":"100"},{"1":"20","2":"81","3":"100"},{"1":"40","2":"81","3":"100"},{"1":"100","2":"81","3":"100"},{"1":"10","2":"82","3":"100"},{"1":"20","2":"82","3":"100"},{"1":"40","2":"82","3":"100"},{"1":"100","2":"82","3":"100"},{"1":"10","2":"83","3":"100"},{"1":"20","2":"83","3":"100"},{"1":"40","2":"83","3":"100"},{"1":"100","2":"83","3":"100"},{"1":"10","2":"84","3":"100"},{"1":"20","2":"84","3":"100"},{"1":"40","2":"84","3":"100"},{"1":"100","2":"84","3":"100"},{"1":"10","2":"85","3":"100"},{"1":"20","2":"85","3":"100"},{"1":"40","2":"85","3":"100"},{"1":"100","2":"85","3":"100"},{"1":"10","2":"86","3":"100"},{"1":"20","2":"86","3":"100"},{"1":"40","2":"86","3":"100"},{"1":"100","2":"86","3":"100"},{"1":"10","2":"87","3":"100"},{"1":"20","2":"87","3":"100"},{"1":"40","2":"87","3":"100"},{"1":"100","2":"87","3":"100"},{"1":"10","2":"88","3":"100"},{"1":"20","2":"88","3":"100"},{"1":"40","2":"88","3":"100"},{"1":"100","2":"88","3":"100"},{"1":"10","2":"89","3":"100"},{"1":"20","2":"89","3":"100"},{"1":"40","2":"89","3":"100"},{"1":"100","2":"89","3":"100"},{"1":"10","2":"90","3":"100"},{"1":"20","2":"90","3":"100"},{"1":"40","2":"90","3":"100"},{"1":"100","2":"90","3":"100"},{"1":"10","2":"91","3":"100"},{"1":"20","2":"91","3":"100"},{"1":"40","2":"91","3":"100"},{"1":"100","2":"91","3":"100"},{"1":"10","2":"92","3":"100"},{"1":"20","2":"92","3":"100"},{"1":"40","2":"92","3":"100"},{"1":"100","2":"92","3":"100"},{"1":"10","2":"93","3":"100"},{"1":"20","2":"93","3":"100"},{"1":"40","2":"93","3":"100"},{"1":"100","2":"93","3":"100"},{"1":"10","2":"94","3":"100"},{"1":"20","2":"94","3":"100"},{"1":"40","2":"94","3":"100"},{"1":"100","2":"94","3":"100"},{"1":"10","2":"95","3":"100"},{"1":"20","2":"95","3":"100"},{"1":"40","2":"95","3":"100"},{"1":"100","2":"95","3":"100"},{"1":"10","2":"96","3":"100"},{"1":"20","2":"96","3":"100"},{"1":"40","2":"96","3":"100"},{"1":"100","2":"96","3":"100"},{"1":"10","2":"97","3":"100"},{"1":"20","2":"97","3":"100"},{"1":"40","2":"97","3":"100"},{"1":"100","2":"97","3":"100"},{"1":"10","2":"98","3":"100"},{"1":"20","2":"98","3":"100"},{"1":"40","2":"98","3":"100"},{"1":"100","2":"98","3":"100"},{"1":"10","2":"99","3":"100"},{"1":"20","2":"99","3":"100"},{"1":"40","2":"99","3":"100"},{"1":"100","2":"99","3":"100"},{"1":"10","2":"100","3":"100"},{"1":"20","2":"100","3":"100"},{"1":"40","2":"100","3":"100"},{"1":"100","2":"100","3":"100"},{"1":"10","2":"101","3":"100"},{"1":"20","2":"101","3":"100"},{"1":"40","2":"101","3":"100"},{"1":"100","2":"101","3":"100"},{"1":"10","2":"102","3":"100"},{"1":"20","2":"102","3":"100"},{"1":"40","2":"102","3":"100"},{"1":"100","2":"102","3":"100"},{"1":"10","2":"103","3":"100"},{"1":"20","2":"103","3":"100"},{"1":"40","2":"103","3":"100"},{"1":"100","2":"103","3":"100"},{"1":"10","2":"104","3":"100"},{"1":"20","2":"104","3":"100"},{"1":"40","2":"104","3":"100"},{"1":"100","2":"104","3":"100"},{"1":"10","2":"105","3":"100"},{"1":"20","2":"105","3":"100"},{"1":"40","2":"105","3":"100"},{"1":"100","2":"105","3":"100"},{"1":"10","2":"106","3":"100"},{"1":"20","2":"106","3":"100"},{"1":"40","2":"106","3":"100"},{"1":"100","2":"106","3":"100"},{"1":"10","2":"107","3":"100"},{"1":"20","2":"107","3":"100"},{"1":"40","2":"107","3":"100"},{"1":"100","2":"107","3":"100"},{"1":"10","2":"108","3":"100"},{"1":"20","2":"108","3":"100"},{"1":"40","2":"108","3":"100"},{"1":"100","2":"108","3":"100"},{"1":"10","2":"109","3":"100"},{"1":"20","2":"109","3":"100"},{"1":"40","2":"109","3":"100"},{"1":"100","2":"109","3":"100"},{"1":"10","2":"110","3":"100"},{"1":"20","2":"110","3":"100"},{"1":"40","2":"110","3":"100"},{"1":"100","2":"110","3":"100"},{"1":"10","2":"111","3":"100"},{"1":"20","2":"111","3":"100"},{"1":"40","2":"111","3":"100"},{"1":"100","2":"111","3":"100"},{"1":"10","2":"112","3":"100"},{"1":"20","2":"112","3":"100"},{"1":"40","2":"112","3":"100"},{"1":"100","2":"112","3":"100"},{"1":"10","2":"113","3":"100"},{"1":"20","2":"113","3":"100"},{"1":"40","2":"113","3":"100"},{"1":"100","2":"113","3":"100"},{"1":"10","2":"114","3":"100"},{"1":"20","2":"114","3":"100"},{"1":"40","2":"114","3":"100"},{"1":"100","2":"114","3":"100"},{"1":"10","2":"115","3":"100"},{"1":"20","2":"115","3":"100"},{"1":"40","2":"115","3":"100"},{"1":"100","2":"115","3":"100"},{"1":"10","2":"116","3":"100"},{"1":"20","2":"116","3":"100"},{"1":"40","2":"116","3":"100"},{"1":"100","2":"116","3":"100"},{"1":"10","2":"117","3":"100"},{"1":"20","2":"117","3":"100"},{"1":"40","2":"117","3":"100"},{"1":"100","2":"117","3":"100"},{"1":"10","2":"118","3":"100"},{"1":"20","2":"118","3":"100"},{"1":"40","2":"118","3":"100"},{"1":"100","2":"118","3":"100"},{"1":"10","2":"119","3":"100"},{"1":"20","2":"119","3":"100"},{"1":"40","2":"119","3":"100"},{"1":"100","2":"119","3":"100"},{"1":"10","2":"120","3":"100"},{"1":"20","2":"120","3":"100"},{"1":"40","2":"120","3":"100"},{"1":"100","2":"120","3":"100"},{"1":"10","2":"121","3":"100"},{"1":"20","2":"121","3":"100"},{"1":"40","2":"121","3":"100"},{"1":"100","2":"121","3":"100"},{"1":"10","2":"122","3":"100"},{"1":"20","2":"122","3":"100"},{"1":"40","2":"122","3":"100"},{"1":"100","2":"122","3":"100"},{"1":"10","2":"123","3":"100"},{"1":"20","2":"123","3":"100"},{"1":"40","2":"123","3":"100"},{"1":"100","2":"123","3":"100"},{"1":"10","2":"124","3":"100"},{"1":"20","2":"124","3":"100"},{"1":"40","2":"124","3":"100"},{"1":"100","2":"124","3":"100"},{"1":"10","2":"125","3":"100"},{"1":"20","2":"125","3":"100"},{"1":"40","2":"125","3":"100"},{"1":"100","2":"125","3":"100"},{"1":"10","2":"126","3":"100"},{"1":"20","2":"126","3":"100"},{"1":"40","2":"126","3":"100"},{"1":"100","2":"126","3":"100"},{"1":"10","2":"127","3":"100"},{"1":"20","2":"127","3":"100"},{"1":"40","2":"127","3":"100"},{"1":"100","2":"127","3":"100"},{"1":"10","2":"128","3":"100"},{"1":"20","2":"128","3":"100"},{"1":"40","2":"128","3":"100"},{"1":"100","2":"128","3":"100"},{"1":"10","2":"129","3":"100"},{"1":"20","2":"129","3":"100"},{"1":"40","2":"129","3":"100"},{"1":"100","2":"129","3":"100"},{"1":"10","2":"130","3":"100"},{"1":"20","2":"130","3":"100"},{"1":"40","2":"130","3":"100"},{"1":"100","2":"130","3":"100"},{"1":"10","2":"131","3":"100"},{"1":"20","2":"131","3":"100"},{"1":"40","2":"131","3":"100"},{"1":"100","2":"131","3":"100"},{"1":"10","2":"132","3":"100"},{"1":"20","2":"132","3":"100"},{"1":"40","2":"132","3":"100"},{"1":"100","2":"132","3":"100"},{"1":"10","2":"133","3":"100"},{"1":"20","2":"133","3":"100"},{"1":"40","2":"133","3":"100"},{"1":"100","2":"133","3":"100"},{"1":"10","2":"134","3":"100"},{"1":"20","2":"134","3":"100"},{"1":"40","2":"134","3":"100"},{"1":"100","2":"134","3":"100"},{"1":"10","2":"135","3":"100"},{"1":"20","2":"135","3":"100"},{"1":"40","2":"135","3":"100"},{"1":"100","2":"135","3":"100"},{"1":"10","2":"136","3":"100"},{"1":"20","2":"136","3":"100"},{"1":"40","2":"136","3":"100"},{"1":"100","2":"136","3":"100"},{"1":"10","2":"137","3":"100"},{"1":"20","2":"137","3":"100"},{"1":"40","2":"137","3":"100"},{"1":"100","2":"137","3":"100"},{"1":"10","2":"138","3":"100"},{"1":"20","2":"138","3":"100"},{"1":"40","2":"138","3":"100"},{"1":"100","2":"138","3":"100"},{"1":"10","2":"139","3":"100"},{"1":"20","2":"139","3":"100"},{"1":"40","2":"139","3":"100"},{"1":"100","2":"139","3":"100"},{"1":"10","2":"140","3":"100"},{"1":"20","2":"140","3":"100"},{"1":"40","2":"140","3":"100"},{"1":"100","2":"140","3":"100"},{"1":"10","2":"141","3":"100"},{"1":"20","2":"141","3":"100"},{"1":"40","2":"141","3":"100"},{"1":"100","2":"141","3":"100"},{"1":"10","2":"142","3":"100"},{"1":"20","2":"142","3":"100"},{"1":"40","2":"142","3":"100"},{"1":"100","2":"142","3":"100"},{"1":"10","2":"143","3":"100"},{"1":"20","2":"143","3":"100"},{"1":"40","2":"143","3":"100"},{"1":"100","2":"143","3":"100"},{"1":"10","2":"144","3":"100"},{"1":"20","2":"144","3":"100"},{"1":"40","2":"144","3":"100"},{"1":"100","2":"144","3":"100"},{"1":"10","2":"145","3":"100"},{"1":"20","2":"145","3":"100"},{"1":"40","2":"145","3":"100"},{"1":"100","2":"145","3":"100"},{"1":"10","2":"146","3":"100"},{"1":"20","2":"146","3":"100"},{"1":"40","2":"146","3":"100"},{"1":"100","2":"146","3":"100"},{"1":"10","2":"147","3":"100"},{"1":"20","2":"147","3":"100"},{"1":"40","2":"147","3":"100"},{"1":"100","2":"147","3":"100"},{"1":"10","2":"148","3":"100"},{"1":"20","2":"148","3":"100"},{"1":"40","2":"148","3":"100"},{"1":"100","2":"148","3":"100"},{"1":"10","2":"149","3":"100"},{"1":"20","2":"149","3":"100"},{"1":"40","2":"149","3":"100"},{"1":"100","2":"149","3":"100"},{"1":"10","2":"150","3":"100"},{"1":"20","2":"150","3":"100"},{"1":"40","2":"150","3":"100"},{"1":"100","2":"150","3":"100"},{"1":"10","2":"151","3":"100"},{"1":"20","2":"151","3":"100"},{"1":"40","2":"151","3":"100"},{"1":"100","2":"151","3":"100"},{"1":"10","2":"152","3":"100"},{"1":"20","2":"152","3":"100"},{"1":"40","2":"152","3":"100"},{"1":"100","2":"152","3":"100"},{"1":"10","2":"153","3":"100"},{"1":"20","2":"153","3":"100"},{"1":"40","2":"153","3":"100"},{"1":"100","2":"153","3":"100"},{"1":"10","2":"154","3":"100"},{"1":"20","2":"154","3":"100"},{"1":"40","2":"154","3":"100"},{"1":"100","2":"154","3":"100"},{"1":"10","2":"155","3":"100"},{"1":"20","2":"155","3":"100"},{"1":"40","2":"155","3":"100"},{"1":"100","2":"155","3":"100"},{"1":"10","2":"156","3":"100"},{"1":"20","2":"156","3":"100"},{"1":"40","2":"156","3":"100"},{"1":"100","2":"156","3":"100"},{"1":"10","2":"157","3":"100"},{"1":"20","2":"157","3":"100"},{"1":"40","2":"157","3":"100"},{"1":"100","2":"157","3":"100"},{"1":"10","2":"158","3":"100"},{"1":"20","2":"158","3":"100"},{"1":"40","2":"158","3":"100"},{"1":"100","2":"158","3":"100"},{"1":"10","2":"159","3":"100"},{"1":"20","2":"159","3":"100"},{"1":"40","2":"159","3":"100"},{"1":"100","2":"159","3":"100"},{"1":"10","2":"160","3":"100"},{"1":"20","2":"160","3":"100"},{"1":"40","2":"160","3":"100"},{"1":"100","2":"160","3":"100"},{"1":"10","2":"161","3":"100"},{"1":"20","2":"161","3":"100"},{"1":"40","2":"161","3":"100"},{"1":"100","2":"161","3":"100"},{"1":"10","2":"162","3":"100"},{"1":"20","2":"162","3":"100"},{"1":"40","2":"162","3":"100"},{"1":"100","2":"162","3":"100"},{"1":"10","2":"163","3":"100"},{"1":"20","2":"163","3":"100"},{"1":"40","2":"163","3":"100"},{"1":"100","2":"163","3":"100"},{"1":"10","2":"164","3":"100"},{"1":"20","2":"164","3":"100"},{"1":"40","2":"164","3":"100"},{"1":"100","2":"164","3":"100"},{"1":"10","2":"165","3":"100"},{"1":"20","2":"165","3":"100"},{"1":"40","2":"165","3":"100"},{"1":"100","2":"165","3":"100"},{"1":"10","2":"166","3":"100"},{"1":"20","2":"166","3":"100"},{"1":"40","2":"166","3":"100"},{"1":"100","2":"166","3":"100"},{"1":"10","2":"167","3":"100"},{"1":"20","2":"167","3":"100"},{"1":"40","2":"167","3":"100"},{"1":"100","2":"167","3":"100"},{"1":"10","2":"168","3":"100"},{"1":"20","2":"168","3":"100"},{"1":"40","2":"168","3":"100"},{"1":"100","2":"168","3":"100"},{"1":"10","2":"169","3":"100"},{"1":"20","2":"169","3":"100"},{"1":"40","2":"169","3":"100"},{"1":"100","2":"169","3":"100"},{"1":"10","2":"170","3":"100"},{"1":"20","2":"170","3":"100"},{"1":"40","2":"170","3":"100"},{"1":"100","2":"170","3":"100"},{"1":"10","2":"171","3":"100"},{"1":"20","2":"171","3":"100"},{"1":"40","2":"171","3":"100"},{"1":"100","2":"171","3":"100"},{"1":"10","2":"172","3":"100"},{"1":"20","2":"172","3":"100"},{"1":"40","2":"172","3":"100"},{"1":"100","2":"172","3":"100"},{"1":"10","2":"173","3":"100"},{"1":"20","2":"173","3":"100"},{"1":"40","2":"173","3":"100"},{"1":"100","2":"173","3":"100"},{"1":"10","2":"174","3":"100"},{"1":"20","2":"174","3":"100"},{"1":"40","2":"174","3":"100"},{"1":"100","2":"174","3":"100"},{"1":"10","2":"175","3":"100"},{"1":"20","2":"175","3":"100"},{"1":"40","2":"175","3":"100"},{"1":"100","2":"175","3":"100"},{"1":"10","2":"176","3":"100"},{"1":"20","2":"176","3":"100"},{"1":"40","2":"176","3":"100"},{"1":"100","2":"176","3":"100"},{"1":"10","2":"177","3":"100"},{"1":"20","2":"177","3":"100"},{"1":"40","2":"177","3":"100"},{"1":"100","2":"177","3":"100"},{"1":"10","2":"178","3":"100"},{"1":"20","2":"178","3":"100"},{"1":"40","2":"178","3":"100"},{"1":"100","2":"178","3":"100"},{"1":"10","2":"179","3":"100"},{"1":"20","2":"179","3":"100"},{"1":"40","2":"179","3":"100"},{"1":"100","2":"179","3":"100"},{"1":"10","2":"180","3":"100"},{"1":"20","2":"180","3":"100"},{"1":"40","2":"180","3":"100"},{"1":"100","2":"180","3":"100"},{"1":"10","2":"181","3":"100"},{"1":"20","2":"181","3":"100"},{"1":"40","2":"181","3":"100"},{"1":"100","2":"181","3":"100"},{"1":"10","2":"182","3":"100"},{"1":"20","2":"182","3":"100"},{"1":"40","2":"182","3":"100"},{"1":"100","2":"182","3":"100"},{"1":"10","2":"183","3":"100"},{"1":"20","2":"183","3":"100"},{"1":"40","2":"183","3":"100"},{"1":"100","2":"183","3":"100"},{"1":"10","2":"184","3":"100"},{"1":"20","2":"184","3":"100"},{"1":"40","2":"184","3":"100"},{"1":"100","2":"184","3":"100"},{"1":"10","2":"185","3":"100"},{"1":"20","2":"185","3":"100"},{"1":"40","2":"185","3":"100"},{"1":"100","2":"185","3":"100"},{"1":"10","2":"186","3":"100"},{"1":"20","2":"186","3":"100"},{"1":"40","2":"186","3":"100"},{"1":"100","2":"186","3":"100"},{"1":"10","2":"187","3":"100"},{"1":"20","2":"187","3":"100"},{"1":"40","2":"187","3":"100"},{"1":"100","2":"187","3":"100"},{"1":"10","2":"188","3":"100"},{"1":"20","2":"188","3":"100"},{"1":"40","2":"188","3":"100"},{"1":"100","2":"188","3":"100"},{"1":"10","2":"189","3":"100"},{"1":"20","2":"189","3":"100"},{"1":"40","2":"189","3":"100"},{"1":"100","2":"189","3":"100"},{"1":"10","2":"190","3":"100"},{"1":"20","2":"190","3":"100"},{"1":"40","2":"190","3":"100"},{"1":"100","2":"190","3":"100"},{"1":"10","2":"191","3":"100"},{"1":"20","2":"191","3":"100"},{"1":"40","2":"191","3":"100"},{"1":"100","2":"191","3":"100"},{"1":"10","2":"192","3":"100"},{"1":"20","2":"192","3":"100"},{"1":"40","2":"192","3":"100"},{"1":"100","2":"192","3":"100"},{"1":"10","2":"193","3":"100"},{"1":"20","2":"193","3":"100"},{"1":"40","2":"193","3":"100"},{"1":"100","2":"193","3":"100"},{"1":"10","2":"194","3":"100"},{"1":"20","2":"194","3":"100"},{"1":"40","2":"194","3":"100"},{"1":"100","2":"194","3":"100"},{"1":"10","2":"195","3":"100"},{"1":"20","2":"195","3":"100"},{"1":"40","2":"195","3":"100"},{"1":"100","2":"195","3":"100"},{"1":"10","2":"196","3":"100"},{"1":"20","2":"196","3":"100"},{"1":"40","2":"196","3":"100"},{"1":"100","2":"196","3":"100"},{"1":"10","2":"197","3":"100"},{"1":"20","2":"197","3":"100"},{"1":"40","2":"197","3":"100"},{"1":"100","2":"197","3":"100"},{"1":"10","2":"198","3":"100"},{"1":"20","2":"198","3":"100"},{"1":"40","2":"198","3":"100"},{"1":"100","2":"198","3":"100"},{"1":"10","2":"199","3":"100"},{"1":"20","2":"199","3":"100"},{"1":"40","2":"199","3":"100"},{"1":"100","2":"199","3":"100"},{"1":"10","2":"200","3":"100"},{"1":"20","2":"200","3":"100"},{"1":"40","2":"200","3":"100"},{"1":"100","2":"200","3":"100"},{"1":"10","2":"201","3":"100"},{"1":"20","2":"201","3":"100"},{"1":"40","2":"201","3":"100"},{"1":"100","2":"201","3":"100"},{"1":"10","2":"202","3":"100"},{"1":"20","2":"202","3":"100"},{"1":"40","2":"202","3":"100"},{"1":"100","2":"202","3":"100"},{"1":"10","2":"203","3":"100"},{"1":"20","2":"203","3":"100"},{"1":"40","2":"203","3":"100"},{"1":"100","2":"203","3":"100"},{"1":"10","2":"204","3":"100"},{"1":"20","2":"204","3":"100"},{"1":"40","2":"204","3":"100"},{"1":"100","2":"204","3":"100"},{"1":"10","2":"205","3":"100"},{"1":"20","2":"205","3":"100"},{"1":"40","2":"205","3":"100"},{"1":"100","2":"205","3":"100"},{"1":"10","2":"206","3":"100"},{"1":"20","2":"206","3":"100"},{"1":"40","2":"206","3":"100"},{"1":"100","2":"206","3":"100"},{"1":"10","2":"207","3":"100"},{"1":"20","2":"207","3":"100"},{"1":"40","2":"207","3":"100"},{"1":"100","2":"207","3":"100"},{"1":"10","2":"208","3":"100"},{"1":"20","2":"208","3":"100"},{"1":"40","2":"208","3":"100"},{"1":"100","2":"208","3":"100"},{"1":"10","2":"209","3":"100"},{"1":"20","2":"209","3":"100"},{"1":"40","2":"209","3":"100"},{"1":"100","2":"209","3":"100"},{"1":"10","2":"210","3":"100"},{"1":"20","2":"210","3":"100"},{"1":"40","2":"210","3":"100"},{"1":"100","2":"210","3":"100"},{"1":"10","2":"211","3":"100"},{"1":"20","2":"211","3":"100"},{"1":"40","2":"211","3":"100"},{"1":"100","2":"211","3":"100"},{"1":"10","2":"212","3":"100"},{"1":"20","2":"212","3":"100"},{"1":"40","2":"212","3":"100"},{"1":"100","2":"212","3":"100"},{"1":"10","2":"213","3":"100"},{"1":"20","2":"213","3":"100"},{"1":"40","2":"213","3":"100"},{"1":"100","2":"213","3":"100"},{"1":"10","2":"214","3":"100"},{"1":"20","2":"214","3":"100"},{"1":"40","2":"214","3":"100"},{"1":"100","2":"214","3":"100"},{"1":"10","2":"215","3":"100"},{"1":"20","2":"215","3":"100"},{"1":"40","2":"215","3":"100"},{"1":"100","2":"215","3":"100"},{"1":"10","2":"216","3":"100"},{"1":"20","2":"216","3":"100"},{"1":"40","2":"216","3":"100"},{"1":"100","2":"216","3":"100"},{"1":"10","2":"217","3":"100"},{"1":"20","2":"217","3":"100"},{"1":"40","2":"217","3":"100"},{"1":"100","2":"217","3":"100"},{"1":"10","2":"218","3":"100"},{"1":"20","2":"218","3":"100"},{"1":"40","2":"218","3":"100"},{"1":"100","2":"218","3":"100"},{"1":"10","2":"219","3":"100"},{"1":"20","2":"219","3":"100"},{"1":"40","2":"219","3":"100"},{"1":"100","2":"219","3":"100"},{"1":"10","2":"220","3":"100"},{"1":"20","2":"220","3":"100"},{"1":"40","2":"220","3":"100"},{"1":"100","2":"220","3":"100"},{"1":"10","2":"221","3":"100"},{"1":"20","2":"221","3":"100"},{"1":"40","2":"221","3":"100"},{"1":"100","2":"221","3":"100"},{"1":"10","2":"222","3":"100"},{"1":"20","2":"222","3":"100"},{"1":"40","2":"222","3":"100"},{"1":"100","2":"222","3":"100"},{"1":"10","2":"223","3":"100"},{"1":"20","2":"223","3":"100"},{"1":"40","2":"223","3":"100"},{"1":"100","2":"223","3":"100"},{"1":"10","2":"224","3":"100"},{"1":"20","2":"224","3":"100"},{"1":"40","2":"224","3":"100"},{"1":"100","2":"224","3":"100"},{"1":"10","2":"225","3":"100"},{"1":"20","2":"225","3":"100"},{"1":"40","2":"225","3":"100"},{"1":"100","2":"225","3":"100"},{"1":"10","2":"226","3":"100"},{"1":"20","2":"226","3":"100"},{"1":"40","2":"226","3":"100"},{"1":"100","2":"226","3":"100"},{"1":"10","2":"227","3":"100"},{"1":"20","2":"227","3":"100"},{"1":"40","2":"227","3":"100"},{"1":"100","2":"227","3":"100"},{"1":"10","2":"228","3":"100"},{"1":"20","2":"228","3":"100"},{"1":"40","2":"228","3":"100"},{"1":"100","2":"228","3":"100"},{"1":"10","2":"229","3":"100"},{"1":"20","2":"229","3":"100"},{"1":"40","2":"229","3":"100"},{"1":"100","2":"229","3":"100"},{"1":"10","2":"230","3":"100"},{"1":"20","2":"230","3":"100"},{"1":"40","2":"230","3":"100"},{"1":"100","2":"230","3":"100"},{"1":"10","2":"231","3":"100"},{"1":"20","2":"231","3":"100"},{"1":"40","2":"231","3":"100"},{"1":"100","2":"231","3":"100"},{"1":"10","2":"232","3":"100"},{"1":"20","2":"232","3":"100"},{"1":"40","2":"232","3":"100"},{"1":"100","2":"232","3":"100"},{"1":"10","2":"233","3":"100"},{"1":"20","2":"233","3":"100"},{"1":"40","2":"233","3":"100"},{"1":"100","2":"233","3":"100"},{"1":"10","2":"234","3":"100"},{"1":"20","2":"234","3":"100"},{"1":"40","2":"234","3":"100"},{"1":"100","2":"234","3":"100"},{"1":"10","2":"235","3":"100"},{"1":"20","2":"235","3":"100"},{"1":"40","2":"235","3":"100"},{"1":"100","2":"235","3":"100"},{"1":"10","2":"236","3":"100"},{"1":"20","2":"236","3":"100"},{"1":"40","2":"236","3":"100"},{"1":"100","2":"236","3":"100"},{"1":"10","2":"237","3":"100"},{"1":"20","2":"237","3":"100"},{"1":"40","2":"237","3":"100"},{"1":"100","2":"237","3":"100"},{"1":"10","2":"238","3":"100"},{"1":"20","2":"238","3":"100"},{"1":"40","2":"238","3":"100"},{"1":"100","2":"238","3":"100"},{"1":"10","2":"239","3":"100"},{"1":"20","2":"239","3":"100"},{"1":"40","2":"239","3":"100"},{"1":"100","2":"239","3":"100"},{"1":"10","2":"240","3":"100"},{"1":"20","2":"240","3":"100"},{"1":"40","2":"240","3":"100"},{"1":"100","2":"240","3":"100"},{"1":"10","2":"241","3":"100"},{"1":"20","2":"241","3":"100"},{"1":"40","2":"241","3":"100"},{"1":"100","2":"241","3":"100"},{"1":"10","2":"242","3":"100"},{"1":"20","2":"242","3":"100"},{"1":"40","2":"242","3":"100"},{"1":"100","2":"242","3":"100"},{"1":"10","2":"243","3":"100"},{"1":"20","2":"243","3":"100"},{"1":"40","2":"243","3":"100"},{"1":"100","2":"243","3":"100"},{"1":"10","2":"244","3":"100"},{"1":"20","2":"244","3":"100"},{"1":"40","2":"244","3":"100"},{"1":"100","2":"244","3":"100"},{"1":"10","2":"245","3":"100"},{"1":"20","2":"245","3":"100"},{"1":"40","2":"245","3":"100"},{"1":"100","2":"245","3":"100"},{"1":"10","2":"246","3":"100"},{"1":"20","2":"246","3":"100"},{"1":"40","2":"246","3":"100"},{"1":"100","2":"246","3":"100"},{"1":"10","2":"247","3":"100"},{"1":"20","2":"247","3":"100"},{"1":"40","2":"247","3":"100"},{"1":"100","2":"247","3":"100"},{"1":"10","2":"248","3":"100"},{"1":"20","2":"248","3":"100"},{"1":"40","2":"248","3":"100"},{"1":"100","2":"248","3":"100"},{"1":"10","2":"249","3":"100"},{"1":"20","2":"249","3":"100"},{"1":"40","2":"249","3":"100"},{"1":"100","2":"249","3":"100"},{"1":"10","2":"250","3":"100"},{"1":"20","2":"250","3":"100"},{"1":"40","2":"250","3":"100"},{"1":"100","2":"250","3":"100"},{"1":"10","2":"251","3":"100"},{"1":"20","2":"251","3":"100"},{"1":"40","2":"251","3":"100"},{"1":"100","2":"251","3":"100"},{"1":"10","2":"252","3":"100"},{"1":"20","2":"252","3":"100"},{"1":"40","2":"252","3":"100"},{"1":"100","2":"252","3":"100"},{"1":"10","2":"253","3":"100"},{"1":"20","2":"253","3":"100"},{"1":"40","2":"253","3":"100"},{"1":"100","2":"253","3":"100"},{"1":"10","2":"254","3":"100"},{"1":"20","2":"254","3":"100"},{"1":"40","2":"254","3":"100"},{"1":"100","2":"254","3":"100"},{"1":"10","2":"255","3":"100"},{"1":"20","2":"255","3":"100"},{"1":"40","2":"255","3":"100"},{"1":"100","2":"255","3":"100"},{"1":"10","2":"256","3":"100"},{"1":"20","2":"256","3":"100"},{"1":"40","2":"256","3":"100"},{"1":"100","2":"256","3":"100"},{"1":"10","2":"257","3":"100"},{"1":"20","2":"257","3":"100"},{"1":"40","2":"257","3":"100"},{"1":"100","2":"257","3":"100"},{"1":"10","2":"258","3":"100"},{"1":"20","2":"258","3":"100"},{"1":"40","2":"258","3":"100"},{"1":"100","2":"258","3":"100"},{"1":"10","2":"259","3":"100"},{"1":"20","2":"259","3":"100"},{"1":"40","2":"259","3":"100"},{"1":"100","2":"259","3":"100"},{"1":"10","2":"260","3":"100"},{"1":"20","2":"260","3":"100"},{"1":"40","2":"260","3":"100"},{"1":"100","2":"260","3":"100"},{"1":"10","2":"261","3":"100"},{"1":"20","2":"261","3":"100"},{"1":"40","2":"261","3":"100"},{"1":"100","2":"261","3":"100"},{"1":"10","2":"262","3":"100"},{"1":"20","2":"262","3":"100"},{"1":"40","2":"262","3":"100"},{"1":"100","2":"262","3":"100"},{"1":"10","2":"263","3":"100"},{"1":"20","2":"263","3":"100"},{"1":"40","2":"263","3":"100"},{"1":"100","2":"263","3":"100"},{"1":"10","2":"264","3":"100"},{"1":"20","2":"264","3":"100"},{"1":"40","2":"264","3":"100"},{"1":"100","2":"264","3":"100"},{"1":"10","2":"265","3":"100"},{"1":"20","2":"265","3":"100"},{"1":"40","2":"265","3":"100"},{"1":"100","2":"265","3":"100"},{"1":"10","2":"266","3":"100"},{"1":"20","2":"266","3":"100"},{"1":"40","2":"266","3":"100"},{"1":"100","2":"266","3":"100"},{"1":"10","2":"267","3":"100"},{"1":"20","2":"267","3":"100"},{"1":"40","2":"267","3":"100"},{"1":"100","2":"267","3":"100"},{"1":"10","2":"268","3":"100"},{"1":"20","2":"268","3":"100"},{"1":"40","2":"268","3":"100"},{"1":"100","2":"268","3":"100"},{"1":"10","2":"269","3":"100"},{"1":"20","2":"269","3":"100"},{"1":"40","2":"269","3":"100"},{"1":"100","2":"269","3":"100"},{"1":"10","2":"270","3":"100"},{"1":"20","2":"270","3":"100"},{"1":"40","2":"270","3":"100"},{"1":"100","2":"270","3":"100"},{"1":"10","2":"271","3":"100"},{"1":"20","2":"271","3":"100"},{"1":"40","2":"271","3":"100"},{"1":"100","2":"271","3":"100"},{"1":"10","2":"272","3":"100"},{"1":"20","2":"272","3":"100"},{"1":"40","2":"272","3":"100"},{"1":"100","2":"272","3":"100"},{"1":"10","2":"273","3":"100"},{"1":"20","2":"273","3":"100"},{"1":"40","2":"273","3":"100"},{"1":"100","2":"273","3":"100"},{"1":"10","2":"274","3":"100"},{"1":"20","2":"274","3":"100"},{"1":"40","2":"274","3":"100"},{"1":"100","2":"274","3":"100"},{"1":"10","2":"275","3":"100"},{"1":"20","2":"275","3":"100"},{"1":"40","2":"275","3":"100"},{"1":"100","2":"275","3":"100"},{"1":"10","2":"276","3":"100"},{"1":"20","2":"276","3":"100"},{"1":"40","2":"276","3":"100"},{"1":"100","2":"276","3":"100"},{"1":"10","2":"277","3":"100"},{"1":"20","2":"277","3":"100"},{"1":"40","2":"277","3":"100"},{"1":"100","2":"277","3":"100"},{"1":"10","2":"278","3":"100"},{"1":"20","2":"278","3":"100"},{"1":"40","2":"278","3":"100"},{"1":"100","2":"278","3":"100"},{"1":"10","2":"279","3":"100"},{"1":"20","2":"279","3":"100"},{"1":"40","2":"279","3":"100"},{"1":"100","2":"279","3":"100"},{"1":"10","2":"280","3":"100"},{"1":"20","2":"280","3":"100"},{"1":"40","2":"280","3":"100"},{"1":"100","2":"280","3":"100"},{"1":"10","2":"281","3":"100"},{"1":"20","2":"281","3":"100"},{"1":"40","2":"281","3":"100"},{"1":"100","2":"281","3":"100"},{"1":"10","2":"282","3":"100"},{"1":"20","2":"282","3":"100"},{"1":"40","2":"282","3":"100"},{"1":"100","2":"282","3":"100"},{"1":"10","2":"283","3":"100"},{"1":"20","2":"283","3":"100"},{"1":"40","2":"283","3":"100"},{"1":"100","2":"283","3":"100"},{"1":"10","2":"284","3":"100"},{"1":"20","2":"284","3":"100"},{"1":"40","2":"284","3":"100"},{"1":"100","2":"284","3":"100"},{"1":"10","2":"285","3":"100"},{"1":"20","2":"285","3":"100"},{"1":"40","2":"285","3":"100"},{"1":"100","2":"285","3":"100"},{"1":"10","2":"286","3":"100"},{"1":"20","2":"286","3":"100"},{"1":"40","2":"286","3":"100"},{"1":"100","2":"286","3":"100"},{"1":"10","2":"287","3":"100"},{"1":"20","2":"287","3":"100"},{"1":"40","2":"287","3":"100"},{"1":"100","2":"287","3":"100"},{"1":"10","2":"288","3":"100"},{"1":"20","2":"288","3":"100"},{"1":"40","2":"288","3":"100"},{"1":"100","2":"288","3":"100"},{"1":"10","2":"289","3":"100"},{"1":"20","2":"289","3":"100"},{"1":"40","2":"289","3":"100"},{"1":"100","2":"289","3":"100"},{"1":"10","2":"290","3":"100"},{"1":"20","2":"290","3":"100"},{"1":"40","2":"290","3":"100"},{"1":"100","2":"290","3":"100"},{"1":"10","2":"291","3":"100"},{"1":"20","2":"291","3":"100"},{"1":"40","2":"291","3":"100"},{"1":"100","2":"291","3":"100"},{"1":"10","2":"292","3":"100"},{"1":"20","2":"292","3":"100"},{"1":"40","2":"292","3":"100"},{"1":"100","2":"292","3":"100"},{"1":"10","2":"293","3":"100"},{"1":"20","2":"293","3":"100"},{"1":"40","2":"293","3":"100"},{"1":"100","2":"293","3":"100"},{"1":"10","2":"294","3":"100"},{"1":"20","2":"294","3":"100"},{"1":"40","2":"294","3":"100"},{"1":"100","2":"294","3":"100"},{"1":"10","2":"295","3":"100"},{"1":"20","2":"295","3":"100"},{"1":"40","2":"295","3":"100"},{"1":"100","2":"295","3":"100"},{"1":"10","2":"296","3":"100"},{"1":"20","2":"296","3":"100"},{"1":"40","2":"296","3":"100"},{"1":"100","2":"296","3":"100"},{"1":"10","2":"297","3":"100"},{"1":"20","2":"297","3":"100"},{"1":"40","2":"297","3":"100"},{"1":"100","2":"297","3":"100"},{"1":"10","2":"298","3":"100"},{"1":"20","2":"298","3":"100"},{"1":"40","2":"298","3":"100"},{"1":"100","2":"298","3":"100"},{"1":"10","2":"299","3":"100"},{"1":"20","2":"299","3":"100"},{"1":"40","2":"299","3":"100"},{"1":"100","2":"299","3":"100"},{"1":"10","2":"300","3":"100"},{"1":"20","2":"300","3":"100"},{"1":"40","2":"300","3":"100"},{"1":"100","2":"300","3":"100"},{"1":"10","2":"301","3":"100"},{"1":"20","2":"301","3":"100"},{"1":"40","2":"301","3":"100"},{"1":"100","2":"301","3":"100"},{"1":"10","2":"302","3":"100"},{"1":"20","2":"302","3":"100"},{"1":"40","2":"302","3":"100"},{"1":"100","2":"302","3":"100"},{"1":"10","2":"303","3":"100"},{"1":"20","2":"303","3":"100"},{"1":"40","2":"303","3":"100"},{"1":"100","2":"303","3":"100"},{"1":"10","2":"304","3":"100"},{"1":"20","2":"304","3":"100"},{"1":"40","2":"304","3":"100"},{"1":"100","2":"304","3":"100"},{"1":"10","2":"305","3":"100"},{"1":"20","2":"305","3":"100"},{"1":"40","2":"305","3":"100"},{"1":"100","2":"305","3":"100"},{"1":"10","2":"306","3":"100"},{"1":"20","2":"306","3":"100"},{"1":"40","2":"306","3":"100"},{"1":"100","2":"306","3":"100"},{"1":"10","2":"307","3":"100"},{"1":"20","2":"307","3":"100"},{"1":"40","2":"307","3":"100"},{"1":"100","2":"307","3":"100"},{"1":"10","2":"308","3":"100"},{"1":"20","2":"308","3":"100"},{"1":"40","2":"308","3":"100"},{"1":"100","2":"308","3":"100"},{"1":"10","2":"309","3":"100"},{"1":"20","2":"309","3":"100"},{"1":"40","2":"309","3":"100"},{"1":"100","2":"309","3":"100"},{"1":"10","2":"310","3":"100"},{"1":"20","2":"310","3":"100"},{"1":"40","2":"310","3":"100"},{"1":"100","2":"310","3":"100"},{"1":"10","2":"311","3":"100"},{"1":"20","2":"311","3":"100"},{"1":"40","2":"311","3":"100"},{"1":"100","2":"311","3":"100"},{"1":"10","2":"312","3":"100"},{"1":"20","2":"312","3":"100"},{"1":"40","2":"312","3":"100"},{"1":"100","2":"312","3":"100"},{"1":"10","2":"313","3":"100"},{"1":"20","2":"313","3":"100"},{"1":"40","2":"313","3":"100"},{"1":"100","2":"313","3":"100"},{"1":"10","2":"314","3":"100"},{"1":"20","2":"314","3":"100"},{"1":"40","2":"314","3":"100"},{"1":"100","2":"314","3":"100"},{"1":"10","2":"315","3":"100"},{"1":"20","2":"315","3":"100"},{"1":"40","2":"315","3":"100"},{"1":"100","2":"315","3":"100"},{"1":"10","2":"316","3":"100"},{"1":"20","2":"316","3":"100"},{"1":"40","2":"316","3":"100"},{"1":"100","2":"316","3":"100"},{"1":"10","2":"317","3":"100"},{"1":"20","2":"317","3":"100"},{"1":"40","2":"317","3":"100"},{"1":"100","2":"317","3":"100"},{"1":"10","2":"318","3":"100"},{"1":"20","2":"318","3":"100"},{"1":"40","2":"318","3":"100"},{"1":"100","2":"318","3":"100"},{"1":"10","2":"319","3":"100"},{"1":"20","2":"319","3":"100"},{"1":"40","2":"319","3":"100"},{"1":"100","2":"319","3":"100"},{"1":"10","2":"320","3":"100"},{"1":"20","2":"320","3":"100"},{"1":"40","2":"320","3":"100"},{"1":"100","2":"320","3":"100"},{"1":"10","2":"321","3":"100"},{"1":"20","2":"321","3":"100"},{"1":"40","2":"321","3":"100"},{"1":"100","2":"321","3":"100"},{"1":"10","2":"322","3":"100"},{"1":"20","2":"322","3":"100"},{"1":"40","2":"322","3":"100"},{"1":"100","2":"322","3":"100"},{"1":"10","2":"323","3":"100"},{"1":"20","2":"323","3":"100"},{"1":"40","2":"323","3":"100"},{"1":"100","2":"323","3":"100"},{"1":"10","2":"324","3":"100"},{"1":"20","2":"324","3":"100"},{"1":"40","2":"324","3":"100"},{"1":"100","2":"324","3":"100"},{"1":"10","2":"325","3":"100"},{"1":"20","2":"325","3":"100"},{"1":"40","2":"325","3":"100"},{"1":"100","2":"325","3":"100"},{"1":"10","2":"326","3":"100"},{"1":"20","2":"326","3":"100"},{"1":"40","2":"326","3":"100"},{"1":"100","2":"326","3":"100"},{"1":"10","2":"327","3":"100"},{"1":"20","2":"327","3":"100"},{"1":"40","2":"327","3":"100"},{"1":"100","2":"327","3":"100"},{"1":"10","2":"328","3":"100"},{"1":"20","2":"328","3":"100"},{"1":"40","2":"328","3":"100"},{"1":"100","2":"328","3":"100"},{"1":"10","2":"329","3":"100"},{"1":"20","2":"329","3":"100"},{"1":"40","2":"329","3":"100"},{"1":"100","2":"329","3":"100"},{"1":"10","2":"330","3":"100"},{"1":"20","2":"330","3":"100"},{"1":"40","2":"330","3":"100"},{"1":"100","2":"330","3":"100"},{"1":"10","2":"331","3":"100"},{"1":"20","2":"331","3":"100"},{"1":"40","2":"331","3":"100"},{"1":"100","2":"331","3":"100"},{"1":"10","2":"332","3":"100"},{"1":"20","2":"332","3":"100"},{"1":"40","2":"332","3":"100"},{"1":"100","2":"332","3":"100"},{"1":"10","2":"333","3":"100"},{"1":"20","2":"333","3":"100"},{"1":"40","2":"333","3":"100"},{"1":"100","2":"333","3":"100"},{"1":"10","2":"334","3":"100"},{"1":"20","2":"334","3":"100"},{"1":"40","2":"334","3":"100"},{"1":"100","2":"334","3":"100"},{"1":"10","2":"335","3":"100"},{"1":"20","2":"335","3":"100"},{"1":"40","2":"335","3":"100"},{"1":"100","2":"335","3":"100"},{"1":"10","2":"336","3":"100"},{"1":"20","2":"336","3":"100"},{"1":"40","2":"336","3":"100"},{"1":"100","2":"336","3":"100"},{"1":"10","2":"337","3":"100"},{"1":"20","2":"337","3":"100"},{"1":"40","2":"337","3":"100"},{"1":"100","2":"337","3":"100"},{"1":"10","2":"338","3":"100"},{"1":"20","2":"338","3":"100"},{"1":"40","2":"338","3":"100"},{"1":"100","2":"338","3":"100"},{"1":"10","2":"339","3":"100"},{"1":"20","2":"339","3":"100"},{"1":"40","2":"339","3":"100"},{"1":"100","2":"339","3":"100"},{"1":"10","2":"340","3":"100"},{"1":"20","2":"340","3":"100"},{"1":"40","2":"340","3":"100"},{"1":"100","2":"340","3":"100"},{"1":"10","2":"341","3":"100"},{"1":"20","2":"341","3":"100"},{"1":"40","2":"341","3":"100"},{"1":"100","2":"341","3":"100"},{"1":"10","2":"342","3":"100"},{"1":"20","2":"342","3":"100"},{"1":"40","2":"342","3":"100"},{"1":"100","2":"342","3":"100"},{"1":"10","2":"343","3":"100"},{"1":"20","2":"343","3":"100"},{"1":"40","2":"343","3":"100"},{"1":"100","2":"343","3":"100"},{"1":"10","2":"344","3":"100"},{"1":"20","2":"344","3":"100"},{"1":"40","2":"344","3":"100"},{"1":"100","2":"344","3":"100"},{"1":"10","2":"345","3":"100"},{"1":"20","2":"345","3":"100"},{"1":"40","2":"345","3":"100"},{"1":"100","2":"345","3":"100"},{"1":"10","2":"346","3":"100"},{"1":"20","2":"346","3":"100"},{"1":"40","2":"346","3":"100"},{"1":"100","2":"346","3":"100"},{"1":"10","2":"347","3":"100"},{"1":"20","2":"347","3":"100"},{"1":"40","2":"347","3":"100"},{"1":"100","2":"347","3":"100"},{"1":"10","2":"348","3":"100"},{"1":"20","2":"348","3":"100"},{"1":"40","2":"348","3":"100"},{"1":"100","2":"348","3":"100"},{"1":"10","2":"349","3":"100"},{"1":"20","2":"349","3":"100"},{"1":"40","2":"349","3":"100"},{"1":"100","2":"349","3":"100"},{"1":"10","2":"350","3":"100"},{"1":"20","2":"350","3":"100"},{"1":"40","2":"350","3":"100"},{"1":"100","2":"350","3":"100"},{"1":"10","2":"351","3":"100"},{"1":"20","2":"351","3":"100"},{"1":"40","2":"351","3":"100"},{"1":"100","2":"351","3":"100"},{"1":"10","2":"352","3":"100"},{"1":"20","2":"352","3":"100"},{"1":"40","2":"352","3":"100"},{"1":"100","2":"352","3":"100"},{"1":"10","2":"353","3":"100"},{"1":"20","2":"353","3":"100"},{"1":"40","2":"353","3":"100"},{"1":"100","2":"353","3":"100"},{"1":"10","2":"354","3":"100"},{"1":"20","2":"354","3":"100"},{"1":"40","2":"354","3":"100"},{"1":"100","2":"354","3":"100"},{"1":"10","2":"355","3":"100"},{"1":"20","2":"355","3":"100"},{"1":"40","2":"355","3":"100"},{"1":"100","2":"355","3":"100"},{"1":"10","2":"356","3":"100"},{"1":"20","2":"356","3":"100"},{"1":"40","2":"356","3":"100"},{"1":"100","2":"356","3":"100"},{"1":"10","2":"357","3":"100"},{"1":"20","2":"357","3":"100"},{"1":"40","2":"357","3":"100"},{"1":"100","2":"357","3":"100"},{"1":"10","2":"358","3":"100"},{"1":"20","2":"358","3":"100"},{"1":"40","2":"358","3":"100"},{"1":"100","2":"358","3":"100"},{"1":"10","2":"359","3":"100"},{"1":"20","2":"359","3":"100"},{"1":"40","2":"359","3":"100"},{"1":"100","2":"359","3":"100"},{"1":"10","2":"360","3":"100"},{"1":"20","2":"360","3":"100"},{"1":"40","2":"360","3":"100"},{"1":"100","2":"360","3":"100"},{"1":"10","2":"361","3":"100"},{"1":"20","2":"361","3":"100"},{"1":"40","2":"361","3":"100"},{"1":"100","2":"361","3":"100"},{"1":"10","2":"362","3":"100"},{"1":"20","2":"362","3":"100"},{"1":"40","2":"362","3":"100"},{"1":"100","2":"362","3":"100"},{"1":"10","2":"363","3":"100"},{"1":"20","2":"363","3":"100"},{"1":"40","2":"363","3":"100"},{"1":"100","2":"363","3":"100"},{"1":"10","2":"364","3":"100"},{"1":"20","2":"364","3":"100"},{"1":"40","2":"364","3":"100"},{"1":"100","2":"364","3":"100"},{"1":"10","2":"365","3":"100"},{"1":"20","2":"365","3":"100"},{"1":"40","2":"365","3":"100"},{"1":"100","2":"365","3":"100"},{"1":"10","2":"366","3":"100"},{"1":"20","2":"366","3":"100"},{"1":"40","2":"366","3":"100"},{"1":"100","2":"366","3":"100"},{"1":"10","2":"367","3":"100"},{"1":"20","2":"367","3":"100"},{"1":"40","2":"367","3":"100"},{"1":"100","2":"367","3":"100"},{"1":"10","2":"368","3":"100"},{"1":"20","2":"368","3":"100"},{"1":"40","2":"368","3":"100"},{"1":"100","2":"368","3":"100"},{"1":"10","2":"369","3":"100"},{"1":"20","2":"369","3":"100"},{"1":"40","2":"369","3":"100"},{"1":"100","2":"369","3":"100"},{"1":"10","2":"370","3":"100"},{"1":"20","2":"370","3":"100"},{"1":"40","2":"370","3":"100"},{"1":"100","2":"370","3":"100"},{"1":"10","2":"371","3":"100"},{"1":"20","2":"371","3":"100"},{"1":"40","2":"371","3":"100"},{"1":"100","2":"371","3":"100"},{"1":"10","2":"372","3":"100"},{"1":"20","2":"372","3":"100"},{"1":"40","2":"372","3":"100"},{"1":"100","2":"372","3":"100"},{"1":"10","2":"373","3":"100"},{"1":"20","2":"373","3":"100"},{"1":"40","2":"373","3":"100"},{"1":"100","2":"373","3":"100"},{"1":"10","2":"374","3":"100"},{"1":"20","2":"374","3":"100"},{"1":"40","2":"374","3":"100"},{"1":"100","2":"374","3":"100"},{"1":"10","2":"375","3":"100"},{"1":"20","2":"375","3":"100"},{"1":"40","2":"375","3":"100"},{"1":"100","2":"375","3":"100"},{"1":"10","2":"376","3":"100"},{"1":"20","2":"376","3":"100"},{"1":"40","2":"376","3":"100"},{"1":"100","2":"376","3":"100"},{"1":"10","2":"377","3":"100"},{"1":"20","2":"377","3":"100"},{"1":"40","2":"377","3":"100"},{"1":"100","2":"377","3":"100"},{"1":"10","2":"378","3":"100"},{"1":"20","2":"378","3":"100"},{"1":"40","2":"378","3":"100"},{"1":"100","2":"378","3":"100"},{"1":"10","2":"379","3":"100"},{"1":"20","2":"379","3":"100"},{"1":"40","2":"379","3":"100"},{"1":"100","2":"379","3":"100"},{"1":"10","2":"380","3":"100"},{"1":"20","2":"380","3":"100"},{"1":"40","2":"380","3":"100"},{"1":"100","2":"380","3":"100"},{"1":"10","2":"381","3":"100"},{"1":"20","2":"381","3":"100"},{"1":"40","2":"381","3":"100"},{"1":"100","2":"381","3":"100"},{"1":"10","2":"382","3":"100"},{"1":"20","2":"382","3":"100"},{"1":"40","2":"382","3":"100"},{"1":"100","2":"382","3":"100"},{"1":"10","2":"383","3":"100"},{"1":"20","2":"383","3":"100"},{"1":"40","2":"383","3":"100"},{"1":"100","2":"383","3":"100"},{"1":"10","2":"384","3":"100"},{"1":"20","2":"384","3":"100"},{"1":"40","2":"384","3":"100"},{"1":"100","2":"384","3":"100"},{"1":"10","2":"385","3":"100"},{"1":"20","2":"385","3":"100"},{"1":"40","2":"385","3":"100"},{"1":"100","2":"385","3":"100"},{"1":"10","2":"386","3":"100"},{"1":"20","2":"386","3":"100"},{"1":"40","2":"386","3":"100"},{"1":"100","2":"386","3":"100"},{"1":"10","2":"387","3":"100"},{"1":"20","2":"387","3":"100"},{"1":"40","2":"387","3":"100"},{"1":"100","2":"387","3":"100"},{"1":"10","2":"388","3":"100"},{"1":"20","2":"388","3":"100"},{"1":"40","2":"388","3":"100"},{"1":"100","2":"388","3":"100"},{"1":"10","2":"389","3":"100"},{"1":"20","2":"389","3":"100"},{"1":"40","2":"389","3":"100"},{"1":"100","2":"389","3":"100"},{"1":"10","2":"390","3":"100"},{"1":"20","2":"390","3":"100"},{"1":"40","2":"390","3":"100"},{"1":"100","2":"390","3":"100"},{"1":"10","2":"391","3":"100"},{"1":"20","2":"391","3":"100"},{"1":"40","2":"391","3":"100"},{"1":"100","2":"391","3":"100"},{"1":"10","2":"392","3":"100"},{"1":"20","2":"392","3":"100"},{"1":"40","2":"392","3":"100"},{"1":"100","2":"392","3":"100"},{"1":"10","2":"393","3":"100"},{"1":"20","2":"393","3":"100"},{"1":"40","2":"393","3":"100"},{"1":"100","2":"393","3":"100"},{"1":"10","2":"394","3":"100"},{"1":"20","2":"394","3":"100"},{"1":"40","2":"394","3":"100"},{"1":"100","2":"394","3":"100"},{"1":"10","2":"395","3":"100"},{"1":"20","2":"395","3":"100"},{"1":"40","2":"395","3":"100"},{"1":"100","2":"395","3":"100"},{"1":"10","2":"396","3":"100"},{"1":"20","2":"396","3":"100"},{"1":"40","2":"396","3":"100"},{"1":"100","2":"396","3":"100"},{"1":"10","2":"397","3":"100"},{"1":"20","2":"397","3":"100"},{"1":"40","2":"397","3":"100"},{"1":"100","2":"397","3":"100"},{"1":"10","2":"398","3":"100"},{"1":"20","2":"398","3":"100"},{"1":"40","2":"398","3":"100"},{"1":"100","2":"398","3":"100"},{"1":"10","2":"399","3":"100"},{"1":"20","2":"399","3":"100"},{"1":"40","2":"399","3":"100"},{"1":"100","2":"399","3":"100"},{"1":"10","2":"400","3":"100"},{"1":"20","2":"400","3":"100"},{"1":"40","2":"400","3":"100"},{"1":"100","2":"400","3":"100"},{"1":"10","2":"401","3":"100"},{"1":"20","2":"401","3":"100"},{"1":"40","2":"401","3":"100"},{"1":"100","2":"401","3":"100"},{"1":"10","2":"402","3":"100"},{"1":"20","2":"402","3":"100"},{"1":"40","2":"402","3":"100"},{"1":"100","2":"402","3":"100"},{"1":"10","2":"403","3":"100"},{"1":"20","2":"403","3":"100"},{"1":"40","2":"403","3":"100"},{"1":"100","2":"403","3":"100"},{"1":"10","2":"404","3":"100"},{"1":"20","2":"404","3":"100"},{"1":"40","2":"404","3":"100"},{"1":"100","2":"404","3":"100"},{"1":"10","2":"405","3":"100"},{"1":"20","2":"405","3":"100"},{"1":"40","2":"405","3":"100"},{"1":"100","2":"405","3":"100"},{"1":"10","2":"406","3":"100"},{"1":"20","2":"406","3":"100"},{"1":"40","2":"406","3":"100"},{"1":"100","2":"406","3":"100"},{"1":"10","2":"407","3":"100"},{"1":"20","2":"407","3":"100"},{"1":"40","2":"407","3":"100"},{"1":"100","2":"407","3":"100"},{"1":"10","2":"408","3":"100"},{"1":"20","2":"408","3":"100"},{"1":"40","2":"408","3":"100"},{"1":"100","2":"408","3":"100"},{"1":"10","2":"409","3":"100"},{"1":"20","2":"409","3":"100"},{"1":"40","2":"409","3":"100"},{"1":"100","2":"409","3":"100"},{"1":"10","2":"410","3":"100"},{"1":"20","2":"410","3":"100"},{"1":"40","2":"410","3":"100"},{"1":"100","2":"410","3":"100"},{"1":"10","2":"411","3":"100"},{"1":"20","2":"411","3":"100"},{"1":"40","2":"411","3":"100"},{"1":"100","2":"411","3":"100"},{"1":"10","2":"412","3":"100"},{"1":"20","2":"412","3":"100"},{"1":"40","2":"412","3":"100"},{"1":"100","2":"412","3":"100"},{"1":"10","2":"413","3":"100"},{"1":"20","2":"413","3":"100"},{"1":"40","2":"413","3":"100"},{"1":"100","2":"413","3":"100"},{"1":"10","2":"414","3":"100"},{"1":"20","2":"414","3":"100"},{"1":"40","2":"414","3":"100"},{"1":"100","2":"414","3":"100"},{"1":"10","2":"415","3":"100"},{"1":"20","2":"415","3":"100"},{"1":"40","2":"415","3":"100"},{"1":"100","2":"415","3":"100"},{"1":"10","2":"416","3":"100"},{"1":"20","2":"416","3":"100"},{"1":"40","2":"416","3":"100"},{"1":"100","2":"416","3":"100"},{"1":"10","2":"417","3":"100"},{"1":"20","2":"417","3":"100"},{"1":"40","2":"417","3":"100"},{"1":"100","2":"417","3":"100"},{"1":"10","2":"418","3":"100"},{"1":"20","2":"418","3":"100"},{"1":"40","2":"418","3":"100"},{"1":"100","2":"418","3":"100"},{"1":"10","2":"419","3":"100"},{"1":"20","2":"419","3":"100"},{"1":"40","2":"419","3":"100"},{"1":"100","2":"419","3":"100"},{"1":"10","2":"420","3":"100"},{"1":"20","2":"420","3":"100"},{"1":"40","2":"420","3":"100"},{"1":"100","2":"420","3":"100"},{"1":"10","2":"421","3":"100"},{"1":"20","2":"421","3":"100"},{"1":"40","2":"421","3":"100"},{"1":"100","2":"421","3":"100"},{"1":"10","2":"422","3":"100"},{"1":"20","2":"422","3":"100"},{"1":"40","2":"422","3":"100"},{"1":"100","2":"422","3":"100"},{"1":"10","2":"423","3":"100"},{"1":"20","2":"423","3":"100"},{"1":"40","2":"423","3":"100"},{"1":"100","2":"423","3":"100"},{"1":"10","2":"424","3":"100"},{"1":"20","2":"424","3":"100"},{"1":"40","2":"424","3":"100"},{"1":"100","2":"424","3":"100"},{"1":"10","2":"425","3":"100"},{"1":"20","2":"425","3":"100"},{"1":"40","2":"425","3":"100"},{"1":"100","2":"425","3":"100"},{"1":"10","2":"426","3":"100"},{"1":"20","2":"426","3":"100"},{"1":"40","2":"426","3":"100"},{"1":"100","2":"426","3":"100"},{"1":"10","2":"427","3":"100"},{"1":"20","2":"427","3":"100"},{"1":"40","2":"427","3":"100"},{"1":"100","2":"427","3":"100"},{"1":"10","2":"428","3":"100"},{"1":"20","2":"428","3":"100"},{"1":"40","2":"428","3":"100"},{"1":"100","2":"428","3":"100"},{"1":"10","2":"429","3":"100"},{"1":"20","2":"429","3":"100"},{"1":"40","2":"429","3":"100"},{"1":"100","2":"429","3":"100"},{"1":"10","2":"430","3":"100"},{"1":"20","2":"430","3":"100"},{"1":"40","2":"430","3":"100"},{"1":"100","2":"430","3":"100"},{"1":"10","2":"431","3":"100"},{"1":"20","2":"431","3":"100"},{"1":"40","2":"431","3":"100"},{"1":"100","2":"431","3":"100"},{"1":"10","2":"432","3":"100"},{"1":"20","2":"432","3":"100"},{"1":"40","2":"432","3":"100"},{"1":"100","2":"432","3":"100"},{"1":"10","2":"433","3":"100"},{"1":"20","2":"433","3":"100"},{"1":"40","2":"433","3":"100"},{"1":"100","2":"433","3":"100"},{"1":"10","2":"434","3":"100"},{"1":"20","2":"434","3":"100"},{"1":"40","2":"434","3":"100"},{"1":"100","2":"434","3":"100"},{"1":"10","2":"435","3":"100"},{"1":"20","2":"435","3":"100"},{"1":"40","2":"435","3":"100"},{"1":"100","2":"435","3":"100"},{"1":"10","2":"436","3":"100"},{"1":"20","2":"436","3":"100"},{"1":"40","2":"436","3":"100"},{"1":"100","2":"436","3":"100"},{"1":"10","2":"437","3":"100"},{"1":"20","2":"437","3":"100"},{"1":"40","2":"437","3":"100"},{"1":"100","2":"437","3":"100"},{"1":"10","2":"438","3":"100"},{"1":"20","2":"438","3":"100"},{"1":"40","2":"438","3":"100"},{"1":"100","2":"438","3":"100"},{"1":"10","2":"439","3":"100"},{"1":"20","2":"439","3":"100"},{"1":"40","2":"439","3":"100"},{"1":"100","2":"439","3":"100"},{"1":"10","2":"440","3":"100"},{"1":"20","2":"440","3":"100"},{"1":"40","2":"440","3":"100"},{"1":"100","2":"440","3":"100"},{"1":"10","2":"441","3":"100"},{"1":"20","2":"441","3":"100"},{"1":"40","2":"441","3":"100"},{"1":"100","2":"441","3":"100"},{"1":"10","2":"442","3":"100"},{"1":"20","2":"442","3":"100"},{"1":"40","2":"442","3":"100"},{"1":"100","2":"442","3":"100"},{"1":"10","2":"443","3":"100"},{"1":"20","2":"443","3":"100"},{"1":"40","2":"443","3":"100"},{"1":"100","2":"443","3":"100"},{"1":"10","2":"444","3":"100"},{"1":"20","2":"444","3":"100"},{"1":"40","2":"444","3":"100"},{"1":"100","2":"444","3":"100"},{"1":"10","2":"445","3":"100"},{"1":"20","2":"445","3":"100"},{"1":"40","2":"445","3":"100"},{"1":"100","2":"445","3":"100"},{"1":"10","2":"446","3":"100"},{"1":"20","2":"446","3":"100"},{"1":"40","2":"446","3":"100"},{"1":"100","2":"446","3":"100"},{"1":"10","2":"447","3":"100"},{"1":"20","2":"447","3":"100"},{"1":"40","2":"447","3":"100"},{"1":"100","2":"447","3":"100"},{"1":"10","2":"448","3":"100"},{"1":"20","2":"448","3":"100"},{"1":"40","2":"448","3":"100"},{"1":"100","2":"448","3":"100"},{"1":"10","2":"449","3":"100"},{"1":"20","2":"449","3":"100"},{"1":"40","2":"449","3":"100"},{"1":"100","2":"449","3":"100"},{"1":"10","2":"450","3":"100"},{"1":"20","2":"450","3":"100"},{"1":"40","2":"450","3":"100"},{"1":"100","2":"450","3":"100"},{"1":"10","2":"451","3":"100"},{"1":"20","2":"451","3":"100"},{"1":"40","2":"451","3":"100"},{"1":"100","2":"451","3":"100"},{"1":"10","2":"452","3":"100"},{"1":"20","2":"452","3":"100"},{"1":"40","2":"452","3":"100"},{"1":"100","2":"452","3":"100"},{"1":"10","2":"453","3":"100"},{"1":"20","2":"453","3":"100"},{"1":"40","2":"453","3":"100"},{"1":"100","2":"453","3":"100"},{"1":"10","2":"454","3":"100"},{"1":"20","2":"454","3":"100"},{"1":"40","2":"454","3":"100"},{"1":"100","2":"454","3":"100"},{"1":"10","2":"455","3":"100"},{"1":"20","2":"455","3":"100"},{"1":"40","2":"455","3":"100"},{"1":"100","2":"455","3":"100"},{"1":"10","2":"456","3":"100"},{"1":"20","2":"456","3":"100"},{"1":"40","2":"456","3":"100"},{"1":"100","2":"456","3":"100"},{"1":"10","2":"457","3":"100"},{"1":"20","2":"457","3":"100"},{"1":"40","2":"457","3":"100"},{"1":"100","2":"457","3":"100"},{"1":"10","2":"458","3":"100"},{"1":"20","2":"458","3":"100"},{"1":"40","2":"458","3":"100"},{"1":"100","2":"458","3":"100"},{"1":"10","2":"459","3":"100"},{"1":"20","2":"459","3":"100"},{"1":"40","2":"459","3":"100"},{"1":"100","2":"459","3":"100"},{"1":"10","2":"460","3":"100"},{"1":"20","2":"460","3":"100"},{"1":"40","2":"460","3":"100"},{"1":"100","2":"460","3":"100"},{"1":"10","2":"461","3":"100"},{"1":"20","2":"461","3":"100"},{"1":"40","2":"461","3":"100"},{"1":"100","2":"461","3":"100"},{"1":"10","2":"462","3":"100"},{"1":"20","2":"462","3":"100"},{"1":"40","2":"462","3":"100"},{"1":"100","2":"462","3":"100"},{"1":"10","2":"463","3":"100"},{"1":"20","2":"463","3":"100"},{"1":"40","2":"463","3":"100"},{"1":"100","2":"463","3":"100"},{"1":"10","2":"464","3":"100"},{"1":"20","2":"464","3":"100"},{"1":"40","2":"464","3":"100"},{"1":"100","2":"464","3":"100"},{"1":"10","2":"465","3":"100"},{"1":"20","2":"465","3":"100"},{"1":"40","2":"465","3":"100"},{"1":"100","2":"465","3":"100"},{"1":"10","2":"466","3":"100"},{"1":"20","2":"466","3":"100"},{"1":"40","2":"466","3":"100"},{"1":"100","2":"466","3":"100"},{"1":"10","2":"467","3":"100"},{"1":"20","2":"467","3":"100"},{"1":"40","2":"467","3":"100"},{"1":"100","2":"467","3":"100"},{"1":"10","2":"468","3":"100"},{"1":"20","2":"468","3":"100"},{"1":"40","2":"468","3":"100"},{"1":"100","2":"468","3":"100"},{"1":"10","2":"469","3":"100"},{"1":"20","2":"469","3":"100"},{"1":"40","2":"469","3":"100"},{"1":"100","2":"469","3":"100"},{"1":"10","2":"470","3":"100"},{"1":"20","2":"470","3":"100"},{"1":"40","2":"470","3":"100"},{"1":"100","2":"470","3":"100"},{"1":"10","2":"471","3":"100"},{"1":"20","2":"471","3":"100"},{"1":"40","2":"471","3":"100"},{"1":"100","2":"471","3":"100"},{"1":"10","2":"472","3":"100"},{"1":"20","2":"472","3":"100"},{"1":"40","2":"472","3":"100"},{"1":"100","2":"472","3":"100"},{"1":"10","2":"473","3":"100"},{"1":"20","2":"473","3":"100"},{"1":"40","2":"473","3":"100"},{"1":"100","2":"473","3":"100"},{"1":"10","2":"474","3":"100"},{"1":"20","2":"474","3":"100"},{"1":"40","2":"474","3":"100"},{"1":"100","2":"474","3":"100"},{"1":"10","2":"475","3":"100"},{"1":"20","2":"475","3":"100"},{"1":"40","2":"475","3":"100"},{"1":"100","2":"475","3":"100"},{"1":"10","2":"476","3":"100"},{"1":"20","2":"476","3":"100"},{"1":"40","2":"476","3":"100"},{"1":"100","2":"476","3":"100"},{"1":"10","2":"477","3":"100"},{"1":"20","2":"477","3":"100"},{"1":"40","2":"477","3":"100"},{"1":"100","2":"477","3":"100"},{"1":"10","2":"478","3":"100"},{"1":"20","2":"478","3":"100"},{"1":"40","2":"478","3":"100"},{"1":"100","2":"478","3":"100"},{"1":"10","2":"479","3":"100"},{"1":"20","2":"479","3":"100"},{"1":"40","2":"479","3":"100"},{"1":"100","2":"479","3":"100"},{"1":"10","2":"480","3":"100"},{"1":"20","2":"480","3":"100"},{"1":"40","2":"480","3":"100"},{"1":"100","2":"480","3":"100"},{"1":"10","2":"481","3":"100"},{"1":"20","2":"481","3":"100"},{"1":"40","2":"481","3":"100"},{"1":"100","2":"481","3":"100"},{"1":"10","2":"482","3":"100"},{"1":"20","2":"482","3":"100"},{"1":"40","2":"482","3":"100"},{"1":"100","2":"482","3":"100"},{"1":"10","2":"483","3":"100"},{"1":"20","2":"483","3":"100"},{"1":"40","2":"483","3":"100"},{"1":"100","2":"483","3":"100"},{"1":"10","2":"484","3":"100"},{"1":"20","2":"484","3":"100"},{"1":"40","2":"484","3":"100"},{"1":"100","2":"484","3":"100"},{"1":"10","2":"485","3":"100"},{"1":"20","2":"485","3":"100"},{"1":"40","2":"485","3":"100"},{"1":"100","2":"485","3":"100"},{"1":"10","2":"486","3":"100"},{"1":"20","2":"486","3":"100"},{"1":"40","2":"486","3":"100"},{"1":"100","2":"486","3":"100"},{"1":"10","2":"487","3":"100"},{"1":"20","2":"487","3":"100"},{"1":"40","2":"487","3":"100"},{"1":"100","2":"487","3":"100"},{"1":"10","2":"488","3":"100"},{"1":"20","2":"488","3":"100"},{"1":"40","2":"488","3":"100"},{"1":"100","2":"488","3":"100"},{"1":"10","2":"489","3":"100"},{"1":"20","2":"489","3":"100"},{"1":"40","2":"489","3":"100"},{"1":"100","2":"489","3":"100"},{"1":"10","2":"490","3":"100"},{"1":"20","2":"490","3":"100"},{"1":"40","2":"490","3":"100"},{"1":"100","2":"490","3":"100"},{"1":"10","2":"491","3":"100"},{"1":"20","2":"491","3":"100"},{"1":"40","2":"491","3":"100"},{"1":"100","2":"491","3":"100"},{"1":"10","2":"492","3":"100"},{"1":"20","2":"492","3":"100"},{"1":"40","2":"492","3":"100"},{"1":"100","2":"492","3":"100"},{"1":"10","2":"493","3":"100"},{"1":"20","2":"493","3":"100"},{"1":"40","2":"493","3":"100"},{"1":"100","2":"493","3":"100"},{"1":"10","2":"494","3":"100"},{"1":"20","2":"494","3":"100"},{"1":"40","2":"494","3":"100"},{"1":"100","2":"494","3":"100"},{"1":"10","2":"495","3":"100"},{"1":"20","2":"495","3":"100"},{"1":"40","2":"495","3":"100"},{"1":"100","2":"495","3":"100"},{"1":"10","2":"496","3":"100"},{"1":"20","2":"496","3":"100"},{"1":"40","2":"496","3":"100"},{"1":"100","2":"496","3":"100"},{"1":"10","2":"497","3":"100"},{"1":"20","2":"497","3":"100"},{"1":"40","2":"497","3":"100"},{"1":"100","2":"497","3":"100"},{"1":"10","2":"498","3":"100"},{"1":"20","2":"498","3":"100"},{"1":"40","2":"498","3":"100"},{"1":"100","2":"498","3":"100"},{"1":"10","2":"499","3":"100"},{"1":"20","2":"499","3":"100"},{"1":"40","2":"499","3":"100"},{"1":"100","2":"499","3":"100"},{"1":"10","2":"500","3":"100"},{"1":"20","2":"500","3":"100"},{"1":"40","2":"500","3":"100"},{"1":"100","2":"500","3":"100"},{"1":"10","2":"501","3":"100"},{"1":"20","2":"501","3":"100"},{"1":"40","2":"501","3":"100"},{"1":"100","2":"501","3":"100"},{"1":"10","2":"502","3":"100"},{"1":"20","2":"502","3":"100"},{"1":"40","2":"502","3":"100"},{"1":"100","2":"502","3":"100"},{"1":"10","2":"503","3":"100"},{"1":"20","2":"503","3":"100"},{"1":"40","2":"503","3":"100"},{"1":"100","2":"503","3":"100"},{"1":"10","2":"504","3":"100"},{"1":"20","2":"504","3":"100"},{"1":"40","2":"504","3":"100"},{"1":"100","2":"504","3":"100"},{"1":"10","2":"505","3":"100"},{"1":"20","2":"505","3":"100"},{"1":"40","2":"505","3":"100"},{"1":"100","2":"505","3":"100"},{"1":"10","2":"506","3":"100"},{"1":"20","2":"506","3":"100"},{"1":"40","2":"506","3":"100"},{"1":"100","2":"506","3":"100"},{"1":"10","2":"507","3":"100"},{"1":"20","2":"507","3":"100"},{"1":"40","2":"507","3":"100"},{"1":"100","2":"507","3":"100"},{"1":"10","2":"508","3":"100"},{"1":"20","2":"508","3":"100"},{"1":"40","2":"508","3":"100"},{"1":"100","2":"508","3":"100"},{"1":"10","2":"509","3":"100"},{"1":"20","2":"509","3":"100"},{"1":"40","2":"509","3":"100"},{"1":"100","2":"509","3":"100"},{"1":"10","2":"510","3":"100"},{"1":"20","2":"510","3":"100"},{"1":"40","2":"510","3":"100"},{"1":"100","2":"510","3":"100"},{"1":"10","2":"511","3":"100"},{"1":"20","2":"511","3":"100"},{"1":"40","2":"511","3":"100"},{"1":"100","2":"511","3":"100"},{"1":"10","2":"512","3":"100"},{"1":"20","2":"512","3":"100"},{"1":"40","2":"512","3":"100"},{"1":"100","2":"512","3":"100"},{"1":"10","2":"513","3":"100"},{"1":"20","2":"513","3":"100"},{"1":"40","2":"513","3":"100"},{"1":"100","2":"513","3":"100"},{"1":"10","2":"514","3":"100"},{"1":"20","2":"514","3":"100"},{"1":"40","2":"514","3":"100"},{"1":"100","2":"514","3":"100"},{"1":"10","2":"515","3":"100"},{"1":"20","2":"515","3":"100"},{"1":"40","2":"515","3":"100"},{"1":"100","2":"515","3":"100"},{"1":"10","2":"516","3":"100"},{"1":"20","2":"516","3":"100"},{"1":"40","2":"516","3":"100"},{"1":"100","2":"516","3":"100"},{"1":"10","2":"517","3":"100"},{"1":"20","2":"517","3":"100"},{"1":"40","2":"517","3":"100"},{"1":"100","2":"517","3":"100"},{"1":"10","2":"518","3":"100"},{"1":"20","2":"518","3":"100"},{"1":"40","2":"518","3":"100"},{"1":"100","2":"518","3":"100"},{"1":"10","2":"519","3":"100"},{"1":"20","2":"519","3":"100"},{"1":"40","2":"519","3":"100"},{"1":"100","2":"519","3":"100"},{"1":"10","2":"520","3":"100"},{"1":"20","2":"520","3":"100"},{"1":"40","2":"520","3":"100"},{"1":"100","2":"520","3":"100"},{"1":"10","2":"521","3":"100"},{"1":"20","2":"521","3":"100"},{"1":"40","2":"521","3":"100"},{"1":"100","2":"521","3":"100"},{"1":"10","2":"522","3":"100"},{"1":"20","2":"522","3":"100"},{"1":"40","2":"522","3":"100"},{"1":"100","2":"522","3":"100"},{"1":"10","2":"523","3":"100"},{"1":"20","2":"523","3":"100"},{"1":"40","2":"523","3":"100"},{"1":"100","2":"523","3":"100"},{"1":"10","2":"524","3":"100"},{"1":"20","2":"524","3":"100"},{"1":"40","2":"524","3":"100"},{"1":"100","2":"524","3":"100"},{"1":"10","2":"525","3":"100"},{"1":"20","2":"525","3":"100"},{"1":"40","2":"525","3":"100"},{"1":"100","2":"525","3":"100"},{"1":"10","2":"526","3":"100"},{"1":"20","2":"526","3":"100"},{"1":"40","2":"526","3":"100"},{"1":"100","2":"526","3":"100"},{"1":"10","2":"527","3":"100"},{"1":"20","2":"527","3":"100"},{"1":"40","2":"527","3":"100"},{"1":"100","2":"527","3":"100"},{"1":"10","2":"528","3":"100"},{"1":"20","2":"528","3":"100"},{"1":"40","2":"528","3":"100"},{"1":"100","2":"528","3":"100"},{"1":"10","2":"529","3":"100"},{"1":"20","2":"529","3":"100"},{"1":"40","2":"529","3":"100"},{"1":"100","2":"529","3":"100"},{"1":"10","2":"530","3":"100"},{"1":"20","2":"530","3":"100"},{"1":"40","2":"530","3":"100"},{"1":"100","2":"530","3":"100"},{"1":"10","2":"531","3":"100"},{"1":"20","2":"531","3":"100"},{"1":"40","2":"531","3":"100"},{"1":"100","2":"531","3":"100"},{"1":"10","2":"532","3":"100"},{"1":"20","2":"532","3":"100"},{"1":"40","2":"532","3":"100"},{"1":"100","2":"532","3":"100"},{"1":"10","2":"533","3":"100"},{"1":"20","2":"533","3":"100"},{"1":"40","2":"533","3":"100"},{"1":"100","2":"533","3":"100"},{"1":"10","2":"534","3":"100"},{"1":"20","2":"534","3":"100"},{"1":"40","2":"534","3":"100"},{"1":"100","2":"534","3":"100"},{"1":"10","2":"535","3":"100"},{"1":"20","2":"535","3":"100"},{"1":"40","2":"535","3":"100"},{"1":"100","2":"535","3":"100"},{"1":"10","2":"536","3":"100"},{"1":"20","2":"536","3":"100"},{"1":"40","2":"536","3":"100"},{"1":"100","2":"536","3":"100"},{"1":"10","2":"537","3":"100"},{"1":"20","2":"537","3":"100"},{"1":"40","2":"537","3":"100"},{"1":"100","2":"537","3":"100"},{"1":"10","2":"538","3":"100"},{"1":"20","2":"538","3":"100"},{"1":"40","2":"538","3":"100"},{"1":"100","2":"538","3":"100"},{"1":"10","2":"539","3":"100"},{"1":"20","2":"539","3":"100"},{"1":"40","2":"539","3":"100"},{"1":"100","2":"539","3":"100"},{"1":"10","2":"540","3":"100"},{"1":"20","2":"540","3":"100"},{"1":"40","2":"540","3":"100"},{"1":"100","2":"540","3":"100"},{"1":"10","2":"541","3":"100"},{"1":"20","2":"541","3":"100"},{"1":"40","2":"541","3":"100"},{"1":"100","2":"541","3":"100"},{"1":"10","2":"542","3":"100"},{"1":"20","2":"542","3":"100"},{"1":"40","2":"542","3":"100"},{"1":"100","2":"542","3":"100"},{"1":"10","2":"543","3":"100"},{"1":"20","2":"543","3":"100"},{"1":"40","2":"543","3":"100"},{"1":"100","2":"543","3":"100"},{"1":"10","2":"544","3":"100"},{"1":"20","2":"544","3":"100"},{"1":"40","2":"544","3":"100"},{"1":"100","2":"544","3":"100"},{"1":"10","2":"545","3":"100"},{"1":"20","2":"545","3":"100"},{"1":"40","2":"545","3":"100"},{"1":"100","2":"545","3":"100"},{"1":"10","2":"546","3":"100"},{"1":"20","2":"546","3":"100"},{"1":"40","2":"546","3":"100"},{"1":"100","2":"546","3":"100"},{"1":"10","2":"547","3":"100"},{"1":"20","2":"547","3":"100"},{"1":"40","2":"547","3":"100"},{"1":"100","2":"547","3":"100"},{"1":"10","2":"548","3":"100"},{"1":"20","2":"548","3":"100"},{"1":"40","2":"548","3":"100"},{"1":"100","2":"548","3":"100"},{"1":"10","2":"549","3":"100"},{"1":"20","2":"549","3":"100"},{"1":"40","2":"549","3":"100"},{"1":"100","2":"549","3":"100"},{"1":"10","2":"550","3":"100"},{"1":"20","2":"550","3":"100"},{"1":"40","2":"550","3":"100"},{"1":"100","2":"550","3":"100"},{"1":"10","2":"551","3":"100"},{"1":"20","2":"551","3":"100"},{"1":"40","2":"551","3":"100"},{"1":"100","2":"551","3":"100"},{"1":"10","2":"552","3":"100"},{"1":"20","2":"552","3":"100"},{"1":"40","2":"552","3":"100"},{"1":"100","2":"552","3":"100"},{"1":"10","2":"553","3":"100"},{"1":"20","2":"553","3":"100"},{"1":"40","2":"553","3":"100"},{"1":"100","2":"553","3":"100"},{"1":"10","2":"554","3":"100"},{"1":"20","2":"554","3":"100"},{"1":"40","2":"554","3":"100"},{"1":"100","2":"554","3":"100"},{"1":"10","2":"555","3":"100"},{"1":"20","2":"555","3":"100"},{"1":"40","2":"555","3":"100"},{"1":"100","2":"555","3":"100"},{"1":"10","2":"556","3":"100"},{"1":"20","2":"556","3":"100"},{"1":"40","2":"556","3":"100"},{"1":"100","2":"556","3":"100"},{"1":"10","2":"557","3":"100"},{"1":"20","2":"557","3":"100"},{"1":"40","2":"557","3":"100"},{"1":"100","2":"557","3":"100"},{"1":"10","2":"558","3":"100"},{"1":"20","2":"558","3":"100"},{"1":"40","2":"558","3":"100"},{"1":"100","2":"558","3":"100"},{"1":"10","2":"559","3":"100"},{"1":"20","2":"559","3":"100"},{"1":"40","2":"559","3":"100"},{"1":"100","2":"559","3":"100"},{"1":"10","2":"560","3":"100"},{"1":"20","2":"560","3":"100"},{"1":"40","2":"560","3":"100"},{"1":"100","2":"560","3":"100"},{"1":"10","2":"561","3":"100"},{"1":"20","2":"561","3":"100"},{"1":"40","2":"561","3":"100"},{"1":"100","2":"561","3":"100"},{"1":"10","2":"562","3":"100"},{"1":"20","2":"562","3":"100"},{"1":"40","2":"562","3":"100"},{"1":"100","2":"562","3":"100"},{"1":"10","2":"563","3":"100"},{"1":"20","2":"563","3":"100"},{"1":"40","2":"563","3":"100"},{"1":"100","2":"563","3":"100"},{"1":"10","2":"564","3":"100"},{"1":"20","2":"564","3":"100"},{"1":"40","2":"564","3":"100"},{"1":"100","2":"564","3":"100"},{"1":"10","2":"565","3":"100"},{"1":"20","2":"565","3":"100"},{"1":"40","2":"565","3":"100"},{"1":"100","2":"565","3":"100"},{"1":"10","2":"566","3":"100"},{"1":"20","2":"566","3":"100"},{"1":"40","2":"566","3":"100"},{"1":"100","2":"566","3":"100"},{"1":"10","2":"567","3":"100"},{"1":"20","2":"567","3":"100"},{"1":"40","2":"567","3":"100"},{"1":"100","2":"567","3":"100"},{"1":"10","2":"568","3":"100"},{"1":"20","2":"568","3":"100"},{"1":"40","2":"568","3":"100"},{"1":"100","2":"568","3":"100"},{"1":"10","2":"569","3":"100"},{"1":"20","2":"569","3":"100"},{"1":"40","2":"569","3":"100"},{"1":"100","2":"569","3":"100"},{"1":"10","2":"570","3":"100"},{"1":"20","2":"570","3":"100"},{"1":"40","2":"570","3":"100"},{"1":"100","2":"570","3":"100"},{"1":"10","2":"571","3":"100"},{"1":"20","2":"571","3":"100"},{"1":"40","2":"571","3":"100"},{"1":"100","2":"571","3":"100"},{"1":"10","2":"572","3":"100"},{"1":"20","2":"572","3":"100"},{"1":"40","2":"572","3":"100"},{"1":"100","2":"572","3":"100"},{"1":"10","2":"573","3":"100"},{"1":"20","2":"573","3":"100"},{"1":"40","2":"573","3":"100"},{"1":"100","2":"573","3":"100"},{"1":"10","2":"574","3":"100"},{"1":"20","2":"574","3":"100"},{"1":"40","2":"574","3":"100"},{"1":"100","2":"574","3":"100"},{"1":"10","2":"575","3":"100"},{"1":"20","2":"575","3":"100"},{"1":"40","2":"575","3":"100"},{"1":"100","2":"575","3":"100"},{"1":"10","2":"576","3":"100"},{"1":"20","2":"576","3":"100"},{"1":"40","2":"576","3":"100"},{"1":"100","2":"576","3":"100"},{"1":"10","2":"577","3":"100"},{"1":"20","2":"577","3":"100"},{"1":"40","2":"577","3":"100"},{"1":"100","2":"577","3":"100"},{"1":"10","2":"578","3":"100"},{"1":"20","2":"578","3":"100"},{"1":"40","2":"578","3":"100"},{"1":"100","2":"578","3":"100"},{"1":"10","2":"579","3":"100"},{"1":"20","2":"579","3":"100"},{"1":"40","2":"579","3":"100"},{"1":"100","2":"579","3":"100"},{"1":"10","2":"580","3":"100"},{"1":"20","2":"580","3":"100"},{"1":"40","2":"580","3":"100"},{"1":"100","2":"580","3":"100"},{"1":"10","2":"581","3":"100"},{"1":"20","2":"581","3":"100"},{"1":"40","2":"581","3":"100"},{"1":"100","2":"581","3":"100"},{"1":"10","2":"582","3":"100"},{"1":"20","2":"582","3":"100"},{"1":"40","2":"582","3":"100"},{"1":"100","2":"582","3":"100"},{"1":"10","2":"583","3":"100"},{"1":"20","2":"583","3":"100"},{"1":"40","2":"583","3":"100"},{"1":"100","2":"583","3":"100"},{"1":"10","2":"584","3":"100"},{"1":"20","2":"584","3":"100"},{"1":"40","2":"584","3":"100"},{"1":"100","2":"584","3":"100"},{"1":"10","2":"585","3":"100"},{"1":"20","2":"585","3":"100"},{"1":"40","2":"585","3":"100"},{"1":"100","2":"585","3":"100"},{"1":"10","2":"586","3":"100"},{"1":"20","2":"586","3":"100"},{"1":"40","2":"586","3":"100"},{"1":"100","2":"586","3":"100"},{"1":"10","2":"587","3":"100"},{"1":"20","2":"587","3":"100"},{"1":"40","2":"587","3":"100"},{"1":"100","2":"587","3":"100"},{"1":"10","2":"588","3":"100"},{"1":"20","2":"588","3":"100"},{"1":"40","2":"588","3":"100"},{"1":"100","2":"588","3":"100"},{"1":"10","2":"589","3":"100"},{"1":"20","2":"589","3":"100"},{"1":"40","2":"589","3":"100"},{"1":"100","2":"589","3":"100"},{"1":"10","2":"590","3":"100"},{"1":"20","2":"590","3":"100"},{"1":"40","2":"590","3":"100"},{"1":"100","2":"590","3":"100"},{"1":"10","2":"591","3":"100"},{"1":"20","2":"591","3":"100"},{"1":"40","2":"591","3":"100"},{"1":"100","2":"591","3":"100"},{"1":"10","2":"592","3":"100"},{"1":"20","2":"592","3":"100"},{"1":"40","2":"592","3":"100"},{"1":"100","2":"592","3":"100"},{"1":"10","2":"593","3":"100"},{"1":"20","2":"593","3":"100"},{"1":"40","2":"593","3":"100"},{"1":"100","2":"593","3":"100"},{"1":"10","2":"594","3":"100"},{"1":"20","2":"594","3":"100"},{"1":"40","2":"594","3":"100"},{"1":"100","2":"594","3":"100"},{"1":"10","2":"595","3":"100"},{"1":"20","2":"595","3":"100"},{"1":"40","2":"595","3":"100"},{"1":"100","2":"595","3":"100"},{"1":"10","2":"596","3":"100"},{"1":"20","2":"596","3":"100"},{"1":"40","2":"596","3":"100"},{"1":"100","2":"596","3":"100"},{"1":"10","2":"597","3":"100"},{"1":"20","2":"597","3":"100"},{"1":"40","2":"597","3":"100"},{"1":"100","2":"597","3":"100"},{"1":"10","2":"598","3":"100"},{"1":"20","2":"598","3":"100"},{"1":"40","2":"598","3":"100"},{"1":"100","2":"598","3":"100"},{"1":"10","2":"599","3":"100"},{"1":"20","2":"599","3":"100"},{"1":"40","2":"599","3":"100"},{"1":"100","2":"599","3":"100"},{"1":"10","2":"600","3":"100"},{"1":"20","2":"600","3":"100"},{"1":"40","2":"600","3":"100"},{"1":"100","2":"600","3":"100"},{"1":"10","2":"601","3":"100"},{"1":"20","2":"601","3":"100"},{"1":"40","2":"601","3":"100"},{"1":"100","2":"601","3":"100"},{"1":"10","2":"602","3":"100"},{"1":"20","2":"602","3":"100"},{"1":"40","2":"602","3":"100"},{"1":"100","2":"602","3":"100"},{"1":"10","2":"603","3":"100"},{"1":"20","2":"603","3":"100"},{"1":"40","2":"603","3":"100"},{"1":"100","2":"603","3":"100"},{"1":"10","2":"604","3":"100"},{"1":"20","2":"604","3":"100"},{"1":"40","2":"604","3":"100"},{"1":"100","2":"604","3":"100"},{"1":"10","2":"605","3":"100"},{"1":"20","2":"605","3":"100"},{"1":"40","2":"605","3":"100"},{"1":"100","2":"605","3":"100"},{"1":"10","2":"606","3":"100"},{"1":"20","2":"606","3":"100"},{"1":"40","2":"606","3":"100"},{"1":"100","2":"606","3":"100"},{"1":"10","2":"607","3":"100"},{"1":"20","2":"607","3":"100"},{"1":"40","2":"607","3":"100"},{"1":"100","2":"607","3":"100"},{"1":"10","2":"608","3":"100"},{"1":"20","2":"608","3":"100"},{"1":"40","2":"608","3":"100"},{"1":"100","2":"608","3":"100"},{"1":"10","2":"609","3":"100"},{"1":"20","2":"609","3":"100"},{"1":"40","2":"609","3":"100"},{"1":"100","2":"609","3":"100"},{"1":"10","2":"610","3":"100"},{"1":"20","2":"610","3":"100"},{"1":"40","2":"610","3":"100"},{"1":"100","2":"610","3":"100"},{"1":"10","2":"611","3":"100"},{"1":"20","2":"611","3":"100"},{"1":"40","2":"611","3":"100"},{"1":"100","2":"611","3":"100"},{"1":"10","2":"612","3":"100"},{"1":"20","2":"612","3":"100"},{"1":"40","2":"612","3":"100"},{"1":"100","2":"612","3":"100"},{"1":"10","2":"613","3":"100"},{"1":"20","2":"613","3":"100"},{"1":"40","2":"613","3":"100"},{"1":"100","2":"613","3":"100"},{"1":"10","2":"614","3":"100"},{"1":"20","2":"614","3":"100"},{"1":"40","2":"614","3":"100"},{"1":"100","2":"614","3":"100"},{"1":"10","2":"615","3":"100"},{"1":"20","2":"615","3":"100"},{"1":"40","2":"615","3":"100"},{"1":"100","2":"615","3":"100"},{"1":"10","2":"616","3":"100"},{"1":"20","2":"616","3":"100"},{"1":"40","2":"616","3":"100"},{"1":"100","2":"616","3":"100"},{"1":"10","2":"617","3":"100"},{"1":"20","2":"617","3":"100"},{"1":"40","2":"617","3":"100"},{"1":"100","2":"617","3":"100"},{"1":"10","2":"618","3":"100"},{"1":"20","2":"618","3":"100"},{"1":"40","2":"618","3":"100"},{"1":"100","2":"618","3":"100"},{"1":"10","2":"619","3":"100"},{"1":"20","2":"619","3":"100"},{"1":"40","2":"619","3":"100"},{"1":"100","2":"619","3":"100"},{"1":"10","2":"620","3":"100"},{"1":"20","2":"620","3":"100"},{"1":"40","2":"620","3":"100"},{"1":"100","2":"620","3":"100"},{"1":"10","2":"621","3":"100"},{"1":"20","2":"621","3":"100"},{"1":"40","2":"621","3":"100"},{"1":"100","2":"621","3":"100"},{"1":"10","2":"622","3":"100"},{"1":"20","2":"622","3":"100"},{"1":"40","2":"622","3":"100"},{"1":"100","2":"622","3":"100"},{"1":"10","2":"623","3":"100"},{"1":"20","2":"623","3":"100"},{"1":"40","2":"623","3":"100"},{"1":"100","2":"623","3":"100"},{"1":"10","2":"624","3":"100"},{"1":"20","2":"624","3":"100"},{"1":"40","2":"624","3":"100"},{"1":"100","2":"624","3":"100"},{"1":"10","2":"625","3":"100"},{"1":"20","2":"625","3":"100"},{"1":"40","2":"625","3":"100"},{"1":"100","2":"625","3":"100"},{"1":"10","2":"626","3":"100"},{"1":"20","2":"626","3":"100"},{"1":"40","2":"626","3":"100"},{"1":"100","2":"626","3":"100"},{"1":"10","2":"627","3":"100"},{"1":"20","2":"627","3":"100"},{"1":"40","2":"627","3":"100"},{"1":"100","2":"627","3":"100"},{"1":"10","2":"628","3":"100"},{"1":"20","2":"628","3":"100"},{"1":"40","2":"628","3":"100"},{"1":"100","2":"628","3":"100"},{"1":"10","2":"629","3":"100"},{"1":"20","2":"629","3":"100"},{"1":"40","2":"629","3":"100"},{"1":"100","2":"629","3":"100"},{"1":"10","2":"630","3":"100"},{"1":"20","2":"630","3":"100"},{"1":"40","2":"630","3":"100"},{"1":"100","2":"630","3":"100"},{"1":"10","2":"631","3":"100"},{"1":"20","2":"631","3":"100"},{"1":"40","2":"631","3":"100"},{"1":"100","2":"631","3":"100"},{"1":"10","2":"632","3":"100"},{"1":"20","2":"632","3":"100"},{"1":"40","2":"632","3":"100"},{"1":"100","2":"632","3":"100"},{"1":"10","2":"633","3":"100"},{"1":"20","2":"633","3":"100"},{"1":"40","2":"633","3":"100"},{"1":"100","2":"633","3":"100"},{"1":"10","2":"634","3":"100"},{"1":"20","2":"634","3":"100"},{"1":"40","2":"634","3":"100"},{"1":"100","2":"634","3":"100"},{"1":"10","2":"635","3":"100"},{"1":"20","2":"635","3":"100"},{"1":"40","2":"635","3":"100"},{"1":"100","2":"635","3":"100"},{"1":"10","2":"636","3":"100"},{"1":"20","2":"636","3":"100"},{"1":"40","2":"636","3":"100"},{"1":"100","2":"636","3":"100"},{"1":"10","2":"637","3":"100"},{"1":"20","2":"637","3":"100"},{"1":"40","2":"637","3":"100"},{"1":"100","2":"637","3":"100"},{"1":"10","2":"638","3":"100"},{"1":"20","2":"638","3":"100"},{"1":"40","2":"638","3":"100"},{"1":"100","2":"638","3":"100"},{"1":"10","2":"639","3":"100"},{"1":"20","2":"639","3":"100"},{"1":"40","2":"639","3":"100"},{"1":"100","2":"639","3":"100"},{"1":"10","2":"640","3":"100"},{"1":"20","2":"640","3":"100"},{"1":"40","2":"640","3":"100"},{"1":"100","2":"640","3":"100"},{"1":"10","2":"641","3":"100"},{"1":"20","2":"641","3":"100"},{"1":"40","2":"641","3":"100"},{"1":"100","2":"641","3":"100"},{"1":"10","2":"642","3":"100"},{"1":"20","2":"642","3":"100"},{"1":"40","2":"642","3":"100"},{"1":"100","2":"642","3":"100"},{"1":"10","2":"643","3":"100"},{"1":"20","2":"643","3":"100"},{"1":"40","2":"643","3":"100"},{"1":"100","2":"643","3":"100"},{"1":"10","2":"644","3":"100"},{"1":"20","2":"644","3":"100"},{"1":"40","2":"644","3":"100"},{"1":"100","2":"644","3":"100"},{"1":"10","2":"645","3":"100"},{"1":"20","2":"645","3":"100"},{"1":"40","2":"645","3":"100"},{"1":"100","2":"645","3":"100"},{"1":"10","2":"646","3":"100"},{"1":"20","2":"646","3":"100"},{"1":"40","2":"646","3":"100"},{"1":"100","2":"646","3":"100"},{"1":"10","2":"647","3":"100"},{"1":"20","2":"647","3":"100"},{"1":"40","2":"647","3":"100"},{"1":"100","2":"647","3":"100"},{"1":"10","2":"648","3":"100"},{"1":"20","2":"648","3":"100"},{"1":"40","2":"648","3":"100"},{"1":"100","2":"648","3":"100"},{"1":"10","2":"649","3":"100"},{"1":"20","2":"649","3":"100"},{"1":"40","2":"649","3":"100"},{"1":"100","2":"649","3":"100"},{"1":"10","2":"650","3":"100"},{"1":"20","2":"650","3":"100"},{"1":"40","2":"650","3":"100"},{"1":"100","2":"650","3":"100"},{"1":"10","2":"651","3":"100"},{"1":"20","2":"651","3":"100"},{"1":"40","2":"651","3":"100"},{"1":"100","2":"651","3":"100"},{"1":"10","2":"652","3":"100"},{"1":"20","2":"652","3":"100"},{"1":"40","2":"652","3":"100"},{"1":"100","2":"652","3":"100"},{"1":"10","2":"653","3":"100"},{"1":"20","2":"653","3":"100"},{"1":"40","2":"653","3":"100"},{"1":"100","2":"653","3":"100"},{"1":"10","2":"654","3":"100"},{"1":"20","2":"654","3":"100"},{"1":"40","2":"654","3":"100"},{"1":"100","2":"654","3":"100"},{"1":"10","2":"655","3":"100"},{"1":"20","2":"655","3":"100"},{"1":"40","2":"655","3":"100"},{"1":"100","2":"655","3":"100"},{"1":"10","2":"656","3":"100"},{"1":"20","2":"656","3":"100"},{"1":"40","2":"656","3":"100"},{"1":"100","2":"656","3":"100"},{"1":"10","2":"657","3":"100"},{"1":"20","2":"657","3":"100"},{"1":"40","2":"657","3":"100"},{"1":"100","2":"657","3":"100"},{"1":"10","2":"658","3":"100"},{"1":"20","2":"658","3":"100"},{"1":"40","2":"658","3":"100"},{"1":"100","2":"658","3":"100"},{"1":"10","2":"659","3":"100"},{"1":"20","2":"659","3":"100"},{"1":"40","2":"659","3":"100"},{"1":"100","2":"659","3":"100"},{"1":"10","2":"660","3":"100"},{"1":"20","2":"660","3":"100"},{"1":"40","2":"660","3":"100"},{"1":"100","2":"660","3":"100"},{"1":"10","2":"661","3":"100"},{"1":"20","2":"661","3":"100"},{"1":"40","2":"661","3":"100"},{"1":"100","2":"661","3":"100"},{"1":"10","2":"662","3":"100"},{"1":"20","2":"662","3":"100"},{"1":"40","2":"662","3":"100"},{"1":"100","2":"662","3":"100"},{"1":"10","2":"663","3":"100"},{"1":"20","2":"663","3":"100"},{"1":"40","2":"663","3":"100"},{"1":"100","2":"663","3":"100"},{"1":"10","2":"664","3":"100"},{"1":"20","2":"664","3":"100"},{"1":"40","2":"664","3":"100"},{"1":"100","2":"664","3":"100"},{"1":"10","2":"665","3":"100"},{"1":"20","2":"665","3":"100"},{"1":"40","2":"665","3":"100"},{"1":"100","2":"665","3":"100"},{"1":"10","2":"666","3":"100"},{"1":"20","2":"666","3":"100"},{"1":"40","2":"666","3":"100"},{"1":"100","2":"666","3":"100"},{"1":"10","2":"667","3":"100"},{"1":"20","2":"667","3":"100"},{"1":"40","2":"667","3":"100"},{"1":"100","2":"667","3":"100"},{"1":"10","2":"668","3":"100"},{"1":"20","2":"668","3":"100"},{"1":"40","2":"668","3":"100"},{"1":"100","2":"668","3":"100"},{"1":"10","2":"669","3":"100"},{"1":"20","2":"669","3":"100"},{"1":"40","2":"669","3":"100"},{"1":"100","2":"669","3":"100"},{"1":"10","2":"670","3":"100"},{"1":"20","2":"670","3":"100"},{"1":"40","2":"670","3":"100"},{"1":"100","2":"670","3":"100"},{"1":"10","2":"671","3":"100"},{"1":"20","2":"671","3":"100"},{"1":"40","2":"671","3":"100"},{"1":"100","2":"671","3":"100"},{"1":"10","2":"672","3":"100"},{"1":"20","2":"672","3":"100"},{"1":"40","2":"672","3":"100"},{"1":"100","2":"672","3":"100"},{"1":"10","2":"673","3":"100"},{"1":"20","2":"673","3":"100"},{"1":"40","2":"673","3":"100"},{"1":"100","2":"673","3":"100"},{"1":"10","2":"674","3":"100"},{"1":"20","2":"674","3":"100"},{"1":"40","2":"674","3":"100"},{"1":"100","2":"674","3":"100"},{"1":"10","2":"675","3":"100"},{"1":"20","2":"675","3":"100"},{"1":"40","2":"675","3":"100"},{"1":"100","2":"675","3":"100"},{"1":"10","2":"676","3":"100"},{"1":"20","2":"676","3":"100"},{"1":"40","2":"676","3":"100"},{"1":"100","2":"676","3":"100"},{"1":"10","2":"677","3":"100"},{"1":"20","2":"677","3":"100"},{"1":"40","2":"677","3":"100"},{"1":"100","2":"677","3":"100"},{"1":"10","2":"678","3":"100"},{"1":"20","2":"678","3":"100"},{"1":"40","2":"678","3":"100"},{"1":"100","2":"678","3":"100"},{"1":"10","2":"679","3":"100"},{"1":"20","2":"679","3":"100"},{"1":"40","2":"679","3":"100"},{"1":"100","2":"679","3":"100"},{"1":"10","2":"680","3":"100"},{"1":"20","2":"680","3":"100"},{"1":"40","2":"680","3":"100"},{"1":"100","2":"680","3":"100"},{"1":"10","2":"681","3":"100"},{"1":"20","2":"681","3":"100"},{"1":"40","2":"681","3":"100"},{"1":"100","2":"681","3":"100"},{"1":"10","2":"682","3":"100"},{"1":"20","2":"682","3":"100"},{"1":"40","2":"682","3":"100"},{"1":"100","2":"682","3":"100"},{"1":"10","2":"683","3":"100"},{"1":"20","2":"683","3":"100"},{"1":"40","2":"683","3":"100"},{"1":"100","2":"683","3":"100"},{"1":"10","2":"684","3":"100"},{"1":"20","2":"684","3":"100"},{"1":"40","2":"684","3":"100"},{"1":"100","2":"684","3":"100"},{"1":"10","2":"685","3":"100"},{"1":"20","2":"685","3":"100"},{"1":"40","2":"685","3":"100"},{"1":"100","2":"685","3":"100"},{"1":"10","2":"686","3":"100"},{"1":"20","2":"686","3":"100"},{"1":"40","2":"686","3":"100"},{"1":"100","2":"686","3":"100"},{"1":"10","2":"687","3":"100"},{"1":"20","2":"687","3":"100"},{"1":"40","2":"687","3":"100"},{"1":"100","2":"687","3":"100"},{"1":"10","2":"688","3":"100"},{"1":"20","2":"688","3":"100"},{"1":"40","2":"688","3":"100"},{"1":"100","2":"688","3":"100"},{"1":"10","2":"689","3":"100"},{"1":"20","2":"689","3":"100"},{"1":"40","2":"689","3":"100"},{"1":"100","2":"689","3":"100"},{"1":"10","2":"690","3":"100"},{"1":"20","2":"690","3":"100"},{"1":"40","2":"690","3":"100"},{"1":"100","2":"690","3":"100"},{"1":"10","2":"691","3":"100"},{"1":"20","2":"691","3":"100"},{"1":"40","2":"691","3":"100"},{"1":"100","2":"691","3":"100"},{"1":"10","2":"692","3":"100"},{"1":"20","2":"692","3":"100"},{"1":"40","2":"692","3":"100"},{"1":"100","2":"692","3":"100"},{"1":"10","2":"693","3":"100"},{"1":"20","2":"693","3":"100"},{"1":"40","2":"693","3":"100"},{"1":"100","2":"693","3":"100"},{"1":"10","2":"694","3":"100"},{"1":"20","2":"694","3":"100"},{"1":"40","2":"694","3":"100"},{"1":"100","2":"694","3":"100"},{"1":"10","2":"695","3":"100"},{"1":"20","2":"695","3":"100"},{"1":"40","2":"695","3":"100"},{"1":"100","2":"695","3":"100"},{"1":"10","2":"696","3":"100"},{"1":"20","2":"696","3":"100"},{"1":"40","2":"696","3":"100"},{"1":"100","2":"696","3":"100"},{"1":"10","2":"697","3":"100"},{"1":"20","2":"697","3":"100"},{"1":"40","2":"697","3":"100"},{"1":"100","2":"697","3":"100"},{"1":"10","2":"698","3":"100"},{"1":"20","2":"698","3":"100"},{"1":"40","2":"698","3":"100"},{"1":"100","2":"698","3":"100"},{"1":"10","2":"699","3":"100"},{"1":"20","2":"699","3":"100"},{"1":"40","2":"699","3":"100"},{"1":"100","2":"699","3":"100"},{"1":"10","2":"700","3":"100"},{"1":"20","2":"700","3":"100"},{"1":"40","2":"700","3":"100"},{"1":"100","2":"700","3":"100"},{"1":"10","2":"701","3":"100"},{"1":"20","2":"701","3":"100"},{"1":"40","2":"701","3":"100"},{"1":"100","2":"701","3":"100"},{"1":"10","2":"702","3":"100"},{"1":"20","2":"702","3":"100"},{"1":"40","2":"702","3":"100"},{"1":"100","2":"702","3":"100"},{"1":"10","2":"703","3":"100"},{"1":"20","2":"703","3":"100"},{"1":"40","2":"703","3":"100"},{"1":"100","2":"703","3":"100"},{"1":"10","2":"704","3":"100"},{"1":"20","2":"704","3":"100"},{"1":"40","2":"704","3":"100"},{"1":"100","2":"704","3":"100"},{"1":"10","2":"705","3":"100"},{"1":"20","2":"705","3":"100"},{"1":"40","2":"705","3":"100"},{"1":"100","2":"705","3":"100"},{"1":"10","2":"706","3":"100"},{"1":"20","2":"706","3":"100"},{"1":"40","2":"706","3":"100"},{"1":"100","2":"706","3":"100"},{"1":"10","2":"707","3":"100"},{"1":"20","2":"707","3":"100"},{"1":"40","2":"707","3":"100"},{"1":"100","2":"707","3":"100"},{"1":"10","2":"708","3":"100"},{"1":"20","2":"708","3":"100"},{"1":"40","2":"708","3":"100"},{"1":"100","2":"708","3":"100"},{"1":"10","2":"709","3":"100"},{"1":"20","2":"709","3":"100"},{"1":"40","2":"709","3":"100"},{"1":"100","2":"709","3":"100"},{"1":"10","2":"710","3":"100"},{"1":"20","2":"710","3":"100"},{"1":"40","2":"710","3":"100"},{"1":"100","2":"710","3":"100"},{"1":"10","2":"711","3":"100"},{"1":"20","2":"711","3":"100"},{"1":"40","2":"711","3":"100"},{"1":"100","2":"711","3":"100"},{"1":"10","2":"712","3":"100"},{"1":"20","2":"712","3":"100"},{"1":"40","2":"712","3":"100"},{"1":"100","2":"712","3":"100"},{"1":"10","2":"713","3":"100"},{"1":"20","2":"713","3":"100"},{"1":"40","2":"713","3":"100"},{"1":"100","2":"713","3":"100"},{"1":"10","2":"714","3":"100"},{"1":"20","2":"714","3":"100"},{"1":"40","2":"714","3":"100"},{"1":"100","2":"714","3":"100"},{"1":"10","2":"715","3":"100"},{"1":"20","2":"715","3":"100"},{"1":"40","2":"715","3":"100"},{"1":"100","2":"715","3":"100"},{"1":"10","2":"716","3":"100"},{"1":"20","2":"716","3":"100"},{"1":"40","2":"716","3":"100"},{"1":"100","2":"716","3":"100"},{"1":"10","2":"717","3":"100"},{"1":"20","2":"717","3":"100"},{"1":"40","2":"717","3":"100"},{"1":"100","2":"717","3":"100"},{"1":"10","2":"718","3":"100"},{"1":"20","2":"718","3":"100"},{"1":"40","2":"718","3":"100"},{"1":"100","2":"718","3":"100"},{"1":"10","2":"719","3":"100"},{"1":"20","2":"719","3":"100"},{"1":"40","2":"719","3":"100"},{"1":"100","2":"719","3":"100"},{"1":"10","2":"720","3":"100"},{"1":"20","2":"720","3":"100"},{"1":"40","2":"720","3":"100"},{"1":"100","2":"720","3":"100"},{"1":"10","2":"721","3":"100"},{"1":"20","2":"721","3":"100"},{"1":"40","2":"721","3":"100"},{"1":"100","2":"721","3":"100"},{"1":"10","2":"722","3":"100"},{"1":"20","2":"722","3":"100"},{"1":"40","2":"722","3":"100"},{"1":"100","2":"722","3":"100"},{"1":"10","2":"723","3":"100"},{"1":"20","2":"723","3":"100"},{"1":"40","2":"723","3":"100"},{"1":"100","2":"723","3":"100"},{"1":"10","2":"724","3":"100"},{"1":"20","2":"724","3":"100"},{"1":"40","2":"724","3":"100"},{"1":"100","2":"724","3":"100"},{"1":"10","2":"725","3":"100"},{"1":"20","2":"725","3":"100"},{"1":"40","2":"725","3":"100"},{"1":"100","2":"725","3":"100"},{"1":"10","2":"726","3":"100"},{"1":"20","2":"726","3":"100"},{"1":"40","2":"726","3":"100"},{"1":"100","2":"726","3":"100"},{"1":"10","2":"727","3":"100"},{"1":"20","2":"727","3":"100"},{"1":"40","2":"727","3":"100"},{"1":"100","2":"727","3":"100"},{"1":"10","2":"728","3":"100"},{"1":"20","2":"728","3":"100"},{"1":"40","2":"728","3":"100"},{"1":"100","2":"728","3":"100"},{"1":"10","2":"729","3":"100"},{"1":"20","2":"729","3":"100"},{"1":"40","2":"729","3":"100"},{"1":"100","2":"729","3":"100"},{"1":"10","2":"730","3":"100"},{"1":"20","2":"730","3":"100"},{"1":"40","2":"730","3":"100"},{"1":"100","2":"730","3":"100"},{"1":"10","2":"731","3":"100"},{"1":"20","2":"731","3":"100"},{"1":"40","2":"731","3":"100"},{"1":"100","2":"731","3":"100"},{"1":"10","2":"732","3":"100"},{"1":"20","2":"732","3":"100"},{"1":"40","2":"732","3":"100"},{"1":"100","2":"732","3":"100"},{"1":"10","2":"733","3":"100"},{"1":"20","2":"733","3":"100"},{"1":"40","2":"733","3":"100"},{"1":"100","2":"733","3":"100"},{"1":"10","2":"734","3":"100"},{"1":"20","2":"734","3":"100"},{"1":"40","2":"734","3":"100"},{"1":"100","2":"734","3":"100"},{"1":"10","2":"735","3":"100"},{"1":"20","2":"735","3":"100"},{"1":"40","2":"735","3":"100"},{"1":"100","2":"735","3":"100"},{"1":"10","2":"736","3":"100"},{"1":"20","2":"736","3":"100"},{"1":"40","2":"736","3":"100"},{"1":"100","2":"736","3":"100"},{"1":"10","2":"737","3":"100"},{"1":"20","2":"737","3":"100"},{"1":"40","2":"737","3":"100"},{"1":"100","2":"737","3":"100"},{"1":"10","2":"738","3":"100"},{"1":"20","2":"738","3":"100"},{"1":"40","2":"738","3":"100"},{"1":"100","2":"738","3":"100"},{"1":"10","2":"739","3":"100"},{"1":"20","2":"739","3":"100"},{"1":"40","2":"739","3":"100"},{"1":"100","2":"739","3":"100"},{"1":"10","2":"740","3":"100"},{"1":"20","2":"740","3":"100"},{"1":"40","2":"740","3":"100"},{"1":"100","2":"740","3":"100"},{"1":"10","2":"741","3":"100"},{"1":"20","2":"741","3":"100"},{"1":"40","2":"741","3":"100"},{"1":"100","2":"741","3":"100"},{"1":"10","2":"742","3":"100"},{"1":"20","2":"742","3":"100"},{"1":"40","2":"742","3":"100"},{"1":"100","2":"742","3":"100"},{"1":"10","2":"743","3":"100"},{"1":"20","2":"743","3":"100"},{"1":"40","2":"743","3":"100"},{"1":"100","2":"743","3":"100"},{"1":"10","2":"744","3":"100"},{"1":"20","2":"744","3":"100"},{"1":"40","2":"744","3":"100"},{"1":"100","2":"744","3":"100"},{"1":"10","2":"745","3":"100"},{"1":"20","2":"745","3":"100"},{"1":"40","2":"745","3":"100"},{"1":"100","2":"745","3":"100"},{"1":"10","2":"746","3":"100"},{"1":"20","2":"746","3":"100"},{"1":"40","2":"746","3":"100"},{"1":"100","2":"746","3":"100"},{"1":"10","2":"747","3":"100"},{"1":"20","2":"747","3":"100"},{"1":"40","2":"747","3":"100"},{"1":"100","2":"747","3":"100"},{"1":"10","2":"748","3":"100"},{"1":"20","2":"748","3":"100"},{"1":"40","2":"748","3":"100"},{"1":"100","2":"748","3":"100"},{"1":"10","2":"749","3":"100"},{"1":"20","2":"749","3":"100"},{"1":"40","2":"749","3":"100"},{"1":"100","2":"749","3":"100"},{"1":"10","2":"750","3":"100"},{"1":"20","2":"750","3":"100"},{"1":"40","2":"750","3":"100"},{"1":"100","2":"750","3":"100"},{"1":"10","2":"751","3":"100"},{"1":"20","2":"751","3":"100"},{"1":"40","2":"751","3":"100"},{"1":"100","2":"751","3":"100"},{"1":"10","2":"752","3":"100"},{"1":"20","2":"752","3":"100"},{"1":"40","2":"752","3":"100"},{"1":"100","2":"752","3":"100"},{"1":"10","2":"753","3":"100"},{"1":"20","2":"753","3":"100"},{"1":"40","2":"753","3":"100"},{"1":"100","2":"753","3":"100"},{"1":"10","2":"754","3":"100"},{"1":"20","2":"754","3":"100"},{"1":"40","2":"754","3":"100"},{"1":"100","2":"754","3":"100"},{"1":"10","2":"755","3":"100"},{"1":"20","2":"755","3":"100"},{"1":"40","2":"755","3":"100"},{"1":"100","2":"755","3":"100"},{"1":"10","2":"756","3":"100"},{"1":"20","2":"756","3":"100"},{"1":"40","2":"756","3":"100"},{"1":"100","2":"756","3":"100"},{"1":"10","2":"757","3":"100"},{"1":"20","2":"757","3":"100"},{"1":"40","2":"757","3":"100"},{"1":"100","2":"757","3":"100"},{"1":"10","2":"758","3":"100"},{"1":"20","2":"758","3":"100"},{"1":"40","2":"758","3":"100"},{"1":"100","2":"758","3":"100"},{"1":"10","2":"759","3":"100"},{"1":"20","2":"759","3":"100"},{"1":"40","2":"759","3":"100"},{"1":"100","2":"759","3":"100"},{"1":"10","2":"760","3":"100"},{"1":"20","2":"760","3":"100"},{"1":"40","2":"760","3":"100"},{"1":"100","2":"760","3":"100"},{"1":"10","2":"761","3":"100"},{"1":"20","2":"761","3":"100"},{"1":"40","2":"761","3":"100"},{"1":"100","2":"761","3":"100"},{"1":"10","2":"762","3":"100"},{"1":"20","2":"762","3":"100"},{"1":"40","2":"762","3":"100"},{"1":"100","2":"762","3":"100"},{"1":"10","2":"763","3":"100"},{"1":"20","2":"763","3":"100"},{"1":"40","2":"763","3":"100"},{"1":"100","2":"763","3":"100"},{"1":"10","2":"764","3":"100"},{"1":"20","2":"764","3":"100"},{"1":"40","2":"764","3":"100"},{"1":"100","2":"764","3":"100"},{"1":"10","2":"765","3":"100"},{"1":"20","2":"765","3":"100"},{"1":"40","2":"765","3":"100"},{"1":"100","2":"765","3":"100"},{"1":"10","2":"766","3":"100"},{"1":"20","2":"766","3":"100"},{"1":"40","2":"766","3":"100"},{"1":"100","2":"766","3":"100"},{"1":"10","2":"767","3":"100"},{"1":"20","2":"767","3":"100"},{"1":"40","2":"767","3":"100"},{"1":"100","2":"767","3":"100"},{"1":"10","2":"768","3":"100"},{"1":"20","2":"768","3":"100"},{"1":"40","2":"768","3":"100"},{"1":"100","2":"768","3":"100"},{"1":"10","2":"769","3":"100"},{"1":"20","2":"769","3":"100"},{"1":"40","2":"769","3":"100"},{"1":"100","2":"769","3":"100"},{"1":"10","2":"770","3":"100"},{"1":"20","2":"770","3":"100"},{"1":"40","2":"770","3":"100"},{"1":"100","2":"770","3":"100"},{"1":"10","2":"771","3":"100"},{"1":"20","2":"771","3":"100"},{"1":"40","2":"771","3":"100"},{"1":"100","2":"771","3":"100"},{"1":"10","2":"772","3":"100"},{"1":"20","2":"772","3":"100"},{"1":"40","2":"772","3":"100"},{"1":"100","2":"772","3":"100"},{"1":"10","2":"773","3":"100"},{"1":"20","2":"773","3":"100"},{"1":"40","2":"773","3":"100"},{"1":"100","2":"773","3":"100"},{"1":"10","2":"774","3":"100"},{"1":"20","2":"774","3":"100"},{"1":"40","2":"774","3":"100"},{"1":"100","2":"774","3":"100"},{"1":"10","2":"775","3":"100"},{"1":"20","2":"775","3":"100"},{"1":"40","2":"775","3":"100"},{"1":"100","2":"775","3":"100"},{"1":"10","2":"776","3":"100"},{"1":"20","2":"776","3":"100"},{"1":"40","2":"776","3":"100"},{"1":"100","2":"776","3":"100"},{"1":"10","2":"777","3":"100"},{"1":"20","2":"777","3":"100"},{"1":"40","2":"777","3":"100"},{"1":"100","2":"777","3":"100"},{"1":"10","2":"778","3":"100"},{"1":"20","2":"778","3":"100"},{"1":"40","2":"778","3":"100"},{"1":"100","2":"778","3":"100"},{"1":"10","2":"779","3":"100"},{"1":"20","2":"779","3":"100"},{"1":"40","2":"779","3":"100"},{"1":"100","2":"779","3":"100"},{"1":"10","2":"780","3":"100"},{"1":"20","2":"780","3":"100"},{"1":"40","2":"780","3":"100"},{"1":"100","2":"780","3":"100"},{"1":"10","2":"781","3":"100"},{"1":"20","2":"781","3":"100"},{"1":"40","2":"781","3":"100"},{"1":"100","2":"781","3":"100"},{"1":"10","2":"782","3":"100"},{"1":"20","2":"782","3":"100"},{"1":"40","2":"782","3":"100"},{"1":"100","2":"782","3":"100"},{"1":"10","2":"783","3":"100"},{"1":"20","2":"783","3":"100"},{"1":"40","2":"783","3":"100"},{"1":"100","2":"783","3":"100"},{"1":"10","2":"784","3":"100"},{"1":"20","2":"784","3":"100"},{"1":"40","2":"784","3":"100"},{"1":"100","2":"784","3":"100"},{"1":"10","2":"785","3":"100"},{"1":"20","2":"785","3":"100"},{"1":"40","2":"785","3":"100"},{"1":"100","2":"785","3":"100"},{"1":"10","2":"786","3":"100"},{"1":"20","2":"786","3":"100"},{"1":"40","2":"786","3":"100"},{"1":"100","2":"786","3":"100"},{"1":"10","2":"787","3":"100"},{"1":"20","2":"787","3":"100"},{"1":"40","2":"787","3":"100"},{"1":"100","2":"787","3":"100"},{"1":"10","2":"788","3":"100"},{"1":"20","2":"788","3":"100"},{"1":"40","2":"788","3":"100"},{"1":"100","2":"788","3":"100"},{"1":"10","2":"789","3":"100"},{"1":"20","2":"789","3":"100"},{"1":"40","2":"789","3":"100"},{"1":"100","2":"789","3":"100"},{"1":"10","2":"790","3":"100"},{"1":"20","2":"790","3":"100"},{"1":"40","2":"790","3":"100"},{"1":"100","2":"790","3":"100"},{"1":"10","2":"791","3":"100"},{"1":"20","2":"791","3":"100"},{"1":"40","2":"791","3":"100"},{"1":"100","2":"791","3":"100"},{"1":"10","2":"792","3":"100"},{"1":"20","2":"792","3":"100"},{"1":"40","2":"792","3":"100"},{"1":"100","2":"792","3":"100"},{"1":"10","2":"793","3":"100"},{"1":"20","2":"793","3":"100"},{"1":"40","2":"793","3":"100"},{"1":"100","2":"793","3":"100"},{"1":"10","2":"794","3":"100"},{"1":"20","2":"794","3":"100"},{"1":"40","2":"794","3":"100"},{"1":"100","2":"794","3":"100"},{"1":"10","2":"795","3":"100"},{"1":"20","2":"795","3":"100"},{"1":"40","2":"795","3":"100"},{"1":"100","2":"795","3":"100"},{"1":"10","2":"796","3":"100"},{"1":"20","2":"796","3":"100"},{"1":"40","2":"796","3":"100"},{"1":"100","2":"796","3":"100"},{"1":"10","2":"797","3":"100"},{"1":"20","2":"797","3":"100"},{"1":"40","2":"797","3":"100"},{"1":"100","2":"797","3":"100"},{"1":"10","2":"798","3":"100"},{"1":"20","2":"798","3":"100"},{"1":"40","2":"798","3":"100"},{"1":"100","2":"798","3":"100"},{"1":"10","2":"799","3":"100"},{"1":"20","2":"799","3":"100"},{"1":"40","2":"799","3":"100"},{"1":"100","2":"799","3":"100"},{"1":"10","2":"800","3":"100"},{"1":"20","2":"800","3":"100"},{"1":"40","2":"800","3":"100"},{"1":"100","2":"800","3":"100"},{"1":"10","2":"801","3":"100"},{"1":"20","2":"801","3":"100"},{"1":"40","2":"801","3":"100"},{"1":"100","2":"801","3":"100"},{"1":"10","2":"802","3":"100"},{"1":"20","2":"802","3":"100"},{"1":"40","2":"802","3":"100"},{"1":"100","2":"802","3":"100"},{"1":"10","2":"803","3":"100"},{"1":"20","2":"803","3":"100"},{"1":"40","2":"803","3":"100"},{"1":"100","2":"803","3":"100"},{"1":"10","2":"804","3":"100"},{"1":"20","2":"804","3":"100"},{"1":"40","2":"804","3":"100"},{"1":"100","2":"804","3":"100"},{"1":"10","2":"805","3":"100"},{"1":"20","2":"805","3":"100"},{"1":"40","2":"805","3":"100"},{"1":"100","2":"805","3":"100"},{"1":"10","2":"806","3":"100"},{"1":"20","2":"806","3":"100"},{"1":"40","2":"806","3":"100"},{"1":"100","2":"806","3":"100"},{"1":"10","2":"807","3":"100"},{"1":"20","2":"807","3":"100"},{"1":"40","2":"807","3":"100"},{"1":"100","2":"807","3":"100"},{"1":"10","2":"808","3":"100"},{"1":"20","2":"808","3":"100"},{"1":"40","2":"808","3":"100"},{"1":"100","2":"808","3":"100"},{"1":"10","2":"809","3":"100"},{"1":"20","2":"809","3":"100"},{"1":"40","2":"809","3":"100"},{"1":"100","2":"809","3":"100"},{"1":"10","2":"810","3":"100"},{"1":"20","2":"810","3":"100"},{"1":"40","2":"810","3":"100"},{"1":"100","2":"810","3":"100"},{"1":"10","2":"811","3":"100"},{"1":"20","2":"811","3":"100"},{"1":"40","2":"811","3":"100"},{"1":"100","2":"811","3":"100"},{"1":"10","2":"812","3":"100"},{"1":"20","2":"812","3":"100"},{"1":"40","2":"812","3":"100"},{"1":"100","2":"812","3":"100"},{"1":"10","2":"813","3":"100"},{"1":"20","2":"813","3":"100"},{"1":"40","2":"813","3":"100"},{"1":"100","2":"813","3":"100"},{"1":"10","2":"814","3":"100"},{"1":"20","2":"814","3":"100"},{"1":"40","2":"814","3":"100"},{"1":"100","2":"814","3":"100"},{"1":"10","2":"815","3":"100"},{"1":"20","2":"815","3":"100"},{"1":"40","2":"815","3":"100"},{"1":"100","2":"815","3":"100"},{"1":"10","2":"816","3":"100"},{"1":"20","2":"816","3":"100"},{"1":"40","2":"816","3":"100"},{"1":"100","2":"816","3":"100"},{"1":"10","2":"817","3":"100"},{"1":"20","2":"817","3":"100"},{"1":"40","2":"817","3":"100"},{"1":"100","2":"817","3":"100"},{"1":"10","2":"818","3":"100"},{"1":"20","2":"818","3":"100"},{"1":"40","2":"818","3":"100"},{"1":"100","2":"818","3":"100"},{"1":"10","2":"819","3":"100"},{"1":"20","2":"819","3":"100"},{"1":"40","2":"819","3":"100"},{"1":"100","2":"819","3":"100"},{"1":"10","2":"820","3":"100"},{"1":"20","2":"820","3":"100"},{"1":"40","2":"820","3":"100"},{"1":"100","2":"820","3":"100"},{"1":"10","2":"821","3":"100"},{"1":"20","2":"821","3":"100"},{"1":"40","2":"821","3":"100"},{"1":"100","2":"821","3":"100"},{"1":"10","2":"822","3":"100"},{"1":"20","2":"822","3":"100"},{"1":"40","2":"822","3":"100"},{"1":"100","2":"822","3":"100"},{"1":"10","2":"823","3":"100"},{"1":"20","2":"823","3":"100"},{"1":"40","2":"823","3":"100"},{"1":"100","2":"823","3":"100"},{"1":"10","2":"824","3":"100"},{"1":"20","2":"824","3":"100"},{"1":"40","2":"824","3":"100"},{"1":"100","2":"824","3":"100"},{"1":"10","2":"825","3":"100"},{"1":"20","2":"825","3":"100"},{"1":"40","2":"825","3":"100"},{"1":"100","2":"825","3":"100"},{"1":"10","2":"826","3":"100"},{"1":"20","2":"826","3":"100"},{"1":"40","2":"826","3":"100"},{"1":"100","2":"826","3":"100"},{"1":"10","2":"827","3":"100"},{"1":"20","2":"827","3":"100"},{"1":"40","2":"827","3":"100"},{"1":"100","2":"827","3":"100"},{"1":"10","2":"828","3":"100"},{"1":"20","2":"828","3":"100"},{"1":"40","2":"828","3":"100"},{"1":"100","2":"828","3":"100"},{"1":"10","2":"829","3":"100"},{"1":"20","2":"829","3":"100"},{"1":"40","2":"829","3":"100"},{"1":"100","2":"829","3":"100"},{"1":"10","2":"830","3":"100"},{"1":"20","2":"830","3":"100"},{"1":"40","2":"830","3":"100"},{"1":"100","2":"830","3":"100"},{"1":"10","2":"831","3":"100"},{"1":"20","2":"831","3":"100"},{"1":"40","2":"831","3":"100"},{"1":"100","2":"831","3":"100"},{"1":"10","2":"832","3":"100"},{"1":"20","2":"832","3":"100"},{"1":"40","2":"832","3":"100"},{"1":"100","2":"832","3":"100"},{"1":"10","2":"833","3":"100"},{"1":"20","2":"833","3":"100"},{"1":"40","2":"833","3":"100"},{"1":"100","2":"833","3":"100"},{"1":"10","2":"834","3":"100"},{"1":"20","2":"834","3":"100"},{"1":"40","2":"834","3":"100"},{"1":"100","2":"834","3":"100"},{"1":"10","2":"835","3":"100"},{"1":"20","2":"835","3":"100"},{"1":"40","2":"835","3":"100"},{"1":"100","2":"835","3":"100"},{"1":"10","2":"836","3":"100"},{"1":"20","2":"836","3":"100"},{"1":"40","2":"836","3":"100"},{"1":"100","2":"836","3":"100"},{"1":"10","2":"837","3":"100"},{"1":"20","2":"837","3":"100"},{"1":"40","2":"837","3":"100"},{"1":"100","2":"837","3":"100"},{"1":"10","2":"838","3":"100"},{"1":"20","2":"838","3":"100"},{"1":"40","2":"838","3":"100"},{"1":"100","2":"838","3":"100"},{"1":"10","2":"839","3":"100"},{"1":"20","2":"839","3":"100"},{"1":"40","2":"839","3":"100"},{"1":"100","2":"839","3":"100"},{"1":"10","2":"840","3":"100"},{"1":"20","2":"840","3":"100"},{"1":"40","2":"840","3":"100"},{"1":"100","2":"840","3":"100"},{"1":"10","2":"841","3":"100"},{"1":"20","2":"841","3":"100"},{"1":"40","2":"841","3":"100"},{"1":"100","2":"841","3":"100"},{"1":"10","2":"842","3":"100"},{"1":"20","2":"842","3":"100"},{"1":"40","2":"842","3":"100"},{"1":"100","2":"842","3":"100"},{"1":"10","2":"843","3":"100"},{"1":"20","2":"843","3":"100"},{"1":"40","2":"843","3":"100"},{"1":"100","2":"843","3":"100"},{"1":"10","2":"844","3":"100"},{"1":"20","2":"844","3":"100"},{"1":"40","2":"844","3":"100"},{"1":"100","2":"844","3":"100"},{"1":"10","2":"845","3":"100"},{"1":"20","2":"845","3":"100"},{"1":"40","2":"845","3":"100"},{"1":"100","2":"845","3":"100"},{"1":"10","2":"846","3":"100"},{"1":"20","2":"846","3":"100"},{"1":"40","2":"846","3":"100"},{"1":"100","2":"846","3":"100"},{"1":"10","2":"847","3":"100"},{"1":"20","2":"847","3":"100"},{"1":"40","2":"847","3":"100"},{"1":"100","2":"847","3":"100"},{"1":"10","2":"848","3":"100"},{"1":"20","2":"848","3":"100"},{"1":"40","2":"848","3":"100"},{"1":"100","2":"848","3":"100"},{"1":"10","2":"849","3":"100"},{"1":"20","2":"849","3":"100"},{"1":"40","2":"849","3":"100"},{"1":"100","2":"849","3":"100"},{"1":"10","2":"850","3":"100"},{"1":"20","2":"850","3":"100"},{"1":"40","2":"850","3":"100"},{"1":"100","2":"850","3":"100"},{"1":"10","2":"851","3":"100"},{"1":"20","2":"851","3":"100"},{"1":"40","2":"851","3":"100"},{"1":"100","2":"851","3":"100"},{"1":"10","2":"852","3":"100"},{"1":"20","2":"852","3":"100"},{"1":"40","2":"852","3":"100"},{"1":"100","2":"852","3":"100"},{"1":"10","2":"853","3":"100"},{"1":"20","2":"853","3":"100"},{"1":"40","2":"853","3":"100"},{"1":"100","2":"853","3":"100"},{"1":"10","2":"854","3":"100"},{"1":"20","2":"854","3":"100"},{"1":"40","2":"854","3":"100"},{"1":"100","2":"854","3":"100"},{"1":"10","2":"855","3":"100"},{"1":"20","2":"855","3":"100"},{"1":"40","2":"855","3":"100"},{"1":"100","2":"855","3":"100"},{"1":"10","2":"856","3":"100"},{"1":"20","2":"856","3":"100"},{"1":"40","2":"856","3":"100"},{"1":"100","2":"856","3":"100"},{"1":"10","2":"857","3":"100"},{"1":"20","2":"857","3":"100"},{"1":"40","2":"857","3":"100"},{"1":"100","2":"857","3":"100"},{"1":"10","2":"858","3":"100"},{"1":"20","2":"858","3":"100"},{"1":"40","2":"858","3":"100"},{"1":"100","2":"858","3":"100"},{"1":"10","2":"859","3":"100"},{"1":"20","2":"859","3":"100"},{"1":"40","2":"859","3":"100"},{"1":"100","2":"859","3":"100"},{"1":"10","2":"860","3":"100"},{"1":"20","2":"860","3":"100"},{"1":"40","2":"860","3":"100"},{"1":"100","2":"860","3":"100"},{"1":"10","2":"861","3":"100"},{"1":"20","2":"861","3":"100"},{"1":"40","2":"861","3":"100"},{"1":"100","2":"861","3":"100"},{"1":"10","2":"862","3":"100"},{"1":"20","2":"862","3":"100"},{"1":"40","2":"862","3":"100"},{"1":"100","2":"862","3":"100"},{"1":"10","2":"863","3":"100"},{"1":"20","2":"863","3":"100"},{"1":"40","2":"863","3":"100"},{"1":"100","2":"863","3":"100"},{"1":"10","2":"864","3":"100"},{"1":"20","2":"864","3":"100"},{"1":"40","2":"864","3":"100"},{"1":"100","2":"864","3":"100"},{"1":"10","2":"865","3":"100"},{"1":"20","2":"865","3":"100"},{"1":"40","2":"865","3":"100"},{"1":"100","2":"865","3":"100"},{"1":"10","2":"866","3":"100"},{"1":"20","2":"866","3":"100"},{"1":"40","2":"866","3":"100"},{"1":"100","2":"866","3":"100"},{"1":"10","2":"867","3":"100"},{"1":"20","2":"867","3":"100"},{"1":"40","2":"867","3":"100"},{"1":"100","2":"867","3":"100"},{"1":"10","2":"868","3":"100"},{"1":"20","2":"868","3":"100"},{"1":"40","2":"868","3":"100"},{"1":"100","2":"868","3":"100"},{"1":"10","2":"869","3":"100"},{"1":"20","2":"869","3":"100"},{"1":"40","2":"869","3":"100"},{"1":"100","2":"869","3":"100"},{"1":"10","2":"870","3":"100"},{"1":"20","2":"870","3":"100"},{"1":"40","2":"870","3":"100"},{"1":"100","2":"870","3":"100"},{"1":"10","2":"871","3":"100"},{"1":"20","2":"871","3":"100"},{"1":"40","2":"871","3":"100"},{"1":"100","2":"871","3":"100"},{"1":"10","2":"872","3":"100"},{"1":"20","2":"872","3":"100"},{"1":"40","2":"872","3":"100"},{"1":"100","2":"872","3":"100"},{"1":"10","2":"873","3":"100"},{"1":"20","2":"873","3":"100"},{"1":"40","2":"873","3":"100"},{"1":"100","2":"873","3":"100"},{"1":"10","2":"874","3":"100"},{"1":"20","2":"874","3":"100"},{"1":"40","2":"874","3":"100"},{"1":"100","2":"874","3":"100"},{"1":"10","2":"875","3":"100"},{"1":"20","2":"875","3":"100"},{"1":"40","2":"875","3":"100"},{"1":"100","2":"875","3":"100"},{"1":"10","2":"876","3":"100"},{"1":"20","2":"876","3":"100"},{"1":"40","2":"876","3":"100"},{"1":"100","2":"876","3":"100"},{"1":"10","2":"877","3":"100"},{"1":"20","2":"877","3":"100"},{"1":"40","2":"877","3":"100"},{"1":"100","2":"877","3":"100"},{"1":"10","2":"878","3":"100"},{"1":"20","2":"878","3":"100"},{"1":"40","2":"878","3":"100"},{"1":"100","2":"878","3":"100"},{"1":"10","2":"879","3":"100"},{"1":"20","2":"879","3":"100"},{"1":"40","2":"879","3":"100"},{"1":"100","2":"879","3":"100"},{"1":"10","2":"880","3":"100"},{"1":"20","2":"880","3":"100"},{"1":"40","2":"880","3":"100"},{"1":"100","2":"880","3":"100"},{"1":"10","2":"881","3":"100"},{"1":"20","2":"881","3":"100"},{"1":"40","2":"881","3":"100"},{"1":"100","2":"881","3":"100"},{"1":"10","2":"882","3":"100"},{"1":"20","2":"882","3":"100"},{"1":"40","2":"882","3":"100"},{"1":"100","2":"882","3":"100"},{"1":"10","2":"883","3":"100"},{"1":"20","2":"883","3":"100"},{"1":"40","2":"883","3":"100"},{"1":"100","2":"883","3":"100"},{"1":"10","2":"884","3":"100"},{"1":"20","2":"884","3":"100"},{"1":"40","2":"884","3":"100"},{"1":"100","2":"884","3":"100"},{"1":"10","2":"885","3":"100"},{"1":"20","2":"885","3":"100"},{"1":"40","2":"885","3":"100"},{"1":"100","2":"885","3":"100"},{"1":"10","2":"886","3":"100"},{"1":"20","2":"886","3":"100"},{"1":"40","2":"886","3":"100"},{"1":"100","2":"886","3":"100"},{"1":"10","2":"887","3":"100"},{"1":"20","2":"887","3":"100"},{"1":"40","2":"887","3":"100"},{"1":"100","2":"887","3":"100"},{"1":"10","2":"888","3":"100"},{"1":"20","2":"888","3":"100"},{"1":"40","2":"888","3":"100"},{"1":"100","2":"888","3":"100"},{"1":"10","2":"889","3":"100"},{"1":"20","2":"889","3":"100"},{"1":"40","2":"889","3":"100"},{"1":"100","2":"889","3":"100"},{"1":"10","2":"890","3":"100"},{"1":"20","2":"890","3":"100"},{"1":"40","2":"890","3":"100"},{"1":"100","2":"890","3":"100"},{"1":"10","2":"891","3":"100"},{"1":"20","2":"891","3":"100"},{"1":"40","2":"891","3":"100"},{"1":"100","2":"891","3":"100"},{"1":"10","2":"892","3":"100"},{"1":"20","2":"892","3":"100"},{"1":"40","2":"892","3":"100"},{"1":"100","2":"892","3":"100"},{"1":"10","2":"893","3":"100"},{"1":"20","2":"893","3":"100"},{"1":"40","2":"893","3":"100"},{"1":"100","2":"893","3":"100"},{"1":"10","2":"894","3":"100"},{"1":"20","2":"894","3":"100"},{"1":"40","2":"894","3":"100"},{"1":"100","2":"894","3":"100"},{"1":"10","2":"895","3":"100"},{"1":"20","2":"895","3":"100"},{"1":"40","2":"895","3":"100"},{"1":"100","2":"895","3":"100"},{"1":"10","2":"896","3":"100"},{"1":"20","2":"896","3":"100"},{"1":"40","2":"896","3":"100"},{"1":"100","2":"896","3":"100"},{"1":"10","2":"897","3":"100"},{"1":"20","2":"897","3":"100"},{"1":"40","2":"897","3":"100"},{"1":"100","2":"897","3":"100"},{"1":"10","2":"898","3":"100"},{"1":"20","2":"898","3":"100"},{"1":"40","2":"898","3":"100"},{"1":"100","2":"898","3":"100"},{"1":"10","2":"899","3":"100"},{"1":"20","2":"899","3":"100"},{"1":"40","2":"899","3":"100"},{"1":"100","2":"899","3":"100"},{"1":"10","2":"900","3":"100"},{"1":"20","2":"900","3":"100"},{"1":"40","2":"900","3":"100"},{"1":"100","2":"900","3":"100"},{"1":"10","2":"901","3":"100"},{"1":"20","2":"901","3":"100"},{"1":"40","2":"901","3":"100"},{"1":"100","2":"901","3":"100"},{"1":"10","2":"902","3":"100"},{"1":"20","2":"902","3":"100"},{"1":"40","2":"902","3":"100"},{"1":"100","2":"902","3":"100"},{"1":"10","2":"903","3":"100"},{"1":"20","2":"903","3":"100"},{"1":"40","2":"903","3":"100"},{"1":"100","2":"903","3":"100"},{"1":"10","2":"904","3":"100"},{"1":"20","2":"904","3":"100"},{"1":"40","2":"904","3":"100"},{"1":"100","2":"904","3":"100"},{"1":"10","2":"905","3":"100"},{"1":"20","2":"905","3":"100"},{"1":"40","2":"905","3":"100"},{"1":"100","2":"905","3":"100"},{"1":"10","2":"906","3":"100"},{"1":"20","2":"906","3":"100"},{"1":"40","2":"906","3":"100"},{"1":"100","2":"906","3":"100"},{"1":"10","2":"907","3":"100"},{"1":"20","2":"907","3":"100"},{"1":"40","2":"907","3":"100"},{"1":"100","2":"907","3":"100"},{"1":"10","2":"908","3":"100"},{"1":"20","2":"908","3":"100"},{"1":"40","2":"908","3":"100"},{"1":"100","2":"908","3":"100"},{"1":"10","2":"909","3":"100"},{"1":"20","2":"909","3":"100"},{"1":"40","2":"909","3":"100"},{"1":"100","2":"909","3":"100"},{"1":"10","2":"910","3":"100"},{"1":"20","2":"910","3":"100"},{"1":"40","2":"910","3":"100"},{"1":"100","2":"910","3":"100"},{"1":"10","2":"911","3":"100"},{"1":"20","2":"911","3":"100"},{"1":"40","2":"911","3":"100"},{"1":"100","2":"911","3":"100"},{"1":"10","2":"912","3":"100"},{"1":"20","2":"912","3":"100"},{"1":"40","2":"912","3":"100"},{"1":"100","2":"912","3":"100"},{"1":"10","2":"913","3":"100"},{"1":"20","2":"913","3":"100"},{"1":"40","2":"913","3":"100"},{"1":"100","2":"913","3":"100"},{"1":"10","2":"914","3":"100"},{"1":"20","2":"914","3":"100"},{"1":"40","2":"914","3":"100"},{"1":"100","2":"914","3":"100"},{"1":"10","2":"915","3":"100"},{"1":"20","2":"915","3":"100"},{"1":"40","2":"915","3":"100"},{"1":"100","2":"915","3":"100"},{"1":"10","2":"916","3":"100"},{"1":"20","2":"916","3":"100"},{"1":"40","2":"916","3":"100"},{"1":"100","2":"916","3":"100"},{"1":"10","2":"917","3":"100"},{"1":"20","2":"917","3":"100"},{"1":"40","2":"917","3":"100"},{"1":"100","2":"917","3":"100"},{"1":"10","2":"918","3":"100"},{"1":"20","2":"918","3":"100"},{"1":"40","2":"918","3":"100"},{"1":"100","2":"918","3":"100"},{"1":"10","2":"919","3":"100"},{"1":"20","2":"919","3":"100"},{"1":"40","2":"919","3":"100"},{"1":"100","2":"919","3":"100"},{"1":"10","2":"920","3":"100"},{"1":"20","2":"920","3":"100"},{"1":"40","2":"920","3":"100"},{"1":"100","2":"920","3":"100"},{"1":"10","2":"921","3":"100"},{"1":"20","2":"921","3":"100"},{"1":"40","2":"921","3":"100"},{"1":"100","2":"921","3":"100"},{"1":"10","2":"922","3":"100"},{"1":"20","2":"922","3":"100"},{"1":"40","2":"922","3":"100"},{"1":"100","2":"922","3":"100"},{"1":"10","2":"923","3":"100"},{"1":"20","2":"923","3":"100"},{"1":"40","2":"923","3":"100"},{"1":"100","2":"923","3":"100"},{"1":"10","2":"924","3":"100"},{"1":"20","2":"924","3":"100"},{"1":"40","2":"924","3":"100"},{"1":"100","2":"924","3":"100"},{"1":"10","2":"925","3":"100"},{"1":"20","2":"925","3":"100"},{"1":"40","2":"925","3":"100"},{"1":"100","2":"925","3":"100"},{"1":"10","2":"926","3":"100"},{"1":"20","2":"926","3":"100"},{"1":"40","2":"926","3":"100"},{"1":"100","2":"926","3":"100"},{"1":"10","2":"927","3":"100"},{"1":"20","2":"927","3":"100"},{"1":"40","2":"927","3":"100"},{"1":"100","2":"927","3":"100"},{"1":"10","2":"928","3":"100"},{"1":"20","2":"928","3":"100"},{"1":"40","2":"928","3":"100"},{"1":"100","2":"928","3":"100"},{"1":"10","2":"929","3":"100"},{"1":"20","2":"929","3":"100"},{"1":"40","2":"929","3":"100"},{"1":"100","2":"929","3":"100"},{"1":"10","2":"930","3":"100"},{"1":"20","2":"930","3":"100"},{"1":"40","2":"930","3":"100"},{"1":"100","2":"930","3":"100"},{"1":"10","2":"931","3":"100"},{"1":"20","2":"931","3":"100"},{"1":"40","2":"931","3":"100"},{"1":"100","2":"931","3":"100"},{"1":"10","2":"932","3":"100"},{"1":"20","2":"932","3":"100"},{"1":"40","2":"932","3":"100"},{"1":"100","2":"932","3":"100"},{"1":"10","2":"933","3":"100"},{"1":"20","2":"933","3":"100"},{"1":"40","2":"933","3":"100"},{"1":"100","2":"933","3":"100"},{"1":"10","2":"934","3":"100"},{"1":"20","2":"934","3":"100"},{"1":"40","2":"934","3":"100"},{"1":"100","2":"934","3":"100"},{"1":"10","2":"935","3":"100"},{"1":"20","2":"935","3":"100"},{"1":"40","2":"935","3":"100"},{"1":"100","2":"935","3":"100"},{"1":"10","2":"936","3":"100"},{"1":"20","2":"936","3":"100"},{"1":"40","2":"936","3":"100"},{"1":"100","2":"936","3":"100"},{"1":"10","2":"937","3":"100"},{"1":"20","2":"937","3":"100"},{"1":"40","2":"937","3":"100"},{"1":"100","2":"937","3":"100"},{"1":"10","2":"938","3":"100"},{"1":"20","2":"938","3":"100"},{"1":"40","2":"938","3":"100"},{"1":"100","2":"938","3":"100"},{"1":"10","2":"939","3":"100"},{"1":"20","2":"939","3":"100"},{"1":"40","2":"939","3":"100"},{"1":"100","2":"939","3":"100"},{"1":"10","2":"940","3":"100"},{"1":"20","2":"940","3":"100"},{"1":"40","2":"940","3":"100"},{"1":"100","2":"940","3":"100"},{"1":"10","2":"941","3":"100"},{"1":"20","2":"941","3":"100"},{"1":"40","2":"941","3":"100"},{"1":"100","2":"941","3":"100"},{"1":"10","2":"942","3":"100"},{"1":"20","2":"942","3":"100"},{"1":"40","2":"942","3":"100"},{"1":"100","2":"942","3":"100"},{"1":"10","2":"943","3":"100"},{"1":"20","2":"943","3":"100"},{"1":"40","2":"943","3":"100"},{"1":"100","2":"943","3":"100"},{"1":"10","2":"944","3":"100"},{"1":"20","2":"944","3":"100"},{"1":"40","2":"944","3":"100"},{"1":"100","2":"944","3":"100"},{"1":"10","2":"945","3":"100"},{"1":"20","2":"945","3":"100"},{"1":"40","2":"945","3":"100"},{"1":"100","2":"945","3":"100"},{"1":"10","2":"946","3":"100"},{"1":"20","2":"946","3":"100"},{"1":"40","2":"946","3":"100"},{"1":"100","2":"946","3":"100"},{"1":"10","2":"947","3":"100"},{"1":"20","2":"947","3":"100"},{"1":"40","2":"947","3":"100"},{"1":"100","2":"947","3":"100"},{"1":"10","2":"948","3":"100"},{"1":"20","2":"948","3":"100"},{"1":"40","2":"948","3":"100"},{"1":"100","2":"948","3":"100"},{"1":"10","2":"949","3":"100"},{"1":"20","2":"949","3":"100"},{"1":"40","2":"949","3":"100"},{"1":"100","2":"949","3":"100"},{"1":"10","2":"950","3":"100"},{"1":"20","2":"950","3":"100"},{"1":"40","2":"950","3":"100"},{"1":"100","2":"950","3":"100"},{"1":"10","2":"951","3":"100"},{"1":"20","2":"951","3":"100"},{"1":"40","2":"951","3":"100"},{"1":"100","2":"951","3":"100"},{"1":"10","2":"952","3":"100"},{"1":"20","2":"952","3":"100"},{"1":"40","2":"952","3":"100"},{"1":"100","2":"952","3":"100"},{"1":"10","2":"953","3":"100"},{"1":"20","2":"953","3":"100"},{"1":"40","2":"953","3":"100"},{"1":"100","2":"953","3":"100"},{"1":"10","2":"954","3":"100"},{"1":"20","2":"954","3":"100"},{"1":"40","2":"954","3":"100"},{"1":"100","2":"954","3":"100"},{"1":"10","2":"955","3":"100"},{"1":"20","2":"955","3":"100"},{"1":"40","2":"955","3":"100"},{"1":"100","2":"955","3":"100"},{"1":"10","2":"956","3":"100"},{"1":"20","2":"956","3":"100"},{"1":"40","2":"956","3":"100"},{"1":"100","2":"956","3":"100"},{"1":"10","2":"957","3":"100"},{"1":"20","2":"957","3":"100"},{"1":"40","2":"957","3":"100"},{"1":"100","2":"957","3":"100"},{"1":"10","2":"958","3":"100"},{"1":"20","2":"958","3":"100"},{"1":"40","2":"958","3":"100"},{"1":"100","2":"958","3":"100"},{"1":"10","2":"959","3":"100"},{"1":"20","2":"959","3":"100"},{"1":"40","2":"959","3":"100"},{"1":"100","2":"959","3":"100"},{"1":"10","2":"960","3":"100"},{"1":"20","2":"960","3":"100"},{"1":"40","2":"960","3":"100"},{"1":"100","2":"960","3":"100"},{"1":"10","2":"961","3":"100"},{"1":"20","2":"961","3":"100"},{"1":"40","2":"961","3":"100"},{"1":"100","2":"961","3":"100"},{"1":"10","2":"962","3":"100"},{"1":"20","2":"962","3":"100"},{"1":"40","2":"962","3":"100"},{"1":"100","2":"962","3":"100"},{"1":"10","2":"963","3":"100"},{"1":"20","2":"963","3":"100"},{"1":"40","2":"963","3":"100"},{"1":"100","2":"963","3":"100"},{"1":"10","2":"964","3":"100"},{"1":"20","2":"964","3":"100"},{"1":"40","2":"964","3":"100"},{"1":"100","2":"964","3":"100"},{"1":"10","2":"965","3":"100"},{"1":"20","2":"965","3":"100"},{"1":"40","2":"965","3":"100"},{"1":"100","2":"965","3":"100"},{"1":"10","2":"966","3":"100"},{"1":"20","2":"966","3":"100"},{"1":"40","2":"966","3":"100"},{"1":"100","2":"966","3":"100"},{"1":"10","2":"967","3":"100"},{"1":"20","2":"967","3":"100"},{"1":"40","2":"967","3":"100"},{"1":"100","2":"967","3":"100"},{"1":"10","2":"968","3":"100"},{"1":"20","2":"968","3":"100"},{"1":"40","2":"968","3":"100"},{"1":"100","2":"968","3":"100"},{"1":"10","2":"969","3":"100"},{"1":"20","2":"969","3":"100"},{"1":"40","2":"969","3":"100"},{"1":"100","2":"969","3":"100"},{"1":"10","2":"970","3":"100"},{"1":"20","2":"970","3":"100"},{"1":"40","2":"970","3":"100"},{"1":"100","2":"970","3":"100"},{"1":"10","2":"971","3":"100"},{"1":"20","2":"971","3":"100"},{"1":"40","2":"971","3":"100"},{"1":"100","2":"971","3":"100"},{"1":"10","2":"972","3":"100"},{"1":"20","2":"972","3":"100"},{"1":"40","2":"972","3":"100"},{"1":"100","2":"972","3":"100"},{"1":"10","2":"973","3":"100"},{"1":"20","2":"973","3":"100"},{"1":"40","2":"973","3":"100"},{"1":"100","2":"973","3":"100"},{"1":"10","2":"974","3":"100"},{"1":"20","2":"974","3":"100"},{"1":"40","2":"974","3":"100"},{"1":"100","2":"974","3":"100"},{"1":"10","2":"975","3":"100"},{"1":"20","2":"975","3":"100"},{"1":"40","2":"975","3":"100"},{"1":"100","2":"975","3":"100"},{"1":"10","2":"976","3":"100"},{"1":"20","2":"976","3":"100"},{"1":"40","2":"976","3":"100"},{"1":"100","2":"976","3":"100"},{"1":"10","2":"977","3":"100"},{"1":"20","2":"977","3":"100"},{"1":"40","2":"977","3":"100"},{"1":"100","2":"977","3":"100"},{"1":"10","2":"978","3":"100"},{"1":"20","2":"978","3":"100"},{"1":"40","2":"978","3":"100"},{"1":"100","2":"978","3":"100"},{"1":"10","2":"979","3":"100"},{"1":"20","2":"979","3":"100"},{"1":"40","2":"979","3":"100"},{"1":"100","2":"979","3":"100"},{"1":"10","2":"980","3":"100"},{"1":"20","2":"980","3":"100"},{"1":"40","2":"980","3":"100"},{"1":"100","2":"980","3":"100"},{"1":"10","2":"981","3":"100"},{"1":"20","2":"981","3":"100"},{"1":"40","2":"981","3":"100"},{"1":"100","2":"981","3":"100"},{"1":"10","2":"982","3":"100"},{"1":"20","2":"982","3":"100"},{"1":"40","2":"982","3":"100"},{"1":"100","2":"982","3":"100"},{"1":"10","2":"983","3":"100"},{"1":"20","2":"983","3":"100"},{"1":"40","2":"983","3":"100"},{"1":"100","2":"983","3":"100"},{"1":"10","2":"984","3":"100"},{"1":"20","2":"984","3":"100"},{"1":"40","2":"984","3":"100"},{"1":"100","2":"984","3":"100"},{"1":"10","2":"985","3":"100"},{"1":"20","2":"985","3":"100"},{"1":"40","2":"985","3":"100"},{"1":"100","2":"985","3":"100"},{"1":"10","2":"986","3":"100"},{"1":"20","2":"986","3":"100"},{"1":"40","2":"986","3":"100"},{"1":"100","2":"986","3":"100"},{"1":"10","2":"987","3":"100"},{"1":"20","2":"987","3":"100"},{"1":"40","2":"987","3":"100"},{"1":"100","2":"987","3":"100"},{"1":"10","2":"988","3":"100"},{"1":"20","2":"988","3":"100"},{"1":"40","2":"988","3":"100"},{"1":"100","2":"988","3":"100"},{"1":"10","2":"989","3":"100"},{"1":"20","2":"989","3":"100"},{"1":"40","2":"989","3":"100"},{"1":"100","2":"989","3":"100"},{"1":"10","2":"990","3":"100"},{"1":"20","2":"990","3":"100"},{"1":"40","2":"990","3":"100"},{"1":"100","2":"990","3":"100"},{"1":"10","2":"991","3":"100"},{"1":"20","2":"991","3":"100"},{"1":"40","2":"991","3":"100"},{"1":"100","2":"991","3":"100"},{"1":"10","2":"992","3":"100"},{"1":"20","2":"992","3":"100"},{"1":"40","2":"992","3":"100"},{"1":"100","2":"992","3":"100"},{"1":"10","2":"993","3":"100"},{"1":"20","2":"993","3":"100"},{"1":"40","2":"993","3":"100"},{"1":"100","2":"993","3":"100"},{"1":"10","2":"994","3":"100"},{"1":"20","2":"994","3":"100"},{"1":"40","2":"994","3":"100"},{"1":"100","2":"994","3":"100"},{"1":"10","2":"995","3":"100"},{"1":"20","2":"995","3":"100"},{"1":"40","2":"995","3":"100"},{"1":"100","2":"995","3":"100"},{"1":"10","2":"996","3":"100"},{"1":"20","2":"996","3":"100"},{"1":"40","2":"996","3":"100"},{"1":"100","2":"996","3":"100"},{"1":"10","2":"997","3":"100"},{"1":"20","2":"997","3":"100"},{"1":"40","2":"997","3":"100"},{"1":"100","2":"997","3":"100"},{"1":"10","2":"998","3":"100"},{"1":"20","2":"998","3":"100"},{"1":"40","2":"998","3":"100"},{"1":"100","2":"998","3":"100"},{"1":"10","2":"999","3":"100"},{"1":"20","2":"999","3":"100"},{"1":"40","2":"999","3":"100"},{"1":"100","2":"999","3":"100"},{"1":"10","2":"1000","3":"100"},{"1":"20","2":"1000","3":"100"},{"1":"40","2":"1000","3":"100"},{"1":"100","2":"1000","3":"100"},{"1":"10","2":"1","3":"200"},{"1":"20","2":"1","3":"200"},{"1":"40","2":"1","3":"200"},{"1":"100","2":"1","3":"200"},{"1":"10","2":"2","3":"200"},{"1":"20","2":"2","3":"200"},{"1":"40","2":"2","3":"200"},{"1":"100","2":"2","3":"200"},{"1":"10","2":"3","3":"200"},{"1":"20","2":"3","3":"200"},{"1":"40","2":"3","3":"200"},{"1":"100","2":"3","3":"200"},{"1":"10","2":"4","3":"200"},{"1":"20","2":"4","3":"200"},{"1":"40","2":"4","3":"200"},{"1":"100","2":"4","3":"200"},{"1":"10","2":"5","3":"200"},{"1":"20","2":"5","3":"200"},{"1":"40","2":"5","3":"200"},{"1":"100","2":"5","3":"200"},{"1":"10","2":"6","3":"200"},{"1":"20","2":"6","3":"200"},{"1":"40","2":"6","3":"200"},{"1":"100","2":"6","3":"200"},{"1":"10","2":"7","3":"200"},{"1":"20","2":"7","3":"200"},{"1":"40","2":"7","3":"200"},{"1":"100","2":"7","3":"200"},{"1":"10","2":"8","3":"200"},{"1":"20","2":"8","3":"200"},{"1":"40","2":"8","3":"200"},{"1":"100","2":"8","3":"200"},{"1":"10","2":"9","3":"200"},{"1":"20","2":"9","3":"200"},{"1":"40","2":"9","3":"200"},{"1":"100","2":"9","3":"200"},{"1":"10","2":"10","3":"200"},{"1":"20","2":"10","3":"200"},{"1":"40","2":"10","3":"200"},{"1":"100","2":"10","3":"200"},{"1":"10","2":"11","3":"200"},{"1":"20","2":"11","3":"200"},{"1":"40","2":"11","3":"200"},{"1":"100","2":"11","3":"200"},{"1":"10","2":"12","3":"200"},{"1":"20","2":"12","3":"200"},{"1":"40","2":"12","3":"200"},{"1":"100","2":"12","3":"200"},{"1":"10","2":"13","3":"200"},{"1":"20","2":"13","3":"200"},{"1":"40","2":"13","3":"200"},{"1":"100","2":"13","3":"200"},{"1":"10","2":"14","3":"200"},{"1":"20","2":"14","3":"200"},{"1":"40","2":"14","3":"200"},{"1":"100","2":"14","3":"200"},{"1":"10","2":"15","3":"200"},{"1":"20","2":"15","3":"200"},{"1":"40","2":"15","3":"200"},{"1":"100","2":"15","3":"200"},{"1":"10","2":"16","3":"200"},{"1":"20","2":"16","3":"200"},{"1":"40","2":"16","3":"200"},{"1":"100","2":"16","3":"200"},{"1":"10","2":"17","3":"200"},{"1":"20","2":"17","3":"200"},{"1":"40","2":"17","3":"200"},{"1":"100","2":"17","3":"200"},{"1":"10","2":"18","3":"200"},{"1":"20","2":"18","3":"200"},{"1":"40","2":"18","3":"200"},{"1":"100","2":"18","3":"200"},{"1":"10","2":"19","3":"200"},{"1":"20","2":"19","3":"200"},{"1":"40","2":"19","3":"200"},{"1":"100","2":"19","3":"200"},{"1":"10","2":"20","3":"200"},{"1":"20","2":"20","3":"200"},{"1":"40","2":"20","3":"200"},{"1":"100","2":"20","3":"200"},{"1":"10","2":"21","3":"200"},{"1":"20","2":"21","3":"200"},{"1":"40","2":"21","3":"200"},{"1":"100","2":"21","3":"200"},{"1":"10","2":"22","3":"200"},{"1":"20","2":"22","3":"200"},{"1":"40","2":"22","3":"200"},{"1":"100","2":"22","3":"200"},{"1":"10","2":"23","3":"200"},{"1":"20","2":"23","3":"200"},{"1":"40","2":"23","3":"200"},{"1":"100","2":"23","3":"200"},{"1":"10","2":"24","3":"200"},{"1":"20","2":"24","3":"200"},{"1":"40","2":"24","3":"200"},{"1":"100","2":"24","3":"200"},{"1":"10","2":"25","3":"200"},{"1":"20","2":"25","3":"200"},{"1":"40","2":"25","3":"200"},{"1":"100","2":"25","3":"200"},{"1":"10","2":"26","3":"200"},{"1":"20","2":"26","3":"200"},{"1":"40","2":"26","3":"200"},{"1":"100","2":"26","3":"200"},{"1":"10","2":"27","3":"200"},{"1":"20","2":"27","3":"200"},{"1":"40","2":"27","3":"200"},{"1":"100","2":"27","3":"200"},{"1":"10","2":"28","3":"200"},{"1":"20","2":"28","3":"200"},{"1":"40","2":"28","3":"200"},{"1":"100","2":"28","3":"200"},{"1":"10","2":"29","3":"200"},{"1":"20","2":"29","3":"200"},{"1":"40","2":"29","3":"200"},{"1":"100","2":"29","3":"200"},{"1":"10","2":"30","3":"200"},{"1":"20","2":"30","3":"200"},{"1":"40","2":"30","3":"200"},{"1":"100","2":"30","3":"200"},{"1":"10","2":"31","3":"200"},{"1":"20","2":"31","3":"200"},{"1":"40","2":"31","3":"200"},{"1":"100","2":"31","3":"200"},{"1":"10","2":"32","3":"200"},{"1":"20","2":"32","3":"200"},{"1":"40","2":"32","3":"200"},{"1":"100","2":"32","3":"200"},{"1":"10","2":"33","3":"200"},{"1":"20","2":"33","3":"200"},{"1":"40","2":"33","3":"200"},{"1":"100","2":"33","3":"200"},{"1":"10","2":"34","3":"200"},{"1":"20","2":"34","3":"200"},{"1":"40","2":"34","3":"200"},{"1":"100","2":"34","3":"200"},{"1":"10","2":"35","3":"200"},{"1":"20","2":"35","3":"200"},{"1":"40","2":"35","3":"200"},{"1":"100","2":"35","3":"200"},{"1":"10","2":"36","3":"200"},{"1":"20","2":"36","3":"200"},{"1":"40","2":"36","3":"200"},{"1":"100","2":"36","3":"200"},{"1":"10","2":"37","3":"200"},{"1":"20","2":"37","3":"200"},{"1":"40","2":"37","3":"200"},{"1":"100","2":"37","3":"200"},{"1":"10","2":"38","3":"200"},{"1":"20","2":"38","3":"200"},{"1":"40","2":"38","3":"200"},{"1":"100","2":"38","3":"200"},{"1":"10","2":"39","3":"200"},{"1":"20","2":"39","3":"200"},{"1":"40","2":"39","3":"200"},{"1":"100","2":"39","3":"200"},{"1":"10","2":"40","3":"200"},{"1":"20","2":"40","3":"200"},{"1":"40","2":"40","3":"200"},{"1":"100","2":"40","3":"200"},{"1":"10","2":"41","3":"200"},{"1":"20","2":"41","3":"200"},{"1":"40","2":"41","3":"200"},{"1":"100","2":"41","3":"200"},{"1":"10","2":"42","3":"200"},{"1":"20","2":"42","3":"200"},{"1":"40","2":"42","3":"200"},{"1":"100","2":"42","3":"200"},{"1":"10","2":"43","3":"200"},{"1":"20","2":"43","3":"200"},{"1":"40","2":"43","3":"200"},{"1":"100","2":"43","3":"200"},{"1":"10","2":"44","3":"200"},{"1":"20","2":"44","3":"200"},{"1":"40","2":"44","3":"200"},{"1":"100","2":"44","3":"200"},{"1":"10","2":"45","3":"200"},{"1":"20","2":"45","3":"200"},{"1":"40","2":"45","3":"200"},{"1":"100","2":"45","3":"200"},{"1":"10","2":"46","3":"200"},{"1":"20","2":"46","3":"200"},{"1":"40","2":"46","3":"200"},{"1":"100","2":"46","3":"200"},{"1":"10","2":"47","3":"200"},{"1":"20","2":"47","3":"200"},{"1":"40","2":"47","3":"200"},{"1":"100","2":"47","3":"200"},{"1":"10","2":"48","3":"200"},{"1":"20","2":"48","3":"200"},{"1":"40","2":"48","3":"200"},{"1":"100","2":"48","3":"200"},{"1":"10","2":"49","3":"200"},{"1":"20","2":"49","3":"200"},{"1":"40","2":"49","3":"200"},{"1":"100","2":"49","3":"200"},{"1":"10","2":"50","3":"200"},{"1":"20","2":"50","3":"200"},{"1":"40","2":"50","3":"200"},{"1":"100","2":"50","3":"200"},{"1":"10","2":"51","3":"200"},{"1":"20","2":"51","3":"200"},{"1":"40","2":"51","3":"200"},{"1":"100","2":"51","3":"200"},{"1":"10","2":"52","3":"200"},{"1":"20","2":"52","3":"200"},{"1":"40","2":"52","3":"200"},{"1":"100","2":"52","3":"200"},{"1":"10","2":"53","3":"200"},{"1":"20","2":"53","3":"200"},{"1":"40","2":"53","3":"200"},{"1":"100","2":"53","3":"200"},{"1":"10","2":"54","3":"200"},{"1":"20","2":"54","3":"200"},{"1":"40","2":"54","3":"200"},{"1":"100","2":"54","3":"200"},{"1":"10","2":"55","3":"200"},{"1":"20","2":"55","3":"200"},{"1":"40","2":"55","3":"200"},{"1":"100","2":"55","3":"200"},{"1":"10","2":"56","3":"200"},{"1":"20","2":"56","3":"200"},{"1":"40","2":"56","3":"200"},{"1":"100","2":"56","3":"200"},{"1":"10","2":"57","3":"200"},{"1":"20","2":"57","3":"200"},{"1":"40","2":"57","3":"200"},{"1":"100","2":"57","3":"200"},{"1":"10","2":"58","3":"200"},{"1":"20","2":"58","3":"200"},{"1":"40","2":"58","3":"200"},{"1":"100","2":"58","3":"200"},{"1":"10","2":"59","3":"200"},{"1":"20","2":"59","3":"200"},{"1":"40","2":"59","3":"200"},{"1":"100","2":"59","3":"200"},{"1":"10","2":"60","3":"200"},{"1":"20","2":"60","3":"200"},{"1":"40","2":"60","3":"200"},{"1":"100","2":"60","3":"200"},{"1":"10","2":"61","3":"200"},{"1":"20","2":"61","3":"200"},{"1":"40","2":"61","3":"200"},{"1":"100","2":"61","3":"200"},{"1":"10","2":"62","3":"200"},{"1":"20","2":"62","3":"200"},{"1":"40","2":"62","3":"200"},{"1":"100","2":"62","3":"200"},{"1":"10","2":"63","3":"200"},{"1":"20","2":"63","3":"200"},{"1":"40","2":"63","3":"200"},{"1":"100","2":"63","3":"200"},{"1":"10","2":"64","3":"200"},{"1":"20","2":"64","3":"200"},{"1":"40","2":"64","3":"200"},{"1":"100","2":"64","3":"200"},{"1":"10","2":"65","3":"200"},{"1":"20","2":"65","3":"200"},{"1":"40","2":"65","3":"200"},{"1":"100","2":"65","3":"200"},{"1":"10","2":"66","3":"200"},{"1":"20","2":"66","3":"200"},{"1":"40","2":"66","3":"200"},{"1":"100","2":"66","3":"200"},{"1":"10","2":"67","3":"200"},{"1":"20","2":"67","3":"200"},{"1":"40","2":"67","3":"200"},{"1":"100","2":"67","3":"200"},{"1":"10","2":"68","3":"200"},{"1":"20","2":"68","3":"200"},{"1":"40","2":"68","3":"200"},{"1":"100","2":"68","3":"200"},{"1":"10","2":"69","3":"200"},{"1":"20","2":"69","3":"200"},{"1":"40","2":"69","3":"200"},{"1":"100","2":"69","3":"200"},{"1":"10","2":"70","3":"200"},{"1":"20","2":"70","3":"200"},{"1":"40","2":"70","3":"200"},{"1":"100","2":"70","3":"200"},{"1":"10","2":"71","3":"200"},{"1":"20","2":"71","3":"200"},{"1":"40","2":"71","3":"200"},{"1":"100","2":"71","3":"200"},{"1":"10","2":"72","3":"200"},{"1":"20","2":"72","3":"200"},{"1":"40","2":"72","3":"200"},{"1":"100","2":"72","3":"200"},{"1":"10","2":"73","3":"200"},{"1":"20","2":"73","3":"200"},{"1":"40","2":"73","3":"200"},{"1":"100","2":"73","3":"200"},{"1":"10","2":"74","3":"200"},{"1":"20","2":"74","3":"200"},{"1":"40","2":"74","3":"200"},{"1":"100","2":"74","3":"200"},{"1":"10","2":"75","3":"200"},{"1":"20","2":"75","3":"200"},{"1":"40","2":"75","3":"200"},{"1":"100","2":"75","3":"200"},{"1":"10","2":"76","3":"200"},{"1":"20","2":"76","3":"200"},{"1":"40","2":"76","3":"200"},{"1":"100","2":"76","3":"200"},{"1":"10","2":"77","3":"200"},{"1":"20","2":"77","3":"200"},{"1":"40","2":"77","3":"200"},{"1":"100","2":"77","3":"200"},{"1":"10","2":"78","3":"200"},{"1":"20","2":"78","3":"200"},{"1":"40","2":"78","3":"200"},{"1":"100","2":"78","3":"200"},{"1":"10","2":"79","3":"200"},{"1":"20","2":"79","3":"200"},{"1":"40","2":"79","3":"200"},{"1":"100","2":"79","3":"200"},{"1":"10","2":"80","3":"200"},{"1":"20","2":"80","3":"200"},{"1":"40","2":"80","3":"200"},{"1":"100","2":"80","3":"200"},{"1":"10","2":"81","3":"200"},{"1":"20","2":"81","3":"200"},{"1":"40","2":"81","3":"200"},{"1":"100","2":"81","3":"200"},{"1":"10","2":"82","3":"200"},{"1":"20","2":"82","3":"200"},{"1":"40","2":"82","3":"200"},{"1":"100","2":"82","3":"200"},{"1":"10","2":"83","3":"200"},{"1":"20","2":"83","3":"200"},{"1":"40","2":"83","3":"200"},{"1":"100","2":"83","3":"200"},{"1":"10","2":"84","3":"200"},{"1":"20","2":"84","3":"200"},{"1":"40","2":"84","3":"200"},{"1":"100","2":"84","3":"200"},{"1":"10","2":"85","3":"200"},{"1":"20","2":"85","3":"200"},{"1":"40","2":"85","3":"200"},{"1":"100","2":"85","3":"200"},{"1":"10","2":"86","3":"200"},{"1":"20","2":"86","3":"200"},{"1":"40","2":"86","3":"200"},{"1":"100","2":"86","3":"200"},{"1":"10","2":"87","3":"200"},{"1":"20","2":"87","3":"200"},{"1":"40","2":"87","3":"200"},{"1":"100","2":"87","3":"200"},{"1":"10","2":"88","3":"200"},{"1":"20","2":"88","3":"200"},{"1":"40","2":"88","3":"200"},{"1":"100","2":"88","3":"200"},{"1":"10","2":"89","3":"200"},{"1":"20","2":"89","3":"200"},{"1":"40","2":"89","3":"200"},{"1":"100","2":"89","3":"200"},{"1":"10","2":"90","3":"200"},{"1":"20","2":"90","3":"200"},{"1":"40","2":"90","3":"200"},{"1":"100","2":"90","3":"200"},{"1":"10","2":"91","3":"200"},{"1":"20","2":"91","3":"200"},{"1":"40","2":"91","3":"200"},{"1":"100","2":"91","3":"200"},{"1":"10","2":"92","3":"200"},{"1":"20","2":"92","3":"200"},{"1":"40","2":"92","3":"200"},{"1":"100","2":"92","3":"200"},{"1":"10","2":"93","3":"200"},{"1":"20","2":"93","3":"200"},{"1":"40","2":"93","3":"200"},{"1":"100","2":"93","3":"200"},{"1":"10","2":"94","3":"200"},{"1":"20","2":"94","3":"200"},{"1":"40","2":"94","3":"200"},{"1":"100","2":"94","3":"200"},{"1":"10","2":"95","3":"200"},{"1":"20","2":"95","3":"200"},{"1":"40","2":"95","3":"200"},{"1":"100","2":"95","3":"200"},{"1":"10","2":"96","3":"200"},{"1":"20","2":"96","3":"200"},{"1":"40","2":"96","3":"200"},{"1":"100","2":"96","3":"200"},{"1":"10","2":"97","3":"200"},{"1":"20","2":"97","3":"200"},{"1":"40","2":"97","3":"200"},{"1":"100","2":"97","3":"200"},{"1":"10","2":"98","3":"200"},{"1":"20","2":"98","3":"200"},{"1":"40","2":"98","3":"200"},{"1":"100","2":"98","3":"200"},{"1":"10","2":"99","3":"200"},{"1":"20","2":"99","3":"200"},{"1":"40","2":"99","3":"200"},{"1":"100","2":"99","3":"200"},{"1":"10","2":"100","3":"200"},{"1":"20","2":"100","3":"200"},{"1":"40","2":"100","3":"200"},{"1":"100","2":"100","3":"200"},{"1":"10","2":"101","3":"200"},{"1":"20","2":"101","3":"200"},{"1":"40","2":"101","3":"200"},{"1":"100","2":"101","3":"200"},{"1":"10","2":"102","3":"200"},{"1":"20","2":"102","3":"200"},{"1":"40","2":"102","3":"200"},{"1":"100","2":"102","3":"200"},{"1":"10","2":"103","3":"200"},{"1":"20","2":"103","3":"200"},{"1":"40","2":"103","3":"200"},{"1":"100","2":"103","3":"200"},{"1":"10","2":"104","3":"200"},{"1":"20","2":"104","3":"200"},{"1":"40","2":"104","3":"200"},{"1":"100","2":"104","3":"200"},{"1":"10","2":"105","3":"200"},{"1":"20","2":"105","3":"200"},{"1":"40","2":"105","3":"200"},{"1":"100","2":"105","3":"200"},{"1":"10","2":"106","3":"200"},{"1":"20","2":"106","3":"200"},{"1":"40","2":"106","3":"200"},{"1":"100","2":"106","3":"200"},{"1":"10","2":"107","3":"200"},{"1":"20","2":"107","3":"200"},{"1":"40","2":"107","3":"200"},{"1":"100","2":"107","3":"200"},{"1":"10","2":"108","3":"200"},{"1":"20","2":"108","3":"200"},{"1":"40","2":"108","3":"200"},{"1":"100","2":"108","3":"200"},{"1":"10","2":"109","3":"200"},{"1":"20","2":"109","3":"200"},{"1":"40","2":"109","3":"200"},{"1":"100","2":"109","3":"200"},{"1":"10","2":"110","3":"200"},{"1":"20","2":"110","3":"200"},{"1":"40","2":"110","3":"200"},{"1":"100","2":"110","3":"200"},{"1":"10","2":"111","3":"200"},{"1":"20","2":"111","3":"200"},{"1":"40","2":"111","3":"200"},{"1":"100","2":"111","3":"200"},{"1":"10","2":"112","3":"200"},{"1":"20","2":"112","3":"200"},{"1":"40","2":"112","3":"200"},{"1":"100","2":"112","3":"200"},{"1":"10","2":"113","3":"200"},{"1":"20","2":"113","3":"200"},{"1":"40","2":"113","3":"200"},{"1":"100","2":"113","3":"200"},{"1":"10","2":"114","3":"200"},{"1":"20","2":"114","3":"200"},{"1":"40","2":"114","3":"200"},{"1":"100","2":"114","3":"200"},{"1":"10","2":"115","3":"200"},{"1":"20","2":"115","3":"200"},{"1":"40","2":"115","3":"200"},{"1":"100","2":"115","3":"200"},{"1":"10","2":"116","3":"200"},{"1":"20","2":"116","3":"200"},{"1":"40","2":"116","3":"200"},{"1":"100","2":"116","3":"200"},{"1":"10","2":"117","3":"200"},{"1":"20","2":"117","3":"200"},{"1":"40","2":"117","3":"200"},{"1":"100","2":"117","3":"200"},{"1":"10","2":"118","3":"200"},{"1":"20","2":"118","3":"200"},{"1":"40","2":"118","3":"200"},{"1":"100","2":"118","3":"200"},{"1":"10","2":"119","3":"200"},{"1":"20","2":"119","3":"200"},{"1":"40","2":"119","3":"200"},{"1":"100","2":"119","3":"200"},{"1":"10","2":"120","3":"200"},{"1":"20","2":"120","3":"200"},{"1":"40","2":"120","3":"200"},{"1":"100","2":"120","3":"200"},{"1":"10","2":"121","3":"200"},{"1":"20","2":"121","3":"200"},{"1":"40","2":"121","3":"200"},{"1":"100","2":"121","3":"200"},{"1":"10","2":"122","3":"200"},{"1":"20","2":"122","3":"200"},{"1":"40","2":"122","3":"200"},{"1":"100","2":"122","3":"200"},{"1":"10","2":"123","3":"200"},{"1":"20","2":"123","3":"200"},{"1":"40","2":"123","3":"200"},{"1":"100","2":"123","3":"200"},{"1":"10","2":"124","3":"200"},{"1":"20","2":"124","3":"200"},{"1":"40","2":"124","3":"200"},{"1":"100","2":"124","3":"200"},{"1":"10","2":"125","3":"200"},{"1":"20","2":"125","3":"200"},{"1":"40","2":"125","3":"200"},{"1":"100","2":"125","3":"200"},{"1":"10","2":"126","3":"200"},{"1":"20","2":"126","3":"200"},{"1":"40","2":"126","3":"200"},{"1":"100","2":"126","3":"200"},{"1":"10","2":"127","3":"200"},{"1":"20","2":"127","3":"200"},{"1":"40","2":"127","3":"200"},{"1":"100","2":"127","3":"200"},{"1":"10","2":"128","3":"200"},{"1":"20","2":"128","3":"200"},{"1":"40","2":"128","3":"200"},{"1":"100","2":"128","3":"200"},{"1":"10","2":"129","3":"200"},{"1":"20","2":"129","3":"200"},{"1":"40","2":"129","3":"200"},{"1":"100","2":"129","3":"200"},{"1":"10","2":"130","3":"200"},{"1":"20","2":"130","3":"200"},{"1":"40","2":"130","3":"200"},{"1":"100","2":"130","3":"200"},{"1":"10","2":"131","3":"200"},{"1":"20","2":"131","3":"200"},{"1":"40","2":"131","3":"200"},{"1":"100","2":"131","3":"200"},{"1":"10","2":"132","3":"200"},{"1":"20","2":"132","3":"200"},{"1":"40","2":"132","3":"200"},{"1":"100","2":"132","3":"200"},{"1":"10","2":"133","3":"200"},{"1":"20","2":"133","3":"200"},{"1":"40","2":"133","3":"200"},{"1":"100","2":"133","3":"200"},{"1":"10","2":"134","3":"200"},{"1":"20","2":"134","3":"200"},{"1":"40","2":"134","3":"200"},{"1":"100","2":"134","3":"200"},{"1":"10","2":"135","3":"200"},{"1":"20","2":"135","3":"200"},{"1":"40","2":"135","3":"200"},{"1":"100","2":"135","3":"200"},{"1":"10","2":"136","3":"200"},{"1":"20","2":"136","3":"200"},{"1":"40","2":"136","3":"200"},{"1":"100","2":"136","3":"200"},{"1":"10","2":"137","3":"200"},{"1":"20","2":"137","3":"200"},{"1":"40","2":"137","3":"200"},{"1":"100","2":"137","3":"200"},{"1":"10","2":"138","3":"200"},{"1":"20","2":"138","3":"200"},{"1":"40","2":"138","3":"200"},{"1":"100","2":"138","3":"200"},{"1":"10","2":"139","3":"200"},{"1":"20","2":"139","3":"200"},{"1":"40","2":"139","3":"200"},{"1":"100","2":"139","3":"200"},{"1":"10","2":"140","3":"200"},{"1":"20","2":"140","3":"200"},{"1":"40","2":"140","3":"200"},{"1":"100","2":"140","3":"200"},{"1":"10","2":"141","3":"200"},{"1":"20","2":"141","3":"200"},{"1":"40","2":"141","3":"200"},{"1":"100","2":"141","3":"200"},{"1":"10","2":"142","3":"200"},{"1":"20","2":"142","3":"200"},{"1":"40","2":"142","3":"200"},{"1":"100","2":"142","3":"200"},{"1":"10","2":"143","3":"200"},{"1":"20","2":"143","3":"200"},{"1":"40","2":"143","3":"200"},{"1":"100","2":"143","3":"200"},{"1":"10","2":"144","3":"200"},{"1":"20","2":"144","3":"200"},{"1":"40","2":"144","3":"200"},{"1":"100","2":"144","3":"200"},{"1":"10","2":"145","3":"200"},{"1":"20","2":"145","3":"200"},{"1":"40","2":"145","3":"200"},{"1":"100","2":"145","3":"200"},{"1":"10","2":"146","3":"200"},{"1":"20","2":"146","3":"200"},{"1":"40","2":"146","3":"200"},{"1":"100","2":"146","3":"200"},{"1":"10","2":"147","3":"200"},{"1":"20","2":"147","3":"200"},{"1":"40","2":"147","3":"200"},{"1":"100","2":"147","3":"200"},{"1":"10","2":"148","3":"200"},{"1":"20","2":"148","3":"200"},{"1":"40","2":"148","3":"200"},{"1":"100","2":"148","3":"200"},{"1":"10","2":"149","3":"200"},{"1":"20","2":"149","3":"200"},{"1":"40","2":"149","3":"200"},{"1":"100","2":"149","3":"200"},{"1":"10","2":"150","3":"200"},{"1":"20","2":"150","3":"200"},{"1":"40","2":"150","3":"200"},{"1":"100","2":"150","3":"200"},{"1":"10","2":"151","3":"200"},{"1":"20","2":"151","3":"200"},{"1":"40","2":"151","3":"200"},{"1":"100","2":"151","3":"200"},{"1":"10","2":"152","3":"200"},{"1":"20","2":"152","3":"200"},{"1":"40","2":"152","3":"200"},{"1":"100","2":"152","3":"200"},{"1":"10","2":"153","3":"200"},{"1":"20","2":"153","3":"200"},{"1":"40","2":"153","3":"200"},{"1":"100","2":"153","3":"200"},{"1":"10","2":"154","3":"200"},{"1":"20","2":"154","3":"200"},{"1":"40","2":"154","3":"200"},{"1":"100","2":"154","3":"200"},{"1":"10","2":"155","3":"200"},{"1":"20","2":"155","3":"200"},{"1":"40","2":"155","3":"200"},{"1":"100","2":"155","3":"200"},{"1":"10","2":"156","3":"200"},{"1":"20","2":"156","3":"200"},{"1":"40","2":"156","3":"200"},{"1":"100","2":"156","3":"200"},{"1":"10","2":"157","3":"200"},{"1":"20","2":"157","3":"200"},{"1":"40","2":"157","3":"200"},{"1":"100","2":"157","3":"200"},{"1":"10","2":"158","3":"200"},{"1":"20","2":"158","3":"200"},{"1":"40","2":"158","3":"200"},{"1":"100","2":"158","3":"200"},{"1":"10","2":"159","3":"200"},{"1":"20","2":"159","3":"200"},{"1":"40","2":"159","3":"200"},{"1":"100","2":"159","3":"200"},{"1":"10","2":"160","3":"200"},{"1":"20","2":"160","3":"200"},{"1":"40","2":"160","3":"200"},{"1":"100","2":"160","3":"200"},{"1":"10","2":"161","3":"200"},{"1":"20","2":"161","3":"200"},{"1":"40","2":"161","3":"200"},{"1":"100","2":"161","3":"200"},{"1":"10","2":"162","3":"200"},{"1":"20","2":"162","3":"200"},{"1":"40","2":"162","3":"200"},{"1":"100","2":"162","3":"200"},{"1":"10","2":"163","3":"200"},{"1":"20","2":"163","3":"200"},{"1":"40","2":"163","3":"200"},{"1":"100","2":"163","3":"200"},{"1":"10","2":"164","3":"200"},{"1":"20","2":"164","3":"200"},{"1":"40","2":"164","3":"200"},{"1":"100","2":"164","3":"200"},{"1":"10","2":"165","3":"200"},{"1":"20","2":"165","3":"200"},{"1":"40","2":"165","3":"200"},{"1":"100","2":"165","3":"200"},{"1":"10","2":"166","3":"200"},{"1":"20","2":"166","3":"200"},{"1":"40","2":"166","3":"200"},{"1":"100","2":"166","3":"200"},{"1":"10","2":"167","3":"200"},{"1":"20","2":"167","3":"200"},{"1":"40","2":"167","3":"200"},{"1":"100","2":"167","3":"200"},{"1":"10","2":"168","3":"200"},{"1":"20","2":"168","3":"200"},{"1":"40","2":"168","3":"200"},{"1":"100","2":"168","3":"200"},{"1":"10","2":"169","3":"200"},{"1":"20","2":"169","3":"200"},{"1":"40","2":"169","3":"200"},{"1":"100","2":"169","3":"200"},{"1":"10","2":"170","3":"200"},{"1":"20","2":"170","3":"200"},{"1":"40","2":"170","3":"200"},{"1":"100","2":"170","3":"200"},{"1":"10","2":"171","3":"200"},{"1":"20","2":"171","3":"200"},{"1":"40","2":"171","3":"200"},{"1":"100","2":"171","3":"200"},{"1":"10","2":"172","3":"200"},{"1":"20","2":"172","3":"200"},{"1":"40","2":"172","3":"200"},{"1":"100","2":"172","3":"200"},{"1":"10","2":"173","3":"200"},{"1":"20","2":"173","3":"200"},{"1":"40","2":"173","3":"200"},{"1":"100","2":"173","3":"200"},{"1":"10","2":"174","3":"200"},{"1":"20","2":"174","3":"200"},{"1":"40","2":"174","3":"200"},{"1":"100","2":"174","3":"200"},{"1":"10","2":"175","3":"200"},{"1":"20","2":"175","3":"200"},{"1":"40","2":"175","3":"200"},{"1":"100","2":"175","3":"200"},{"1":"10","2":"176","3":"200"},{"1":"20","2":"176","3":"200"},{"1":"40","2":"176","3":"200"},{"1":"100","2":"176","3":"200"},{"1":"10","2":"177","3":"200"},{"1":"20","2":"177","3":"200"},{"1":"40","2":"177","3":"200"},{"1":"100","2":"177","3":"200"},{"1":"10","2":"178","3":"200"},{"1":"20","2":"178","3":"200"},{"1":"40","2":"178","3":"200"},{"1":"100","2":"178","3":"200"},{"1":"10","2":"179","3":"200"},{"1":"20","2":"179","3":"200"},{"1":"40","2":"179","3":"200"},{"1":"100","2":"179","3":"200"},{"1":"10","2":"180","3":"200"},{"1":"20","2":"180","3":"200"},{"1":"40","2":"180","3":"200"},{"1":"100","2":"180","3":"200"},{"1":"10","2":"181","3":"200"},{"1":"20","2":"181","3":"200"},{"1":"40","2":"181","3":"200"},{"1":"100","2":"181","3":"200"},{"1":"10","2":"182","3":"200"},{"1":"20","2":"182","3":"200"},{"1":"40","2":"182","3":"200"},{"1":"100","2":"182","3":"200"},{"1":"10","2":"183","3":"200"},{"1":"20","2":"183","3":"200"},{"1":"40","2":"183","3":"200"},{"1":"100","2":"183","3":"200"},{"1":"10","2":"184","3":"200"},{"1":"20","2":"184","3":"200"},{"1":"40","2":"184","3":"200"},{"1":"100","2":"184","3":"200"},{"1":"10","2":"185","3":"200"},{"1":"20","2":"185","3":"200"},{"1":"40","2":"185","3":"200"},{"1":"100","2":"185","3":"200"},{"1":"10","2":"186","3":"200"},{"1":"20","2":"186","3":"200"},{"1":"40","2":"186","3":"200"},{"1":"100","2":"186","3":"200"},{"1":"10","2":"187","3":"200"},{"1":"20","2":"187","3":"200"},{"1":"40","2":"187","3":"200"},{"1":"100","2":"187","3":"200"},{"1":"10","2":"188","3":"200"},{"1":"20","2":"188","3":"200"},{"1":"40","2":"188","3":"200"},{"1":"100","2":"188","3":"200"},{"1":"10","2":"189","3":"200"},{"1":"20","2":"189","3":"200"},{"1":"40","2":"189","3":"200"},{"1":"100","2":"189","3":"200"},{"1":"10","2":"190","3":"200"},{"1":"20","2":"190","3":"200"},{"1":"40","2":"190","3":"200"},{"1":"100","2":"190","3":"200"},{"1":"10","2":"191","3":"200"},{"1":"20","2":"191","3":"200"},{"1":"40","2":"191","3":"200"},{"1":"100","2":"191","3":"200"},{"1":"10","2":"192","3":"200"},{"1":"20","2":"192","3":"200"},{"1":"40","2":"192","3":"200"},{"1":"100","2":"192","3":"200"},{"1":"10","2":"193","3":"200"},{"1":"20","2":"193","3":"200"},{"1":"40","2":"193","3":"200"},{"1":"100","2":"193","3":"200"},{"1":"10","2":"194","3":"200"},{"1":"20","2":"194","3":"200"},{"1":"40","2":"194","3":"200"},{"1":"100","2":"194","3":"200"},{"1":"10","2":"195","3":"200"},{"1":"20","2":"195","3":"200"},{"1":"40","2":"195","3":"200"},{"1":"100","2":"195","3":"200"},{"1":"10","2":"196","3":"200"},{"1":"20","2":"196","3":"200"},{"1":"40","2":"196","3":"200"},{"1":"100","2":"196","3":"200"},{"1":"10","2":"197","3":"200"},{"1":"20","2":"197","3":"200"},{"1":"40","2":"197","3":"200"},{"1":"100","2":"197","3":"200"},{"1":"10","2":"198","3":"200"},{"1":"20","2":"198","3":"200"},{"1":"40","2":"198","3":"200"},{"1":"100","2":"198","3":"200"},{"1":"10","2":"199","3":"200"},{"1":"20","2":"199","3":"200"},{"1":"40","2":"199","3":"200"},{"1":"100","2":"199","3":"200"},{"1":"10","2":"200","3":"200"},{"1":"20","2":"200","3":"200"},{"1":"40","2":"200","3":"200"},{"1":"100","2":"200","3":"200"},{"1":"10","2":"201","3":"200"},{"1":"20","2":"201","3":"200"},{"1":"40","2":"201","3":"200"},{"1":"100","2":"201","3":"200"},{"1":"10","2":"202","3":"200"},{"1":"20","2":"202","3":"200"},{"1":"40","2":"202","3":"200"},{"1":"100","2":"202","3":"200"},{"1":"10","2":"203","3":"200"},{"1":"20","2":"203","3":"200"},{"1":"40","2":"203","3":"200"},{"1":"100","2":"203","3":"200"},{"1":"10","2":"204","3":"200"},{"1":"20","2":"204","3":"200"},{"1":"40","2":"204","3":"200"},{"1":"100","2":"204","3":"200"},{"1":"10","2":"205","3":"200"},{"1":"20","2":"205","3":"200"},{"1":"40","2":"205","3":"200"},{"1":"100","2":"205","3":"200"},{"1":"10","2":"206","3":"200"},{"1":"20","2":"206","3":"200"},{"1":"40","2":"206","3":"200"},{"1":"100","2":"206","3":"200"},{"1":"10","2":"207","3":"200"},{"1":"20","2":"207","3":"200"},{"1":"40","2":"207","3":"200"},{"1":"100","2":"207","3":"200"},{"1":"10","2":"208","3":"200"},{"1":"20","2":"208","3":"200"},{"1":"40","2":"208","3":"200"},{"1":"100","2":"208","3":"200"},{"1":"10","2":"209","3":"200"},{"1":"20","2":"209","3":"200"},{"1":"40","2":"209","3":"200"},{"1":"100","2":"209","3":"200"},{"1":"10","2":"210","3":"200"},{"1":"20","2":"210","3":"200"},{"1":"40","2":"210","3":"200"},{"1":"100","2":"210","3":"200"},{"1":"10","2":"211","3":"200"},{"1":"20","2":"211","3":"200"},{"1":"40","2":"211","3":"200"},{"1":"100","2":"211","3":"200"},{"1":"10","2":"212","3":"200"},{"1":"20","2":"212","3":"200"},{"1":"40","2":"212","3":"200"},{"1":"100","2":"212","3":"200"},{"1":"10","2":"213","3":"200"},{"1":"20","2":"213","3":"200"},{"1":"40","2":"213","3":"200"},{"1":"100","2":"213","3":"200"},{"1":"10","2":"214","3":"200"},{"1":"20","2":"214","3":"200"},{"1":"40","2":"214","3":"200"},{"1":"100","2":"214","3":"200"},{"1":"10","2":"215","3":"200"},{"1":"20","2":"215","3":"200"},{"1":"40","2":"215","3":"200"},{"1":"100","2":"215","3":"200"},{"1":"10","2":"216","3":"200"},{"1":"20","2":"216","3":"200"},{"1":"40","2":"216","3":"200"},{"1":"100","2":"216","3":"200"},{"1":"10","2":"217","3":"200"},{"1":"20","2":"217","3":"200"},{"1":"40","2":"217","3":"200"},{"1":"100","2":"217","3":"200"},{"1":"10","2":"218","3":"200"},{"1":"20","2":"218","3":"200"},{"1":"40","2":"218","3":"200"},{"1":"100","2":"218","3":"200"},{"1":"10","2":"219","3":"200"},{"1":"20","2":"219","3":"200"},{"1":"40","2":"219","3":"200"},{"1":"100","2":"219","3":"200"},{"1":"10","2":"220","3":"200"},{"1":"20","2":"220","3":"200"},{"1":"40","2":"220","3":"200"},{"1":"100","2":"220","3":"200"},{"1":"10","2":"221","3":"200"},{"1":"20","2":"221","3":"200"},{"1":"40","2":"221","3":"200"},{"1":"100","2":"221","3":"200"},{"1":"10","2":"222","3":"200"},{"1":"20","2":"222","3":"200"},{"1":"40","2":"222","3":"200"},{"1":"100","2":"222","3":"200"},{"1":"10","2":"223","3":"200"},{"1":"20","2":"223","3":"200"},{"1":"40","2":"223","3":"200"},{"1":"100","2":"223","3":"200"},{"1":"10","2":"224","3":"200"},{"1":"20","2":"224","3":"200"},{"1":"40","2":"224","3":"200"},{"1":"100","2":"224","3":"200"},{"1":"10","2":"225","3":"200"},{"1":"20","2":"225","3":"200"},{"1":"40","2":"225","3":"200"},{"1":"100","2":"225","3":"200"},{"1":"10","2":"226","3":"200"},{"1":"20","2":"226","3":"200"},{"1":"40","2":"226","3":"200"},{"1":"100","2":"226","3":"200"},{"1":"10","2":"227","3":"200"},{"1":"20","2":"227","3":"200"},{"1":"40","2":"227","3":"200"},{"1":"100","2":"227","3":"200"},{"1":"10","2":"228","3":"200"},{"1":"20","2":"228","3":"200"},{"1":"40","2":"228","3":"200"},{"1":"100","2":"228","3":"200"},{"1":"10","2":"229","3":"200"},{"1":"20","2":"229","3":"200"},{"1":"40","2":"229","3":"200"},{"1":"100","2":"229","3":"200"},{"1":"10","2":"230","3":"200"},{"1":"20","2":"230","3":"200"},{"1":"40","2":"230","3":"200"},{"1":"100","2":"230","3":"200"},{"1":"10","2":"231","3":"200"},{"1":"20","2":"231","3":"200"},{"1":"40","2":"231","3":"200"},{"1":"100","2":"231","3":"200"},{"1":"10","2":"232","3":"200"},{"1":"20","2":"232","3":"200"},{"1":"40","2":"232","3":"200"},{"1":"100","2":"232","3":"200"},{"1":"10","2":"233","3":"200"},{"1":"20","2":"233","3":"200"},{"1":"40","2":"233","3":"200"},{"1":"100","2":"233","3":"200"},{"1":"10","2":"234","3":"200"},{"1":"20","2":"234","3":"200"},{"1":"40","2":"234","3":"200"},{"1":"100","2":"234","3":"200"},{"1":"10","2":"235","3":"200"},{"1":"20","2":"235","3":"200"},{"1":"40","2":"235","3":"200"},{"1":"100","2":"235","3":"200"},{"1":"10","2":"236","3":"200"},{"1":"20","2":"236","3":"200"},{"1":"40","2":"236","3":"200"},{"1":"100","2":"236","3":"200"},{"1":"10","2":"237","3":"200"},{"1":"20","2":"237","3":"200"},{"1":"40","2":"237","3":"200"},{"1":"100","2":"237","3":"200"},{"1":"10","2":"238","3":"200"},{"1":"20","2":"238","3":"200"},{"1":"40","2":"238","3":"200"},{"1":"100","2":"238","3":"200"},{"1":"10","2":"239","3":"200"},{"1":"20","2":"239","3":"200"},{"1":"40","2":"239","3":"200"},{"1":"100","2":"239","3":"200"},{"1":"10","2":"240","3":"200"},{"1":"20","2":"240","3":"200"},{"1":"40","2":"240","3":"200"},{"1":"100","2":"240","3":"200"},{"1":"10","2":"241","3":"200"},{"1":"20","2":"241","3":"200"},{"1":"40","2":"241","3":"200"},{"1":"100","2":"241","3":"200"},{"1":"10","2":"242","3":"200"},{"1":"20","2":"242","3":"200"},{"1":"40","2":"242","3":"200"},{"1":"100","2":"242","3":"200"},{"1":"10","2":"243","3":"200"},{"1":"20","2":"243","3":"200"},{"1":"40","2":"243","3":"200"},{"1":"100","2":"243","3":"200"},{"1":"10","2":"244","3":"200"},{"1":"20","2":"244","3":"200"},{"1":"40","2":"244","3":"200"},{"1":"100","2":"244","3":"200"},{"1":"10","2":"245","3":"200"},{"1":"20","2":"245","3":"200"},{"1":"40","2":"245","3":"200"},{"1":"100","2":"245","3":"200"},{"1":"10","2":"246","3":"200"},{"1":"20","2":"246","3":"200"},{"1":"40","2":"246","3":"200"},{"1":"100","2":"246","3":"200"},{"1":"10","2":"247","3":"200"},{"1":"20","2":"247","3":"200"},{"1":"40","2":"247","3":"200"},{"1":"100","2":"247","3":"200"},{"1":"10","2":"248","3":"200"},{"1":"20","2":"248","3":"200"},{"1":"40","2":"248","3":"200"},{"1":"100","2":"248","3":"200"},{"1":"10","2":"249","3":"200"},{"1":"20","2":"249","3":"200"},{"1":"40","2":"249","3":"200"},{"1":"100","2":"249","3":"200"},{"1":"10","2":"250","3":"200"},{"1":"20","2":"250","3":"200"},{"1":"40","2":"250","3":"200"},{"1":"100","2":"250","3":"200"},{"1":"10","2":"251","3":"200"},{"1":"20","2":"251","3":"200"},{"1":"40","2":"251","3":"200"},{"1":"100","2":"251","3":"200"},{"1":"10","2":"252","3":"200"},{"1":"20","2":"252","3":"200"},{"1":"40","2":"252","3":"200"},{"1":"100","2":"252","3":"200"},{"1":"10","2":"253","3":"200"},{"1":"20","2":"253","3":"200"},{"1":"40","2":"253","3":"200"},{"1":"100","2":"253","3":"200"},{"1":"10","2":"254","3":"200"},{"1":"20","2":"254","3":"200"},{"1":"40","2":"254","3":"200"},{"1":"100","2":"254","3":"200"},{"1":"10","2":"255","3":"200"},{"1":"20","2":"255","3":"200"},{"1":"40","2":"255","3":"200"},{"1":"100","2":"255","3":"200"},{"1":"10","2":"256","3":"200"},{"1":"20","2":"256","3":"200"},{"1":"40","2":"256","3":"200"},{"1":"100","2":"256","3":"200"},{"1":"10","2":"257","3":"200"},{"1":"20","2":"257","3":"200"},{"1":"40","2":"257","3":"200"},{"1":"100","2":"257","3":"200"},{"1":"10","2":"258","3":"200"},{"1":"20","2":"258","3":"200"},{"1":"40","2":"258","3":"200"},{"1":"100","2":"258","3":"200"},{"1":"10","2":"259","3":"200"},{"1":"20","2":"259","3":"200"},{"1":"40","2":"259","3":"200"},{"1":"100","2":"259","3":"200"},{"1":"10","2":"260","3":"200"},{"1":"20","2":"260","3":"200"},{"1":"40","2":"260","3":"200"},{"1":"100","2":"260","3":"200"},{"1":"10","2":"261","3":"200"},{"1":"20","2":"261","3":"200"},{"1":"40","2":"261","3":"200"},{"1":"100","2":"261","3":"200"},{"1":"10","2":"262","3":"200"},{"1":"20","2":"262","3":"200"},{"1":"40","2":"262","3":"200"},{"1":"100","2":"262","3":"200"},{"1":"10","2":"263","3":"200"},{"1":"20","2":"263","3":"200"},{"1":"40","2":"263","3":"200"},{"1":"100","2":"263","3":"200"},{"1":"10","2":"264","3":"200"},{"1":"20","2":"264","3":"200"},{"1":"40","2":"264","3":"200"},{"1":"100","2":"264","3":"200"},{"1":"10","2":"265","3":"200"},{"1":"20","2":"265","3":"200"},{"1":"40","2":"265","3":"200"},{"1":"100","2":"265","3":"200"},{"1":"10","2":"266","3":"200"},{"1":"20","2":"266","3":"200"},{"1":"40","2":"266","3":"200"},{"1":"100","2":"266","3":"200"},{"1":"10","2":"267","3":"200"},{"1":"20","2":"267","3":"200"},{"1":"40","2":"267","3":"200"},{"1":"100","2":"267","3":"200"},{"1":"10","2":"268","3":"200"},{"1":"20","2":"268","3":"200"},{"1":"40","2":"268","3":"200"},{"1":"100","2":"268","3":"200"},{"1":"10","2":"269","3":"200"},{"1":"20","2":"269","3":"200"},{"1":"40","2":"269","3":"200"},{"1":"100","2":"269","3":"200"},{"1":"10","2":"270","3":"200"},{"1":"20","2":"270","3":"200"},{"1":"40","2":"270","3":"200"},{"1":"100","2":"270","3":"200"},{"1":"10","2":"271","3":"200"},{"1":"20","2":"271","3":"200"},{"1":"40","2":"271","3":"200"},{"1":"100","2":"271","3":"200"},{"1":"10","2":"272","3":"200"},{"1":"20","2":"272","3":"200"},{"1":"40","2":"272","3":"200"},{"1":"100","2":"272","3":"200"},{"1":"10","2":"273","3":"200"},{"1":"20","2":"273","3":"200"},{"1":"40","2":"273","3":"200"},{"1":"100","2":"273","3":"200"},{"1":"10","2":"274","3":"200"},{"1":"20","2":"274","3":"200"},{"1":"40","2":"274","3":"200"},{"1":"100","2":"274","3":"200"},{"1":"10","2":"275","3":"200"},{"1":"20","2":"275","3":"200"},{"1":"40","2":"275","3":"200"},{"1":"100","2":"275","3":"200"},{"1":"10","2":"276","3":"200"},{"1":"20","2":"276","3":"200"},{"1":"40","2":"276","3":"200"},{"1":"100","2":"276","3":"200"},{"1":"10","2":"277","3":"200"},{"1":"20","2":"277","3":"200"},{"1":"40","2":"277","3":"200"},{"1":"100","2":"277","3":"200"},{"1":"10","2":"278","3":"200"},{"1":"20","2":"278","3":"200"},{"1":"40","2":"278","3":"200"},{"1":"100","2":"278","3":"200"},{"1":"10","2":"279","3":"200"},{"1":"20","2":"279","3":"200"},{"1":"40","2":"279","3":"200"},{"1":"100","2":"279","3":"200"},{"1":"10","2":"280","3":"200"},{"1":"20","2":"280","3":"200"},{"1":"40","2":"280","3":"200"},{"1":"100","2":"280","3":"200"},{"1":"10","2":"281","3":"200"},{"1":"20","2":"281","3":"200"},{"1":"40","2":"281","3":"200"},{"1":"100","2":"281","3":"200"},{"1":"10","2":"282","3":"200"},{"1":"20","2":"282","3":"200"},{"1":"40","2":"282","3":"200"},{"1":"100","2":"282","3":"200"},{"1":"10","2":"283","3":"200"},{"1":"20","2":"283","3":"200"},{"1":"40","2":"283","3":"200"},{"1":"100","2":"283","3":"200"},{"1":"10","2":"284","3":"200"},{"1":"20","2":"284","3":"200"},{"1":"40","2":"284","3":"200"},{"1":"100","2":"284","3":"200"},{"1":"10","2":"285","3":"200"},{"1":"20","2":"285","3":"200"},{"1":"40","2":"285","3":"200"},{"1":"100","2":"285","3":"200"},{"1":"10","2":"286","3":"200"},{"1":"20","2":"286","3":"200"},{"1":"40","2":"286","3":"200"},{"1":"100","2":"286","3":"200"},{"1":"10","2":"287","3":"200"},{"1":"20","2":"287","3":"200"},{"1":"40","2":"287","3":"200"},{"1":"100","2":"287","3":"200"},{"1":"10","2":"288","3":"200"},{"1":"20","2":"288","3":"200"},{"1":"40","2":"288","3":"200"},{"1":"100","2":"288","3":"200"},{"1":"10","2":"289","3":"200"},{"1":"20","2":"289","3":"200"},{"1":"40","2":"289","3":"200"},{"1":"100","2":"289","3":"200"},{"1":"10","2":"290","3":"200"},{"1":"20","2":"290","3":"200"},{"1":"40","2":"290","3":"200"},{"1":"100","2":"290","3":"200"},{"1":"10","2":"291","3":"200"},{"1":"20","2":"291","3":"200"},{"1":"40","2":"291","3":"200"},{"1":"100","2":"291","3":"200"},{"1":"10","2":"292","3":"200"},{"1":"20","2":"292","3":"200"},{"1":"40","2":"292","3":"200"},{"1":"100","2":"292","3":"200"},{"1":"10","2":"293","3":"200"},{"1":"20","2":"293","3":"200"},{"1":"40","2":"293","3":"200"},{"1":"100","2":"293","3":"200"},{"1":"10","2":"294","3":"200"},{"1":"20","2":"294","3":"200"},{"1":"40","2":"294","3":"200"},{"1":"100","2":"294","3":"200"},{"1":"10","2":"295","3":"200"},{"1":"20","2":"295","3":"200"},{"1":"40","2":"295","3":"200"},{"1":"100","2":"295","3":"200"},{"1":"10","2":"296","3":"200"},{"1":"20","2":"296","3":"200"},{"1":"40","2":"296","3":"200"},{"1":"100","2":"296","3":"200"},{"1":"10","2":"297","3":"200"},{"1":"20","2":"297","3":"200"},{"1":"40","2":"297","3":"200"},{"1":"100","2":"297","3":"200"},{"1":"10","2":"298","3":"200"},{"1":"20","2":"298","3":"200"},{"1":"40","2":"298","3":"200"},{"1":"100","2":"298","3":"200"},{"1":"10","2":"299","3":"200"},{"1":"20","2":"299","3":"200"},{"1":"40","2":"299","3":"200"},{"1":"100","2":"299","3":"200"},{"1":"10","2":"300","3":"200"},{"1":"20","2":"300","3":"200"},{"1":"40","2":"300","3":"200"},{"1":"100","2":"300","3":"200"},{"1":"10","2":"301","3":"200"},{"1":"20","2":"301","3":"200"},{"1":"40","2":"301","3":"200"},{"1":"100","2":"301","3":"200"},{"1":"10","2":"302","3":"200"},{"1":"20","2":"302","3":"200"},{"1":"40","2":"302","3":"200"},{"1":"100","2":"302","3":"200"},{"1":"10","2":"303","3":"200"},{"1":"20","2":"303","3":"200"},{"1":"40","2":"303","3":"200"},{"1":"100","2":"303","3":"200"},{"1":"10","2":"304","3":"200"},{"1":"20","2":"304","3":"200"},{"1":"40","2":"304","3":"200"},{"1":"100","2":"304","3":"200"},{"1":"10","2":"305","3":"200"},{"1":"20","2":"305","3":"200"},{"1":"40","2":"305","3":"200"},{"1":"100","2":"305","3":"200"},{"1":"10","2":"306","3":"200"},{"1":"20","2":"306","3":"200"},{"1":"40","2":"306","3":"200"},{"1":"100","2":"306","3":"200"},{"1":"10","2":"307","3":"200"},{"1":"20","2":"307","3":"200"},{"1":"40","2":"307","3":"200"},{"1":"100","2":"307","3":"200"},{"1":"10","2":"308","3":"200"},{"1":"20","2":"308","3":"200"},{"1":"40","2":"308","3":"200"},{"1":"100","2":"308","3":"200"},{"1":"10","2":"309","3":"200"},{"1":"20","2":"309","3":"200"},{"1":"40","2":"309","3":"200"},{"1":"100","2":"309","3":"200"},{"1":"10","2":"310","3":"200"},{"1":"20","2":"310","3":"200"},{"1":"40","2":"310","3":"200"},{"1":"100","2":"310","3":"200"},{"1":"10","2":"311","3":"200"},{"1":"20","2":"311","3":"200"},{"1":"40","2":"311","3":"200"},{"1":"100","2":"311","3":"200"},{"1":"10","2":"312","3":"200"},{"1":"20","2":"312","3":"200"},{"1":"40","2":"312","3":"200"},{"1":"100","2":"312","3":"200"},{"1":"10","2":"313","3":"200"},{"1":"20","2":"313","3":"200"},{"1":"40","2":"313","3":"200"},{"1":"100","2":"313","3":"200"},{"1":"10","2":"314","3":"200"},{"1":"20","2":"314","3":"200"},{"1":"40","2":"314","3":"200"},{"1":"100","2":"314","3":"200"},{"1":"10","2":"315","3":"200"},{"1":"20","2":"315","3":"200"},{"1":"40","2":"315","3":"200"},{"1":"100","2":"315","3":"200"},{"1":"10","2":"316","3":"200"},{"1":"20","2":"316","3":"200"},{"1":"40","2":"316","3":"200"},{"1":"100","2":"316","3":"200"},{"1":"10","2":"317","3":"200"},{"1":"20","2":"317","3":"200"},{"1":"40","2":"317","3":"200"},{"1":"100","2":"317","3":"200"},{"1":"10","2":"318","3":"200"},{"1":"20","2":"318","3":"200"},{"1":"40","2":"318","3":"200"},{"1":"100","2":"318","3":"200"},{"1":"10","2":"319","3":"200"},{"1":"20","2":"319","3":"200"},{"1":"40","2":"319","3":"200"},{"1":"100","2":"319","3":"200"},{"1":"10","2":"320","3":"200"},{"1":"20","2":"320","3":"200"},{"1":"40","2":"320","3":"200"},{"1":"100","2":"320","3":"200"},{"1":"10","2":"321","3":"200"},{"1":"20","2":"321","3":"200"},{"1":"40","2":"321","3":"200"},{"1":"100","2":"321","3":"200"},{"1":"10","2":"322","3":"200"},{"1":"20","2":"322","3":"200"},{"1":"40","2":"322","3":"200"},{"1":"100","2":"322","3":"200"},{"1":"10","2":"323","3":"200"},{"1":"20","2":"323","3":"200"},{"1":"40","2":"323","3":"200"},{"1":"100","2":"323","3":"200"},{"1":"10","2":"324","3":"200"},{"1":"20","2":"324","3":"200"},{"1":"40","2":"324","3":"200"},{"1":"100","2":"324","3":"200"},{"1":"10","2":"325","3":"200"},{"1":"20","2":"325","3":"200"},{"1":"40","2":"325","3":"200"},{"1":"100","2":"325","3":"200"},{"1":"10","2":"326","3":"200"},{"1":"20","2":"326","3":"200"},{"1":"40","2":"326","3":"200"},{"1":"100","2":"326","3":"200"},{"1":"10","2":"327","3":"200"},{"1":"20","2":"327","3":"200"},{"1":"40","2":"327","3":"200"},{"1":"100","2":"327","3":"200"},{"1":"10","2":"328","3":"200"},{"1":"20","2":"328","3":"200"},{"1":"40","2":"328","3":"200"},{"1":"100","2":"328","3":"200"},{"1":"10","2":"329","3":"200"},{"1":"20","2":"329","3":"200"},{"1":"40","2":"329","3":"200"},{"1":"100","2":"329","3":"200"},{"1":"10","2":"330","3":"200"},{"1":"20","2":"330","3":"200"},{"1":"40","2":"330","3":"200"},{"1":"100","2":"330","3":"200"},{"1":"10","2":"331","3":"200"},{"1":"20","2":"331","3":"200"},{"1":"40","2":"331","3":"200"},{"1":"100","2":"331","3":"200"},{"1":"10","2":"332","3":"200"},{"1":"20","2":"332","3":"200"},{"1":"40","2":"332","3":"200"},{"1":"100","2":"332","3":"200"},{"1":"10","2":"333","3":"200"},{"1":"20","2":"333","3":"200"},{"1":"40","2":"333","3":"200"},{"1":"100","2":"333","3":"200"},{"1":"10","2":"334","3":"200"},{"1":"20","2":"334","3":"200"},{"1":"40","2":"334","3":"200"},{"1":"100","2":"334","3":"200"},{"1":"10","2":"335","3":"200"},{"1":"20","2":"335","3":"200"},{"1":"40","2":"335","3":"200"},{"1":"100","2":"335","3":"200"},{"1":"10","2":"336","3":"200"},{"1":"20","2":"336","3":"200"},{"1":"40","2":"336","3":"200"},{"1":"100","2":"336","3":"200"},{"1":"10","2":"337","3":"200"},{"1":"20","2":"337","3":"200"},{"1":"40","2":"337","3":"200"},{"1":"100","2":"337","3":"200"},{"1":"10","2":"338","3":"200"},{"1":"20","2":"338","3":"200"},{"1":"40","2":"338","3":"200"},{"1":"100","2":"338","3":"200"},{"1":"10","2":"339","3":"200"},{"1":"20","2":"339","3":"200"},{"1":"40","2":"339","3":"200"},{"1":"100","2":"339","3":"200"},{"1":"10","2":"340","3":"200"},{"1":"20","2":"340","3":"200"},{"1":"40","2":"340","3":"200"},{"1":"100","2":"340","3":"200"},{"1":"10","2":"341","3":"200"},{"1":"20","2":"341","3":"200"},{"1":"40","2":"341","3":"200"},{"1":"100","2":"341","3":"200"},{"1":"10","2":"342","3":"200"},{"1":"20","2":"342","3":"200"},{"1":"40","2":"342","3":"200"},{"1":"100","2":"342","3":"200"},{"1":"10","2":"343","3":"200"},{"1":"20","2":"343","3":"200"},{"1":"40","2":"343","3":"200"},{"1":"100","2":"343","3":"200"},{"1":"10","2":"344","3":"200"},{"1":"20","2":"344","3":"200"},{"1":"40","2":"344","3":"200"},{"1":"100","2":"344","3":"200"},{"1":"10","2":"345","3":"200"},{"1":"20","2":"345","3":"200"},{"1":"40","2":"345","3":"200"},{"1":"100","2":"345","3":"200"},{"1":"10","2":"346","3":"200"},{"1":"20","2":"346","3":"200"},{"1":"40","2":"346","3":"200"},{"1":"100","2":"346","3":"200"},{"1":"10","2":"347","3":"200"},{"1":"20","2":"347","3":"200"},{"1":"40","2":"347","3":"200"},{"1":"100","2":"347","3":"200"},{"1":"10","2":"348","3":"200"},{"1":"20","2":"348","3":"200"},{"1":"40","2":"348","3":"200"},{"1":"100","2":"348","3":"200"},{"1":"10","2":"349","3":"200"},{"1":"20","2":"349","3":"200"},{"1":"40","2":"349","3":"200"},{"1":"100","2":"349","3":"200"},{"1":"10","2":"350","3":"200"},{"1":"20","2":"350","3":"200"},{"1":"40","2":"350","3":"200"},{"1":"100","2":"350","3":"200"},{"1":"10","2":"351","3":"200"},{"1":"20","2":"351","3":"200"},{"1":"40","2":"351","3":"200"},{"1":"100","2":"351","3":"200"},{"1":"10","2":"352","3":"200"},{"1":"20","2":"352","3":"200"},{"1":"40","2":"352","3":"200"},{"1":"100","2":"352","3":"200"},{"1":"10","2":"353","3":"200"},{"1":"20","2":"353","3":"200"},{"1":"40","2":"353","3":"200"},{"1":"100","2":"353","3":"200"},{"1":"10","2":"354","3":"200"},{"1":"20","2":"354","3":"200"},{"1":"40","2":"354","3":"200"},{"1":"100","2":"354","3":"200"},{"1":"10","2":"355","3":"200"},{"1":"20","2":"355","3":"200"},{"1":"40","2":"355","3":"200"},{"1":"100","2":"355","3":"200"},{"1":"10","2":"356","3":"200"},{"1":"20","2":"356","3":"200"},{"1":"40","2":"356","3":"200"},{"1":"100","2":"356","3":"200"},{"1":"10","2":"357","3":"200"},{"1":"20","2":"357","3":"200"},{"1":"40","2":"357","3":"200"},{"1":"100","2":"357","3":"200"},{"1":"10","2":"358","3":"200"},{"1":"20","2":"358","3":"200"},{"1":"40","2":"358","3":"200"},{"1":"100","2":"358","3":"200"},{"1":"10","2":"359","3":"200"},{"1":"20","2":"359","3":"200"},{"1":"40","2":"359","3":"200"},{"1":"100","2":"359","3":"200"},{"1":"10","2":"360","3":"200"},{"1":"20","2":"360","3":"200"},{"1":"40","2":"360","3":"200"},{"1":"100","2":"360","3":"200"},{"1":"10","2":"361","3":"200"},{"1":"20","2":"361","3":"200"},{"1":"40","2":"361","3":"200"},{"1":"100","2":"361","3":"200"},{"1":"10","2":"362","3":"200"},{"1":"20","2":"362","3":"200"},{"1":"40","2":"362","3":"200"},{"1":"100","2":"362","3":"200"},{"1":"10","2":"363","3":"200"},{"1":"20","2":"363","3":"200"},{"1":"40","2":"363","3":"200"},{"1":"100","2":"363","3":"200"},{"1":"10","2":"364","3":"200"},{"1":"20","2":"364","3":"200"},{"1":"40","2":"364","3":"200"},{"1":"100","2":"364","3":"200"},{"1":"10","2":"365","3":"200"},{"1":"20","2":"365","3":"200"},{"1":"40","2":"365","3":"200"},{"1":"100","2":"365","3":"200"},{"1":"10","2":"366","3":"200"},{"1":"20","2":"366","3":"200"},{"1":"40","2":"366","3":"200"},{"1":"100","2":"366","3":"200"},{"1":"10","2":"367","3":"200"},{"1":"20","2":"367","3":"200"},{"1":"40","2":"367","3":"200"},{"1":"100","2":"367","3":"200"},{"1":"10","2":"368","3":"200"},{"1":"20","2":"368","3":"200"},{"1":"40","2":"368","3":"200"},{"1":"100","2":"368","3":"200"},{"1":"10","2":"369","3":"200"},{"1":"20","2":"369","3":"200"},{"1":"40","2":"369","3":"200"},{"1":"100","2":"369","3":"200"},{"1":"10","2":"370","3":"200"},{"1":"20","2":"370","3":"200"},{"1":"40","2":"370","3":"200"},{"1":"100","2":"370","3":"200"},{"1":"10","2":"371","3":"200"},{"1":"20","2":"371","3":"200"},{"1":"40","2":"371","3":"200"},{"1":"100","2":"371","3":"200"},{"1":"10","2":"372","3":"200"},{"1":"20","2":"372","3":"200"},{"1":"40","2":"372","3":"200"},{"1":"100","2":"372","3":"200"},{"1":"10","2":"373","3":"200"},{"1":"20","2":"373","3":"200"},{"1":"40","2":"373","3":"200"},{"1":"100","2":"373","3":"200"},{"1":"10","2":"374","3":"200"},{"1":"20","2":"374","3":"200"},{"1":"40","2":"374","3":"200"},{"1":"100","2":"374","3":"200"},{"1":"10","2":"375","3":"200"},{"1":"20","2":"375","3":"200"},{"1":"40","2":"375","3":"200"},{"1":"100","2":"375","3":"200"},{"1":"10","2":"376","3":"200"},{"1":"20","2":"376","3":"200"},{"1":"40","2":"376","3":"200"},{"1":"100","2":"376","3":"200"},{"1":"10","2":"377","3":"200"},{"1":"20","2":"377","3":"200"},{"1":"40","2":"377","3":"200"},{"1":"100","2":"377","3":"200"},{"1":"10","2":"378","3":"200"},{"1":"20","2":"378","3":"200"},{"1":"40","2":"378","3":"200"},{"1":"100","2":"378","3":"200"},{"1":"10","2":"379","3":"200"},{"1":"20","2":"379","3":"200"},{"1":"40","2":"379","3":"200"},{"1":"100","2":"379","3":"200"},{"1":"10","2":"380","3":"200"},{"1":"20","2":"380","3":"200"},{"1":"40","2":"380","3":"200"},{"1":"100","2":"380","3":"200"},{"1":"10","2":"381","3":"200"},{"1":"20","2":"381","3":"200"},{"1":"40","2":"381","3":"200"},{"1":"100","2":"381","3":"200"},{"1":"10","2":"382","3":"200"},{"1":"20","2":"382","3":"200"},{"1":"40","2":"382","3":"200"},{"1":"100","2":"382","3":"200"},{"1":"10","2":"383","3":"200"},{"1":"20","2":"383","3":"200"},{"1":"40","2":"383","3":"200"},{"1":"100","2":"383","3":"200"},{"1":"10","2":"384","3":"200"},{"1":"20","2":"384","3":"200"},{"1":"40","2":"384","3":"200"},{"1":"100","2":"384","3":"200"},{"1":"10","2":"385","3":"200"},{"1":"20","2":"385","3":"200"},{"1":"40","2":"385","3":"200"},{"1":"100","2":"385","3":"200"},{"1":"10","2":"386","3":"200"},{"1":"20","2":"386","3":"200"},{"1":"40","2":"386","3":"200"},{"1":"100","2":"386","3":"200"},{"1":"10","2":"387","3":"200"},{"1":"20","2":"387","3":"200"},{"1":"40","2":"387","3":"200"},{"1":"100","2":"387","3":"200"},{"1":"10","2":"388","3":"200"},{"1":"20","2":"388","3":"200"},{"1":"40","2":"388","3":"200"},{"1":"100","2":"388","3":"200"},{"1":"10","2":"389","3":"200"},{"1":"20","2":"389","3":"200"},{"1":"40","2":"389","3":"200"},{"1":"100","2":"389","3":"200"},{"1":"10","2":"390","3":"200"},{"1":"20","2":"390","3":"200"},{"1":"40","2":"390","3":"200"},{"1":"100","2":"390","3":"200"},{"1":"10","2":"391","3":"200"},{"1":"20","2":"391","3":"200"},{"1":"40","2":"391","3":"200"},{"1":"100","2":"391","3":"200"},{"1":"10","2":"392","3":"200"},{"1":"20","2":"392","3":"200"},{"1":"40","2":"392","3":"200"},{"1":"100","2":"392","3":"200"},{"1":"10","2":"393","3":"200"},{"1":"20","2":"393","3":"200"},{"1":"40","2":"393","3":"200"},{"1":"100","2":"393","3":"200"},{"1":"10","2":"394","3":"200"},{"1":"20","2":"394","3":"200"},{"1":"40","2":"394","3":"200"},{"1":"100","2":"394","3":"200"},{"1":"10","2":"395","3":"200"},{"1":"20","2":"395","3":"200"},{"1":"40","2":"395","3":"200"},{"1":"100","2":"395","3":"200"},{"1":"10","2":"396","3":"200"},{"1":"20","2":"396","3":"200"},{"1":"40","2":"396","3":"200"},{"1":"100","2":"396","3":"200"},{"1":"10","2":"397","3":"200"},{"1":"20","2":"397","3":"200"},{"1":"40","2":"397","3":"200"},{"1":"100","2":"397","3":"200"},{"1":"10","2":"398","3":"200"},{"1":"20","2":"398","3":"200"},{"1":"40","2":"398","3":"200"},{"1":"100","2":"398","3":"200"},{"1":"10","2":"399","3":"200"},{"1":"20","2":"399","3":"200"},{"1":"40","2":"399","3":"200"},{"1":"100","2":"399","3":"200"},{"1":"10","2":"400","3":"200"},{"1":"20","2":"400","3":"200"},{"1":"40","2":"400","3":"200"},{"1":"100","2":"400","3":"200"},{"1":"10","2":"401","3":"200"},{"1":"20","2":"401","3":"200"},{"1":"40","2":"401","3":"200"},{"1":"100","2":"401","3":"200"},{"1":"10","2":"402","3":"200"},{"1":"20","2":"402","3":"200"},{"1":"40","2":"402","3":"200"},{"1":"100","2":"402","3":"200"},{"1":"10","2":"403","3":"200"},{"1":"20","2":"403","3":"200"},{"1":"40","2":"403","3":"200"},{"1":"100","2":"403","3":"200"},{"1":"10","2":"404","3":"200"},{"1":"20","2":"404","3":"200"},{"1":"40","2":"404","3":"200"},{"1":"100","2":"404","3":"200"},{"1":"10","2":"405","3":"200"},{"1":"20","2":"405","3":"200"},{"1":"40","2":"405","3":"200"},{"1":"100","2":"405","3":"200"},{"1":"10","2":"406","3":"200"},{"1":"20","2":"406","3":"200"},{"1":"40","2":"406","3":"200"},{"1":"100","2":"406","3":"200"},{"1":"10","2":"407","3":"200"},{"1":"20","2":"407","3":"200"},{"1":"40","2":"407","3":"200"},{"1":"100","2":"407","3":"200"},{"1":"10","2":"408","3":"200"},{"1":"20","2":"408","3":"200"},{"1":"40","2":"408","3":"200"},{"1":"100","2":"408","3":"200"},{"1":"10","2":"409","3":"200"},{"1":"20","2":"409","3":"200"},{"1":"40","2":"409","3":"200"},{"1":"100","2":"409","3":"200"},{"1":"10","2":"410","3":"200"},{"1":"20","2":"410","3":"200"},{"1":"40","2":"410","3":"200"},{"1":"100","2":"410","3":"200"},{"1":"10","2":"411","3":"200"},{"1":"20","2":"411","3":"200"},{"1":"40","2":"411","3":"200"},{"1":"100","2":"411","3":"200"},{"1":"10","2":"412","3":"200"},{"1":"20","2":"412","3":"200"},{"1":"40","2":"412","3":"200"},{"1":"100","2":"412","3":"200"},{"1":"10","2":"413","3":"200"},{"1":"20","2":"413","3":"200"},{"1":"40","2":"413","3":"200"},{"1":"100","2":"413","3":"200"},{"1":"10","2":"414","3":"200"},{"1":"20","2":"414","3":"200"},{"1":"40","2":"414","3":"200"},{"1":"100","2":"414","3":"200"},{"1":"10","2":"415","3":"200"},{"1":"20","2":"415","3":"200"},{"1":"40","2":"415","3":"200"},{"1":"100","2":"415","3":"200"},{"1":"10","2":"416","3":"200"},{"1":"20","2":"416","3":"200"},{"1":"40","2":"416","3":"200"},{"1":"100","2":"416","3":"200"},{"1":"10","2":"417","3":"200"},{"1":"20","2":"417","3":"200"},{"1":"40","2":"417","3":"200"},{"1":"100","2":"417","3":"200"},{"1":"10","2":"418","3":"200"},{"1":"20","2":"418","3":"200"},{"1":"40","2":"418","3":"200"},{"1":"100","2":"418","3":"200"},{"1":"10","2":"419","3":"200"},{"1":"20","2":"419","3":"200"},{"1":"40","2":"419","3":"200"},{"1":"100","2":"419","3":"200"},{"1":"10","2":"420","3":"200"},{"1":"20","2":"420","3":"200"},{"1":"40","2":"420","3":"200"},{"1":"100","2":"420","3":"200"},{"1":"10","2":"421","3":"200"},{"1":"20","2":"421","3":"200"},{"1":"40","2":"421","3":"200"},{"1":"100","2":"421","3":"200"},{"1":"10","2":"422","3":"200"},{"1":"20","2":"422","3":"200"},{"1":"40","2":"422","3":"200"},{"1":"100","2":"422","3":"200"},{"1":"10","2":"423","3":"200"},{"1":"20","2":"423","3":"200"},{"1":"40","2":"423","3":"200"},{"1":"100","2":"423","3":"200"},{"1":"10","2":"424","3":"200"},{"1":"20","2":"424","3":"200"},{"1":"40","2":"424","3":"200"},{"1":"100","2":"424","3":"200"},{"1":"10","2":"425","3":"200"},{"1":"20","2":"425","3":"200"},{"1":"40","2":"425","3":"200"},{"1":"100","2":"425","3":"200"},{"1":"10","2":"426","3":"200"},{"1":"20","2":"426","3":"200"},{"1":"40","2":"426","3":"200"},{"1":"100","2":"426","3":"200"},{"1":"10","2":"427","3":"200"},{"1":"20","2":"427","3":"200"},{"1":"40","2":"427","3":"200"},{"1":"100","2":"427","3":"200"},{"1":"10","2":"428","3":"200"},{"1":"20","2":"428","3":"200"},{"1":"40","2":"428","3":"200"},{"1":"100","2":"428","3":"200"},{"1":"10","2":"429","3":"200"},{"1":"20","2":"429","3":"200"},{"1":"40","2":"429","3":"200"},{"1":"100","2":"429","3":"200"},{"1":"10","2":"430","3":"200"},{"1":"20","2":"430","3":"200"},{"1":"40","2":"430","3":"200"},{"1":"100","2":"430","3":"200"},{"1":"10","2":"431","3":"200"},{"1":"20","2":"431","3":"200"},{"1":"40","2":"431","3":"200"},{"1":"100","2":"431","3":"200"},{"1":"10","2":"432","3":"200"},{"1":"20","2":"432","3":"200"},{"1":"40","2":"432","3":"200"},{"1":"100","2":"432","3":"200"},{"1":"10","2":"433","3":"200"},{"1":"20","2":"433","3":"200"},{"1":"40","2":"433","3":"200"},{"1":"100","2":"433","3":"200"},{"1":"10","2":"434","3":"200"},{"1":"20","2":"434","3":"200"},{"1":"40","2":"434","3":"200"},{"1":"100","2":"434","3":"200"},{"1":"10","2":"435","3":"200"},{"1":"20","2":"435","3":"200"},{"1":"40","2":"435","3":"200"},{"1":"100","2":"435","3":"200"},{"1":"10","2":"436","3":"200"},{"1":"20","2":"436","3":"200"},{"1":"40","2":"436","3":"200"},{"1":"100","2":"436","3":"200"},{"1":"10","2":"437","3":"200"},{"1":"20","2":"437","3":"200"},{"1":"40","2":"437","3":"200"},{"1":"100","2":"437","3":"200"},{"1":"10","2":"438","3":"200"},{"1":"20","2":"438","3":"200"},{"1":"40","2":"438","3":"200"},{"1":"100","2":"438","3":"200"},{"1":"10","2":"439","3":"200"},{"1":"20","2":"439","3":"200"},{"1":"40","2":"439","3":"200"},{"1":"100","2":"439","3":"200"},{"1":"10","2":"440","3":"200"},{"1":"20","2":"440","3":"200"},{"1":"40","2":"440","3":"200"},{"1":"100","2":"440","3":"200"},{"1":"10","2":"441","3":"200"},{"1":"20","2":"441","3":"200"},{"1":"40","2":"441","3":"200"},{"1":"100","2":"441","3":"200"},{"1":"10","2":"442","3":"200"},{"1":"20","2":"442","3":"200"},{"1":"40","2":"442","3":"200"},{"1":"100","2":"442","3":"200"},{"1":"10","2":"443","3":"200"},{"1":"20","2":"443","3":"200"},{"1":"40","2":"443","3":"200"},{"1":"100","2":"443","3":"200"},{"1":"10","2":"444","3":"200"},{"1":"20","2":"444","3":"200"},{"1":"40","2":"444","3":"200"},{"1":"100","2":"444","3":"200"},{"1":"10","2":"445","3":"200"},{"1":"20","2":"445","3":"200"},{"1":"40","2":"445","3":"200"},{"1":"100","2":"445","3":"200"},{"1":"10","2":"446","3":"200"},{"1":"20","2":"446","3":"200"},{"1":"40","2":"446","3":"200"},{"1":"100","2":"446","3":"200"},{"1":"10","2":"447","3":"200"},{"1":"20","2":"447","3":"200"},{"1":"40","2":"447","3":"200"},{"1":"100","2":"447","3":"200"},{"1":"10","2":"448","3":"200"},{"1":"20","2":"448","3":"200"},{"1":"40","2":"448","3":"200"},{"1":"100","2":"448","3":"200"},{"1":"10","2":"449","3":"200"},{"1":"20","2":"449","3":"200"},{"1":"40","2":"449","3":"200"},{"1":"100","2":"449","3":"200"},{"1":"10","2":"450","3":"200"},{"1":"20","2":"450","3":"200"},{"1":"40","2":"450","3":"200"},{"1":"100","2":"450","3":"200"},{"1":"10","2":"451","3":"200"},{"1":"20","2":"451","3":"200"},{"1":"40","2":"451","3":"200"},{"1":"100","2":"451","3":"200"},{"1":"10","2":"452","3":"200"},{"1":"20","2":"452","3":"200"},{"1":"40","2":"452","3":"200"},{"1":"100","2":"452","3":"200"},{"1":"10","2":"453","3":"200"},{"1":"20","2":"453","3":"200"},{"1":"40","2":"453","3":"200"},{"1":"100","2":"453","3":"200"},{"1":"10","2":"454","3":"200"},{"1":"20","2":"454","3":"200"},{"1":"40","2":"454","3":"200"},{"1":"100","2":"454","3":"200"},{"1":"10","2":"455","3":"200"},{"1":"20","2":"455","3":"200"},{"1":"40","2":"455","3":"200"},{"1":"100","2":"455","3":"200"},{"1":"10","2":"456","3":"200"},{"1":"20","2":"456","3":"200"},{"1":"40","2":"456","3":"200"},{"1":"100","2":"456","3":"200"},{"1":"10","2":"457","3":"200"},{"1":"20","2":"457","3":"200"},{"1":"40","2":"457","3":"200"},{"1":"100","2":"457","3":"200"},{"1":"10","2":"458","3":"200"},{"1":"20","2":"458","3":"200"},{"1":"40","2":"458","3":"200"},{"1":"100","2":"458","3":"200"},{"1":"10","2":"459","3":"200"},{"1":"20","2":"459","3":"200"},{"1":"40","2":"459","3":"200"},{"1":"100","2":"459","3":"200"},{"1":"10","2":"460","3":"200"},{"1":"20","2":"460","3":"200"},{"1":"40","2":"460","3":"200"},{"1":"100","2":"460","3":"200"},{"1":"10","2":"461","3":"200"},{"1":"20","2":"461","3":"200"},{"1":"40","2":"461","3":"200"},{"1":"100","2":"461","3":"200"},{"1":"10","2":"462","3":"200"},{"1":"20","2":"462","3":"200"},{"1":"40","2":"462","3":"200"},{"1":"100","2":"462","3":"200"},{"1":"10","2":"463","3":"200"},{"1":"20","2":"463","3":"200"},{"1":"40","2":"463","3":"200"},{"1":"100","2":"463","3":"200"},{"1":"10","2":"464","3":"200"},{"1":"20","2":"464","3":"200"},{"1":"40","2":"464","3":"200"},{"1":"100","2":"464","3":"200"},{"1":"10","2":"465","3":"200"},{"1":"20","2":"465","3":"200"},{"1":"40","2":"465","3":"200"},{"1":"100","2":"465","3":"200"},{"1":"10","2":"466","3":"200"},{"1":"20","2":"466","3":"200"},{"1":"40","2":"466","3":"200"},{"1":"100","2":"466","3":"200"},{"1":"10","2":"467","3":"200"},{"1":"20","2":"467","3":"200"},{"1":"40","2":"467","3":"200"},{"1":"100","2":"467","3":"200"},{"1":"10","2":"468","3":"200"},{"1":"20","2":"468","3":"200"},{"1":"40","2":"468","3":"200"},{"1":"100","2":"468","3":"200"},{"1":"10","2":"469","3":"200"},{"1":"20","2":"469","3":"200"},{"1":"40","2":"469","3":"200"},{"1":"100","2":"469","3":"200"},{"1":"10","2":"470","3":"200"},{"1":"20","2":"470","3":"200"},{"1":"40","2":"470","3":"200"},{"1":"100","2":"470","3":"200"},{"1":"10","2":"471","3":"200"},{"1":"20","2":"471","3":"200"},{"1":"40","2":"471","3":"200"},{"1":"100","2":"471","3":"200"},{"1":"10","2":"472","3":"200"},{"1":"20","2":"472","3":"200"},{"1":"40","2":"472","3":"200"},{"1":"100","2":"472","3":"200"},{"1":"10","2":"473","3":"200"},{"1":"20","2":"473","3":"200"},{"1":"40","2":"473","3":"200"},{"1":"100","2":"473","3":"200"},{"1":"10","2":"474","3":"200"},{"1":"20","2":"474","3":"200"},{"1":"40","2":"474","3":"200"},{"1":"100","2":"474","3":"200"},{"1":"10","2":"475","3":"200"},{"1":"20","2":"475","3":"200"},{"1":"40","2":"475","3":"200"},{"1":"100","2":"475","3":"200"},{"1":"10","2":"476","3":"200"},{"1":"20","2":"476","3":"200"},{"1":"40","2":"476","3":"200"},{"1":"100","2":"476","3":"200"},{"1":"10","2":"477","3":"200"},{"1":"20","2":"477","3":"200"},{"1":"40","2":"477","3":"200"},{"1":"100","2":"477","3":"200"},{"1":"10","2":"478","3":"200"},{"1":"20","2":"478","3":"200"},{"1":"40","2":"478","3":"200"},{"1":"100","2":"478","3":"200"},{"1":"10","2":"479","3":"200"},{"1":"20","2":"479","3":"200"},{"1":"40","2":"479","3":"200"},{"1":"100","2":"479","3":"200"},{"1":"10","2":"480","3":"200"},{"1":"20","2":"480","3":"200"},{"1":"40","2":"480","3":"200"},{"1":"100","2":"480","3":"200"},{"1":"10","2":"481","3":"200"},{"1":"20","2":"481","3":"200"},{"1":"40","2":"481","3":"200"},{"1":"100","2":"481","3":"200"},{"1":"10","2":"482","3":"200"},{"1":"20","2":"482","3":"200"},{"1":"40","2":"482","3":"200"},{"1":"100","2":"482","3":"200"},{"1":"10","2":"483","3":"200"},{"1":"20","2":"483","3":"200"},{"1":"40","2":"483","3":"200"},{"1":"100","2":"483","3":"200"},{"1":"10","2":"484","3":"200"},{"1":"20","2":"484","3":"200"},{"1":"40","2":"484","3":"200"},{"1":"100","2":"484","3":"200"},{"1":"10","2":"485","3":"200"},{"1":"20","2":"485","3":"200"},{"1":"40","2":"485","3":"200"},{"1":"100","2":"485","3":"200"},{"1":"10","2":"486","3":"200"},{"1":"20","2":"486","3":"200"},{"1":"40","2":"486","3":"200"},{"1":"100","2":"486","3":"200"},{"1":"10","2":"487","3":"200"},{"1":"20","2":"487","3":"200"},{"1":"40","2":"487","3":"200"},{"1":"100","2":"487","3":"200"},{"1":"10","2":"488","3":"200"},{"1":"20","2":"488","3":"200"},{"1":"40","2":"488","3":"200"},{"1":"100","2":"488","3":"200"},{"1":"10","2":"489","3":"200"},{"1":"20","2":"489","3":"200"},{"1":"40","2":"489","3":"200"},{"1":"100","2":"489","3":"200"},{"1":"10","2":"490","3":"200"},{"1":"20","2":"490","3":"200"},{"1":"40","2":"490","3":"200"},{"1":"100","2":"490","3":"200"},{"1":"10","2":"491","3":"200"},{"1":"20","2":"491","3":"200"},{"1":"40","2":"491","3":"200"},{"1":"100","2":"491","3":"200"},{"1":"10","2":"492","3":"200"},{"1":"20","2":"492","3":"200"},{"1":"40","2":"492","3":"200"},{"1":"100","2":"492","3":"200"},{"1":"10","2":"493","3":"200"},{"1":"20","2":"493","3":"200"},{"1":"40","2":"493","3":"200"},{"1":"100","2":"493","3":"200"},{"1":"10","2":"494","3":"200"},{"1":"20","2":"494","3":"200"},{"1":"40","2":"494","3":"200"},{"1":"100","2":"494","3":"200"},{"1":"10","2":"495","3":"200"},{"1":"20","2":"495","3":"200"},{"1":"40","2":"495","3":"200"},{"1":"100","2":"495","3":"200"},{"1":"10","2":"496","3":"200"},{"1":"20","2":"496","3":"200"},{"1":"40","2":"496","3":"200"},{"1":"100","2":"496","3":"200"},{"1":"10","2":"497","3":"200"},{"1":"20","2":"497","3":"200"},{"1":"40","2":"497","3":"200"},{"1":"100","2":"497","3":"200"},{"1":"10","2":"498","3":"200"},{"1":"20","2":"498","3":"200"},{"1":"40","2":"498","3":"200"},{"1":"100","2":"498","3":"200"},{"1":"10","2":"499","3":"200"},{"1":"20","2":"499","3":"200"},{"1":"40","2":"499","3":"200"},{"1":"100","2":"499","3":"200"},{"1":"10","2":"500","3":"200"},{"1":"20","2":"500","3":"200"},{"1":"40","2":"500","3":"200"},{"1":"100","2":"500","3":"200"},{"1":"10","2":"501","3":"200"},{"1":"20","2":"501","3":"200"},{"1":"40","2":"501","3":"200"},{"1":"100","2":"501","3":"200"},{"1":"10","2":"502","3":"200"},{"1":"20","2":"502","3":"200"},{"1":"40","2":"502","3":"200"},{"1":"100","2":"502","3":"200"},{"1":"10","2":"503","3":"200"},{"1":"20","2":"503","3":"200"},{"1":"40","2":"503","3":"200"},{"1":"100","2":"503","3":"200"},{"1":"10","2":"504","3":"200"},{"1":"20","2":"504","3":"200"},{"1":"40","2":"504","3":"200"},{"1":"100","2":"504","3":"200"},{"1":"10","2":"505","3":"200"},{"1":"20","2":"505","3":"200"},{"1":"40","2":"505","3":"200"},{"1":"100","2":"505","3":"200"},{"1":"10","2":"506","3":"200"},{"1":"20","2":"506","3":"200"},{"1":"40","2":"506","3":"200"},{"1":"100","2":"506","3":"200"},{"1":"10","2":"507","3":"200"},{"1":"20","2":"507","3":"200"},{"1":"40","2":"507","3":"200"},{"1":"100","2":"507","3":"200"},{"1":"10","2":"508","3":"200"},{"1":"20","2":"508","3":"200"},{"1":"40","2":"508","3":"200"},{"1":"100","2":"508","3":"200"},{"1":"10","2":"509","3":"200"},{"1":"20","2":"509","3":"200"},{"1":"40","2":"509","3":"200"},{"1":"100","2":"509","3":"200"},{"1":"10","2":"510","3":"200"},{"1":"20","2":"510","3":"200"},{"1":"40","2":"510","3":"200"},{"1":"100","2":"510","3":"200"},{"1":"10","2":"511","3":"200"},{"1":"20","2":"511","3":"200"},{"1":"40","2":"511","3":"200"},{"1":"100","2":"511","3":"200"},{"1":"10","2":"512","3":"200"},{"1":"20","2":"512","3":"200"},{"1":"40","2":"512","3":"200"},{"1":"100","2":"512","3":"200"},{"1":"10","2":"513","3":"200"},{"1":"20","2":"513","3":"200"},{"1":"40","2":"513","3":"200"},{"1":"100","2":"513","3":"200"},{"1":"10","2":"514","3":"200"},{"1":"20","2":"514","3":"200"},{"1":"40","2":"514","3":"200"},{"1":"100","2":"514","3":"200"},{"1":"10","2":"515","3":"200"},{"1":"20","2":"515","3":"200"},{"1":"40","2":"515","3":"200"},{"1":"100","2":"515","3":"200"},{"1":"10","2":"516","3":"200"},{"1":"20","2":"516","3":"200"},{"1":"40","2":"516","3":"200"},{"1":"100","2":"516","3":"200"},{"1":"10","2":"517","3":"200"},{"1":"20","2":"517","3":"200"},{"1":"40","2":"517","3":"200"},{"1":"100","2":"517","3":"200"},{"1":"10","2":"518","3":"200"},{"1":"20","2":"518","3":"200"},{"1":"40","2":"518","3":"200"},{"1":"100","2":"518","3":"200"},{"1":"10","2":"519","3":"200"},{"1":"20","2":"519","3":"200"},{"1":"40","2":"519","3":"200"},{"1":"100","2":"519","3":"200"},{"1":"10","2":"520","3":"200"},{"1":"20","2":"520","3":"200"},{"1":"40","2":"520","3":"200"},{"1":"100","2":"520","3":"200"},{"1":"10","2":"521","3":"200"},{"1":"20","2":"521","3":"200"},{"1":"40","2":"521","3":"200"},{"1":"100","2":"521","3":"200"},{"1":"10","2":"522","3":"200"},{"1":"20","2":"522","3":"200"},{"1":"40","2":"522","3":"200"},{"1":"100","2":"522","3":"200"},{"1":"10","2":"523","3":"200"},{"1":"20","2":"523","3":"200"},{"1":"40","2":"523","3":"200"},{"1":"100","2":"523","3":"200"},{"1":"10","2":"524","3":"200"},{"1":"20","2":"524","3":"200"},{"1":"40","2":"524","3":"200"},{"1":"100","2":"524","3":"200"},{"1":"10","2":"525","3":"200"},{"1":"20","2":"525","3":"200"},{"1":"40","2":"525","3":"200"},{"1":"100","2":"525","3":"200"},{"1":"10","2":"526","3":"200"},{"1":"20","2":"526","3":"200"},{"1":"40","2":"526","3":"200"},{"1":"100","2":"526","3":"200"},{"1":"10","2":"527","3":"200"},{"1":"20","2":"527","3":"200"},{"1":"40","2":"527","3":"200"},{"1":"100","2":"527","3":"200"},{"1":"10","2":"528","3":"200"},{"1":"20","2":"528","3":"200"},{"1":"40","2":"528","3":"200"},{"1":"100","2":"528","3":"200"},{"1":"10","2":"529","3":"200"},{"1":"20","2":"529","3":"200"},{"1":"40","2":"529","3":"200"},{"1":"100","2":"529","3":"200"},{"1":"10","2":"530","3":"200"},{"1":"20","2":"530","3":"200"},{"1":"40","2":"530","3":"200"},{"1":"100","2":"530","3":"200"},{"1":"10","2":"531","3":"200"},{"1":"20","2":"531","3":"200"},{"1":"40","2":"531","3":"200"},{"1":"100","2":"531","3":"200"},{"1":"10","2":"532","3":"200"},{"1":"20","2":"532","3":"200"},{"1":"40","2":"532","3":"200"},{"1":"100","2":"532","3":"200"},{"1":"10","2":"533","3":"200"},{"1":"20","2":"533","3":"200"},{"1":"40","2":"533","3":"200"},{"1":"100","2":"533","3":"200"},{"1":"10","2":"534","3":"200"},{"1":"20","2":"534","3":"200"},{"1":"40","2":"534","3":"200"},{"1":"100","2":"534","3":"200"},{"1":"10","2":"535","3":"200"},{"1":"20","2":"535","3":"200"},{"1":"40","2":"535","3":"200"},{"1":"100","2":"535","3":"200"},{"1":"10","2":"536","3":"200"},{"1":"20","2":"536","3":"200"},{"1":"40","2":"536","3":"200"},{"1":"100","2":"536","3":"200"},{"1":"10","2":"537","3":"200"},{"1":"20","2":"537","3":"200"},{"1":"40","2":"537","3":"200"},{"1":"100","2":"537","3":"200"},{"1":"10","2":"538","3":"200"},{"1":"20","2":"538","3":"200"},{"1":"40","2":"538","3":"200"},{"1":"100","2":"538","3":"200"},{"1":"10","2":"539","3":"200"},{"1":"20","2":"539","3":"200"},{"1":"40","2":"539","3":"200"},{"1":"100","2":"539","3":"200"},{"1":"10","2":"540","3":"200"},{"1":"20","2":"540","3":"200"},{"1":"40","2":"540","3":"200"},{"1":"100","2":"540","3":"200"},{"1":"10","2":"541","3":"200"},{"1":"20","2":"541","3":"200"},{"1":"40","2":"541","3":"200"},{"1":"100","2":"541","3":"200"},{"1":"10","2":"542","3":"200"},{"1":"20","2":"542","3":"200"},{"1":"40","2":"542","3":"200"},{"1":"100","2":"542","3":"200"},{"1":"10","2":"543","3":"200"},{"1":"20","2":"543","3":"200"},{"1":"40","2":"543","3":"200"},{"1":"100","2":"543","3":"200"},{"1":"10","2":"544","3":"200"},{"1":"20","2":"544","3":"200"},{"1":"40","2":"544","3":"200"},{"1":"100","2":"544","3":"200"},{"1":"10","2":"545","3":"200"},{"1":"20","2":"545","3":"200"},{"1":"40","2":"545","3":"200"},{"1":"100","2":"545","3":"200"},{"1":"10","2":"546","3":"200"},{"1":"20","2":"546","3":"200"},{"1":"40","2":"546","3":"200"},{"1":"100","2":"546","3":"200"},{"1":"10","2":"547","3":"200"},{"1":"20","2":"547","3":"200"},{"1":"40","2":"547","3":"200"},{"1":"100","2":"547","3":"200"},{"1":"10","2":"548","3":"200"},{"1":"20","2":"548","3":"200"},{"1":"40","2":"548","3":"200"},{"1":"100","2":"548","3":"200"},{"1":"10","2":"549","3":"200"},{"1":"20","2":"549","3":"200"},{"1":"40","2":"549","3":"200"},{"1":"100","2":"549","3":"200"},{"1":"10","2":"550","3":"200"},{"1":"20","2":"550","3":"200"},{"1":"40","2":"550","3":"200"},{"1":"100","2":"550","3":"200"},{"1":"10","2":"551","3":"200"},{"1":"20","2":"551","3":"200"},{"1":"40","2":"551","3":"200"},{"1":"100","2":"551","3":"200"},{"1":"10","2":"552","3":"200"},{"1":"20","2":"552","3":"200"},{"1":"40","2":"552","3":"200"},{"1":"100","2":"552","3":"200"},{"1":"10","2":"553","3":"200"},{"1":"20","2":"553","3":"200"},{"1":"40","2":"553","3":"200"},{"1":"100","2":"553","3":"200"},{"1":"10","2":"554","3":"200"},{"1":"20","2":"554","3":"200"},{"1":"40","2":"554","3":"200"},{"1":"100","2":"554","3":"200"},{"1":"10","2":"555","3":"200"},{"1":"20","2":"555","3":"200"},{"1":"40","2":"555","3":"200"},{"1":"100","2":"555","3":"200"},{"1":"10","2":"556","3":"200"},{"1":"20","2":"556","3":"200"},{"1":"40","2":"556","3":"200"},{"1":"100","2":"556","3":"200"},{"1":"10","2":"557","3":"200"},{"1":"20","2":"557","3":"200"},{"1":"40","2":"557","3":"200"},{"1":"100","2":"557","3":"200"},{"1":"10","2":"558","3":"200"},{"1":"20","2":"558","3":"200"},{"1":"40","2":"558","3":"200"},{"1":"100","2":"558","3":"200"},{"1":"10","2":"559","3":"200"},{"1":"20","2":"559","3":"200"},{"1":"40","2":"559","3":"200"},{"1":"100","2":"559","3":"200"},{"1":"10","2":"560","3":"200"},{"1":"20","2":"560","3":"200"},{"1":"40","2":"560","3":"200"},{"1":"100","2":"560","3":"200"},{"1":"10","2":"561","3":"200"},{"1":"20","2":"561","3":"200"},{"1":"40","2":"561","3":"200"},{"1":"100","2":"561","3":"200"},{"1":"10","2":"562","3":"200"},{"1":"20","2":"562","3":"200"},{"1":"40","2":"562","3":"200"},{"1":"100","2":"562","3":"200"},{"1":"10","2":"563","3":"200"},{"1":"20","2":"563","3":"200"},{"1":"40","2":"563","3":"200"},{"1":"100","2":"563","3":"200"},{"1":"10","2":"564","3":"200"},{"1":"20","2":"564","3":"200"},{"1":"40","2":"564","3":"200"},{"1":"100","2":"564","3":"200"},{"1":"10","2":"565","3":"200"},{"1":"20","2":"565","3":"200"},{"1":"40","2":"565","3":"200"},{"1":"100","2":"565","3":"200"},{"1":"10","2":"566","3":"200"},{"1":"20","2":"566","3":"200"},{"1":"40","2":"566","3":"200"},{"1":"100","2":"566","3":"200"},{"1":"10","2":"567","3":"200"},{"1":"20","2":"567","3":"200"},{"1":"40","2":"567","3":"200"},{"1":"100","2":"567","3":"200"},{"1":"10","2":"568","3":"200"},{"1":"20","2":"568","3":"200"},{"1":"40","2":"568","3":"200"},{"1":"100","2":"568","3":"200"},{"1":"10","2":"569","3":"200"},{"1":"20","2":"569","3":"200"},{"1":"40","2":"569","3":"200"},{"1":"100","2":"569","3":"200"},{"1":"10","2":"570","3":"200"},{"1":"20","2":"570","3":"200"},{"1":"40","2":"570","3":"200"},{"1":"100","2":"570","3":"200"},{"1":"10","2":"571","3":"200"},{"1":"20","2":"571","3":"200"},{"1":"40","2":"571","3":"200"},{"1":"100","2":"571","3":"200"},{"1":"10","2":"572","3":"200"},{"1":"20","2":"572","3":"200"},{"1":"40","2":"572","3":"200"},{"1":"100","2":"572","3":"200"},{"1":"10","2":"573","3":"200"},{"1":"20","2":"573","3":"200"},{"1":"40","2":"573","3":"200"},{"1":"100","2":"573","3":"200"},{"1":"10","2":"574","3":"200"},{"1":"20","2":"574","3":"200"},{"1":"40","2":"574","3":"200"},{"1":"100","2":"574","3":"200"},{"1":"10","2":"575","3":"200"},{"1":"20","2":"575","3":"200"},{"1":"40","2":"575","3":"200"},{"1":"100","2":"575","3":"200"},{"1":"10","2":"576","3":"200"},{"1":"20","2":"576","3":"200"},{"1":"40","2":"576","3":"200"},{"1":"100","2":"576","3":"200"},{"1":"10","2":"577","3":"200"},{"1":"20","2":"577","3":"200"},{"1":"40","2":"577","3":"200"},{"1":"100","2":"577","3":"200"},{"1":"10","2":"578","3":"200"},{"1":"20","2":"578","3":"200"},{"1":"40","2":"578","3":"200"},{"1":"100","2":"578","3":"200"},{"1":"10","2":"579","3":"200"},{"1":"20","2":"579","3":"200"},{"1":"40","2":"579","3":"200"},{"1":"100","2":"579","3":"200"},{"1":"10","2":"580","3":"200"},{"1":"20","2":"580","3":"200"},{"1":"40","2":"580","3":"200"},{"1":"100","2":"580","3":"200"},{"1":"10","2":"581","3":"200"},{"1":"20","2":"581","3":"200"},{"1":"40","2":"581","3":"200"},{"1":"100","2":"581","3":"200"},{"1":"10","2":"582","3":"200"},{"1":"20","2":"582","3":"200"},{"1":"40","2":"582","3":"200"},{"1":"100","2":"582","3":"200"},{"1":"10","2":"583","3":"200"},{"1":"20","2":"583","3":"200"},{"1":"40","2":"583","3":"200"},{"1":"100","2":"583","3":"200"},{"1":"10","2":"584","3":"200"},{"1":"20","2":"584","3":"200"},{"1":"40","2":"584","3":"200"},{"1":"100","2":"584","3":"200"},{"1":"10","2":"585","3":"200"},{"1":"20","2":"585","3":"200"},{"1":"40","2":"585","3":"200"},{"1":"100","2":"585","3":"200"},{"1":"10","2":"586","3":"200"},{"1":"20","2":"586","3":"200"},{"1":"40","2":"586","3":"200"},{"1":"100","2":"586","3":"200"},{"1":"10","2":"587","3":"200"},{"1":"20","2":"587","3":"200"},{"1":"40","2":"587","3":"200"},{"1":"100","2":"587","3":"200"},{"1":"10","2":"588","3":"200"},{"1":"20","2":"588","3":"200"},{"1":"40","2":"588","3":"200"},{"1":"100","2":"588","3":"200"},{"1":"10","2":"589","3":"200"},{"1":"20","2":"589","3":"200"},{"1":"40","2":"589","3":"200"},{"1":"100","2":"589","3":"200"},{"1":"10","2":"590","3":"200"},{"1":"20","2":"590","3":"200"},{"1":"40","2":"590","3":"200"},{"1":"100","2":"590","3":"200"},{"1":"10","2":"591","3":"200"},{"1":"20","2":"591","3":"200"},{"1":"40","2":"591","3":"200"},{"1":"100","2":"591","3":"200"},{"1":"10","2":"592","3":"200"},{"1":"20","2":"592","3":"200"},{"1":"40","2":"592","3":"200"},{"1":"100","2":"592","3":"200"},{"1":"10","2":"593","3":"200"},{"1":"20","2":"593","3":"200"},{"1":"40","2":"593","3":"200"},{"1":"100","2":"593","3":"200"},{"1":"10","2":"594","3":"200"},{"1":"20","2":"594","3":"200"},{"1":"40","2":"594","3":"200"},{"1":"100","2":"594","3":"200"},{"1":"10","2":"595","3":"200"},{"1":"20","2":"595","3":"200"},{"1":"40","2":"595","3":"200"},{"1":"100","2":"595","3":"200"},{"1":"10","2":"596","3":"200"},{"1":"20","2":"596","3":"200"},{"1":"40","2":"596","3":"200"},{"1":"100","2":"596","3":"200"},{"1":"10","2":"597","3":"200"},{"1":"20","2":"597","3":"200"},{"1":"40","2":"597","3":"200"},{"1":"100","2":"597","3":"200"},{"1":"10","2":"598","3":"200"},{"1":"20","2":"598","3":"200"},{"1":"40","2":"598","3":"200"},{"1":"100","2":"598","3":"200"},{"1":"10","2":"599","3":"200"},{"1":"20","2":"599","3":"200"},{"1":"40","2":"599","3":"200"},{"1":"100","2":"599","3":"200"},{"1":"10","2":"600","3":"200"},{"1":"20","2":"600","3":"200"},{"1":"40","2":"600","3":"200"},{"1":"100","2":"600","3":"200"},{"1":"10","2":"601","3":"200"},{"1":"20","2":"601","3":"200"},{"1":"40","2":"601","3":"200"},{"1":"100","2":"601","3":"200"},{"1":"10","2":"602","3":"200"},{"1":"20","2":"602","3":"200"},{"1":"40","2":"602","3":"200"},{"1":"100","2":"602","3":"200"},{"1":"10","2":"603","3":"200"},{"1":"20","2":"603","3":"200"},{"1":"40","2":"603","3":"200"},{"1":"100","2":"603","3":"200"},{"1":"10","2":"604","3":"200"},{"1":"20","2":"604","3":"200"},{"1":"40","2":"604","3":"200"},{"1":"100","2":"604","3":"200"},{"1":"10","2":"605","3":"200"},{"1":"20","2":"605","3":"200"},{"1":"40","2":"605","3":"200"},{"1":"100","2":"605","3":"200"},{"1":"10","2":"606","3":"200"},{"1":"20","2":"606","3":"200"},{"1":"40","2":"606","3":"200"},{"1":"100","2":"606","3":"200"},{"1":"10","2":"607","3":"200"},{"1":"20","2":"607","3":"200"},{"1":"40","2":"607","3":"200"},{"1":"100","2":"607","3":"200"},{"1":"10","2":"608","3":"200"},{"1":"20","2":"608","3":"200"},{"1":"40","2":"608","3":"200"},{"1":"100","2":"608","3":"200"},{"1":"10","2":"609","3":"200"},{"1":"20","2":"609","3":"200"},{"1":"40","2":"609","3":"200"},{"1":"100","2":"609","3":"200"},{"1":"10","2":"610","3":"200"},{"1":"20","2":"610","3":"200"},{"1":"40","2":"610","3":"200"},{"1":"100","2":"610","3":"200"},{"1":"10","2":"611","3":"200"},{"1":"20","2":"611","3":"200"},{"1":"40","2":"611","3":"200"},{"1":"100","2":"611","3":"200"},{"1":"10","2":"612","3":"200"},{"1":"20","2":"612","3":"200"},{"1":"40","2":"612","3":"200"},{"1":"100","2":"612","3":"200"},{"1":"10","2":"613","3":"200"},{"1":"20","2":"613","3":"200"},{"1":"40","2":"613","3":"200"},{"1":"100","2":"613","3":"200"},{"1":"10","2":"614","3":"200"},{"1":"20","2":"614","3":"200"},{"1":"40","2":"614","3":"200"},{"1":"100","2":"614","3":"200"},{"1":"10","2":"615","3":"200"},{"1":"20","2":"615","3":"200"},{"1":"40","2":"615","3":"200"},{"1":"100","2":"615","3":"200"},{"1":"10","2":"616","3":"200"},{"1":"20","2":"616","3":"200"},{"1":"40","2":"616","3":"200"},{"1":"100","2":"616","3":"200"},{"1":"10","2":"617","3":"200"},{"1":"20","2":"617","3":"200"},{"1":"40","2":"617","3":"200"},{"1":"100","2":"617","3":"200"},{"1":"10","2":"618","3":"200"},{"1":"20","2":"618","3":"200"},{"1":"40","2":"618","3":"200"},{"1":"100","2":"618","3":"200"},{"1":"10","2":"619","3":"200"},{"1":"20","2":"619","3":"200"},{"1":"40","2":"619","3":"200"},{"1":"100","2":"619","3":"200"},{"1":"10","2":"620","3":"200"},{"1":"20","2":"620","3":"200"},{"1":"40","2":"620","3":"200"},{"1":"100","2":"620","3":"200"},{"1":"10","2":"621","3":"200"},{"1":"20","2":"621","3":"200"},{"1":"40","2":"621","3":"200"},{"1":"100","2":"621","3":"200"},{"1":"10","2":"622","3":"200"},{"1":"20","2":"622","3":"200"},{"1":"40","2":"622","3":"200"},{"1":"100","2":"622","3":"200"},{"1":"10","2":"623","3":"200"},{"1":"20","2":"623","3":"200"},{"1":"40","2":"623","3":"200"},{"1":"100","2":"623","3":"200"},{"1":"10","2":"624","3":"200"},{"1":"20","2":"624","3":"200"},{"1":"40","2":"624","3":"200"},{"1":"100","2":"624","3":"200"},{"1":"10","2":"625","3":"200"},{"1":"20","2":"625","3":"200"},{"1":"40","2":"625","3":"200"},{"1":"100","2":"625","3":"200"},{"1":"10","2":"626","3":"200"},{"1":"20","2":"626","3":"200"},{"1":"40","2":"626","3":"200"},{"1":"100","2":"626","3":"200"},{"1":"10","2":"627","3":"200"},{"1":"20","2":"627","3":"200"},{"1":"40","2":"627","3":"200"},{"1":"100","2":"627","3":"200"},{"1":"10","2":"628","3":"200"},{"1":"20","2":"628","3":"200"},{"1":"40","2":"628","3":"200"},{"1":"100","2":"628","3":"200"},{"1":"10","2":"629","3":"200"},{"1":"20","2":"629","3":"200"},{"1":"40","2":"629","3":"200"},{"1":"100","2":"629","3":"200"},{"1":"10","2":"630","3":"200"},{"1":"20","2":"630","3":"200"},{"1":"40","2":"630","3":"200"},{"1":"100","2":"630","3":"200"},{"1":"10","2":"631","3":"200"},{"1":"20","2":"631","3":"200"},{"1":"40","2":"631","3":"200"},{"1":"100","2":"631","3":"200"},{"1":"10","2":"632","3":"200"},{"1":"20","2":"632","3":"200"},{"1":"40","2":"632","3":"200"},{"1":"100","2":"632","3":"200"},{"1":"10","2":"633","3":"200"},{"1":"20","2":"633","3":"200"},{"1":"40","2":"633","3":"200"},{"1":"100","2":"633","3":"200"},{"1":"10","2":"634","3":"200"},{"1":"20","2":"634","3":"200"},{"1":"40","2":"634","3":"200"},{"1":"100","2":"634","3":"200"},{"1":"10","2":"635","3":"200"},{"1":"20","2":"635","3":"200"},{"1":"40","2":"635","3":"200"},{"1":"100","2":"635","3":"200"},{"1":"10","2":"636","3":"200"},{"1":"20","2":"636","3":"200"},{"1":"40","2":"636","3":"200"},{"1":"100","2":"636","3":"200"},{"1":"10","2":"637","3":"200"},{"1":"20","2":"637","3":"200"},{"1":"40","2":"637","3":"200"},{"1":"100","2":"637","3":"200"},{"1":"10","2":"638","3":"200"},{"1":"20","2":"638","3":"200"},{"1":"40","2":"638","3":"200"},{"1":"100","2":"638","3":"200"},{"1":"10","2":"639","3":"200"},{"1":"20","2":"639","3":"200"},{"1":"40","2":"639","3":"200"},{"1":"100","2":"639","3":"200"},{"1":"10","2":"640","3":"200"},{"1":"20","2":"640","3":"200"},{"1":"40","2":"640","3":"200"},{"1":"100","2":"640","3":"200"},{"1":"10","2":"641","3":"200"},{"1":"20","2":"641","3":"200"},{"1":"40","2":"641","3":"200"},{"1":"100","2":"641","3":"200"},{"1":"10","2":"642","3":"200"},{"1":"20","2":"642","3":"200"},{"1":"40","2":"642","3":"200"},{"1":"100","2":"642","3":"200"},{"1":"10","2":"643","3":"200"},{"1":"20","2":"643","3":"200"},{"1":"40","2":"643","3":"200"},{"1":"100","2":"643","3":"200"},{"1":"10","2":"644","3":"200"},{"1":"20","2":"644","3":"200"},{"1":"40","2":"644","3":"200"},{"1":"100","2":"644","3":"200"},{"1":"10","2":"645","3":"200"},{"1":"20","2":"645","3":"200"},{"1":"40","2":"645","3":"200"},{"1":"100","2":"645","3":"200"},{"1":"10","2":"646","3":"200"},{"1":"20","2":"646","3":"200"},{"1":"40","2":"646","3":"200"},{"1":"100","2":"646","3":"200"},{"1":"10","2":"647","3":"200"},{"1":"20","2":"647","3":"200"},{"1":"40","2":"647","3":"200"},{"1":"100","2":"647","3":"200"},{"1":"10","2":"648","3":"200"},{"1":"20","2":"648","3":"200"},{"1":"40","2":"648","3":"200"},{"1":"100","2":"648","3":"200"},{"1":"10","2":"649","3":"200"},{"1":"20","2":"649","3":"200"},{"1":"40","2":"649","3":"200"},{"1":"100","2":"649","3":"200"},{"1":"10","2":"650","3":"200"},{"1":"20","2":"650","3":"200"},{"1":"40","2":"650","3":"200"},{"1":"100","2":"650","3":"200"},{"1":"10","2":"651","3":"200"},{"1":"20","2":"651","3":"200"},{"1":"40","2":"651","3":"200"},{"1":"100","2":"651","3":"200"},{"1":"10","2":"652","3":"200"},{"1":"20","2":"652","3":"200"},{"1":"40","2":"652","3":"200"},{"1":"100","2":"652","3":"200"},{"1":"10","2":"653","3":"200"},{"1":"20","2":"653","3":"200"},{"1":"40","2":"653","3":"200"},{"1":"100","2":"653","3":"200"},{"1":"10","2":"654","3":"200"},{"1":"20","2":"654","3":"200"},{"1":"40","2":"654","3":"200"},{"1":"100","2":"654","3":"200"},{"1":"10","2":"655","3":"200"},{"1":"20","2":"655","3":"200"},{"1":"40","2":"655","3":"200"},{"1":"100","2":"655","3":"200"},{"1":"10","2":"656","3":"200"},{"1":"20","2":"656","3":"200"},{"1":"40","2":"656","3":"200"},{"1":"100","2":"656","3":"200"},{"1":"10","2":"657","3":"200"},{"1":"20","2":"657","3":"200"},{"1":"40","2":"657","3":"200"},{"1":"100","2":"657","3":"200"},{"1":"10","2":"658","3":"200"},{"1":"20","2":"658","3":"200"},{"1":"40","2":"658","3":"200"},{"1":"100","2":"658","3":"200"},{"1":"10","2":"659","3":"200"},{"1":"20","2":"659","3":"200"},{"1":"40","2":"659","3":"200"},{"1":"100","2":"659","3":"200"},{"1":"10","2":"660","3":"200"},{"1":"20","2":"660","3":"200"},{"1":"40","2":"660","3":"200"},{"1":"100","2":"660","3":"200"},{"1":"10","2":"661","3":"200"},{"1":"20","2":"661","3":"200"},{"1":"40","2":"661","3":"200"},{"1":"100","2":"661","3":"200"},{"1":"10","2":"662","3":"200"},{"1":"20","2":"662","3":"200"},{"1":"40","2":"662","3":"200"},{"1":"100","2":"662","3":"200"},{"1":"10","2":"663","3":"200"},{"1":"20","2":"663","3":"200"},{"1":"40","2":"663","3":"200"},{"1":"100","2":"663","3":"200"},{"1":"10","2":"664","3":"200"},{"1":"20","2":"664","3":"200"},{"1":"40","2":"664","3":"200"},{"1":"100","2":"664","3":"200"},{"1":"10","2":"665","3":"200"},{"1":"20","2":"665","3":"200"},{"1":"40","2":"665","3":"200"},{"1":"100","2":"665","3":"200"},{"1":"10","2":"666","3":"200"},{"1":"20","2":"666","3":"200"},{"1":"40","2":"666","3":"200"},{"1":"100","2":"666","3":"200"},{"1":"10","2":"667","3":"200"},{"1":"20","2":"667","3":"200"},{"1":"40","2":"667","3":"200"},{"1":"100","2":"667","3":"200"},{"1":"10","2":"668","3":"200"},{"1":"20","2":"668","3":"200"},{"1":"40","2":"668","3":"200"},{"1":"100","2":"668","3":"200"},{"1":"10","2":"669","3":"200"},{"1":"20","2":"669","3":"200"},{"1":"40","2":"669","3":"200"},{"1":"100","2":"669","3":"200"},{"1":"10","2":"670","3":"200"},{"1":"20","2":"670","3":"200"},{"1":"40","2":"670","3":"200"},{"1":"100","2":"670","3":"200"},{"1":"10","2":"671","3":"200"},{"1":"20","2":"671","3":"200"},{"1":"40","2":"671","3":"200"},{"1":"100","2":"671","3":"200"},{"1":"10","2":"672","3":"200"},{"1":"20","2":"672","3":"200"},{"1":"40","2":"672","3":"200"},{"1":"100","2":"672","3":"200"},{"1":"10","2":"673","3":"200"},{"1":"20","2":"673","3":"200"},{"1":"40","2":"673","3":"200"},{"1":"100","2":"673","3":"200"},{"1":"10","2":"674","3":"200"},{"1":"20","2":"674","3":"200"},{"1":"40","2":"674","3":"200"},{"1":"100","2":"674","3":"200"},{"1":"10","2":"675","3":"200"},{"1":"20","2":"675","3":"200"},{"1":"40","2":"675","3":"200"},{"1":"100","2":"675","3":"200"},{"1":"10","2":"676","3":"200"},{"1":"20","2":"676","3":"200"},{"1":"40","2":"676","3":"200"},{"1":"100","2":"676","3":"200"},{"1":"10","2":"677","3":"200"},{"1":"20","2":"677","3":"200"},{"1":"40","2":"677","3":"200"},{"1":"100","2":"677","3":"200"},{"1":"10","2":"678","3":"200"},{"1":"20","2":"678","3":"200"},{"1":"40","2":"678","3":"200"},{"1":"100","2":"678","3":"200"},{"1":"10","2":"679","3":"200"},{"1":"20","2":"679","3":"200"},{"1":"40","2":"679","3":"200"},{"1":"100","2":"679","3":"200"},{"1":"10","2":"680","3":"200"},{"1":"20","2":"680","3":"200"},{"1":"40","2":"680","3":"200"},{"1":"100","2":"680","3":"200"},{"1":"10","2":"681","3":"200"},{"1":"20","2":"681","3":"200"},{"1":"40","2":"681","3":"200"},{"1":"100","2":"681","3":"200"},{"1":"10","2":"682","3":"200"},{"1":"20","2":"682","3":"200"},{"1":"40","2":"682","3":"200"},{"1":"100","2":"682","3":"200"},{"1":"10","2":"683","3":"200"},{"1":"20","2":"683","3":"200"},{"1":"40","2":"683","3":"200"},{"1":"100","2":"683","3":"200"},{"1":"10","2":"684","3":"200"},{"1":"20","2":"684","3":"200"},{"1":"40","2":"684","3":"200"},{"1":"100","2":"684","3":"200"},{"1":"10","2":"685","3":"200"},{"1":"20","2":"685","3":"200"},{"1":"40","2":"685","3":"200"},{"1":"100","2":"685","3":"200"},{"1":"10","2":"686","3":"200"},{"1":"20","2":"686","3":"200"},{"1":"40","2":"686","3":"200"},{"1":"100","2":"686","3":"200"},{"1":"10","2":"687","3":"200"},{"1":"20","2":"687","3":"200"},{"1":"40","2":"687","3":"200"},{"1":"100","2":"687","3":"200"},{"1":"10","2":"688","3":"200"},{"1":"20","2":"688","3":"200"},{"1":"40","2":"688","3":"200"},{"1":"100","2":"688","3":"200"},{"1":"10","2":"689","3":"200"},{"1":"20","2":"689","3":"200"},{"1":"40","2":"689","3":"200"},{"1":"100","2":"689","3":"200"},{"1":"10","2":"690","3":"200"},{"1":"20","2":"690","3":"200"},{"1":"40","2":"690","3":"200"},{"1":"100","2":"690","3":"200"},{"1":"10","2":"691","3":"200"},{"1":"20","2":"691","3":"200"},{"1":"40","2":"691","3":"200"},{"1":"100","2":"691","3":"200"},{"1":"10","2":"692","3":"200"},{"1":"20","2":"692","3":"200"},{"1":"40","2":"692","3":"200"},{"1":"100","2":"692","3":"200"},{"1":"10","2":"693","3":"200"},{"1":"20","2":"693","3":"200"},{"1":"40","2":"693","3":"200"},{"1":"100","2":"693","3":"200"},{"1":"10","2":"694","3":"200"},{"1":"20","2":"694","3":"200"},{"1":"40","2":"694","3":"200"},{"1":"100","2":"694","3":"200"},{"1":"10","2":"695","3":"200"},{"1":"20","2":"695","3":"200"},{"1":"40","2":"695","3":"200"},{"1":"100","2":"695","3":"200"},{"1":"10","2":"696","3":"200"},{"1":"20","2":"696","3":"200"},{"1":"40","2":"696","3":"200"},{"1":"100","2":"696","3":"200"},{"1":"10","2":"697","3":"200"},{"1":"20","2":"697","3":"200"},{"1":"40","2":"697","3":"200"},{"1":"100","2":"697","3":"200"},{"1":"10","2":"698","3":"200"},{"1":"20","2":"698","3":"200"},{"1":"40","2":"698","3":"200"},{"1":"100","2":"698","3":"200"},{"1":"10","2":"699","3":"200"},{"1":"20","2":"699","3":"200"},{"1":"40","2":"699","3":"200"},{"1":"100","2":"699","3":"200"},{"1":"10","2":"700","3":"200"},{"1":"20","2":"700","3":"200"},{"1":"40","2":"700","3":"200"},{"1":"100","2":"700","3":"200"},{"1":"10","2":"701","3":"200"},{"1":"20","2":"701","3":"200"},{"1":"40","2":"701","3":"200"},{"1":"100","2":"701","3":"200"},{"1":"10","2":"702","3":"200"},{"1":"20","2":"702","3":"200"},{"1":"40","2":"702","3":"200"},{"1":"100","2":"702","3":"200"},{"1":"10","2":"703","3":"200"},{"1":"20","2":"703","3":"200"},{"1":"40","2":"703","3":"200"},{"1":"100","2":"703","3":"200"},{"1":"10","2":"704","3":"200"},{"1":"20","2":"704","3":"200"},{"1":"40","2":"704","3":"200"},{"1":"100","2":"704","3":"200"},{"1":"10","2":"705","3":"200"},{"1":"20","2":"705","3":"200"},{"1":"40","2":"705","3":"200"},{"1":"100","2":"705","3":"200"},{"1":"10","2":"706","3":"200"},{"1":"20","2":"706","3":"200"},{"1":"40","2":"706","3":"200"},{"1":"100","2":"706","3":"200"},{"1":"10","2":"707","3":"200"},{"1":"20","2":"707","3":"200"},{"1":"40","2":"707","3":"200"},{"1":"100","2":"707","3":"200"},{"1":"10","2":"708","3":"200"},{"1":"20","2":"708","3":"200"},{"1":"40","2":"708","3":"200"},{"1":"100","2":"708","3":"200"},{"1":"10","2":"709","3":"200"},{"1":"20","2":"709","3":"200"},{"1":"40","2":"709","3":"200"},{"1":"100","2":"709","3":"200"},{"1":"10","2":"710","3":"200"},{"1":"20","2":"710","3":"200"},{"1":"40","2":"710","3":"200"},{"1":"100","2":"710","3":"200"},{"1":"10","2":"711","3":"200"},{"1":"20","2":"711","3":"200"},{"1":"40","2":"711","3":"200"},{"1":"100","2":"711","3":"200"},{"1":"10","2":"712","3":"200"},{"1":"20","2":"712","3":"200"},{"1":"40","2":"712","3":"200"},{"1":"100","2":"712","3":"200"},{"1":"10","2":"713","3":"200"},{"1":"20","2":"713","3":"200"},{"1":"40","2":"713","3":"200"},{"1":"100","2":"713","3":"200"},{"1":"10","2":"714","3":"200"},{"1":"20","2":"714","3":"200"},{"1":"40","2":"714","3":"200"},{"1":"100","2":"714","3":"200"},{"1":"10","2":"715","3":"200"},{"1":"20","2":"715","3":"200"},{"1":"40","2":"715","3":"200"},{"1":"100","2":"715","3":"200"},{"1":"10","2":"716","3":"200"},{"1":"20","2":"716","3":"200"},{"1":"40","2":"716","3":"200"},{"1":"100","2":"716","3":"200"},{"1":"10","2":"717","3":"200"},{"1":"20","2":"717","3":"200"},{"1":"40","2":"717","3":"200"},{"1":"100","2":"717","3":"200"},{"1":"10","2":"718","3":"200"},{"1":"20","2":"718","3":"200"},{"1":"40","2":"718","3":"200"},{"1":"100","2":"718","3":"200"},{"1":"10","2":"719","3":"200"},{"1":"20","2":"719","3":"200"},{"1":"40","2":"719","3":"200"},{"1":"100","2":"719","3":"200"},{"1":"10","2":"720","3":"200"},{"1":"20","2":"720","3":"200"},{"1":"40","2":"720","3":"200"},{"1":"100","2":"720","3":"200"},{"1":"10","2":"721","3":"200"},{"1":"20","2":"721","3":"200"},{"1":"40","2":"721","3":"200"},{"1":"100","2":"721","3":"200"},{"1":"10","2":"722","3":"200"},{"1":"20","2":"722","3":"200"},{"1":"40","2":"722","3":"200"},{"1":"100","2":"722","3":"200"},{"1":"10","2":"723","3":"200"},{"1":"20","2":"723","3":"200"},{"1":"40","2":"723","3":"200"},{"1":"100","2":"723","3":"200"},{"1":"10","2":"724","3":"200"},{"1":"20","2":"724","3":"200"},{"1":"40","2":"724","3":"200"},{"1":"100","2":"724","3":"200"},{"1":"10","2":"725","3":"200"},{"1":"20","2":"725","3":"200"},{"1":"40","2":"725","3":"200"},{"1":"100","2":"725","3":"200"},{"1":"10","2":"726","3":"200"},{"1":"20","2":"726","3":"200"},{"1":"40","2":"726","3":"200"},{"1":"100","2":"726","3":"200"},{"1":"10","2":"727","3":"200"},{"1":"20","2":"727","3":"200"},{"1":"40","2":"727","3":"200"},{"1":"100","2":"727","3":"200"},{"1":"10","2":"728","3":"200"},{"1":"20","2":"728","3":"200"},{"1":"40","2":"728","3":"200"},{"1":"100","2":"728","3":"200"},{"1":"10","2":"729","3":"200"},{"1":"20","2":"729","3":"200"},{"1":"40","2":"729","3":"200"},{"1":"100","2":"729","3":"200"},{"1":"10","2":"730","3":"200"},{"1":"20","2":"730","3":"200"},{"1":"40","2":"730","3":"200"},{"1":"100","2":"730","3":"200"},{"1":"10","2":"731","3":"200"},{"1":"20","2":"731","3":"200"},{"1":"40","2":"731","3":"200"},{"1":"100","2":"731","3":"200"},{"1":"10","2":"732","3":"200"},{"1":"20","2":"732","3":"200"},{"1":"40","2":"732","3":"200"},{"1":"100","2":"732","3":"200"},{"1":"10","2":"733","3":"200"},{"1":"20","2":"733","3":"200"},{"1":"40","2":"733","3":"200"},{"1":"100","2":"733","3":"200"},{"1":"10","2":"734","3":"200"},{"1":"20","2":"734","3":"200"},{"1":"40","2":"734","3":"200"},{"1":"100","2":"734","3":"200"},{"1":"10","2":"735","3":"200"},{"1":"20","2":"735","3":"200"},{"1":"40","2":"735","3":"200"},{"1":"100","2":"735","3":"200"},{"1":"10","2":"736","3":"200"},{"1":"20","2":"736","3":"200"},{"1":"40","2":"736","3":"200"},{"1":"100","2":"736","3":"200"},{"1":"10","2":"737","3":"200"},{"1":"20","2":"737","3":"200"},{"1":"40","2":"737","3":"200"},{"1":"100","2":"737","3":"200"},{"1":"10","2":"738","3":"200"},{"1":"20","2":"738","3":"200"},{"1":"40","2":"738","3":"200"},{"1":"100","2":"738","3":"200"},{"1":"10","2":"739","3":"200"},{"1":"20","2":"739","3":"200"},{"1":"40","2":"739","3":"200"},{"1":"100","2":"739","3":"200"},{"1":"10","2":"740","3":"200"},{"1":"20","2":"740","3":"200"},{"1":"40","2":"740","3":"200"},{"1":"100","2":"740","3":"200"},{"1":"10","2":"741","3":"200"},{"1":"20","2":"741","3":"200"},{"1":"40","2":"741","3":"200"},{"1":"100","2":"741","3":"200"},{"1":"10","2":"742","3":"200"},{"1":"20","2":"742","3":"200"},{"1":"40","2":"742","3":"200"},{"1":"100","2":"742","3":"200"},{"1":"10","2":"743","3":"200"},{"1":"20","2":"743","3":"200"},{"1":"40","2":"743","3":"200"},{"1":"100","2":"743","3":"200"},{"1":"10","2":"744","3":"200"},{"1":"20","2":"744","3":"200"},{"1":"40","2":"744","3":"200"},{"1":"100","2":"744","3":"200"},{"1":"10","2":"745","3":"200"},{"1":"20","2":"745","3":"200"},{"1":"40","2":"745","3":"200"},{"1":"100","2":"745","3":"200"},{"1":"10","2":"746","3":"200"},{"1":"20","2":"746","3":"200"},{"1":"40","2":"746","3":"200"},{"1":"100","2":"746","3":"200"},{"1":"10","2":"747","3":"200"},{"1":"20","2":"747","3":"200"},{"1":"40","2":"747","3":"200"},{"1":"100","2":"747","3":"200"},{"1":"10","2":"748","3":"200"},{"1":"20","2":"748","3":"200"},{"1":"40","2":"748","3":"200"},{"1":"100","2":"748","3":"200"},{"1":"10","2":"749","3":"200"},{"1":"20","2":"749","3":"200"},{"1":"40","2":"749","3":"200"},{"1":"100","2":"749","3":"200"},{"1":"10","2":"750","3":"200"},{"1":"20","2":"750","3":"200"},{"1":"40","2":"750","3":"200"},{"1":"100","2":"750","3":"200"},{"1":"10","2":"751","3":"200"},{"1":"20","2":"751","3":"200"},{"1":"40","2":"751","3":"200"},{"1":"100","2":"751","3":"200"},{"1":"10","2":"752","3":"200"},{"1":"20","2":"752","3":"200"},{"1":"40","2":"752","3":"200"},{"1":"100","2":"752","3":"200"},{"1":"10","2":"753","3":"200"},{"1":"20","2":"753","3":"200"},{"1":"40","2":"753","3":"200"},{"1":"100","2":"753","3":"200"},{"1":"10","2":"754","3":"200"},{"1":"20","2":"754","3":"200"},{"1":"40","2":"754","3":"200"},{"1":"100","2":"754","3":"200"},{"1":"10","2":"755","3":"200"},{"1":"20","2":"755","3":"200"},{"1":"40","2":"755","3":"200"},{"1":"100","2":"755","3":"200"},{"1":"10","2":"756","3":"200"},{"1":"20","2":"756","3":"200"},{"1":"40","2":"756","3":"200"},{"1":"100","2":"756","3":"200"},{"1":"10","2":"757","3":"200"},{"1":"20","2":"757","3":"200"},{"1":"40","2":"757","3":"200"},{"1":"100","2":"757","3":"200"},{"1":"10","2":"758","3":"200"},{"1":"20","2":"758","3":"200"},{"1":"40","2":"758","3":"200"},{"1":"100","2":"758","3":"200"},{"1":"10","2":"759","3":"200"},{"1":"20","2":"759","3":"200"},{"1":"40","2":"759","3":"200"},{"1":"100","2":"759","3":"200"},{"1":"10","2":"760","3":"200"},{"1":"20","2":"760","3":"200"},{"1":"40","2":"760","3":"200"},{"1":"100","2":"760","3":"200"},{"1":"10","2":"761","3":"200"},{"1":"20","2":"761","3":"200"},{"1":"40","2":"761","3":"200"},{"1":"100","2":"761","3":"200"},{"1":"10","2":"762","3":"200"},{"1":"20","2":"762","3":"200"},{"1":"40","2":"762","3":"200"},{"1":"100","2":"762","3":"200"},{"1":"10","2":"763","3":"200"},{"1":"20","2":"763","3":"200"},{"1":"40","2":"763","3":"200"},{"1":"100","2":"763","3":"200"},{"1":"10","2":"764","3":"200"},{"1":"20","2":"764","3":"200"},{"1":"40","2":"764","3":"200"},{"1":"100","2":"764","3":"200"},{"1":"10","2":"765","3":"200"},{"1":"20","2":"765","3":"200"},{"1":"40","2":"765","3":"200"},{"1":"100","2":"765","3":"200"},{"1":"10","2":"766","3":"200"},{"1":"20","2":"766","3":"200"},{"1":"40","2":"766","3":"200"},{"1":"100","2":"766","3":"200"},{"1":"10","2":"767","3":"200"},{"1":"20","2":"767","3":"200"},{"1":"40","2":"767","3":"200"},{"1":"100","2":"767","3":"200"},{"1":"10","2":"768","3":"200"},{"1":"20","2":"768","3":"200"},{"1":"40","2":"768","3":"200"},{"1":"100","2":"768","3":"200"},{"1":"10","2":"769","3":"200"},{"1":"20","2":"769","3":"200"},{"1":"40","2":"769","3":"200"},{"1":"100","2":"769","3":"200"},{"1":"10","2":"770","3":"200"},{"1":"20","2":"770","3":"200"},{"1":"40","2":"770","3":"200"},{"1":"100","2":"770","3":"200"},{"1":"10","2":"771","3":"200"},{"1":"20","2":"771","3":"200"},{"1":"40","2":"771","3":"200"},{"1":"100","2":"771","3":"200"},{"1":"10","2":"772","3":"200"},{"1":"20","2":"772","3":"200"},{"1":"40","2":"772","3":"200"},{"1":"100","2":"772","3":"200"},{"1":"10","2":"773","3":"200"},{"1":"20","2":"773","3":"200"},{"1":"40","2":"773","3":"200"},{"1":"100","2":"773","3":"200"},{"1":"10","2":"774","3":"200"},{"1":"20","2":"774","3":"200"},{"1":"40","2":"774","3":"200"},{"1":"100","2":"774","3":"200"},{"1":"10","2":"775","3":"200"},{"1":"20","2":"775","3":"200"},{"1":"40","2":"775","3":"200"},{"1":"100","2":"775","3":"200"},{"1":"10","2":"776","3":"200"},{"1":"20","2":"776","3":"200"},{"1":"40","2":"776","3":"200"},{"1":"100","2":"776","3":"200"},{"1":"10","2":"777","3":"200"},{"1":"20","2":"777","3":"200"},{"1":"40","2":"777","3":"200"},{"1":"100","2":"777","3":"200"},{"1":"10","2":"778","3":"200"},{"1":"20","2":"778","3":"200"},{"1":"40","2":"778","3":"200"},{"1":"100","2":"778","3":"200"},{"1":"10","2":"779","3":"200"},{"1":"20","2":"779","3":"200"},{"1":"40","2":"779","3":"200"},{"1":"100","2":"779","3":"200"},{"1":"10","2":"780","3":"200"},{"1":"20","2":"780","3":"200"},{"1":"40","2":"780","3":"200"},{"1":"100","2":"780","3":"200"},{"1":"10","2":"781","3":"200"},{"1":"20","2":"781","3":"200"},{"1":"40","2":"781","3":"200"},{"1":"100","2":"781","3":"200"},{"1":"10","2":"782","3":"200"},{"1":"20","2":"782","3":"200"},{"1":"40","2":"782","3":"200"},{"1":"100","2":"782","3":"200"},{"1":"10","2":"783","3":"200"},{"1":"20","2":"783","3":"200"},{"1":"40","2":"783","3":"200"},{"1":"100","2":"783","3":"200"},{"1":"10","2":"784","3":"200"},{"1":"20","2":"784","3":"200"},{"1":"40","2":"784","3":"200"},{"1":"100","2":"784","3":"200"},{"1":"10","2":"785","3":"200"},{"1":"20","2":"785","3":"200"},{"1":"40","2":"785","3":"200"},{"1":"100","2":"785","3":"200"},{"1":"10","2":"786","3":"200"},{"1":"20","2":"786","3":"200"},{"1":"40","2":"786","3":"200"},{"1":"100","2":"786","3":"200"},{"1":"10","2":"787","3":"200"},{"1":"20","2":"787","3":"200"},{"1":"40","2":"787","3":"200"},{"1":"100","2":"787","3":"200"},{"1":"10","2":"788","3":"200"},{"1":"20","2":"788","3":"200"},{"1":"40","2":"788","3":"200"},{"1":"100","2":"788","3":"200"},{"1":"10","2":"789","3":"200"},{"1":"20","2":"789","3":"200"},{"1":"40","2":"789","3":"200"},{"1":"100","2":"789","3":"200"},{"1":"10","2":"790","3":"200"},{"1":"20","2":"790","3":"200"},{"1":"40","2":"790","3":"200"},{"1":"100","2":"790","3":"200"},{"1":"10","2":"791","3":"200"},{"1":"20","2":"791","3":"200"},{"1":"40","2":"791","3":"200"},{"1":"100","2":"791","3":"200"},{"1":"10","2":"792","3":"200"},{"1":"20","2":"792","3":"200"},{"1":"40","2":"792","3":"200"},{"1":"100","2":"792","3":"200"},{"1":"10","2":"793","3":"200"},{"1":"20","2":"793","3":"200"},{"1":"40","2":"793","3":"200"},{"1":"100","2":"793","3":"200"},{"1":"10","2":"794","3":"200"},{"1":"20","2":"794","3":"200"},{"1":"40","2":"794","3":"200"},{"1":"100","2":"794","3":"200"},{"1":"10","2":"795","3":"200"},{"1":"20","2":"795","3":"200"},{"1":"40","2":"795","3":"200"},{"1":"100","2":"795","3":"200"},{"1":"10","2":"796","3":"200"},{"1":"20","2":"796","3":"200"},{"1":"40","2":"796","3":"200"},{"1":"100","2":"796","3":"200"},{"1":"10","2":"797","3":"200"},{"1":"20","2":"797","3":"200"},{"1":"40","2":"797","3":"200"},{"1":"100","2":"797","3":"200"},{"1":"10","2":"798","3":"200"},{"1":"20","2":"798","3":"200"},{"1":"40","2":"798","3":"200"},{"1":"100","2":"798","3":"200"},{"1":"10","2":"799","3":"200"},{"1":"20","2":"799","3":"200"},{"1":"40","2":"799","3":"200"},{"1":"100","2":"799","3":"200"},{"1":"10","2":"800","3":"200"},{"1":"20","2":"800","3":"200"},{"1":"40","2":"800","3":"200"},{"1":"100","2":"800","3":"200"},{"1":"10","2":"801","3":"200"},{"1":"20","2":"801","3":"200"},{"1":"40","2":"801","3":"200"},{"1":"100","2":"801","3":"200"},{"1":"10","2":"802","3":"200"},{"1":"20","2":"802","3":"200"},{"1":"40","2":"802","3":"200"},{"1":"100","2":"802","3":"200"},{"1":"10","2":"803","3":"200"},{"1":"20","2":"803","3":"200"},{"1":"40","2":"803","3":"200"},{"1":"100","2":"803","3":"200"},{"1":"10","2":"804","3":"200"},{"1":"20","2":"804","3":"200"},{"1":"40","2":"804","3":"200"},{"1":"100","2":"804","3":"200"},{"1":"10","2":"805","3":"200"},{"1":"20","2":"805","3":"200"},{"1":"40","2":"805","3":"200"},{"1":"100","2":"805","3":"200"},{"1":"10","2":"806","3":"200"},{"1":"20","2":"806","3":"200"},{"1":"40","2":"806","3":"200"},{"1":"100","2":"806","3":"200"},{"1":"10","2":"807","3":"200"},{"1":"20","2":"807","3":"200"},{"1":"40","2":"807","3":"200"},{"1":"100","2":"807","3":"200"},{"1":"10","2":"808","3":"200"},{"1":"20","2":"808","3":"200"},{"1":"40","2":"808","3":"200"},{"1":"100","2":"808","3":"200"},{"1":"10","2":"809","3":"200"},{"1":"20","2":"809","3":"200"},{"1":"40","2":"809","3":"200"},{"1":"100","2":"809","3":"200"},{"1":"10","2":"810","3":"200"},{"1":"20","2":"810","3":"200"},{"1":"40","2":"810","3":"200"},{"1":"100","2":"810","3":"200"},{"1":"10","2":"811","3":"200"},{"1":"20","2":"811","3":"200"},{"1":"40","2":"811","3":"200"},{"1":"100","2":"811","3":"200"},{"1":"10","2":"812","3":"200"},{"1":"20","2":"812","3":"200"},{"1":"40","2":"812","3":"200"},{"1":"100","2":"812","3":"200"},{"1":"10","2":"813","3":"200"},{"1":"20","2":"813","3":"200"},{"1":"40","2":"813","3":"200"},{"1":"100","2":"813","3":"200"},{"1":"10","2":"814","3":"200"},{"1":"20","2":"814","3":"200"},{"1":"40","2":"814","3":"200"},{"1":"100","2":"814","3":"200"},{"1":"10","2":"815","3":"200"},{"1":"20","2":"815","3":"200"},{"1":"40","2":"815","3":"200"},{"1":"100","2":"815","3":"200"},{"1":"10","2":"816","3":"200"},{"1":"20","2":"816","3":"200"},{"1":"40","2":"816","3":"200"},{"1":"100","2":"816","3":"200"},{"1":"10","2":"817","3":"200"},{"1":"20","2":"817","3":"200"},{"1":"40","2":"817","3":"200"},{"1":"100","2":"817","3":"200"},{"1":"10","2":"818","3":"200"},{"1":"20","2":"818","3":"200"},{"1":"40","2":"818","3":"200"},{"1":"100","2":"818","3":"200"},{"1":"10","2":"819","3":"200"},{"1":"20","2":"819","3":"200"},{"1":"40","2":"819","3":"200"},{"1":"100","2":"819","3":"200"},{"1":"10","2":"820","3":"200"},{"1":"20","2":"820","3":"200"},{"1":"40","2":"820","3":"200"},{"1":"100","2":"820","3":"200"},{"1":"10","2":"821","3":"200"},{"1":"20","2":"821","3":"200"},{"1":"40","2":"821","3":"200"},{"1":"100","2":"821","3":"200"},{"1":"10","2":"822","3":"200"},{"1":"20","2":"822","3":"200"},{"1":"40","2":"822","3":"200"},{"1":"100","2":"822","3":"200"},{"1":"10","2":"823","3":"200"},{"1":"20","2":"823","3":"200"},{"1":"40","2":"823","3":"200"},{"1":"100","2":"823","3":"200"},{"1":"10","2":"824","3":"200"},{"1":"20","2":"824","3":"200"},{"1":"40","2":"824","3":"200"},{"1":"100","2":"824","3":"200"},{"1":"10","2":"825","3":"200"},{"1":"20","2":"825","3":"200"},{"1":"40","2":"825","3":"200"},{"1":"100","2":"825","3":"200"},{"1":"10","2":"826","3":"200"},{"1":"20","2":"826","3":"200"},{"1":"40","2":"826","3":"200"},{"1":"100","2":"826","3":"200"},{"1":"10","2":"827","3":"200"},{"1":"20","2":"827","3":"200"},{"1":"40","2":"827","3":"200"},{"1":"100","2":"827","3":"200"},{"1":"10","2":"828","3":"200"},{"1":"20","2":"828","3":"200"},{"1":"40","2":"828","3":"200"},{"1":"100","2":"828","3":"200"},{"1":"10","2":"829","3":"200"},{"1":"20","2":"829","3":"200"},{"1":"40","2":"829","3":"200"},{"1":"100","2":"829","3":"200"},{"1":"10","2":"830","3":"200"},{"1":"20","2":"830","3":"200"},{"1":"40","2":"830","3":"200"},{"1":"100","2":"830","3":"200"},{"1":"10","2":"831","3":"200"},{"1":"20","2":"831","3":"200"},{"1":"40","2":"831","3":"200"},{"1":"100","2":"831","3":"200"},{"1":"10","2":"832","3":"200"},{"1":"20","2":"832","3":"200"},{"1":"40","2":"832","3":"200"},{"1":"100","2":"832","3":"200"},{"1":"10","2":"833","3":"200"},{"1":"20","2":"833","3":"200"},{"1":"40","2":"833","3":"200"},{"1":"100","2":"833","3":"200"},{"1":"10","2":"834","3":"200"},{"1":"20","2":"834","3":"200"},{"1":"40","2":"834","3":"200"},{"1":"100","2":"834","3":"200"},{"1":"10","2":"835","3":"200"},{"1":"20","2":"835","3":"200"},{"1":"40","2":"835","3":"200"},{"1":"100","2":"835","3":"200"},{"1":"10","2":"836","3":"200"},{"1":"20","2":"836","3":"200"},{"1":"40","2":"836","3":"200"},{"1":"100","2":"836","3":"200"},{"1":"10","2":"837","3":"200"},{"1":"20","2":"837","3":"200"},{"1":"40","2":"837","3":"200"},{"1":"100","2":"837","3":"200"},{"1":"10","2":"838","3":"200"},{"1":"20","2":"838","3":"200"},{"1":"40","2":"838","3":"200"},{"1":"100","2":"838","3":"200"},{"1":"10","2":"839","3":"200"},{"1":"20","2":"839","3":"200"},{"1":"40","2":"839","3":"200"},{"1":"100","2":"839","3":"200"},{"1":"10","2":"840","3":"200"},{"1":"20","2":"840","3":"200"},{"1":"40","2":"840","3":"200"},{"1":"100","2":"840","3":"200"},{"1":"10","2":"841","3":"200"},{"1":"20","2":"841","3":"200"},{"1":"40","2":"841","3":"200"},{"1":"100","2":"841","3":"200"},{"1":"10","2":"842","3":"200"},{"1":"20","2":"842","3":"200"},{"1":"40","2":"842","3":"200"},{"1":"100","2":"842","3":"200"},{"1":"10","2":"843","3":"200"},{"1":"20","2":"843","3":"200"},{"1":"40","2":"843","3":"200"},{"1":"100","2":"843","3":"200"},{"1":"10","2":"844","3":"200"},{"1":"20","2":"844","3":"200"},{"1":"40","2":"844","3":"200"},{"1":"100","2":"844","3":"200"},{"1":"10","2":"845","3":"200"},{"1":"20","2":"845","3":"200"},{"1":"40","2":"845","3":"200"},{"1":"100","2":"845","3":"200"},{"1":"10","2":"846","3":"200"},{"1":"20","2":"846","3":"200"},{"1":"40","2":"846","3":"200"},{"1":"100","2":"846","3":"200"},{"1":"10","2":"847","3":"200"},{"1":"20","2":"847","3":"200"},{"1":"40","2":"847","3":"200"},{"1":"100","2":"847","3":"200"},{"1":"10","2":"848","3":"200"},{"1":"20","2":"848","3":"200"},{"1":"40","2":"848","3":"200"},{"1":"100","2":"848","3":"200"},{"1":"10","2":"849","3":"200"},{"1":"20","2":"849","3":"200"},{"1":"40","2":"849","3":"200"},{"1":"100","2":"849","3":"200"},{"1":"10","2":"850","3":"200"},{"1":"20","2":"850","3":"200"},{"1":"40","2":"850","3":"200"},{"1":"100","2":"850","3":"200"},{"1":"10","2":"851","3":"200"},{"1":"20","2":"851","3":"200"},{"1":"40","2":"851","3":"200"},{"1":"100","2":"851","3":"200"},{"1":"10","2":"852","3":"200"},{"1":"20","2":"852","3":"200"},{"1":"40","2":"852","3":"200"},{"1":"100","2":"852","3":"200"},{"1":"10","2":"853","3":"200"},{"1":"20","2":"853","3":"200"},{"1":"40","2":"853","3":"200"},{"1":"100","2":"853","3":"200"},{"1":"10","2":"854","3":"200"},{"1":"20","2":"854","3":"200"},{"1":"40","2":"854","3":"200"},{"1":"100","2":"854","3":"200"},{"1":"10","2":"855","3":"200"},{"1":"20","2":"855","3":"200"},{"1":"40","2":"855","3":"200"},{"1":"100","2":"855","3":"200"},{"1":"10","2":"856","3":"200"},{"1":"20","2":"856","3":"200"},{"1":"40","2":"856","3":"200"},{"1":"100","2":"856","3":"200"},{"1":"10","2":"857","3":"200"},{"1":"20","2":"857","3":"200"},{"1":"40","2":"857","3":"200"},{"1":"100","2":"857","3":"200"},{"1":"10","2":"858","3":"200"},{"1":"20","2":"858","3":"200"},{"1":"40","2":"858","3":"200"},{"1":"100","2":"858","3":"200"},{"1":"10","2":"859","3":"200"},{"1":"20","2":"859","3":"200"},{"1":"40","2":"859","3":"200"},{"1":"100","2":"859","3":"200"},{"1":"10","2":"860","3":"200"},{"1":"20","2":"860","3":"200"},{"1":"40","2":"860","3":"200"},{"1":"100","2":"860","3":"200"},{"1":"10","2":"861","3":"200"},{"1":"20","2":"861","3":"200"},{"1":"40","2":"861","3":"200"},{"1":"100","2":"861","3":"200"},{"1":"10","2":"862","3":"200"},{"1":"20","2":"862","3":"200"},{"1":"40","2":"862","3":"200"},{"1":"100","2":"862","3":"200"},{"1":"10","2":"863","3":"200"},{"1":"20","2":"863","3":"200"},{"1":"40","2":"863","3":"200"},{"1":"100","2":"863","3":"200"},{"1":"10","2":"864","3":"200"},{"1":"20","2":"864","3":"200"},{"1":"40","2":"864","3":"200"},{"1":"100","2":"864","3":"200"},{"1":"10","2":"865","3":"200"},{"1":"20","2":"865","3":"200"},{"1":"40","2":"865","3":"200"},{"1":"100","2":"865","3":"200"},{"1":"10","2":"866","3":"200"},{"1":"20","2":"866","3":"200"},{"1":"40","2":"866","3":"200"},{"1":"100","2":"866","3":"200"},{"1":"10","2":"867","3":"200"},{"1":"20","2":"867","3":"200"},{"1":"40","2":"867","3":"200"},{"1":"100","2":"867","3":"200"},{"1":"10","2":"868","3":"200"},{"1":"20","2":"868","3":"200"},{"1":"40","2":"868","3":"200"},{"1":"100","2":"868","3":"200"},{"1":"10","2":"869","3":"200"},{"1":"20","2":"869","3":"200"},{"1":"40","2":"869","3":"200"},{"1":"100","2":"869","3":"200"},{"1":"10","2":"870","3":"200"},{"1":"20","2":"870","3":"200"},{"1":"40","2":"870","3":"200"},{"1":"100","2":"870","3":"200"},{"1":"10","2":"871","3":"200"},{"1":"20","2":"871","3":"200"},{"1":"40","2":"871","3":"200"},{"1":"100","2":"871","3":"200"},{"1":"10","2":"872","3":"200"},{"1":"20","2":"872","3":"200"},{"1":"40","2":"872","3":"200"},{"1":"100","2":"872","3":"200"},{"1":"10","2":"873","3":"200"},{"1":"20","2":"873","3":"200"},{"1":"40","2":"873","3":"200"},{"1":"100","2":"873","3":"200"},{"1":"10","2":"874","3":"200"},{"1":"20","2":"874","3":"200"},{"1":"40","2":"874","3":"200"},{"1":"100","2":"874","3":"200"},{"1":"10","2":"875","3":"200"},{"1":"20","2":"875","3":"200"},{"1":"40","2":"875","3":"200"},{"1":"100","2":"875","3":"200"},{"1":"10","2":"876","3":"200"},{"1":"20","2":"876","3":"200"},{"1":"40","2":"876","3":"200"},{"1":"100","2":"876","3":"200"},{"1":"10","2":"877","3":"200"},{"1":"20","2":"877","3":"200"},{"1":"40","2":"877","3":"200"},{"1":"100","2":"877","3":"200"},{"1":"10","2":"878","3":"200"},{"1":"20","2":"878","3":"200"},{"1":"40","2":"878","3":"200"},{"1":"100","2":"878","3":"200"},{"1":"10","2":"879","3":"200"},{"1":"20","2":"879","3":"200"},{"1":"40","2":"879","3":"200"},{"1":"100","2":"879","3":"200"},{"1":"10","2":"880","3":"200"},{"1":"20","2":"880","3":"200"},{"1":"40","2":"880","3":"200"},{"1":"100","2":"880","3":"200"},{"1":"10","2":"881","3":"200"},{"1":"20","2":"881","3":"200"},{"1":"40","2":"881","3":"200"},{"1":"100","2":"881","3":"200"},{"1":"10","2":"882","3":"200"},{"1":"20","2":"882","3":"200"},{"1":"40","2":"882","3":"200"},{"1":"100","2":"882","3":"200"},{"1":"10","2":"883","3":"200"},{"1":"20","2":"883","3":"200"},{"1":"40","2":"883","3":"200"},{"1":"100","2":"883","3":"200"},{"1":"10","2":"884","3":"200"},{"1":"20","2":"884","3":"200"},{"1":"40","2":"884","3":"200"},{"1":"100","2":"884","3":"200"},{"1":"10","2":"885","3":"200"},{"1":"20","2":"885","3":"200"},{"1":"40","2":"885","3":"200"},{"1":"100","2":"885","3":"200"},{"1":"10","2":"886","3":"200"},{"1":"20","2":"886","3":"200"},{"1":"40","2":"886","3":"200"},{"1":"100","2":"886","3":"200"},{"1":"10","2":"887","3":"200"},{"1":"20","2":"887","3":"200"},{"1":"40","2":"887","3":"200"},{"1":"100","2":"887","3":"200"},{"1":"10","2":"888","3":"200"},{"1":"20","2":"888","3":"200"},{"1":"40","2":"888","3":"200"},{"1":"100","2":"888","3":"200"},{"1":"10","2":"889","3":"200"},{"1":"20","2":"889","3":"200"},{"1":"40","2":"889","3":"200"},{"1":"100","2":"889","3":"200"},{"1":"10","2":"890","3":"200"},{"1":"20","2":"890","3":"200"},{"1":"40","2":"890","3":"200"},{"1":"100","2":"890","3":"200"},{"1":"10","2":"891","3":"200"},{"1":"20","2":"891","3":"200"},{"1":"40","2":"891","3":"200"},{"1":"100","2":"891","3":"200"},{"1":"10","2":"892","3":"200"},{"1":"20","2":"892","3":"200"},{"1":"40","2":"892","3":"200"},{"1":"100","2":"892","3":"200"},{"1":"10","2":"893","3":"200"},{"1":"20","2":"893","3":"200"},{"1":"40","2":"893","3":"200"},{"1":"100","2":"893","3":"200"},{"1":"10","2":"894","3":"200"},{"1":"20","2":"894","3":"200"},{"1":"40","2":"894","3":"200"},{"1":"100","2":"894","3":"200"},{"1":"10","2":"895","3":"200"},{"1":"20","2":"895","3":"200"},{"1":"40","2":"895","3":"200"},{"1":"100","2":"895","3":"200"},{"1":"10","2":"896","3":"200"},{"1":"20","2":"896","3":"200"},{"1":"40","2":"896","3":"200"},{"1":"100","2":"896","3":"200"},{"1":"10","2":"897","3":"200"},{"1":"20","2":"897","3":"200"},{"1":"40","2":"897","3":"200"},{"1":"100","2":"897","3":"200"},{"1":"10","2":"898","3":"200"},{"1":"20","2":"898","3":"200"},{"1":"40","2":"898","3":"200"},{"1":"100","2":"898","3":"200"},{"1":"10","2":"899","3":"200"},{"1":"20","2":"899","3":"200"},{"1":"40","2":"899","3":"200"},{"1":"100","2":"899","3":"200"},{"1":"10","2":"900","3":"200"},{"1":"20","2":"900","3":"200"},{"1":"40","2":"900","3":"200"},{"1":"100","2":"900","3":"200"},{"1":"10","2":"901","3":"200"},{"1":"20","2":"901","3":"200"},{"1":"40","2":"901","3":"200"},{"1":"100","2":"901","3":"200"},{"1":"10","2":"902","3":"200"},{"1":"20","2":"902","3":"200"},{"1":"40","2":"902","3":"200"},{"1":"100","2":"902","3":"200"},{"1":"10","2":"903","3":"200"},{"1":"20","2":"903","3":"200"},{"1":"40","2":"903","3":"200"},{"1":"100","2":"903","3":"200"},{"1":"10","2":"904","3":"200"},{"1":"20","2":"904","3":"200"},{"1":"40","2":"904","3":"200"},{"1":"100","2":"904","3":"200"},{"1":"10","2":"905","3":"200"},{"1":"20","2":"905","3":"200"},{"1":"40","2":"905","3":"200"},{"1":"100","2":"905","3":"200"},{"1":"10","2":"906","3":"200"},{"1":"20","2":"906","3":"200"},{"1":"40","2":"906","3":"200"},{"1":"100","2":"906","3":"200"},{"1":"10","2":"907","3":"200"},{"1":"20","2":"907","3":"200"},{"1":"40","2":"907","3":"200"},{"1":"100","2":"907","3":"200"},{"1":"10","2":"908","3":"200"},{"1":"20","2":"908","3":"200"},{"1":"40","2":"908","3":"200"},{"1":"100","2":"908","3":"200"},{"1":"10","2":"909","3":"200"},{"1":"20","2":"909","3":"200"},{"1":"40","2":"909","3":"200"},{"1":"100","2":"909","3":"200"},{"1":"10","2":"910","3":"200"},{"1":"20","2":"910","3":"200"},{"1":"40","2":"910","3":"200"},{"1":"100","2":"910","3":"200"},{"1":"10","2":"911","3":"200"},{"1":"20","2":"911","3":"200"},{"1":"40","2":"911","3":"200"},{"1":"100","2":"911","3":"200"},{"1":"10","2":"912","3":"200"},{"1":"20","2":"912","3":"200"},{"1":"40","2":"912","3":"200"},{"1":"100","2":"912","3":"200"},{"1":"10","2":"913","3":"200"},{"1":"20","2":"913","3":"200"},{"1":"40","2":"913","3":"200"},{"1":"100","2":"913","3":"200"},{"1":"10","2":"914","3":"200"},{"1":"20","2":"914","3":"200"},{"1":"40","2":"914","3":"200"},{"1":"100","2":"914","3":"200"},{"1":"10","2":"915","3":"200"},{"1":"20","2":"915","3":"200"},{"1":"40","2":"915","3":"200"},{"1":"100","2":"915","3":"200"},{"1":"10","2":"916","3":"200"},{"1":"20","2":"916","3":"200"},{"1":"40","2":"916","3":"200"},{"1":"100","2":"916","3":"200"},{"1":"10","2":"917","3":"200"},{"1":"20","2":"917","3":"200"},{"1":"40","2":"917","3":"200"},{"1":"100","2":"917","3":"200"},{"1":"10","2":"918","3":"200"},{"1":"20","2":"918","3":"200"},{"1":"40","2":"918","3":"200"},{"1":"100","2":"918","3":"200"},{"1":"10","2":"919","3":"200"},{"1":"20","2":"919","3":"200"},{"1":"40","2":"919","3":"200"},{"1":"100","2":"919","3":"200"},{"1":"10","2":"920","3":"200"},{"1":"20","2":"920","3":"200"},{"1":"40","2":"920","3":"200"},{"1":"100","2":"920","3":"200"},{"1":"10","2":"921","3":"200"},{"1":"20","2":"921","3":"200"},{"1":"40","2":"921","3":"200"},{"1":"100","2":"921","3":"200"},{"1":"10","2":"922","3":"200"},{"1":"20","2":"922","3":"200"},{"1":"40","2":"922","3":"200"},{"1":"100","2":"922","3":"200"},{"1":"10","2":"923","3":"200"},{"1":"20","2":"923","3":"200"},{"1":"40","2":"923","3":"200"},{"1":"100","2":"923","3":"200"},{"1":"10","2":"924","3":"200"},{"1":"20","2":"924","3":"200"},{"1":"40","2":"924","3":"200"},{"1":"100","2":"924","3":"200"},{"1":"10","2":"925","3":"200"},{"1":"20","2":"925","3":"200"},{"1":"40","2":"925","3":"200"},{"1":"100","2":"925","3":"200"},{"1":"10","2":"926","3":"200"},{"1":"20","2":"926","3":"200"},{"1":"40","2":"926","3":"200"},{"1":"100","2":"926","3":"200"},{"1":"10","2":"927","3":"200"},{"1":"20","2":"927","3":"200"},{"1":"40","2":"927","3":"200"},{"1":"100","2":"927","3":"200"},{"1":"10","2":"928","3":"200"},{"1":"20","2":"928","3":"200"},{"1":"40","2":"928","3":"200"},{"1":"100","2":"928","3":"200"},{"1":"10","2":"929","3":"200"},{"1":"20","2":"929","3":"200"},{"1":"40","2":"929","3":"200"},{"1":"100","2":"929","3":"200"},{"1":"10","2":"930","3":"200"},{"1":"20","2":"930","3":"200"},{"1":"40","2":"930","3":"200"},{"1":"100","2":"930","3":"200"},{"1":"10","2":"931","3":"200"},{"1":"20","2":"931","3":"200"},{"1":"40","2":"931","3":"200"},{"1":"100","2":"931","3":"200"},{"1":"10","2":"932","3":"200"},{"1":"20","2":"932","3":"200"},{"1":"40","2":"932","3":"200"},{"1":"100","2":"932","3":"200"},{"1":"10","2":"933","3":"200"},{"1":"20","2":"933","3":"200"},{"1":"40","2":"933","3":"200"},{"1":"100","2":"933","3":"200"},{"1":"10","2":"934","3":"200"},{"1":"20","2":"934","3":"200"},{"1":"40","2":"934","3":"200"},{"1":"100","2":"934","3":"200"},{"1":"10","2":"935","3":"200"},{"1":"20","2":"935","3":"200"},{"1":"40","2":"935","3":"200"},{"1":"100","2":"935","3":"200"},{"1":"10","2":"936","3":"200"},{"1":"20","2":"936","3":"200"},{"1":"40","2":"936","3":"200"},{"1":"100","2":"936","3":"200"},{"1":"10","2":"937","3":"200"},{"1":"20","2":"937","3":"200"},{"1":"40","2":"937","3":"200"},{"1":"100","2":"937","3":"200"},{"1":"10","2":"938","3":"200"},{"1":"20","2":"938","3":"200"},{"1":"40","2":"938","3":"200"},{"1":"100","2":"938","3":"200"},{"1":"10","2":"939","3":"200"},{"1":"20","2":"939","3":"200"},{"1":"40","2":"939","3":"200"},{"1":"100","2":"939","3":"200"},{"1":"10","2":"940","3":"200"},{"1":"20","2":"940","3":"200"},{"1":"40","2":"940","3":"200"},{"1":"100","2":"940","3":"200"},{"1":"10","2":"941","3":"200"},{"1":"20","2":"941","3":"200"},{"1":"40","2":"941","3":"200"},{"1":"100","2":"941","3":"200"},{"1":"10","2":"942","3":"200"},{"1":"20","2":"942","3":"200"},{"1":"40","2":"942","3":"200"},{"1":"100","2":"942","3":"200"},{"1":"10","2":"943","3":"200"},{"1":"20","2":"943","3":"200"},{"1":"40","2":"943","3":"200"},{"1":"100","2":"943","3":"200"},{"1":"10","2":"944","3":"200"},{"1":"20","2":"944","3":"200"},{"1":"40","2":"944","3":"200"},{"1":"100","2":"944","3":"200"},{"1":"10","2":"945","3":"200"},{"1":"20","2":"945","3":"200"},{"1":"40","2":"945","3":"200"},{"1":"100","2":"945","3":"200"},{"1":"10","2":"946","3":"200"},{"1":"20","2":"946","3":"200"},{"1":"40","2":"946","3":"200"},{"1":"100","2":"946","3":"200"},{"1":"10","2":"947","3":"200"},{"1":"20","2":"947","3":"200"},{"1":"40","2":"947","3":"200"},{"1":"100","2":"947","3":"200"},{"1":"10","2":"948","3":"200"},{"1":"20","2":"948","3":"200"},{"1":"40","2":"948","3":"200"},{"1":"100","2":"948","3":"200"},{"1":"10","2":"949","3":"200"},{"1":"20","2":"949","3":"200"},{"1":"40","2":"949","3":"200"},{"1":"100","2":"949","3":"200"},{"1":"10","2":"950","3":"200"},{"1":"20","2":"950","3":"200"},{"1":"40","2":"950","3":"200"},{"1":"100","2":"950","3":"200"},{"1":"10","2":"951","3":"200"},{"1":"20","2":"951","3":"200"},{"1":"40","2":"951","3":"200"},{"1":"100","2":"951","3":"200"},{"1":"10","2":"952","3":"200"},{"1":"20","2":"952","3":"200"},{"1":"40","2":"952","3":"200"},{"1":"100","2":"952","3":"200"},{"1":"10","2":"953","3":"200"},{"1":"20","2":"953","3":"200"},{"1":"40","2":"953","3":"200"},{"1":"100","2":"953","3":"200"},{"1":"10","2":"954","3":"200"},{"1":"20","2":"954","3":"200"},{"1":"40","2":"954","3":"200"},{"1":"100","2":"954","3":"200"},{"1":"10","2":"955","3":"200"},{"1":"20","2":"955","3":"200"},{"1":"40","2":"955","3":"200"},{"1":"100","2":"955","3":"200"},{"1":"10","2":"956","3":"200"},{"1":"20","2":"956","3":"200"},{"1":"40","2":"956","3":"200"},{"1":"100","2":"956","3":"200"},{"1":"10","2":"957","3":"200"},{"1":"20","2":"957","3":"200"},{"1":"40","2":"957","3":"200"},{"1":"100","2":"957","3":"200"},{"1":"10","2":"958","3":"200"},{"1":"20","2":"958","3":"200"},{"1":"40","2":"958","3":"200"},{"1":"100","2":"958","3":"200"},{"1":"10","2":"959","3":"200"},{"1":"20","2":"959","3":"200"},{"1":"40","2":"959","3":"200"},{"1":"100","2":"959","3":"200"},{"1":"10","2":"960","3":"200"},{"1":"20","2":"960","3":"200"},{"1":"40","2":"960","3":"200"},{"1":"100","2":"960","3":"200"},{"1":"10","2":"961","3":"200"},{"1":"20","2":"961","3":"200"},{"1":"40","2":"961","3":"200"},{"1":"100","2":"961","3":"200"},{"1":"10","2":"962","3":"200"},{"1":"20","2":"962","3":"200"},{"1":"40","2":"962","3":"200"},{"1":"100","2":"962","3":"200"},{"1":"10","2":"963","3":"200"},{"1":"20","2":"963","3":"200"},{"1":"40","2":"963","3":"200"},{"1":"100","2":"963","3":"200"},{"1":"10","2":"964","3":"200"},{"1":"20","2":"964","3":"200"},{"1":"40","2":"964","3":"200"},{"1":"100","2":"964","3":"200"},{"1":"10","2":"965","3":"200"},{"1":"20","2":"965","3":"200"},{"1":"40","2":"965","3":"200"},{"1":"100","2":"965","3":"200"},{"1":"10","2":"966","3":"200"},{"1":"20","2":"966","3":"200"},{"1":"40","2":"966","3":"200"},{"1":"100","2":"966","3":"200"},{"1":"10","2":"967","3":"200"},{"1":"20","2":"967","3":"200"},{"1":"40","2":"967","3":"200"},{"1":"100","2":"967","3":"200"},{"1":"10","2":"968","3":"200"},{"1":"20","2":"968","3":"200"},{"1":"40","2":"968","3":"200"},{"1":"100","2":"968","3":"200"},{"1":"10","2":"969","3":"200"},{"1":"20","2":"969","3":"200"},{"1":"40","2":"969","3":"200"},{"1":"100","2":"969","3":"200"},{"1":"10","2":"970","3":"200"},{"1":"20","2":"970","3":"200"},{"1":"40","2":"970","3":"200"},{"1":"100","2":"970","3":"200"},{"1":"10","2":"971","3":"200"},{"1":"20","2":"971","3":"200"},{"1":"40","2":"971","3":"200"},{"1":"100","2":"971","3":"200"},{"1":"10","2":"972","3":"200"},{"1":"20","2":"972","3":"200"},{"1":"40","2":"972","3":"200"},{"1":"100","2":"972","3":"200"},{"1":"10","2":"973","3":"200"},{"1":"20","2":"973","3":"200"},{"1":"40","2":"973","3":"200"},{"1":"100","2":"973","3":"200"},{"1":"10","2":"974","3":"200"},{"1":"20","2":"974","3":"200"},{"1":"40","2":"974","3":"200"},{"1":"100","2":"974","3":"200"},{"1":"10","2":"975","3":"200"},{"1":"20","2":"975","3":"200"},{"1":"40","2":"975","3":"200"},{"1":"100","2":"975","3":"200"},{"1":"10","2":"976","3":"200"},{"1":"20","2":"976","3":"200"},{"1":"40","2":"976","3":"200"},{"1":"100","2":"976","3":"200"},{"1":"10","2":"977","3":"200"},{"1":"20","2":"977","3":"200"},{"1":"40","2":"977","3":"200"},{"1":"100","2":"977","3":"200"},{"1":"10","2":"978","3":"200"},{"1":"20","2":"978","3":"200"},{"1":"40","2":"978","3":"200"},{"1":"100","2":"978","3":"200"},{"1":"10","2":"979","3":"200"},{"1":"20","2":"979","3":"200"},{"1":"40","2":"979","3":"200"},{"1":"100","2":"979","3":"200"},{"1":"10","2":"980","3":"200"},{"1":"20","2":"980","3":"200"},{"1":"40","2":"980","3":"200"},{"1":"100","2":"980","3":"200"},{"1":"10","2":"981","3":"200"},{"1":"20","2":"981","3":"200"},{"1":"40","2":"981","3":"200"},{"1":"100","2":"981","3":"200"},{"1":"10","2":"982","3":"200"},{"1":"20","2":"982","3":"200"},{"1":"40","2":"982","3":"200"},{"1":"100","2":"982","3":"200"},{"1":"10","2":"983","3":"200"},{"1":"20","2":"983","3":"200"},{"1":"40","2":"983","3":"200"},{"1":"100","2":"983","3":"200"},{"1":"10","2":"984","3":"200"},{"1":"20","2":"984","3":"200"},{"1":"40","2":"984","3":"200"},{"1":"100","2":"984","3":"200"},{"1":"10","2":"985","3":"200"},{"1":"20","2":"985","3":"200"},{"1":"40","2":"985","3":"200"},{"1":"100","2":"985","3":"200"},{"1":"10","2":"986","3":"200"},{"1":"20","2":"986","3":"200"},{"1":"40","2":"986","3":"200"},{"1":"100","2":"986","3":"200"},{"1":"10","2":"987","3":"200"},{"1":"20","2":"987","3":"200"},{"1":"40","2":"987","3":"200"},{"1":"100","2":"987","3":"200"},{"1":"10","2":"988","3":"200"},{"1":"20","2":"988","3":"200"},{"1":"40","2":"988","3":"200"},{"1":"100","2":"988","3":"200"},{"1":"10","2":"989","3":"200"},{"1":"20","2":"989","3":"200"},{"1":"40","2":"989","3":"200"},{"1":"100","2":"989","3":"200"},{"1":"10","2":"990","3":"200"},{"1":"20","2":"990","3":"200"},{"1":"40","2":"990","3":"200"},{"1":"100","2":"990","3":"200"},{"1":"10","2":"991","3":"200"},{"1":"20","2":"991","3":"200"},{"1":"40","2":"991","3":"200"},{"1":"100","2":"991","3":"200"},{"1":"10","2":"992","3":"200"},{"1":"20","2":"992","3":"200"},{"1":"40","2":"992","3":"200"},{"1":"100","2":"992","3":"200"},{"1":"10","2":"993","3":"200"},{"1":"20","2":"993","3":"200"},{"1":"40","2":"993","3":"200"},{"1":"100","2":"993","3":"200"},{"1":"10","2":"994","3":"200"},{"1":"20","2":"994","3":"200"},{"1":"40","2":"994","3":"200"},{"1":"100","2":"994","3":"200"},{"1":"10","2":"995","3":"200"},{"1":"20","2":"995","3":"200"},{"1":"40","2":"995","3":"200"},{"1":"100","2":"995","3":"200"},{"1":"10","2":"996","3":"200"},{"1":"20","2":"996","3":"200"},{"1":"40","2":"996","3":"200"},{"1":"100","2":"996","3":"200"},{"1":"10","2":"997","3":"200"},{"1":"20","2":"997","3":"200"},{"1":"40","2":"997","3":"200"},{"1":"100","2":"997","3":"200"},{"1":"10","2":"998","3":"200"},{"1":"20","2":"998","3":"200"},{"1":"40","2":"998","3":"200"},{"1":"100","2":"998","3":"200"},{"1":"10","2":"999","3":"200"},{"1":"20","2":"999","3":"200"},{"1":"40","2":"999","3":"200"},{"1":"100","2":"999","3":"200"},{"1":"10","2":"1000","3":"200"},{"1":"20","2":"1000","3":"200"},{"1":"40","2":"1000","3":"200"},{"1":"100","2":"1000","3":"200"},{"1":"10","2":"1","3":"300"},{"1":"20","2":"1","3":"300"},{"1":"40","2":"1","3":"300"},{"1":"100","2":"1","3":"300"},{"1":"10","2":"2","3":"300"},{"1":"20","2":"2","3":"300"},{"1":"40","2":"2","3":"300"},{"1":"100","2":"2","3":"300"},{"1":"10","2":"3","3":"300"},{"1":"20","2":"3","3":"300"},{"1":"40","2":"3","3":"300"},{"1":"100","2":"3","3":"300"},{"1":"10","2":"4","3":"300"},{"1":"20","2":"4","3":"300"},{"1":"40","2":"4","3":"300"},{"1":"100","2":"4","3":"300"},{"1":"10","2":"5","3":"300"},{"1":"20","2":"5","3":"300"},{"1":"40","2":"5","3":"300"},{"1":"100","2":"5","3":"300"},{"1":"10","2":"6","3":"300"},{"1":"20","2":"6","3":"300"},{"1":"40","2":"6","3":"300"},{"1":"100","2":"6","3":"300"},{"1":"10","2":"7","3":"300"},{"1":"20","2":"7","3":"300"},{"1":"40","2":"7","3":"300"},{"1":"100","2":"7","3":"300"},{"1":"10","2":"8","3":"300"},{"1":"20","2":"8","3":"300"},{"1":"40","2":"8","3":"300"},{"1":"100","2":"8","3":"300"},{"1":"10","2":"9","3":"300"},{"1":"20","2":"9","3":"300"},{"1":"40","2":"9","3":"300"},{"1":"100","2":"9","3":"300"},{"1":"10","2":"10","3":"300"},{"1":"20","2":"10","3":"300"},{"1":"40","2":"10","3":"300"},{"1":"100","2":"10","3":"300"},{"1":"10","2":"11","3":"300"},{"1":"20","2":"11","3":"300"},{"1":"40","2":"11","3":"300"},{"1":"100","2":"11","3":"300"},{"1":"10","2":"12","3":"300"},{"1":"20","2":"12","3":"300"},{"1":"40","2":"12","3":"300"},{"1":"100","2":"12","3":"300"},{"1":"10","2":"13","3":"300"},{"1":"20","2":"13","3":"300"},{"1":"40","2":"13","3":"300"},{"1":"100","2":"13","3":"300"},{"1":"10","2":"14","3":"300"},{"1":"20","2":"14","3":"300"},{"1":"40","2":"14","3":"300"},{"1":"100","2":"14","3":"300"},{"1":"10","2":"15","3":"300"},{"1":"20","2":"15","3":"300"},{"1":"40","2":"15","3":"300"},{"1":"100","2":"15","3":"300"},{"1":"10","2":"16","3":"300"},{"1":"20","2":"16","3":"300"},{"1":"40","2":"16","3":"300"},{"1":"100","2":"16","3":"300"},{"1":"10","2":"17","3":"300"},{"1":"20","2":"17","3":"300"},{"1":"40","2":"17","3":"300"},{"1":"100","2":"17","3":"300"},{"1":"10","2":"18","3":"300"},{"1":"20","2":"18","3":"300"},{"1":"40","2":"18","3":"300"},{"1":"100","2":"18","3":"300"},{"1":"10","2":"19","3":"300"},{"1":"20","2":"19","3":"300"},{"1":"40","2":"19","3":"300"},{"1":"100","2":"19","3":"300"},{"1":"10","2":"20","3":"300"},{"1":"20","2":"20","3":"300"},{"1":"40","2":"20","3":"300"},{"1":"100","2":"20","3":"300"},{"1":"10","2":"21","3":"300"},{"1":"20","2":"21","3":"300"},{"1":"40","2":"21","3":"300"},{"1":"100","2":"21","3":"300"},{"1":"10","2":"22","3":"300"},{"1":"20","2":"22","3":"300"},{"1":"40","2":"22","3":"300"},{"1":"100","2":"22","3":"300"},{"1":"10","2":"23","3":"300"},{"1":"20","2":"23","3":"300"},{"1":"40","2":"23","3":"300"},{"1":"100","2":"23","3":"300"},{"1":"10","2":"24","3":"300"},{"1":"20","2":"24","3":"300"},{"1":"40","2":"24","3":"300"},{"1":"100","2":"24","3":"300"},{"1":"10","2":"25","3":"300"},{"1":"20","2":"25","3":"300"},{"1":"40","2":"25","3":"300"},{"1":"100","2":"25","3":"300"},{"1":"10","2":"26","3":"300"},{"1":"20","2":"26","3":"300"},{"1":"40","2":"26","3":"300"},{"1":"100","2":"26","3":"300"},{"1":"10","2":"27","3":"300"},{"1":"20","2":"27","3":"300"},{"1":"40","2":"27","3":"300"},{"1":"100","2":"27","3":"300"},{"1":"10","2":"28","3":"300"},{"1":"20","2":"28","3":"300"},{"1":"40","2":"28","3":"300"},{"1":"100","2":"28","3":"300"},{"1":"10","2":"29","3":"300"},{"1":"20","2":"29","3":"300"},{"1":"40","2":"29","3":"300"},{"1":"100","2":"29","3":"300"},{"1":"10","2":"30","3":"300"},{"1":"20","2":"30","3":"300"},{"1":"40","2":"30","3":"300"},{"1":"100","2":"30","3":"300"},{"1":"10","2":"31","3":"300"},{"1":"20","2":"31","3":"300"},{"1":"40","2":"31","3":"300"},{"1":"100","2":"31","3":"300"},{"1":"10","2":"32","3":"300"},{"1":"20","2":"32","3":"300"},{"1":"40","2":"32","3":"300"},{"1":"100","2":"32","3":"300"},{"1":"10","2":"33","3":"300"},{"1":"20","2":"33","3":"300"},{"1":"40","2":"33","3":"300"},{"1":"100","2":"33","3":"300"},{"1":"10","2":"34","3":"300"},{"1":"20","2":"34","3":"300"},{"1":"40","2":"34","3":"300"},{"1":"100","2":"34","3":"300"},{"1":"10","2":"35","3":"300"},{"1":"20","2":"35","3":"300"},{"1":"40","2":"35","3":"300"},{"1":"100","2":"35","3":"300"},{"1":"10","2":"36","3":"300"},{"1":"20","2":"36","3":"300"},{"1":"40","2":"36","3":"300"},{"1":"100","2":"36","3":"300"},{"1":"10","2":"37","3":"300"},{"1":"20","2":"37","3":"300"},{"1":"40","2":"37","3":"300"},{"1":"100","2":"37","3":"300"},{"1":"10","2":"38","3":"300"},{"1":"20","2":"38","3":"300"},{"1":"40","2":"38","3":"300"},{"1":"100","2":"38","3":"300"},{"1":"10","2":"39","3":"300"},{"1":"20","2":"39","3":"300"},{"1":"40","2":"39","3":"300"},{"1":"100","2":"39","3":"300"},{"1":"10","2":"40","3":"300"},{"1":"20","2":"40","3":"300"},{"1":"40","2":"40","3":"300"},{"1":"100","2":"40","3":"300"},{"1":"10","2":"41","3":"300"},{"1":"20","2":"41","3":"300"},{"1":"40","2":"41","3":"300"},{"1":"100","2":"41","3":"300"},{"1":"10","2":"42","3":"300"},{"1":"20","2":"42","3":"300"},{"1":"40","2":"42","3":"300"},{"1":"100","2":"42","3":"300"},{"1":"10","2":"43","3":"300"},{"1":"20","2":"43","3":"300"},{"1":"40","2":"43","3":"300"},{"1":"100","2":"43","3":"300"},{"1":"10","2":"44","3":"300"},{"1":"20","2":"44","3":"300"},{"1":"40","2":"44","3":"300"},{"1":"100","2":"44","3":"300"},{"1":"10","2":"45","3":"300"},{"1":"20","2":"45","3":"300"},{"1":"40","2":"45","3":"300"},{"1":"100","2":"45","3":"300"},{"1":"10","2":"46","3":"300"},{"1":"20","2":"46","3":"300"},{"1":"40","2":"46","3":"300"},{"1":"100","2":"46","3":"300"},{"1":"10","2":"47","3":"300"},{"1":"20","2":"47","3":"300"},{"1":"40","2":"47","3":"300"},{"1":"100","2":"47","3":"300"},{"1":"10","2":"48","3":"300"},{"1":"20","2":"48","3":"300"},{"1":"40","2":"48","3":"300"},{"1":"100","2":"48","3":"300"},{"1":"10","2":"49","3":"300"},{"1":"20","2":"49","3":"300"},{"1":"40","2":"49","3":"300"},{"1":"100","2":"49","3":"300"},{"1":"10","2":"50","3":"300"},{"1":"20","2":"50","3":"300"},{"1":"40","2":"50","3":"300"},{"1":"100","2":"50","3":"300"},{"1":"10","2":"51","3":"300"},{"1":"20","2":"51","3":"300"},{"1":"40","2":"51","3":"300"},{"1":"100","2":"51","3":"300"},{"1":"10","2":"52","3":"300"},{"1":"20","2":"52","3":"300"},{"1":"40","2":"52","3":"300"},{"1":"100","2":"52","3":"300"},{"1":"10","2":"53","3":"300"},{"1":"20","2":"53","3":"300"},{"1":"40","2":"53","3":"300"},{"1":"100","2":"53","3":"300"},{"1":"10","2":"54","3":"300"},{"1":"20","2":"54","3":"300"},{"1":"40","2":"54","3":"300"},{"1":"100","2":"54","3":"300"},{"1":"10","2":"55","3":"300"},{"1":"20","2":"55","3":"300"},{"1":"40","2":"55","3":"300"},{"1":"100","2":"55","3":"300"},{"1":"10","2":"56","3":"300"},{"1":"20","2":"56","3":"300"},{"1":"40","2":"56","3":"300"},{"1":"100","2":"56","3":"300"},{"1":"10","2":"57","3":"300"},{"1":"20","2":"57","3":"300"},{"1":"40","2":"57","3":"300"},{"1":"100","2":"57","3":"300"},{"1":"10","2":"58","3":"300"},{"1":"20","2":"58","3":"300"},{"1":"40","2":"58","3":"300"},{"1":"100","2":"58","3":"300"},{"1":"10","2":"59","3":"300"},{"1":"20","2":"59","3":"300"},{"1":"40","2":"59","3":"300"},{"1":"100","2":"59","3":"300"},{"1":"10","2":"60","3":"300"},{"1":"20","2":"60","3":"300"},{"1":"40","2":"60","3":"300"},{"1":"100","2":"60","3":"300"},{"1":"10","2":"61","3":"300"},{"1":"20","2":"61","3":"300"},{"1":"40","2":"61","3":"300"},{"1":"100","2":"61","3":"300"},{"1":"10","2":"62","3":"300"},{"1":"20","2":"62","3":"300"},{"1":"40","2":"62","3":"300"},{"1":"100","2":"62","3":"300"},{"1":"10","2":"63","3":"300"},{"1":"20","2":"63","3":"300"},{"1":"40","2":"63","3":"300"},{"1":"100","2":"63","3":"300"},{"1":"10","2":"64","3":"300"},{"1":"20","2":"64","3":"300"},{"1":"40","2":"64","3":"300"},{"1":"100","2":"64","3":"300"},{"1":"10","2":"65","3":"300"},{"1":"20","2":"65","3":"300"},{"1":"40","2":"65","3":"300"},{"1":"100","2":"65","3":"300"},{"1":"10","2":"66","3":"300"},{"1":"20","2":"66","3":"300"},{"1":"40","2":"66","3":"300"},{"1":"100","2":"66","3":"300"},{"1":"10","2":"67","3":"300"},{"1":"20","2":"67","3":"300"},{"1":"40","2":"67","3":"300"},{"1":"100","2":"67","3":"300"},{"1":"10","2":"68","3":"300"},{"1":"20","2":"68","3":"300"},{"1":"40","2":"68","3":"300"},{"1":"100","2":"68","3":"300"},{"1":"10","2":"69","3":"300"},{"1":"20","2":"69","3":"300"},{"1":"40","2":"69","3":"300"},{"1":"100","2":"69","3":"300"},{"1":"10","2":"70","3":"300"},{"1":"20","2":"70","3":"300"},{"1":"40","2":"70","3":"300"},{"1":"100","2":"70","3":"300"},{"1":"10","2":"71","3":"300"},{"1":"20","2":"71","3":"300"},{"1":"40","2":"71","3":"300"},{"1":"100","2":"71","3":"300"},{"1":"10","2":"72","3":"300"},{"1":"20","2":"72","3":"300"},{"1":"40","2":"72","3":"300"},{"1":"100","2":"72","3":"300"},{"1":"10","2":"73","3":"300"},{"1":"20","2":"73","3":"300"},{"1":"40","2":"73","3":"300"},{"1":"100","2":"73","3":"300"},{"1":"10","2":"74","3":"300"},{"1":"20","2":"74","3":"300"},{"1":"40","2":"74","3":"300"},{"1":"100","2":"74","3":"300"},{"1":"10","2":"75","3":"300"},{"1":"20","2":"75","3":"300"},{"1":"40","2":"75","3":"300"},{"1":"100","2":"75","3":"300"},{"1":"10","2":"76","3":"300"},{"1":"20","2":"76","3":"300"},{"1":"40","2":"76","3":"300"},{"1":"100","2":"76","3":"300"},{"1":"10","2":"77","3":"300"},{"1":"20","2":"77","3":"300"},{"1":"40","2":"77","3":"300"},{"1":"100","2":"77","3":"300"},{"1":"10","2":"78","3":"300"},{"1":"20","2":"78","3":"300"},{"1":"40","2":"78","3":"300"},{"1":"100","2":"78","3":"300"},{"1":"10","2":"79","3":"300"},{"1":"20","2":"79","3":"300"},{"1":"40","2":"79","3":"300"},{"1":"100","2":"79","3":"300"},{"1":"10","2":"80","3":"300"},{"1":"20","2":"80","3":"300"},{"1":"40","2":"80","3":"300"},{"1":"100","2":"80","3":"300"},{"1":"10","2":"81","3":"300"},{"1":"20","2":"81","3":"300"},{"1":"40","2":"81","3":"300"},{"1":"100","2":"81","3":"300"},{"1":"10","2":"82","3":"300"},{"1":"20","2":"82","3":"300"},{"1":"40","2":"82","3":"300"},{"1":"100","2":"82","3":"300"},{"1":"10","2":"83","3":"300"},{"1":"20","2":"83","3":"300"},{"1":"40","2":"83","3":"300"},{"1":"100","2":"83","3":"300"},{"1":"10","2":"84","3":"300"},{"1":"20","2":"84","3":"300"},{"1":"40","2":"84","3":"300"},{"1":"100","2":"84","3":"300"},{"1":"10","2":"85","3":"300"},{"1":"20","2":"85","3":"300"},{"1":"40","2":"85","3":"300"},{"1":"100","2":"85","3":"300"},{"1":"10","2":"86","3":"300"},{"1":"20","2":"86","3":"300"},{"1":"40","2":"86","3":"300"},{"1":"100","2":"86","3":"300"},{"1":"10","2":"87","3":"300"},{"1":"20","2":"87","3":"300"},{"1":"40","2":"87","3":"300"},{"1":"100","2":"87","3":"300"},{"1":"10","2":"88","3":"300"},{"1":"20","2":"88","3":"300"},{"1":"40","2":"88","3":"300"},{"1":"100","2":"88","3":"300"},{"1":"10","2":"89","3":"300"},{"1":"20","2":"89","3":"300"},{"1":"40","2":"89","3":"300"},{"1":"100","2":"89","3":"300"},{"1":"10","2":"90","3":"300"},{"1":"20","2":"90","3":"300"},{"1":"40","2":"90","3":"300"},{"1":"100","2":"90","3":"300"},{"1":"10","2":"91","3":"300"},{"1":"20","2":"91","3":"300"},{"1":"40","2":"91","3":"300"},{"1":"100","2":"91","3":"300"},{"1":"10","2":"92","3":"300"},{"1":"20","2":"92","3":"300"},{"1":"40","2":"92","3":"300"},{"1":"100","2":"92","3":"300"},{"1":"10","2":"93","3":"300"},{"1":"20","2":"93","3":"300"},{"1":"40","2":"93","3":"300"},{"1":"100","2":"93","3":"300"},{"1":"10","2":"94","3":"300"},{"1":"20","2":"94","3":"300"},{"1":"40","2":"94","3":"300"},{"1":"100","2":"94","3":"300"},{"1":"10","2":"95","3":"300"},{"1":"20","2":"95","3":"300"},{"1":"40","2":"95","3":"300"},{"1":"100","2":"95","3":"300"},{"1":"10","2":"96","3":"300"},{"1":"20","2":"96","3":"300"},{"1":"40","2":"96","3":"300"},{"1":"100","2":"96","3":"300"},{"1":"10","2":"97","3":"300"},{"1":"20","2":"97","3":"300"},{"1":"40","2":"97","3":"300"},{"1":"100","2":"97","3":"300"},{"1":"10","2":"98","3":"300"},{"1":"20","2":"98","3":"300"},{"1":"40","2":"98","3":"300"},{"1":"100","2":"98","3":"300"},{"1":"10","2":"99","3":"300"},{"1":"20","2":"99","3":"300"},{"1":"40","2":"99","3":"300"},{"1":"100","2":"99","3":"300"},{"1":"10","2":"100","3":"300"},{"1":"20","2":"100","3":"300"},{"1":"40","2":"100","3":"300"},{"1":"100","2":"100","3":"300"},{"1":"10","2":"101","3":"300"},{"1":"20","2":"101","3":"300"},{"1":"40","2":"101","3":"300"},{"1":"100","2":"101","3":"300"},{"1":"10","2":"102","3":"300"},{"1":"20","2":"102","3":"300"},{"1":"40","2":"102","3":"300"},{"1":"100","2":"102","3":"300"},{"1":"10","2":"103","3":"300"},{"1":"20","2":"103","3":"300"},{"1":"40","2":"103","3":"300"},{"1":"100","2":"103","3":"300"},{"1":"10","2":"104","3":"300"},{"1":"20","2":"104","3":"300"},{"1":"40","2":"104","3":"300"},{"1":"100","2":"104","3":"300"},{"1":"10","2":"105","3":"300"},{"1":"20","2":"105","3":"300"},{"1":"40","2":"105","3":"300"},{"1":"100","2":"105","3":"300"},{"1":"10","2":"106","3":"300"},{"1":"20","2":"106","3":"300"},{"1":"40","2":"106","3":"300"},{"1":"100","2":"106","3":"300"},{"1":"10","2":"107","3":"300"},{"1":"20","2":"107","3":"300"},{"1":"40","2":"107","3":"300"},{"1":"100","2":"107","3":"300"},{"1":"10","2":"108","3":"300"},{"1":"20","2":"108","3":"300"},{"1":"40","2":"108","3":"300"},{"1":"100","2":"108","3":"300"},{"1":"10","2":"109","3":"300"},{"1":"20","2":"109","3":"300"},{"1":"40","2":"109","3":"300"},{"1":"100","2":"109","3":"300"},{"1":"10","2":"110","3":"300"},{"1":"20","2":"110","3":"300"},{"1":"40","2":"110","3":"300"},{"1":"100","2":"110","3":"300"},{"1":"10","2":"111","3":"300"},{"1":"20","2":"111","3":"300"},{"1":"40","2":"111","3":"300"},{"1":"100","2":"111","3":"300"},{"1":"10","2":"112","3":"300"},{"1":"20","2":"112","3":"300"},{"1":"40","2":"112","3":"300"},{"1":"100","2":"112","3":"300"},{"1":"10","2":"113","3":"300"},{"1":"20","2":"113","3":"300"},{"1":"40","2":"113","3":"300"},{"1":"100","2":"113","3":"300"},{"1":"10","2":"114","3":"300"},{"1":"20","2":"114","3":"300"},{"1":"40","2":"114","3":"300"},{"1":"100","2":"114","3":"300"},{"1":"10","2":"115","3":"300"},{"1":"20","2":"115","3":"300"},{"1":"40","2":"115","3":"300"},{"1":"100","2":"115","3":"300"},{"1":"10","2":"116","3":"300"},{"1":"20","2":"116","3":"300"},{"1":"40","2":"116","3":"300"},{"1":"100","2":"116","3":"300"},{"1":"10","2":"117","3":"300"},{"1":"20","2":"117","3":"300"},{"1":"40","2":"117","3":"300"},{"1":"100","2":"117","3":"300"},{"1":"10","2":"118","3":"300"},{"1":"20","2":"118","3":"300"},{"1":"40","2":"118","3":"300"},{"1":"100","2":"118","3":"300"},{"1":"10","2":"119","3":"300"},{"1":"20","2":"119","3":"300"},{"1":"40","2":"119","3":"300"},{"1":"100","2":"119","3":"300"},{"1":"10","2":"120","3":"300"},{"1":"20","2":"120","3":"300"},{"1":"40","2":"120","3":"300"},{"1":"100","2":"120","3":"300"},{"1":"10","2":"121","3":"300"},{"1":"20","2":"121","3":"300"},{"1":"40","2":"121","3":"300"},{"1":"100","2":"121","3":"300"},{"1":"10","2":"122","3":"300"},{"1":"20","2":"122","3":"300"},{"1":"40","2":"122","3":"300"},{"1":"100","2":"122","3":"300"},{"1":"10","2":"123","3":"300"},{"1":"20","2":"123","3":"300"},{"1":"40","2":"123","3":"300"},{"1":"100","2":"123","3":"300"},{"1":"10","2":"124","3":"300"},{"1":"20","2":"124","3":"300"},{"1":"40","2":"124","3":"300"},{"1":"100","2":"124","3":"300"},{"1":"10","2":"125","3":"300"},{"1":"20","2":"125","3":"300"},{"1":"40","2":"125","3":"300"},{"1":"100","2":"125","3":"300"},{"1":"10","2":"126","3":"300"},{"1":"20","2":"126","3":"300"},{"1":"40","2":"126","3":"300"},{"1":"100","2":"126","3":"300"},{"1":"10","2":"127","3":"300"},{"1":"20","2":"127","3":"300"},{"1":"40","2":"127","3":"300"},{"1":"100","2":"127","3":"300"},{"1":"10","2":"128","3":"300"},{"1":"20","2":"128","3":"300"},{"1":"40","2":"128","3":"300"},{"1":"100","2":"128","3":"300"},{"1":"10","2":"129","3":"300"},{"1":"20","2":"129","3":"300"},{"1":"40","2":"129","3":"300"},{"1":"100","2":"129","3":"300"},{"1":"10","2":"130","3":"300"},{"1":"20","2":"130","3":"300"},{"1":"40","2":"130","3":"300"},{"1":"100","2":"130","3":"300"},{"1":"10","2":"131","3":"300"},{"1":"20","2":"131","3":"300"},{"1":"40","2":"131","3":"300"},{"1":"100","2":"131","3":"300"},{"1":"10","2":"132","3":"300"},{"1":"20","2":"132","3":"300"},{"1":"40","2":"132","3":"300"},{"1":"100","2":"132","3":"300"},{"1":"10","2":"133","3":"300"},{"1":"20","2":"133","3":"300"},{"1":"40","2":"133","3":"300"},{"1":"100","2":"133","3":"300"},{"1":"10","2":"134","3":"300"},{"1":"20","2":"134","3":"300"},{"1":"40","2":"134","3":"300"},{"1":"100","2":"134","3":"300"},{"1":"10","2":"135","3":"300"},{"1":"20","2":"135","3":"300"},{"1":"40","2":"135","3":"300"},{"1":"100","2":"135","3":"300"},{"1":"10","2":"136","3":"300"},{"1":"20","2":"136","3":"300"},{"1":"40","2":"136","3":"300"},{"1":"100","2":"136","3":"300"},{"1":"10","2":"137","3":"300"},{"1":"20","2":"137","3":"300"},{"1":"40","2":"137","3":"300"},{"1":"100","2":"137","3":"300"},{"1":"10","2":"138","3":"300"},{"1":"20","2":"138","3":"300"},{"1":"40","2":"138","3":"300"},{"1":"100","2":"138","3":"300"},{"1":"10","2":"139","3":"300"},{"1":"20","2":"139","3":"300"},{"1":"40","2":"139","3":"300"},{"1":"100","2":"139","3":"300"},{"1":"10","2":"140","3":"300"},{"1":"20","2":"140","3":"300"},{"1":"40","2":"140","3":"300"},{"1":"100","2":"140","3":"300"},{"1":"10","2":"141","3":"300"},{"1":"20","2":"141","3":"300"},{"1":"40","2":"141","3":"300"},{"1":"100","2":"141","3":"300"},{"1":"10","2":"142","3":"300"},{"1":"20","2":"142","3":"300"},{"1":"40","2":"142","3":"300"},{"1":"100","2":"142","3":"300"},{"1":"10","2":"143","3":"300"},{"1":"20","2":"143","3":"300"},{"1":"40","2":"143","3":"300"},{"1":"100","2":"143","3":"300"},{"1":"10","2":"144","3":"300"},{"1":"20","2":"144","3":"300"},{"1":"40","2":"144","3":"300"},{"1":"100","2":"144","3":"300"},{"1":"10","2":"145","3":"300"},{"1":"20","2":"145","3":"300"},{"1":"40","2":"145","3":"300"},{"1":"100","2":"145","3":"300"},{"1":"10","2":"146","3":"300"},{"1":"20","2":"146","3":"300"},{"1":"40","2":"146","3":"300"},{"1":"100","2":"146","3":"300"},{"1":"10","2":"147","3":"300"},{"1":"20","2":"147","3":"300"},{"1":"40","2":"147","3":"300"},{"1":"100","2":"147","3":"300"},{"1":"10","2":"148","3":"300"},{"1":"20","2":"148","3":"300"},{"1":"40","2":"148","3":"300"},{"1":"100","2":"148","3":"300"},{"1":"10","2":"149","3":"300"},{"1":"20","2":"149","3":"300"},{"1":"40","2":"149","3":"300"},{"1":"100","2":"149","3":"300"},{"1":"10","2":"150","3":"300"},{"1":"20","2":"150","3":"300"},{"1":"40","2":"150","3":"300"},{"1":"100","2":"150","3":"300"},{"1":"10","2":"151","3":"300"},{"1":"20","2":"151","3":"300"},{"1":"40","2":"151","3":"300"},{"1":"100","2":"151","3":"300"},{"1":"10","2":"152","3":"300"},{"1":"20","2":"152","3":"300"},{"1":"40","2":"152","3":"300"},{"1":"100","2":"152","3":"300"},{"1":"10","2":"153","3":"300"},{"1":"20","2":"153","3":"300"},{"1":"40","2":"153","3":"300"},{"1":"100","2":"153","3":"300"},{"1":"10","2":"154","3":"300"},{"1":"20","2":"154","3":"300"},{"1":"40","2":"154","3":"300"},{"1":"100","2":"154","3":"300"},{"1":"10","2":"155","3":"300"},{"1":"20","2":"155","3":"300"},{"1":"40","2":"155","3":"300"},{"1":"100","2":"155","3":"300"},{"1":"10","2":"156","3":"300"},{"1":"20","2":"156","3":"300"},{"1":"40","2":"156","3":"300"},{"1":"100","2":"156","3":"300"},{"1":"10","2":"157","3":"300"},{"1":"20","2":"157","3":"300"},{"1":"40","2":"157","3":"300"},{"1":"100","2":"157","3":"300"},{"1":"10","2":"158","3":"300"},{"1":"20","2":"158","3":"300"},{"1":"40","2":"158","3":"300"},{"1":"100","2":"158","3":"300"},{"1":"10","2":"159","3":"300"},{"1":"20","2":"159","3":"300"},{"1":"40","2":"159","3":"300"},{"1":"100","2":"159","3":"300"},{"1":"10","2":"160","3":"300"},{"1":"20","2":"160","3":"300"},{"1":"40","2":"160","3":"300"},{"1":"100","2":"160","3":"300"},{"1":"10","2":"161","3":"300"},{"1":"20","2":"161","3":"300"},{"1":"40","2":"161","3":"300"},{"1":"100","2":"161","3":"300"},{"1":"10","2":"162","3":"300"},{"1":"20","2":"162","3":"300"},{"1":"40","2":"162","3":"300"},{"1":"100","2":"162","3":"300"},{"1":"10","2":"163","3":"300"},{"1":"20","2":"163","3":"300"},{"1":"40","2":"163","3":"300"},{"1":"100","2":"163","3":"300"},{"1":"10","2":"164","3":"300"},{"1":"20","2":"164","3":"300"},{"1":"40","2":"164","3":"300"},{"1":"100","2":"164","3":"300"},{"1":"10","2":"165","3":"300"},{"1":"20","2":"165","3":"300"},{"1":"40","2":"165","3":"300"},{"1":"100","2":"165","3":"300"},{"1":"10","2":"166","3":"300"},{"1":"20","2":"166","3":"300"},{"1":"40","2":"166","3":"300"},{"1":"100","2":"166","3":"300"},{"1":"10","2":"167","3":"300"},{"1":"20","2":"167","3":"300"},{"1":"40","2":"167","3":"300"},{"1":"100","2":"167","3":"300"},{"1":"10","2":"168","3":"300"},{"1":"20","2":"168","3":"300"},{"1":"40","2":"168","3":"300"},{"1":"100","2":"168","3":"300"},{"1":"10","2":"169","3":"300"},{"1":"20","2":"169","3":"300"},{"1":"40","2":"169","3":"300"},{"1":"100","2":"169","3":"300"},{"1":"10","2":"170","3":"300"},{"1":"20","2":"170","3":"300"},{"1":"40","2":"170","3":"300"},{"1":"100","2":"170","3":"300"},{"1":"10","2":"171","3":"300"},{"1":"20","2":"171","3":"300"},{"1":"40","2":"171","3":"300"},{"1":"100","2":"171","3":"300"},{"1":"10","2":"172","3":"300"},{"1":"20","2":"172","3":"300"},{"1":"40","2":"172","3":"300"},{"1":"100","2":"172","3":"300"},{"1":"10","2":"173","3":"300"},{"1":"20","2":"173","3":"300"},{"1":"40","2":"173","3":"300"},{"1":"100","2":"173","3":"300"},{"1":"10","2":"174","3":"300"},{"1":"20","2":"174","3":"300"},{"1":"40","2":"174","3":"300"},{"1":"100","2":"174","3":"300"},{"1":"10","2":"175","3":"300"},{"1":"20","2":"175","3":"300"},{"1":"40","2":"175","3":"300"},{"1":"100","2":"175","3":"300"},{"1":"10","2":"176","3":"300"},{"1":"20","2":"176","3":"300"},{"1":"40","2":"176","3":"300"},{"1":"100","2":"176","3":"300"},{"1":"10","2":"177","3":"300"},{"1":"20","2":"177","3":"300"},{"1":"40","2":"177","3":"300"},{"1":"100","2":"177","3":"300"},{"1":"10","2":"178","3":"300"},{"1":"20","2":"178","3":"300"},{"1":"40","2":"178","3":"300"},{"1":"100","2":"178","3":"300"},{"1":"10","2":"179","3":"300"},{"1":"20","2":"179","3":"300"},{"1":"40","2":"179","3":"300"},{"1":"100","2":"179","3":"300"},{"1":"10","2":"180","3":"300"},{"1":"20","2":"180","3":"300"},{"1":"40","2":"180","3":"300"},{"1":"100","2":"180","3":"300"},{"1":"10","2":"181","3":"300"},{"1":"20","2":"181","3":"300"},{"1":"40","2":"181","3":"300"},{"1":"100","2":"181","3":"300"},{"1":"10","2":"182","3":"300"},{"1":"20","2":"182","3":"300"},{"1":"40","2":"182","3":"300"},{"1":"100","2":"182","3":"300"},{"1":"10","2":"183","3":"300"},{"1":"20","2":"183","3":"300"},{"1":"40","2":"183","3":"300"},{"1":"100","2":"183","3":"300"},{"1":"10","2":"184","3":"300"},{"1":"20","2":"184","3":"300"},{"1":"40","2":"184","3":"300"},{"1":"100","2":"184","3":"300"},{"1":"10","2":"185","3":"300"},{"1":"20","2":"185","3":"300"},{"1":"40","2":"185","3":"300"},{"1":"100","2":"185","3":"300"},{"1":"10","2":"186","3":"300"},{"1":"20","2":"186","3":"300"},{"1":"40","2":"186","3":"300"},{"1":"100","2":"186","3":"300"},{"1":"10","2":"187","3":"300"},{"1":"20","2":"187","3":"300"},{"1":"40","2":"187","3":"300"},{"1":"100","2":"187","3":"300"},{"1":"10","2":"188","3":"300"},{"1":"20","2":"188","3":"300"},{"1":"40","2":"188","3":"300"},{"1":"100","2":"188","3":"300"},{"1":"10","2":"189","3":"300"},{"1":"20","2":"189","3":"300"},{"1":"40","2":"189","3":"300"},{"1":"100","2":"189","3":"300"},{"1":"10","2":"190","3":"300"},{"1":"20","2":"190","3":"300"},{"1":"40","2":"190","3":"300"},{"1":"100","2":"190","3":"300"},{"1":"10","2":"191","3":"300"},{"1":"20","2":"191","3":"300"},{"1":"40","2":"191","3":"300"},{"1":"100","2":"191","3":"300"},{"1":"10","2":"192","3":"300"},{"1":"20","2":"192","3":"300"},{"1":"40","2":"192","3":"300"},{"1":"100","2":"192","3":"300"},{"1":"10","2":"193","3":"300"},{"1":"20","2":"193","3":"300"},{"1":"40","2":"193","3":"300"},{"1":"100","2":"193","3":"300"},{"1":"10","2":"194","3":"300"},{"1":"20","2":"194","3":"300"},{"1":"40","2":"194","3":"300"},{"1":"100","2":"194","3":"300"},{"1":"10","2":"195","3":"300"},{"1":"20","2":"195","3":"300"},{"1":"40","2":"195","3":"300"},{"1":"100","2":"195","3":"300"},{"1":"10","2":"196","3":"300"},{"1":"20","2":"196","3":"300"},{"1":"40","2":"196","3":"300"},{"1":"100","2":"196","3":"300"},{"1":"10","2":"197","3":"300"},{"1":"20","2":"197","3":"300"},{"1":"40","2":"197","3":"300"},{"1":"100","2":"197","3":"300"},{"1":"10","2":"198","3":"300"},{"1":"20","2":"198","3":"300"},{"1":"40","2":"198","3":"300"},{"1":"100","2":"198","3":"300"},{"1":"10","2":"199","3":"300"},{"1":"20","2":"199","3":"300"},{"1":"40","2":"199","3":"300"},{"1":"100","2":"199","3":"300"},{"1":"10","2":"200","3":"300"},{"1":"20","2":"200","3":"300"},{"1":"40","2":"200","3":"300"},{"1":"100","2":"200","3":"300"},{"1":"10","2":"201","3":"300"},{"1":"20","2":"201","3":"300"},{"1":"40","2":"201","3":"300"},{"1":"100","2":"201","3":"300"},{"1":"10","2":"202","3":"300"},{"1":"20","2":"202","3":"300"},{"1":"40","2":"202","3":"300"},{"1":"100","2":"202","3":"300"},{"1":"10","2":"203","3":"300"},{"1":"20","2":"203","3":"300"},{"1":"40","2":"203","3":"300"},{"1":"100","2":"203","3":"300"},{"1":"10","2":"204","3":"300"},{"1":"20","2":"204","3":"300"},{"1":"40","2":"204","3":"300"},{"1":"100","2":"204","3":"300"},{"1":"10","2":"205","3":"300"},{"1":"20","2":"205","3":"300"},{"1":"40","2":"205","3":"300"},{"1":"100","2":"205","3":"300"},{"1":"10","2":"206","3":"300"},{"1":"20","2":"206","3":"300"},{"1":"40","2":"206","3":"300"},{"1":"100","2":"206","3":"300"},{"1":"10","2":"207","3":"300"},{"1":"20","2":"207","3":"300"},{"1":"40","2":"207","3":"300"},{"1":"100","2":"207","3":"300"},{"1":"10","2":"208","3":"300"},{"1":"20","2":"208","3":"300"},{"1":"40","2":"208","3":"300"},{"1":"100","2":"208","3":"300"},{"1":"10","2":"209","3":"300"},{"1":"20","2":"209","3":"300"},{"1":"40","2":"209","3":"300"},{"1":"100","2":"209","3":"300"},{"1":"10","2":"210","3":"300"},{"1":"20","2":"210","3":"300"},{"1":"40","2":"210","3":"300"},{"1":"100","2":"210","3":"300"},{"1":"10","2":"211","3":"300"},{"1":"20","2":"211","3":"300"},{"1":"40","2":"211","3":"300"},{"1":"100","2":"211","3":"300"},{"1":"10","2":"212","3":"300"},{"1":"20","2":"212","3":"300"},{"1":"40","2":"212","3":"300"},{"1":"100","2":"212","3":"300"},{"1":"10","2":"213","3":"300"},{"1":"20","2":"213","3":"300"},{"1":"40","2":"213","3":"300"},{"1":"100","2":"213","3":"300"},{"1":"10","2":"214","3":"300"},{"1":"20","2":"214","3":"300"},{"1":"40","2":"214","3":"300"},{"1":"100","2":"214","3":"300"},{"1":"10","2":"215","3":"300"},{"1":"20","2":"215","3":"300"},{"1":"40","2":"215","3":"300"},{"1":"100","2":"215","3":"300"},{"1":"10","2":"216","3":"300"},{"1":"20","2":"216","3":"300"},{"1":"40","2":"216","3":"300"},{"1":"100","2":"216","3":"300"},{"1":"10","2":"217","3":"300"},{"1":"20","2":"217","3":"300"},{"1":"40","2":"217","3":"300"},{"1":"100","2":"217","3":"300"},{"1":"10","2":"218","3":"300"},{"1":"20","2":"218","3":"300"},{"1":"40","2":"218","3":"300"},{"1":"100","2":"218","3":"300"},{"1":"10","2":"219","3":"300"},{"1":"20","2":"219","3":"300"},{"1":"40","2":"219","3":"300"},{"1":"100","2":"219","3":"300"},{"1":"10","2":"220","3":"300"},{"1":"20","2":"220","3":"300"},{"1":"40","2":"220","3":"300"},{"1":"100","2":"220","3":"300"},{"1":"10","2":"221","3":"300"},{"1":"20","2":"221","3":"300"},{"1":"40","2":"221","3":"300"},{"1":"100","2":"221","3":"300"},{"1":"10","2":"222","3":"300"},{"1":"20","2":"222","3":"300"},{"1":"40","2":"222","3":"300"},{"1":"100","2":"222","3":"300"},{"1":"10","2":"223","3":"300"},{"1":"20","2":"223","3":"300"},{"1":"40","2":"223","3":"300"},{"1":"100","2":"223","3":"300"},{"1":"10","2":"224","3":"300"},{"1":"20","2":"224","3":"300"},{"1":"40","2":"224","3":"300"},{"1":"100","2":"224","3":"300"},{"1":"10","2":"225","3":"300"},{"1":"20","2":"225","3":"300"},{"1":"40","2":"225","3":"300"},{"1":"100","2":"225","3":"300"},{"1":"10","2":"226","3":"300"},{"1":"20","2":"226","3":"300"},{"1":"40","2":"226","3":"300"},{"1":"100","2":"226","3":"300"},{"1":"10","2":"227","3":"300"},{"1":"20","2":"227","3":"300"},{"1":"40","2":"227","3":"300"},{"1":"100","2":"227","3":"300"},{"1":"10","2":"228","3":"300"},{"1":"20","2":"228","3":"300"},{"1":"40","2":"228","3":"300"},{"1":"100","2":"228","3":"300"},{"1":"10","2":"229","3":"300"},{"1":"20","2":"229","3":"300"},{"1":"40","2":"229","3":"300"},{"1":"100","2":"229","3":"300"},{"1":"10","2":"230","3":"300"},{"1":"20","2":"230","3":"300"},{"1":"40","2":"230","3":"300"},{"1":"100","2":"230","3":"300"},{"1":"10","2":"231","3":"300"},{"1":"20","2":"231","3":"300"},{"1":"40","2":"231","3":"300"},{"1":"100","2":"231","3":"300"},{"1":"10","2":"232","3":"300"},{"1":"20","2":"232","3":"300"},{"1":"40","2":"232","3":"300"},{"1":"100","2":"232","3":"300"},{"1":"10","2":"233","3":"300"},{"1":"20","2":"233","3":"300"},{"1":"40","2":"233","3":"300"},{"1":"100","2":"233","3":"300"},{"1":"10","2":"234","3":"300"},{"1":"20","2":"234","3":"300"},{"1":"40","2":"234","3":"300"},{"1":"100","2":"234","3":"300"},{"1":"10","2":"235","3":"300"},{"1":"20","2":"235","3":"300"},{"1":"40","2":"235","3":"300"},{"1":"100","2":"235","3":"300"},{"1":"10","2":"236","3":"300"},{"1":"20","2":"236","3":"300"},{"1":"40","2":"236","3":"300"},{"1":"100","2":"236","3":"300"},{"1":"10","2":"237","3":"300"},{"1":"20","2":"237","3":"300"},{"1":"40","2":"237","3":"300"},{"1":"100","2":"237","3":"300"},{"1":"10","2":"238","3":"300"},{"1":"20","2":"238","3":"300"},{"1":"40","2":"238","3":"300"},{"1":"100","2":"238","3":"300"},{"1":"10","2":"239","3":"300"},{"1":"20","2":"239","3":"300"},{"1":"40","2":"239","3":"300"},{"1":"100","2":"239","3":"300"},{"1":"10","2":"240","3":"300"},{"1":"20","2":"240","3":"300"},{"1":"40","2":"240","3":"300"},{"1":"100","2":"240","3":"300"},{"1":"10","2":"241","3":"300"},{"1":"20","2":"241","3":"300"},{"1":"40","2":"241","3":"300"},{"1":"100","2":"241","3":"300"},{"1":"10","2":"242","3":"300"},{"1":"20","2":"242","3":"300"},{"1":"40","2":"242","3":"300"},{"1":"100","2":"242","3":"300"},{"1":"10","2":"243","3":"300"},{"1":"20","2":"243","3":"300"},{"1":"40","2":"243","3":"300"},{"1":"100","2":"243","3":"300"},{"1":"10","2":"244","3":"300"},{"1":"20","2":"244","3":"300"},{"1":"40","2":"244","3":"300"},{"1":"100","2":"244","3":"300"},{"1":"10","2":"245","3":"300"},{"1":"20","2":"245","3":"300"},{"1":"40","2":"245","3":"300"},{"1":"100","2":"245","3":"300"},{"1":"10","2":"246","3":"300"},{"1":"20","2":"246","3":"300"},{"1":"40","2":"246","3":"300"},{"1":"100","2":"246","3":"300"},{"1":"10","2":"247","3":"300"},{"1":"20","2":"247","3":"300"},{"1":"40","2":"247","3":"300"},{"1":"100","2":"247","3":"300"},{"1":"10","2":"248","3":"300"},{"1":"20","2":"248","3":"300"},{"1":"40","2":"248","3":"300"},{"1":"100","2":"248","3":"300"},{"1":"10","2":"249","3":"300"},{"1":"20","2":"249","3":"300"},{"1":"40","2":"249","3":"300"},{"1":"100","2":"249","3":"300"},{"1":"10","2":"250","3":"300"},{"1":"20","2":"250","3":"300"},{"1":"40","2":"250","3":"300"},{"1":"100","2":"250","3":"300"},{"1":"10","2":"251","3":"300"},{"1":"20","2":"251","3":"300"},{"1":"40","2":"251","3":"300"},{"1":"100","2":"251","3":"300"},{"1":"10","2":"252","3":"300"},{"1":"20","2":"252","3":"300"},{"1":"40","2":"252","3":"300"},{"1":"100","2":"252","3":"300"},{"1":"10","2":"253","3":"300"},{"1":"20","2":"253","3":"300"},{"1":"40","2":"253","3":"300"},{"1":"100","2":"253","3":"300"},{"1":"10","2":"254","3":"300"},{"1":"20","2":"254","3":"300"},{"1":"40","2":"254","3":"300"},{"1":"100","2":"254","3":"300"},{"1":"10","2":"255","3":"300"},{"1":"20","2":"255","3":"300"},{"1":"40","2":"255","3":"300"},{"1":"100","2":"255","3":"300"},{"1":"10","2":"256","3":"300"},{"1":"20","2":"256","3":"300"},{"1":"40","2":"256","3":"300"},{"1":"100","2":"256","3":"300"},{"1":"10","2":"257","3":"300"},{"1":"20","2":"257","3":"300"},{"1":"40","2":"257","3":"300"},{"1":"100","2":"257","3":"300"},{"1":"10","2":"258","3":"300"},{"1":"20","2":"258","3":"300"},{"1":"40","2":"258","3":"300"},{"1":"100","2":"258","3":"300"},{"1":"10","2":"259","3":"300"},{"1":"20","2":"259","3":"300"},{"1":"40","2":"259","3":"300"},{"1":"100","2":"259","3":"300"},{"1":"10","2":"260","3":"300"},{"1":"20","2":"260","3":"300"},{"1":"40","2":"260","3":"300"},{"1":"100","2":"260","3":"300"},{"1":"10","2":"261","3":"300"},{"1":"20","2":"261","3":"300"},{"1":"40","2":"261","3":"300"},{"1":"100","2":"261","3":"300"},{"1":"10","2":"262","3":"300"},{"1":"20","2":"262","3":"300"},{"1":"40","2":"262","3":"300"},{"1":"100","2":"262","3":"300"},{"1":"10","2":"263","3":"300"},{"1":"20","2":"263","3":"300"},{"1":"40","2":"263","3":"300"},{"1":"100","2":"263","3":"300"},{"1":"10","2":"264","3":"300"},{"1":"20","2":"264","3":"300"},{"1":"40","2":"264","3":"300"},{"1":"100","2":"264","3":"300"},{"1":"10","2":"265","3":"300"},{"1":"20","2":"265","3":"300"},{"1":"40","2":"265","3":"300"},{"1":"100","2":"265","3":"300"},{"1":"10","2":"266","3":"300"},{"1":"20","2":"266","3":"300"},{"1":"40","2":"266","3":"300"},{"1":"100","2":"266","3":"300"},{"1":"10","2":"267","3":"300"},{"1":"20","2":"267","3":"300"},{"1":"40","2":"267","3":"300"},{"1":"100","2":"267","3":"300"},{"1":"10","2":"268","3":"300"},{"1":"20","2":"268","3":"300"},{"1":"40","2":"268","3":"300"},{"1":"100","2":"268","3":"300"},{"1":"10","2":"269","3":"300"},{"1":"20","2":"269","3":"300"},{"1":"40","2":"269","3":"300"},{"1":"100","2":"269","3":"300"},{"1":"10","2":"270","3":"300"},{"1":"20","2":"270","3":"300"},{"1":"40","2":"270","3":"300"},{"1":"100","2":"270","3":"300"},{"1":"10","2":"271","3":"300"},{"1":"20","2":"271","3":"300"},{"1":"40","2":"271","3":"300"},{"1":"100","2":"271","3":"300"},{"1":"10","2":"272","3":"300"},{"1":"20","2":"272","3":"300"},{"1":"40","2":"272","3":"300"},{"1":"100","2":"272","3":"300"},{"1":"10","2":"273","3":"300"},{"1":"20","2":"273","3":"300"},{"1":"40","2":"273","3":"300"},{"1":"100","2":"273","3":"300"},{"1":"10","2":"274","3":"300"},{"1":"20","2":"274","3":"300"},{"1":"40","2":"274","3":"300"},{"1":"100","2":"274","3":"300"},{"1":"10","2":"275","3":"300"},{"1":"20","2":"275","3":"300"},{"1":"40","2":"275","3":"300"},{"1":"100","2":"275","3":"300"},{"1":"10","2":"276","3":"300"},{"1":"20","2":"276","3":"300"},{"1":"40","2":"276","3":"300"},{"1":"100","2":"276","3":"300"},{"1":"10","2":"277","3":"300"},{"1":"20","2":"277","3":"300"},{"1":"40","2":"277","3":"300"},{"1":"100","2":"277","3":"300"},{"1":"10","2":"278","3":"300"},{"1":"20","2":"278","3":"300"},{"1":"40","2":"278","3":"300"},{"1":"100","2":"278","3":"300"},{"1":"10","2":"279","3":"300"},{"1":"20","2":"279","3":"300"},{"1":"40","2":"279","3":"300"},{"1":"100","2":"279","3":"300"},{"1":"10","2":"280","3":"300"},{"1":"20","2":"280","3":"300"},{"1":"40","2":"280","3":"300"},{"1":"100","2":"280","3":"300"},{"1":"10","2":"281","3":"300"},{"1":"20","2":"281","3":"300"},{"1":"40","2":"281","3":"300"},{"1":"100","2":"281","3":"300"},{"1":"10","2":"282","3":"300"},{"1":"20","2":"282","3":"300"},{"1":"40","2":"282","3":"300"},{"1":"100","2":"282","3":"300"},{"1":"10","2":"283","3":"300"},{"1":"20","2":"283","3":"300"},{"1":"40","2":"283","3":"300"},{"1":"100","2":"283","3":"300"},{"1":"10","2":"284","3":"300"},{"1":"20","2":"284","3":"300"},{"1":"40","2":"284","3":"300"},{"1":"100","2":"284","3":"300"},{"1":"10","2":"285","3":"300"},{"1":"20","2":"285","3":"300"},{"1":"40","2":"285","3":"300"},{"1":"100","2":"285","3":"300"},{"1":"10","2":"286","3":"300"},{"1":"20","2":"286","3":"300"},{"1":"40","2":"286","3":"300"},{"1":"100","2":"286","3":"300"},{"1":"10","2":"287","3":"300"},{"1":"20","2":"287","3":"300"},{"1":"40","2":"287","3":"300"},{"1":"100","2":"287","3":"300"},{"1":"10","2":"288","3":"300"},{"1":"20","2":"288","3":"300"},{"1":"40","2":"288","3":"300"},{"1":"100","2":"288","3":"300"},{"1":"10","2":"289","3":"300"},{"1":"20","2":"289","3":"300"},{"1":"40","2":"289","3":"300"},{"1":"100","2":"289","3":"300"},{"1":"10","2":"290","3":"300"},{"1":"20","2":"290","3":"300"},{"1":"40","2":"290","3":"300"},{"1":"100","2":"290","3":"300"},{"1":"10","2":"291","3":"300"},{"1":"20","2":"291","3":"300"},{"1":"40","2":"291","3":"300"},{"1":"100","2":"291","3":"300"},{"1":"10","2":"292","3":"300"},{"1":"20","2":"292","3":"300"},{"1":"40","2":"292","3":"300"},{"1":"100","2":"292","3":"300"},{"1":"10","2":"293","3":"300"},{"1":"20","2":"293","3":"300"},{"1":"40","2":"293","3":"300"},{"1":"100","2":"293","3":"300"},{"1":"10","2":"294","3":"300"},{"1":"20","2":"294","3":"300"},{"1":"40","2":"294","3":"300"},{"1":"100","2":"294","3":"300"},{"1":"10","2":"295","3":"300"},{"1":"20","2":"295","3":"300"},{"1":"40","2":"295","3":"300"},{"1":"100","2":"295","3":"300"},{"1":"10","2":"296","3":"300"},{"1":"20","2":"296","3":"300"},{"1":"40","2":"296","3":"300"},{"1":"100","2":"296","3":"300"},{"1":"10","2":"297","3":"300"},{"1":"20","2":"297","3":"300"},{"1":"40","2":"297","3":"300"},{"1":"100","2":"297","3":"300"},{"1":"10","2":"298","3":"300"},{"1":"20","2":"298","3":"300"},{"1":"40","2":"298","3":"300"},{"1":"100","2":"298","3":"300"},{"1":"10","2":"299","3":"300"},{"1":"20","2":"299","3":"300"},{"1":"40","2":"299","3":"300"},{"1":"100","2":"299","3":"300"},{"1":"10","2":"300","3":"300"},{"1":"20","2":"300","3":"300"},{"1":"40","2":"300","3":"300"},{"1":"100","2":"300","3":"300"},{"1":"10","2":"301","3":"300"},{"1":"20","2":"301","3":"300"},{"1":"40","2":"301","3":"300"},{"1":"100","2":"301","3":"300"},{"1":"10","2":"302","3":"300"},{"1":"20","2":"302","3":"300"},{"1":"40","2":"302","3":"300"},{"1":"100","2":"302","3":"300"},{"1":"10","2":"303","3":"300"},{"1":"20","2":"303","3":"300"},{"1":"40","2":"303","3":"300"},{"1":"100","2":"303","3":"300"},{"1":"10","2":"304","3":"300"},{"1":"20","2":"304","3":"300"},{"1":"40","2":"304","3":"300"},{"1":"100","2":"304","3":"300"},{"1":"10","2":"305","3":"300"},{"1":"20","2":"305","3":"300"},{"1":"40","2":"305","3":"300"},{"1":"100","2":"305","3":"300"},{"1":"10","2":"306","3":"300"},{"1":"20","2":"306","3":"300"},{"1":"40","2":"306","3":"300"},{"1":"100","2":"306","3":"300"},{"1":"10","2":"307","3":"300"},{"1":"20","2":"307","3":"300"},{"1":"40","2":"307","3":"300"},{"1":"100","2":"307","3":"300"},{"1":"10","2":"308","3":"300"},{"1":"20","2":"308","3":"300"},{"1":"40","2":"308","3":"300"},{"1":"100","2":"308","3":"300"},{"1":"10","2":"309","3":"300"},{"1":"20","2":"309","3":"300"},{"1":"40","2":"309","3":"300"},{"1":"100","2":"309","3":"300"},{"1":"10","2":"310","3":"300"},{"1":"20","2":"310","3":"300"},{"1":"40","2":"310","3":"300"},{"1":"100","2":"310","3":"300"},{"1":"10","2":"311","3":"300"},{"1":"20","2":"311","3":"300"},{"1":"40","2":"311","3":"300"},{"1":"100","2":"311","3":"300"},{"1":"10","2":"312","3":"300"},{"1":"20","2":"312","3":"300"},{"1":"40","2":"312","3":"300"},{"1":"100","2":"312","3":"300"},{"1":"10","2":"313","3":"300"},{"1":"20","2":"313","3":"300"},{"1":"40","2":"313","3":"300"},{"1":"100","2":"313","3":"300"},{"1":"10","2":"314","3":"300"},{"1":"20","2":"314","3":"300"},{"1":"40","2":"314","3":"300"},{"1":"100","2":"314","3":"300"},{"1":"10","2":"315","3":"300"},{"1":"20","2":"315","3":"300"},{"1":"40","2":"315","3":"300"},{"1":"100","2":"315","3":"300"},{"1":"10","2":"316","3":"300"},{"1":"20","2":"316","3":"300"},{"1":"40","2":"316","3":"300"},{"1":"100","2":"316","3":"300"},{"1":"10","2":"317","3":"300"},{"1":"20","2":"317","3":"300"},{"1":"40","2":"317","3":"300"},{"1":"100","2":"317","3":"300"},{"1":"10","2":"318","3":"300"},{"1":"20","2":"318","3":"300"},{"1":"40","2":"318","3":"300"},{"1":"100","2":"318","3":"300"},{"1":"10","2":"319","3":"300"},{"1":"20","2":"319","3":"300"},{"1":"40","2":"319","3":"300"},{"1":"100","2":"319","3":"300"},{"1":"10","2":"320","3":"300"},{"1":"20","2":"320","3":"300"},{"1":"40","2":"320","3":"300"},{"1":"100","2":"320","3":"300"},{"1":"10","2":"321","3":"300"},{"1":"20","2":"321","3":"300"},{"1":"40","2":"321","3":"300"},{"1":"100","2":"321","3":"300"},{"1":"10","2":"322","3":"300"},{"1":"20","2":"322","3":"300"},{"1":"40","2":"322","3":"300"},{"1":"100","2":"322","3":"300"},{"1":"10","2":"323","3":"300"},{"1":"20","2":"323","3":"300"},{"1":"40","2":"323","3":"300"},{"1":"100","2":"323","3":"300"},{"1":"10","2":"324","3":"300"},{"1":"20","2":"324","3":"300"},{"1":"40","2":"324","3":"300"},{"1":"100","2":"324","3":"300"},{"1":"10","2":"325","3":"300"},{"1":"20","2":"325","3":"300"},{"1":"40","2":"325","3":"300"},{"1":"100","2":"325","3":"300"},{"1":"10","2":"326","3":"300"},{"1":"20","2":"326","3":"300"},{"1":"40","2":"326","3":"300"},{"1":"100","2":"326","3":"300"},{"1":"10","2":"327","3":"300"},{"1":"20","2":"327","3":"300"},{"1":"40","2":"327","3":"300"},{"1":"100","2":"327","3":"300"},{"1":"10","2":"328","3":"300"},{"1":"20","2":"328","3":"300"},{"1":"40","2":"328","3":"300"},{"1":"100","2":"328","3":"300"},{"1":"10","2":"329","3":"300"},{"1":"20","2":"329","3":"300"},{"1":"40","2":"329","3":"300"},{"1":"100","2":"329","3":"300"},{"1":"10","2":"330","3":"300"},{"1":"20","2":"330","3":"300"},{"1":"40","2":"330","3":"300"},{"1":"100","2":"330","3":"300"},{"1":"10","2":"331","3":"300"},{"1":"20","2":"331","3":"300"},{"1":"40","2":"331","3":"300"},{"1":"100","2":"331","3":"300"},{"1":"10","2":"332","3":"300"},{"1":"20","2":"332","3":"300"},{"1":"40","2":"332","3":"300"},{"1":"100","2":"332","3":"300"},{"1":"10","2":"333","3":"300"},{"1":"20","2":"333","3":"300"},{"1":"40","2":"333","3":"300"},{"1":"100","2":"333","3":"300"},{"1":"10","2":"334","3":"300"},{"1":"20","2":"334","3":"300"},{"1":"40","2":"334","3":"300"},{"1":"100","2":"334","3":"300"},{"1":"10","2":"335","3":"300"},{"1":"20","2":"335","3":"300"},{"1":"40","2":"335","3":"300"},{"1":"100","2":"335","3":"300"},{"1":"10","2":"336","3":"300"},{"1":"20","2":"336","3":"300"},{"1":"40","2":"336","3":"300"},{"1":"100","2":"336","3":"300"},{"1":"10","2":"337","3":"300"},{"1":"20","2":"337","3":"300"},{"1":"40","2":"337","3":"300"},{"1":"100","2":"337","3":"300"},{"1":"10","2":"338","3":"300"},{"1":"20","2":"338","3":"300"},{"1":"40","2":"338","3":"300"},{"1":"100","2":"338","3":"300"},{"1":"10","2":"339","3":"300"},{"1":"20","2":"339","3":"300"},{"1":"40","2":"339","3":"300"},{"1":"100","2":"339","3":"300"},{"1":"10","2":"340","3":"300"},{"1":"20","2":"340","3":"300"},{"1":"40","2":"340","3":"300"},{"1":"100","2":"340","3":"300"},{"1":"10","2":"341","3":"300"},{"1":"20","2":"341","3":"300"},{"1":"40","2":"341","3":"300"},{"1":"100","2":"341","3":"300"},{"1":"10","2":"342","3":"300"},{"1":"20","2":"342","3":"300"},{"1":"40","2":"342","3":"300"},{"1":"100","2":"342","3":"300"},{"1":"10","2":"343","3":"300"},{"1":"20","2":"343","3":"300"},{"1":"40","2":"343","3":"300"},{"1":"100","2":"343","3":"300"},{"1":"10","2":"344","3":"300"},{"1":"20","2":"344","3":"300"},{"1":"40","2":"344","3":"300"},{"1":"100","2":"344","3":"300"},{"1":"10","2":"345","3":"300"},{"1":"20","2":"345","3":"300"},{"1":"40","2":"345","3":"300"},{"1":"100","2":"345","3":"300"},{"1":"10","2":"346","3":"300"},{"1":"20","2":"346","3":"300"},{"1":"40","2":"346","3":"300"},{"1":"100","2":"346","3":"300"},{"1":"10","2":"347","3":"300"},{"1":"20","2":"347","3":"300"},{"1":"40","2":"347","3":"300"},{"1":"100","2":"347","3":"300"},{"1":"10","2":"348","3":"300"},{"1":"20","2":"348","3":"300"},{"1":"40","2":"348","3":"300"},{"1":"100","2":"348","3":"300"},{"1":"10","2":"349","3":"300"},{"1":"20","2":"349","3":"300"},{"1":"40","2":"349","3":"300"},{"1":"100","2":"349","3":"300"},{"1":"10","2":"350","3":"300"},{"1":"20","2":"350","3":"300"},{"1":"40","2":"350","3":"300"},{"1":"100","2":"350","3":"300"},{"1":"10","2":"351","3":"300"},{"1":"20","2":"351","3":"300"},{"1":"40","2":"351","3":"300"},{"1":"100","2":"351","3":"300"},{"1":"10","2":"352","3":"300"},{"1":"20","2":"352","3":"300"},{"1":"40","2":"352","3":"300"},{"1":"100","2":"352","3":"300"},{"1":"10","2":"353","3":"300"},{"1":"20","2":"353","3":"300"},{"1":"40","2":"353","3":"300"},{"1":"100","2":"353","3":"300"},{"1":"10","2":"354","3":"300"},{"1":"20","2":"354","3":"300"},{"1":"40","2":"354","3":"300"},{"1":"100","2":"354","3":"300"},{"1":"10","2":"355","3":"300"},{"1":"20","2":"355","3":"300"},{"1":"40","2":"355","3":"300"},{"1":"100","2":"355","3":"300"},{"1":"10","2":"356","3":"300"},{"1":"20","2":"356","3":"300"},{"1":"40","2":"356","3":"300"},{"1":"100","2":"356","3":"300"},{"1":"10","2":"357","3":"300"},{"1":"20","2":"357","3":"300"},{"1":"40","2":"357","3":"300"},{"1":"100","2":"357","3":"300"},{"1":"10","2":"358","3":"300"},{"1":"20","2":"358","3":"300"},{"1":"40","2":"358","3":"300"},{"1":"100","2":"358","3":"300"},{"1":"10","2":"359","3":"300"},{"1":"20","2":"359","3":"300"},{"1":"40","2":"359","3":"300"},{"1":"100","2":"359","3":"300"},{"1":"10","2":"360","3":"300"},{"1":"20","2":"360","3":"300"},{"1":"40","2":"360","3":"300"},{"1":"100","2":"360","3":"300"},{"1":"10","2":"361","3":"300"},{"1":"20","2":"361","3":"300"},{"1":"40","2":"361","3":"300"},{"1":"100","2":"361","3":"300"},{"1":"10","2":"362","3":"300"},{"1":"20","2":"362","3":"300"},{"1":"40","2":"362","3":"300"},{"1":"100","2":"362","3":"300"},{"1":"10","2":"363","3":"300"},{"1":"20","2":"363","3":"300"},{"1":"40","2":"363","3":"300"},{"1":"100","2":"363","3":"300"},{"1":"10","2":"364","3":"300"},{"1":"20","2":"364","3":"300"},{"1":"40","2":"364","3":"300"},{"1":"100","2":"364","3":"300"},{"1":"10","2":"365","3":"300"},{"1":"20","2":"365","3":"300"},{"1":"40","2":"365","3":"300"},{"1":"100","2":"365","3":"300"},{"1":"10","2":"366","3":"300"},{"1":"20","2":"366","3":"300"},{"1":"40","2":"366","3":"300"},{"1":"100","2":"366","3":"300"},{"1":"10","2":"367","3":"300"},{"1":"20","2":"367","3":"300"},{"1":"40","2":"367","3":"300"},{"1":"100","2":"367","3":"300"},{"1":"10","2":"368","3":"300"},{"1":"20","2":"368","3":"300"},{"1":"40","2":"368","3":"300"},{"1":"100","2":"368","3":"300"},{"1":"10","2":"369","3":"300"},{"1":"20","2":"369","3":"300"},{"1":"40","2":"369","3":"300"},{"1":"100","2":"369","3":"300"},{"1":"10","2":"370","3":"300"},{"1":"20","2":"370","3":"300"},{"1":"40","2":"370","3":"300"},{"1":"100","2":"370","3":"300"},{"1":"10","2":"371","3":"300"},{"1":"20","2":"371","3":"300"},{"1":"40","2":"371","3":"300"},{"1":"100","2":"371","3":"300"},{"1":"10","2":"372","3":"300"},{"1":"20","2":"372","3":"300"},{"1":"40","2":"372","3":"300"},{"1":"100","2":"372","3":"300"},{"1":"10","2":"373","3":"300"},{"1":"20","2":"373","3":"300"},{"1":"40","2":"373","3":"300"},{"1":"100","2":"373","3":"300"},{"1":"10","2":"374","3":"300"},{"1":"20","2":"374","3":"300"},{"1":"40","2":"374","3":"300"},{"1":"100","2":"374","3":"300"},{"1":"10","2":"375","3":"300"},{"1":"20","2":"375","3":"300"},{"1":"40","2":"375","3":"300"},{"1":"100","2":"375","3":"300"},{"1":"10","2":"376","3":"300"},{"1":"20","2":"376","3":"300"},{"1":"40","2":"376","3":"300"},{"1":"100","2":"376","3":"300"},{"1":"10","2":"377","3":"300"},{"1":"20","2":"377","3":"300"},{"1":"40","2":"377","3":"300"},{"1":"100","2":"377","3":"300"},{"1":"10","2":"378","3":"300"},{"1":"20","2":"378","3":"300"},{"1":"40","2":"378","3":"300"},{"1":"100","2":"378","3":"300"},{"1":"10","2":"379","3":"300"},{"1":"20","2":"379","3":"300"},{"1":"40","2":"379","3":"300"},{"1":"100","2":"379","3":"300"},{"1":"10","2":"380","3":"300"},{"1":"20","2":"380","3":"300"},{"1":"40","2":"380","3":"300"},{"1":"100","2":"380","3":"300"},{"1":"10","2":"381","3":"300"},{"1":"20","2":"381","3":"300"},{"1":"40","2":"381","3":"300"},{"1":"100","2":"381","3":"300"},{"1":"10","2":"382","3":"300"},{"1":"20","2":"382","3":"300"},{"1":"40","2":"382","3":"300"},{"1":"100","2":"382","3":"300"},{"1":"10","2":"383","3":"300"},{"1":"20","2":"383","3":"300"},{"1":"40","2":"383","3":"300"},{"1":"100","2":"383","3":"300"},{"1":"10","2":"384","3":"300"},{"1":"20","2":"384","3":"300"},{"1":"40","2":"384","3":"300"},{"1":"100","2":"384","3":"300"},{"1":"10","2":"385","3":"300"},{"1":"20","2":"385","3":"300"},{"1":"40","2":"385","3":"300"},{"1":"100","2":"385","3":"300"},{"1":"10","2":"386","3":"300"},{"1":"20","2":"386","3":"300"},{"1":"40","2":"386","3":"300"},{"1":"100","2":"386","3":"300"},{"1":"10","2":"387","3":"300"},{"1":"20","2":"387","3":"300"},{"1":"40","2":"387","3":"300"},{"1":"100","2":"387","3":"300"},{"1":"10","2":"388","3":"300"},{"1":"20","2":"388","3":"300"},{"1":"40","2":"388","3":"300"},{"1":"100","2":"388","3":"300"},{"1":"10","2":"389","3":"300"},{"1":"20","2":"389","3":"300"},{"1":"40","2":"389","3":"300"},{"1":"100","2":"389","3":"300"},{"1":"10","2":"390","3":"300"},{"1":"20","2":"390","3":"300"},{"1":"40","2":"390","3":"300"},{"1":"100","2":"390","3":"300"},{"1":"10","2":"391","3":"300"},{"1":"20","2":"391","3":"300"},{"1":"40","2":"391","3":"300"},{"1":"100","2":"391","3":"300"},{"1":"10","2":"392","3":"300"},{"1":"20","2":"392","3":"300"},{"1":"40","2":"392","3":"300"},{"1":"100","2":"392","3":"300"},{"1":"10","2":"393","3":"300"},{"1":"20","2":"393","3":"300"},{"1":"40","2":"393","3":"300"},{"1":"100","2":"393","3":"300"},{"1":"10","2":"394","3":"300"},{"1":"20","2":"394","3":"300"},{"1":"40","2":"394","3":"300"},{"1":"100","2":"394","3":"300"},{"1":"10","2":"395","3":"300"},{"1":"20","2":"395","3":"300"},{"1":"40","2":"395","3":"300"},{"1":"100","2":"395","3":"300"},{"1":"10","2":"396","3":"300"},{"1":"20","2":"396","3":"300"},{"1":"40","2":"396","3":"300"},{"1":"100","2":"396","3":"300"},{"1":"10","2":"397","3":"300"},{"1":"20","2":"397","3":"300"},{"1":"40","2":"397","3":"300"},{"1":"100","2":"397","3":"300"},{"1":"10","2":"398","3":"300"},{"1":"20","2":"398","3":"300"},{"1":"40","2":"398","3":"300"},{"1":"100","2":"398","3":"300"},{"1":"10","2":"399","3":"300"},{"1":"20","2":"399","3":"300"},{"1":"40","2":"399","3":"300"},{"1":"100","2":"399","3":"300"},{"1":"10","2":"400","3":"300"},{"1":"20","2":"400","3":"300"},{"1":"40","2":"400","3":"300"},{"1":"100","2":"400","3":"300"},{"1":"10","2":"401","3":"300"},{"1":"20","2":"401","3":"300"},{"1":"40","2":"401","3":"300"},{"1":"100","2":"401","3":"300"},{"1":"10","2":"402","3":"300"},{"1":"20","2":"402","3":"300"},{"1":"40","2":"402","3":"300"},{"1":"100","2":"402","3":"300"},{"1":"10","2":"403","3":"300"},{"1":"20","2":"403","3":"300"},{"1":"40","2":"403","3":"300"},{"1":"100","2":"403","3":"300"},{"1":"10","2":"404","3":"300"},{"1":"20","2":"404","3":"300"},{"1":"40","2":"404","3":"300"},{"1":"100","2":"404","3":"300"},{"1":"10","2":"405","3":"300"},{"1":"20","2":"405","3":"300"},{"1":"40","2":"405","3":"300"},{"1":"100","2":"405","3":"300"},{"1":"10","2":"406","3":"300"},{"1":"20","2":"406","3":"300"},{"1":"40","2":"406","3":"300"},{"1":"100","2":"406","3":"300"},{"1":"10","2":"407","3":"300"},{"1":"20","2":"407","3":"300"},{"1":"40","2":"407","3":"300"},{"1":"100","2":"407","3":"300"},{"1":"10","2":"408","3":"300"},{"1":"20","2":"408","3":"300"},{"1":"40","2":"408","3":"300"},{"1":"100","2":"408","3":"300"},{"1":"10","2":"409","3":"300"},{"1":"20","2":"409","3":"300"},{"1":"40","2":"409","3":"300"},{"1":"100","2":"409","3":"300"},{"1":"10","2":"410","3":"300"},{"1":"20","2":"410","3":"300"},{"1":"40","2":"410","3":"300"},{"1":"100","2":"410","3":"300"},{"1":"10","2":"411","3":"300"},{"1":"20","2":"411","3":"300"},{"1":"40","2":"411","3":"300"},{"1":"100","2":"411","3":"300"},{"1":"10","2":"412","3":"300"},{"1":"20","2":"412","3":"300"},{"1":"40","2":"412","3":"300"},{"1":"100","2":"412","3":"300"},{"1":"10","2":"413","3":"300"},{"1":"20","2":"413","3":"300"},{"1":"40","2":"413","3":"300"},{"1":"100","2":"413","3":"300"},{"1":"10","2":"414","3":"300"},{"1":"20","2":"414","3":"300"},{"1":"40","2":"414","3":"300"},{"1":"100","2":"414","3":"300"},{"1":"10","2":"415","3":"300"},{"1":"20","2":"415","3":"300"},{"1":"40","2":"415","3":"300"},{"1":"100","2":"415","3":"300"},{"1":"10","2":"416","3":"300"},{"1":"20","2":"416","3":"300"},{"1":"40","2":"416","3":"300"},{"1":"100","2":"416","3":"300"},{"1":"10","2":"417","3":"300"},{"1":"20","2":"417","3":"300"},{"1":"40","2":"417","3":"300"},{"1":"100","2":"417","3":"300"},{"1":"10","2":"418","3":"300"},{"1":"20","2":"418","3":"300"},{"1":"40","2":"418","3":"300"},{"1":"100","2":"418","3":"300"},{"1":"10","2":"419","3":"300"},{"1":"20","2":"419","3":"300"},{"1":"40","2":"419","3":"300"},{"1":"100","2":"419","3":"300"},{"1":"10","2":"420","3":"300"},{"1":"20","2":"420","3":"300"},{"1":"40","2":"420","3":"300"},{"1":"100","2":"420","3":"300"},{"1":"10","2":"421","3":"300"},{"1":"20","2":"421","3":"300"},{"1":"40","2":"421","3":"300"},{"1":"100","2":"421","3":"300"},{"1":"10","2":"422","3":"300"},{"1":"20","2":"422","3":"300"},{"1":"40","2":"422","3":"300"},{"1":"100","2":"422","3":"300"},{"1":"10","2":"423","3":"300"},{"1":"20","2":"423","3":"300"},{"1":"40","2":"423","3":"300"},{"1":"100","2":"423","3":"300"},{"1":"10","2":"424","3":"300"},{"1":"20","2":"424","3":"300"},{"1":"40","2":"424","3":"300"},{"1":"100","2":"424","3":"300"},{"1":"10","2":"425","3":"300"},{"1":"20","2":"425","3":"300"},{"1":"40","2":"425","3":"300"},{"1":"100","2":"425","3":"300"},{"1":"10","2":"426","3":"300"},{"1":"20","2":"426","3":"300"},{"1":"40","2":"426","3":"300"},{"1":"100","2":"426","3":"300"},{"1":"10","2":"427","3":"300"},{"1":"20","2":"427","3":"300"},{"1":"40","2":"427","3":"300"},{"1":"100","2":"427","3":"300"},{"1":"10","2":"428","3":"300"},{"1":"20","2":"428","3":"300"},{"1":"40","2":"428","3":"300"},{"1":"100","2":"428","3":"300"},{"1":"10","2":"429","3":"300"},{"1":"20","2":"429","3":"300"},{"1":"40","2":"429","3":"300"},{"1":"100","2":"429","3":"300"},{"1":"10","2":"430","3":"300"},{"1":"20","2":"430","3":"300"},{"1":"40","2":"430","3":"300"},{"1":"100","2":"430","3":"300"},{"1":"10","2":"431","3":"300"},{"1":"20","2":"431","3":"300"},{"1":"40","2":"431","3":"300"},{"1":"100","2":"431","3":"300"},{"1":"10","2":"432","3":"300"},{"1":"20","2":"432","3":"300"},{"1":"40","2":"432","3":"300"},{"1":"100","2":"432","3":"300"},{"1":"10","2":"433","3":"300"},{"1":"20","2":"433","3":"300"},{"1":"40","2":"433","3":"300"},{"1":"100","2":"433","3":"300"},{"1":"10","2":"434","3":"300"},{"1":"20","2":"434","3":"300"},{"1":"40","2":"434","3":"300"},{"1":"100","2":"434","3":"300"},{"1":"10","2":"435","3":"300"},{"1":"20","2":"435","3":"300"},{"1":"40","2":"435","3":"300"},{"1":"100","2":"435","3":"300"},{"1":"10","2":"436","3":"300"},{"1":"20","2":"436","3":"300"},{"1":"40","2":"436","3":"300"},{"1":"100","2":"436","3":"300"},{"1":"10","2":"437","3":"300"},{"1":"20","2":"437","3":"300"},{"1":"40","2":"437","3":"300"},{"1":"100","2":"437","3":"300"},{"1":"10","2":"438","3":"300"},{"1":"20","2":"438","3":"300"},{"1":"40","2":"438","3":"300"},{"1":"100","2":"438","3":"300"},{"1":"10","2":"439","3":"300"},{"1":"20","2":"439","3":"300"},{"1":"40","2":"439","3":"300"},{"1":"100","2":"439","3":"300"},{"1":"10","2":"440","3":"300"},{"1":"20","2":"440","3":"300"},{"1":"40","2":"440","3":"300"},{"1":"100","2":"440","3":"300"},{"1":"10","2":"441","3":"300"},{"1":"20","2":"441","3":"300"},{"1":"40","2":"441","3":"300"},{"1":"100","2":"441","3":"300"},{"1":"10","2":"442","3":"300"},{"1":"20","2":"442","3":"300"},{"1":"40","2":"442","3":"300"},{"1":"100","2":"442","3":"300"},{"1":"10","2":"443","3":"300"},{"1":"20","2":"443","3":"300"},{"1":"40","2":"443","3":"300"},{"1":"100","2":"443","3":"300"},{"1":"10","2":"444","3":"300"},{"1":"20","2":"444","3":"300"},{"1":"40","2":"444","3":"300"},{"1":"100","2":"444","3":"300"},{"1":"10","2":"445","3":"300"},{"1":"20","2":"445","3":"300"},{"1":"40","2":"445","3":"300"},{"1":"100","2":"445","3":"300"},{"1":"10","2":"446","3":"300"},{"1":"20","2":"446","3":"300"},{"1":"40","2":"446","3":"300"},{"1":"100","2":"446","3":"300"},{"1":"10","2":"447","3":"300"},{"1":"20","2":"447","3":"300"},{"1":"40","2":"447","3":"300"},{"1":"100","2":"447","3":"300"},{"1":"10","2":"448","3":"300"},{"1":"20","2":"448","3":"300"},{"1":"40","2":"448","3":"300"},{"1":"100","2":"448","3":"300"},{"1":"10","2":"449","3":"300"},{"1":"20","2":"449","3":"300"},{"1":"40","2":"449","3":"300"},{"1":"100","2":"449","3":"300"},{"1":"10","2":"450","3":"300"},{"1":"20","2":"450","3":"300"},{"1":"40","2":"450","3":"300"},{"1":"100","2":"450","3":"300"},{"1":"10","2":"451","3":"300"},{"1":"20","2":"451","3":"300"},{"1":"40","2":"451","3":"300"},{"1":"100","2":"451","3":"300"},{"1":"10","2":"452","3":"300"},{"1":"20","2":"452","3":"300"},{"1":"40","2":"452","3":"300"},{"1":"100","2":"452","3":"300"},{"1":"10","2":"453","3":"300"},{"1":"20","2":"453","3":"300"},{"1":"40","2":"453","3":"300"},{"1":"100","2":"453","3":"300"},{"1":"10","2":"454","3":"300"},{"1":"20","2":"454","3":"300"},{"1":"40","2":"454","3":"300"},{"1":"100","2":"454","3":"300"},{"1":"10","2":"455","3":"300"},{"1":"20","2":"455","3":"300"},{"1":"40","2":"455","3":"300"},{"1":"100","2":"455","3":"300"},{"1":"10","2":"456","3":"300"},{"1":"20","2":"456","3":"300"},{"1":"40","2":"456","3":"300"},{"1":"100","2":"456","3":"300"},{"1":"10","2":"457","3":"300"},{"1":"20","2":"457","3":"300"},{"1":"40","2":"457","3":"300"},{"1":"100","2":"457","3":"300"},{"1":"10","2":"458","3":"300"},{"1":"20","2":"458","3":"300"},{"1":"40","2":"458","3":"300"},{"1":"100","2":"458","3":"300"},{"1":"10","2":"459","3":"300"},{"1":"20","2":"459","3":"300"},{"1":"40","2":"459","3":"300"},{"1":"100","2":"459","3":"300"},{"1":"10","2":"460","3":"300"},{"1":"20","2":"460","3":"300"},{"1":"40","2":"460","3":"300"},{"1":"100","2":"460","3":"300"},{"1":"10","2":"461","3":"300"},{"1":"20","2":"461","3":"300"},{"1":"40","2":"461","3":"300"},{"1":"100","2":"461","3":"300"},{"1":"10","2":"462","3":"300"},{"1":"20","2":"462","3":"300"},{"1":"40","2":"462","3":"300"},{"1":"100","2":"462","3":"300"},{"1":"10","2":"463","3":"300"},{"1":"20","2":"463","3":"300"},{"1":"40","2":"463","3":"300"},{"1":"100","2":"463","3":"300"},{"1":"10","2":"464","3":"300"},{"1":"20","2":"464","3":"300"},{"1":"40","2":"464","3":"300"},{"1":"100","2":"464","3":"300"},{"1":"10","2":"465","3":"300"},{"1":"20","2":"465","3":"300"},{"1":"40","2":"465","3":"300"},{"1":"100","2":"465","3":"300"},{"1":"10","2":"466","3":"300"},{"1":"20","2":"466","3":"300"},{"1":"40","2":"466","3":"300"},{"1":"100","2":"466","3":"300"},{"1":"10","2":"467","3":"300"},{"1":"20","2":"467","3":"300"},{"1":"40","2":"467","3":"300"},{"1":"100","2":"467","3":"300"},{"1":"10","2":"468","3":"300"},{"1":"20","2":"468","3":"300"},{"1":"40","2":"468","3":"300"},{"1":"100","2":"468","3":"300"},{"1":"10","2":"469","3":"300"},{"1":"20","2":"469","3":"300"},{"1":"40","2":"469","3":"300"},{"1":"100","2":"469","3":"300"},{"1":"10","2":"470","3":"300"},{"1":"20","2":"470","3":"300"},{"1":"40","2":"470","3":"300"},{"1":"100","2":"470","3":"300"},{"1":"10","2":"471","3":"300"},{"1":"20","2":"471","3":"300"},{"1":"40","2":"471","3":"300"},{"1":"100","2":"471","3":"300"},{"1":"10","2":"472","3":"300"},{"1":"20","2":"472","3":"300"},{"1":"40","2":"472","3":"300"},{"1":"100","2":"472","3":"300"},{"1":"10","2":"473","3":"300"},{"1":"20","2":"473","3":"300"},{"1":"40","2":"473","3":"300"},{"1":"100","2":"473","3":"300"},{"1":"10","2":"474","3":"300"},{"1":"20","2":"474","3":"300"},{"1":"40","2":"474","3":"300"},{"1":"100","2":"474","3":"300"},{"1":"10","2":"475","3":"300"},{"1":"20","2":"475","3":"300"},{"1":"40","2":"475","3":"300"},{"1":"100","2":"475","3":"300"},{"1":"10","2":"476","3":"300"},{"1":"20","2":"476","3":"300"},{"1":"40","2":"476","3":"300"},{"1":"100","2":"476","3":"300"},{"1":"10","2":"477","3":"300"},{"1":"20","2":"477","3":"300"},{"1":"40","2":"477","3":"300"},{"1":"100","2":"477","3":"300"},{"1":"10","2":"478","3":"300"},{"1":"20","2":"478","3":"300"},{"1":"40","2":"478","3":"300"},{"1":"100","2":"478","3":"300"},{"1":"10","2":"479","3":"300"},{"1":"20","2":"479","3":"300"},{"1":"40","2":"479","3":"300"},{"1":"100","2":"479","3":"300"},{"1":"10","2":"480","3":"300"},{"1":"20","2":"480","3":"300"},{"1":"40","2":"480","3":"300"},{"1":"100","2":"480","3":"300"},{"1":"10","2":"481","3":"300"},{"1":"20","2":"481","3":"300"},{"1":"40","2":"481","3":"300"},{"1":"100","2":"481","3":"300"},{"1":"10","2":"482","3":"300"},{"1":"20","2":"482","3":"300"},{"1":"40","2":"482","3":"300"},{"1":"100","2":"482","3":"300"},{"1":"10","2":"483","3":"300"},{"1":"20","2":"483","3":"300"},{"1":"40","2":"483","3":"300"},{"1":"100","2":"483","3":"300"},{"1":"10","2":"484","3":"300"},{"1":"20","2":"484","3":"300"},{"1":"40","2":"484","3":"300"},{"1":"100","2":"484","3":"300"},{"1":"10","2":"485","3":"300"},{"1":"20","2":"485","3":"300"},{"1":"40","2":"485","3":"300"},{"1":"100","2":"485","3":"300"},{"1":"10","2":"486","3":"300"},{"1":"20","2":"486","3":"300"},{"1":"40","2":"486","3":"300"},{"1":"100","2":"486","3":"300"},{"1":"10","2":"487","3":"300"},{"1":"20","2":"487","3":"300"},{"1":"40","2":"487","3":"300"},{"1":"100","2":"487","3":"300"},{"1":"10","2":"488","3":"300"},{"1":"20","2":"488","3":"300"},{"1":"40","2":"488","3":"300"},{"1":"100","2":"488","3":"300"},{"1":"10","2":"489","3":"300"},{"1":"20","2":"489","3":"300"},{"1":"40","2":"489","3":"300"},{"1":"100","2":"489","3":"300"},{"1":"10","2":"490","3":"300"},{"1":"20","2":"490","3":"300"},{"1":"40","2":"490","3":"300"},{"1":"100","2":"490","3":"300"},{"1":"10","2":"491","3":"300"},{"1":"20","2":"491","3":"300"},{"1":"40","2":"491","3":"300"},{"1":"100","2":"491","3":"300"},{"1":"10","2":"492","3":"300"},{"1":"20","2":"492","3":"300"},{"1":"40","2":"492","3":"300"},{"1":"100","2":"492","3":"300"},{"1":"10","2":"493","3":"300"},{"1":"20","2":"493","3":"300"},{"1":"40","2":"493","3":"300"},{"1":"100","2":"493","3":"300"},{"1":"10","2":"494","3":"300"},{"1":"20","2":"494","3":"300"},{"1":"40","2":"494","3":"300"},{"1":"100","2":"494","3":"300"},{"1":"10","2":"495","3":"300"},{"1":"20","2":"495","3":"300"},{"1":"40","2":"495","3":"300"},{"1":"100","2":"495","3":"300"},{"1":"10","2":"496","3":"300"},{"1":"20","2":"496","3":"300"},{"1":"40","2":"496","3":"300"},{"1":"100","2":"496","3":"300"},{"1":"10","2":"497","3":"300"},{"1":"20","2":"497","3":"300"},{"1":"40","2":"497","3":"300"},{"1":"100","2":"497","3":"300"},{"1":"10","2":"498","3":"300"},{"1":"20","2":"498","3":"300"},{"1":"40","2":"498","3":"300"},{"1":"100","2":"498","3":"300"},{"1":"10","2":"499","3":"300"},{"1":"20","2":"499","3":"300"},{"1":"40","2":"499","3":"300"},{"1":"100","2":"499","3":"300"},{"1":"10","2":"500","3":"300"},{"1":"20","2":"500","3":"300"},{"1":"40","2":"500","3":"300"},{"1":"100","2":"500","3":"300"}],"options":{"columns":{"min":{},"max":[10]},"rows":{"min":[10],"max":[10]},"pages":{}}} </script>
# compute p-value for each replication and each sample size and trial number
sim_dt_by_trial_raifei[, p_val:= simulate_mix_raifei_aggr(n_subjects, n_trials = n_trials, mean_est, cov_mat, avg_sd), by = .(n_subjects, n_reps, n_trials)]
sim_dt_by_trial_raifei_avg<-sim_dt_by_trial_raifei[,.(power = mean(as.numeric(p_val<0.05))), by = .(n_subjects,n_trials) ]

ggplot(sim_dt_by_trial_raifei_avg, aes(x = n_trials, color = factor(n_subjects), y = power))+
  geom_line(stat='summary', fun.y = mean)+
  labs(y = 'Power', x = 'N trials', color = 'N subjects')+
   geom_hline(yintercept = 0.8, linetype = 2, color = 'red')