Libraries

library(tidyverse)
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ dplyr     1.1.2     ✔ readr     2.1.4
## ✔ forcats   1.0.0     ✔ stringr   1.5.0
## ✔ ggplot2   3.4.2     ✔ tibble    3.2.1
## ✔ lubridate 1.9.2     ✔ tidyr     1.3.0
## ✔ purrr     1.0.1     
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ dplyr::filter() masks stats::filter()
## ✖ dplyr::lag()    masks stats::lag()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(ggplot2)
library(janitor)
## 
## Attaching package: 'janitor'
## 
## The following objects are masked from 'package:stats':
## 
##     chisq.test, fisher.test
library(broom)
library(dplyr)
library(tidyr)
library(purrr)
library(readxl)
library(gridExtra)
## 
## Attaching package: 'gridExtra'
## 
## The following object is masked from 'package:dplyr':
## 
##     combine
library(readr)
library(stringr)
library(naniar)
library(zoo)
## 
## Attaching package: 'zoo'
## 
## The following objects are masked from 'package:base':
## 
##     as.Date, as.Date.numeric
library(afex)
## Loading required package: lme4
## Loading required package: Matrix
## 
## Attaching package: 'Matrix'
## 
## The following objects are masked from 'package:tidyr':
## 
##     expand, pack, unpack
## 
## ************
## Welcome to afex. For support visit: http://afex.singmann.science/
## - Functions for ANOVAs: aov_car(), aov_ez(), and aov_4()
## - Methods for calculating p-values with mixed(): 'S', 'KR', 'LRT', and 'PB'
## - 'afex_aov' and 'mixed' objects can be passed to emmeans() for follow-up tests
## - Get and set global package options with: afex_options()
## - Set sum-to-zero contrasts globally: set_sum_contrasts()
## - For example analyses see: browseVignettes("afex")
## ************
## 
## Attaching package: 'afex'
## 
## The following object is masked from 'package:lme4':
## 
##     lmer
library(nlme)
## 
## Attaching package: 'nlme'
## 
## The following object is masked from 'package:lme4':
## 
##     lmList
## 
## The following object is masked from 'package:dplyr':
## 
##     collapse
library(ggpubr)
library(rstatix)
## 
## Attaching package: 'rstatix'
## 
## The following object is masked from 'package:janitor':
## 
##     make_clean_names
## 
## The following object is masked from 'package:stats':
## 
##     filter
library(emmeans)
library(effects)
## Loading required package: carData
## lattice theme set by effectsTheme()
## See ?effectsTheme for details.

Uploading all participants Data

# Set the path to the directory where the files are located
path <- "D:\\NEW DATA\\csv\\THESIS\\participants"

# Create an empty list to store the data frames
LISTP5 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 5) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP5[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP6 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 6) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP6[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP7 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 7) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP7[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP8 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 8) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP8[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP9 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 9) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP9[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP10 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 10) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP10[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP11 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 11) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP11[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}
LISTP12 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 12) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP12[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}
LISTP13 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 13) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP13[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP14 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 14) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP14[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP15 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 15) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP15[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP16 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 16) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP16[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP17 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 17) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP17[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP18 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 18) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP18[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP19 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 19) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP19[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP20 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 20) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP20[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP21 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 21) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP21[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP22 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 22) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP22[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP23 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 23) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP23[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP24 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 24) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP24[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP25 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 25) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP25[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP26 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 26) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP26[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP27 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 27) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP27[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP28 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 28) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP28[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP29 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 29) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP29[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP30 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 30) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP30[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP31 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 31) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP31[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP32 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 32) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP32[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP33 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 33) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP33[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

LISTP34 <- list()#CHANGE ACCORDING TO PARTICIPANT

# Loop through the participant numbers and block numbers
for (P in 34) { #CHANGE ACCORDING TO PARTICIPANT
  for (B in 1:10) {
    # Construct the file name
    file_name <- paste0("P", P, "B", B, ".csv")
    # Construct the file path
    file_path <- file.path(path, file_name)
    # Read in the file and add it to the list
    if (file.exists(file_path)) {
      LISTP34[[paste0("P", P, "B", B)]] <- read.csv(file_path, sep = ",")
    }
  }
}

Rename Variables

TIME <- "TIME"


for (i in seq_along(LISTP5)) {
  names(LISTP5[[i]])[1] <- TIME
}

for (i in seq_along(LISTP6)) {
  names(LISTP6[[i]])[1] <- TIME
}

for (i in seq_along(LISTP7)) {
  names(LISTP7[[i]])[1] <- TIME
}

for (i in seq_along(LISTP8)) {
  names(LISTP8[[i]])[1] <- TIME
}

for (i in seq_along(LISTP9)) {
  names(LISTP9[[i]])[1] <- TIME
}

for (i in seq_along(LISTP10)) {
  names(LISTP10[[i]])[1] <- TIME
}

for (i in seq_along(LISTP11)) {
  names(LISTP11[[i]])[1] <- TIME
}

for (i in seq_along(LISTP12)) {
  names(LISTP12[[i]])[1] <- TIME
}

for (i in seq_along(LISTP13)) {
  names(LISTP13[[i]])[1] <- TIME
}

for (i in seq_along(LISTP14)) {
  names(LISTP14[[i]])[1] <- TIME
}

for (i in seq_along(LISTP15)) {
  names(LISTP15[[i]])[1] <- TIME
}

for (i in seq_along(LISTP16)) {
  names(LISTP16[[i]])[1] <- TIME
}

for (i in seq_along(LISTP17)) {
  names(LISTP17[[i]])[1] <- TIME
}

for (i in seq_along(LISTP18)) {
  names(LISTP18[[i]])[1] <- TIME
}


for (i in seq_along(LISTP19)) {
  names(LISTP19[[i]])[1] <- TIME
}


for (i in seq_along(LISTP20)) {
  names(LISTP20[[i]])[1] <- TIME
}

for (i in seq_along(LISTP21)) {
  names(LISTP21[[i]])[1] <- TIME
}

for (i in seq_along(LISTP22)) {
  names(LISTP22[[i]])[1] <- TIME
}

for (i in seq_along(LISTP23)) {
  names(LISTP23[[i]])[1] <- TIME
}

for (i in seq_along(LISTP24)) {
  names(LISTP24[[i]])[1] <- TIME
}

for (i in seq_along(LISTP25)) {
  names(LISTP25[[i]])[1] <- TIME
}

for (i in seq_along(LISTP26)) {
  names(LISTP26[[i]])[1] <- TIME
}

for (i in seq_along(LISTP27)) {
  names(LISTP27[[i]])[1] <- TIME
}

for (i in seq_along(LISTP28)) {
  names(LISTP28[[i]])[1] <- TIME
}

for (i in seq_along(LISTP29)) {
  names(LISTP29[[i]])[1] <- TIME
}

for (i in seq_along(LISTP30)) {
  names(LISTP30[[i]])[1] <- TIME
}

for (i in seq_along(LISTP31)) {
  names(LISTP31[[i]])[1] <- TIME
}

for (i in seq_along(LISTP32)) {
  names(LISTP32[[i]])[1] <- TIME
}

for (i in seq_along(LISTP33)) {
  names(LISTP33[[i]])[1] <- TIME
}

for (i in seq_along(LISTP34)) {
  names(LISTP34[[i]])[1] <- TIME
}


ID <- "ID"


for (i in seq_along(LISTP5)) {
  names(LISTP5[[i]])[2] <- ID
}

for (i in seq_along(LISTP6)) {
  names(LISTP6[[i]])[2] <- ID
}

for (i in seq_along(LISTP7)) {
  names(LISTP7[[i]])[2] <- ID
}

for (i in seq_along(LISTP8)) {
  names(LISTP8[[i]])[2] <- ID
}

for (i in seq_along(LISTP9)) {
  names(LISTP9[[i]])[2] <- ID
}

for (i in seq_along(LISTP10)) {
  names(LISTP10[[i]])[2] <- ID
}

for (i in seq_along(LISTP11)) {
  names(LISTP11[[i]])[2] <- ID
}

for (i in seq_along(LISTP12)) {
  names(LISTP12[[i]])[2] <- ID
}

for (i in seq_along(LISTP13)) {
  names(LISTP13[[i]])[2] <- ID
}

for (i in seq_along(LISTP14)) {
  names(LISTP14[[i]])[2] <- ID
}

for (i in seq_along(LISTP15)) {
  names(LISTP15[[i]])[2] <- ID
}

for (i in seq_along(LISTP16)) {
  names(LISTP16[[i]])[2] <- ID
}

for (i in seq_along(LISTP17)) {
  names(LISTP17[[i]])[2] <- ID
}

for (i in seq_along(LISTP18)) {
  names(LISTP18[[i]])[2] <- ID
}

for (i in seq_along(LISTP19)) {
  names(LISTP19[[i]])[2] <- ID
}

for (i in seq_along(LISTP20)) {
  names(LISTP20[[i]])[2] <- ID
}

for (i in seq_along(LISTP21)) {
  names(LISTP21[[i]])[2] <- ID
}

for (i in seq_along(LISTP22)) {
  names(LISTP22[[i]])[2] <- ID
}

for (i in seq_along(LISTP23)) {
  names(LISTP23[[i]])[2] <- ID
}

for (i in seq_along(LISTP24)) {
  names(LISTP24[[i]])[2] <- ID
}

for (i in seq_along(LISTP25)) {
  names(LISTP25[[i]])[2] <- ID
}

for (i in seq_along(LISTP26)) {
  names(LISTP26[[i]])[2] <- ID
}

for (i in seq_along(LISTP27)) {
  names(LISTP27[[i]])[2] <- ID
}

for (i in seq_along(LISTP28)) {
  names(LISTP28[[i]])[2] <- ID
}

for (i in seq_along(LISTP29)) {
  names(LISTP29[[i]])[2] <- ID
}

for (i in seq_along(LISTP30)) {
  names(LISTP30[[i]])[2] <- ID
}

for (i in seq_along(LISTP31)) {
  names(LISTP31[[i]])[2] <- ID
}

for (i in seq_along(LISTP32)) {
  names(LISTP32[[i]])[2] <- ID
}

for (i in seq_along(LISTP33)) {
  names(LISTP33[[i]])[2] <- ID
}

for (i in seq_along(LISTP34)) {
  names(LISTP34[[i]])[2] <- ID
}


VALUE <- "VALUE"


for (i in seq_along(LISTP5)) {
  names(LISTP5[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP6)) {
  names(LISTP6[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP7)) {
  names(LISTP7[[i]])[3] <- VALUE
}


for (i in seq_along(LISTP8)) {
  names(LISTP8[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP9)) {
  names(LISTP9[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP10)) {
  names(LISTP10[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP11)) {
  names(LISTP11[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP12)) {
  names(LISTP12[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP13)) {
  names(LISTP13[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP14)) {
  names(LISTP14[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP15)) {
  names(LISTP15[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP16)) {
  names(LISTP16[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP17)) {
  names(LISTP17[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP18)) {
  names(LISTP18[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP19)) {
  names(LISTP19[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP20)) {
  names(LISTP20[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP21)) {
  names(LISTP21[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP22)) {
  names(LISTP22[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP23)) {
  names(LISTP23[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP24)) {
  names(LISTP24[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP25)) {
  names(LISTP25[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP26)) {
  names(LISTP26[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP27)) {
  names(LISTP27[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP28)) {
  names(LISTP28[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP29)) {
  names(LISTP29[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP30)) {
  names(LISTP30[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP31)) {
  names(LISTP31[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP32)) {
  names(LISTP32[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP33)) {
  names(LISTP33[[i]])[3] <- VALUE
}

for (i in seq_along(LISTP34)) {
  names(LISTP34[[i]])[3] <- VALUE
}

Upload PERCENTAGE excel

#read
PERCENTAGEP5 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP5.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP6 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP6.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP7 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP7.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP8 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP8.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP9 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP9.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP10 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP10.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP11 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP11.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP12 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP12.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP13 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP13.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP14 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP14.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP15 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP15.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP16 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP16.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP17 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP17.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP18 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP18.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP19 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP19.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP20 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP20.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP21 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP21.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP22 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP22.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP23 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP23.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP24 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP24.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP25 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP25.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP26 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP26.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP27 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP27.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP28 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP28.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP29 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP29.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP30 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP30.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP31 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP31.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP32 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP32.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP33 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP33.xlsx")
## New names:
## • `` -> `...1`
PERCENTAGEP34 <- read_excel("D:\\NEW DATA\\csv\\THESIS\\percentage\\PERCENTAGEP34.xlsx")
## New names:
## • `` -> `...1`

MAX VALUES INTERVAL

max_valueP5B1 <- max(LISTP5[[1]]$TIME)
max_valueP5B2 <- max(LISTP5[[2]]$TIME)
max_valueP5B3 <- max(LISTP5[[3]]$TIME)
max_valueP5B4 <- max(LISTP5[[4]]$TIME)
max_valueP5B5 <- max(LISTP5[[5]]$TIME)
max_valueP5B6 <- max(LISTP5[[6]]$TIME)
max_valueP5B7 <- max(LISTP5[[7]]$TIME)
max_valueP5B8 <- max(LISTP5[[8]]$TIME)
max_valueP5B9 <- max(LISTP5[[9]]$TIME)
max_valueP5B10 <- max(LISTP5[[10]]$TIME)
max_valueP6B1 <- max(LISTP6[[1]]$TIME)
max_valueP6B2 <- max(LISTP6[[2]]$TIME)
max_valueP6B3 <- max(LISTP6[[3]]$TIME)
max_valueP6B4 <- max(LISTP6[[4]]$TIME)
max_valueP6B5 <- max(LISTP6[[5]]$TIME)
max_valueP6B6 <- max(LISTP6[[6]]$TIME)
max_valueP6B7 <- max(LISTP6[[7]]$TIME)
max_valueP6B8 <- max(LISTP6[[8]]$TIME)
max_valueP6B9 <- max(LISTP6[[9]]$TIME)
max_valueP6B10 <- max(LISTP6[[10]]$TIME)
max_valueP7B1 <- max(LISTP7[[1]]$TIME)
max_valueP7B2 <- max(LISTP7[[2]]$TIME)
max_valueP7B3 <- max(LISTP7[[3]]$TIME)
max_valueP7B4 <- max(LISTP7[[4]]$TIME)
max_valueP7B5 <- max(LISTP7[[5]]$TIME)
max_valueP7B6 <- max(LISTP7[[6]]$TIME)
max_valueP7B7 <- max(LISTP7[[7]]$TIME)
max_valueP7B8 <- max(LISTP7[[8]]$TIME)
max_valueP7B9 <- max(LISTP7[[9]]$TIME)
max_valueP7B10 <- max(LISTP7[[10]]$TIME)
max_valueP8B1 <- max(LISTP8[[1]]$TIME)
max_valueP8B2 <- max(LISTP8[[2]]$TIME)
max_valueP8B3 <- max(LISTP8[[3]]$TIME)
max_valueP8B4 <- max(LISTP8[[4]]$TIME)
max_valueP8B5 <- max(LISTP8[[5]]$TIME)
max_valueP8B6 <- max(LISTP8[[6]]$TIME)
max_valueP8B7 <- max(LISTP8[[7]]$TIME)
max_valueP8B8 <- max(LISTP8[[8]]$TIME)
max_valueP8B9 <- max(LISTP8[[9]]$TIME)
max_valueP8B10 <- max(LISTP8[[10]]$TIME)
max_valueP9B1 <- max(LISTP9[[1]]$TIME)
max_valueP9B2 <- max(LISTP9[[2]]$TIME)
max_valueP9B3 <- max(LISTP9[[3]]$TIME)
max_valueP9B4 <- max(LISTP9[[4]]$TIME)
max_valueP9B5 <- max(LISTP9[[5]]$TIME)
max_valueP9B6 <- max(LISTP9[[6]]$TIME)
max_valueP9B7 <- max(LISTP9[[7]]$TIME)
max_valueP9B8 <- max(LISTP9[[8]]$TIME)
max_valueP9B9 <- max(LISTP9[[9]]$TIME)
max_valueP9B10 <- max(LISTP9[[10]]$TIME)
max_valueP10B1 <- max(LISTP10[[1]]$TIME)
max_valueP10B2 <- max(LISTP10[[2]]$TIME)
max_valueP10B3 <- max(LISTP10[[3]]$TIME)
max_valueP10B4 <- max(LISTP10[[4]]$TIME)
max_valueP10B5 <- max(LISTP10[[5]]$TIME)
max_valueP10B6 <- max(LISTP10[[6]]$TIME)
max_valueP10B7 <- max(LISTP10[[7]]$TIME)
max_valueP10B8 <- max(LISTP10[[8]]$TIME)
max_valueP10B9 <- max(LISTP10[[9]]$TIME)
max_valueP10B10 <- max(LISTP10[[10]]$TIME)
max_valueP11B1 <- max(LISTP11[[1]]$TIME)
max_valueP11B2 <- max(LISTP11[[2]]$TIME)
max_valueP11B3 <- max(LISTP11[[3]]$TIME)
max_valueP11B4 <- max(LISTP11[[4]]$TIME)
max_valueP11B5 <- max(LISTP11[[5]]$TIME)
max_valueP11B6 <- max(LISTP11[[6]]$TIME)
max_valueP11B7 <- max(LISTP11[[7]]$TIME)
max_valueP11B8 <- max(LISTP11[[8]]$TIME)
max_valueP11B9 <- max(LISTP11[[9]]$TIME)
max_valueP11B10 <- max(LISTP11[[10]]$TIME)
max_valueP12B1 <- max(LISTP12[[1]]$TIME)
max_valueP12B2 <- max(LISTP12[[2]]$TIME)
max_valueP12B3 <- max(LISTP12[[3]]$TIME)
max_valueP12B4 <- max(LISTP12[[4]]$TIME)
max_valueP12B5 <- max(LISTP12[[5]]$TIME)
max_valueP12B6 <- max(LISTP12[[6]]$TIME)
max_valueP12B7 <- max(LISTP12[[7]]$TIME)
max_valueP12B8 <- max(LISTP12[[8]]$TIME)
max_valueP12B9 <- max(LISTP12[[9]]$TIME)
max_valueP12B10 <- max(LISTP12[[10]]$TIME)
max_valueP13B1 <- max(LISTP13[[1]]$TIME)
max_valueP13B2 <- max(LISTP13[[2]]$TIME)
max_valueP13B3 <- max(LISTP13[[3]]$TIME)
max_valueP13B4 <- max(LISTP13[[4]]$TIME)
max_valueP13B5 <- max(LISTP13[[5]]$TIME)
max_valueP13B6 <- max(LISTP13[[6]]$TIME)
max_valueP13B7 <- max(LISTP13[[7]]$TIME)
max_valueP13B8 <- max(LISTP13[[8]]$TIME)
max_valueP13B9 <- max(LISTP13[[9]]$TIME)
max_valueP13B10 <- max(LISTP13[[10]]$TIME)
max_valueP14B1 <- max(LISTP14[[1]]$TIME)
max_valueP14B2 <- max(LISTP14[[2]]$TIME)
max_valueP14B3 <- max(LISTP14[[3]]$TIME)
max_valueP14B4 <- max(LISTP14[[4]]$TIME)
max_valueP14B5 <- max(LISTP14[[5]]$TIME)
max_valueP14B6 <- max(LISTP14[[6]]$TIME)
max_valueP14B7 <- max(LISTP14[[7]]$TIME)
max_valueP14B8 <- max(LISTP14[[8]]$TIME)
max_valueP14B9 <- max(LISTP14[[9]]$TIME)
max_valueP14B10 <- max(LISTP14[[10]]$TIME)
max_valueP15B1 <- max(LISTP15[[1]]$TIME)
max_valueP15B2 <- max(LISTP15[[2]]$TIME)
max_valueP15B3 <- max(LISTP15[[3]]$TIME)
max_valueP15B4 <- max(LISTP15[[4]]$TIME)
max_valueP15B5 <- max(LISTP15[[5]]$TIME)
max_valueP15B6 <- max(LISTP15[[6]]$TIME)
max_valueP15B7 <- max(LISTP15[[7]]$TIME)
max_valueP15B8 <- max(LISTP15[[8]]$TIME)
max_valueP15B9 <- max(LISTP15[[9]]$TIME)
max_valueP15B10 <- max(LISTP15[[10]]$TIME)
max_valueP16B1 <- max(LISTP16[[1]]$TIME)
max_valueP16B2 <- max(LISTP16[[2]]$TIME)
max_valueP16B3 <- max(LISTP16[[3]]$TIME)
max_valueP16B4 <- max(LISTP16[[4]]$TIME)
max_valueP16B5 <- max(LISTP16[[5]]$TIME)
max_valueP16B6 <- max(LISTP16[[6]]$TIME)
max_valueP16B7 <- max(LISTP16[[7]]$TIME)
max_valueP16B8 <- max(LISTP16[[8]]$TIME)
max_valueP16B9 <- max(LISTP16[[9]]$TIME)
max_valueP16B10 <- max(LISTP16[[10]]$TIME)
max_valueP17B1 <- max(LISTP17[[1]]$TIME)
max_valueP17B2 <- max(LISTP17[[2]]$TIME)
max_valueP17B3 <- max(LISTP17[[3]]$TIME)
max_valueP17B4 <- max(LISTP17[[4]]$TIME)
max_valueP17B5 <- max(LISTP17[[5]]$TIME)
max_valueP17B6 <- max(LISTP17[[6]]$TIME)
max_valueP17B7 <- max(LISTP17[[7]]$TIME)
max_valueP17B8 <- max(LISTP17[[8]]$TIME)
max_valueP17B9 <- max(LISTP17[[9]]$TIME)
max_valueP17B10 <- max(LISTP17[[10]]$TIME)
max_valueP18B1 <- max(LISTP18[[1]]$TIME)
max_valueP18B2 <- max(LISTP18[[2]]$TIME)
max_valueP18B3 <- max(LISTP18[[3]]$TIME)
max_valueP18B4 <- max(LISTP18[[4]]$TIME)
max_valueP18B5 <- max(LISTP18[[5]]$TIME)
max_valueP18B6 <- max(LISTP18[[6]]$TIME)
max_valueP18B7 <- max(LISTP18[[7]]$TIME)
max_valueP18B8 <- max(LISTP18[[8]]$TIME)
max_valueP18B9 <- max(LISTP18[[9]]$TIME)
max_valueP18B10 <- max(LISTP18[[10]]$TIME)
max_valueP19B1 <- max(LISTP19[[1]]$TIME)
max_valueP19B2 <- max(LISTP19[[2]]$TIME)
max_valueP19B3 <- max(LISTP19[[3]]$TIME)
max_valueP19B4 <- max(LISTP19[[4]]$TIME)
max_valueP19B5 <- max(LISTP19[[5]]$TIME)
max_valueP19B6 <- max(LISTP19[[6]]$TIME)
max_valueP19B7 <- max(LISTP19[[7]]$TIME)
max_valueP19B8 <- max(LISTP19[[8]]$TIME)
max_valueP19B9 <- max(LISTP19[[9]]$TIME)
max_valueP19B10 <- max(LISTP19[[10]]$TIME)
max_valueP20B1 <- max(LISTP20[[1]]$TIME)
max_valueP20B2 <- max(LISTP20[[2]]$TIME)
max_valueP20B3 <- max(LISTP20[[3]]$TIME)
max_valueP20B4 <- max(LISTP20[[4]]$TIME)
max_valueP20B5 <- max(LISTP20[[5]]$TIME)
max_valueP20B6 <- max(LISTP20[[6]]$TIME)
max_valueP20B7 <- max(LISTP20[[7]]$TIME)
max_valueP20B8 <- max(LISTP20[[8]]$TIME)
max_valueP20B9 <- max(LISTP20[[9]]$TIME)
max_valueP20B10 <- max(LISTP20[[10]]$TIME)
max_valueP21B1 <- max(LISTP21[[1]]$TIME)
max_valueP21B2 <- max(LISTP21[[2]]$TIME)
max_valueP21B3 <- max(LISTP21[[3]]$TIME)
max_valueP21B4 <- max(LISTP21[[4]]$TIME)
max_valueP21B5 <- max(LISTP21[[5]]$TIME)
max_valueP21B6 <- max(LISTP21[[6]]$TIME)
max_valueP21B7 <- max(LISTP21[[7]]$TIME)
max_valueP21B8 <- max(LISTP21[[8]]$TIME)
max_valueP21B9 <- max(LISTP21[[9]]$TIME)
max_valueP21B10 <- max(LISTP21[[10]]$TIME)
max_valueP22B1 <- max(LISTP22[[1]]$TIME)
max_valueP22B2 <- max(LISTP22[[2]]$TIME)
max_valueP22B3 <- max(LISTP22[[3]]$TIME)
max_valueP22B4 <- max(LISTP22[[4]]$TIME)
max_valueP22B5 <- max(LISTP22[[5]]$TIME)
max_valueP22B6 <- max(LISTP22[[6]]$TIME)
max_valueP22B7 <- max(LISTP22[[7]]$TIME)
max_valueP22B8 <- max(LISTP22[[8]]$TIME)
max_valueP22B9 <- max(LISTP22[[9]]$TIME)
max_valueP22B10 <- max(LISTP22[[10]]$TIME)
max_valueP23B1 <- max(LISTP23[[1]]$TIME)
max_valueP23B2 <- max(LISTP23[[2]]$TIME)
max_valueP23B3 <- max(LISTP23[[3]]$TIME)
max_valueP23B4 <- max(LISTP23[[4]]$TIME)
max_valueP23B5 <- max(LISTP23[[5]]$TIME)
max_valueP23B6 <- max(LISTP23[[6]]$TIME)
max_valueP23B7 <- max(LISTP23[[7]]$TIME)
max_valueP23B8 <- max(LISTP23[[8]]$TIME)
max_valueP23B9 <- max(LISTP23[[9]]$TIME)
max_valueP23B10 <- max(LISTP23[[10]]$TIME)
max_valueP24B1 <- max(LISTP24[[1]]$TIME)
max_valueP24B2 <- max(LISTP24[[2]]$TIME)
max_valueP24B3 <- max(LISTP24[[3]]$TIME)
max_valueP24B4 <- max(LISTP24[[4]]$TIME)
max_valueP24B5 <- max(LISTP24[[5]]$TIME)
max_valueP24B6 <- max(LISTP24[[6]]$TIME)
max_valueP24B7 <- max(LISTP24[[7]]$TIME)
max_valueP24B8 <- max(LISTP24[[8]]$TIME)
max_valueP24B9 <- max(LISTP24[[9]]$TIME)
max_valueP24B10 <- max(LISTP24[[10]]$TIME)
max_valueP25B1 <- max(LISTP25[[1]]$TIME)
max_valueP25B2 <- max(LISTP25[[2]]$TIME)
max_valueP25B3 <- max(LISTP25[[3]]$TIME)
max_valueP25B4 <- max(LISTP25[[4]]$TIME)
max_valueP25B5 <- max(LISTP25[[5]]$TIME)
max_valueP25B6 <- max(LISTP25[[6]]$TIME)
max_valueP25B7 <- max(LISTP25[[7]]$TIME)
max_valueP25B8 <- max(LISTP25[[8]]$TIME)
max_valueP25B9 <- max(LISTP25[[9]]$TIME)
max_valueP25B10 <- max(LISTP25[[10]]$TIME)
max_valueP26B1 <- max(LISTP26[[1]]$TIME)
max_valueP26B2 <- max(LISTP26[[2]]$TIME)
max_valueP26B3 <- max(LISTP26[[3]]$TIME)
max_valueP26B4 <- max(LISTP26[[4]]$TIME)
max_valueP26B5 <- max(LISTP26[[5]]$TIME)
max_valueP26B6 <- max(LISTP26[[6]]$TIME)
max_valueP26B7 <- max(LISTP26[[7]]$TIME)
max_valueP26B8 <- max(LISTP26[[8]]$TIME)
max_valueP26B9 <- max(LISTP26[[9]]$TIME)
max_valueP26B10 <- max(LISTP26[[10]]$TIME)
max_valueP27B1 <- max(LISTP27[[1]]$TIME)
max_valueP27B2 <- max(LISTP27[[2]]$TIME)
max_valueP27B3 <- max(LISTP27[[3]]$TIME)
max_valueP27B4 <- max(LISTP27[[4]]$TIME)
max_valueP27B5 <- max(LISTP27[[5]]$TIME)
max_valueP27B6 <- max(LISTP27[[6]]$TIME)
max_valueP27B7 <- max(LISTP27[[7]]$TIME)
max_valueP27B8 <- max(LISTP27[[8]]$TIME)
max_valueP27B9 <- max(LISTP27[[9]]$TIME)
max_valueP27B10 <- max(LISTP27[[10]]$TIME)
max_valueP28B1 <- max(LISTP28[[1]]$TIME)
max_valueP28B2 <- max(LISTP28[[2]]$TIME)
max_valueP28B3 <- max(LISTP28[[3]]$TIME)
max_valueP28B4 <- max(LISTP28[[4]]$TIME)
max_valueP28B5 <- max(LISTP28[[5]]$TIME)
max_valueP28B6 <- max(LISTP28[[6]]$TIME)
max_valueP28B7 <- max(LISTP28[[7]]$TIME)
max_valueP28B8 <- max(LISTP28[[8]]$TIME)
max_valueP28B9 <- max(LISTP28[[9]]$TIME)
max_valueP28B10 <- max(LISTP28[[10]]$TIME)
max_valueP29B1 <- max(LISTP29[[1]]$TIME)
max_valueP29B2 <- max(LISTP29[[2]]$TIME)
max_valueP29B3 <- max(LISTP29[[3]]$TIME)
max_valueP29B4 <- max(LISTP29[[4]]$TIME)
max_valueP29B5 <- max(LISTP29[[5]]$TIME)
max_valueP29B6 <- max(LISTP29[[6]]$TIME)
max_valueP29B7 <- max(LISTP29[[7]]$TIME)
max_valueP29B8 <- max(LISTP29[[8]]$TIME)
max_valueP29B9 <- max(LISTP29[[9]]$TIME)
max_valueP29B10 <- max(LISTP29[[10]]$TIME)
max_valueP30B1 <- max(LISTP30[[1]]$TIME)
max_valueP30B2 <- max(LISTP30[[2]]$TIME)
max_valueP30B3 <- max(LISTP30[[3]]$TIME)
max_valueP30B4 <- max(LISTP30[[4]]$TIME)
max_valueP30B5 <- max(LISTP30[[5]]$TIME)
max_valueP30B6 <- max(LISTP30[[6]]$TIME)
max_valueP30B7 <- max(LISTP30[[7]]$TIME)
max_valueP30B8 <- max(LISTP30[[8]]$TIME)
max_valueP30B9 <- max(LISTP30[[9]]$TIME)
max_valueP30B10 <- max(LISTP30[[10]]$TIME)
max_valueP31B1 <- max(LISTP31[[1]]$TIME)
max_valueP31B2 <- max(LISTP31[[2]]$TIME)
max_valueP31B3 <- max(LISTP31[[3]]$TIME)
max_valueP31B4 <- max(LISTP31[[4]]$TIME)
max_valueP31B5 <- max(LISTP31[[5]]$TIME)
max_valueP31B6 <- max(LISTP31[[6]]$TIME)
max_valueP31B7 <- max(LISTP31[[7]]$TIME)
max_valueP31B8 <- max(LISTP31[[8]]$TIME)
max_valueP31B9 <- max(LISTP31[[9]]$TIME)
max_valueP31B10 <- max(LISTP31[[10]]$TIME)
max_valueP32B1 <- max(LISTP32[[1]]$TIME)
max_valueP32B2 <- max(LISTP32[[2]]$TIME)
max_valueP32B3 <- max(LISTP32[[3]]$TIME)
max_valueP32B4 <- max(LISTP32[[4]]$TIME)
max_valueP32B5 <- max(LISTP32[[5]]$TIME)
max_valueP32B6 <- max(LISTP32[[6]]$TIME)
max_valueP32B7 <- max(LISTP32[[7]]$TIME)
max_valueP32B8 <- max(LISTP32[[8]]$TIME)
max_valueP32B9 <- max(LISTP32[[9]]$TIME)
max_valueP32B10 <- max(LISTP32[[10]]$TIME)
max_valueP33B1 <- max(LISTP33[[1]]$TIME)
max_valueP33B2 <- max(LISTP33[[2]]$TIME)
max_valueP33B3 <- max(LISTP33[[3]]$TIME)
max_valueP33B4 <- max(LISTP33[[4]]$TIME)
max_valueP33B5 <- max(LISTP33[[5]]$TIME)
max_valueP33B6 <- max(LISTP33[[6]]$TIME)
max_valueP33B7 <- max(LISTP33[[7]]$TIME)
max_valueP33B8 <- max(LISTP33[[8]]$TIME)
max_valueP33B9 <- max(LISTP33[[9]]$TIME)
max_valueP33B10 <- max(LISTP33[[10]]$TIME)
max_valueP34B1 <- max(LISTP34[[1]]$TIME)
max_valueP34B2 <- max(LISTP34[[2]]$TIME)
max_valueP34B3 <- max(LISTP34[[3]]$TIME)
max_valueP34B4 <- max(LISTP34[[4]]$TIME)
max_valueP34B5 <- max(LISTP34[[5]]$TIME)
max_valueP34B6 <- max(LISTP34[[6]]$TIME)
max_valueP34B7 <- max(LISTP34[[7]]$TIME)
max_valueP34B8 <- max(LISTP34[[8]]$TIME)
max_valueP34B9 <- max(LISTP34[[9]]$TIME)
max_valueP34B10 <- max(LISTP34[[10]]$TIME)
#DIVISION IN 10% PER BLOCKS
#P5
#B1
x10INTERVALSP5B1<-c(PERCENTAGEP5$B1T1,PERCENTAGEP5$B1T2,PERCENTAGEP5$B1T3,PERCENTAGEP5$B1T4,PERCENTAGEP5$B1T5, max_valueP5B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP5B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP5B1 <- unique(x10INTERVALSP5B1)
  x10INTERVALSP5B1 <- sort(x10INTERVALSP5B1)
  breaks <- seq(min(x10INTERVALSP5B1), max(x10INTERVALSP5B1), length.out = length(x10INTERVALSP5B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP5B1
}

# Create new variable TRIALS according to interval
LISTP5[[1]]$INTERVALS <- cut(LISTP5[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP5B2<-c(PERCENTAGEP5$B2T1,PERCENTAGEP5$B2T2,PERCENTAGEP5$B2T3,PERCENTAGEP5$B2T4,PERCENTAGEP5$B2T5, max_valueP5B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP5B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP5B2 <- unique(x10INTERVALSP5B2)
  x10INTERVALSP5B2 <- sort(x10INTERVALSP5B2)
  breaks <- seq(min(x10INTERVALSP5B2), max(x10INTERVALSP5B2), length.out = length(x10INTERVALSP5B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP5B2
}

# Create new variable TRIALS according to interval
LISTP5[[2]]$INTERVALS <- cut(LISTP5[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP5B3<-c(PERCENTAGEP5$B3T1,PERCENTAGEP5$B3T2,PERCENTAGEP5$B3T3,PERCENTAGEP5$B3T4,PERCENTAGEP5$B3T5, max_valueP5B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP5B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP5B3 <- unique(x10INTERVALSP5B3)
  x10INTERVALSP5B3 <- sort(x10INTERVALSP5B3)
  breaks <- seq(min(x10INTERVALSP5B3), max(x10INTERVALSP5B3), length.out = length(x10INTERVALSP5B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP5B3
}

# Create new variable TRIALS according to interval
LISTP5[[3]]$INTERVALS <- cut(LISTP5[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP5B4<-c(PERCENTAGEP5$B4T1,PERCENTAGEP5$B4T2,PERCENTAGEP5$B4T3,PERCENTAGEP5$B4T4,PERCENTAGEP5$B4T5, max_valueP5B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP5B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP5B4 <- unique(x10INTERVALSP5B4)
  x10INTERVALSP5B4 <- sort(x10INTERVALSP5B4)
  breaks <- seq(min(x10INTERVALSP5B4), max(x10INTERVALSP5B4), length.out = length(x10INTERVALSP5B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP5B4
}

# Create new variable TRIALS according to interval
LISTP5[[4]]$INTERVALS <- cut(LISTP5[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP5B5<-c(PERCENTAGEP5$B5T1,PERCENTAGEP5$B5T2,PERCENTAGEP5$B5T3,PERCENTAGEP5$B5T4,PERCENTAGEP5$B5T5, max_valueP5B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP5B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP5B5 <- unique(x10INTERVALSP5B5)
  x10INTERVALSP5B5 <- sort(x10INTERVALSP5B5)
  breaks <- seq(min(x10INTERVALSP5B5), max(x10INTERVALSP5B5), length.out = length(x10INTERVALSP5B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP5B5
}

# Create new variable TRIALS according to interval
LISTP5[[5]]$INTERVALS <- cut(LISTP5[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP5B6<-c(PERCENTAGEP5$B6T1,PERCENTAGEP5$B6T2,PERCENTAGEP5$B6T3,PERCENTAGEP5$B6T4,PERCENTAGEP5$B6T5, max_valueP5B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP5B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP5B6 <- unique(x10INTERVALSP5B6)
  x10INTERVALSP5B6 <- sort(x10INTERVALSP5B6)
  breaks <- seq(min(x10INTERVALSP5B6), max(x10INTERVALSP5B6), length.out = length(x10INTERVALSP5B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP5B6
}

# Create new variable TRIALS according to interval
LISTP5[[6]]$INTERVALS <- cut(LISTP5[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP5B7<-c(PERCENTAGEP5$B7T1,PERCENTAGEP5$B7T2,PERCENTAGEP5$B7T3,PERCENTAGEP5$B7T4,PERCENTAGEP5$B7T5, max_valueP5B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP5B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP5B7 <- unique(x10INTERVALSP5B7)
  x10INTERVALSP5B7 <- sort(x10INTERVALSP5B7)
  breaks <- seq(min(x10INTERVALSP5B7), max(x10INTERVALSP5B7), length.out = length(x10INTERVALSP5B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP5B7
}

# Create new variable TRIALS according to interval
LISTP5[[7]]$INTERVALS <- cut(LISTP5[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP5B8<-c(PERCENTAGEP5$B8T1,PERCENTAGEP5$B8T2,PERCENTAGEP5$B8T3,PERCENTAGEP5$B8T4,PERCENTAGEP5$B8T5, max_valueP5B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP5B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP5B8 <- unique(x10INTERVALSP5B8)
  x10INTERVALSP5B8 <- sort(x10INTERVALSP5B8)
  breaks <- seq(min(x10INTERVALSP5B8), max(x10INTERVALSP5B8), length.out = length(x10INTERVALSP5B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP5B8
}

# Create new variable TRIALS according to interval
LISTP5[[8]]$INTERVALS <- cut(LISTP5[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP5B9<-c(PERCENTAGEP5$B9T1,PERCENTAGEP5$B9T2,PERCENTAGEP5$B9T3,PERCENTAGEP5$B9T4,PERCENTAGEP5$B9T5, max_valueP5B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP5B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP5B9 <- unique(x10INTERVALSP5B9)
  x10INTERVALSP5B9 <- sort(x10INTERVALSP5B9)
  breaks <- seq(min(x10INTERVALSP5B9), max(x10INTERVALSP5B9), length.out = length(x10INTERVALSP5B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP5B9
}

# Create new variable TRIALS according to interval
LISTP5[[9]]$INTERVALS <- cut(LISTP5[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP5B10<-c(PERCENTAGEP5$B10T1,PERCENTAGEP5$B10T2,PERCENTAGEP5$B10T3,PERCENTAGEP5$B10T4,PERCENTAGEP5$B10T5, max_valueP5B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP5B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP5B10 <- unique(x10INTERVALSP5B10)
  x10INTERVALSP5B10 <- sort(x10INTERVALSP5B10)
  breaks <- seq(min(x10INTERVALSP5B10), max(x10INTERVALSP5B10), length.out = length(x10INTERVALSP5B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP5B10
}

# Create new variable TRIALS according to interval
LISTP5[[10]]$INTERVALS <- cut(LISTP5[[10]]$TIME, breaks = breaks, labels = FALSE)

#P6
#DIVISION IN 10% PER BLOCKS
#B1
x10INTERVALSP6B1<-c(PERCENTAGEP6$B1T1,PERCENTAGEP6$B1T2,PERCENTAGEP6$B1T3,PERCENTAGEP6$B1T4,PERCENTAGEP6$B1T5, max_valueP6B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP6B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP6B1 <- unique(x10INTERVALSP6B1)
  x10INTERVALSP6B1 <- sort(x10INTERVALSP6B1)
  breaks <- seq(min(x10INTERVALSP6B1), max(x10INTERVALSP6B1), length.out = length(x10INTERVALSP6B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP6B1
}

# Create new variable TRIALS according to interval
LISTP6[[1]]$INTERVALS <- cut(LISTP6[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP6B2<-c(PERCENTAGEP6$B2T1,PERCENTAGEP6$B2T2,PERCENTAGEP6$B2T3,PERCENTAGEP6$B2T4,PERCENTAGEP6$B2T5, max_valueP6B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP6B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP6B2 <- unique(x10INTERVALSP6B2)
  x10INTERVALSP6B2 <- sort(x10INTERVALSP6B2)
  breaks <- seq(min(x10INTERVALSP6B2), max(x10INTERVALSP6B2), length.out = length(x10INTERVALSP6B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP6B2
}

# Create new variable TRIALS according to interval
LISTP6[[2]]$INTERVALS <- cut(LISTP6[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP6B3<-c(PERCENTAGEP6$B3T1,PERCENTAGEP6$B3T2,PERCENTAGEP6$B3T3,PERCENTAGEP6$B3T4,PERCENTAGEP6$B3T5, max_valueP6B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP6B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP6B3 <- unique(x10INTERVALSP6B3)
  x10INTERVALSP6B3 <- sort(x10INTERVALSP6B3)
  breaks <- seq(min(x10INTERVALSP6B3), max(x10INTERVALSP6B3), length.out = length(x10INTERVALSP6B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP6B3
}

# Create new variable TRIALS according to interval
LISTP6[[3]]$INTERVALS <- cut(LISTP6[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP6B4<-c(PERCENTAGEP6$B4T1,PERCENTAGEP6$B4T2,PERCENTAGEP6$B4T3,PERCENTAGEP6$B4T4,PERCENTAGEP6$B4T5, max_valueP6B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP6B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP6B4 <- unique(x10INTERVALSP6B4)
  x10INTERVALSP6B4 <- sort(x10INTERVALSP6B4)
  breaks <- seq(min(x10INTERVALSP6B4), max(x10INTERVALSP6B4), length.out = length(x10INTERVALSP6B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP6B4
}

# Create new variable TRIALS according to interval
LISTP6[[4]]$INTERVALS <- cut(LISTP6[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP6B5<-c(PERCENTAGEP6$B5T1,PERCENTAGEP6$B5T2,PERCENTAGEP6$B5T3,PERCENTAGEP6$B5T4,PERCENTAGEP6$B5T5, max_valueP6B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP6B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP6B5 <- unique(x10INTERVALSP6B5)
  x10INTERVALSP6B5 <- sort(x10INTERVALSP6B5)
  breaks <- seq(min(x10INTERVALSP6B5), max(x10INTERVALSP6B5), length.out = length(x10INTERVALSP6B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP6B5
}

# Create new variable TRIALS according to interval
LISTP6[[5]]$INTERVALS <- cut(LISTP6[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP6B6<-c(PERCENTAGEP6$B6T1,PERCENTAGEP6$B6T2,PERCENTAGEP6$B6T3,PERCENTAGEP6$B6T4,PERCENTAGEP6$B6T5, max_valueP6B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP6B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP6B6 <- unique(x10INTERVALSP6B6)
  x10INTERVALSP6B6 <- sort(x10INTERVALSP6B6)
  breaks <- seq(min(x10INTERVALSP6B6), max(x10INTERVALSP6B6), length.out = length(x10INTERVALSP6B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP6B6
}

# Create new variable TRIALS according to interval
LISTP6[[6]]$INTERVALS <- cut(LISTP6[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP6B7<-c(PERCENTAGEP6$B7T1,PERCENTAGEP6$B7T2,PERCENTAGEP6$B7T3,PERCENTAGEP6$B7T4,PERCENTAGEP6$B7T5, max_valueP6B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP6B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP6B7 <- unique(x10INTERVALSP6B7)
  x10INTERVALSP6B7 <- sort(x10INTERVALSP6B7)
  breaks <- seq(min(x10INTERVALSP6B7), max(x10INTERVALSP6B7), length.out = length(x10INTERVALSP6B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP6B7
}

# Create new variable TRIALS according to interval
LISTP6[[7]]$INTERVALS <- cut(LISTP6[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP6B8<-c(PERCENTAGEP6$B8T1,PERCENTAGEP6$B8T2,PERCENTAGEP6$B8T3,PERCENTAGEP6$B8T4,PERCENTAGEP6$B8T5, max_valueP6B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP6B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP6B8 <- unique(x10INTERVALSP6B8)
  x10INTERVALSP6B8 <- sort(x10INTERVALSP6B8)
  breaks <- seq(min(x10INTERVALSP6B8), max(x10INTERVALSP6B8), length.out = length(x10INTERVALSP6B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP6B8
}

# Create new variable TRIALS according to interval
LISTP6[[8]]$INTERVALS <- cut(LISTP6[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP6B9<-c(PERCENTAGEP6$B9T1,PERCENTAGEP6$B9T2,PERCENTAGEP6$B9T3,PERCENTAGEP6$B9T4,PERCENTAGEP6$B9T5, max_valueP6B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP6B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP6B9 <- unique(x10INTERVALSP6B9)
  x10INTERVALSP6B9 <- sort(x10INTERVALSP6B9)
  breaks <- seq(min(x10INTERVALSP6B9), max(x10INTERVALSP6B9), length.out = length(x10INTERVALSP6B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP6B9
}

# Create new variable TRIALS according to interval
LISTP6[[9]]$INTERVALS <- cut(LISTP6[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP6B10<-c(PERCENTAGEP6$B10T1,PERCENTAGEP6$B10T2,PERCENTAGEP6$B10T3,PERCENTAGEP6$B10T4,PERCENTAGEP6$B10T5, max_valueP6B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP6B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP6B10 <- unique(x10INTERVALSP6B10)
  x10INTERVALSP6B10 <- sort(x10INTERVALSP6B10)
  breaks <- seq(min(x10INTERVALSP6B10), max(x10INTERVALSP6B10), length.out = length(x10INTERVALSP6B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP6B10
}

# Create new variable TRIALS according to interval
LISTP6[[10]]$INTERVALS <- cut(LISTP6[[10]]$TIME, breaks = breaks, labels = FALSE)

#P7
#B1
x10INTERVALSP7B1<-c(PERCENTAGEP7$B1T1,PERCENTAGEP7$B1T2,PERCENTAGEP7$B1T3,PERCENTAGEP7$B1T4,PERCENTAGEP7$B1T5, max_valueP7B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP7B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP7B1 <- unique(x10INTERVALSP7B1)
  x10INTERVALSP7B1 <- sort(x10INTERVALSP7B1)
  breaks <- seq(min(x10INTERVALSP7B1), max(x10INTERVALSP7B1), length.out = length(x10INTERVALSP7B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP7B1
}

# Create new variable TRIALS according to interval
LISTP7[[1]]$INTERVALS <- cut(LISTP7[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP7B2<-c(PERCENTAGEP7$B2T1,PERCENTAGEP7$B2T2,PERCENTAGEP7$B2T3,PERCENTAGEP7$B2T4,PERCENTAGEP7$B2T5, max_valueP7B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP7B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP7B2 <- unique(x10INTERVALSP7B2)
  x10INTERVALSP7B2 <- sort(x10INTERVALSP7B2)
  breaks <- seq(min(x10INTERVALSP7B2), max(x10INTERVALSP7B2), length.out = length(x10INTERVALSP7B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP7B2
}

# Create new variable TRIALS according to interval
LISTP7[[2]]$INTERVALS <- cut(LISTP7[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP7B3<-c(PERCENTAGEP7$B3T1,PERCENTAGEP7$B3T2,PERCENTAGEP7$B3T3,PERCENTAGEP7$B3T4,PERCENTAGEP7$B3T5, max_valueP7B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP7B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP7B3 <- unique(x10INTERVALSP7B3)
  x10INTERVALSP7B3 <- sort(x10INTERVALSP7B3)
  breaks <- seq(min(x10INTERVALSP7B3), max(x10INTERVALSP7B3), length.out = length(x10INTERVALSP7B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP7B3
}

# Create new variable TRIALS according to interval
LISTP7[[3]]$INTERVALS <- cut(LISTP7[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP7B4<-c(PERCENTAGEP7$B4T1,PERCENTAGEP7$B4T2,PERCENTAGEP7$B4T3,PERCENTAGEP7$B4T4,PERCENTAGEP7$B4T5, max_valueP7B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP7B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP7B4 <- unique(x10INTERVALSP7B4)
  x10INTERVALSP7B4 <- sort(x10INTERVALSP7B4)
  breaks <- seq(min(x10INTERVALSP7B4), max(x10INTERVALSP7B4), length.out = length(x10INTERVALSP7B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP7B4
}

# Create new variable TRIALS according to interval
LISTP7[[4]]$INTERVALS <- cut(LISTP7[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP7B5<-c(PERCENTAGEP7$B5T1,PERCENTAGEP7$B5T2,PERCENTAGEP7$B5T3,PERCENTAGEP7$B5T4,PERCENTAGEP7$B5T5, max_valueP7B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP7B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP7B5 <- unique(x10INTERVALSP7B5)
  x10INTERVALSP7B5 <- sort(x10INTERVALSP7B5)
  breaks <- seq(min(x10INTERVALSP7B5), max(x10INTERVALSP7B5), length.out = length(x10INTERVALSP7B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP7B5
}

# Create new variable TRIALS according to interval
LISTP7[[5]]$INTERVALS <- cut(LISTP7[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP7B6<-c(PERCENTAGEP7$B6T1,PERCENTAGEP7$B6T2,PERCENTAGEP7$B6T3,PERCENTAGEP7$B6T4,PERCENTAGEP7$B6T5, max_valueP7B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP7B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP7B6 <- unique(x10INTERVALSP7B6)
  x10INTERVALSP7B6 <- sort(x10INTERVALSP7B6)
  breaks <- seq(min(x10INTERVALSP7B6), max(x10INTERVALSP7B6), length.out = length(x10INTERVALSP7B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP7B6
}

# Create new variable TRIALS according to interval
LISTP7[[6]]$INTERVALS <- cut(LISTP7[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP7B7<-c(PERCENTAGEP7$B7T1,PERCENTAGEP7$B7T2,PERCENTAGEP7$B7T3,PERCENTAGEP7$B7T4,PERCENTAGEP7$B7T5, max_valueP7B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP7B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP7B7 <- unique(x10INTERVALSP7B7)
  x10INTERVALSP7B7 <- sort(x10INTERVALSP7B7)
  breaks <- seq(min(x10INTERVALSP7B7), max(x10INTERVALSP7B7), length.out = length(x10INTERVALSP7B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP7B7
}

# Create new variable TRIALS according to interval
LISTP7[[7]]$INTERVALS <- cut(LISTP7[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP7B8<-c(PERCENTAGEP7$B8T1,PERCENTAGEP7$B8T2,PERCENTAGEP7$B8T3,PERCENTAGEP7$B8T4,PERCENTAGEP7$B8T5, max_valueP7B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP7B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP7B8 <- unique(x10INTERVALSP7B8)
  x10INTERVALSP7B8 <- sort(x10INTERVALSP7B8)
  breaks <- seq(min(x10INTERVALSP7B8), max(x10INTERVALSP7B8), length.out = length(x10INTERVALSP7B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP7B8
}

# Create new variable TRIALS according to interval
LISTP7[[8]]$INTERVALS <- cut(LISTP7[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP7B9<-c(PERCENTAGEP7$B9T1,PERCENTAGEP7$B9T2,PERCENTAGEP7$B9T3,PERCENTAGEP7$B9T4,PERCENTAGEP7$B9T5, max_valueP7B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP7B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP7B9 <- unique(x10INTERVALSP7B9)
  x10INTERVALSP7B9 <- sort(x10INTERVALSP7B9)
  breaks <- seq(min(x10INTERVALSP7B9), max(x10INTERVALSP7B9), length.out = length(x10INTERVALSP7B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP7B9
}

# Create new variable TRIALS according to interval
LISTP7[[9]]$INTERVALS <- cut(LISTP7[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP7B10<-c(PERCENTAGEP7$B10T1,PERCENTAGEP7$B10T2,PERCENTAGEP7$B10T3,PERCENTAGEP7$B10T4,PERCENTAGEP7$B10T5, max_valueP7B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP7B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP7B10 <- unique(x10INTERVALSP7B10)
  x10INTERVALSP7B10 <- sort(x10INTERVALSP7B10)
  breaks <- seq(min(x10INTERVALSP7B10), max(x10INTERVALSP7B10), length.out = length(x10INTERVALSP7B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP7B10
}

# Create new variable TRIALS according to interval
LISTP7[[10]]$INTERVALS <- cut(LISTP7[[10]]$TIME, breaks = breaks, labels = FALSE)
#P8
#B1
x10INTERVALSP8B1<-c(PERCENTAGEP8$B1T1,PERCENTAGEP8$B1T2,PERCENTAGEP8$B1T3,PERCENTAGEP8$B1T4,PERCENTAGEP8$B1T5, max_valueP8B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP8B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP8B1 <- unique(x10INTERVALSP8B1)
  x10INTERVALSP8B1 <- sort(x10INTERVALSP8B1)
  breaks <- seq(min(x10INTERVALSP8B1), max(x10INTERVALSP8B1), length.out = length(x10INTERVALSP8B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP8B1
}

# Create new variable TRIALS according to interval
LISTP8[[1]]$INTERVALS <- cut(LISTP8[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP8B2<-c(PERCENTAGEP8$B2T1,PERCENTAGEP8$B2T2,PERCENTAGEP8$B2T3,PERCENTAGEP8$B2T4,PERCENTAGEP8$B2T5, max_valueP8B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP8B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP8B2 <- unique(x10INTERVALSP8B2)
  x10INTERVALSP8B2 <- sort(x10INTERVALSP8B2)
  breaks <- seq(min(x10INTERVALSP8B2), max(x10INTERVALSP8B2), length.out = length(x10INTERVALSP8B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP8B2
}

# Create new variable TRIALS according to interval
LISTP8[[2]]$INTERVALS <- cut(LISTP8[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP8B3<-c(PERCENTAGEP8$B3T1,PERCENTAGEP8$B3T2,PERCENTAGEP8$B3T3,PERCENTAGEP8$B3T4,PERCENTAGEP8$B3T5, max_valueP8B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP8B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP8B3 <- unique(x10INTERVALSP8B3)
  x10INTERVALSP8B3 <- sort(x10INTERVALSP8B3)
  breaks <- seq(min(x10INTERVALSP8B3), max(x10INTERVALSP8B3), length.out = length(x10INTERVALSP8B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP8B3
}

# Create new variable TRIALS according to interval
LISTP8[[3]]$INTERVALS <- cut(LISTP8[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP8B4<-c(PERCENTAGEP8$B4T1,PERCENTAGEP8$B4T2,PERCENTAGEP8$B4T3,PERCENTAGEP8$B4T4,PERCENTAGEP8$B4T5, max_valueP8B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP8B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP8B4 <- unique(x10INTERVALSP8B4)
  x10INTERVALSP8B4 <- sort(x10INTERVALSP8B4)
  breaks <- seq(min(x10INTERVALSP8B4), max(x10INTERVALSP8B4), length.out = length(x10INTERVALSP8B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP8B4
}

# Create new variable TRIALS according to interval
LISTP8[[4]]$INTERVALS <- cut(LISTP8[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP8B5<-c(PERCENTAGEP8$B5T1,PERCENTAGEP8$B5T2,PERCENTAGEP8$B5T3,PERCENTAGEP8$B5T4,PERCENTAGEP8$B5T5, max_valueP8B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP8B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP8B5 <- unique(x10INTERVALSP8B5)
  x10INTERVALSP8B5 <- sort(x10INTERVALSP8B5)
  breaks <- seq(min(x10INTERVALSP8B5), max(x10INTERVALSP8B5), length.out = length(x10INTERVALSP8B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP8B5
}

# Create new variable TRIALS according to interval
LISTP8[[5]]$INTERVALS <- cut(LISTP8[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP8B6<-c(PERCENTAGEP8$B6T1,PERCENTAGEP8$B6T2,PERCENTAGEP8$B6T3,PERCENTAGEP8$B6T4,PERCENTAGEP8$B6T5, max_valueP8B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP8B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP8B6 <- unique(x10INTERVALSP8B6)
  x10INTERVALSP8B6 <- sort(x10INTERVALSP8B6)
  breaks <- seq(min(x10INTERVALSP8B6), max(x10INTERVALSP8B6), length.out = length(x10INTERVALSP8B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP8B6
}

# Create new variable TRIALS according to interval
LISTP8[[6]]$INTERVALS <- cut(LISTP8[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP8B7<-c(PERCENTAGEP8$B7T1,PERCENTAGEP8$B7T2,PERCENTAGEP8$B7T3,PERCENTAGEP8$B7T4,PERCENTAGEP8$B7T5, max_valueP8B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP8B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP8B7 <- unique(x10INTERVALSP8B7)
  x10INTERVALSP8B7 <- sort(x10INTERVALSP8B7)
  breaks <- seq(min(x10INTERVALSP8B7), max(x10INTERVALSP8B7), length.out = length(x10INTERVALSP8B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP8B7
}

# Create new variable TRIALS according to interval
LISTP8[[7]]$INTERVALS <- cut(LISTP8[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP8B8<-c(PERCENTAGEP8$B8T1,PERCENTAGEP8$B8T2,PERCENTAGEP8$B8T3,PERCENTAGEP8$B8T4,PERCENTAGEP8$B8T5, max_valueP8B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP8B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP8B8 <- unique(x10INTERVALSP8B8)
  x10INTERVALSP8B8 <- sort(x10INTERVALSP8B8)
  breaks <- seq(min(x10INTERVALSP8B8), max(x10INTERVALSP8B8), length.out = length(x10INTERVALSP8B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP8B8
}

# Create new variable TRIALS according to interval
LISTP8[[8]]$INTERVALS <- cut(LISTP8[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP8B9<-c(PERCENTAGEP8$B9T1,PERCENTAGEP8$B9T2,PERCENTAGEP8$B9T3,PERCENTAGEP8$B9T4,PERCENTAGEP8$B9T5, max_valueP8B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP8B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP8B9 <- unique(x10INTERVALSP8B9)
  x10INTERVALSP8B9 <- sort(x10INTERVALSP8B9)
  breaks <- seq(min(x10INTERVALSP8B9), max(x10INTERVALSP8B9), length.out = length(x10INTERVALSP8B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP8B9
}

# Create new variable TRIALS according to interval
LISTP8[[9]]$INTERVALS <- cut(LISTP8[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP8B10<-c(PERCENTAGEP8$B10T1,PERCENTAGEP8$B10T2,PERCENTAGEP8$B10T3,PERCENTAGEP8$B10T4,PERCENTAGEP8$B10T5, max_valueP8B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP8B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP8B10 <- unique(x10INTERVALSP8B10)
  x10INTERVALSP8B10 <- sort(x10INTERVALSP8B10)
  breaks <- seq(min(x10INTERVALSP8B10), max(x10INTERVALSP8B10), length.out = length(x10INTERVALSP8B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP8B10
}

# Create new variable TRIALS according to interval
LISTP8[[10]]$INTERVALS <- cut(LISTP8[[10]]$TIME, breaks = breaks, labels = FALSE)
#P9
#B1
x10INTERVALSP9B1<-c(PERCENTAGEP9$B1T1,PERCENTAGEP9$B1T2,PERCENTAGEP9$B1T3,PERCENTAGEP9$B1T4,PERCENTAGEP9$B1T5, max_valueP9B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP9B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP9B1 <- unique(x10INTERVALSP9B1)
  x10INTERVALSP9B1 <- sort(x10INTERVALSP9B1)
  breaks <- seq(min(x10INTERVALSP9B1), max(x10INTERVALSP9B1), length.out = length(x10INTERVALSP9B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP9B1
}

# Create new variable TRIALS according to interval
LISTP9[[1]]$INTERVALS <- cut(LISTP9[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP9B2<-c(PERCENTAGEP9$B2T1,PERCENTAGEP9$B2T2,PERCENTAGEP9$B2T3,PERCENTAGEP9$B2T4,PERCENTAGEP9$B2T5, max_valueP9B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP9B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP9B2 <- unique(x10INTERVALSP9B2)
  x10INTERVALSP9B2 <- sort(x10INTERVALSP9B2)
  breaks <- seq(min(x10INTERVALSP9B2), max(x10INTERVALSP9B2), length.out = length(x10INTERVALSP9B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP9B2
}

# Create new variable TRIALS according to interval
LISTP9[[2]]$INTERVALS <- cut(LISTP9[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP9B3<-c(PERCENTAGEP9$B3T1,PERCENTAGEP9$B3T2,PERCENTAGEP9$B3T3,PERCENTAGEP9$B3T4,PERCENTAGEP9$B3T5, max_valueP9B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP9B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP9B3 <- unique(x10INTERVALSP9B3)
  x10INTERVALSP9B3 <- sort(x10INTERVALSP9B3)
  breaks <- seq(min(x10INTERVALSP9B3), max(x10INTERVALSP9B3), length.out = length(x10INTERVALSP9B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP9B3
}

# Create new variable TRIALS according to interval
LISTP9[[3]]$INTERVALS <- cut(LISTP9[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP9B4<-c(PERCENTAGEP9$B4T1,PERCENTAGEP9$B4T2,PERCENTAGEP9$B4T3,PERCENTAGEP9$B4T4,PERCENTAGEP9$B4T5, max_valueP9B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP9B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP9B4 <- unique(x10INTERVALSP9B4)
  x10INTERVALSP9B4 <- sort(x10INTERVALSP9B4)
  breaks <- seq(min(x10INTERVALSP9B4), max(x10INTERVALSP9B4), length.out = length(x10INTERVALSP9B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP9B4
}

# Create new variable TRIALS according to interval
LISTP9[[4]]$INTERVALS <- cut(LISTP9[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP9B5<-c(PERCENTAGEP9$B5T1,PERCENTAGEP9$B5T2,PERCENTAGEP9$B5T3,PERCENTAGEP9$B5T4,PERCENTAGEP9$B5T5, max_valueP9B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP9B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP9B5 <- unique(x10INTERVALSP9B5)
  x10INTERVALSP9B5 <- sort(x10INTERVALSP9B5)
  breaks <- seq(min(x10INTERVALSP9B5), max(x10INTERVALSP9B5), length.out = length(x10INTERVALSP9B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP9B5
}

# Create new variable TRIALS according to interval
LISTP9[[5]]$INTERVALS <- cut(LISTP9[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP9B6<-c(PERCENTAGEP9$B6T1,PERCENTAGEP9$B6T2,PERCENTAGEP9$B6T3,PERCENTAGEP9$B6T4,PERCENTAGEP9$B6T5, max_valueP9B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP9B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP9B6 <- unique(x10INTERVALSP9B6)
  x10INTERVALSP9B6 <- sort(x10INTERVALSP9B6)
  breaks <- seq(min(x10INTERVALSP9B6), max(x10INTERVALSP9B6), length.out = length(x10INTERVALSP9B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP9B6
}

# Create new variable TRIALS according to interval
LISTP9[[6]]$INTERVALS <- cut(LISTP9[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP9B7<-c(PERCENTAGEP9$B7T1,PERCENTAGEP9$B7T2,PERCENTAGEP9$B7T3,PERCENTAGEP9$B7T4,PERCENTAGEP9$B7T5, max_valueP9B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP9B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP9B7 <- unique(x10INTERVALSP9B7)
  x10INTERVALSP9B7 <- sort(x10INTERVALSP9B7)
  breaks <- seq(min(x10INTERVALSP9B7), max(x10INTERVALSP9B7), length.out = length(x10INTERVALSP9B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP9B7
}

# Create new variable TRIALS according to interval
LISTP9[[7]]$INTERVALS <- cut(LISTP9[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP9B8<-c(PERCENTAGEP9$B8T1,PERCENTAGEP9$B8T2,PERCENTAGEP9$B8T3,PERCENTAGEP9$B8T4,PERCENTAGEP9$B8T5, max_valueP9B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP9B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP9B8 <- unique(x10INTERVALSP9B8)
  x10INTERVALSP9B8 <- sort(x10INTERVALSP9B8)
  breaks <- seq(min(x10INTERVALSP9B8), max(x10INTERVALSP9B8), length.out = length(x10INTERVALSP9B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP9B8
}

# Create new variable TRIALS according to interval
LISTP9[[8]]$INTERVALS <- cut(LISTP9[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP9B9<-c(PERCENTAGEP9$B9T1,PERCENTAGEP9$B9T2,PERCENTAGEP9$B9T3,PERCENTAGEP9$B9T4,PERCENTAGEP9$B9T5, max_valueP9B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP9B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP9B9 <- unique(x10INTERVALSP9B9)
  x10INTERVALSP9B9 <- sort(x10INTERVALSP9B9)
  breaks <- seq(min(x10INTERVALSP9B9), max(x10INTERVALSP9B9), length.out = length(x10INTERVALSP9B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP9B9
}

# Create new variable TRIALS according to interval
LISTP9[[9]]$INTERVALS <- cut(LISTP9[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP9B10<-c(PERCENTAGEP9$B10T1,PERCENTAGEP9$B10T2,PERCENTAGEP9$B10T3,PERCENTAGEP9$B10T4,PERCENTAGEP9$B10T5, max_valueP9B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP9B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP9B10 <- unique(x10INTERVALSP9B10)
  x10INTERVALSP9B10 <- sort(x10INTERVALSP9B10)
  breaks <- seq(min(x10INTERVALSP9B10), max(x10INTERVALSP9B10), length.out = length(x10INTERVALSP9B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP9B10
}

# Create new variable TRIALS according to interval
LISTP9[[10]]$INTERVALS <- cut(LISTP9[[10]]$TIME, breaks = breaks, labels = FALSE)
#P10
#B1
x10INTERVALSP10B1<-c(PERCENTAGEP10$B1T1,PERCENTAGEP10$B1T2,PERCENTAGEP10$B1T3,PERCENTAGEP10$B1T4,PERCENTAGEP10$B1T5, max_valueP10B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP10B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP10B1 <- unique(x10INTERVALSP10B1)
  x10INTERVALSP10B1 <- sort(x10INTERVALSP10B1)
  breaks <- seq(min(x10INTERVALSP10B1), max(x10INTERVALSP10B1), length.out = length(x10INTERVALSP10B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP10B1
}

# Create new variable TRIALS according to interval
LISTP10[[1]]$INTERVALS <- cut(LISTP10[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP10B2<-c(PERCENTAGEP10$B2T1,PERCENTAGEP10$B2T2,PERCENTAGEP10$B2T3,PERCENTAGEP10$B2T4,PERCENTAGEP10$B2T5, max_valueP10B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP10B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP10B2 <- unique(x10INTERVALSP10B2)
  x10INTERVALSP10B2 <- sort(x10INTERVALSP10B2)
  breaks <- seq(min(x10INTERVALSP10B2), max(x10INTERVALSP10B2), length.out = length(x10INTERVALSP10B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP10B2
}

# Create new variable TRIALS according to interval
LISTP10[[2]]$INTERVALS <- cut(LISTP10[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP10B3<-c(PERCENTAGEP10$B3T1,PERCENTAGEP10$B3T2,PERCENTAGEP10$B3T3,PERCENTAGEP10$B3T4,PERCENTAGEP10$B3T5, max_valueP10B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP10B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP10B3 <- unique(x10INTERVALSP10B3)
  x10INTERVALSP10B3 <- sort(x10INTERVALSP10B3)
  breaks <- seq(min(x10INTERVALSP10B3), max(x10INTERVALSP10B3), length.out = length(x10INTERVALSP10B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP10B3
}

# Create new variable TRIALS according to interval
LISTP10[[3]]$INTERVALS <- cut(LISTP10[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP10B4<-c(PERCENTAGEP10$B4T1,PERCENTAGEP10$B4T2,PERCENTAGEP10$B4T3,PERCENTAGEP10$B4T4,PERCENTAGEP10$B4T5, max_valueP10B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP10B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP10B4 <- unique(x10INTERVALSP10B4)
  x10INTERVALSP10B4 <- sort(x10INTERVALSP10B4)
  breaks <- seq(min(x10INTERVALSP10B4), max(x10INTERVALSP10B4), length.out = length(x10INTERVALSP10B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP10B4
}

# Create new variable TRIALS according to interval
LISTP10[[4]]$INTERVALS <- cut(LISTP10[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP10B5<-c(PERCENTAGEP10$B5T1,PERCENTAGEP10$B5T2,PERCENTAGEP10$B5T3,PERCENTAGEP10$B5T4,PERCENTAGEP10$B5T5, max_valueP10B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP10B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP10B5 <- unique(x10INTERVALSP10B5)
  x10INTERVALSP10B5 <- sort(x10INTERVALSP10B5)
  breaks <- seq(min(x10INTERVALSP10B5), max(x10INTERVALSP10B5), length.out = length(x10INTERVALSP10B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP10B5
}

# Create new variable TRIALS according to interval
LISTP10[[5]]$INTERVALS <- cut(LISTP10[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP10B6<-c(PERCENTAGEP10$B6T1,PERCENTAGEP10$B6T2,PERCENTAGEP10$B6T3,PERCENTAGEP10$B6T4,PERCENTAGEP10$B6T5, max_valueP10B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP10B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP10B6 <- unique(x10INTERVALSP10B6)
  x10INTERVALSP10B6 <- sort(x10INTERVALSP10B6)
  breaks <- seq(min(x10INTERVALSP10B6), max(x10INTERVALSP10B6), length.out = length(x10INTERVALSP10B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP10B6
}

# Create new variable TRIALS according to interval
LISTP10[[6]]$INTERVALS <- cut(LISTP10[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP10B7<-c(PERCENTAGEP10$B7T1,PERCENTAGEP10$B7T2,PERCENTAGEP10$B7T3,PERCENTAGEP10$B7T4,PERCENTAGEP10$B7T5, max_valueP10B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP10B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP10B7 <- unique(x10INTERVALSP10B7)
  x10INTERVALSP10B7 <- sort(x10INTERVALSP10B7)
  breaks <- seq(min(x10INTERVALSP10B7), max(x10INTERVALSP10B7), length.out = length(x10INTERVALSP10B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP10B7
}

# Create new variable TRIALS according to interval
LISTP10[[7]]$INTERVALS <- cut(LISTP10[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP10B8<-c(PERCENTAGEP10$B8T1,PERCENTAGEP10$B8T2,PERCENTAGEP10$B8T3,PERCENTAGEP10$B8T4,PERCENTAGEP10$B8T5, max_valueP10B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP10B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP10B8 <- unique(x10INTERVALSP10B8)
  x10INTERVALSP10B8 <- sort(x10INTERVALSP10B8)
  breaks <- seq(min(x10INTERVALSP10B8), max(x10INTERVALSP10B8), length.out = length(x10INTERVALSP10B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP10B8
}

# Create new variable TRIALS according to interval
LISTP10[[8]]$INTERVALS <- cut(LISTP10[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP10B9<-c(PERCENTAGEP10$B9T1,PERCENTAGEP10$B9T2,PERCENTAGEP10$B9T3,PERCENTAGEP10$B9T4,PERCENTAGEP10$B9T5, max_valueP10B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP10B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP10B9 <- unique(x10INTERVALSP10B9)
  x10INTERVALSP10B9 <- sort(x10INTERVALSP10B9)
  breaks <- seq(min(x10INTERVALSP10B9), max(x10INTERVALSP10B9), length.out = length(x10INTERVALSP10B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP10B9
}

# Create new variable TRIALS according to interval
LISTP10[[9]]$INTERVALS <- cut(LISTP10[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP10B10<-c(PERCENTAGEP10$B10T1,PERCENTAGEP10$B10T2,PERCENTAGEP10$B10T3,PERCENTAGEP10$B10T4,PERCENTAGEP10$B10T5, max_valueP10B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP10B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP10B10 <- unique(x10INTERVALSP10B10)
  x10INTERVALSP10B10 <- sort(x10INTERVALSP10B10)
  breaks <- seq(min(x10INTERVALSP10B10), max(x10INTERVALSP10B10), length.out = length(x10INTERVALSP10B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP10B10
}

# Create new variable TRIALS according to interval
LISTP10[[10]]$INTERVALS <- cut(LISTP10[[10]]$TIME, breaks = breaks, labels = FALSE)
#P11
#B1
x10INTERVALSP11B1<-c(PERCENTAGEP11$B1T1,PERCENTAGEP11$B1T2,PERCENTAGEP11$B1T3,PERCENTAGEP11$B1T4,PERCENTAGEP11$B1T5, max_valueP11B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP11B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP11B1 <- unique(x10INTERVALSP11B1)
  x10INTERVALSP11B1 <- sort(x10INTERVALSP11B1)
  breaks <- seq(min(x10INTERVALSP11B1), max(x10INTERVALSP11B1), length.out = length(x10INTERVALSP11B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP11B1
}

# Create new variable TRIALS according to interval
LISTP11[[1]]$INTERVALS <- cut(LISTP11[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP11B2<-c(PERCENTAGEP11$B2T1,PERCENTAGEP11$B2T2,PERCENTAGEP11$B2T3,PERCENTAGEP11$B2T4,PERCENTAGEP11$B2T5, max_valueP11B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP11B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP11B2 <- unique(x10INTERVALSP11B2)
  x10INTERVALSP11B2 <- sort(x10INTERVALSP11B2)
  breaks <- seq(min(x10INTERVALSP11B2), max(x10INTERVALSP11B2), length.out = length(x10INTERVALSP11B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP11B2
}

# Create new variable TRIALS according to interval
LISTP11[[2]]$INTERVALS <- cut(LISTP11[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP11B3<-c(PERCENTAGEP11$B3T1,PERCENTAGEP11$B3T2,PERCENTAGEP11$B3T3,PERCENTAGEP11$B3T4,PERCENTAGEP11$B3T5, max_valueP11B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP11B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP11B3 <- unique(x10INTERVALSP11B3)
  x10INTERVALSP11B3 <- sort(x10INTERVALSP11B3)
  breaks <- seq(min(x10INTERVALSP11B3), max(x10INTERVALSP11B3), length.out = length(x10INTERVALSP11B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP11B3
}

# Create new variable TRIALS according to interval
LISTP11[[3]]$INTERVALS <- cut(LISTP11[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP11B4<-c(PERCENTAGEP11$B4T1,PERCENTAGEP11$B4T2,PERCENTAGEP11$B4T3,PERCENTAGEP11$B4T4,PERCENTAGEP11$B4T5, max_valueP11B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP11B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP11B4 <- unique(x10INTERVALSP11B4)
  x10INTERVALSP11B4 <- sort(x10INTERVALSP11B4)
  breaks <- seq(min(x10INTERVALSP11B4), max(x10INTERVALSP11B4), length.out = length(x10INTERVALSP11B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP11B4
}

# Create new variable TRIALS according to interval
LISTP11[[4]]$INTERVALS <- cut(LISTP11[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP11B5<-c(PERCENTAGEP11$B5T1,PERCENTAGEP11$B5T2,PERCENTAGEP11$B5T3,PERCENTAGEP11$B5T4,PERCENTAGEP11$B5T5, max_valueP11B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP11B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP11B5 <- unique(x10INTERVALSP11B5)
  x10INTERVALSP11B5 <- sort(x10INTERVALSP11B5)
  breaks <- seq(min(x10INTERVALSP11B5), max(x10INTERVALSP11B5), length.out = length(x10INTERVALSP11B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP11B5
}

# Create new variable TRIALS according to interval
LISTP11[[5]]$INTERVALS <- cut(LISTP11[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP11B6<-c(PERCENTAGEP11$B6T1,PERCENTAGEP11$B6T2,PERCENTAGEP11$B6T3,PERCENTAGEP11$B6T4,PERCENTAGEP11$B6T5, max_valueP11B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP11B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP11B6 <- unique(x10INTERVALSP11B6)
  x10INTERVALSP11B6 <- sort(x10INTERVALSP11B6)
  breaks <- seq(min(x10INTERVALSP11B6), max(x10INTERVALSP11B6), length.out = length(x10INTERVALSP11B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP11B6
}

# Create new variable TRIALS according to interval
LISTP11[[6]]$INTERVALS <- cut(LISTP11[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP11B7<-c(PERCENTAGEP11$B7T1,PERCENTAGEP11$B7T2,PERCENTAGEP11$B7T3,PERCENTAGEP11$B7T4,PERCENTAGEP11$B7T5, max_valueP11B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP11B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP11B7 <- unique(x10INTERVALSP11B7)
  x10INTERVALSP11B7 <- sort(x10INTERVALSP11B7)
  breaks <- seq(min(x10INTERVALSP11B7), max(x10INTERVALSP11B7), length.out = length(x10INTERVALSP11B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP11B7
}

# Create new variable TRIALS according to interval
LISTP11[[7]]$INTERVALS <- cut(LISTP11[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP11B8<-c(PERCENTAGEP11$B8T1,PERCENTAGEP11$B8T2,PERCENTAGEP11$B8T3,PERCENTAGEP11$B8T4,PERCENTAGEP11$B8T5, max_valueP11B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP11B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP11B8 <- unique(x10INTERVALSP11B8)
  x10INTERVALSP11B8 <- sort(x10INTERVALSP11B8)
  breaks <- seq(min(x10INTERVALSP11B8), max(x10INTERVALSP11B8), length.out = length(x10INTERVALSP11B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP11B8
}

# Create new variable TRIALS according to interval
LISTP11[[8]]$INTERVALS <- cut(LISTP11[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP11B9<-c(PERCENTAGEP11$B9T1,PERCENTAGEP11$B9T2,PERCENTAGEP11$B9T3,PERCENTAGEP11$B9T4,PERCENTAGEP11$B9T5, max_valueP11B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP11B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP11B9 <- unique(x10INTERVALSP11B9)
  x10INTERVALSP11B9 <- sort(x10INTERVALSP11B9)
  breaks <- seq(min(x10INTERVALSP11B9), max(x10INTERVALSP11B9), length.out = length(x10INTERVALSP11B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP11B9
}

# Create new variable TRIALS according to interval
LISTP11[[9]]$INTERVALS <- cut(LISTP11[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP11B10<-c(PERCENTAGEP11$B10T1,PERCENTAGEP11$B10T2,PERCENTAGEP11$B10T3,PERCENTAGEP11$B10T4,PERCENTAGEP11$B10T5, max_valueP11B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP11B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP11B10 <- unique(x10INTERVALSP11B10)
  x10INTERVALSP11B10 <- sort(x10INTERVALSP11B10)
  breaks <- seq(min(x10INTERVALSP11B10), max(x10INTERVALSP11B10), length.out = length(x10INTERVALSP11B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP11B10
}

# Create new variable TRIALS according to interval
LISTP11[[10]]$INTERVALS <- cut(LISTP11[[10]]$TIME, breaks = breaks, labels = FALSE)
#P12
#B1
x10INTERVALSP12B1<-c(PERCENTAGEP12$B1T1,PERCENTAGEP12$B1T2,PERCENTAGEP12$B1T3,PERCENTAGEP12$B1T4,PERCENTAGEP12$B1T5, max_valueP12B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP12B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP12B1 <- unique(x10INTERVALSP12B1)
  x10INTERVALSP12B1 <- sort(x10INTERVALSP12B1)
  breaks <- seq(min(x10INTERVALSP12B1), max(x10INTERVALSP12B1), length.out = length(x10INTERVALSP12B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP12B1
}

# Create new variable TRIALS according to interval
LISTP12[[1]]$INTERVALS <- cut(LISTP12[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP12B2<-c(PERCENTAGEP12$B2T1,PERCENTAGEP12$B2T2,PERCENTAGEP12$B2T3,PERCENTAGEP12$B2T4,PERCENTAGEP12$B2T5, max_valueP12B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP12B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP12B2 <- unique(x10INTERVALSP12B2)
  x10INTERVALSP12B2 <- sort(x10INTERVALSP12B2)
  breaks <- seq(min(x10INTERVALSP12B2), max(x10INTERVALSP12B2), length.out = length(x10INTERVALSP12B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP12B2
}

# Create new variable TRIALS according to interval
LISTP12[[2]]$INTERVALS <- cut(LISTP12[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP12B3<-c(PERCENTAGEP12$B3T1,PERCENTAGEP12$B3T2,PERCENTAGEP12$B3T3,PERCENTAGEP12$B3T4,PERCENTAGEP12$B3T5, max_valueP12B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP12B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP12B3 <- unique(x10INTERVALSP12B3)
  x10INTERVALSP12B3 <- sort(x10INTERVALSP12B3)
  breaks <- seq(min(x10INTERVALSP12B3), max(x10INTERVALSP12B3), length.out = length(x10INTERVALSP12B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP12B3
}

# Create new variable TRIALS according to interval
LISTP12[[3]]$INTERVALS <- cut(LISTP12[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP12B4<-c(PERCENTAGEP12$B4T1,PERCENTAGEP12$B4T2,PERCENTAGEP12$B4T3,PERCENTAGEP12$B4T4,PERCENTAGEP12$B4T5, max_valueP12B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP12B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP12B4 <- unique(x10INTERVALSP12B4)
  x10INTERVALSP12B4 <- sort(x10INTERVALSP12B4)
  breaks <- seq(min(x10INTERVALSP12B4), max(x10INTERVALSP12B4), length.out = length(x10INTERVALSP12B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP12B4
}

# Create new variable TRIALS according to interval
LISTP12[[4]]$INTERVALS <- cut(LISTP12[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP12B5<-c(PERCENTAGEP12$B5T1,PERCENTAGEP12$B5T2,PERCENTAGEP12$B5T3,PERCENTAGEP12$B5T4,PERCENTAGEP12$B5T5, max_valueP12B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP12B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP12B5 <- unique(x10INTERVALSP12B5)
  x10INTERVALSP12B5 <- sort(x10INTERVALSP12B5)
  breaks <- seq(min(x10INTERVALSP12B5), max(x10INTERVALSP12B5), length.out = length(x10INTERVALSP12B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP12B5
}

# Create new variable TRIALS according to interval
LISTP12[[5]]$INTERVALS <- cut(LISTP12[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP12B6<-c(PERCENTAGEP12$B6T1,PERCENTAGEP12$B6T2,PERCENTAGEP12$B6T3,PERCENTAGEP12$B6T4,PERCENTAGEP12$B6T5, max_valueP12B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP12B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP12B6 <- unique(x10INTERVALSP12B6)
  x10INTERVALSP12B6 <- sort(x10INTERVALSP12B6)
  breaks <- seq(min(x10INTERVALSP12B6), max(x10INTERVALSP12B6), length.out = length(x10INTERVALSP12B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP12B6
}

# Create new variable TRIALS according to interval
LISTP12[[6]]$INTERVALS <- cut(LISTP12[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP12B7<-c(PERCENTAGEP12$B7T1,PERCENTAGEP12$B7T2,PERCENTAGEP12$B7T3,PERCENTAGEP12$B7T4,PERCENTAGEP12$B7T5, max_valueP12B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP12B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP12B7 <- unique(x10INTERVALSP12B7)
  x10INTERVALSP12B7 <- sort(x10INTERVALSP12B7)
  breaks <- seq(min(x10INTERVALSP12B7), max(x10INTERVALSP12B7), length.out = length(x10INTERVALSP12B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP12B7
}

# Create new variable TRIALS according to interval
LISTP12[[7]]$INTERVALS <- cut(LISTP12[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP12B8<-c(PERCENTAGEP12$B8T1,PERCENTAGEP12$B8T2,PERCENTAGEP12$B8T3,PERCENTAGEP12$B8T4,PERCENTAGEP12$B8T5, max_valueP12B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP12B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP12B8 <- unique(x10INTERVALSP12B8)
  x10INTERVALSP12B8 <- sort(x10INTERVALSP12B8)
  breaks <- seq(min(x10INTERVALSP12B8), max(x10INTERVALSP12B8), length.out = length(x10INTERVALSP12B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP12B8
}

# Create new variable TRIALS according to interval
LISTP12[[8]]$INTERVALS <- cut(LISTP12[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP12B9<-c(PERCENTAGEP12$B9T1,PERCENTAGEP12$B9T2,PERCENTAGEP12$B9T3,PERCENTAGEP12$B9T4,PERCENTAGEP12$B9T5, max_valueP12B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP12B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP12B9 <- unique(x10INTERVALSP12B9)
  x10INTERVALSP12B9 <- sort(x10INTERVALSP12B9)
  breaks <- seq(min(x10INTERVALSP12B9), max(x10INTERVALSP12B9), length.out = length(x10INTERVALSP12B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP12B9
}

# Create new variable TRIALS according to interval
LISTP12[[9]]$INTERVALS <- cut(LISTP12[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP12B10<-c(PERCENTAGEP12$B10T1,PERCENTAGEP12$B10T2,PERCENTAGEP12$B10T3,PERCENTAGEP12$B10T4,PERCENTAGEP12$B10T5, max_valueP12B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP12B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP12B10 <- unique(x10INTERVALSP12B10)
  x10INTERVALSP12B10 <- sort(x10INTERVALSP12B10)
  breaks <- seq(min(x10INTERVALSP12B10), max(x10INTERVALSP12B10), length.out = length(x10INTERVALSP12B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP12B10
}

# Create new variable TRIALS according to interval
LISTP12[[10]]$INTERVALS <- cut(LISTP12[[10]]$TIME, breaks = breaks, labels = FALSE)
#P13
#B1
x10INTERVALSP13B1<-c(PERCENTAGEP13$B1T1,PERCENTAGEP13$B1T2,PERCENTAGEP13$B1T3,PERCENTAGEP13$B1T4,PERCENTAGEP13$B1T5, max_valueP13B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP13B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP13B1 <- unique(x10INTERVALSP13B1)
  x10INTERVALSP13B1 <- sort(x10INTERVALSP13B1)
  breaks <- seq(min(x10INTERVALSP13B1), max(x10INTERVALSP13B1), length.out = length(x10INTERVALSP13B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP13B1
}

# Create new variable TRIALS according to interval
LISTP13[[1]]$INTERVALS <- cut(LISTP13[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP13B2<-c(PERCENTAGEP13$B2T1,PERCENTAGEP13$B2T2,PERCENTAGEP13$B2T3,PERCENTAGEP13$B2T4,PERCENTAGEP13$B2T5, max_valueP13B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP13B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP13B2 <- unique(x10INTERVALSP13B2)
  x10INTERVALSP13B2 <- sort(x10INTERVALSP13B2)
  breaks <- seq(min(x10INTERVALSP13B2), max(x10INTERVALSP13B2), length.out = length(x10INTERVALSP13B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP13B2
}

# Create new variable TRIALS according to interval
LISTP13[[2]]$INTERVALS <- cut(LISTP13[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP13B3<-c(PERCENTAGEP13$B3T1,PERCENTAGEP13$B3T2,PERCENTAGEP13$B3T3,PERCENTAGEP13$B3T4,PERCENTAGEP13$B3T5, max_valueP13B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP13B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP13B3 <- unique(x10INTERVALSP13B3)
  x10INTERVALSP13B3 <- sort(x10INTERVALSP13B3)
  breaks <- seq(min(x10INTERVALSP13B3), max(x10INTERVALSP13B3), length.out = length(x10INTERVALSP13B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP13B3
}

# Create new variable TRIALS according to interval
LISTP13[[3]]$INTERVALS <- cut(LISTP13[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP13B4<-c(PERCENTAGEP13$B4T1,PERCENTAGEP13$B4T2,PERCENTAGEP13$B4T3,PERCENTAGEP13$B4T4,PERCENTAGEP13$B4T5, max_valueP13B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP13B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP13B4 <- unique(x10INTERVALSP13B4)
  x10INTERVALSP13B4 <- sort(x10INTERVALSP13B4)
  breaks <- seq(min(x10INTERVALSP13B4), max(x10INTERVALSP13B4), length.out = length(x10INTERVALSP13B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP13B4
}

# Create new variable TRIALS according to interval
LISTP13[[4]]$INTERVALS <- cut(LISTP13[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP13B5<-c(PERCENTAGEP13$B5T1,PERCENTAGEP13$B5T2,PERCENTAGEP13$B5T3,PERCENTAGEP13$B5T4,PERCENTAGEP13$B5T5, max_valueP13B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP13B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP13B5 <- unique(x10INTERVALSP13B5)
  x10INTERVALSP13B5 <- sort(x10INTERVALSP13B5)
  breaks <- seq(min(x10INTERVALSP13B5), max(x10INTERVALSP13B5), length.out = length(x10INTERVALSP13B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP13B5
}

# Create new variable TRIALS according to interval
LISTP13[[5]]$INTERVALS <- cut(LISTP13[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP13B6<-c(PERCENTAGEP13$B6T1,PERCENTAGEP13$B6T2,PERCENTAGEP13$B6T3,PERCENTAGEP13$B6T4,PERCENTAGEP13$B6T5, max_valueP13B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP13B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP13B6 <- unique(x10INTERVALSP13B6)
  x10INTERVALSP13B6 <- sort(x10INTERVALSP13B6)
  breaks <- seq(min(x10INTERVALSP13B6), max(x10INTERVALSP13B6), length.out = length(x10INTERVALSP13B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP13B6
}

# Create new variable TRIALS according to interval
LISTP13[[6]]$INTERVALS <- cut(LISTP13[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP13B7<-c(PERCENTAGEP13$B7T1,PERCENTAGEP13$B7T2,PERCENTAGEP13$B7T3,PERCENTAGEP13$B7T4,PERCENTAGEP13$B7T5, max_valueP13B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP13B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP13B7 <- unique(x10INTERVALSP13B7)
  x10INTERVALSP13B7 <- sort(x10INTERVALSP13B7)
  breaks <- seq(min(x10INTERVALSP13B7), max(x10INTERVALSP13B7), length.out = length(x10INTERVALSP13B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP13B7
}

# Create new variable TRIALS according to interval
LISTP13[[7]]$INTERVALS <- cut(LISTP13[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP13B8<-c(PERCENTAGEP13$B8T1,PERCENTAGEP13$B8T2,PERCENTAGEP13$B8T3,PERCENTAGEP13$B8T4,PERCENTAGEP13$B8T5, max_valueP13B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP13B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP13B8 <- unique(x10INTERVALSP13B8)
  x10INTERVALSP13B8 <- sort(x10INTERVALSP13B8)
  breaks <- seq(min(x10INTERVALSP13B8), max(x10INTERVALSP13B8), length.out = length(x10INTERVALSP13B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP13B8
}

# Create new variable TRIALS according to interval
LISTP13[[8]]$INTERVALS <- cut(LISTP13[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP13B9<-c(PERCENTAGEP13$B9T1,PERCENTAGEP13$B9T2,PERCENTAGEP13$B9T3,PERCENTAGEP13$B9T4,PERCENTAGEP13$B9T5, max_valueP13B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP13B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP13B9 <- unique(x10INTERVALSP13B9)
  x10INTERVALSP13B9 <- sort(x10INTERVALSP13B9)
  breaks <- seq(min(x10INTERVALSP13B9), max(x10INTERVALSP13B9), length.out = length(x10INTERVALSP13B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP13B9
}

# Create new variable TRIALS according to interval
LISTP13[[9]]$INTERVALS <- cut(LISTP13[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP13B10<-c(PERCENTAGEP13$B10T1,PERCENTAGEP13$B10T2,PERCENTAGEP13$B10T3,PERCENTAGEP13$B10T4,PERCENTAGEP13$B10T5, max_valueP13B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP13B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP13B10 <- unique(x10INTERVALSP13B10)
  x10INTERVALSP13B10 <- sort(x10INTERVALSP13B10)
  breaks <- seq(min(x10INTERVALSP13B10), max(x10INTERVALSP13B10), length.out = length(x10INTERVALSP13B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP13B10
}

# Create new variable TRIALS according to interval
LISTP13[[10]]$INTERVALS <- cut(LISTP13[[10]]$TIME, breaks = breaks, labels = FALSE)
#P14
#B1
x10INTERVALSP14B1<-c(PERCENTAGEP14$B1T1,PERCENTAGEP14$B1T2,PERCENTAGEP14$B1T3,PERCENTAGEP14$B1T4,PERCENTAGEP14$B1T5, max_valueP14B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP14B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP14B1 <- unique(x10INTERVALSP14B1)
  x10INTERVALSP14B1 <- sort(x10INTERVALSP14B1)
  breaks <- seq(min(x10INTERVALSP14B1), max(x10INTERVALSP14B1), length.out = length(x10INTERVALSP14B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP14B1
}

# Create new variable TRIALS according to interval
LISTP14[[1]]$INTERVALS <- cut(LISTP14[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP14B2<-c(PERCENTAGEP14$B2T1,PERCENTAGEP14$B2T2,PERCENTAGEP14$B2T3,PERCENTAGEP14$B2T4,PERCENTAGEP14$B2T5, max_valueP14B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP14B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP14B2 <- unique(x10INTERVALSP14B2)
  x10INTERVALSP14B2 <- sort(x10INTERVALSP14B2)
  breaks <- seq(min(x10INTERVALSP14B2), max(x10INTERVALSP14B2), length.out = length(x10INTERVALSP14B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP14B2
}

# Create new variable TRIALS according to interval
LISTP14[[2]]$INTERVALS <- cut(LISTP14[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP14B3<-c(PERCENTAGEP14$B3T1,PERCENTAGEP14$B3T2,PERCENTAGEP14$B3T3,PERCENTAGEP14$B3T4,PERCENTAGEP14$B3T5, max_valueP14B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP14B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP14B3 <- unique(x10INTERVALSP14B3)
  x10INTERVALSP14B3 <- sort(x10INTERVALSP14B3)
  breaks <- seq(min(x10INTERVALSP14B3), max(x10INTERVALSP14B3), length.out = length(x10INTERVALSP14B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP14B3
}

# Create new variable TRIALS according to interval
LISTP14[[3]]$INTERVALS <- cut(LISTP14[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP14B4<-c(PERCENTAGEP14$B4T1,PERCENTAGEP14$B4T2,PERCENTAGEP14$B4T3,PERCENTAGEP14$B4T4,PERCENTAGEP14$B4T5, max_valueP14B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP14B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP14B4 <- unique(x10INTERVALSP14B4)
  x10INTERVALSP14B4 <- sort(x10INTERVALSP14B4)
  breaks <- seq(min(x10INTERVALSP14B4), max(x10INTERVALSP14B4), length.out = length(x10INTERVALSP14B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP14B4
}

# Create new variable TRIALS according to interval
LISTP14[[4]]$INTERVALS <- cut(LISTP14[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP14B5<-c(PERCENTAGEP14$B5T1,PERCENTAGEP14$B5T2,PERCENTAGEP14$B5T3,PERCENTAGEP14$B5T4,PERCENTAGEP14$B5T5, max_valueP14B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP14B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP14B5 <- unique(x10INTERVALSP14B5)
  x10INTERVALSP14B5 <- sort(x10INTERVALSP14B5)
  breaks <- seq(min(x10INTERVALSP14B5), max(x10INTERVALSP14B5), length.out = length(x10INTERVALSP14B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP14B5
}

# Create new variable TRIALS according to interval
LISTP14[[5]]$INTERVALS <- cut(LISTP14[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP14B6<-c(PERCENTAGEP14$B6T1,PERCENTAGEP14$B6T2,PERCENTAGEP14$B6T3,PERCENTAGEP14$B6T4,PERCENTAGEP14$B6T5, max_valueP14B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP14B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP14B6 <- unique(x10INTERVALSP14B6)
  x10INTERVALSP14B6 <- sort(x10INTERVALSP14B6)
  breaks <- seq(min(x10INTERVALSP14B6), max(x10INTERVALSP14B6), length.out = length(x10INTERVALSP14B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP14B6
}

# Create new variable TRIALS according to interval
LISTP14[[6]]$INTERVALS <- cut(LISTP14[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP14B7<-c(PERCENTAGEP14$B7T1,PERCENTAGEP14$B7T2,PERCENTAGEP14$B7T3,PERCENTAGEP14$B7T4,PERCENTAGEP14$B7T5, max_valueP14B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP14B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP14B7 <- unique(x10INTERVALSP14B7)
  x10INTERVALSP14B7 <- sort(x10INTERVALSP14B7)
  breaks <- seq(min(x10INTERVALSP14B7), max(x10INTERVALSP14B7), length.out = length(x10INTERVALSP14B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP14B7
}

# Create new variable TRIALS according to interval
LISTP14[[7]]$INTERVALS <- cut(LISTP14[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP14B8<-c(PERCENTAGEP14$B8T1,PERCENTAGEP14$B8T2,PERCENTAGEP14$B8T3,PERCENTAGEP14$B8T4,PERCENTAGEP14$B8T5, max_valueP14B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP14B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP14B8 <- unique(x10INTERVALSP14B8)
  x10INTERVALSP14B8 <- sort(x10INTERVALSP14B8)
  breaks <- seq(min(x10INTERVALSP14B8), max(x10INTERVALSP14B8), length.out = length(x10INTERVALSP14B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP14B8
}

# Create new variable TRIALS according to interval
LISTP14[[8]]$INTERVALS <- cut(LISTP14[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP14B9<-c(PERCENTAGEP14$B9T1,PERCENTAGEP14$B9T2,PERCENTAGEP14$B9T3,PERCENTAGEP14$B9T4,PERCENTAGEP14$B9T5, max_valueP14B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP14B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP14B9 <- unique(x10INTERVALSP14B9)
  x10INTERVALSP14B9 <- sort(x10INTERVALSP14B9)
  breaks <- seq(min(x10INTERVALSP14B9), max(x10INTERVALSP14B9), length.out = length(x10INTERVALSP14B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP14B9
}

# Create new variable TRIALS according to interval
LISTP14[[9]]$INTERVALS <- cut(LISTP14[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP14B10<-c(PERCENTAGEP14$B10T1,PERCENTAGEP14$B10T2,PERCENTAGEP14$B10T3,PERCENTAGEP14$B10T4,PERCENTAGEP14$B10T5, max_valueP14B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP14B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP14B10 <- unique(x10INTERVALSP14B10)
  x10INTERVALSP14B10 <- sort(x10INTERVALSP14B10)
  breaks <- seq(min(x10INTERVALSP14B10), max(x10INTERVALSP14B10), length.out = length(x10INTERVALSP14B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP14B10
}

# Create new variable TRIALS according to interval
LISTP14[[10]]$INTERVALS <- cut(LISTP14[[10]]$TIME, breaks = breaks, labels = FALSE)
#P15
#B1
x10INTERVALSP15B1<-c(PERCENTAGEP15$B1T1,PERCENTAGEP15$B1T2,PERCENTAGEP15$B1T3,PERCENTAGEP15$B1T4,PERCENTAGEP15$B1T5, max_valueP15B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP15B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP15B1 <- unique(x10INTERVALSP15B1)
  x10INTERVALSP15B1 <- sort(x10INTERVALSP15B1)
  breaks <- seq(min(x10INTERVALSP15B1), max(x10INTERVALSP15B1), length.out = length(x10INTERVALSP15B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP15B1
}

# Create new variable TRIALS according to interval
LISTP15[[1]]$INTERVALS <- cut(LISTP15[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP15B2<-c(PERCENTAGEP15$B2T1,PERCENTAGEP15$B2T2,PERCENTAGEP15$B2T3,PERCENTAGEP15$B2T4,PERCENTAGEP15$B2T5, max_valueP15B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP15B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP15B2 <- unique(x10INTERVALSP15B2)
  x10INTERVALSP15B2 <- sort(x10INTERVALSP15B2)
  breaks <- seq(min(x10INTERVALSP15B2), max(x10INTERVALSP15B2), length.out = length(x10INTERVALSP15B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP15B2
}

# Create new variable TRIALS according to interval
LISTP15[[2]]$INTERVALS <- cut(LISTP15[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP15B3<-c(PERCENTAGEP15$B3T1,PERCENTAGEP15$B3T2,PERCENTAGEP15$B3T3,PERCENTAGEP15$B3T4,PERCENTAGEP15$B3T5, max_valueP15B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP15B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP15B3 <- unique(x10INTERVALSP15B3)
  x10INTERVALSP15B3 <- sort(x10INTERVALSP15B3)
  breaks <- seq(min(x10INTERVALSP15B3), max(x10INTERVALSP15B3), length.out = length(x10INTERVALSP15B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP15B3
}

# Create new variable TRIALS according to interval
LISTP15[[3]]$INTERVALS <- cut(LISTP15[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP15B4<-c(PERCENTAGEP15$B4T1,PERCENTAGEP15$B4T2,PERCENTAGEP15$B4T3,PERCENTAGEP15$B4T4,PERCENTAGEP15$B4T5, max_valueP15B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP15B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP15B4 <- unique(x10INTERVALSP15B4)
  x10INTERVALSP15B4 <- sort(x10INTERVALSP15B4)
  breaks <- seq(min(x10INTERVALSP15B4), max(x10INTERVALSP15B4), length.out = length(x10INTERVALSP15B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP15B4
}

# Create new variable TRIALS according to interval
LISTP15[[4]]$INTERVALS <- cut(LISTP15[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP15B5<-c(PERCENTAGEP15$B5T1,PERCENTAGEP15$B5T2,PERCENTAGEP15$B5T3,PERCENTAGEP15$B5T4,PERCENTAGEP15$B5T5, max_valueP15B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP15B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP15B5 <- unique(x10INTERVALSP15B5)
  x10INTERVALSP15B5 <- sort(x10INTERVALSP15B5)
  breaks <- seq(min(x10INTERVALSP15B5), max(x10INTERVALSP15B5), length.out = length(x10INTERVALSP15B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP15B5
}

# Create new variable TRIALS according to interval
LISTP15[[5]]$INTERVALS <- cut(LISTP15[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP15B6<-c(PERCENTAGEP15$B6T1,PERCENTAGEP15$B6T2,PERCENTAGEP15$B6T3,PERCENTAGEP15$B6T4,PERCENTAGEP15$B6T5, max_valueP15B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP15B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP15B6 <- unique(x10INTERVALSP15B6)
  x10INTERVALSP15B6 <- sort(x10INTERVALSP15B6)
  breaks <- seq(min(x10INTERVALSP15B6), max(x10INTERVALSP15B6), length.out = length(x10INTERVALSP15B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP15B6
}

# Create new variable TRIALS according to interval
LISTP15[[6]]$INTERVALS <- cut(LISTP15[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP15B7<-c(PERCENTAGEP15$B7T1,PERCENTAGEP15$B7T2,PERCENTAGEP15$B7T3,PERCENTAGEP15$B7T4,PERCENTAGEP15$B7T5, max_valueP15B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP15B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP15B7 <- unique(x10INTERVALSP15B7)
  x10INTERVALSP15B7 <- sort(x10INTERVALSP15B7)
  breaks <- seq(min(x10INTERVALSP15B7), max(x10INTERVALSP15B7), length.out = length(x10INTERVALSP15B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP15B7
}

# Create new variable TRIALS according to interval
LISTP15[[7]]$INTERVALS <- cut(LISTP15[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP15B8<-c(PERCENTAGEP15$B8T1,PERCENTAGEP15$B8T2,PERCENTAGEP15$B8T3,PERCENTAGEP15$B8T4,PERCENTAGEP15$B8T5, max_valueP15B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP15B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP15B8 <- unique(x10INTERVALSP15B8)
  x10INTERVALSP15B8 <- sort(x10INTERVALSP15B8)
  breaks <- seq(min(x10INTERVALSP15B8), max(x10INTERVALSP15B8), length.out = length(x10INTERVALSP15B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP15B8
}

# Create new variable TRIALS according to interval
LISTP15[[8]]$INTERVALS <- cut(LISTP15[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP15B9<-c(PERCENTAGEP15$B9T1,PERCENTAGEP15$B9T2,PERCENTAGEP15$B9T3,PERCENTAGEP15$B9T4,PERCENTAGEP15$B9T5, max_valueP15B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP15B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP15B9 <- unique(x10INTERVALSP15B9)
  x10INTERVALSP15B9 <- sort(x10INTERVALSP15B9)
  breaks <- seq(min(x10INTERVALSP15B9), max(x10INTERVALSP15B9), length.out = length(x10INTERVALSP15B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP15B9
}

# Create new variable TRIALS according to interval
LISTP15[[9]]$INTERVALS <- cut(LISTP15[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP15B10<-c(PERCENTAGEP15$B10T1,PERCENTAGEP15$B10T2,PERCENTAGEP15$B10T3,PERCENTAGEP15$B10T4,PERCENTAGEP15$B10T5, max_valueP15B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP15B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP15B10 <- unique(x10INTERVALSP15B10)
  x10INTERVALSP15B10 <- sort(x10INTERVALSP15B10)
  breaks <- seq(min(x10INTERVALSP15B10), max(x10INTERVALSP15B10), length.out = length(x10INTERVALSP15B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP15B10
}

# Create new variable TRIALS according to interval
LISTP15[[10]]$INTERVALS <- cut(LISTP15[[10]]$TIME, breaks = breaks, labels = FALSE)
#P16
#B1
x10INTERVALSP16B1<-c(PERCENTAGEP16$B1T1,PERCENTAGEP16$B1T2,PERCENTAGEP16$B1T3,PERCENTAGEP16$B1T4,PERCENTAGEP16$B1T5, max_valueP16B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP16B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP16B1 <- unique(x10INTERVALSP16B1)
  x10INTERVALSP16B1 <- sort(x10INTERVALSP16B1)
  breaks <- seq(min(x10INTERVALSP16B1), max(x10INTERVALSP16B1), length.out = length(x10INTERVALSP16B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP16B1
}

# Create new variable TRIALS according to interval
LISTP16[[1]]$INTERVALS <- cut(LISTP16[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP16B2<-c(PERCENTAGEP16$B2T1,PERCENTAGEP16$B2T2,PERCENTAGEP16$B2T3,PERCENTAGEP16$B2T4,PERCENTAGEP16$B2T5, max_valueP16B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP16B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP16B2 <- unique(x10INTERVALSP16B2)
  x10INTERVALSP16B2 <- sort(x10INTERVALSP16B2)
  breaks <- seq(min(x10INTERVALSP16B2), max(x10INTERVALSP16B2), length.out = length(x10INTERVALSP16B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP16B2
}

# Create new variable TRIALS according to interval
LISTP16[[2]]$INTERVALS <- cut(LISTP16[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP16B3<-c(PERCENTAGEP16$B3T1,PERCENTAGEP16$B3T2,PERCENTAGEP16$B3T3,PERCENTAGEP16$B3T4,PERCENTAGEP16$B3T5, max_valueP16B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP16B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP16B3 <- unique(x10INTERVALSP16B3)
  x10INTERVALSP16B3 <- sort(x10INTERVALSP16B3)
  breaks <- seq(min(x10INTERVALSP16B3), max(x10INTERVALSP16B3), length.out = length(x10INTERVALSP16B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP16B3
}

# Create new variable TRIALS according to interval
LISTP16[[3]]$INTERVALS <- cut(LISTP16[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP16B4<-c(PERCENTAGEP16$B4T1,PERCENTAGEP16$B4T2,PERCENTAGEP16$B4T3,PERCENTAGEP16$B4T4,PERCENTAGEP16$B4T5, max_valueP16B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP16B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP16B4 <- unique(x10INTERVALSP16B4)
  x10INTERVALSP16B4 <- sort(x10INTERVALSP16B4)
  breaks <- seq(min(x10INTERVALSP16B4), max(x10INTERVALSP16B4), length.out = length(x10INTERVALSP16B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP16B4
}

# Create new variable TRIALS according to interval
LISTP16[[4]]$INTERVALS <- cut(LISTP16[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP16B5<-c(PERCENTAGEP16$B5T1,PERCENTAGEP16$B5T2,PERCENTAGEP16$B5T3,PERCENTAGEP16$B5T4,PERCENTAGEP16$B5T5, max_valueP16B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP16B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP16B5 <- unique(x10INTERVALSP16B5)
  x10INTERVALSP16B5 <- sort(x10INTERVALSP16B5)
  breaks <- seq(min(x10INTERVALSP16B5), max(x10INTERVALSP16B5), length.out = length(x10INTERVALSP16B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP16B5
}

# Create new variable TRIALS according to interval
LISTP16[[5]]$INTERVALS <- cut(LISTP16[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP16B6<-c(PERCENTAGEP16$B6T1,PERCENTAGEP16$B6T2,PERCENTAGEP16$B6T3,PERCENTAGEP16$B6T4,PERCENTAGEP16$B6T5, max_valueP16B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP16B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP16B6 <- unique(x10INTERVALSP16B6)
  x10INTERVALSP16B6 <- sort(x10INTERVALSP16B6)
  breaks <- seq(min(x10INTERVALSP16B6), max(x10INTERVALSP16B6), length.out = length(x10INTERVALSP16B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP16B6
}

# Create new variable TRIALS according to interval
LISTP16[[6]]$INTERVALS <- cut(LISTP16[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP16B7<-c(PERCENTAGEP16$B7T1,PERCENTAGEP16$B7T2,PERCENTAGEP16$B7T3,PERCENTAGEP16$B7T4,PERCENTAGEP16$B7T5, max_valueP16B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP16B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP16B7 <- unique(x10INTERVALSP16B7)
  x10INTERVALSP16B7 <- sort(x10INTERVALSP16B7)
  breaks <- seq(min(x10INTERVALSP16B7), max(x10INTERVALSP16B7), length.out = length(x10INTERVALSP16B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP16B7
}

# Create new variable TRIALS according to interval
LISTP16[[7]]$INTERVALS <- cut(LISTP16[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP16B8<-c(PERCENTAGEP16$B8T1,PERCENTAGEP16$B8T2,PERCENTAGEP16$B8T3,PERCENTAGEP16$B8T4,PERCENTAGEP16$B8T5, max_valueP16B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP16B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP16B8 <- unique(x10INTERVALSP16B8)
  x10INTERVALSP16B8 <- sort(x10INTERVALSP16B8)
  breaks <- seq(min(x10INTERVALSP16B8), max(x10INTERVALSP16B8), length.out = length(x10INTERVALSP16B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP16B8
}

# Create new variable TRIALS according to interval
LISTP16[[8]]$INTERVALS <- cut(LISTP16[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP16B9<-c(PERCENTAGEP16$B9T1,PERCENTAGEP16$B9T2,PERCENTAGEP16$B9T3,PERCENTAGEP16$B9T4,PERCENTAGEP16$B9T5, max_valueP16B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP16B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP16B9 <- unique(x10INTERVALSP16B9)
  x10INTERVALSP16B9 <- sort(x10INTERVALSP16B9)
  breaks <- seq(min(x10INTERVALSP16B9), max(x10INTERVALSP16B9), length.out = length(x10INTERVALSP16B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP16B9
}

# Create new variable TRIALS according to interval
LISTP16[[9]]$INTERVALS <- cut(LISTP16[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP16B10<-c(PERCENTAGEP16$B10T1,PERCENTAGEP16$B10T2,PERCENTAGEP16$B10T3,PERCENTAGEP16$B10T4,PERCENTAGEP16$B10T5, max_valueP16B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP16B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP16B10 <- unique(x10INTERVALSP16B10)
  x10INTERVALSP16B10 <- sort(x10INTERVALSP16B10)
  breaks <- seq(min(x10INTERVALSP16B10), max(x10INTERVALSP16B10), length.out = length(x10INTERVALSP16B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP16B10
}

# Create new variable TRIALS according to interval
LISTP16[[10]]$INTERVALS <- cut(LISTP16[[10]]$TIME, breaks = breaks, labels = FALSE)
#P17
#B1
x10INTERVALSP17B1<-c(PERCENTAGEP17$B1T1,PERCENTAGEP17$B1T2,PERCENTAGEP17$B1T3,PERCENTAGEP17$B1T4,PERCENTAGEP17$B1T5, max_valueP17B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP17B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP17B1 <- unique(x10INTERVALSP17B1)
  x10INTERVALSP17B1 <- sort(x10INTERVALSP17B1)
  breaks <- seq(min(x10INTERVALSP17B1), max(x10INTERVALSP17B1), length.out = length(x10INTERVALSP17B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP17B1
}

# Create new variable TRIALS according to interval
LISTP17[[1]]$INTERVALS <- cut(LISTP17[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP17B2<-c(PERCENTAGEP17$B2T1,PERCENTAGEP17$B2T2,PERCENTAGEP17$B2T3,PERCENTAGEP17$B2T4,PERCENTAGEP17$B2T5, max_valueP17B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP17B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP17B2 <- unique(x10INTERVALSP17B2)
  x10INTERVALSP17B2 <- sort(x10INTERVALSP17B2)
  breaks <- seq(min(x10INTERVALSP17B2), max(x10INTERVALSP17B2), length.out = length(x10INTERVALSP17B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP17B2
}

# Create new variable TRIALS according to interval
LISTP17[[2]]$INTERVALS <- cut(LISTP17[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP17B3<-c(PERCENTAGEP17$B3T1,PERCENTAGEP17$B3T2,PERCENTAGEP17$B3T3,PERCENTAGEP17$B3T4,PERCENTAGEP17$B3T5, max_valueP17B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP17B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP17B3 <- unique(x10INTERVALSP17B3)
  x10INTERVALSP17B3 <- sort(x10INTERVALSP17B3)
  breaks <- seq(min(x10INTERVALSP17B3), max(x10INTERVALSP17B3), length.out = length(x10INTERVALSP17B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP17B3
}

# Create new variable TRIALS according to interval
LISTP17[[3]]$INTERVALS <- cut(LISTP17[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP17B4<-c(PERCENTAGEP17$B4T1,PERCENTAGEP17$B4T2,PERCENTAGEP17$B4T3,PERCENTAGEP17$B4T4,PERCENTAGEP17$B4T5, max_valueP17B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP17B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP17B4 <- unique(x10INTERVALSP17B4)
  x10INTERVALSP17B4 <- sort(x10INTERVALSP17B4)
  breaks <- seq(min(x10INTERVALSP17B4), max(x10INTERVALSP17B4), length.out = length(x10INTERVALSP17B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP17B4
}

# Create new variable TRIALS according to interval
LISTP17[[4]]$INTERVALS <- cut(LISTP17[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP17B5<-c(PERCENTAGEP17$B5T1,PERCENTAGEP17$B5T2,PERCENTAGEP17$B5T3,PERCENTAGEP17$B5T4,PERCENTAGEP17$B5T5, max_valueP17B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP17B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP17B5 <- unique(x10INTERVALSP17B5)
  x10INTERVALSP17B5 <- sort(x10INTERVALSP17B5)
  breaks <- seq(min(x10INTERVALSP17B5), max(x10INTERVALSP17B5), length.out = length(x10INTERVALSP17B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP17B5
}

# Create new variable TRIALS according to interval
LISTP17[[5]]$INTERVALS <- cut(LISTP17[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP17B6<-c(PERCENTAGEP17$B6T1,PERCENTAGEP17$B6T2,PERCENTAGEP17$B6T3,PERCENTAGEP17$B6T4,PERCENTAGEP17$B6T5, max_valueP17B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP17B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP17B6 <- unique(x10INTERVALSP17B6)
  x10INTERVALSP17B6 <- sort(x10INTERVALSP17B6)
  breaks <- seq(min(x10INTERVALSP17B6), max(x10INTERVALSP17B6), length.out = length(x10INTERVALSP17B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP17B6
}

# Create new variable TRIALS according to interval
LISTP17[[6]]$INTERVALS <- cut(LISTP17[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP17B7<-c(PERCENTAGEP17$B7T1,PERCENTAGEP17$B7T2,PERCENTAGEP17$B7T3,PERCENTAGEP17$B7T4,PERCENTAGEP17$B7T5, max_valueP17B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP17B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP17B7 <- unique(x10INTERVALSP17B7)
  x10INTERVALSP17B7 <- sort(x10INTERVALSP17B7)
  breaks <- seq(min(x10INTERVALSP17B7), max(x10INTERVALSP17B7), length.out = length(x10INTERVALSP17B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP17B7
}

# Create new variable TRIALS according to interval
LISTP17[[7]]$INTERVALS <- cut(LISTP17[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP17B8<-c(PERCENTAGEP17$B8T1,PERCENTAGEP17$B8T2,PERCENTAGEP17$B8T3,PERCENTAGEP17$B8T4,PERCENTAGEP17$B8T5, max_valueP17B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP17B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP17B8 <- unique(x10INTERVALSP17B8)
  x10INTERVALSP17B8 <- sort(x10INTERVALSP17B8)
  breaks <- seq(min(x10INTERVALSP17B8), max(x10INTERVALSP17B8), length.out = length(x10INTERVALSP17B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP17B8
}

# Create new variable TRIALS according to interval
LISTP17[[8]]$INTERVALS <- cut(LISTP17[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP17B9<-c(PERCENTAGEP17$B9T1,PERCENTAGEP17$B9T2,PERCENTAGEP17$B9T3,PERCENTAGEP17$B9T4,PERCENTAGEP17$B9T5, max_valueP17B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP17B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP17B9 <- unique(x10INTERVALSP17B9)
  x10INTERVALSP17B9 <- sort(x10INTERVALSP17B9)
  breaks <- seq(min(x10INTERVALSP17B9), max(x10INTERVALSP17B9), length.out = length(x10INTERVALSP17B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP17B9
}

# Create new variable TRIALS according to interval
LISTP17[[9]]$INTERVALS <- cut(LISTP17[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP17B10<-c(PERCENTAGEP17$B10T1,PERCENTAGEP17$B10T2,PERCENTAGEP17$B10T3,PERCENTAGEP17$B10T4,PERCENTAGEP17$B10T5, max_valueP17B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP17B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP17B10 <- unique(x10INTERVALSP17B10)
  x10INTERVALSP17B10 <- sort(x10INTERVALSP17B10)
  breaks <- seq(min(x10INTERVALSP17B10), max(x10INTERVALSP17B10), length.out = length(x10INTERVALSP17B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP17B10
}

# Create new variable TRIALS according to interval
LISTP17[[10]]$INTERVALS <- cut(LISTP17[[10]]$TIME, breaks = breaks, labels = FALSE)
#P18
#B1
x10INTERVALSP18B1<-c(PERCENTAGEP18$B1T1,PERCENTAGEP18$B1T2,PERCENTAGEP18$B1T3,PERCENTAGEP18$B1T4,PERCENTAGEP18$B1T5, max_valueP18B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP18B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP18B1 <- unique(x10INTERVALSP18B1)
  x10INTERVALSP18B1 <- sort(x10INTERVALSP18B1)
  breaks <- seq(min(x10INTERVALSP18B1), max(x10INTERVALSP18B1), length.out = length(x10INTERVALSP18B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP18B1
}

# Create new variable TRIALS according to interval
LISTP18[[1]]$INTERVALS <- cut(LISTP18[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP18B2<-c(PERCENTAGEP18$B2T1,PERCENTAGEP18$B2T2,PERCENTAGEP18$B2T3,PERCENTAGEP18$B2T4,PERCENTAGEP18$B2T5, max_valueP18B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP18B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP18B2 <- unique(x10INTERVALSP18B2)
  x10INTERVALSP18B2 <- sort(x10INTERVALSP18B2)
  breaks <- seq(min(x10INTERVALSP18B2), max(x10INTERVALSP18B2), length.out = length(x10INTERVALSP18B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP18B2
}

# Create new variable TRIALS according to interval
LISTP18[[2]]$INTERVALS <- cut(LISTP18[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP18B3<-c(PERCENTAGEP18$B3T1,PERCENTAGEP18$B3T2,PERCENTAGEP18$B3T3,PERCENTAGEP18$B3T4,PERCENTAGEP18$B3T5, max_valueP18B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP18B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP18B3 <- unique(x10INTERVALSP18B3)
  x10INTERVALSP18B3 <- sort(x10INTERVALSP18B3)
  breaks <- seq(min(x10INTERVALSP18B3), max(x10INTERVALSP18B3), length.out = length(x10INTERVALSP18B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP18B3
}

# Create new variable TRIALS according to interval
LISTP18[[3]]$INTERVALS <- cut(LISTP18[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP18B4<-c(PERCENTAGEP18$B4T1,PERCENTAGEP18$B4T2,PERCENTAGEP18$B4T3,PERCENTAGEP18$B4T4,PERCENTAGEP18$B4T5, max_valueP18B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP18B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP18B4 <- unique(x10INTERVALSP18B4)
  x10INTERVALSP18B4 <- sort(x10INTERVALSP18B4)
  breaks <- seq(min(x10INTERVALSP18B4), max(x10INTERVALSP18B4), length.out = length(x10INTERVALSP18B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP18B4
}

# Create new variable TRIALS according to interval
LISTP18[[4]]$INTERVALS <- cut(LISTP18[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP18B5<-c(PERCENTAGEP18$B5T1,PERCENTAGEP18$B5T2,PERCENTAGEP18$B5T3,PERCENTAGEP18$B5T4,PERCENTAGEP18$B5T5, max_valueP18B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP18B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP18B5 <- unique(x10INTERVALSP18B5)
  x10INTERVALSP18B5 <- sort(x10INTERVALSP18B5)
  breaks <- seq(min(x10INTERVALSP18B5), max(x10INTERVALSP18B5), length.out = length(x10INTERVALSP18B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP18B5
}

# Create new variable TRIALS according to interval
LISTP18[[5]]$INTERVALS <- cut(LISTP18[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP18B6<-c(PERCENTAGEP18$B6T1,PERCENTAGEP18$B6T2,PERCENTAGEP18$B6T3,PERCENTAGEP18$B6T4,PERCENTAGEP18$B6T5, max_valueP18B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP18B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP18B6 <- unique(x10INTERVALSP18B6)
  x10INTERVALSP18B6 <- sort(x10INTERVALSP18B6)
  breaks <- seq(min(x10INTERVALSP18B6), max(x10INTERVALSP18B6), length.out = length(x10INTERVALSP18B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP18B6
}

# Create new variable TRIALS according to interval
LISTP18[[6]]$INTERVALS <- cut(LISTP18[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP18B7<-c(PERCENTAGEP18$B7T1,PERCENTAGEP18$B7T2,PERCENTAGEP18$B7T3,PERCENTAGEP18$B7T4,PERCENTAGEP18$B7T5, max_valueP18B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP18B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP18B7 <- unique(x10INTERVALSP18B7)
  x10INTERVALSP18B7 <- sort(x10INTERVALSP18B7)
  breaks <- seq(min(x10INTERVALSP18B7), max(x10INTERVALSP18B7), length.out = length(x10INTERVALSP18B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP18B7
}

# Create new variable TRIALS according to interval
LISTP18[[7]]$INTERVALS <- cut(LISTP18[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP18B8<-c(PERCENTAGEP18$B8T1,PERCENTAGEP18$B8T2,PERCENTAGEP18$B8T3,PERCENTAGEP18$B8T4,PERCENTAGEP18$B8T5, max_valueP18B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP18B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP18B8 <- unique(x10INTERVALSP18B8)
  x10INTERVALSP18B8 <- sort(x10INTERVALSP18B8)
  breaks <- seq(min(x10INTERVALSP18B8), max(x10INTERVALSP18B8), length.out = length(x10INTERVALSP18B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP18B8
}

# Create new variable TRIALS according to interval
LISTP18[[8]]$INTERVALS <- cut(LISTP18[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP18B9<-c(PERCENTAGEP18$B9T1,PERCENTAGEP18$B9T2,PERCENTAGEP18$B9T3,PERCENTAGEP18$B9T4,PERCENTAGEP18$B9T5, max_valueP18B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP18B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP18B9 <- unique(x10INTERVALSP18B9)
  x10INTERVALSP18B9 <- sort(x10INTERVALSP18B9)
  breaks <- seq(min(x10INTERVALSP18B9), max(x10INTERVALSP18B9), length.out = length(x10INTERVALSP18B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP18B9
}

# Create new variable TRIALS according to interval
LISTP18[[9]]$INTERVALS <- cut(LISTP18[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP18B10<-c(PERCENTAGEP18$B10T1,PERCENTAGEP18$B10T2,PERCENTAGEP18$B10T3,PERCENTAGEP18$B10T4,PERCENTAGEP18$B10T5, max_valueP18B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP18B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP18B10 <- unique(x10INTERVALSP18B10)
  x10INTERVALSP18B10 <- sort(x10INTERVALSP18B10)
  breaks <- seq(min(x10INTERVALSP18B10), max(x10INTERVALSP18B10), length.out = length(x10INTERVALSP18B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP18B10
}

# Create new variable TRIALS according to interval
LISTP18[[10]]$INTERVALS <- cut(LISTP18[[10]]$TIME, breaks = breaks, labels = FALSE)
#P19
#B1
x10INTERVALSP19B1<-c(PERCENTAGEP19$B1T1,PERCENTAGEP19$B1T2,PERCENTAGEP19$B1T3,PERCENTAGEP19$B1T4,PERCENTAGEP19$B1T5, max_valueP19B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP19B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP19B1 <- unique(x10INTERVALSP19B1)
  x10INTERVALSP19B1 <- sort(x10INTERVALSP19B1)
  breaks <- seq(min(x10INTERVALSP19B1), max(x10INTERVALSP19B1), length.out = length(x10INTERVALSP19B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP19B1
}

# Create new variable TRIALS according to interval
LISTP19[[1]]$INTERVALS <- cut(LISTP19[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP19B2<-c(PERCENTAGEP19$B2T1,PERCENTAGEP19$B2T2,PERCENTAGEP19$B2T3,PERCENTAGEP19$B2T4,PERCENTAGEP19$B2T5, max_valueP19B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP19B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP19B2 <- unique(x10INTERVALSP19B2)
  x10INTERVALSP19B2 <- sort(x10INTERVALSP19B2)
  breaks <- seq(min(x10INTERVALSP19B2), max(x10INTERVALSP19B2), length.out = length(x10INTERVALSP19B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP19B2
}

# Create new variable TRIALS according to interval
LISTP19[[2]]$INTERVALS <- cut(LISTP19[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP19B3<-c(PERCENTAGEP19$B3T1,PERCENTAGEP19$B3T2,PERCENTAGEP19$B3T3,PERCENTAGEP19$B3T4,PERCENTAGEP19$B3T5, max_valueP19B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP19B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP19B3 <- unique(x10INTERVALSP19B3)
  x10INTERVALSP19B3 <- sort(x10INTERVALSP19B3)
  breaks <- seq(min(x10INTERVALSP19B3), max(x10INTERVALSP19B3), length.out = length(x10INTERVALSP19B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP19B3
}

# Create new variable TRIALS according to interval
LISTP19[[3]]$INTERVALS <- cut(LISTP19[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP19B4<-c(PERCENTAGEP19$B4T1,PERCENTAGEP19$B4T2,PERCENTAGEP19$B4T3,PERCENTAGEP19$B4T4,PERCENTAGEP19$B4T5, max_valueP19B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP19B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP19B4 <- unique(x10INTERVALSP19B4)
  x10INTERVALSP19B4 <- sort(x10INTERVALSP19B4)
  breaks <- seq(min(x10INTERVALSP19B4), max(x10INTERVALSP19B4), length.out = length(x10INTERVALSP19B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP19B4
}

# Create new variable TRIALS according to interval
LISTP19[[4]]$INTERVALS <- cut(LISTP19[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP19B5<-c(PERCENTAGEP19$B5T1,PERCENTAGEP19$B5T2,PERCENTAGEP19$B5T3,PERCENTAGEP19$B5T4,PERCENTAGEP19$B5T5, max_valueP19B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP19B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP19B5 <- unique(x10INTERVALSP19B5)
  x10INTERVALSP19B5 <- sort(x10INTERVALSP19B5)
  breaks <- seq(min(x10INTERVALSP19B5), max(x10INTERVALSP19B5), length.out = length(x10INTERVALSP19B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP19B5
}

# Create new variable TRIALS according to interval
LISTP19[[5]]$INTERVALS <- cut(LISTP19[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP19B6<-c(PERCENTAGEP19$B6T1,PERCENTAGEP19$B6T2,PERCENTAGEP19$B6T3,PERCENTAGEP19$B6T4,PERCENTAGEP19$B6T5, max_valueP19B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP19B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP19B6 <- unique(x10INTERVALSP19B6)
  x10INTERVALSP19B6 <- sort(x10INTERVALSP19B6)
  breaks <- seq(min(x10INTERVALSP19B6), max(x10INTERVALSP19B6), length.out = length(x10INTERVALSP19B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP19B6
}

# Create new variable TRIALS according to interval
LISTP19[[6]]$INTERVALS <- cut(LISTP19[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP19B7<-c(PERCENTAGEP19$B7T1,PERCENTAGEP19$B7T2,PERCENTAGEP19$B7T3,PERCENTAGEP19$B7T4,PERCENTAGEP19$B7T5, max_valueP19B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP19B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP19B7 <- unique(x10INTERVALSP19B7)
  x10INTERVALSP19B7 <- sort(x10INTERVALSP19B7)
  breaks <- seq(min(x10INTERVALSP19B7), max(x10INTERVALSP19B7), length.out = length(x10INTERVALSP19B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP19B7
}

# Create new variable TRIALS according to interval
LISTP19[[7]]$INTERVALS <- cut(LISTP19[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP19B8<-c(PERCENTAGEP19$B8T1,PERCENTAGEP19$B8T2,PERCENTAGEP19$B8T3,PERCENTAGEP19$B8T4,PERCENTAGEP19$B8T5, max_valueP19B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP19B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP19B8 <- unique(x10INTERVALSP19B8)
  x10INTERVALSP19B8 <- sort(x10INTERVALSP19B8)
  breaks <- seq(min(x10INTERVALSP19B8), max(x10INTERVALSP19B8), length.out = length(x10INTERVALSP19B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP19B8
}

# Create new variable TRIALS according to interval
LISTP19[[8]]$INTERVALS <- cut(LISTP19[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP19B9<-c(PERCENTAGEP19$B9T1,PERCENTAGEP19$B9T2,PERCENTAGEP19$B9T3,PERCENTAGEP19$B9T4,PERCENTAGEP19$B9T5, max_valueP19B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP19B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP19B9 <- unique(x10INTERVALSP19B9)
  x10INTERVALSP19B9 <- sort(x10INTERVALSP19B9)
  breaks <- seq(min(x10INTERVALSP19B9), max(x10INTERVALSP19B9), length.out = length(x10INTERVALSP19B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP19B9
}

# Create new variable TRIALS according to interval
LISTP19[[9]]$INTERVALS <- cut(LISTP19[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP19B10<-c(PERCENTAGEP19$B10T1,PERCENTAGEP19$B10T2,PERCENTAGEP19$B10T3,PERCENTAGEP19$B10T4,PERCENTAGEP19$B10T5, max_valueP19B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP19B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP19B10 <- unique(x10INTERVALSP19B10)
  x10INTERVALSP19B10 <- sort(x10INTERVALSP19B10)
  breaks <- seq(min(x10INTERVALSP19B10), max(x10INTERVALSP19B10), length.out = length(x10INTERVALSP19B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP19B10
}

# Create new variable TRIALS according to interval
LISTP19[[10]]$INTERVALS <- cut(LISTP19[[10]]$TIME, breaks = breaks, labels = FALSE)
#P20
#B1
x10INTERVALSP20B1<-c(PERCENTAGEP20$B1T1,PERCENTAGEP20$B1T2,PERCENTAGEP20$B1T3,PERCENTAGEP20$B1T4,PERCENTAGEP20$B1T5, max_valueP20B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP20B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP20B1 <- unique(x10INTERVALSP20B1)
  x10INTERVALSP20B1 <- sort(x10INTERVALSP20B1)
  breaks <- seq(min(x10INTERVALSP20B1), max(x10INTERVALSP20B1), length.out = length(x10INTERVALSP20B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP20B1
}

# Create new variable TRIALS according to interval
LISTP20[[1]]$INTERVALS <- cut(LISTP20[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP20B2<-c(PERCENTAGEP20$B2T1,PERCENTAGEP20$B2T2,PERCENTAGEP20$B2T3,PERCENTAGEP20$B2T4,PERCENTAGEP20$B2T5, max_valueP20B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP20B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP20B2 <- unique(x10INTERVALSP20B2)
  x10INTERVALSP20B2 <- sort(x10INTERVALSP20B2)
  breaks <- seq(min(x10INTERVALSP20B2), max(x10INTERVALSP20B2), length.out = length(x10INTERVALSP20B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP20B2
}

# Create new variable TRIALS according to interval
LISTP20[[2]]$INTERVALS <- cut(LISTP20[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP20B3<-c(PERCENTAGEP20$B3T1,PERCENTAGEP20$B3T2,PERCENTAGEP20$B3T3,PERCENTAGEP20$B3T4,PERCENTAGEP20$B3T5, max_valueP20B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP20B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP20B3 <- unique(x10INTERVALSP20B3)
  x10INTERVALSP20B3 <- sort(x10INTERVALSP20B3)
  breaks <- seq(min(x10INTERVALSP20B3), max(x10INTERVALSP20B3), length.out = length(x10INTERVALSP20B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP20B3
}

# Create new variable TRIALS according to interval
LISTP20[[3]]$INTERVALS <- cut(LISTP20[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP20B4<-c(PERCENTAGEP20$B4T1,PERCENTAGEP20$B4T2,PERCENTAGEP20$B4T3,PERCENTAGEP20$B4T4,PERCENTAGEP20$B4T5, max_valueP20B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP20B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP20B4 <- unique(x10INTERVALSP20B4)
  x10INTERVALSP20B4 <- sort(x10INTERVALSP20B4)
  breaks <- seq(min(x10INTERVALSP20B4), max(x10INTERVALSP20B4), length.out = length(x10INTERVALSP20B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP20B4
}

# Create new variable TRIALS according to interval
LISTP20[[4]]$INTERVALS <- cut(LISTP20[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP20B5<-c(PERCENTAGEP20$B5T1,PERCENTAGEP20$B5T2,PERCENTAGEP20$B5T3,PERCENTAGEP20$B5T4,PERCENTAGEP20$B5T5, max_valueP20B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP20B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP20B5 <- unique(x10INTERVALSP20B5)
  x10INTERVALSP20B5 <- sort(x10INTERVALSP20B5)
  breaks <- seq(min(x10INTERVALSP20B5), max(x10INTERVALSP20B5), length.out = length(x10INTERVALSP20B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP20B5
}

# Create new variable TRIALS according to interval
LISTP20[[5]]$INTERVALS <- cut(LISTP20[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP20B6<-c(PERCENTAGEP20$B6T1,PERCENTAGEP20$B6T2,PERCENTAGEP20$B6T3,PERCENTAGEP20$B6T4,PERCENTAGEP20$B6T5, max_valueP20B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP20B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP20B6 <- unique(x10INTERVALSP20B6)
  x10INTERVALSP20B6 <- sort(x10INTERVALSP20B6)
  breaks <- seq(min(x10INTERVALSP20B6), max(x10INTERVALSP20B6), length.out = length(x10INTERVALSP20B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP20B6
}

# Create new variable TRIALS according to interval
LISTP20[[6]]$INTERVALS <- cut(LISTP20[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP20B7<-c(PERCENTAGEP20$B7T1,PERCENTAGEP20$B7T2,PERCENTAGEP20$B7T3,PERCENTAGEP20$B7T4,PERCENTAGEP20$B7T5, max_valueP20B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP20B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP20B7 <- unique(x10INTERVALSP20B7)
  x10INTERVALSP20B7 <- sort(x10INTERVALSP20B7)
  breaks <- seq(min(x10INTERVALSP20B7), max(x10INTERVALSP20B7), length.out = length(x10INTERVALSP20B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP20B7
}

# Create new variable TRIALS according to interval
LISTP20[[7]]$INTERVALS <- cut(LISTP20[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP20B8<-c(PERCENTAGEP20$B8T1,PERCENTAGEP20$B8T2,PERCENTAGEP20$B8T3,PERCENTAGEP20$B8T4,PERCENTAGEP20$B8T5, max_valueP20B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP20B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP20B8 <- unique(x10INTERVALSP20B8)
  x10INTERVALSP20B8 <- sort(x10INTERVALSP20B8)
  breaks <- seq(min(x10INTERVALSP20B8), max(x10INTERVALSP20B8), length.out = length(x10INTERVALSP20B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP20B8
}

# Create new variable TRIALS according to interval
LISTP20[[8]]$INTERVALS <- cut(LISTP20[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP20B9<-c(PERCENTAGEP20$B9T1,PERCENTAGEP20$B9T2,PERCENTAGEP20$B9T3,PERCENTAGEP20$B9T4,PERCENTAGEP20$B9T5, max_valueP20B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP20B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP20B9 <- unique(x10INTERVALSP20B9)
  x10INTERVALSP20B9 <- sort(x10INTERVALSP20B9)
  breaks <- seq(min(x10INTERVALSP20B9), max(x10INTERVALSP20B9), length.out = length(x10INTERVALSP20B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP20B9
}

# Create new variable TRIALS according to interval
LISTP20[[9]]$INTERVALS <- cut(LISTP20[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP20B10<-c(PERCENTAGEP20$B10T1,PERCENTAGEP20$B10T2,PERCENTAGEP20$B10T3,PERCENTAGEP20$B10T4,PERCENTAGEP20$B10T5, max_valueP20B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP20B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP20B10 <- unique(x10INTERVALSP20B10)
  x10INTERVALSP20B10 <- sort(x10INTERVALSP20B10)
  breaks <- seq(min(x10INTERVALSP20B10), max(x10INTERVALSP20B10), length.out = length(x10INTERVALSP20B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP20B10
}

# Create new variable TRIALS according to interval
LISTP20[[10]]$INTERVALS <- cut(LISTP20[[10]]$TIME, breaks = breaks, labels = FALSE)
#P21
#B1
x10INTERVALSP21B1<-c(PERCENTAGEP21$B1T1,PERCENTAGEP21$B1T2,PERCENTAGEP21$B1T3,PERCENTAGEP21$B1T4,PERCENTAGEP21$B1T5, max_valueP21B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP21B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP21B1 <- unique(x10INTERVALSP21B1)
  x10INTERVALSP21B1 <- sort(x10INTERVALSP21B1)
  breaks <- seq(min(x10INTERVALSP21B1), max(x10INTERVALSP21B1), length.out = length(x10INTERVALSP21B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP21B1
}

# Create new variable TRIALS according to interval
LISTP21[[1]]$INTERVALS <- cut(LISTP21[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP21B2<-c(PERCENTAGEP21$B2T1,PERCENTAGEP21$B2T2,PERCENTAGEP21$B2T3,PERCENTAGEP21$B2T4,PERCENTAGEP21$B2T5, max_valueP21B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP21B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP21B2 <- unique(x10INTERVALSP21B2)
  x10INTERVALSP21B2 <- sort(x10INTERVALSP21B2)
  breaks <- seq(min(x10INTERVALSP21B2), max(x10INTERVALSP21B2), length.out = length(x10INTERVALSP21B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP21B2
}

# Create new variable TRIALS according to interval
LISTP21[[2]]$INTERVALS <- cut(LISTP21[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP21B3<-c(PERCENTAGEP21$B3T1,PERCENTAGEP21$B3T2,PERCENTAGEP21$B3T3,PERCENTAGEP21$B3T4,PERCENTAGEP21$B3T5, max_valueP21B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP21B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP21B3 <- unique(x10INTERVALSP21B3)
  x10INTERVALSP21B3 <- sort(x10INTERVALSP21B3)
  breaks <- seq(min(x10INTERVALSP21B3), max(x10INTERVALSP21B3), length.out = length(x10INTERVALSP21B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP21B3
}

# Create new variable TRIALS according to interval
LISTP21[[3]]$INTERVALS <- cut(LISTP21[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP21B4<-c(PERCENTAGEP21$B4T1,PERCENTAGEP21$B4T2,PERCENTAGEP21$B4T3,PERCENTAGEP21$B4T4,PERCENTAGEP21$B4T5, max_valueP21B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP21B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP21B4 <- unique(x10INTERVALSP21B4)
  x10INTERVALSP21B4 <- sort(x10INTERVALSP21B4)
  breaks <- seq(min(x10INTERVALSP21B4), max(x10INTERVALSP21B4), length.out = length(x10INTERVALSP21B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP21B4
}

# Create new variable TRIALS according to interval
LISTP21[[4]]$INTERVALS <- cut(LISTP21[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP21B5<-c(PERCENTAGEP21$B5T1,PERCENTAGEP21$B5T2,PERCENTAGEP21$B5T3,PERCENTAGEP21$B5T4,PERCENTAGEP21$B5T5, max_valueP21B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP21B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP21B5 <- unique(x10INTERVALSP21B5)
  x10INTERVALSP21B5 <- sort(x10INTERVALSP21B5)
  breaks <- seq(min(x10INTERVALSP21B5), max(x10INTERVALSP21B5), length.out = length(x10INTERVALSP21B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP21B5
}

# Create new variable TRIALS according to interval
LISTP21[[5]]$INTERVALS <- cut(LISTP21[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP21B6<-c(PERCENTAGEP21$B6T1,PERCENTAGEP21$B6T2,PERCENTAGEP21$B6T3,PERCENTAGEP21$B6T4,PERCENTAGEP21$B6T5, max_valueP21B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP21B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP21B6 <- unique(x10INTERVALSP21B6)
  x10INTERVALSP21B6 <- sort(x10INTERVALSP21B6)
  breaks <- seq(min(x10INTERVALSP21B6), max(x10INTERVALSP21B6), length.out = length(x10INTERVALSP21B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP21B6
}

# Create new variable TRIALS according to interval
LISTP21[[6]]$INTERVALS <- cut(LISTP21[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP21B7<-c(PERCENTAGEP21$B7T1,PERCENTAGEP21$B7T2,PERCENTAGEP21$B7T3,PERCENTAGEP21$B7T4,PERCENTAGEP21$B7T5, max_valueP21B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP21B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP21B7 <- unique(x10INTERVALSP21B7)
  x10INTERVALSP21B7 <- sort(x10INTERVALSP21B7)
  breaks <- seq(min(x10INTERVALSP21B7), max(x10INTERVALSP21B7), length.out = length(x10INTERVALSP21B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP21B7
}

# Create new variable TRIALS according to interval
LISTP21[[7]]$INTERVALS <- cut(LISTP21[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP21B8<-c(PERCENTAGEP21$B8T1,PERCENTAGEP21$B8T2,PERCENTAGEP21$B8T3,PERCENTAGEP21$B8T4,PERCENTAGEP21$B8T5, max_valueP21B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP21B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP21B8 <- unique(x10INTERVALSP21B8)
  x10INTERVALSP21B8 <- sort(x10INTERVALSP21B8)
  breaks <- seq(min(x10INTERVALSP21B8), max(x10INTERVALSP21B8), length.out = length(x10INTERVALSP21B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP21B8
}

# Create new variable TRIALS according to interval
LISTP21[[8]]$INTERVALS <- cut(LISTP21[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP21B9<-c(PERCENTAGEP21$B9T1,PERCENTAGEP21$B9T2,PERCENTAGEP21$B9T3,PERCENTAGEP21$B9T4,PERCENTAGEP21$B9T5, max_valueP21B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP21B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP21B9 <- unique(x10INTERVALSP21B9)
  x10INTERVALSP21B9 <- sort(x10INTERVALSP21B9)
  breaks <- seq(min(x10INTERVALSP21B9), max(x10INTERVALSP21B9), length.out = length(x10INTERVALSP21B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP21B9
}

# Create new variable TRIALS according to interval
LISTP21[[9]]$INTERVALS <- cut(LISTP21[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP21B10<-c(PERCENTAGEP21$B10T1,PERCENTAGEP21$B10T2,PERCENTAGEP21$B10T3,PERCENTAGEP21$B10T4,PERCENTAGEP21$B10T5, max_valueP21B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP21B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP21B10 <- unique(x10INTERVALSP21B10)
  x10INTERVALSP21B10 <- sort(x10INTERVALSP21B10)
  breaks <- seq(min(x10INTERVALSP21B10), max(x10INTERVALSP21B10), length.out = length(x10INTERVALSP21B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP21B10
}

# Create new variable TRIALS according to interval
LISTP21[[10]]$INTERVALS <- cut(LISTP21[[10]]$TIME, breaks = breaks, labels = FALSE)
#P22
#B1
x10INTERVALSP22B1<-c(PERCENTAGEP22$B1T1,PERCENTAGEP22$B1T2,PERCENTAGEP22$B1T3,PERCENTAGEP22$B1T4,PERCENTAGEP22$B1T5, max_valueP22B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP22B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP22B1 <- unique(x10INTERVALSP22B1)
  x10INTERVALSP22B1 <- sort(x10INTERVALSP22B1)
  breaks <- seq(min(x10INTERVALSP22B1), max(x10INTERVALSP22B1), length.out = length(x10INTERVALSP22B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP22B1
}

# Create new variable TRIALS according to interval
LISTP22[[1]]$INTERVALS <- cut(LISTP22[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP22B2<-c(PERCENTAGEP22$B2T1,PERCENTAGEP22$B2T2,PERCENTAGEP22$B2T3,PERCENTAGEP22$B2T4,PERCENTAGEP22$B2T5, max_valueP22B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP22B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP22B2 <- unique(x10INTERVALSP22B2)
  x10INTERVALSP22B2 <- sort(x10INTERVALSP22B2)
  breaks <- seq(min(x10INTERVALSP22B2), max(x10INTERVALSP22B2), length.out = length(x10INTERVALSP22B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP22B2
}

# Create new variable TRIALS according to interval
LISTP22[[2]]$INTERVALS <- cut(LISTP22[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP22B3<-c(PERCENTAGEP22$B3T1,PERCENTAGEP22$B3T2,PERCENTAGEP22$B3T3,PERCENTAGEP22$B3T4,PERCENTAGEP22$B3T5, max_valueP22B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP22B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP22B3 <- unique(x10INTERVALSP22B3)
  x10INTERVALSP22B3 <- sort(x10INTERVALSP22B3)
  breaks <- seq(min(x10INTERVALSP22B3), max(x10INTERVALSP22B3), length.out = length(x10INTERVALSP22B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP22B3
}

# Create new variable TRIALS according to interval
LISTP22[[3]]$INTERVALS <- cut(LISTP22[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP22B4<-c(PERCENTAGEP22$B4T1,PERCENTAGEP22$B4T2,PERCENTAGEP22$B4T3,PERCENTAGEP22$B4T4,PERCENTAGEP22$B4T5, max_valueP22B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP22B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP22B4 <- unique(x10INTERVALSP22B4)
  x10INTERVALSP22B4 <- sort(x10INTERVALSP22B4)
  breaks <- seq(min(x10INTERVALSP22B4), max(x10INTERVALSP22B4), length.out = length(x10INTERVALSP22B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP22B4
}

# Create new variable TRIALS according to interval
LISTP22[[4]]$INTERVALS <- cut(LISTP22[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP22B5<-c(PERCENTAGEP22$B5T1,PERCENTAGEP22$B5T2,PERCENTAGEP22$B5T3,PERCENTAGEP22$B5T4,PERCENTAGEP22$B5T5, max_valueP22B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP22B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP22B5 <- unique(x10INTERVALSP22B5)
  x10INTERVALSP22B5 <- sort(x10INTERVALSP22B5)
  breaks <- seq(min(x10INTERVALSP22B5), max(x10INTERVALSP22B5), length.out = length(x10INTERVALSP22B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP22B5
}

# Create new variable TRIALS according to interval
LISTP22[[5]]$INTERVALS <- cut(LISTP22[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP22B6<-c(PERCENTAGEP22$B6T1,PERCENTAGEP22$B6T2,PERCENTAGEP22$B6T3,PERCENTAGEP22$B6T4,PERCENTAGEP22$B6T5, max_valueP22B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP22B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP22B6 <- unique(x10INTERVALSP22B6)
  x10INTERVALSP22B6 <- sort(x10INTERVALSP22B6)
  breaks <- seq(min(x10INTERVALSP22B6), max(x10INTERVALSP22B6), length.out = length(x10INTERVALSP22B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP22B6
}

# Create new variable TRIALS according to interval
LISTP22[[6]]$INTERVALS <- cut(LISTP22[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP22B7<-c(PERCENTAGEP22$B7T1,PERCENTAGEP22$B7T2,PERCENTAGEP22$B7T3,PERCENTAGEP22$B7T4,PERCENTAGEP22$B7T5, max_valueP22B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP22B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP22B7 <- unique(x10INTERVALSP22B7)
  x10INTERVALSP22B7 <- sort(x10INTERVALSP22B7)
  breaks <- seq(min(x10INTERVALSP22B7), max(x10INTERVALSP22B7), length.out = length(x10INTERVALSP22B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP22B7
}

# Create new variable TRIALS according to interval
LISTP22[[7]]$INTERVALS <- cut(LISTP22[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP22B8<-c(PERCENTAGEP22$B8T1,PERCENTAGEP22$B8T2,PERCENTAGEP22$B8T3,PERCENTAGEP22$B8T4,PERCENTAGEP22$B8T5, max_valueP22B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP22B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP22B8 <- unique(x10INTERVALSP22B8)
  x10INTERVALSP22B8 <- sort(x10INTERVALSP22B8)
  breaks <- seq(min(x10INTERVALSP22B8), max(x10INTERVALSP22B8), length.out = length(x10INTERVALSP22B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP22B8
}

# Create new variable TRIALS according to interval
LISTP22[[8]]$INTERVALS <- cut(LISTP22[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP22B9<-c(PERCENTAGEP22$B9T1,PERCENTAGEP22$B9T2,PERCENTAGEP22$B9T3,PERCENTAGEP22$B9T4,PERCENTAGEP22$B9T5, max_valueP22B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP22B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP22B9 <- unique(x10INTERVALSP22B9)
  x10INTERVALSP22B9 <- sort(x10INTERVALSP22B9)
  breaks <- seq(min(x10INTERVALSP22B9), max(x10INTERVALSP22B9), length.out = length(x10INTERVALSP22B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP22B9
}

# Create new variable TRIALS according to interval
LISTP22[[9]]$INTERVALS <- cut(LISTP22[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP22B10<-c(PERCENTAGEP22$B10T1,PERCENTAGEP22$B10T2,PERCENTAGEP22$B10T3,PERCENTAGEP22$B10T4,PERCENTAGEP22$B10T5, max_valueP22B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP22B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP22B10 <- unique(x10INTERVALSP22B10)
  x10INTERVALSP22B10 <- sort(x10INTERVALSP22B10)
  breaks <- seq(min(x10INTERVALSP22B10), max(x10INTERVALSP22B10), length.out = length(x10INTERVALSP22B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP22B10
}

# Create new variable TRIALS according to interval
LISTP22[[10]]$INTERVALS <- cut(LISTP22[[10]]$TIME, breaks = breaks, labels = FALSE)
#P23
#B1
x10INTERVALSP23B1<-c(PERCENTAGEP23$B1T1,PERCENTAGEP23$B1T2,PERCENTAGEP23$B1T3,PERCENTAGEP23$B1T4,PERCENTAGEP23$B1T5, max_valueP23B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP23B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP23B1 <- unique(x10INTERVALSP23B1)
  x10INTERVALSP23B1 <- sort(x10INTERVALSP23B1)
  breaks <- seq(min(x10INTERVALSP23B1), max(x10INTERVALSP23B1), length.out = length(x10INTERVALSP23B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP23B1
}

# Create new variable TRIALS according to interval
LISTP23[[1]]$INTERVALS <- cut(LISTP23[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP23B2<-c(PERCENTAGEP23$B2T1,PERCENTAGEP23$B2T2,PERCENTAGEP23$B2T3,PERCENTAGEP23$B2T4,PERCENTAGEP23$B2T5, max_valueP23B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP23B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP23B2 <- unique(x10INTERVALSP23B2)
  x10INTERVALSP23B2 <- sort(x10INTERVALSP23B2)
  breaks <- seq(min(x10INTERVALSP23B2), max(x10INTERVALSP23B2), length.out = length(x10INTERVALSP23B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP23B2
}

# Create new variable TRIALS according to interval
LISTP23[[2]]$INTERVALS <- cut(LISTP23[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP23B3<-c(PERCENTAGEP23$B3T1,PERCENTAGEP23$B3T2,PERCENTAGEP23$B3T3,PERCENTAGEP23$B3T4,PERCENTAGEP23$B3T5, max_valueP23B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP23B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP23B3 <- unique(x10INTERVALSP23B3)
  x10INTERVALSP23B3 <- sort(x10INTERVALSP23B3)
  breaks <- seq(min(x10INTERVALSP23B3), max(x10INTERVALSP23B3), length.out = length(x10INTERVALSP23B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP23B3
}

# Create new variable TRIALS according to interval
LISTP23[[3]]$INTERVALS <- cut(LISTP23[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP23B4<-c(PERCENTAGEP23$B4T1,PERCENTAGEP23$B4T2,PERCENTAGEP23$B4T3,PERCENTAGEP23$B4T4,PERCENTAGEP23$B4T5, max_valueP23B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP23B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP23B4 <- unique(x10INTERVALSP23B4)
  x10INTERVALSP23B4 <- sort(x10INTERVALSP23B4)
  breaks <- seq(min(x10INTERVALSP23B4), max(x10INTERVALSP23B4), length.out = length(x10INTERVALSP23B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP23B4
}

# Create new variable TRIALS according to interval
LISTP23[[4]]$INTERVALS <- cut(LISTP23[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP23B5<-c(PERCENTAGEP23$B5T1,PERCENTAGEP23$B5T2,PERCENTAGEP23$B5T3,PERCENTAGEP23$B5T4,PERCENTAGEP23$B5T5, max_valueP23B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP23B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP23B5 <- unique(x10INTERVALSP23B5)
  x10INTERVALSP23B5 <- sort(x10INTERVALSP23B5)
  breaks <- seq(min(x10INTERVALSP23B5), max(x10INTERVALSP23B5), length.out = length(x10INTERVALSP23B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP23B5
}

# Create new variable TRIALS according to interval
LISTP23[[5]]$INTERVALS <- cut(LISTP23[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP23B6<-c(PERCENTAGEP23$B6T1,PERCENTAGEP23$B6T2,PERCENTAGEP23$B6T3,PERCENTAGEP23$B6T4,PERCENTAGEP23$B6T5, max_valueP23B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP23B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP23B6 <- unique(x10INTERVALSP23B6)
  x10INTERVALSP23B6 <- sort(x10INTERVALSP23B6)
  breaks <- seq(min(x10INTERVALSP23B6), max(x10INTERVALSP23B6), length.out = length(x10INTERVALSP23B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP23B6
}

# Create new variable TRIALS according to interval
LISTP23[[6]]$INTERVALS <- cut(LISTP23[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP23B7<-c(PERCENTAGEP23$B7T1,PERCENTAGEP23$B7T2,PERCENTAGEP23$B7T3,PERCENTAGEP23$B7T4,PERCENTAGEP23$B7T5, max_valueP23B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP23B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP23B7 <- unique(x10INTERVALSP23B7)
  x10INTERVALSP23B7 <- sort(x10INTERVALSP23B7)
  breaks <- seq(min(x10INTERVALSP23B7), max(x10INTERVALSP23B7), length.out = length(x10INTERVALSP23B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP23B7
}

# Create new variable TRIALS according to interval
LISTP23[[7]]$INTERVALS <- cut(LISTP23[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP23B8<-c(PERCENTAGEP23$B8T1,PERCENTAGEP23$B8T2,PERCENTAGEP23$B8T3,PERCENTAGEP23$B8T4,PERCENTAGEP23$B8T5, max_valueP23B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP23B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP23B8 <- unique(x10INTERVALSP23B8)
  x10INTERVALSP23B8 <- sort(x10INTERVALSP23B8)
  breaks <- seq(min(x10INTERVALSP23B8), max(x10INTERVALSP23B8), length.out = length(x10INTERVALSP23B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP23B8
}

# Create new variable TRIALS according to interval
LISTP23[[8]]$INTERVALS <- cut(LISTP23[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP23B9<-c(PERCENTAGEP23$B9T1,PERCENTAGEP23$B9T2,PERCENTAGEP23$B9T3,PERCENTAGEP23$B9T4,PERCENTAGEP23$B9T5, max_valueP23B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP23B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP23B9 <- unique(x10INTERVALSP23B9)
  x10INTERVALSP23B9 <- sort(x10INTERVALSP23B9)
  breaks <- seq(min(x10INTERVALSP23B9), max(x10INTERVALSP23B9), length.out = length(x10INTERVALSP23B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP23B9
}

# Create new variable TRIALS according to interval
LISTP23[[9]]$INTERVALS <- cut(LISTP23[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP23B10<-c(PERCENTAGEP23$B10T1,PERCENTAGEP23$B10T2,PERCENTAGEP23$B10T3,PERCENTAGEP23$B10T4,PERCENTAGEP23$B10T5, max_valueP23B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP23B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP23B10 <- unique(x10INTERVALSP23B10)
  x10INTERVALSP23B10 <- sort(x10INTERVALSP23B10)
  breaks <- seq(min(x10INTERVALSP23B10), max(x10INTERVALSP23B10), length.out = length(x10INTERVALSP23B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP23B10
}

# Create new variable TRIALS according to interval
LISTP23[[10]]$INTERVALS <- cut(LISTP23[[10]]$TIME, breaks = breaks, labels = FALSE)
#P24
#B1
x10INTERVALSP24B1<-c(PERCENTAGEP24$B1T1,PERCENTAGEP24$B1T2,PERCENTAGEP24$B1T3,PERCENTAGEP24$B1T4,PERCENTAGEP24$B1T5, max_valueP24B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP24B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP24B1 <- unique(x10INTERVALSP24B1)
  x10INTERVALSP24B1 <- sort(x10INTERVALSP24B1)
  breaks <- seq(min(x10INTERVALSP24B1), max(x10INTERVALSP24B1), length.out = length(x10INTERVALSP24B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP24B1
}

# Create new variable TRIALS according to interval
LISTP24[[1]]$INTERVALS <- cut(LISTP24[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP24B2<-c(PERCENTAGEP24$B2T1,PERCENTAGEP24$B2T2,PERCENTAGEP24$B2T3,PERCENTAGEP24$B2T4,PERCENTAGEP24$B2T5, max_valueP24B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP24B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP24B2 <- unique(x10INTERVALSP24B2)
  x10INTERVALSP24B2 <- sort(x10INTERVALSP24B2)
  breaks <- seq(min(x10INTERVALSP24B2), max(x10INTERVALSP24B2), length.out = length(x10INTERVALSP24B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP24B2
}

# Create new variable TRIALS according to interval
LISTP24[[2]]$INTERVALS <- cut(LISTP24[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP24B3<-c(PERCENTAGEP24$B3T1,PERCENTAGEP24$B3T2,PERCENTAGEP24$B3T3,PERCENTAGEP24$B3T4,PERCENTAGEP24$B3T5, max_valueP24B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP24B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP24B3 <- unique(x10INTERVALSP24B3)
  x10INTERVALSP24B3 <- sort(x10INTERVALSP24B3)
  breaks <- seq(min(x10INTERVALSP24B3), max(x10INTERVALSP24B3), length.out = length(x10INTERVALSP24B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP24B3
}

# Create new variable TRIALS according to interval
LISTP24[[3]]$INTERVALS <- cut(LISTP24[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP24B4<-c(PERCENTAGEP24$B4T1,PERCENTAGEP24$B4T2,PERCENTAGEP24$B4T3,PERCENTAGEP24$B4T4,PERCENTAGEP24$B4T5, max_valueP24B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP24B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP24B4 <- unique(x10INTERVALSP24B4)
  x10INTERVALSP24B4 <- sort(x10INTERVALSP24B4)
  breaks <- seq(min(x10INTERVALSP24B4), max(x10INTERVALSP24B4), length.out = length(x10INTERVALSP24B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP24B4
}

# Create new variable TRIALS according to interval
LISTP24[[4]]$INTERVALS <- cut(LISTP24[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP24B5<-c(PERCENTAGEP24$B5T1,PERCENTAGEP24$B5T2,PERCENTAGEP24$B5T3,PERCENTAGEP24$B5T4,PERCENTAGEP24$B5T5, max_valueP24B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP24B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP24B5 <- unique(x10INTERVALSP24B5)
  x10INTERVALSP24B5 <- sort(x10INTERVALSP24B5)
  breaks <- seq(min(x10INTERVALSP24B5), max(x10INTERVALSP24B5), length.out = length(x10INTERVALSP24B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP24B5
}

# Create new variable TRIALS according to interval
LISTP24[[5]]$INTERVALS <- cut(LISTP24[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP24B6<-c(PERCENTAGEP24$B6T1,PERCENTAGEP24$B6T2,PERCENTAGEP24$B6T3,PERCENTAGEP24$B6T4,PERCENTAGEP24$B6T5, max_valueP24B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP24B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP24B6 <- unique(x10INTERVALSP24B6)
  x10INTERVALSP24B6 <- sort(x10INTERVALSP24B6)
  breaks <- seq(min(x10INTERVALSP24B6), max(x10INTERVALSP24B6), length.out = length(x10INTERVALSP24B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP24B6
}

# Create new variable TRIALS according to interval
LISTP24[[6]]$INTERVALS <- cut(LISTP24[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP24B7<-c(PERCENTAGEP24$B7T1,PERCENTAGEP24$B7T2,PERCENTAGEP24$B7T3,PERCENTAGEP24$B7T4,PERCENTAGEP24$B7T5, max_valueP24B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP24B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP24B7 <- unique(x10INTERVALSP24B7)
  x10INTERVALSP24B7 <- sort(x10INTERVALSP24B7)
  breaks <- seq(min(x10INTERVALSP24B7), max(x10INTERVALSP24B7), length.out = length(x10INTERVALSP24B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP24B7
}

# Create new variable TRIALS according to interval
LISTP24[[7]]$INTERVALS <- cut(LISTP24[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP24B8<-c(PERCENTAGEP24$B8T1,PERCENTAGEP24$B8T2,PERCENTAGEP24$B8T3,PERCENTAGEP24$B8T4,PERCENTAGEP24$B8T5, max_valueP24B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP24B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP24B8 <- unique(x10INTERVALSP24B8)
  x10INTERVALSP24B8 <- sort(x10INTERVALSP24B8)
  breaks <- seq(min(x10INTERVALSP24B8), max(x10INTERVALSP24B8), length.out = length(x10INTERVALSP24B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP24B8
}

# Create new variable TRIALS according to interval
LISTP24[[8]]$INTERVALS <- cut(LISTP24[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP24B9<-c(PERCENTAGEP24$B9T1,PERCENTAGEP24$B9T2,PERCENTAGEP24$B9T3,PERCENTAGEP24$B9T4,PERCENTAGEP24$B9T5, max_valueP24B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP24B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP24B9 <- unique(x10INTERVALSP24B9)
  x10INTERVALSP24B9 <- sort(x10INTERVALSP24B9)
  breaks <- seq(min(x10INTERVALSP24B9), max(x10INTERVALSP24B9), length.out = length(x10INTERVALSP24B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP24B9
}

# Create new variable TRIALS according to interval
LISTP24[[9]]$INTERVALS <- cut(LISTP24[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP24B10<-c(PERCENTAGEP24$B10T1,PERCENTAGEP24$B10T2,PERCENTAGEP24$B10T3,PERCENTAGEP24$B10T4,PERCENTAGEP24$B10T5, max_valueP24B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP24B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP24B10 <- unique(x10INTERVALSP24B10)
  x10INTERVALSP24B10 <- sort(x10INTERVALSP24B10)
  breaks <- seq(min(x10INTERVALSP24B10), max(x10INTERVALSP24B10), length.out = length(x10INTERVALSP24B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP24B10
}

# Create new variable TRIALS according to interval
LISTP24[[10]]$INTERVALS <- cut(LISTP24[[10]]$TIME, breaks = breaks, labels = FALSE)
#P25
#B1
x10INTERVALSP25B1<-c(PERCENTAGEP25$B1T1,PERCENTAGEP25$B1T2,PERCENTAGEP25$B1T3,PERCENTAGEP25$B1T4,PERCENTAGEP25$B1T5, max_valueP25B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP25B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP25B1 <- unique(x10INTERVALSP25B1)
  x10INTERVALSP25B1 <- sort(x10INTERVALSP25B1)
  breaks <- seq(min(x10INTERVALSP25B1), max(x10INTERVALSP25B1), length.out = length(x10INTERVALSP25B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP25B1
}

# Create new variable TRIALS according to interval
LISTP25[[1]]$INTERVALS <- cut(LISTP25[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP25B2<-c(PERCENTAGEP25$B2T1,PERCENTAGEP25$B2T2,PERCENTAGEP25$B2T3,PERCENTAGEP25$B2T4,PERCENTAGEP25$B2T5, max_valueP25B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP25B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP25B2 <- unique(x10INTERVALSP25B2)
  x10INTERVALSP25B2 <- sort(x10INTERVALSP25B2)
  breaks <- seq(min(x10INTERVALSP25B2), max(x10INTERVALSP25B2), length.out = length(x10INTERVALSP25B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP25B2
}

# Create new variable TRIALS according to interval
LISTP25[[2]]$INTERVALS <- cut(LISTP25[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP25B3<-c(PERCENTAGEP25$B3T1,PERCENTAGEP25$B3T2,PERCENTAGEP25$B3T3,PERCENTAGEP25$B3T4,PERCENTAGEP25$B3T5, max_valueP25B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP25B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP25B3 <- unique(x10INTERVALSP25B3)
  x10INTERVALSP25B3 <- sort(x10INTERVALSP25B3)
  breaks <- seq(min(x10INTERVALSP25B3), max(x10INTERVALSP25B3), length.out = length(x10INTERVALSP25B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP25B3
}

# Create new variable TRIALS according to interval
LISTP25[[3]]$INTERVALS <- cut(LISTP25[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP25B4<-c(PERCENTAGEP25$B4T1,PERCENTAGEP25$B4T2,PERCENTAGEP25$B4T3,PERCENTAGEP25$B4T4,PERCENTAGEP25$B4T5, max_valueP25B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP25B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP25B4 <- unique(x10INTERVALSP25B4)
  x10INTERVALSP25B4 <- sort(x10INTERVALSP25B4)
  breaks <- seq(min(x10INTERVALSP25B4), max(x10INTERVALSP25B4), length.out = length(x10INTERVALSP25B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP25B4
}

# Create new variable TRIALS according to interval
LISTP25[[4]]$INTERVALS <- cut(LISTP25[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP25B5<-c(PERCENTAGEP25$B5T1,PERCENTAGEP25$B5T2,PERCENTAGEP25$B5T3,PERCENTAGEP25$B5T4,PERCENTAGEP25$B5T5, max_valueP25B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP25B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP25B5 <- unique(x10INTERVALSP25B5)
  x10INTERVALSP25B5 <- sort(x10INTERVALSP25B5)
  breaks <- seq(min(x10INTERVALSP25B5), max(x10INTERVALSP25B5), length.out = length(x10INTERVALSP25B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP25B5
}

# Create new variable TRIALS according to interval
LISTP25[[5]]$INTERVALS <- cut(LISTP25[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP25B6<-c(PERCENTAGEP25$B6T1,PERCENTAGEP25$B6T2,PERCENTAGEP25$B6T3,PERCENTAGEP25$B6T4,PERCENTAGEP25$B6T5, max_valueP25B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP25B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP25B6 <- unique(x10INTERVALSP25B6)
  x10INTERVALSP25B6 <- sort(x10INTERVALSP25B6)
  breaks <- seq(min(x10INTERVALSP25B6), max(x10INTERVALSP25B6), length.out = length(x10INTERVALSP25B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP25B6
}

# Create new variable TRIALS according to interval
LISTP25[[6]]$INTERVALS <- cut(LISTP25[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP25B7<-c(PERCENTAGEP25$B7T1,PERCENTAGEP25$B7T2,PERCENTAGEP25$B7T3,PERCENTAGEP25$B7T4,PERCENTAGEP25$B7T5, max_valueP25B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP25B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP25B7 <- unique(x10INTERVALSP25B7)
  x10INTERVALSP25B7 <- sort(x10INTERVALSP25B7)
  breaks <- seq(min(x10INTERVALSP25B7), max(x10INTERVALSP25B7), length.out = length(x10INTERVALSP25B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP25B7
}

# Create new variable TRIALS according to interval
LISTP25[[7]]$INTERVALS <- cut(LISTP25[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP25B8<-c(PERCENTAGEP25$B8T1,PERCENTAGEP25$B8T2,PERCENTAGEP25$B8T3,PERCENTAGEP25$B8T4,PERCENTAGEP25$B8T5, max_valueP25B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP25B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP25B8 <- unique(x10INTERVALSP25B8)
  x10INTERVALSP25B8 <- sort(x10INTERVALSP25B8)
  breaks <- seq(min(x10INTERVALSP25B8), max(x10INTERVALSP25B8), length.out = length(x10INTERVALSP25B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP25B8
}

# Create new variable TRIALS according to interval
LISTP25[[8]]$INTERVALS <- cut(LISTP25[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP25B9<-c(PERCENTAGEP25$B9T1,PERCENTAGEP25$B9T2,PERCENTAGEP25$B9T3,PERCENTAGEP25$B9T4,PERCENTAGEP25$B9T5, max_valueP25B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP25B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP25B9 <- unique(x10INTERVALSP25B9)
  x10INTERVALSP25B9 <- sort(x10INTERVALSP25B9)
  breaks <- seq(min(x10INTERVALSP25B9), max(x10INTERVALSP25B9), length.out = length(x10INTERVALSP25B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP25B9
}

# Create new variable TRIALS according to interval
LISTP25[[9]]$INTERVALS <- cut(LISTP25[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP25B10<-c(PERCENTAGEP25$B10T1,PERCENTAGEP25$B10T2,PERCENTAGEP25$B10T3,PERCENTAGEP25$B10T4,PERCENTAGEP25$B10T5, max_valueP25B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP25B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP25B10 <- unique(x10INTERVALSP25B10)
  x10INTERVALSP25B10 <- sort(x10INTERVALSP25B10)
  breaks <- seq(min(x10INTERVALSP25B10), max(x10INTERVALSP25B10), length.out = length(x10INTERVALSP25B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP25B10
}

# Create new variable TRIALS according to interval
LISTP25[[10]]$INTERVALS <- cut(LISTP25[[10]]$TIME, breaks = breaks, labels = FALSE)
#P26
#B1
x10INTERVALSP26B1<-c(PERCENTAGEP26$B1T1,PERCENTAGEP26$B1T2,PERCENTAGEP26$B1T3,PERCENTAGEP26$B1T4,PERCENTAGEP26$B1T5, max_valueP26B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP26B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP26B1 <- unique(x10INTERVALSP26B1)
  x10INTERVALSP26B1 <- sort(x10INTERVALSP26B1)
  breaks <- seq(min(x10INTERVALSP26B1), max(x10INTERVALSP26B1), length.out = length(x10INTERVALSP26B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP26B1
}

# Create new variable TRIALS according to interval
LISTP26[[1]]$INTERVALS <- cut(LISTP26[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP26B2<-c(PERCENTAGEP26$B2T1,PERCENTAGEP26$B2T2,PERCENTAGEP26$B2T3,PERCENTAGEP26$B2T4,PERCENTAGEP26$B2T5, max_valueP26B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP26B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP26B2 <- unique(x10INTERVALSP26B2)
  x10INTERVALSP26B2 <- sort(x10INTERVALSP26B2)
  breaks <- seq(min(x10INTERVALSP26B2), max(x10INTERVALSP26B2), length.out = length(x10INTERVALSP26B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP26B2
}

# Create new variable TRIALS according to interval
LISTP26[[2]]$INTERVALS <- cut(LISTP26[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP26B3<-c(PERCENTAGEP26$B3T1,PERCENTAGEP26$B3T2,PERCENTAGEP26$B3T3,PERCENTAGEP26$B3T4,PERCENTAGEP26$B3T5, max_valueP26B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP26B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP26B3 <- unique(x10INTERVALSP26B3)
  x10INTERVALSP26B3 <- sort(x10INTERVALSP26B3)
  breaks <- seq(min(x10INTERVALSP26B3), max(x10INTERVALSP26B3), length.out = length(x10INTERVALSP26B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP26B3
}

# Create new variable TRIALS according to interval
LISTP26[[3]]$INTERVALS <- cut(LISTP26[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP26B4<-c(PERCENTAGEP26$B4T1,PERCENTAGEP26$B4T2,PERCENTAGEP26$B4T3,PERCENTAGEP26$B4T4,PERCENTAGEP26$B4T5, max_valueP26B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP26B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP26B4 <- unique(x10INTERVALSP26B4)
  x10INTERVALSP26B4 <- sort(x10INTERVALSP26B4)
  breaks <- seq(min(x10INTERVALSP26B4), max(x10INTERVALSP26B4), length.out = length(x10INTERVALSP26B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP26B4
}

# Create new variable TRIALS according to interval
LISTP26[[4]]$INTERVALS <- cut(LISTP26[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP26B5<-c(PERCENTAGEP26$B5T1,PERCENTAGEP26$B5T2,PERCENTAGEP26$B5T3,PERCENTAGEP26$B5T4,PERCENTAGEP26$B5T5, max_valueP26B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP26B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP26B5 <- unique(x10INTERVALSP26B5)
  x10INTERVALSP26B5 <- sort(x10INTERVALSP26B5)
  breaks <- seq(min(x10INTERVALSP26B5), max(x10INTERVALSP26B5), length.out = length(x10INTERVALSP26B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP26B5
}

# Create new variable TRIALS according to interval
LISTP26[[5]]$INTERVALS <- cut(LISTP26[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP26B6<-c(PERCENTAGEP26$B6T1,PERCENTAGEP26$B6T2,PERCENTAGEP26$B6T3,PERCENTAGEP26$B6T4,PERCENTAGEP26$B6T5, max_valueP26B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP26B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP26B6 <- unique(x10INTERVALSP26B6)
  x10INTERVALSP26B6 <- sort(x10INTERVALSP26B6)
  breaks <- seq(min(x10INTERVALSP26B6), max(x10INTERVALSP26B6), length.out = length(x10INTERVALSP26B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP26B6
}

# Create new variable TRIALS according to interval
LISTP26[[6]]$INTERVALS <- cut(LISTP26[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP26B7<-c(PERCENTAGEP26$B7T1,PERCENTAGEP26$B7T2,PERCENTAGEP26$B7T3,PERCENTAGEP26$B7T4,PERCENTAGEP26$B7T5, max_valueP26B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP26B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP26B7 <- unique(x10INTERVALSP26B7)
  x10INTERVALSP26B7 <- sort(x10INTERVALSP26B7)
  breaks <- seq(min(x10INTERVALSP26B7), max(x10INTERVALSP26B7), length.out = length(x10INTERVALSP26B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP26B7
}

# Create new variable TRIALS according to interval
LISTP26[[7]]$INTERVALS <- cut(LISTP26[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP26B8<-c(PERCENTAGEP26$B8T1,PERCENTAGEP26$B8T2,PERCENTAGEP26$B8T3,PERCENTAGEP26$B8T4,PERCENTAGEP26$B8T5, max_valueP26B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP26B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP26B8 <- unique(x10INTERVALSP26B8)
  x10INTERVALSP26B8 <- sort(x10INTERVALSP26B8)
  breaks <- seq(min(x10INTERVALSP26B8), max(x10INTERVALSP26B8), length.out = length(x10INTERVALSP26B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP26B8
}

# Create new variable TRIALS according to interval
LISTP26[[8]]$INTERVALS <- cut(LISTP26[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP26B9<-c(PERCENTAGEP26$B9T1,PERCENTAGEP26$B9T2,PERCENTAGEP26$B9T3,PERCENTAGEP26$B9T4,PERCENTAGEP26$B9T5, max_valueP26B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP26B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP26B9 <- unique(x10INTERVALSP26B9)
  x10INTERVALSP26B9 <- sort(x10INTERVALSP26B9)
  breaks <- seq(min(x10INTERVALSP26B9), max(x10INTERVALSP26B9), length.out = length(x10INTERVALSP26B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP26B9
}

# Create new variable TRIALS according to interval
LISTP26[[9]]$INTERVALS <- cut(LISTP26[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP26B10<-c(PERCENTAGEP26$B10T1,PERCENTAGEP26$B10T2,PERCENTAGEP26$B10T3,PERCENTAGEP26$B10T4,PERCENTAGEP26$B10T5, max_valueP26B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP26B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP26B10 <- unique(x10INTERVALSP26B10)
  x10INTERVALSP26B10 <- sort(x10INTERVALSP26B10)
  breaks <- seq(min(x10INTERVALSP26B10), max(x10INTERVALSP26B10), length.out = length(x10INTERVALSP26B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP26B10
}

# Create new variable TRIALS according to interval
LISTP26[[10]]$INTERVALS <- cut(LISTP26[[10]]$TIME, breaks = breaks, labels = FALSE)
#P27
#B1
x10INTERVALSP27B1<-c(PERCENTAGEP27$B1T1,PERCENTAGEP27$B1T2,PERCENTAGEP27$B1T3,PERCENTAGEP27$B1T4,PERCENTAGEP27$B1T5, max_valueP27B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP27B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP27B1 <- unique(x10INTERVALSP27B1)
  x10INTERVALSP27B1 <- sort(x10INTERVALSP27B1)
  breaks <- seq(min(x10INTERVALSP27B1), max(x10INTERVALSP27B1), length.out = length(x10INTERVALSP27B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP27B1
}

# Create new variable TRIALS according to interval
LISTP27[[1]]$INTERVALS <- cut(LISTP27[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP27B2<-c(PERCENTAGEP27$B2T1,PERCENTAGEP27$B2T2,PERCENTAGEP27$B2T3,PERCENTAGEP27$B2T4,PERCENTAGEP27$B2T5, max_valueP27B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP27B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP27B2 <- unique(x10INTERVALSP27B2)
  x10INTERVALSP27B2 <- sort(x10INTERVALSP27B2)
  breaks <- seq(min(x10INTERVALSP27B2), max(x10INTERVALSP27B2), length.out = length(x10INTERVALSP27B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP27B2
}

# Create new variable TRIALS according to interval
LISTP27[[2]]$INTERVALS <- cut(LISTP27[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP27B3<-c(PERCENTAGEP27$B3T1,PERCENTAGEP27$B3T2,PERCENTAGEP27$B3T3,PERCENTAGEP27$B3T4,PERCENTAGEP27$B3T5, max_valueP27B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP27B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP27B3 <- unique(x10INTERVALSP27B3)
  x10INTERVALSP27B3 <- sort(x10INTERVALSP27B3)
  breaks <- seq(min(x10INTERVALSP27B3), max(x10INTERVALSP27B3), length.out = length(x10INTERVALSP27B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP27B3
}

# Create new variable TRIALS according to interval
LISTP27[[3]]$INTERVALS <- cut(LISTP27[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP27B4<-c(PERCENTAGEP27$B4T1,PERCENTAGEP27$B4T2,PERCENTAGEP27$B4T3,PERCENTAGEP27$B4T4,PERCENTAGEP27$B4T5, max_valueP27B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP27B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP27B4 <- unique(x10INTERVALSP27B4)
  x10INTERVALSP27B4 <- sort(x10INTERVALSP27B4)
  breaks <- seq(min(x10INTERVALSP27B4), max(x10INTERVALSP27B4), length.out = length(x10INTERVALSP27B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP27B4
}

# Create new variable TRIALS according to interval
LISTP27[[4]]$INTERVALS <- cut(LISTP27[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP27B5<-c(PERCENTAGEP27$B5T1,PERCENTAGEP27$B5T2,PERCENTAGEP27$B5T3,PERCENTAGEP27$B5T4,PERCENTAGEP27$B5T5, max_valueP27B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP27B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP27B5 <- unique(x10INTERVALSP27B5)
  x10INTERVALSP27B5 <- sort(x10INTERVALSP27B5)
  breaks <- seq(min(x10INTERVALSP27B5), max(x10INTERVALSP27B5), length.out = length(x10INTERVALSP27B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP27B5
}

# Create new variable TRIALS according to interval
LISTP27[[5]]$INTERVALS <- cut(LISTP27[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP27B6<-c(PERCENTAGEP27$B6T1,PERCENTAGEP27$B6T2,PERCENTAGEP27$B6T3,PERCENTAGEP27$B6T4,PERCENTAGEP27$B6T5, max_valueP27B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP27B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP27B6 <- unique(x10INTERVALSP27B6)
  x10INTERVALSP27B6 <- sort(x10INTERVALSP27B6)
  breaks <- seq(min(x10INTERVALSP27B6), max(x10INTERVALSP27B6), length.out = length(x10INTERVALSP27B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP27B6
}

# Create new variable TRIALS according to interval
LISTP27[[6]]$INTERVALS <- cut(LISTP27[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP27B7<-c(PERCENTAGEP27$B7T1,PERCENTAGEP27$B7T2,PERCENTAGEP27$B7T3,PERCENTAGEP27$B7T4,PERCENTAGEP27$B7T5, max_valueP27B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP27B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP27B7 <- unique(x10INTERVALSP27B7)
  x10INTERVALSP27B7 <- sort(x10INTERVALSP27B7)
  breaks <- seq(min(x10INTERVALSP27B7), max(x10INTERVALSP27B7), length.out = length(x10INTERVALSP27B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP27B7
}

# Create new variable TRIALS according to interval
LISTP27[[7]]$INTERVALS <- cut(LISTP27[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP27B8<-c(PERCENTAGEP27$B8T1,PERCENTAGEP27$B8T2,PERCENTAGEP27$B8T3,PERCENTAGEP27$B8T4,PERCENTAGEP27$B8T5, max_valueP27B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP27B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP27B8 <- unique(x10INTERVALSP27B8)
  x10INTERVALSP27B8 <- sort(x10INTERVALSP27B8)
  breaks <- seq(min(x10INTERVALSP27B8), max(x10INTERVALSP27B8), length.out = length(x10INTERVALSP27B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP27B8
}

# Create new variable TRIALS according to interval
LISTP27[[8]]$INTERVALS <- cut(LISTP27[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP27B9<-c(PERCENTAGEP27$B9T1,PERCENTAGEP27$B9T2,PERCENTAGEP27$B9T3,PERCENTAGEP27$B9T4,PERCENTAGEP27$B9T5, max_valueP27B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP27B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP27B9 <- unique(x10INTERVALSP27B9)
  x10INTERVALSP27B9 <- sort(x10INTERVALSP27B9)
  breaks <- seq(min(x10INTERVALSP27B9), max(x10INTERVALSP27B9), length.out = length(x10INTERVALSP27B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP27B9
}

# Create new variable TRIALS according to interval
LISTP27[[9]]$INTERVALS <- cut(LISTP27[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP27B10<-c(PERCENTAGEP27$B10T1,PERCENTAGEP27$B10T2,PERCENTAGEP27$B10T3,PERCENTAGEP27$B10T4,PERCENTAGEP27$B10T5, max_valueP27B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP27B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP27B10 <- unique(x10INTERVALSP27B10)
  x10INTERVALSP27B10 <- sort(x10INTERVALSP27B10)
  breaks <- seq(min(x10INTERVALSP27B10), max(x10INTERVALSP27B10), length.out = length(x10INTERVALSP27B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP27B10
}

# Create new variable TRIALS according to interval
LISTP27[[10]]$INTERVALS <- cut(LISTP27[[10]]$TIME, breaks = breaks, labels = FALSE)
#P28
#B1
x10INTERVALSP28B1<-c(PERCENTAGEP28$B1T1,PERCENTAGEP28$B1T2,PERCENTAGEP28$B1T3,PERCENTAGEP28$B1T4,PERCENTAGEP28$B1T5, max_valueP28B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP28B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP28B1 <- unique(x10INTERVALSP28B1)
  x10INTERVALSP28B1 <- sort(x10INTERVALSP28B1)
  breaks <- seq(min(x10INTERVALSP28B1), max(x10INTERVALSP28B1), length.out = length(x10INTERVALSP28B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP28B1
}

# Create new variable TRIALS according to interval
LISTP28[[1]]$INTERVALS <- cut(LISTP28[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP28B2<-c(PERCENTAGEP28$B2T1,PERCENTAGEP28$B2T2,PERCENTAGEP28$B2T3,PERCENTAGEP28$B2T4,PERCENTAGEP28$B2T5, max_valueP28B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP28B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP28B2 <- unique(x10INTERVALSP28B2)
  x10INTERVALSP28B2 <- sort(x10INTERVALSP28B2)
  breaks <- seq(min(x10INTERVALSP28B2), max(x10INTERVALSP28B2), length.out = length(x10INTERVALSP28B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP28B2
}

# Create new variable TRIALS according to interval
LISTP28[[2]]$INTERVALS <- cut(LISTP28[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP28B3<-c(PERCENTAGEP28$B3T1,PERCENTAGEP28$B3T2,PERCENTAGEP28$B3T3,PERCENTAGEP28$B3T4,PERCENTAGEP28$B3T5, max_valueP28B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP28B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP28B3 <- unique(x10INTERVALSP28B3)
  x10INTERVALSP28B3 <- sort(x10INTERVALSP28B3)
  breaks <- seq(min(x10INTERVALSP28B3), max(x10INTERVALSP28B3), length.out = length(x10INTERVALSP28B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP28B3
}

# Create new variable TRIALS according to interval
LISTP28[[3]]$INTERVALS <- cut(LISTP28[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP28B4<-c(PERCENTAGEP28$B4T1,PERCENTAGEP28$B4T2,PERCENTAGEP28$B4T3,PERCENTAGEP28$B4T4,PERCENTAGEP28$B4T5, max_valueP28B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP28B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP28B4 <- unique(x10INTERVALSP28B4)
  x10INTERVALSP28B4 <- sort(x10INTERVALSP28B4)
  breaks <- seq(min(x10INTERVALSP28B4), max(x10INTERVALSP28B4), length.out = length(x10INTERVALSP28B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP28B4
}

# Create new variable TRIALS according to interval
LISTP28[[4]]$INTERVALS <- cut(LISTP28[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP28B5<-c(PERCENTAGEP28$B5T1,PERCENTAGEP28$B5T2,PERCENTAGEP28$B5T3,PERCENTAGEP28$B5T4,PERCENTAGEP28$B5T5, max_valueP28B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP28B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP28B5 <- unique(x10INTERVALSP28B5)
  x10INTERVALSP28B5 <- sort(x10INTERVALSP28B5)
  breaks <- seq(min(x10INTERVALSP28B5), max(x10INTERVALSP28B5), length.out = length(x10INTERVALSP28B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP28B5
}

# Create new variable TRIALS according to interval
LISTP28[[5]]$INTERVALS <- cut(LISTP28[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP28B6<-c(PERCENTAGEP28$B6T1,PERCENTAGEP28$B6T2,PERCENTAGEP28$B6T3,PERCENTAGEP28$B6T4,PERCENTAGEP28$B6T5, max_valueP28B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP28B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP28B6 <- unique(x10INTERVALSP28B6)
  x10INTERVALSP28B6 <- sort(x10INTERVALSP28B6)
  breaks <- seq(min(x10INTERVALSP28B6), max(x10INTERVALSP28B6), length.out = length(x10INTERVALSP28B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP28B6
}

# Create new variable TRIALS according to interval
LISTP28[[6]]$INTERVALS <- cut(LISTP28[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP28B7<-c(PERCENTAGEP28$B7T1,PERCENTAGEP28$B7T2,PERCENTAGEP28$B7T3,PERCENTAGEP28$B7T4,PERCENTAGEP28$B7T5, max_valueP28B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP28B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP28B7 <- unique(x10INTERVALSP28B7)
  x10INTERVALSP28B7 <- sort(x10INTERVALSP28B7)
  breaks <- seq(min(x10INTERVALSP28B7), max(x10INTERVALSP28B7), length.out = length(x10INTERVALSP28B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP28B7
}

# Create new variable TRIALS according to interval
LISTP28[[7]]$INTERVALS <- cut(LISTP28[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP28B8<-c(PERCENTAGEP28$B8T1,PERCENTAGEP28$B8T2,PERCENTAGEP28$B8T3,PERCENTAGEP28$B8T4,PERCENTAGEP28$B8T5, max_valueP28B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP28B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP28B8 <- unique(x10INTERVALSP28B8)
  x10INTERVALSP28B8 <- sort(x10INTERVALSP28B8)
  breaks <- seq(min(x10INTERVALSP28B8), max(x10INTERVALSP28B8), length.out = length(x10INTERVALSP28B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP28B8
}

# Create new variable TRIALS according to interval
LISTP28[[8]]$INTERVALS <- cut(LISTP28[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP28B9<-c(PERCENTAGEP28$B9T1,PERCENTAGEP28$B9T2,PERCENTAGEP28$B9T3,PERCENTAGEP28$B9T4,PERCENTAGEP28$B9T5, max_valueP28B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP28B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP28B9 <- unique(x10INTERVALSP28B9)
  x10INTERVALSP28B9 <- sort(x10INTERVALSP28B9)
  breaks <- seq(min(x10INTERVALSP28B9), max(x10INTERVALSP28B9), length.out = length(x10INTERVALSP28B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP28B9
}

# Create new variable TRIALS according to interval
LISTP28[[9]]$INTERVALS <- cut(LISTP28[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP28B10<-c(PERCENTAGEP28$B10T1,PERCENTAGEP28$B10T2,PERCENTAGEP28$B10T3,PERCENTAGEP28$B10T4,PERCENTAGEP28$B10T5, max_valueP28B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP28B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP28B10 <- unique(x10INTERVALSP28B10)
  x10INTERVALSP28B10 <- sort(x10INTERVALSP28B10)
  breaks <- seq(min(x10INTERVALSP28B10), max(x10INTERVALSP28B10), length.out = length(x10INTERVALSP28B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP28B10
}

# Create new variable TRIALS according to interval
LISTP28[[10]]$INTERVALS <- cut(LISTP28[[10]]$TIME, breaks = breaks, labels = FALSE)
#P29
#B1
x10INTERVALSP29B1<-c(PERCENTAGEP29$B1T1,PERCENTAGEP29$B1T2,PERCENTAGEP29$B1T3,PERCENTAGEP29$B1T4,PERCENTAGEP29$B1T5, max_valueP29B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP29B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP29B1 <- unique(x10INTERVALSP29B1)
  x10INTERVALSP29B1 <- sort(x10INTERVALSP29B1)
  breaks <- seq(min(x10INTERVALSP29B1), max(x10INTERVALSP29B1), length.out = length(x10INTERVALSP29B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP29B1
}

# Create new variable TRIALS according to interval
LISTP29[[1]]$INTERVALS <- cut(LISTP29[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP29B2<-c(PERCENTAGEP29$B2T1,PERCENTAGEP29$B2T2,PERCENTAGEP29$B2T3,PERCENTAGEP29$B2T4,PERCENTAGEP29$B2T5, max_valueP29B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP29B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP29B2 <- unique(x10INTERVALSP29B2)
  x10INTERVALSP29B2 <- sort(x10INTERVALSP29B2)
  breaks <- seq(min(x10INTERVALSP29B2), max(x10INTERVALSP29B2), length.out = length(x10INTERVALSP29B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP29B2
}

# Create new variable TRIALS according to interval
LISTP29[[2]]$INTERVALS <- cut(LISTP29[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP29B3<-c(PERCENTAGEP29$B3T1,PERCENTAGEP29$B3T2,PERCENTAGEP29$B3T3,PERCENTAGEP29$B3T4,PERCENTAGEP29$B3T5, max_valueP29B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP29B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP29B3 <- unique(x10INTERVALSP29B3)
  x10INTERVALSP29B3 <- sort(x10INTERVALSP29B3)
  breaks <- seq(min(x10INTERVALSP29B3), max(x10INTERVALSP29B3), length.out = length(x10INTERVALSP29B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP29B3
}

# Create new variable TRIALS according to interval
LISTP29[[3]]$INTERVALS <- cut(LISTP29[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP29B4<-c(PERCENTAGEP29$B4T1,PERCENTAGEP29$B4T2,PERCENTAGEP29$B4T3,PERCENTAGEP29$B4T4,PERCENTAGEP29$B4T5, max_valueP29B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP29B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP29B4 <- unique(x10INTERVALSP29B4)
  x10INTERVALSP29B4 <- sort(x10INTERVALSP29B4)
  breaks <- seq(min(x10INTERVALSP29B4), max(x10INTERVALSP29B4), length.out = length(x10INTERVALSP29B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP29B4
}

# Create new variable TRIALS according to interval
LISTP29[[4]]$INTERVALS <- cut(LISTP29[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP29B5<-c(PERCENTAGEP29$B5T1,PERCENTAGEP29$B5T2,PERCENTAGEP29$B5T3,PERCENTAGEP29$B5T4,PERCENTAGEP29$B5T5, max_valueP29B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP29B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP29B5 <- unique(x10INTERVALSP29B5)
  x10INTERVALSP29B5 <- sort(x10INTERVALSP29B5)
  breaks <- seq(min(x10INTERVALSP29B5), max(x10INTERVALSP29B5), length.out = length(x10INTERVALSP29B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP29B5
}

# Create new variable TRIALS according to interval
LISTP29[[5]]$INTERVALS <- cut(LISTP29[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP29B6<-c(PERCENTAGEP29$B6T1,PERCENTAGEP29$B6T2,PERCENTAGEP29$B6T3,PERCENTAGEP29$B6T4,PERCENTAGEP29$B6T5, max_valueP29B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP29B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP29B6 <- unique(x10INTERVALSP29B6)
  x10INTERVALSP29B6 <- sort(x10INTERVALSP29B6)
  breaks <- seq(min(x10INTERVALSP29B6), max(x10INTERVALSP29B6), length.out = length(x10INTERVALSP29B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP29B6
}

# Create new variable TRIALS according to interval
LISTP29[[6]]$INTERVALS <- cut(LISTP29[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP29B7<-c(PERCENTAGEP29$B7T1,PERCENTAGEP29$B7T2,PERCENTAGEP29$B7T3,PERCENTAGEP29$B7T4,PERCENTAGEP29$B7T5, max_valueP29B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP29B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP29B7 <- unique(x10INTERVALSP29B7)
  x10INTERVALSP29B7 <- sort(x10INTERVALSP29B7)
  breaks <- seq(min(x10INTERVALSP29B7), max(x10INTERVALSP29B7), length.out = length(x10INTERVALSP29B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP29B7
}

# Create new variable TRIALS according to interval
LISTP29[[7]]$INTERVALS <- cut(LISTP29[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP29B8<-c(PERCENTAGEP29$B8T1,PERCENTAGEP29$B8T2,PERCENTAGEP29$B8T3,PERCENTAGEP29$B8T4,PERCENTAGEP29$B8T5, max_valueP29B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP29B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP29B8 <- unique(x10INTERVALSP29B8)
  x10INTERVALSP29B8 <- sort(x10INTERVALSP29B8)
  breaks <- seq(min(x10INTERVALSP29B8), max(x10INTERVALSP29B8), length.out = length(x10INTERVALSP29B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP29B8
}

# Create new variable TRIALS according to interval
LISTP29[[8]]$INTERVALS <- cut(LISTP29[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP29B9<-c(PERCENTAGEP29$B9T1,PERCENTAGEP29$B9T2,PERCENTAGEP29$B9T3,PERCENTAGEP29$B9T4,PERCENTAGEP29$B9T5, max_valueP29B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP29B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP29B9 <- unique(x10INTERVALSP29B9)
  x10INTERVALSP29B9 <- sort(x10INTERVALSP29B9)
  breaks <- seq(min(x10INTERVALSP29B9), max(x10INTERVALSP29B9), length.out = length(x10INTERVALSP29B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP29B9
}

# Create new variable TRIALS according to interval
LISTP29[[9]]$INTERVALS <- cut(LISTP29[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP29B10<-c(PERCENTAGEP29$B10T1,PERCENTAGEP29$B10T2,PERCENTAGEP29$B10T3,PERCENTAGEP29$B10T4,PERCENTAGEP29$B10T5, max_valueP29B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP29B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP29B10 <- unique(x10INTERVALSP29B10)
  x10INTERVALSP29B10 <- sort(x10INTERVALSP29B10)
  breaks <- seq(min(x10INTERVALSP29B10), max(x10INTERVALSP29B10), length.out = length(x10INTERVALSP29B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP29B10
}

# Create new variable TRIALS according to interval
LISTP29[[10]]$INTERVALS <- cut(LISTP29[[10]]$TIME, breaks = breaks, labels = FALSE)
#P30
#B1
x10INTERVALSP30B1<-c(PERCENTAGEP30$B1T1,PERCENTAGEP30$B1T2,PERCENTAGEP30$B1T3,PERCENTAGEP30$B1T4,PERCENTAGEP30$B1T5, max_valueP30B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP30B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP30B1 <- unique(x10INTERVALSP30B1)
  x10INTERVALSP30B1 <- sort(x10INTERVALSP30B1)
  breaks <- seq(min(x10INTERVALSP30B1), max(x10INTERVALSP30B1), length.out = length(x10INTERVALSP30B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP30B1
}

# Create new variable TRIALS according to interval
LISTP30[[1]]$INTERVALS <- cut(LISTP30[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP30B2<-c(PERCENTAGEP30$B2T1,PERCENTAGEP30$B2T2,PERCENTAGEP30$B2T3,PERCENTAGEP30$B2T4,PERCENTAGEP30$B2T5, max_valueP30B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP30B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP30B2 <- unique(x10INTERVALSP30B2)
  x10INTERVALSP30B2 <- sort(x10INTERVALSP30B2)
  breaks <- seq(min(x10INTERVALSP30B2), max(x10INTERVALSP30B2), length.out = length(x10INTERVALSP30B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP30B2
}

# Create new variable TRIALS according to interval
LISTP30[[2]]$INTERVALS <- cut(LISTP30[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP30B3<-c(PERCENTAGEP30$B3T1,PERCENTAGEP30$B3T2,PERCENTAGEP30$B3T3,PERCENTAGEP30$B3T4,PERCENTAGEP30$B3T5, max_valueP30B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP30B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP30B3 <- unique(x10INTERVALSP30B3)
  x10INTERVALSP30B3 <- sort(x10INTERVALSP30B3)
  breaks <- seq(min(x10INTERVALSP30B3), max(x10INTERVALSP30B3), length.out = length(x10INTERVALSP30B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP30B3
}

# Create new variable TRIALS according to interval
LISTP30[[3]]$INTERVALS <- cut(LISTP30[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP30B4<-c(PERCENTAGEP30$B4T1,PERCENTAGEP30$B4T2,PERCENTAGEP30$B4T3,PERCENTAGEP30$B4T4,PERCENTAGEP30$B4T5, max_valueP30B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP30B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP30B4 <- unique(x10INTERVALSP30B4)
  x10INTERVALSP30B4 <- sort(x10INTERVALSP30B4)
  breaks <- seq(min(x10INTERVALSP30B4), max(x10INTERVALSP30B4), length.out = length(x10INTERVALSP30B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP30B4
}

# Create new variable TRIALS according to interval
LISTP30[[4]]$INTERVALS <- cut(LISTP30[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP30B5<-c(PERCENTAGEP30$B5T1,PERCENTAGEP30$B5T2,PERCENTAGEP30$B5T3,PERCENTAGEP30$B5T4,PERCENTAGEP30$B5T5, max_valueP30B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP30B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP30B5 <- unique(x10INTERVALSP30B5)
  x10INTERVALSP30B5 <- sort(x10INTERVALSP30B5)
  breaks <- seq(min(x10INTERVALSP30B5), max(x10INTERVALSP30B5), length.out = length(x10INTERVALSP30B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP30B5
}

# Create new variable TRIALS according to interval
LISTP30[[5]]$INTERVALS <- cut(LISTP30[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP30B6<-c(PERCENTAGEP30$B6T1,PERCENTAGEP30$B6T2,PERCENTAGEP30$B6T3,PERCENTAGEP30$B6T4,PERCENTAGEP30$B6T5, max_valueP30B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP30B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP30B6 <- unique(x10INTERVALSP30B6)
  x10INTERVALSP30B6 <- sort(x10INTERVALSP30B6)
  breaks <- seq(min(x10INTERVALSP30B6), max(x10INTERVALSP30B6), length.out = length(x10INTERVALSP30B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP30B6
}

# Create new variable TRIALS according to interval
LISTP30[[6]]$INTERVALS <- cut(LISTP30[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP30B7<-c(PERCENTAGEP30$B7T1,PERCENTAGEP30$B7T2,PERCENTAGEP30$B7T3,PERCENTAGEP30$B7T4,PERCENTAGEP30$B7T5, max_valueP30B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP30B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP30B7 <- unique(x10INTERVALSP30B7)
  x10INTERVALSP30B7 <- sort(x10INTERVALSP30B7)
  breaks <- seq(min(x10INTERVALSP30B7), max(x10INTERVALSP30B7), length.out = length(x10INTERVALSP30B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP30B7
}

# Create new variable TRIALS according to interval
LISTP30[[7]]$INTERVALS <- cut(LISTP30[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP30B8<-c(PERCENTAGEP30$B8T1,PERCENTAGEP30$B8T2,PERCENTAGEP30$B8T3,PERCENTAGEP30$B8T4,PERCENTAGEP30$B8T5, max_valueP30B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP30B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP30B8 <- unique(x10INTERVALSP30B8)
  x10INTERVALSP30B8 <- sort(x10INTERVALSP30B8)
  breaks <- seq(min(x10INTERVALSP30B8), max(x10INTERVALSP30B8), length.out = length(x10INTERVALSP30B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP30B8
}

# Create new variable TRIALS according to interval
LISTP30[[8]]$INTERVALS <- cut(LISTP30[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP30B9<-c(PERCENTAGEP30$B9T1,PERCENTAGEP30$B9T2,PERCENTAGEP30$B9T3,PERCENTAGEP30$B9T4,PERCENTAGEP30$B9T5, max_valueP30B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP30B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP30B9 <- unique(x10INTERVALSP30B9)
  x10INTERVALSP30B9 <- sort(x10INTERVALSP30B9)
  breaks <- seq(min(x10INTERVALSP30B9), max(x10INTERVALSP30B9), length.out = length(x10INTERVALSP30B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP30B9
}

# Create new variable TRIALS according to interval
LISTP30[[9]]$INTERVALS <- cut(LISTP30[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP30B10<-c(PERCENTAGEP30$B10T1,PERCENTAGEP30$B10T2,PERCENTAGEP30$B10T3,PERCENTAGEP30$B10T4,PERCENTAGEP30$B10T5, max_valueP30B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP30B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP30B10 <- unique(x10INTERVALSP30B10)
  x10INTERVALSP30B10 <- sort(x10INTERVALSP30B10)
  breaks <- seq(min(x10INTERVALSP30B10), max(x10INTERVALSP30B10), length.out = length(x10INTERVALSP30B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP30B10
}

# Create new variable TRIALS according to interval
LISTP30[[10]]$INTERVALS <- cut(LISTP30[[10]]$TIME, breaks = breaks, labels = FALSE)
#P31
#B1
x10INTERVALSP31B1<-c(PERCENTAGEP31$B1T1,PERCENTAGEP31$B1T2,PERCENTAGEP31$B1T3,PERCENTAGEP31$B1T4,PERCENTAGEP31$B1T5, max_valueP31B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP31B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP31B1 <- unique(x10INTERVALSP31B1)
  x10INTERVALSP31B1 <- sort(x10INTERVALSP31B1)
  breaks <- seq(min(x10INTERVALSP31B1), max(x10INTERVALSP31B1), length.out = length(x10INTERVALSP31B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP31B1
}

# Create new variable TRIALS according to interval
LISTP31[[1]]$INTERVALS <- cut(LISTP31[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP31B2<-c(PERCENTAGEP31$B2T1,PERCENTAGEP31$B2T2,PERCENTAGEP31$B2T3,PERCENTAGEP31$B2T4,PERCENTAGEP31$B2T5, max_valueP31B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP31B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP31B2 <- unique(x10INTERVALSP31B2)
  x10INTERVALSP31B2 <- sort(x10INTERVALSP31B2)
  breaks <- seq(min(x10INTERVALSP31B2), max(x10INTERVALSP31B2), length.out = length(x10INTERVALSP31B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP31B2
}

# Create new variable TRIALS according to interval
LISTP31[[2]]$INTERVALS <- cut(LISTP31[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP31B3<-c(PERCENTAGEP31$B3T1,PERCENTAGEP31$B3T2,PERCENTAGEP31$B3T3,PERCENTAGEP31$B3T4,PERCENTAGEP31$B3T5, max_valueP31B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP31B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP31B3 <- unique(x10INTERVALSP31B3)
  x10INTERVALSP31B3 <- sort(x10INTERVALSP31B3)
  breaks <- seq(min(x10INTERVALSP31B3), max(x10INTERVALSP31B3), length.out = length(x10INTERVALSP31B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP31B3
}

# Create new variable TRIALS according to interval
LISTP31[[3]]$INTERVALS <- cut(LISTP31[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP31B4<-c(PERCENTAGEP31$B4T1,PERCENTAGEP31$B4T2,PERCENTAGEP31$B4T3,PERCENTAGEP31$B4T4,PERCENTAGEP31$B4T5, max_valueP31B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP31B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP31B4 <- unique(x10INTERVALSP31B4)
  x10INTERVALSP31B4 <- sort(x10INTERVALSP31B4)
  breaks <- seq(min(x10INTERVALSP31B4), max(x10INTERVALSP31B4), length.out = length(x10INTERVALSP31B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP31B4
}

# Create new variable TRIALS according to interval
LISTP31[[4]]$INTERVALS <- cut(LISTP31[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP31B5<-c(PERCENTAGEP31$B5T1,PERCENTAGEP31$B5T2,PERCENTAGEP31$B5T3,PERCENTAGEP31$B5T4,PERCENTAGEP31$B5T5, max_valueP31B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP31B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP31B5 <- unique(x10INTERVALSP31B5)
  x10INTERVALSP31B5 <- sort(x10INTERVALSP31B5)
  breaks <- seq(min(x10INTERVALSP31B5), max(x10INTERVALSP31B5), length.out = length(x10INTERVALSP31B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP31B5
}

# Create new variable TRIALS according to interval
LISTP31[[5]]$INTERVALS <- cut(LISTP31[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP31B6<-c(PERCENTAGEP31$B6T1,PERCENTAGEP31$B6T2,PERCENTAGEP31$B6T3,PERCENTAGEP31$B6T4,PERCENTAGEP31$B6T5, max_valueP31B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP31B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP31B6 <- unique(x10INTERVALSP31B6)
  x10INTERVALSP31B6 <- sort(x10INTERVALSP31B6)
  breaks <- seq(min(x10INTERVALSP31B6), max(x10INTERVALSP31B6), length.out = length(x10INTERVALSP31B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP31B6
}

# Create new variable TRIALS according to interval
LISTP31[[6]]$INTERVALS <- cut(LISTP31[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP31B7<-c(PERCENTAGEP31$B7T1,PERCENTAGEP31$B7T2,PERCENTAGEP31$B7T3,PERCENTAGEP31$B7T4,PERCENTAGEP31$B7T5, max_valueP31B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP31B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP31B7 <- unique(x10INTERVALSP31B7)
  x10INTERVALSP31B7 <- sort(x10INTERVALSP31B7)
  breaks <- seq(min(x10INTERVALSP31B7), max(x10INTERVALSP31B7), length.out = length(x10INTERVALSP31B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP31B7
}

# Create new variable TRIALS according to interval
LISTP31[[7]]$INTERVALS <- cut(LISTP31[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP31B8<-c(PERCENTAGEP31$B8T1,PERCENTAGEP31$B8T2,PERCENTAGEP31$B8T3,PERCENTAGEP31$B8T4,PERCENTAGEP31$B8T5, max_valueP31B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP31B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP31B8 <- unique(x10INTERVALSP31B8)
  x10INTERVALSP31B8 <- sort(x10INTERVALSP31B8)
  breaks <- seq(min(x10INTERVALSP31B8), max(x10INTERVALSP31B8), length.out = length(x10INTERVALSP31B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP31B8
}

# Create new variable TRIALS according to interval
LISTP31[[8]]$INTERVALS <- cut(LISTP31[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP31B9<-c(PERCENTAGEP31$B9T1,PERCENTAGEP31$B9T2,PERCENTAGEP31$B9T3,PERCENTAGEP31$B9T4,PERCENTAGEP31$B9T5, max_valueP31B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP31B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP31B9 <- unique(x10INTERVALSP31B9)
  x10INTERVALSP31B9 <- sort(x10INTERVALSP31B9)
  breaks <- seq(min(x10INTERVALSP31B9), max(x10INTERVALSP31B9), length.out = length(x10INTERVALSP31B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP31B9
}

# Create new variable TRIALS according to interval
LISTP31[[9]]$INTERVALS <- cut(LISTP31[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP31B10<-c(PERCENTAGEP31$B10T1,PERCENTAGEP31$B10T2,PERCENTAGEP31$B10T3,PERCENTAGEP31$B10T4,PERCENTAGEP31$B10T5, max_valueP31B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP31B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP31B10 <- unique(x10INTERVALSP31B10)
  x10INTERVALSP31B10 <- sort(x10INTERVALSP31B10)
  breaks <- seq(min(x10INTERVALSP31B10), max(x10INTERVALSP31B10), length.out = length(x10INTERVALSP31B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP31B10
}

# Create new variable TRIALS according to interval
LISTP31[[10]]$INTERVALS <- cut(LISTP31[[10]]$TIME, breaks = breaks, labels = FALSE)
#P32
#B1
x10INTERVALSP32B1<-c(PERCENTAGEP32$B1T1,PERCENTAGEP32$B1T2,PERCENTAGEP32$B1T3,PERCENTAGEP32$B1T4,PERCENTAGEP32$B1T5, max_valueP32B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP32B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP32B1 <- unique(x10INTERVALSP32B1)
  x10INTERVALSP32B1 <- sort(x10INTERVALSP32B1)
  breaks <- seq(min(x10INTERVALSP32B1), max(x10INTERVALSP32B1), length.out = length(x10INTERVALSP32B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP32B1
}

# Create new variable TRIALS according to interval
LISTP32[[1]]$INTERVALS <- cut(LISTP32[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP32B2<-c(PERCENTAGEP32$B2T1,PERCENTAGEP32$B2T2,PERCENTAGEP32$B2T3,PERCENTAGEP32$B2T4,PERCENTAGEP32$B2T5, max_valueP32B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP32B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP32B2 <- unique(x10INTERVALSP32B2)
  x10INTERVALSP32B2 <- sort(x10INTERVALSP32B2)
  breaks <- seq(min(x10INTERVALSP32B2), max(x10INTERVALSP32B2), length.out = length(x10INTERVALSP32B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP32B2
}

# Create new variable TRIALS according to interval
LISTP32[[2]]$INTERVALS <- cut(LISTP32[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP32B3<-c(PERCENTAGEP32$B3T1,PERCENTAGEP32$B3T2,PERCENTAGEP32$B3T3,PERCENTAGEP32$B3T4,PERCENTAGEP32$B3T5, max_valueP32B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP32B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP32B3 <- unique(x10INTERVALSP32B3)
  x10INTERVALSP32B3 <- sort(x10INTERVALSP32B3)
  breaks <- seq(min(x10INTERVALSP32B3), max(x10INTERVALSP32B3), length.out = length(x10INTERVALSP32B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP32B3
}

# Create new variable TRIALS according to interval
LISTP32[[3]]$INTERVALS <- cut(LISTP32[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP32B4<-c(PERCENTAGEP32$B4T1,PERCENTAGEP32$B4T2,PERCENTAGEP32$B4T3,PERCENTAGEP32$B4T4,PERCENTAGEP32$B4T5, max_valueP32B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP32B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP32B4 <- unique(x10INTERVALSP32B4)
  x10INTERVALSP32B4 <- sort(x10INTERVALSP32B4)
  breaks <- seq(min(x10INTERVALSP32B4), max(x10INTERVALSP32B4), length.out = length(x10INTERVALSP32B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP32B4
}

# Create new variable TRIALS according to interval
LISTP32[[4]]$INTERVALS <- cut(LISTP32[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP32B5<-c(PERCENTAGEP32$B5T1,PERCENTAGEP32$B5T2,PERCENTAGEP32$B5T3,PERCENTAGEP32$B5T4,PERCENTAGEP32$B5T5, max_valueP32B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP32B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP32B5 <- unique(x10INTERVALSP32B5)
  x10INTERVALSP32B5 <- sort(x10INTERVALSP32B5)
  breaks <- seq(min(x10INTERVALSP32B5), max(x10INTERVALSP32B5), length.out = length(x10INTERVALSP32B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP32B5
}

# Create new variable TRIALS according to interval
LISTP32[[5]]$INTERVALS <- cut(LISTP32[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP32B6<-c(PERCENTAGEP32$B6T1,PERCENTAGEP32$B6T2,PERCENTAGEP32$B6T3,PERCENTAGEP32$B6T4,PERCENTAGEP32$B6T5, max_valueP32B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP32B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP32B6 <- unique(x10INTERVALSP32B6)
  x10INTERVALSP32B6 <- sort(x10INTERVALSP32B6)
  breaks <- seq(min(x10INTERVALSP32B6), max(x10INTERVALSP32B6), length.out = length(x10INTERVALSP32B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP32B6
}

# Create new variable TRIALS according to interval
LISTP32[[6]]$INTERVALS <- cut(LISTP32[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP32B7<-c(PERCENTAGEP32$B7T1,PERCENTAGEP32$B7T2,PERCENTAGEP32$B7T3,PERCENTAGEP32$B7T4,PERCENTAGEP32$B7T5, max_valueP32B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP32B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP32B7 <- unique(x10INTERVALSP32B7)
  x10INTERVALSP32B7 <- sort(x10INTERVALSP32B7)
  breaks <- seq(min(x10INTERVALSP32B7), max(x10INTERVALSP32B7), length.out = length(x10INTERVALSP32B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP32B7
}

# Create new variable TRIALS according to interval
LISTP32[[7]]$INTERVALS <- cut(LISTP32[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP32B8<-c(PERCENTAGEP32$B8T1,PERCENTAGEP32$B8T2,PERCENTAGEP32$B8T3,PERCENTAGEP32$B8T4,PERCENTAGEP32$B8T5, max_valueP32B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP32B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP32B8 <- unique(x10INTERVALSP32B8)
  x10INTERVALSP32B8 <- sort(x10INTERVALSP32B8)
  breaks <- seq(min(x10INTERVALSP32B8), max(x10INTERVALSP32B8), length.out = length(x10INTERVALSP32B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP32B8
}

# Create new variable TRIALS according to interval
LISTP32[[8]]$INTERVALS <- cut(LISTP32[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP32B9<-c(PERCENTAGEP32$B9T1,PERCENTAGEP32$B9T2,PERCENTAGEP32$B9T3,PERCENTAGEP32$B9T4,PERCENTAGEP32$B9T5, max_valueP32B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP32B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP32B9 <- unique(x10INTERVALSP32B9)
  x10INTERVALSP32B9 <- sort(x10INTERVALSP32B9)
  breaks <- seq(min(x10INTERVALSP32B9), max(x10INTERVALSP32B9), length.out = length(x10INTERVALSP32B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP32B9
}

# Create new variable TRIALS according to interval
LISTP32[[9]]$INTERVALS <- cut(LISTP32[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP32B10<-c(PERCENTAGEP32$B10T1,PERCENTAGEP32$B10T2,PERCENTAGEP32$B10T3,PERCENTAGEP32$B10T4,PERCENTAGEP32$B10T5, max_valueP32B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP32B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP32B10 <- unique(x10INTERVALSP32B10)
  x10INTERVALSP32B10 <- sort(x10INTERVALSP32B10)
  breaks <- seq(min(x10INTERVALSP32B10), max(x10INTERVALSP32B10), length.out = length(x10INTERVALSP32B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP32B10
}

# Create new variable TRIALS according to interval
LISTP32[[10]]$INTERVALS <- cut(LISTP32[[10]]$TIME, breaks = breaks, labels = FALSE)
#P33
#B1
x10INTERVALSP33B1<-c(PERCENTAGEP33$B1T1,PERCENTAGEP33$B1T2,PERCENTAGEP33$B1T3,PERCENTAGEP33$B1T4,PERCENTAGEP33$B1T5, max_valueP33B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP33B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP33B1 <- unique(x10INTERVALSP33B1)
  x10INTERVALSP33B1 <- sort(x10INTERVALSP33B1)
  breaks <- seq(min(x10INTERVALSP33B1), max(x10INTERVALSP33B1), length.out = length(x10INTERVALSP33B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP33B1
}

# Create new variable TRIALS according to interval
LISTP33[[1]]$INTERVALS <- cut(LISTP33[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP33B2<-c(PERCENTAGEP33$B2T1,PERCENTAGEP33$B2T2,PERCENTAGEP33$B2T3,PERCENTAGEP33$B2T4,PERCENTAGEP33$B2T5, max_valueP33B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP33B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP33B2 <- unique(x10INTERVALSP33B2)
  x10INTERVALSP33B2 <- sort(x10INTERVALSP33B2)
  breaks <- seq(min(x10INTERVALSP33B2), max(x10INTERVALSP33B2), length.out = length(x10INTERVALSP33B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP33B2
}

# Create new variable TRIALS according to interval
LISTP33[[2]]$INTERVALS <- cut(LISTP33[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP33B3<-c(PERCENTAGEP33$B3T1,PERCENTAGEP33$B3T2,PERCENTAGEP33$B3T3,PERCENTAGEP33$B3T4,PERCENTAGEP33$B3T5, max_valueP33B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP33B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP33B3 <- unique(x10INTERVALSP33B3)
  x10INTERVALSP33B3 <- sort(x10INTERVALSP33B3)
  breaks <- seq(min(x10INTERVALSP33B3), max(x10INTERVALSP33B3), length.out = length(x10INTERVALSP33B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP33B3
}

# Create new variable TRIALS according to interval
LISTP33[[3]]$INTERVALS <- cut(LISTP33[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP33B4<-c(PERCENTAGEP33$B4T1,PERCENTAGEP33$B4T2,PERCENTAGEP33$B4T3,PERCENTAGEP33$B4T4,PERCENTAGEP33$B4T5, max_valueP33B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP33B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP33B4 <- unique(x10INTERVALSP33B4)
  x10INTERVALSP33B4 <- sort(x10INTERVALSP33B4)
  breaks <- seq(min(x10INTERVALSP33B4), max(x10INTERVALSP33B4), length.out = length(x10INTERVALSP33B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP33B4
}

# Create new variable TRIALS according to interval
LISTP33[[4]]$INTERVALS <- cut(LISTP33[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP33B5<-c(PERCENTAGEP33$B5T1,PERCENTAGEP33$B5T2,PERCENTAGEP33$B5T3,PERCENTAGEP33$B5T4,PERCENTAGEP33$B5T5, max_valueP33B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP33B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP33B5 <- unique(x10INTERVALSP33B5)
  x10INTERVALSP33B5 <- sort(x10INTERVALSP33B5)
  breaks <- seq(min(x10INTERVALSP33B5), max(x10INTERVALSP33B5), length.out = length(x10INTERVALSP33B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP33B5
}

# Create new variable TRIALS according to interval
LISTP33[[5]]$INTERVALS <- cut(LISTP33[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP33B6<-c(PERCENTAGEP33$B6T1,PERCENTAGEP33$B6T2,PERCENTAGEP33$B6T3,PERCENTAGEP33$B6T4,PERCENTAGEP33$B6T5, max_valueP33B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP33B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP33B6 <- unique(x10INTERVALSP33B6)
  x10INTERVALSP33B6 <- sort(x10INTERVALSP33B6)
  breaks <- seq(min(x10INTERVALSP33B6), max(x10INTERVALSP33B6), length.out = length(x10INTERVALSP33B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP33B6
}

# Create new variable TRIALS according to interval
LISTP33[[6]]$INTERVALS <- cut(LISTP33[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP33B7<-c(PERCENTAGEP33$B7T1,PERCENTAGEP33$B7T2,PERCENTAGEP33$B7T3,PERCENTAGEP33$B7T4,PERCENTAGEP33$B7T5, max_valueP33B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP33B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP33B7 <- unique(x10INTERVALSP33B7)
  x10INTERVALSP33B7 <- sort(x10INTERVALSP33B7)
  breaks <- seq(min(x10INTERVALSP33B7), max(x10INTERVALSP33B7), length.out = length(x10INTERVALSP33B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP33B7
}

# Create new variable TRIALS according to interval
LISTP33[[7]]$INTERVALS <- cut(LISTP33[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP33B8<-c(PERCENTAGEP33$B8T1,PERCENTAGEP33$B8T2,PERCENTAGEP33$B8T3,PERCENTAGEP33$B8T4,PERCENTAGEP33$B8T5, max_valueP33B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP33B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP33B8 <- unique(x10INTERVALSP33B8)
  x10INTERVALSP33B8 <- sort(x10INTERVALSP33B8)
  breaks <- seq(min(x10INTERVALSP33B8), max(x10INTERVALSP33B8), length.out = length(x10INTERVALSP33B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP33B8
}

# Create new variable TRIALS according to interval
LISTP33[[8]]$INTERVALS <- cut(LISTP33[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP33B9<-c(PERCENTAGEP33$B9T1,PERCENTAGEP33$B9T2,PERCENTAGEP33$B9T3,PERCENTAGEP33$B9T4,PERCENTAGEP33$B9T5, max_valueP33B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP33B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP33B9 <- unique(x10INTERVALSP33B9)
  x10INTERVALSP33B9 <- sort(x10INTERVALSP33B9)
  breaks <- seq(min(x10INTERVALSP33B9), max(x10INTERVALSP33B9), length.out = length(x10INTERVALSP33B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP33B9
}

# Create new variable TRIALS according to interval
LISTP33[[9]]$INTERVALS <- cut(LISTP33[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP33B10<-c(PERCENTAGEP33$B10T1,PERCENTAGEP33$B10T2,PERCENTAGEP33$B10T3,PERCENTAGEP33$B10T4,PERCENTAGEP33$B10T5, max_valueP33B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP33B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP33B10 <- unique(x10INTERVALSP33B10)
  x10INTERVALSP33B10 <- sort(x10INTERVALSP33B10)
  breaks <- seq(min(x10INTERVALSP33B10), max(x10INTERVALSP33B10), length.out = length(x10INTERVALSP33B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP33B10
}

# Create new variable TRIALS according to interval
LISTP33[[10]]$INTERVALS <- cut(LISTP33[[10]]$TIME, breaks = breaks, labels = FALSE)
#P34
#B1
x10INTERVALSP34B1<-c(PERCENTAGEP34$B1T1,PERCENTAGEP34$B1T2,PERCENTAGEP34$B1T3,PERCENTAGEP34$B1T4,PERCENTAGEP34$B1T5, max_valueP34B1) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP34B1)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP34B1 <- unique(x10INTERVALSP34B1)
  x10INTERVALSP34B1 <- sort(x10INTERVALSP34B1)
  breaks <- seq(min(x10INTERVALSP34B1), max(x10INTERVALSP34B1), length.out = length(x10INTERVALSP34B1) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP34B1
}

# Create new variable TRIALS according to interval
LISTP34[[1]]$INTERVALS <- cut(LISTP34[[1]]$TIME, breaks = breaks, labels = FALSE)


#B2
x10INTERVALSP34B2<-c(PERCENTAGEP34$B2T1,PERCENTAGEP34$B2T2,PERCENTAGEP34$B2T3,PERCENTAGEP34$B2T4,PERCENTAGEP34$B2T5, max_valueP34B2) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP34B2)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP34B2 <- unique(x10INTERVALSP34B2)
  x10INTERVALSP34B2 <- sort(x10INTERVALSP34B2)
  breaks <- seq(min(x10INTERVALSP34B2), max(x10INTERVALSP34B2), length.out = length(x10INTERVALSP34B2) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP34B2
}

# Create new variable TRIALS according to interval
LISTP34[[2]]$INTERVALS <- cut(LISTP34[[2]]$TIME, breaks = breaks, labels = FALSE)


#B3
x10INTERVALSP34B3<-c(PERCENTAGEP34$B3T1,PERCENTAGEP34$B3T2,PERCENTAGEP34$B3T3,PERCENTAGEP34$B3T4,PERCENTAGEP34$B3T5, max_valueP34B3) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP34B3)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP34B3 <- unique(x10INTERVALSP34B3)
  x10INTERVALSP34B3 <- sort(x10INTERVALSP34B3)
  breaks <- seq(min(x10INTERVALSP34B3), max(x10INTERVALSP34B3), length.out = length(x10INTERVALSP34B3) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP34B3
}

# Create new variable TRIALS according to interval
LISTP34[[3]]$INTERVALS <- cut(LISTP34[[3]]$TIME, breaks = breaks, labels = FALSE)


#B4
x10INTERVALSP34B4<-c(PERCENTAGEP34$B4T1,PERCENTAGEP34$B4T2,PERCENTAGEP34$B4T3,PERCENTAGEP34$B4T4,PERCENTAGEP34$B4T5, max_valueP34B4) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP34B4)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP34B4 <- unique(x10INTERVALSP34B4)
  x10INTERVALSP34B4 <- sort(x10INTERVALSP34B4)
  breaks <- seq(min(x10INTERVALSP34B4), max(x10INTERVALSP34B4), length.out = length(x10INTERVALSP34B4) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP34B4
}

# Create new variable TRIALS according to interval
LISTP34[[4]]$INTERVALS <- cut(LISTP34[[4]]$TIME, breaks = breaks, labels = FALSE)



#B5
x10INTERVALSP34B5<-c(PERCENTAGEP34$B5T1,PERCENTAGEP34$B5T2,PERCENTAGEP34$B5T3,PERCENTAGEP34$B5T4,PERCENTAGEP34$B5T5, max_valueP34B5) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP34B5)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP34B5 <- unique(x10INTERVALSP34B5)
  x10INTERVALSP34B5 <- sort(x10INTERVALSP34B5)
  breaks <- seq(min(x10INTERVALSP34B5), max(x10INTERVALSP34B5), length.out = length(x10INTERVALSP34B5) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP34B5
}

# Create new variable TRIALS according to interval
LISTP34[[5]]$INTERVALS <- cut(LISTP34[[5]]$TIME, breaks = breaks, labels = FALSE)



#B6
x10INTERVALSP34B6<-c(PERCENTAGEP34$B6T1,PERCENTAGEP34$B6T2,PERCENTAGEP34$B6T3,PERCENTAGEP34$B6T4,PERCENTAGEP34$B6T5, max_valueP34B6) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP34B6)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP34B6 <- unique(x10INTERVALSP34B6)
  x10INTERVALSP34B6 <- sort(x10INTERVALSP34B6)
  breaks <- seq(min(x10INTERVALSP34B6), max(x10INTERVALSP34B6), length.out = length(x10INTERVALSP34B6) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP34B6
}

# Create new variable TRIALS according to interval
LISTP34[[6]]$INTERVALS <- cut(LISTP34[[6]]$TIME, breaks = breaks, labels = FALSE)



#B7
x10INTERVALSP34B7<-c(PERCENTAGEP34$B7T1,PERCENTAGEP34$B7T2,PERCENTAGEP34$B7T3,PERCENTAGEP34$B7T4,PERCENTAGEP34$B7T5, max_valueP34B7) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP34B7)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP34B7 <- unique(x10INTERVALSP34B7)
  x10INTERVALSP34B7 <- sort(x10INTERVALSP34B7)
  breaks <- seq(min(x10INTERVALSP34B7), max(x10INTERVALSP34B7), length.out = length(x10INTERVALSP34B7) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP34B7
}

# Create new variable TRIALS according to interval
LISTP34[[7]]$INTERVALS <- cut(LISTP34[[7]]$TIME, breaks = breaks, labels = FALSE)



#B8
x10INTERVALSP34B8<-c(PERCENTAGEP34$B8T1,PERCENTAGEP34$B8T2,PERCENTAGEP34$B8T3,PERCENTAGEP34$B8T4,PERCENTAGEP34$B8T5, max_valueP34B8) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP34B8)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP34B8 <- unique(x10INTERVALSP34B8)
  x10INTERVALSP34B8 <- sort(x10INTERVALSP34B8)
  breaks <- seq(min(x10INTERVALSP34B8), max(x10INTERVALSP34B8), length.out = length(x10INTERVALSP34B8) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP34B8
}

# Create new variable TRIALS according to interval
LISTP34[[8]]$INTERVALS <- cut(LISTP34[[8]]$TIME, breaks = breaks, labels = FALSE)



#B9
x10INTERVALSP34B9<-c(PERCENTAGEP34$B9T1,PERCENTAGEP34$B9T2,PERCENTAGEP34$B9T3,PERCENTAGEP34$B9T4,PERCENTAGEP34$B9T5, max_valueP34B9) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP34B9)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP34B9 <- unique(x10INTERVALSP34B9)
  x10INTERVALSP34B9 <- sort(x10INTERVALSP34B9)
  breaks <- seq(min(x10INTERVALSP34B9), max(x10INTERVALSP34B9), length.out = length(x10INTERVALSP34B9) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP34B9
}

# Create new variable TRIALS according to interval
LISTP34[[9]]$INTERVALS <- cut(LISTP34[[9]]$TIME, breaks = breaks, labels = FALSE)



#B10
x10INTERVALSP34B10<-c(PERCENTAGEP34$B10T1,PERCENTAGEP34$B10T2,PERCENTAGEP34$B10T3,PERCENTAGEP34$B10T4,PERCENTAGEP34$B10T5, max_valueP34B10) 

#DIVISION IN 10% PER BLOCKS
duplicates <- duplicated(x10INTERVALSP34B10)
if (any(duplicates)) {
  # Remove duplicates and adjust breaks
  x10INTERVALSP34B10 <- unique(x10INTERVALSP34B10)
  x10INTERVALSP34B10 <- sort(x10INTERVALSP34B10)
  breaks <- seq(min(x10INTERVALSP34B10), max(x10INTERVALSP34B10), length.out = length(x10INTERVALSP34B10) + 1)
} else {
  # Use original breaks
  breaks <- x10INTERVALSP34B10
}

# Create new variable TRIALS according to interval
LISTP34[[10]]$INTERVALS <- cut(LISTP34[[10]]$TIME, breaks = breaks, labels = FALSE)

In order to visualize the coactivation process between block a plot was made to see the two ID (60 and 70) together with the error rate (ID 0 ) in 2 plots per participants

MANUAL WORK DONE

After the creation and filtering of data, it was necessary to divide the VALUES for the ID 70,60 and 0 (Extensor, Flexor and errors) in order to create and excel file and manually calculate the Co activation index

To do so 3 different codes depending on the ID were used to create a text file that was manually copied and pasted to excel

# Open a file for writing
output_file <- file("output70.txt", open="w")

# Redirect the output to the file
sink(output_file)

# The code that generates the output
for (p in 5:34) {
  for (b in 1:10) {
    for (i in 1:50) {
      subset_list <- subset(get(paste0("LISTP", p))[[b]], ID == 70 & INTERVALS == i)
      subset_list$VALUE <- as.numeric(subset_list$VALUE)
      
      # Exclude missing values
      subset_list <- subset_list[!is.na(subset_list$VALUE),]
      
      if(nrow(subset_list) == 0){
        cat(paste0("Warning: There are no valid values for INTERVALS=", i, " in LISTP", p, "[[", b, "]]\n"))
      } else if(all(is.na(subset_list$VALUE)) || all(!is.numeric(subset_list$VALUE))) {
        cat(paste0("Warning: All values are missing or non-numeric for INTERVALS=", i, " in LISTP", p, "[[", b, "]]\n"))
      } else {
        subset_list$VALUE[!is.numeric(subset_list$VALUE)] <- NA
        
        mean_value <- mean(subset_list$VALUE, na.rm = TRUE)
        
        if (is.nan(mean_value)) {
          cat(paste0("Warning: There are missing or non-numeric values in the VALUE variable for INTERVALS=", i, " in LISTP", p, "[[", b, "]]\n"))
          non_numeric_values <- subset_list[!is.numeric(subset_list$VALUE), "VALUE"]
          cat("Non-numeric values in VALUE variable:", non_numeric_values, "\n")
        } else {
          cat(paste0("P", p, ",", b, ",", i, ",", mean_value, "\n"))
        }
      }
    }
  }
}
## P5,1,1,1.49093595269608
## P5,1,2,1.49266856744749
## P5,1,3,1.49342834353447
## P5,1,4,1.4942038986418
## P5,1,5,1.49478668415988
## P5,1,6,1.48945493862547
## P5,1,7,1.49340820512852
## P5,1,8,1.49734381771592
## P5,1,9,1.49493953080205
## P5,1,10,1.49626284705268
## P5,1,11,1.47743447759877
## P5,1,12,1.49954493739937
## P5,1,13,1.49296313173631
## P5,1,14,1.48931422578283
## P5,1,15,1.49194545594473
## P5,1,16,1.4826204726746
## P5,1,17,1.48273696958648
## P5,1,18,1.48968227519545
## P5,1,19,1.49247226386235
## P5,1,20,1.489361156971
## P5,1,21,1.48719903522068
## P5,1,22,1.49187084621853
## P5,1,23,1.47416666575841
## P5,1,24,1.49492593951847
## P5,1,25,1.47922016740814
## P5,1,26,1.49816790223122
## P5,1,27,1.4874979292137
## P5,1,28,1.49528426276313
## P5,1,29,1.48962672358226
## P5,1,30,1.49228028962106
## P5,1,31,1.49489623221798
## P5,1,32,1.49945289558835
## P5,1,33,1.49102689768817
## P5,1,34,1.49447886149089
## P5,1,35,1.49411547231484
## P5,1,36,1.49441602845855
## P5,1,37,1.49311388271481
## P5,1,38,1.48988429202309
## P5,1,39,1.49345637441755
## P5,1,40,1.49255519365742
## P5,1,41,1.49328654280333
## P5,1,42,1.49303573534634
## P5,1,43,1.49070977040057
## P5,1,44,1.49101847025656
## P5,1,45,1.49389631450176
## P5,1,46,1.48073391452912
## P5,1,47,1.49292039366626
## P5,1,48,1.49028243088141
## P5,1,49,1.48794014062454
## P5,1,50,1.49368225517273
## P5,2,1,1.49198135284528
## P5,2,2,1.48465436256972
## P5,2,3,1.47830002603967
## P5,2,4,1.49208730768274
## P5,2,5,1.49940976863954
## P5,2,6,1.4914940258242
## P5,2,7,1.49058632623582
## P5,2,8,1.49811300307668
## P5,2,9,1.4900111987673
## P5,2,10,1.49916567963161
## P5,2,11,1.47471257618495
## P5,2,12,1.4929242176669
## P5,2,13,1.45086107254028
## P5,2,14,1.49480396174313
## P5,2,15,1.49332885022433
## P5,2,16,1.48841961769209
## P5,2,17,1.49249533693234
## P5,2,18,1.48106099019008
## P5,2,19,1.48983848249757
## P5,2,20,1.49344039194792
## P5,2,21,1.49019117433517
## P5,2,22,1.49284046749736
## P5,2,23,1.49616588108123
## P5,2,24,1.48436486871937
## P5,2,25,1.47738022779031
## P5,2,26,1.49464501274957
## P5,2,27,1.48903650122804
## P5,2,28,1.49067106030204
## P5,2,29,1.48481692615737
## P5,2,30,1.49305389404297
## P5,2,31,1.49440975606877
## P5,2,32,1.48444402643612
## P5,2,33,1.47700654892694
## P5,2,34,1.49316074022281
## P5,2,35,1.48827997674333
## P5,2,36,1.49465232510721
## P5,2,37,1.49206387387575
## P5,2,38,1.48905555407206
## P5,2,39,1.46686936212965
## P5,2,40,1.49152311550573
## P5,2,41,1.492742324362
## P5,2,42,1.49375310570303
## P5,2,43,1.48130108046052
## P5,2,44,1.49701904659429
## P5,2,45,1.48032083655849
## P5,2,46,1.49131433628807
## P5,2,47,1.49214174392376
## P5,2,48,1.48955600292652
## P5,2,49,1.49402897001251
## P5,2,50,1.49052567159578
## P5,3,1,1.49245230011318
## P5,3,2,1.49157294687235
## P5,3,3,1.49077220633626
## P5,3,4,1.48995244698446
## P5,3,5,1.4914328504053
## P5,3,6,1.49142810200038
## P5,3,7,1.49254019863634
## P5,3,8,1.49056416031317
## P5,3,9,1.49075176466757
## P5,3,10,1.49166214942932
## P5,3,11,1.49162712725964
## P5,3,12,1.49139362573624
## P5,3,13,1.49220484495163
## P5,3,14,1.49359960945285
## P5,3,15,1.49276551405589
## P5,3,16,1.49003002998677
## P5,3,17,1.49779963951844
## P5,3,18,1.49070299440815
## P5,3,19,1.4931082934664
## P5,3,20,1.4911873737971
## P5,3,21,1.49146099009756
## P5,3,22,1.48969141933896
## P5,3,23,1.4916938312592
## P5,3,24,1.49155312014702
## P5,3,25,1.49051982706243
## P5,3,26,1.49162906663031
## P5,3,27,1.49147964954376
## P5,3,28,1.48877118404647
## P5,3,29,1.49318025829075
## P5,3,30,1.49165107790104
## P5,3,31,1.49085901388481
## P5,3,32,1.49121425731762
## P5,3,33,1.4892454364083
## P5,3,34,1.49129054420873
## P5,3,35,1.49194799993456
## P5,3,36,1.49121355366062
## P5,3,37,1.49304605544882
## P5,3,38,1.50153895983329
## P5,3,39,1.48959119476541
## P5,3,40,1.49080412963341
## P5,3,41,1.49571018417676
## P5,3,42,1.49221031301715
## P5,3,43,1.49737223890639
## P5,3,44,1.48892880991886
## P5,3,45,1.48792592181435
## P5,3,46,1.4930706896433
## P5,3,47,1.47316113938677
## P5,3,48,1.49317852656047
## P5,3,49,1.49416327786136
## P5,3,50,1.49235966061101
## P5,4,1,1.49162974622515
## P5,4,2,1.49174999055408
## P5,4,3,1.47227622781481
## P5,4,4,1.49357408635757
## P5,4,5,1.49058035441807
## P5,4,6,1.49214917323628
## P5,4,7,1.49157548930547
## P5,4,8,1.49035201353185
## P5,4,9,1.48979785442352
## P5,4,10,1.49050891399384
## P5,4,11,1.49276488167899
## P5,4,12,1.49094800651073
## P5,4,13,1.49146234698412
## P5,4,14,1.49115667770158
## P5,4,15,1.49078623692792
## P5,4,16,1.4913496914364
## P5,4,17,1.49207001094577
## P5,4,18,1.47949870733114
## P5,4,19,1.49387634131644
## P5,4,20,1.48329710960388
## P5,4,21,1.50157985576364
## P5,4,22,1.49335776693453
## P5,4,23,1.49085492557949
## P5,4,24,1.4784985060739
## P5,4,25,1.50509292237899
## P5,4,26,1.49192428588867
## P5,4,27,1.44292129116294
## P5,4,28,1.49315333230155
## P5,4,29,1.49284210698358
## P5,4,30,1.49221852192512
## P5,4,31,1.49185651721376
## P5,4,32,1.49016607671544
## P5,4,33,1.4904196148827
## P5,4,34,1.49071483726961
## P5,4,35,1.49662504623185
## P5,4,36,1.49381603458063
## P5,4,37,1.49091857466204
## P5,4,38,1.48800191425142
## P5,4,39,1.49062051665917
## P5,4,40,1.51444919292743
## P5,4,41,1.50996827227729
## P5,4,42,1.48783328361118
## P5,4,43,1.50208419202322
## P5,4,44,1.4900888818683
## P5,4,45,1.48955915285193
## P5,4,46,1.49690394886469
## P5,4,47,1.47790241241455
## P5,4,48,1.49674407700847
## P5,4,49,1.4909331734116
## P5,4,50,1.49135029391302
## P5,5,1,1.49199811328541
## P5,5,2,1.49192050341013
## P5,5,3,1.49130152998299
## P5,5,4,1.49424251869543
## P5,5,5,1.49124583743867
## P5,5,6,1.48723209422568
## P5,5,7,1.4907536867286
## P5,5,8,1.49097080122341
## P5,5,9,1.49098167123721
## P5,5,10,1.49072178204854
## P5,5,11,1.49185897736322
## P5,5,12,1.49030962560931
## P5,5,13,1.4924263851617
## P5,5,14,1.49105874300003
## P5,5,15,1.49108294078282
## P5,5,16,1.4913237846061
## P5,5,17,1.4931182347092
## P5,5,18,1.49275336342473
## P5,5,19,1.49149466791461
## P5,5,20,1.49109571080812
## P5,5,21,1.49079278689712
## P5,5,22,1.49305209828846
## P5,5,23,1.49160716984723
## P5,5,24,1.49105225187359
## P5,5,25,1.49196472227203
## P5,5,26,1.49206026792526
## P5,5,27,1.49177179461211
## P5,5,28,1.49111448814129
## P5,5,29,1.49215954840183
## P5,5,30,1.49050053828905
## P5,5,31,1.49067956063806
## P5,5,32,1.49129055354221
## P5,5,33,1.49175960554493
## P5,5,34,1.49169647504413
## P5,5,35,1.49191970985477
## P5,5,36,1.49084488834654
## P5,5,37,1.49165830828927
## P5,5,38,1.49067660740444
## P5,5,39,1.49408307376209
## P5,5,40,1.49060820320905
## P5,5,41,1.49224941281305
## P5,5,42,1.49180240124728
## P5,5,43,1.47924540561178
## P5,5,44,1.49195862938376
## P5,5,45,1.49150436574763
## P5,5,46,1.49082741244086
## P5,5,47,1.4920323504958
## P5,5,48,1.49192181126825
## P5,5,49,1.49270016867835
## P5,5,50,1.49175483347054
## P5,6,1,1.49135291946601
## P5,6,2,1.49244701055656
## P5,6,3,1.49291264913916
## P5,6,4,1.49161233112311
## P5,6,5,1.49213736823627
## P5,6,6,1.49329776007955
## P5,6,7,1.49205224008271
## P5,6,8,1.49243612038462
## P5,6,9,1.49197065364049
## P5,6,10,1.49167094771395
## P5,6,11,1.4908596534729
## P5,6,12,1.49250652263691
## P5,6,13,1.4910042145673
## P5,6,14,1.49176966239666
## P5,6,15,1.4912617792163
## P5,6,16,1.49153266143799
## P5,6,17,1.49084294668519
## P5,6,18,1.49544176720736
## P5,6,19,1.49359557032585
## P5,6,20,1.49393212499697
## P5,6,21,1.49167659216457
## P5,6,22,1.49425489361547
## P5,6,23,1.49268846596237
## P5,6,24,1.49251132806142
## P5,6,25,1.48667719914363
## P5,6,26,1.49136211001684
## P5,6,27,1.4918450290717
## P5,6,28,1.491714488459
## P5,6,29,1.49136476981931
## P5,6,30,1.49108449518681
## P5,6,31,1.49077988971363
## P5,6,32,1.49165591951144
## P5,6,33,1.49256458835325
## P5,6,34,1.49129208531873
## P5,6,35,1.49210475327133
## P5,6,36,1.49188873332034
## P5,6,37,1.49135068511963
## P5,6,38,1.4918079984949
## P5,6,39,1.49191286767176
## P5,6,40,1.49090633626844
## P5,6,41,1.49254237480883
## P5,6,42,1.48887679917472
## P5,6,43,1.49171165658646
## P5,6,44,1.49329021752599
## P5,6,45,1.49302183664762
## P5,6,46,1.49159144739951
## P5,6,47,1.49267165891586
## P5,6,48,1.49015358391158
## P5,6,49,1.49111208728715
## P5,6,50,1.49121515891131
## P5,7,1,1.49134234515103
## P5,7,2,1.49313213825226
## P5,7,3,1.49115213369712
## P5,7,4,1.49023997783661
## P5,7,5,1.49225385821595
## P5,7,6,1.49609838213239
## P5,7,7,1.51200194261512
## P5,7,8,1.48791960038637
## P5,7,9,1.49552247353962
## P5,7,10,1.49234397787797
## P5,7,11,1.49165206132112
## P5,7,12,1.49431037902832
## P5,7,13,1.49216697063852
## P5,7,14,1.49314587587004
## P5,7,15,1.49010884654415
## P5,7,16,1.49244035405221
## P5,7,17,1.49132897339615
## P5,7,18,1.49187420931729
## P5,7,19,1.49206918645128
## P5,7,20,1.4916435001853
## P5,7,21,1.49261038082162
## P5,7,22,1.49890185991923
## P5,7,23,1.49204471732388
## P5,7,24,1.49286851557818
## P5,7,25,1.49138839244843
## P5,7,26,1.49317474622984
## P5,7,27,1.48955515206578
## P5,7,28,1.49143527448177
## P5,7,29,1.48897376590305
## P5,7,30,1.49280384497914
## P5,7,31,1.48428417481098
## P5,7,32,1.49151963506426
## P5,7,33,1.49203846714284
## P5,7,34,1.4909442109721
## P5,7,35,1.4909502546838
## P5,7,36,1.49313740894712
## P5,7,37,1.4920559090175
## P5,7,38,1.49222441514333
## P5,7,39,1.47643338458639
## P5,7,40,1.49490757861169
## P5,7,41,1.49074639424239
## P5,7,42,1.49657467230042
## P5,7,43,1.49099861111557
## P5,7,44,1.49079465254759
## P5,7,45,1.49133562650837
## P5,7,46,1.49112726109368
## P5,7,47,1.49165494582232
## P5,7,48,1.49312989608101
## P5,7,49,1.49470991558499
## P5,7,50,1.49339999448169
## P5,8,1,1.49025191131391
## P5,8,2,1.49213841786751
## P5,8,3,1.49354354234842
## P5,8,4,1.48952983942899
## P5,8,5,1.49408642947674
## P5,8,6,1.4918024072942
## P5,8,7,1.49591561649623
## P5,8,8,1.48812412493157
## P5,8,9,1.49246601400704
## P5,8,10,1.49044365310669
## P5,8,11,1.49059043072238
## P5,8,12,1.49012622625931
## P5,8,13,1.4908010857737
## P5,8,14,1.49174919634154
## P5,8,15,1.49131470236159
## P5,8,16,1.49135584666811
## P5,8,17,1.49959380212037
## P5,8,18,1.48878407478333
## P5,8,19,1.49120214792687
## P5,8,20,1.49185034308103
## P5,8,21,1.49468578843989
## P5,8,22,1.49013098514441
## P5,8,23,1.49236992493417
## P5,8,24,1.48825565322501
## P5,8,25,1.49312064358007
## P5,8,26,1.49524697551021
## P5,8,27,1.49154313405355
## P5,8,28,1.49154817554313
## P5,8,29,1.4917961250652
## P5,8,30,1.4912674573003
## P5,8,31,1.4919928755079
## P5,8,32,1.49505575079667
## P5,8,33,1.49291142145793
## P5,8,34,1.48418719331983
## P5,8,35,1.49981507947368
## P5,8,36,1.48702218639317
## P5,8,37,1.48928448765777
## P5,8,38,1.49209743075901
## P5,8,39,1.49358513775994
## P5,8,40,1.49117580789034
## P5,8,41,1.49160065078735
## P5,8,42,1.49129049198048
## P5,8,43,1.49071175037044
## P5,8,44,1.49111353296812
## P5,8,45,1.49126181541345
## P5,8,46,1.49134495781689
## P5,8,47,1.49097198109294
## P5,8,48,1.49261438319113
## P5,8,49,1.49008065414429
## P5,8,50,1.49173292328441
## P5,9,1,1.49837785543397
## P5,9,2,1.49141627658497
## P5,9,3,1.49214641437974
## P5,9,4,1.49076614172562
## P5,9,5,1.49151746501093
## P5,9,6,1.49057767486572
## P5,9,7,1.49303420719348
## P5,9,8,1.49147434745516
## P5,9,9,1.49234292799966
## P5,9,10,1.49170438448588
## P5,9,11,1.49027156829834
## P5,9,12,1.49366295659864
## P5,9,13,1.49142110758814
## P5,9,14,1.4910596593221
## P5,9,15,1.49132904387612
## P5,9,16,1.49025915764474
## P5,9,17,1.49189546031337
## P5,9,18,1.49138875489824
## P5,9,19,1.49135567855835
## P5,9,20,1.49131607782273
## P5,9,21,1.49166441297198
## P5,9,22,1.49267108623798
## P5,9,23,1.49192917346954
## P5,9,24,1.49123165084095
## P5,9,25,1.49463153165929
## P5,9,26,1.49026657934902
## P5,9,27,1.49161289195822
## P5,9,28,1.48983108347112
## P5,9,29,1.49134201714487
## P5,9,30,1.49110376184637
## P5,9,31,1.49183016827232
## P5,9,32,1.48086841901143
## P5,9,33,1.49074517906486
## P5,9,34,1.49222983812031
## P5,9,35,1.49171940485636
## P5,9,36,1.49248006343842
## P5,9,37,1.4905574592677
## P5,9,38,1.49217836545861
## P5,9,39,1.49435540401574
## P5,9,40,1.49244813635798
## P5,9,41,1.48904198984946
## P5,9,42,1.49133964061737
## P5,9,43,1.49389599177463
## P5,9,44,1.48903745892404
## P5,9,45,1.49237800212134
## P5,9,46,1.49052680863274
## P5,9,47,1.49132204751899
## P5,9,48,1.48829898499606
## P5,9,49,1.49179234635939
## P5,9,50,1.49178625401713
## P5,10,1,1.49115922274413
## P5,10,2,1.49185476423819
## P5,10,3,1.49116100898156
## P5,10,4,1.49143369546097
## P5,10,5,1.48703156942609
## P5,10,6,1.49164930626198
## P5,10,7,1.492247889642
## P5,10,8,1.49021599265967
## P5,10,9,1.49121410581801
## P5,10,10,1.49154112473974
## P5,10,11,1.49145095878177
## P5,10,12,1.49565525798054
## P5,10,13,1.4945669376244
## P5,10,14,1.4910517787257
## P5,10,15,1.49010371786403
## P5,10,16,1.4907174217567
## P5,10,17,1.49221192087446
## P5,10,18,1.48981329024307
## P5,10,19,1.49146129082942
## P5,10,20,1.49079041965937
## P5,10,21,1.49087623822487
## P5,10,22,1.49177384376526
## P5,10,23,1.49012504730906
## P5,10,24,1.48912716374814
## P5,10,25,1.49244468212128
## P5,10,26,1.49114692365968
## P5,10,27,1.49376501355852
## P5,10,28,1.49197735152878
## P5,10,29,1.49146642814688
## P5,10,30,1.49252103002448
## P5,10,31,1.49217407415945
## P5,10,32,1.49186994812705
## P5,10,33,1.49336418331179
## P5,10,34,1.49051765962081
## P5,10,35,1.49648159251494
## P5,10,36,1.49195263783137
## P5,10,37,1.49115576214261
## P5,10,38,1.49094152450562
## P5,10,39,1.49454231511534
## P5,10,40,1.49324383900083
## P5,10,41,1.49056328103897
## P5,10,42,1.49136219353511
## P5,10,43,1.49065878376457
## P5,10,44,1.49530948911394
## P5,10,45,1.48618943041021
## P5,10,46,1.49171511332194
## P5,10,47,1.49223965644836
## P5,10,48,1.49039677294289
## P5,10,49,1.49194644421947
## P5,10,50,1.49113149700051
## P6,1,1,1.49227607072289
## P6,1,2,1.4938959907478
## P6,1,3,1.49184777239244
## P6,1,4,1.49212008396178
## P6,1,5,1.49871272069437
## P6,1,6,1.49204620666052
## P6,1,7,1.50457880232069
## P6,1,8,1.47799602307771
## P6,1,9,1.49608174732753
## P6,1,10,1.47617400367305
## P6,1,11,1.52201096216838
## P6,1,12,1.49139648828751
## P6,1,13,1.50855925369263
## P6,1,14,1.49242963622102
## P6,1,15,1.49317203435031
## P6,1,16,1.48811838713037
## P6,1,17,1.49376708549141
## P6,1,18,1.50480046272278
## P6,1,19,1.48840981721878
## P6,1,20,1.49330945375587
## P6,1,21,1.49024987220764
## P6,1,22,1.49323920673794
## P6,1,23,1.49576319923884
## P6,1,24,1.53328086589945
## P6,1,25,1.50383979130567
## P6,1,26,1.47684191041074
## P6,1,27,1.51303270425689
## P6,1,28,1.50389882994861
## P6,1,29,1.50485129892473
## P6,1,30,1.48880277696203
## P6,1,31,1.48968938777321
## P6,1,32,1.48423093159993
## P6,1,33,1.48442659737929
## P6,1,34,1.48628432410104
## P6,1,35,1.49847383436814
## P6,1,36,1.49124805600035
## P6,1,37,1.48736494779587
## P6,1,38,1.49263906029035
## P6,1,39,1.49040177890233
## P6,1,40,1.49638362307298
## P6,1,41,1.50228670438131
## P6,1,42,1.48122744333176
## P6,1,43,1.49149490097194
## P6,1,44,1.49363079227385
## P6,1,45,1.49024335961593
## P6,1,46,1.49166815455367
## P6,1,47,1.49854155346356
## P6,1,48,1.4936841909702
## P6,1,49,1.49399613671833
## P6,1,50,1.49002782791176
## P6,2,1,1.49134759579675
## P6,2,2,1.48904987672965
## P6,2,3,1.49102585290068
## P6,2,4,1.49295965194702
## P6,2,5,1.49395098785559
## P6,2,6,1.47338291527568
## P6,2,7,1.50529678765829
## P6,2,8,1.4855470851976
## P6,2,9,1.48725147905021
## P6,2,10,1.49810424398203
## P6,2,11,1.5010193330901
## P6,2,12,1.48538622071471
## P6,2,13,1.48968749954587
## P6,2,14,1.49378803253174
## P6,2,15,1.48955865663903
## P6,2,16,1.49353873443604
## P6,2,17,1.49160112694996
## P6,2,18,1.49508076824554
## P6,2,19,1.49456171087317
## P6,2,20,1.49275743192242
## P6,2,21,1.47912277059352
## P6,2,22,1.49231260163443
## P6,2,23,1.49303632312351
## P6,2,24,1.48867900371552
## P6,2,25,1.48983892301718
## P6,2,26,1.48935811808615
## P6,2,27,1.46923155784607
## P6,2,28,1.48677525086836
## P6,2,29,1.49040286220721
## P6,2,30,1.49206389961662
## P6,2,31,1.49008810520172
## P6,2,32,1.49251521165204
## P6,2,33,1.49940049320186
## P6,2,34,1.48854461469148
## P6,2,35,1.49818163274605
## P6,2,36,1.49241966562173
## P6,2,37,1.48930477881217
## P6,2,38,1.49602182601628
## P6,2,39,1.50809368491173
## P6,2,40,1.48401929621111
## P6,2,41,1.5000422415526
## P6,2,42,1.49255114086604
## P6,2,43,1.49782615154982
## P6,2,44,1.49042465209961
## P6,2,45,1.48926559714384
## P6,2,46,1.49163620236894
## P6,2,47,1.4903371199122
## P6,2,48,1.49264804587876
## P6,2,49,1.49476302559696
## P6,2,50,1.49021389929803
## P6,3,1,1.4921329498291
## P6,3,2,1.49281624678908
## P6,3,3,1.49173250615271
## P6,3,4,1.49204078316689
## P6,3,5,1.49303751978381
## P6,3,6,1.49229894598869
## P6,3,7,1.49105735956612
## P6,3,8,1.49162574072142
## P6,3,9,1.4922684930986
## P6,3,10,1.49273533291287
## P6,3,11,1.49258462587992
## P6,3,12,1.4913502269321
## P6,3,13,1.49233584351592
## P6,3,14,1.49080372625782
## P6,3,15,1.49164730875116
## P6,3,16,1.4916942914327
## P6,3,17,1.49243272344271
## P6,3,18,1.49161392260509
## P6,3,19,1.491335272789
## P6,3,20,1.49337734554125
## P6,3,21,1.4926230462931
## P6,3,22,1.49119820092854
## P6,3,23,1.49186967213949
## P6,3,24,1.4916154020711
## P6,3,25,1.49040543882153
## P6,3,26,1.4918884396553
## P6,3,27,1.49688133759932
## P6,3,28,1.49302779634794
## P6,3,29,1.49193803195296
## P6,3,30,1.49028288643315
## P6,3,31,1.49543772686969
## P6,3,32,1.49144941284543
## P6,3,33,1.48524011947491
## P6,3,34,1.49948453367426
## P6,3,35,1.49108093015609
## P6,3,36,1.49293152658563
## P6,3,37,1.49118054431418
## P6,3,38,1.49308524690233
## P6,3,39,1.49177971611852
## P6,3,40,1.49012146800397
## P6,3,41,1.49342797304455
## P6,3,42,1.49156921985103
## P6,3,43,1.49179363651436
## P6,3,44,1.49037425084548
## P6,3,45,1.49221218848715
## P6,3,46,1.49286382899565
## P6,3,47,1.49464005515689
## P6,3,48,1.48899916302074
## P6,3,49,1.48772262804436
## P6,3,50,1.49080815996443
## P6,4,1,1.49008475031172
## P6,4,2,1.49456633096454
## P6,4,3,1.48963601772602
## P6,4,4,1.49076501727104
## P6,4,5,1.49235981206099
## P6,4,6,1.49190517093824
## P6,4,7,1.49219620717715
## P6,4,8,1.49131821894991
## P6,4,9,1.49016967289884
## P6,4,10,1.4916053239037
## P6,4,11,1.49154561938662
## P6,4,12,1.4926405410244
## P6,4,13,1.49292434836334
## P6,4,14,1.49090743220709
## P6,4,15,1.4916615486145
## P6,4,16,1.49307974624634
## P6,4,17,1.49025513833029
## P6,4,18,1.49053495749831
## P6,4,19,1.4914090001685
## P6,4,20,1.48971092816695
## P6,4,21,1.49187766265869
## P6,4,22,1.49221439126097
## P6,4,23,1.49123541867291
## P6,4,24,1.49216965436935
## P6,4,25,1.49168700438279
## P6,4,26,1.49195908032931
## P6,4,27,1.49222530797124
## P6,4,28,1.49108728495511
## P6,4,29,1.49160715606478
## P6,4,30,1.48905312653744
## P6,4,31,1.4918193318123
## P6,4,32,1.49123892417321
## P6,4,33,1.49184781547606
## P6,4,34,1.49187931450464
## P6,4,35,1.49308214868818
## P6,4,36,1.49074809691485
## P6,4,37,1.49047672230264
## P6,4,38,1.49056497216225
## P6,4,39,1.49173677367652
## P6,4,40,1.4903834713392
## P6,4,41,1.49065679662368
## P6,4,42,1.49111822976006
## P6,4,43,1.49242630757784
## P6,4,44,1.49741703135367
## P6,4,45,1.49101969278776
## P6,4,46,1.47873806357384
## P6,4,47,1.50044936492663
## P6,4,48,1.49756369525439
## P6,4,49,1.4982511806488
## P6,4,50,1.48980323158376
## P6,5,1,1.49177657002988
## P6,5,2,1.49256678188548
## P6,5,3,1.49125722249349
## P6,5,4,1.49176771887417
## P6,5,5,1.49029463376754
## P6,5,6,1.48806310583044
## P6,5,7,1.49120612939199
## P6,5,8,1.49186517642095
## P6,5,9,1.49225687324454
## P6,5,10,1.49508426691356
## P6,5,11,1.49158479549267
## P6,5,12,1.49262978290689
## P6,5,13,1.49218651423087
## P6,5,14,1.49069760266472
## P6,5,15,1.49304568282957
## P6,5,16,1.49193782660797
## P6,5,17,1.4916205562529
## P6,5,18,1.49100375997609
## P6,5,19,1.49337450389204
## P6,5,20,1.49163655338124
## P6,5,21,1.49268562235731
## P6,5,22,1.49259446030956
## P6,5,23,1.4904363155365
## P6,5,24,1.49160502696859
## P6,5,25,1.49288492564914
## P6,5,26,1.49191254888262
## P6,5,27,1.48977446315264
## P6,5,28,1.48881462097168
## P6,5,29,1.49085229790729
## P6,5,30,1.49181936156582
## P6,5,31,1.49162990459497
## P6,5,32,1.48966314885523
## P6,5,33,1.49284868890589
## P6,5,34,1.49412701769573
## P6,5,35,1.49116143640482
## P6,5,36,1.49266712935929
## P6,5,37,1.4905350286882
## P6,5,38,1.49247928013075
## P6,5,39,1.49193443971522
## P6,5,40,1.4898250554059
## P6,5,41,1.50172078609467
## P6,5,42,1.48776644720158
## P6,5,43,1.49136847773875
## P6,5,44,1.49136727856052
## P6,5,45,1.49129726960487
## P6,5,46,1.49268309381984
## P6,5,47,1.49268565279372
## P6,5,48,1.48365961031967
## P6,5,49,1.48856470502656
## P6,5,50,1.493260260286
## P6,6,1,1.49235987317735
## P6,6,2,1.49199778338273
## P6,6,3,1.49084038850738
## P6,6,4,1.4935204188029
## P6,6,5,1.49163243226838
## P6,6,6,1.49230349184287
## P6,6,7,1.49177766799927
## P6,6,8,1.49158284500355
## P6,6,9,1.48956992534491
## P6,6,10,1.49302522414321
## P6,6,11,1.49209534367429
## P6,6,12,1.49139789647834
## P6,6,13,1.49265473928207
## P6,6,14,1.48373689008563
## P6,6,15,1.49450994766865
## P6,6,16,1.49318406856166
## P6,6,17,1.49091252342599
## P6,6,18,1.49197642542735
## P6,6,19,1.4919586794092
## P6,6,20,1.4923887677712
## P6,6,21,1.49196601797033
## P6,6,22,1.49175173161077
## P6,6,23,1.49167088166024
## P6,6,24,1.49249496785077
## P6,6,25,1.49317072258621
## P6,6,26,1.49184726154993
## P6,6,27,1.49272833930122
## P6,6,28,1.49172307132335
## P6,6,29,1.49162041538894
## P6,6,30,1.49245874087016
## P6,6,31,1.49223891771757
## P6,6,32,1.49135927671797
## P6,6,33,1.49162986990693
## P6,6,34,1.49265682834318
## P6,6,35,1.49295719691685
## P6,6,36,1.49216125561641
## P6,6,37,1.49191964504331
## P6,6,38,1.4917894701163
## P6,6,39,1.49158095800748
## P6,6,40,1.49221595999313
## P6,6,41,1.49199497456453
## P6,6,42,1.49126606102449
## P6,6,43,1.48985372023149
## P6,6,44,1.49163289631114
## P6,6,45,1.49189770876706
## P6,6,46,1.49016964579203
## P6,6,47,1.4914209994864
## P6,6,48,1.49261685499211
## P6,6,49,1.49178723533555
## P6,6,50,1.49229464831052
## P6,7,1,1.49175227698633
## P6,7,2,1.49119742711385
## P6,7,3,1.49159643567842
## P6,7,4,1.4916771082651
## P6,7,5,1.49024597390906
## P6,7,6,1.49307280182838
## P6,7,7,1.49168143313155
## P6,7,8,1.49222310205524
## P6,7,9,1.49290584046164
## P6,7,10,1.49071265012026
## P6,7,11,1.49464321732521
## P6,7,12,1.49180561006069
## P6,7,13,1.49086567796307
## P6,7,14,1.49066807094373
## P6,7,15,1.49250862002373
## P6,7,16,1.49357978428636
## P6,7,17,1.48912801742554
## P6,7,18,1.49145059175389
## P6,7,19,1.49222022836859
## P6,7,20,1.49151341915131
## P6,7,21,1.49228059120898
## P6,7,22,1.49171967506409
## P6,7,23,1.49231615451851
## P6,7,24,1.49161341786385
## P6,7,25,1.49182820901638
## P6,7,26,1.49386457368439
## P6,7,27,1.49141262618589
## P6,7,28,1.49019902184506
## P6,7,29,1.49246001243591
## P6,7,30,1.49161674836103
## P6,7,31,1.49212184953101
## P6,7,32,1.49213711954966
## P6,7,33,1.49207921882174
## P6,7,34,1.49220403734144
## P6,7,35,1.4942347353155
## P6,7,36,1.48849332638276
## P6,7,37,1.49761942813271
## P6,7,38,1.48945138152217
## P6,7,39,1.49092668294907
## P6,7,40,1.49461753332793
## P6,7,41,1.48977284037739
## P6,7,42,1.49189628042826
## P6,7,43,1.49507831675666
## P6,7,44,1.49267599762989
## P6,7,45,1.49251905465737
## P6,7,46,1.49179135640462
## P6,7,47,1.49459904118588
## P6,7,48,1.49115629103577
## P6,7,49,1.49265655216418
## P6,7,50,1.49132686913616
## P6,8,1,1.49313675729852
## P6,8,2,1.49079842278452
## P6,8,3,1.49177752002593
## P6,8,4,1.49188020354823
## P6,8,5,1.49047934901607
## P6,8,6,1.4913377073076
## P6,8,7,1.4915023503765
## P6,8,8,1.49068785639643
## P6,8,9,1.49258673085576
## P6,8,10,1.49164465023921
## P6,8,11,1.48988161916318
## P6,8,12,1.4918165564537
## P6,8,13,1.49149361435248
## P6,8,14,1.49378652157991
## P6,8,15,1.49179268640185
## P6,8,16,1.49194336759633
## P6,8,17,1.49088632265727
## P6,8,18,1.48934377607752
## P6,8,19,1.49358160355512
## P6,8,20,1.49455136060715
## P6,8,21,1.48963034493583
## P6,8,22,1.490004496915
## P6,8,23,1.49147798220317
## P6,8,24,1.49247963134557
## P6,8,25,1.49216308091816
## P6,8,26,1.49164643398551
## P6,8,27,1.49070401285209
## P6,8,28,1.49218855902206
## P6,8,29,1.49159615647559
## P6,8,30,1.49161813855171
## P6,8,31,1.49165074391799
## P6,8,32,1.49281940962139
## P6,8,33,1.48734939261659
## P6,8,34,1.4905071914196
## P6,8,35,1.49465085739313
## P6,8,36,1.49244006820347
## P6,8,37,1.49348086377849
## P6,8,38,1.49146460741758
## P6,8,39,1.49164506581825
## P6,8,40,1.49195673910238
## P6,8,41,1.49105726656064
## P6,8,42,1.49265168380737
## P6,8,43,1.4915398817796
## P6,8,44,1.4929055381067
## P6,8,45,1.48781502246857
## P6,8,46,1.49339838924571
## P6,8,47,1.49194784164429
## P6,8,48,1.49241549227418
## P6,8,49,1.49242162704468
## P6,8,50,1.49180385024104
## P6,9,1,1.4921425010847
## P6,9,2,1.49117879169743
## P6,9,3,1.49248359369677
## P6,9,4,1.49081170775674
## P6,9,5,1.49199828420367
## P6,9,6,1.49635136585969
## P6,9,7,1.49196005364259
## P6,9,8,1.49162217617035
## P6,9,9,1.49324469793411
## P6,9,10,1.49112532215734
## P6,9,11,1.4919156002742
## P6,9,12,1.49190595673352
## P6,9,13,1.49099172143375
## P6,9,14,1.49182267846732
## P6,9,15,1.48863967707459
## P6,9,16,1.49164081453443
## P6,9,17,1.49169571201007
## P6,9,18,1.49268244613301
## P6,9,19,1.49215496848611
## P6,9,20,1.49187394550868
## P6,9,21,1.49282076047814
## P6,9,22,1.4918380571791
## P6,9,23,1.49279173310981
## P6,9,24,1.48811253330164
## P6,9,25,1.49272655898874
## P6,9,26,1.49701960167188
## P6,9,27,1.49180660662444
## P6,9,28,1.49192948287792
## P6,9,29,1.49079556430844
## P6,9,30,1.49239391952981
## P6,9,31,1.49219051996867
## P6,9,32,1.49129467010498
## P6,9,33,1.48793326253476
## P6,9,34,1.4938779870669
## P6,9,35,1.49265227052901
## P6,9,36,1.48914188808865
## P6,9,37,1.49072226725127
## P6,9,38,1.49374121711368
## P6,9,39,1.4931306540966
## P6,9,40,1.47747691472371
## P6,9,41,1.50949161393302
## P6,9,42,1.48137289424275
## P6,9,43,1.49010287089781
## P6,9,44,1.4971639088222
## P6,9,45,1.47709751910851
## P6,9,46,1.49845667446361
## P6,9,47,1.48689298160741
## P6,9,48,1.49449813899709
## P6,9,49,1.49083829480548
## P6,9,50,1.49195813391197
## P6,10,1,1.4922399520874
## P6,10,2,1.49252940387261
## P6,10,3,1.49155698057081
## P6,10,4,1.49111756483714
## P6,10,5,1.49304989973704
## P6,10,6,1.49171324663384
## P6,10,7,1.49152176720755
## P6,10,8,1.49283730983734
## P6,10,9,1.49175805058973
## P6,10,10,1.49360199769338
## P6,10,11,1.48974835431134
## P6,10,12,1.49257330099742
## P6,10,13,1.49132455950198
## P6,10,14,1.49172593355179
## P6,10,15,1.49266966906461
## P6,10,16,1.49203759319377
## P6,10,17,1.49071318170299
## P6,10,18,1.49389285700662
## P6,10,19,1.49211838415691
## P6,10,20,1.49145296944512
## P6,10,21,1.48976969285445
## P6,10,22,1.49265266548504
## P6,10,23,1.49175956811798
## P6,10,24,1.48936410934206
## P6,10,25,1.49246131579081
## P6,10,26,1.49187942482959
## P6,10,27,1.48916447162628
## P6,10,28,1.49274213690507
## P6,10,29,1.49268500658931
## P6,10,30,1.4911507693204
## P6,10,31,1.49412724801472
## P6,10,32,1.49117798487345
## P6,10,33,1.4926892220974
## P6,10,34,1.49294064839681
## P6,10,35,1.49136079058928
## P6,10,36,1.49165078651073
## P6,10,37,1.49254030093812
## P6,10,38,1.49132016553717
## P6,10,39,1.49130444228649
## P6,10,40,1.49373476703962
## P6,10,41,1.49153604178593
## P6,10,42,1.4925546836853
## P6,10,43,1.4911887910631
## P6,10,44,1.49132940504286
## P6,10,45,1.49144672703099
## P6,10,46,1.49271908471751
## P6,10,47,1.4923453217461
## P6,10,48,1.4935548949886
## P6,10,49,1.49122289375023
## P6,10,50,1.49203831774192
## P7,1,1,1.49517526626587
## P7,1,2,1.49329022327101
## P7,1,3,1.49387971242269
## P7,1,4,1.49369205321584
## P7,1,5,1.49241615349138
## P7,1,6,1.49264378817576
## P7,1,7,1.4949390411377
## P7,1,8,1.49371422806831
## P7,1,9,1.49388893989668
## P7,1,10,1.49324996755757
## P7,1,11,1.49517833677113
## P7,1,12,1.49275613845663
## P7,1,13,1.49209214464019
## P7,1,14,1.49375431239605
## P7,1,15,1.49279015280984
## P7,1,16,1.49406262049599
## P7,1,17,1.49521338578426
## P7,1,18,1.48537968356034
## P7,1,19,1.48932053907862
## P7,1,20,1.49070481210947
## P7,1,21,1.49600071766797
## P7,1,22,1.49001417160034
## P7,1,23,1.4947793262521
## P7,1,24,1.48984012459264
## P7,1,25,1.49381898551859
## P7,1,26,1.4965020793758
## P7,1,27,1.49390274828131
## P7,1,28,1.49462948563278
## P7,1,29,1.50381625708887
## P7,1,30,1.4886405745218
## P7,1,31,1.49183981948429
## P7,1,32,1.4970789605921
## P7,1,33,1.49053455687858
## P7,1,34,1.4928900670197
## P7,1,35,1.49225003378732
## P7,1,36,1.49292393525441
## P7,1,37,1.50240613354577
## P7,1,38,1.4988202676177
## P7,1,39,1.4892833666368
## P7,1,40,1.48917143586753
## P7,1,41,1.50689517656962
## P7,1,42,1.49474172722803
## P7,1,43,1.49086463928223
## P7,1,44,1.49769492149353
## P7,1,45,1.48689947128296
## P7,1,46,1.49129298615129
## P7,1,47,1.48622668130057
## P7,1,48,1.48616253490179
## P7,1,49,1.48886961936951
## P7,1,50,1.49470901956745
## P7,2,1,1.50286676603205
## P7,2,2,1.4991648537772
## P7,2,3,1.49550792845813
## P7,2,4,1.49322553781363
## P7,2,5,1.48427127071263
## P7,2,6,1.49184498293646
## P7,2,7,1.50525702460337
## P7,2,8,1.49192953737159
## P7,2,9,1.48809268535712
## P7,2,10,1.49509863058726
## P7,2,11,1.48901586274843
## P7,2,12,1.50518330774809
## P7,2,13,1.49427852382908
## P7,2,14,1.49382840433428
## P7,2,15,1.48805578431087
## P7,2,16,1.49649756663554
## P7,2,17,1.48606187380277
## P7,2,18,1.49223558877104
## P7,2,19,1.49241459246763
## P7,2,20,1.49394927422206
## P7,2,21,1.48906246821086
## P7,2,22,1.4909219828519
## P7,2,23,1.49355340712141
## P7,2,24,1.49179468029424
## P7,2,25,1.48859494924545
## P7,2,26,1.48720428678725
## P7,2,27,1.49115652787058
## P7,2,28,1.4952693955373
## P7,2,29,1.49025948345661
## P7,2,30,1.48979818988854
## P7,2,31,1.49420871109259
## P7,2,32,1.49502284526825
## P7,2,33,1.49045334412501
## P7,2,34,1.49792639832748
## P7,2,35,1.49220998825565
## P7,2,36,1.49248470306396
## P7,2,37,1.4900953511934
## P7,2,38,1.50143171846867
## P7,2,39,1.49374476346103
## P7,2,40,1.49087480455637
## P7,2,41,1.49015379708911
## P7,2,42,1.49364937568197
## P7,2,43,1.49540565598686
## P7,2,44,1.4973003653919
## P7,2,45,1.49525316026476
## P7,2,46,1.4944035384966
## P7,2,47,1.49546696709805
## P7,2,48,1.50189560215648
## P7,2,49,1.49001621116291
## P7,2,50,1.49444062893207
## P7,3,1,1.41867857820847
## P7,3,2,1.49295712940728
## P7,3,3,1.47563080909925
## P7,3,4,1.50004496445527
## P7,3,5,1.46572576002641
## P7,3,6,1.49623235066732
## P7,3,7,1.49232895080357
## P7,3,8,1.50273424870259
## P7,3,9,1.50608246353851
## P7,3,10,1.4879437182323
## P7,3,11,1.49943891959854
## P7,3,12,1.4904306645979
## P7,3,13,1.49020599549817
## P7,3,14,1.49933185360648
## P7,3,15,1.49655298133949
## P7,3,16,1.48534454345703
## P7,3,17,1.49354028701782
## P7,3,18,1.46764402389526
## P7,3,19,1.50410756197843
## P7,3,20,1.47661741724554
## P7,3,21,1.50655344327291
## P7,3,22,1.47275739557603
## P7,3,23,1.49068535864353
## P7,3,24,1.50591567584446
## P7,3,25,1.49764411202792
## P7,3,26,1.46685634719001
## P7,3,27,1.49363332161537
## P7,3,28,1.48382508998014
## P7,3,29,1.47865079950403
## P7,3,30,1.48789243421693
## P7,3,31,1.50984176908221
## P7,3,32,1.50405177048274
## P7,3,33,1.47738357101168
## P7,3,34,1.49137814839681
## P7,3,35,1.49974658412318
## P7,3,36,1.47723444648411
## P7,3,37,1.4978056990582
## P7,3,38,1.4773844421887
## P7,3,39,1.50870558900653
## P7,3,40,1.49755419625176
## P7,3,41,1.49717189419654
## P7,3,42,1.48732585906982
## P7,3,43,1.4921314331793
## P7,3,44,1.48892325249271
## P7,3,45,1.49652547567663
## P7,3,46,1.48668738773891
## P7,3,47,1.49073656674089
## P7,3,48,1.49278731844318
## P7,3,49,1.49445931911469
## P7,3,50,1.49161301941431
## P7,4,1,1.49071839567903
## P7,4,2,1.4938583050744
## P7,4,3,1.48909989407188
## P7,4,4,1.49058582081514
## P7,4,5,1.49531535257267
## P7,4,6,1.49133041926793
## P7,4,7,1.48989124731584
## P7,4,8,1.49225972680485
## P7,4,9,1.48921493170918
## P7,4,10,1.48613188001845
## P7,4,11,1.49411863269228
## P7,4,12,1.49805148442586
## P7,4,13,1.4927697621859
## P7,4,14,1.48111142282901
## P7,4,15,1.50052950355444
## P7,4,16,1.48091707406221
## P7,4,17,1.49919988632202
## P7,4,18,1.50110523789017
## P7,4,19,1.47635041803553
## P7,4,20,1.49959681092239
## P7,4,21,1.49851787608603
## P7,4,22,1.47123641234178
## P7,4,23,1.50463998759234
## P7,4,24,1.49814831293546
## P7,4,25,1.49369633451421
## P7,4,26,1.47809533683621
## P7,4,27,1.49383051736014
## P7,4,28,1.50412581364314
## P7,4,29,1.49108106439764
## P7,4,30,1.46234816053639
## P7,4,31,1.51106928764506
## P7,4,32,1.5078934601375
## P7,4,33,1.49448921062328
## P7,4,34,1.49000735031931
## P7,4,35,1.49272586297298
## P7,4,36,1.49371144175529
## P7,4,37,1.48630748650967
## P7,4,38,1.49225111441179
## P7,4,39,1.49166968973672
## P7,4,40,1.49503769964542
## P7,4,41,1.48936175137031
## P7,4,42,1.47377174292038
## P7,4,43,1.50006838639577
## P7,4,44,1.50662492061483
## P7,4,45,1.48895713806152
## P7,4,46,1.4924517533718
## P7,4,47,1.49085295995076
## P7,4,48,1.49243701828851
## P7,4,49,1.49109658461351
## P7,4,50,1.49015107036622
## P7,5,1,1.49079808673343
## P7,5,2,1.49007044898139
## P7,5,3,1.49148744344711
## P7,5,4,1.49547189474106
## P7,5,5,1.48717966387349
## P7,5,6,1.48600882575625
## P7,5,7,1.49480404088527
## P7,5,8,1.496313235339
## P7,5,9,1.49516622785112
## P7,5,10,1.48961182832718
## P7,5,11,1.48878326199271
## P7,5,12,1.49407751376812
## P7,5,13,1.49310621382698
## P7,5,14,1.49205460624089
## P7,5,15,1.49407330921718
## P7,5,16,1.49001930762028
## P7,5,17,1.492150290259
## P7,5,18,1.49248039381845
## P7,5,19,1.49312392758652
## P7,5,20,1.49167213439941
## P7,5,21,1.49305367469788
## P7,5,22,1.48847257484824
## P7,5,23,1.49161680845114
## P7,5,24,1.49310097098351
## P7,5,25,1.49520947441222
## P7,5,26,1.49172609083114
## P7,5,27,1.49297550746373
## P7,5,28,1.49453807521511
## P7,5,29,1.49043232277979
## P7,5,30,1.49245031512513
## P7,5,31,1.49235072629205
## P7,5,32,1.49087489540897
## P7,5,33,1.48970673233271
## P7,5,34,1.49293287176835
## P7,5,35,1.49082897555444
## P7,5,36,1.49480999482645
## P7,5,37,1.49396814346313
## P7,5,38,1.49143367343479
## P7,5,39,1.48992712020874
## P7,5,40,1.49338534258414
## P7,5,41,1.49119466940562
## P7,5,42,1.49424152904087
## P7,5,43,1.49314855316938
## P7,5,44,1.4913648387842
## P7,5,45,1.48916965212141
## P7,5,46,1.48654266665964
## P7,5,47,1.48929465258563
## P7,5,48,1.49184596733969
## P7,5,49,1.49253715168346
## P7,5,50,1.490073650114
## P7,6,1,1.49425070722338
## P7,6,2,1.49368299137462
## P7,6,3,1.49454882837111
## P7,6,4,1.49354475253337
## P7,6,5,1.4974919465872
## P7,6,6,1.49370897350027
## P7,6,7,1.50682924733017
## P7,6,8,1.49437380538267
## P7,6,9,1.49350969965865
## P7,6,10,1.4935306428184
## P7,6,11,1.49474445029871
## P7,6,12,1.49351062919154
## P7,6,13,1.49139757717357
## P7,6,14,1.49475820981539
## P7,6,15,1.49217429975184
## P7,6,16,1.4973310447601
## P7,6,17,1.49110880023555
## P7,6,18,1.49161027117473
## P7,6,19,1.49776985168457
## P7,6,20,1.49263511070838
## P7,6,21,1.4925564909881
## P7,6,22,1.49627755428183
## P7,6,23,1.49335377746158
## P7,6,24,1.48837385043292
## P7,6,25,1.49141490912136
## P7,6,26,1.49733817577362
## P7,6,27,1.49498581886292
## P7,6,28,1.50308928887049
## P7,6,29,1.47768042768751
## P7,6,30,1.49426933870477
## P7,6,31,1.49595587987166
## P7,6,32,1.49601249037118
## P7,6,33,1.49631934580596
## P7,6,34,1.49053928817528
## P7,6,35,1.48926963806152
## P7,6,36,1.49560340493917
## P7,6,37,1.48843801722807
## P7,6,38,1.49101196435782
## P7,6,39,1.49146449790811
## P7,6,40,1.49099757536402
## P7,6,41,1.49238498343362
## P7,6,42,1.49390218406916
## P7,6,43,1.49280708608493
## P7,6,44,1.49195693668566
## P7,6,45,1.48986409959339
## P7,6,46,1.49924286206563
## P7,6,47,1.48799688165838
## P7,6,48,1.49017632635016
## P7,6,49,1.49218018849691
## P7,6,50,1.49196135370355
## P7,7,1,1.49257467269897
## P7,7,2,1.4916292218601
## P7,7,3,1.49538531201951
## P7,7,4,1.49152904748917
## P7,7,5,1.48373952056422
## P7,7,6,1.49556402976696
## P7,7,7,1.49241157200025
## P7,7,8,1.49416979153951
## P7,7,9,1.49072364243594
## P7,7,10,1.49384020675312
## P7,7,11,1.49364055471217
## P7,7,12,1.49021031856537
## P7,7,13,1.49547626126197
## P7,7,14,1.49176696494774
## P7,7,15,1.49054276053585
## P7,7,16,1.49585401802732
## P7,7,17,1.49343979358673
## P7,7,18,1.49202215476114
## P7,7,19,1.49459477424622
## P7,7,20,1.49376160757882
## P7,7,21,1.49159183658537
## P7,7,22,1.49005877132147
## P7,7,23,1.49622970231822
## P7,7,24,1.4966146225153
## P7,7,25,1.48658920469738
## P7,7,26,1.49153562905132
## P7,7,27,1.49195889572599
## P7,7,28,1.49309568989034
## P7,7,29,1.49038711312699
## P7,7,30,1.49196135808551
## P7,7,31,1.49150238037109
## P7,7,32,1.49197960936505
## P7,7,33,1.49514722824097
## P7,7,34,1.4922968228658
## P7,7,35,1.48809085951911
## P7,7,36,1.49615598103357
## P7,7,37,1.49394683837891
## P7,7,38,1.47840568293696
## P7,7,39,1.48825418247896
## P7,7,40,1.49298217988783
## P7,7,41,1.46801601239105
## P7,7,42,1.53343293300042
## P7,7,43,1.48661309725618
## P7,7,44,1.49755909226157
## P7,7,45,1.49360207716624
## P7,7,46,1.49671227077268
## P7,7,47,1.49234225273132
## P7,7,48,1.4843432216321
## P7,7,49,1.49510038340533
## P7,7,50,1.49146900678936
## P7,8,1,1.49141466140747
## P7,8,2,1.49357383545131
## P7,8,3,1.49364862307696
## P7,8,4,1.49711275100708
## P7,8,5,1.49002572984406
## P7,8,6,1.49081177254246
## P7,8,7,1.49122433364391
## P7,8,8,1.4928713798523
## P7,8,9,1.49021278030571
## P7,8,10,1.48909544944763
## P7,8,11,1.49270932674408
## P7,8,12,1.49433022576409
## P7,8,13,1.49030360153743
## P7,8,14,1.49228901574106
## P7,8,15,1.49014652216876
## P7,8,16,1.49093166769367
## P7,8,17,1.49253223419189
## P7,8,18,1.49274303436279
## P7,8,19,1.49142199975473
## P7,8,20,1.49058894316355
## P7,8,21,1.49266163764461
## P7,8,22,1.49297354037945
## P7,8,23,1.49197696646055
## P7,8,24,1.49109058964009
## P7,8,25,1.49071624723531
## P7,8,26,1.49245278975543
## P7,8,27,1.49225834933194
## P7,8,28,1.48855090141296
## P7,8,29,1.49248752755634
## P7,8,30,1.49392624559074
## P7,8,31,1.4926828585173
## P7,8,32,1.49225755780935
## P7,8,33,1.49209960301717
## P7,8,34,1.49264336468881
## P7,8,35,1.49197993959699
## P7,8,36,1.49690983772278
## P7,8,37,1.48986214637756
## P7,8,38,1.48984817474607
## P7,8,39,1.49092861584255
## P7,8,40,1.49070717947824
## P7,8,41,1.49366056628344
## P7,8,42,1.49209090937739
## P7,8,43,1.49139664047643
## P7,8,44,1.49344300114831
## P7,8,45,1.49208078384399
## P7,8,46,1.49105958711533
## P7,8,47,1.49546048807543
## P7,8,48,1.49103811330963
## P7,8,49,1.4894170165062
## P7,8,50,1.49366020929246
## P7,9,1,1.49279728531837
## P7,9,2,1.49134102175313
## P7,9,3,1.49092548340559
## P7,9,4,1.49008557579734
## P7,9,5,1.49439004867796
## P7,9,6,1.49113251711871
## P7,9,7,1.49096246614848
## P7,9,8,1.49288221200307
## P7,9,9,1.48849346420982
## P7,9,10,1.49406732559204
## P7,9,11,1.48996268725786
## P7,9,12,1.49235991809679
## P7,9,13,1.49274421655215
## P7,9,14,1.49138108166781
## P7,9,15,1.48954883672423
## P7,9,16,1.49063303552825
## P7,9,17,1.49370304743449
## P7,9,18,1.49149954319
## P7,9,19,1.49111416604784
## P7,9,20,1.49072521704215
## P7,9,21,1.49177148001535
## P7,9,22,1.49175222396851
## P7,9,23,1.49260191190041
## P7,9,24,1.49174588918686
## P7,9,25,1.49176168441772
## P7,9,26,1.49296137264797
## P7,9,27,1.49350472768148
## P7,9,28,1.48930503262414
## P7,9,29,1.49197167616624
## P7,9,30,1.49298412872083
## P7,9,31,1.49165184157235
## P7,9,32,1.49141371439374
## P7,9,33,1.49125304676238
## P7,9,34,1.49223081101762
## P7,9,35,1.49497025746566
## P7,9,36,1.49269243803891
## P7,9,37,1.49185078484671
## P7,9,38,1.49119647911617
## P7,9,39,1.49326405608863
## P7,9,40,1.49350669073022
## P7,9,41,1.48889462471008
## P7,9,42,1.487354857581
## P7,9,43,1.49292412138822
## P7,9,44,1.49325838088989
## P7,9,45,1.49179240509316
## P7,9,46,1.48720091039484
## P7,9,47,1.49662739753723
## P7,9,48,1.49051517139782
## P7,9,49,1.50195728464329
## P7,9,50,1.46683897972107
## P7,10,1,1.48535140149005
## P7,10,2,1.49384341416536
## P7,10,3,1.48898041570509
## P7,10,4,1.49344255707481
## P7,10,5,1.4911184076403
## P7,10,6,1.49309078852336
## P7,10,7,1.49226403654667
## P7,10,8,1.49366389214993
## P7,10,9,1.49287979761759
## P7,10,10,1.48676133155823
## P7,10,11,1.50032565632804
## P7,10,12,1.49175871024698
## P7,10,13,1.47498550559535
## P7,10,14,1.4956370875949
## P7,10,15,1.49985960434223
## P7,10,16,1.48279798534554
## P7,10,17,1.50037951329175
## P7,10,18,1.47273646134597
## P7,10,19,1.5087504746779
## P7,10,20,1.50616005928286
## P7,10,21,1.48317794476525
## P7,10,22,1.48956791190214
## P7,10,23,1.49763363286069
## P7,10,24,1.5015352666378
## P7,10,25,1.47826751640865
## P7,10,26,1.50644006512382
## P7,10,27,1.49485037061903
## P7,10,28,1.48268405596415
## P7,10,29,1.5033753024998
## P7,10,30,1.47608174324036
## P7,10,31,1.5003494869579
## P7,10,32,1.48860708077749
## P7,10,33,1.49627823427499
## P7,10,34,1.4920415633764
## P7,10,35,1.49459602793709
## P7,10,36,1.47410320573383
## P7,10,37,1.50376385992224
## P7,10,38,1.49456506162076
## P7,10,39,1.49169570749456
## P7,10,40,1.49645867018864
## P7,10,41,1.47187903242291
## P7,10,42,1.4889623867838
## P7,10,43,1.50431975451383
## P7,10,44,1.48638405034572
## P7,10,45,1.50317459973422
## P7,10,46,1.47653915431048
## P7,10,47,1.49135238207304
## P7,10,48,1.50398256778717
## P7,10,49,1.48751961390177
## P7,10,50,1.4888600069901
## P8,1,1,1.49278196980876
## P8,1,2,1.49178432535242
## P8,1,3,1.49296074360609
## P8,1,4,1.49382292429606
## P8,1,5,1.49126240899486
## P8,1,6,1.49174000322819
## P8,1,7,1.49682411280545
## P8,1,8,1.49656422932943
## P8,1,9,1.49257756895938
## P8,1,10,1.49140575382259
## P8,1,11,1.491728241562
## P8,1,12,1.49361605820832
## P8,1,13,1.49092633745312
## P8,1,14,1.49223057912744
## P8,1,15,1.49201454787419
## P8,1,16,1.49413029143685
## P8,1,17,1.49314280625047
## P8,1,18,1.49203650574935
## P8,1,19,1.49503283304711
## P8,1,20,1.50957787555197
## P8,1,21,1.49598190735797
## P8,1,22,1.49396330969674
## P8,1,23,1.48184832739174
## P8,1,24,1.49968236093303
## P8,1,25,1.50498316391655
## P8,1,26,1.50880185763041
## P8,1,27,1.50110902865071
## P8,1,28,1.51902585142241
## P8,1,29,1.48058105650402
## P8,1,30,1.49056687794234
## P8,1,31,1.48206780781256
## P8,1,32,1.52316701584968
## P8,1,33,1.49411230713782
## P8,1,34,1.49135093076513
## P8,1,35,1.49291046637076
## P8,1,36,1.49142085228648
## P8,1,37,1.48626689995285
## P8,1,38,1.51640222801103
## P8,1,39,1.50192881048771
## P8,1,40,1.50465565058537
## P8,1,41,1.48316589537121
## P8,1,42,1.5052234835741
## P8,1,43,1.49053153238798
## P8,1,44,1.48924525393996
## P8,1,45,1.49141387421955
## P8,1,46,1.4897224744161
## P8,1,47,1.48682676662098
## P8,1,48,1.48675470766814
## P8,1,49,1.48827897508939
## P8,1,50,1.49320785442281
## P8,2,1,1.51233863830566
## P8,2,2,1.49603805670867
## P8,2,3,1.40916256551389
## P8,2,4,1.48344638531025
## P8,2,5,1.49063182599617
## P8,2,6,1.4908975776361
## P8,2,7,1.49323975753784
## P8,2,8,1.51329538057435
## P8,2,9,1.49135976294949
## P8,2,10,1.49101971626282
## P8,2,11,1.49409613324635
## P8,2,12,1.49600915070418
## P8,2,13,1.49397908724271
## P8,2,14,1.49105352343935
## P8,2,15,1.49000513553619
## P8,2,16,1.49374885461768
## P8,2,17,1.48841489935821
## P8,2,18,1.50309462382876
## P8,2,19,1.45530762297384
## P8,2,20,1.47976438522339
## P8,2,21,1.47766816299574
## P8,2,22,1.55603010886538
## P8,2,23,1.51626186900669
## P8,2,24,1.51130348737123
## P8,2,25,1.50178031360402
## P8,2,26,1.49358275570447
## P8,2,27,1.49251974821091
## P8,2,28,1.48986927924618
## P8,2,29,1.49240441852146
## P8,2,30,1.46417500925999
## P8,2,31,1.48448106516962
## P8,2,32,1.49328512045053
## P8,2,33,1.5223388160978
## P8,2,34,1.50256616523467
## P8,2,35,1.47013625452074
## P8,2,36,1.49227112644124
## P8,2,37,1.49490913591887
## P8,2,38,1.49082284578135
## P8,2,39,1.4965107409985
## P8,2,40,1.48733423626612
## P8,2,41,1.45079193919538
## P8,2,42,1.50680462252192
## P8,2,43,1.47271147507888
## P8,2,44,1.48332235672895
## P8,2,45,1.47434577607272
## P8,2,46,1.49444127229094
## P8,2,47,1.50874066786333
## P8,2,48,1.48911736228249
## P8,2,49,1.48792122556018
## P8,2,50,1.49125879810702
## P8,3,1,1.49131304461782
## P8,3,2,1.45045045919197
## P8,3,3,1.4977532155586
## P8,3,4,1.49454350860751
## P8,3,5,1.49438230650766
## P8,3,6,1.48899939719667
## P8,3,7,1.49026559961253
## P8,3,8,1.49426037332286
## P8,3,9,1.49019325574239
## P8,3,10,1.52379573675302
## P8,3,11,1.49667608141899
## P8,3,12,1.49872079006461
## P8,3,13,1.49223360807999
## P8,3,14,1.48226982174498
## P8,3,15,1.47070057833636
## P8,3,16,1.49833938846849
## P8,3,17,1.48874602494416
## P8,3,18,1.49043337891741
## P8,3,19,1.49375732541084
## P8,3,20,1.48168019325502
## P8,3,21,1.45051293902927
## P8,3,22,1.5074330069061
## P8,3,23,1.46761345863342
## P8,3,24,1.49858886271984
## P8,3,25,1.47694518431178
## P8,3,26,1.489906486712
## P8,3,27,1.47634457581795
## P8,3,28,1.48835345576791
## P8,3,29,1.49083633776064
## P8,3,30,1.49390008575038
## P8,3,31,1.49118469874064
## P8,3,32,1.49002158308828
## P8,3,33,1.49932061097561
## P8,3,34,1.49873436009226
## P8,3,35,1.49325593997692
## P8,3,36,1.45234011892063
## P8,3,37,1.49836053848267
## P8,3,38,1.4946722610324
## P8,3,39,1.49607012119699
## P8,3,40,1.4888027958248
## P8,3,41,1.49178412001012
## P8,3,42,1.48432312666915
## P8,3,43,1.49131802381095
## P8,3,44,1.52003534113775
## P8,3,45,1.48741071874445
## P8,3,46,1.49081252415975
## P8,3,47,1.49259162299773
## P8,3,48,1.49623743907825
## P8,3,49,1.52832010719511
## P8,3,50,1.48858826825863
## P8,4,1,1.53017711639404
## P8,4,2,1.48424336585132
## P8,4,3,1.47151362605211
## P8,4,4,1.45320594173738
## P8,4,5,1.49026105383865
## P8,4,6,1.4821189752146
## P8,4,7,1.49173625103839
## P8,4,8,1.4898198594983
## P8,4,9,1.49330168300205
## P8,4,10,1.49482534943725
## P8,4,11,1.49147158577329
## P8,4,12,1.47532049605721
## P8,4,13,1.49033552805583
## P8,4,14,1.50105359040055
## P8,4,15,1.50029696817473
## P8,4,16,1.50600488706567
## P8,4,17,1.49083029114923
## P8,4,18,1.49062370552736
## P8,4,19,1.49077173190958
## P8,4,20,1.48961001142449
## P8,4,21,1.48824501037598
## P8,4,22,1.49563306219438
## P8,4,23,1.48850595350746
## P8,4,24,1.49664255489003
## P8,4,25,1.47983971718819
## P8,4,26,1.49507229804993
## P8,4,27,1.49339326704391
## P8,4,28,1.49278358618418
## P8,4,29,1.46738455246906
## P8,4,30,1.49959709644318
## P8,4,31,1.48527805140761
## P8,4,32,1.49220697503341
## P8,4,33,1.49102941824465
## P8,4,34,1.48974620079508
## P8,4,35,1.49519140144874
## P8,4,36,1.48859702387164
## P8,4,37,1.48382415609845
## P8,4,38,1.48318697303854
## P8,4,39,1.50079136450314
## P8,4,40,1.48825967311859
## P8,4,41,1.48702017272391
## P8,4,42,1.48960339845116
## P8,4,43,1.49381559545344
## P8,4,44,1.49938226881481
## P8,4,45,1.48868560791016
## P8,4,46,1.50981673327359
## P8,4,47,1.48378102962787
## P8,4,48,1.49039189428346
## P8,4,49,1.4859425770609
## P8,4,50,1.49250937444233
## P8,5,1,1.49081428366971
## P8,5,2,1.4939706374859
## P8,5,3,1.4991790788983
## P8,5,4,1.48411504821022
## P8,5,5,1.49031452291152
## P8,5,6,1.49478671285841
## P8,5,7,1.48879043194426
## P8,5,8,1.48244847995894
## P8,5,9,1.49059364476155
## P8,5,10,1.4922412022823
## P8,5,11,1.49715217554344
## P8,5,12,1.49168053704339
## P8,5,13,1.48629973828793
## P8,5,14,1.49790702847873
## P8,5,15,1.4731314787789
## P8,5,16,1.46404387706365
## P8,5,17,1.4920508246268
## P8,5,18,1.49094890912374
## P8,5,19,1.49155895015861
## P8,5,20,1.48610033887498
## P8,5,21,1.49628969566109
## P8,5,22,1.4745019627856
## P8,5,23,1.49376349151134
## P8,5,24,1.49056547482808
## P8,5,25,1.49619555799928
## P8,5,26,1.48676800220571
## P8,5,27,1.48689723208668
## P8,5,28,1.49027304746667
## P8,5,29,1.49268626716902
## P8,5,30,1.49067068099976
## P8,5,31,1.49613554012485
## P8,5,32,1.49068788181652
## P8,5,33,1.5002658681352
## P8,5,34,1.49753817064422
## P8,5,35,1.50009556030959
## P8,5,36,1.49504213637494
## P8,5,37,1.49347430009108
## P8,5,38,1.47373826163156
## P8,5,39,1.49251491660314
## P8,5,40,1.48872048167859
## P8,5,41,1.49198603342815
## P8,5,42,1.49135628742958
## P8,5,43,1.50059784073191
## P8,5,44,1.48652797329183
## P8,5,45,1.49488189485338
## P8,5,46,1.48652657595548
## P8,5,47,1.48776773184784
## P8,5,48,1.49590046652432
## P8,5,49,1.53441850185394
## P8,5,50,1.48839502260666
## P8,6,1,1.49452057149675
## P8,6,2,1.49545844783628
## P8,6,3,1.49522698266166
## P8,6,4,1.50027864912282
## P8,6,5,1.49595093598237
## P8,6,6,1.49465522766113
## P8,6,7,1.49563698302534
## P8,6,8,1.49329475120262
## P8,6,9,1.49483489990234
## P8,6,10,1.49373089825666
## P8,6,11,1.49237018261316
## P8,6,12,1.49400631994264
## P8,6,13,1.49440875095604
## P8,6,14,1.49282718587805
## P8,6,15,1.49291154585387
## P8,6,16,1.49389802891275
## P8,6,17,1.49167405736857
## P8,6,18,1.49388357412035
## P8,6,19,1.49066484280122
## P8,6,20,1.49293496802046
## P8,6,21,1.49194472817814
## P8,6,22,1.49291453873816
## P8,6,23,1.49405725479126
## P8,6,24,1.49435965520031
## P8,6,25,1.48920482313129
## P8,6,26,1.49290484967439
## P8,6,27,1.49438284382676
## P8,6,28,1.49211976130803
## P8,6,29,1.49094331921555
## P8,6,30,1.49301846152858
## P8,6,31,1.49238850311799
## P8,6,32,1.48839091472938
## P8,6,33,1.49192150660924
## P8,6,34,1.49655699729919
## P8,6,35,1.49246341084677
## P8,6,36,1.4931465081409
## P8,6,37,1.49291978630365
## P8,6,38,1.4943691459862
## P8,6,39,1.49261638025443
## P8,6,40,1.49067415811319
## P8,6,41,1.49189186782288
## P8,6,42,1.49226927546273
## P8,6,43,1.49113925164487
## P8,6,44,1.49081753549122
## P8,6,45,1.50606924459475
## P8,6,46,1.49344284094653
## P8,6,47,1.49188183654438
## P8,6,48,1.49189454455708
## P8,6,49,1.49169974136353
## P8,6,50,1.49100746939091
## P8,7,1,1.4908560087096
## P8,7,2,1.49134550513802
## P8,7,3,1.49075342655182
## P8,7,4,1.48928538663888
## P8,7,5,1.49420539731902
## P8,7,6,1.49242464200718
## P8,7,7,1.4915332626289
## P8,7,8,1.4910185764085
## P8,7,9,1.49234170532227
## P8,7,10,1.48627835557661
## P8,7,11,1.49033058751928
## P8,7,12,1.49108042360163
## P8,7,13,1.49227494728274
## P8,7,14,1.49292919014682
## P8,7,15,1.49716986108709
## P8,7,16,1.49379266209963
## P8,7,17,1.49212619236537
## P8,7,18,1.49093903217119
## P8,7,19,1.49159101203636
## P8,7,20,1.49209119723393
## P8,7,21,1.49291256757883
## P8,7,22,1.49071730507745
## P8,7,23,1.49257234272204
## P8,7,24,1.49383647980229
## P8,7,25,1.49306288566298
## P8,7,26,1.49212466284286
## P8,7,27,1.49250638602984
## P8,7,28,1.49373859288741
## P8,7,29,1.49179370557108
## P8,7,30,1.4908053177159
## P8,7,31,1.49068705008848
## P8,7,32,1.4911142966964
## P8,7,33,1.48847903355513
## P8,7,34,1.49042637007577
## P8,7,35,1.49113779597812
## P8,7,36,1.49078310419012
## P8,7,37,1.49050114128027
## P8,7,38,1.49190850204296
## P8,7,39,1.49214042851954
## P8,7,40,1.49177142043612
## P8,7,41,1.4918222727738
## P8,7,42,1.49095155158133
## P8,7,43,1.49390000636035
## P8,7,44,1.49118742604894
## P8,7,45,1.49177887247897
## P8,7,46,1.49263686631855
## P8,7,47,1.49394737271702
## P8,7,48,1.49227803548177
## P8,7,49,1.49185190541404
## P8,7,50,1.49149615546147
## P8,8,1,1.49043397449312
## P8,8,2,1.48989882734087
## P8,8,3,1.4928176133529
## P8,8,4,1.49111149570729
## P8,8,5,1.49172448203677
## P8,8,6,1.49314136319346
## P8,8,7,1.49024874344468
## P8,8,8,1.49315578079224
## P8,8,9,1.49169052839279
## P8,8,10,1.49037682215373
## P8,8,11,1.49185266727354
## P8,8,12,1.49143816491832
## P8,8,13,1.4902933572468
## P8,8,14,1.49104321984684
## P8,8,15,1.4907467088034
## P8,8,16,1.48945992052062
## P8,8,17,1.4898287545551
## P8,8,18,1.4892836689949
## P8,8,19,1.4922450993159
## P8,8,20,1.49123177161584
## P8,8,21,1.49107756231823
## P8,8,22,1.49259648240846
## P8,8,23,1.4899185713347
## P8,8,24,1.49545988527316
## P8,8,25,1.4926567511125
## P8,8,26,1.49005967599374
## P8,8,27,1.490887541998
## P8,8,28,1.49332429303063
## P8,8,29,1.49223446004531
## P8,8,30,1.49255988515657
## P8,8,31,1.49008213678996
## P8,8,32,1.49073373205293
## P8,8,33,1.4888239428401
## P8,8,34,1.49269563302226
## P8,8,35,1.49144444098839
## P8,8,36,1.49039220333099
## P8,8,37,1.49123453799589
## P8,8,38,1.4913827156534
## P8,8,39,1.49240891764483
## P8,8,40,1.49204166924081
## P8,8,41,1.49153974268696
## P8,8,42,1.49024417422233
## P8,8,43,1.49045440885756
## P8,8,44,1.49191697438558
## P8,8,45,1.49255407349137
## P8,8,46,1.49169893682438
## P8,8,47,1.49085985853317
## P8,8,48,1.49422564552826
## P8,8,49,1.49603506163055
## P8,8,50,1.49106394764268
## P8,9,1,1.49253655261681
## P8,9,2,1.49192764645531
## P8,9,3,1.49328354077461
## P8,9,4,1.49398152224989
## P8,9,5,1.49307848930359
## P8,9,6,1.49229197502136
## P8,9,7,1.48978885503916
## P8,9,8,1.49030991879905
## P8,9,9,1.48673898643918
## P8,9,10,1.49271612560626
## P8,9,11,1.49210894430006
## P8,9,12,1.4900776886743
## P8,9,13,1.49252456885118
## P8,9,14,1.49082223439621
## P8,9,15,1.49122869743491
## P8,9,16,1.48995256925884
## P8,9,17,1.49291634886232
## P8,9,18,1.49074536069818
## P8,9,19,1.49354628482497
## P8,9,20,1.49014601191959
## P8,9,21,1.49125245739432
## P8,9,22,1.49233723612665
## P8,9,23,1.49085171082441
## P8,9,24,1.4910841490093
## P8,9,25,1.49149725437164
## P8,9,26,1.48986584627176
## P8,9,27,1.49170339413178
## P8,9,28,1.48801618633848
## P8,9,29,1.49172994889409
## P8,9,30,1.49209519991508
## P8,9,31,1.49081993638799
## P8,9,32,1.49309780380943
## P8,9,33,1.49119562637515
## P8,9,34,1.49343056644467
## P8,9,35,1.49017417323482
## P8,9,36,1.49261543398998
## P8,9,37,1.49069697640159
## P8,9,38,1.49046801249186
## P8,9,39,1.49250402657882
## P8,9,40,1.49114794442148
## P8,9,41,1.49318853616714
## P8,9,42,1.4938721411007
## P8,9,43,1.49004836643443
## P8,9,44,1.49085816882905
## P8,9,45,1.48903875911937
## P8,9,46,1.49166975418727
## P8,9,47,1.4913055392412
## P8,9,48,1.49282995363077
## P8,9,49,1.48928488045931
## P8,9,50,1.49134932101612
## P8,10,1,1.49106836963344
## P8,10,2,1.49137616425418
## P8,10,3,1.49250615911281
## P8,10,4,1.49112269200316
## P8,10,5,1.49065307824008
## P8,10,6,1.49104686068673
## P8,10,7,1.49161832577714
## P8,10,8,1.49205989067001
## P8,10,9,1.49381714207785
## P8,10,10,1.48912795384725
## P8,10,11,1.49426711582747
## P8,10,12,1.48988660644082
## P8,10,13,1.49189906444364
## P8,10,14,1.49227626235397
## P8,10,15,1.49521432931607
## P8,10,16,1.49166472117106
## P8,10,17,1.49156356626941
## P8,10,18,1.49000944218165
## P8,10,19,1.49246839417352
## P8,10,20,1.48919277191162
## P8,10,21,1.48997445333572
## P8,10,22,1.49048686623573
## P8,10,23,1.49314816792806
## P8,10,24,1.48925422219669
## P8,10,25,1.49271190443704
## P8,10,26,1.4915759563446
## P8,10,27,1.49303950761494
## P8,10,28,1.49225520292918
## P8,10,29,1.48978303199591
## P8,10,30,1.49038241620649
## P8,10,31,1.49065842003119
## P8,10,32,1.48916503235146
## P8,10,33,1.49023700127235
## P8,10,34,1.49161885334895
## P8,10,35,1.49200062190785
## P8,10,36,1.49056676322339
## P8,10,37,1.49136369427045
## P8,10,38,1.49234559172291
## P8,10,39,1.49081725384816
## P8,10,40,1.49156612412542
## P8,10,41,1.49109121810558
## P8,10,42,1.49211102962494
## P8,10,43,1.49176906316708
## P8,10,44,1.4928328057994
## P8,10,45,1.49294744721995
## P8,10,46,1.49231107338615
## P8,10,47,1.49269782263657
## P8,10,48,1.49166464224094
## P8,10,49,1.49247771415158
## P8,10,50,1.4930404266181
## P9,1,1,1.4890897847988
## P9,1,2,1.4906985413315
## P9,1,3,1.48845353807722
## P9,1,4,1.48818483223786
## P9,1,5,1.48882394790649
## P9,1,6,1.49034309137554
## P9,1,7,1.48622062206268
## P9,1,8,1.49177984207396
## P9,1,9,1.48625481685745
## P9,1,10,1.48850806941831
## P9,1,11,1.48041583457083
## P9,1,12,1.50345184843419
## P9,1,13,1.48559037208557
## P9,1,14,1.49322973251343
## P9,1,15,1.48933053252721
## P9,1,16,1.48337493564772
## P9,1,17,1.4918579269858
## P9,1,18,1.48861203342676
## P9,1,19,1.46496886014938
## P9,1,20,1.50211255851833
## P9,1,21,1.49039535610764
## P9,1,22,1.48826652765274
## P9,1,23,1.49175307329963
## P9,1,24,1.49108936105456
## P9,1,25,1.48619242117439
## P9,1,26,1.4928609222925
## P9,1,27,1.50412006378174
## P9,1,28,1.48617776384893
## P9,1,29,1.4883522767287
## P9,1,30,1.4867584729932
## P9,1,31,1.4886934303102
## P9,1,32,1.48518692122565
## P9,1,33,1.49183334003795
## P9,1,34,1.48995015886095
## P9,1,35,1.48984238536088
## P9,1,36,1.49621871422077
## P9,1,37,1.49179331822829
## P9,1,38,1.48828140613252
## P9,1,39,1.48995517931486
## P9,1,40,1.49037929681631
## P9,1,41,1.48924008893295
## P9,1,42,1.49097487214324
## P9,1,43,1.49335439638658
## P9,1,44,1.49147092342377
## P9,1,45,1.49060147025368
## P9,1,46,1.48803957431547
## P9,1,47,1.49217360360282
## P9,1,48,1.49055280892745
## P9,1,49,1.49010579129483
## P9,1,50,1.4903002517234
## P9,2,1,1.48889228701591
## P9,2,2,1.49048070689194
## P9,2,3,1.49016611916678
## P9,2,4,1.48961929065078
## P9,2,5,1.49051291900769
## P9,2,6,1.49001720457366
## P9,2,7,1.49069110325405
## P9,2,8,1.492413294621
## P9,2,9,1.49033632732573
## P9,2,10,1.48956881451006
## P9,2,11,1.48958071837058
## P9,2,12,1.48875560164452
## P9,2,13,1.490999851518
## P9,2,14,1.48938734168248
## P9,2,15,1.49138005186872
## P9,2,16,1.49096875720554
## P9,2,17,1.48921771538563
## P9,2,18,1.49192875948819
## P9,2,19,1.4899164557457
## P9,2,20,1.49268200086511
## P9,2,21,1.49128135696786
## P9,2,22,1.4905274450779
## P9,2,23,1.49218583106995
## P9,2,24,1.49092467308044
## P9,2,25,1.49173787971596
## P9,2,26,1.48960144488842
## P9,2,27,1.49135132555692
## P9,2,28,1.49277083417203
## P9,2,29,1.49408097016184
## P9,2,30,1.48922507224544
## P9,2,31,1.48048186302185
## P9,2,32,1.48519039154053
## P9,2,33,1.48670089244843
## P9,2,34,1.48966969614444
## Warning: There are no valid values for INTERVALS=35 in LISTP9[[2]]
## Warning: There are no valid values for INTERVALS=36 in LISTP9[[2]]
## Warning: There are no valid values for INTERVALS=37 in LISTP9[[2]]
## P9,2,38,1.49043530225754
## P9,2,39,1.49231958389282
## Warning: There are no valid values for INTERVALS=40 in LISTP9[[2]]
## P9,2,41,1.49240260030709
## P9,2,42,1.48874066092751
## P9,2,43,1.49000200383803
## P9,2,44,1.48990664392147
## P9,2,45,1.48863525390625
## P9,2,46,1.49556273505801
## P9,2,47,1.4900303355983
## P9,2,48,1.49381617137364
## P9,2,49,1.4912404654161
## P9,2,50,1.49035562038931
## P9,3,1,1.4898212230311
## P9,3,2,1.49131148348572
## P9,3,3,1.49111045348017
## P9,3,4,1.49015734625644
## P9,3,5,1.48988366594502
## P9,3,6,1.48964187833998
## P9,3,7,1.49085620045662
## P9,3,8,1.49080716133118
## P9,3,9,1.49034723388814
## P9,3,10,1.49009242712283
## P9,3,11,1.49154581643839
## P9,3,12,1.4909367912694
## P9,3,13,1.49096003174782
## P9,3,14,1.49180189997172
## P9,3,15,1.48987989714651
## P9,3,16,1.49007701593287
## P9,3,17,1.49064982494461
## P9,3,18,1.48938528299332
## P9,3,19,1.49074233964432
## P9,3,20,1.49076061537772
## P9,3,21,1.48974563561234
## P9,3,22,1.48934041278463
## P9,3,23,1.49166609900338
## P9,3,24,1.49216208225343
## P9,3,25,1.49087502842858
## P9,3,26,1.4908457159996
## P9,3,27,1.49157221238692
## P9,3,28,1.48916098475456
## P9,3,29,1.48807665017935
## P9,3,30,1.49083314186487
## P9,3,31,1.488169553668
## P9,3,32,1.49138693670625
## P9,3,33,1.49062722069877
## P9,3,34,1.49111091389376
## P9,3,35,1.49141318599383
## P9,3,36,1.49064466555913
## P9,3,37,1.48925644821591
## P9,3,38,1.49231036007404
## P9,3,39,1.49038480539791
## P9,3,40,1.49059729827078
## P9,3,41,1.49172956842772
## P9,3,42,1.48869463602702
## P9,3,43,1.48944877598384
## P9,3,44,1.4918540596962
## P9,3,45,1.49229830333165
## P9,3,46,1.49008576493514
## P9,3,47,1.49265578058031
## P9,3,48,1.48903691952045
## P9,3,49,1.48950258126626
## P9,3,50,1.49102338064801
## P9,4,1,1.48904770758094
## P9,4,2,1.49146802470369
## P9,4,3,1.4919449366056
## P9,4,4,1.49421476364136
## P9,4,5,1.49087590873241
## P9,4,6,1.49296377525955
## P9,4,7,1.4901238044103
## P9,4,8,1.49043890479561
## P9,4,9,1.49106970310211
## P9,4,10,1.49155345715975
## P9,4,11,1.49001901170127
## P9,4,12,1.49110981195915
## P9,4,13,1.49027011740921
## P9,4,14,1.48949329167196
## P9,4,15,1.49012346544128
## P9,4,16,1.49061340093613
## P9,4,17,1.49124338250411
## P9,4,18,1.49150239137503
## P9,4,19,1.49000299418414
## P9,4,20,1.4902546787262
## P9,4,21,1.49022488261378
## P9,4,22,1.48977231411707
## P9,4,23,1.49055426670955
## P9,4,24,1.48941367013114
## P9,4,25,1.49025229276237
## P9,4,26,1.49268872828423
## P9,4,27,1.48861309460231
## P9,4,28,1.49160722054933
## P9,4,29,1.49132173125808
## P9,4,30,1.49234890937805
## P9,4,31,1.49138314173772
## P9,4,32,1.49071741639898
## P9,4,33,1.4919334372429
## P9,4,34,1.4915447081289
## P9,4,35,1.49161968231201
## P9,4,36,1.48916966915131
## P9,4,37,1.48740544409122
## P9,4,38,1.48856966495514
## P9,4,39,1.4918693833881
## P9,4,40,1.49267296913343
## P9,4,41,1.48899107319968
## P9,4,42,1.49162656685402
## P9,4,43,1.49109917420607
## P9,4,44,1.48793474833171
## P9,4,45,1.49239109223147
## P9,4,46,1.4910101180381
## P9,4,47,1.49001965522766
## P9,4,48,1.49042221903801
## P9,4,49,1.4929861202836
## P9,4,50,1.4907425959905
## P9,5,1,1.49119265289868
## P9,5,2,1.49045058802554
## P9,5,3,1.48930922758232
## P9,5,4,1.4912026315122
## P9,5,5,1.48985206500904
## P9,5,6,1.48995588236842
## P9,5,7,1.49084423790293
## P9,5,8,1.49112669229507
## P9,5,9,1.49068478999599
## P9,5,10,1.49014282983447
## P9,5,11,1.49064683914185
## P9,5,12,1.49033410365765
## P9,5,13,1.49005700500918
## P9,5,14,1.49058485882623
## P9,5,15,1.49004221581793
## P9,5,16,1.49047982692719
## P9,5,17,1.49218462830159
## P9,5,18,1.49084496498108
## P9,5,19,1.49041302153405
## P9,5,20,1.48964137690408
## P9,5,21,1.49292752742767
## P9,5,22,1.49086837768555
## P9,5,23,1.49051662560167
## P9,5,24,1.4919540017052
## P9,5,25,1.49194708705819
## P9,5,26,1.4895324358126
## P9,5,27,1.490225998131
## P9,5,28,1.49023948209039
## P9,5,29,1.4907515953327
## P9,5,30,1.49076564070107
## P9,5,31,1.48908312766107
## P9,5,32,1.48963909925416
## P9,5,33,1.49115998073689
## P9,5,34,1.49131352280917
## P9,5,35,1.49163544972738
## P9,5,36,1.49022145387603
## P9,5,37,1.48895340117197
## P9,5,38,1.48856158904087
## P9,5,39,1.49035033312711
## P9,5,40,1.49054328687898
## P9,5,41,1.49039123275063
## P9,5,42,1.49130963242572
## P9,5,43,1.49046134013756
## P9,5,44,1.49005850818422
## P9,5,45,1.4905348681332
## P9,5,46,1.48960919956585
## P9,5,47,1.490930483259
## P9,5,48,1.49168486306162
## P9,5,49,1.48973372043707
## P9,5,50,1.49099088437629
## P9,6,1,1.49252522319829
## P9,6,2,1.49262657619658
## P9,6,3,1.49136760688963
## P9,6,4,1.49018273797146
## P9,6,5,1.49064001390489
## P9,6,6,1.49318605229474
## P9,6,7,1.48986233472824
## P9,6,8,1.49307879534635
## P9,6,9,1.49032663190088
## P9,6,10,1.49018395940463
## P9,6,11,1.49084300344641
## P9,6,12,1.49193253883949
## P9,6,13,1.49126708043086
## P9,6,14,1.49108631794269
## P9,6,15,1.49043202636266
## P9,6,16,1.4909335889934
## P9,6,17,1.49175736441541
## P9,6,18,1.49109386890493
## P9,6,19,1.49179470329954
## P9,6,20,1.49077297716725
## P9,6,21,1.49177556318395
## P9,6,22,1.48999149799347
## P9,6,23,1.49073100515774
## P9,6,24,1.4914558145735
## P9,6,25,1.49287040080499
## P9,6,26,1.48886032427772
## P9,6,27,1.49092766588384
## P9,6,28,1.4917381339603
## P9,6,29,1.49126629795589
## P9,6,30,1.49180921060698
## P9,6,31,1.49165522135221
## P9,6,32,1.49000497848269
## P9,6,33,1.49144016951323
## P9,6,34,1.49049762838027
## P9,6,35,1.49066105382196
## P9,6,36,1.48968730309997
## P9,6,37,1.49200442999848
## P9,6,38,1.490906346639
## P9,6,39,1.49200823704402
## P9,6,40,1.49201110227784
## P9,6,41,1.4919156823107
## P9,6,42,1.4927122933524
## P9,6,43,1.49176863829295
## P9,6,44,1.49064185884264
## P9,6,45,1.49109499984317
## P9,6,46,1.49085327237844
## P9,6,47,1.49117801454332
## P9,6,48,1.49068133672078
## P9,6,49,1.49041814463479
## P9,6,50,1.49120152221536
## P9,7,1,1.48949093149419
## P9,7,2,1.49213526664524
## P9,7,3,1.49069197263036
## P9,7,4,1.49071482817332
## P9,7,5,1.49214174607221
## P9,7,6,1.49201106010599
## P9,7,7,1.49254231314057
## P9,7,8,1.49147003889084
## P9,7,9,1.49063899300315
## P9,7,10,1.49103534555881
## P9,7,11,1.49289844391194
## P9,7,12,1.49112364283779
## P9,7,13,1.49105978536082
## P9,7,14,1.4908517702358
## P9,7,15,1.49029307961464
## P9,7,16,1.49038570608412
## P9,7,17,1.49184937477112
## P9,7,18,1.48935715357463
## P9,7,19,1.49092639344079
## P9,7,20,1.49204330129938
## P9,7,21,1.49092810494559
## P9,7,22,1.49046965512362
## P9,7,23,1.49232369515954
## P9,7,24,1.49252414703369
## P9,7,25,1.48954247599063
## P9,7,26,1.49045978273664
## P9,7,27,1.49028872308277
## P9,7,28,1.49176863829295
## P9,7,29,1.49121578457286
## P9,7,30,1.49153623742572
## P9,7,31,1.49218495299176
## P9,7,32,1.49085244592631
## P9,7,33,1.49071611676897
## P9,7,34,1.49169435626582
## P9,7,35,1.49166720988704
## P9,7,36,1.49135179519653
## P9,7,37,1.49212535423569
## P9,7,38,1.49026801738333
## P9,7,39,1.49003473917643
## P9,7,40,1.49102987741169
## P9,7,41,1.49194255107787
## P9,7,42,1.49140057844274
## P9,7,43,1.48942108154297
## P9,7,44,1.49078026778406
## P9,7,45,1.49153464071212
## P9,7,46,1.49166437730951
## P9,7,47,1.49034846583499
## P9,7,48,1.49097493420476
## P9,7,49,1.49054989293844
## P9,7,50,1.48998279523368
## P9,8,1,1.49192389477505
## P9,8,2,1.49086132596751
## P9,8,3,1.49126292891422
## P9,8,4,1.49051546382013
## P9,8,5,1.49007652320114
## P9,8,6,1.49245843634141
## P9,8,7,1.49073001160019
## P9,8,8,1.49009791664455
## P9,8,9,1.49160491336476
## P9,8,10,1.48994390832053
## P9,8,11,1.49169409565809
## P9,8,12,1.49110561762101
## P9,8,13,1.49461351633072
## P9,8,14,1.4907650554303
## P9,8,15,1.49127760800448
## P9,8,16,1.48996213912964
## P9,8,17,1.49219598268208
## P9,8,18,1.49115670960525
## P9,8,19,1.49108311763177
## P9,8,20,1.4912543296814
## P9,8,21,1.49323087809037
## P9,8,22,1.49213901866566
## P9,8,23,1.49172751307487
## P9,8,24,1.49191195694442
## P9,8,25,1.49171476031459
## P9,8,26,1.49202905760871
## P9,8,27,1.49168948843928
## P9,8,28,1.49112802328065
## P9,8,29,1.49137090682983
## P9,8,30,1.49303457348846
## P9,8,31,1.49263321069571
## P9,8,32,1.49055915655092
## P9,8,33,1.4907617736281
## P9,8,34,1.48949074745178
## P9,8,35,1.49030615358937
## P9,8,36,1.49210210706367
## P9,8,37,1.49136179371884
## P9,8,38,1.49104584999455
## P9,8,39,1.49151835943523
## P9,8,40,1.49068121533645
## P9,8,41,1.49221133494723
## P9,8,42,1.48987321172442
## P9,8,43,1.49079033972203
## P9,8,44,1.49156408650534
## P9,8,45,1.49088243727988
## P9,8,46,1.49293164412181
## P9,8,47,1.4894140985277
## P9,8,48,1.4919119587651
## P9,8,49,1.48987023774968
## P9,8,50,1.49193853702185
## P9,9,1,1.49154973270917
## P9,9,2,1.49277010830966
## P9,9,3,1.48976342117085
## P9,9,4,1.49120808259035
## P9,9,5,1.49107138624469
## P9,9,6,1.4900361723819
## P9,9,7,1.49230962013131
## P9,9,8,1.49000559747219
## P9,9,9,1.49279153196118
## P9,9,10,1.48998514811198
## P9,9,11,1.48870139651828
## P9,9,12,1.49160602001043
## P9,9,13,1.49004221897499
## P9,9,14,1.49073629379272
## P9,9,15,1.48995915212129
## P9,9,16,1.49132593239055
## P9,9,17,1.4900364613795
## P9,9,18,1.49278131553105
## P9,9,19,1.49287017786278
## P9,9,20,1.4905015682352
## P9,9,21,1.49139887094498
## P9,9,22,1.48839111328125
## P9,9,23,1.48906497068183
## P9,9,24,1.49215945259469
## P9,9,25,1.48963464736938
## P9,9,26,1.491736061719
## P9,9,27,1.49206671995275
## P9,9,28,1.48922284444173
## P9,9,29,1.49100519481458
## P9,9,30,1.49217863309951
## P9,9,31,1.49196941744198
## P9,9,32,1.49147423830899
## P9,9,33,1.48986963544573
## P9,9,34,1.48950364941456
## P9,9,35,1.49138688259437
## P9,9,36,1.49197206940762
## P9,9,37,1.49214627842108
## P9,9,38,1.49134562928
## P9,9,39,1.49046044446984
## P9,9,40,1.48983767775239
## P9,9,41,1.48919460932414
## P9,9,42,1.49108205873942
## P9,9,43,1.49126877103533
## P9,9,44,1.49138970673084
## P9,9,45,1.48737794160843
## P9,9,46,1.49194955825806
## P9,9,47,1.49096010011785
## P9,9,48,1.49006671765271
## P9,9,49,1.49030219078064
## P9,9,50,1.49095726013184
## P9,10,1,1.49072754824603
## P9,10,2,1.48982799053192
## P9,10,3,1.49062862992287
## P9,10,4,1.49050410382159
## P9,10,5,1.49113346401014
## P9,10,6,1.49014139175415
## P9,10,7,1.49186775901101
## P9,10,8,1.48999885982937
## P9,10,9,1.49066071510315
## P9,10,10,1.49158636037854
## P9,10,11,1.48988842964172
## P9,10,12,1.49207506892837
## P9,10,13,1.48971967697144
## P9,10,14,1.49426837150867
## P9,10,15,1.48949639002482
## P9,10,16,1.49126689522355
## P9,10,17,1.48875380479372
## P9,10,18,1.49141580542338
## P9,10,19,1.4908259179857
## P9,10,20,1.49180252104998
## P9,10,21,1.49192716826254
## P9,10,22,1.48907350576841
## P9,10,23,1.49096827153806
## P9,10,24,1.48959661458994
## P9,10,25,1.49156926359449
## P9,10,26,1.49129880842615
## P9,10,27,1.49141783574048
## P9,10,28,1.49022048711777
## P9,10,29,1.49050619314005
## P9,10,30,1.4907876060855
## P9,10,31,1.49236416816711
## P9,10,32,1.49107219696045
## P9,10,33,1.48991306204545
## P9,10,34,1.49087065619391
## P9,10,35,1.49168153562044
## P9,10,36,1.4898750100817
## P9,10,37,1.48973214372675
## P9,10,38,1.49023220274183
## P9,10,39,1.49229928796942
## P9,10,40,1.49183915456136
## P9,10,41,1.48908887306849
## P9,10,42,1.49168850890303
## P9,10,43,1.4913097784437
## P9,10,44,1.49018287658691
## P9,10,45,1.49101395294315
## P9,10,46,1.4914546098795
## P9,10,47,1.49130857255724
## P9,10,48,1.49041316416356
## P9,10,49,1.49106108058583
## P9,10,50,1.49052527033049
## P10,1,1,1.49726335348281
## P10,1,2,1.48645923655966
## P10,1,3,1.49426304585225
## P10,1,4,1.49352521268429
## P10,1,5,1.4873012755681
## P10,1,6,1.49043046561154
## P10,1,7,1.49283801363065
## P10,1,8,1.49955876250016
## P10,1,9,1.48492252479479
## P10,1,10,1.49494811312645
## P10,1,11,1.49060754183322
## P10,1,12,1.4881449452153
## P10,1,13,1.50356068497612
## P10,1,14,1.50650077458669
## P10,1,15,1.48394250869751
## P10,1,16,1.48885816638753
## P10,1,17,1.48802656913871
## P10,1,18,1.48518997605084
## P10,1,19,1.50281965791298
## P10,1,20,1.48751431969321
## P10,1,21,1.49170809813908
## P10,1,22,1.50259223374181
## P10,1,23,1.48007562214678
## P10,1,24,1.49393532544198
## P10,1,25,1.46782288123977
## P10,1,26,1.50570584653498
## P10,1,27,1.50296532148602
## P10,1,28,1.49483770731638
## P10,1,29,1.48978671310954
## P10,1,30,1.50325652344586
## P10,1,31,1.47856169715922
## P10,1,32,1.48532676996675
## P10,1,33,1.48491173797513
## P10,1,34,1.50586024685019
## P10,1,35,1.47994464509031
## P10,1,36,1.458685085887
## P10,1,37,1.50948672598981
## P10,1,38,1.50835988509595
## P10,1,39,1.48899287562216
## P10,1,40,1.48567203895466
## P10,1,41,1.50393912666722
## P10,1,42,1.49543719575895
## P10,1,43,1.51459216747154
## P10,1,44,1.4982678568041
## P10,1,45,1.48244722684224
## P10,1,46,1.49939046291091
## P10,1,47,1.49337179439012
## P10,1,48,1.49219667654243
## P10,1,49,1.4829280124688
## P10,1,50,1.49241828185935
## P10,2,1,1.49142839182978
## P10,2,2,1.48888956914183
## P10,2,3,1.49034097753925
## P10,2,4,1.49113981879276
## P10,2,5,1.49248948018195
## P10,2,6,1.48881327908342
## P10,2,7,1.48841827055987
## P10,2,8,1.49658610808288
## P10,2,9,1.48975437217289
## P10,2,10,1.49047160288047
## P10,2,11,1.49280379320446
## P10,2,12,1.49074631865307
## P10,2,13,1.47877277362914
## P10,2,14,1.48918180930905
## P10,2,15,1.49381817848452
## P10,2,16,1.49221374735486
## P10,2,17,1.4912310268568
## P10,2,18,1.49611713512834
## P10,2,19,1.49060910575244
## P10,2,20,1.48748170433706
## P10,2,21,1.49746854369705
## P10,2,22,1.49234884105928
## P10,2,23,1.49943998336792
## P10,2,24,1.48018409068288
## P10,2,25,1.49451916456223
## P10,2,26,1.49007014580715
## P10,2,27,1.48030222095729
## P10,2,28,1.49774858097971
## P10,2,29,1.49756864620292
## P10,2,30,1.49070709981736
## P10,2,31,1.48737411703018
## P10,2,32,1.48753350444094
## P10,2,33,1.48709774544226
## P10,2,34,1.48240702196678
## P10,2,35,1.48031298393427
## P10,2,36,1.49389938432343
## P10,2,37,1.49335692245836
## P10,2,38,1.48793503678875
## P10,2,39,1.49299397902055
## P10,2,40,1.48845016956329
## P10,2,41,1.49027668380737
## P10,2,42,1.49162940916262
## P10,2,43,1.50364796198331
## P10,2,44,1.49122681207215
## P10,2,45,1.48431995179918
## P10,2,46,1.49140265080836
## P10,2,47,1.49386395748306
## P10,2,48,1.49067505495048
## P10,2,49,1.48941353151015
## P10,2,50,1.49323305740195
## P10,3,1,1.48094979170206
## P10,3,2,1.50204907834919
## P10,3,3,1.48753344849364
## P10,3,4,1.49163527366443
## P10,3,5,1.49691814919041
## P10,3,6,1.4910709307744
## P10,3,7,1.49103847571782
## P10,3,8,1.49079319429115
## P10,3,9,1.48867238177
## P10,3,10,1.49401333218529
## P10,3,11,1.48735824815787
## P10,3,12,1.49208669139914
## P10,3,13,1.49170280905331
## P10,3,14,1.49422899045442
## P10,3,15,1.4819856040618
## P10,3,16,1.50140996571005
## P10,3,17,1.48983549604229
## P10,3,18,1.49056437259584
## P10,3,19,1.49439428040856
## P10,3,20,1.4908611533008
## P10,3,21,1.48871592415704
## P10,3,22,1.49408955044217
## P10,3,23,1.48899862371339
## P10,3,24,1.48750049261738
## P10,3,25,1.49255271777985
## P10,3,26,1.49151644914047
## P10,3,27,1.48917967890516
## P10,3,28,1.48741625139377
## P10,3,29,1.48574107248078
## P10,3,30,1.48971722023619
## P10,3,31,1.49669850534863
## P10,3,32,1.49220488592982
## P10,3,33,1.4884136147695
## P10,3,34,1.49413092797544
## P10,3,35,1.4902756968631
## P10,3,36,1.49346623359582
## P10,3,37,1.48980969593937
## P10,3,38,1.48788084830007
## P10,3,39,1.49288849140468
## P10,3,40,1.48578511198906
## P10,3,41,1.49946920077006
## P10,3,42,1.47762256705243
## P10,3,43,1.49431185756656
## P10,3,44,1.49288333307101
## P10,3,45,1.49713319066971
## P10,3,46,1.49122833383494
## P10,3,47,1.49106002303789
## P10,3,48,1.49260634771535
## P10,3,49,1.49730128400466
## P10,3,50,1.49436146418254
## P10,4,1,1.49029311319677
## P10,4,2,1.49376127143311
## P10,4,3,1.49342242031233
## P10,4,4,1.48960463841756
## P10,4,5,1.49151326254975
## P10,4,6,1.48788321470912
## P10,4,7,1.48914395293144
## P10,4,8,1.48869687165969
## P10,4,9,1.49123146113227
## P10,4,10,1.48766656668789
## P10,4,11,1.49595227120798
## P10,4,12,1.48990034005221
## P10,4,13,1.49233382940292
## P10,4,14,1.48931929108444
## P10,4,15,1.49226022161832
## P10,4,16,1.49269442979981
## P10,4,17,1.49150908986727
## P10,4,18,1.49076855416391
## P10,4,19,1.48872989965669
## P10,4,20,1.48194090135258
## P10,4,21,1.49839249410127
## P10,4,22,1.47893138470188
## P10,4,23,1.49111769485474
## P10,4,24,1.49634391711308
## P10,4,25,1.4902992031791
## P10,4,26,1.48704673518305
## P10,4,27,1.48949139648014
## P10,4,28,1.48841009868516
## P10,4,29,1.4890356235676
## P10,4,30,1.48875293077207
## P10,4,31,1.49547712067912
## P10,4,32,1.48741717579999
## P10,4,33,1.49284013821061
## P10,4,34,1.49209899722405
## P10,4,35,1.48951036180769
## P10,4,36,1.49237692290248
## P10,4,37,1.48958262612548
## P10,4,38,1.4931784263024
## P10,4,39,1.499582324339
## P10,4,40,1.48593496715321
## P10,4,41,1.48464065943009
## P10,4,42,1.50556863336002
## P10,4,43,1.495979407477
## P10,4,44,1.49465548651559
## P10,4,45,1.48666456858317
## P10,4,46,1.49339477539062
## P10,4,47,1.49318622232793
## P10,4,48,1.49464446910913
## P10,4,49,1.48124923476254
## P10,4,50,1.49539717269947
## P10,5,1,1.47794727325439
## P10,5,2,1.49005522361168
## P10,5,3,1.49164721605589
## P10,5,4,1.49455347061157
## P10,5,5,1.49092653902566
## P10,5,6,1.48967454209924
## P10,5,7,1.49289020778626
## P10,5,8,1.49107840186671
## P10,5,9,1.49157643653977
## P10,5,10,1.49309971992006
## P10,5,11,1.4880763061011
## P10,5,12,1.49312228626675
## P10,5,13,1.48351679861018
## P10,5,14,1.49422061815858
## P10,5,15,1.49139696179014
## P10,5,16,1.49412941199083
## P10,5,17,1.48913698368244
## P10,5,18,1.4944262340151
## P10,5,19,1.48868420521418
## P10,5,20,1.49603675912928
## P10,5,21,1.48926207197814
## P10,5,22,1.48820173740387
## P10,5,23,1.49400044788014
## P10,5,24,1.48956692572868
## P10,5,25,1.48580181511649
## P10,5,26,1.49302523525049
## P10,5,27,1.49225973510742
## P10,5,28,1.48936107754707
## P10,5,29,1.49462004467449
## P10,5,30,1.49321342871441
## P10,5,31,1.49128078691887
## P10,5,32,1.48511153152309
## P10,5,33,1.49373829749323
## P10,5,34,1.492010220714
## P10,5,35,1.49253604147169
## P10,5,36,1.47695733498836
## P10,5,37,1.50449446729712
## P10,5,38,1.49098220325652
## P10,5,39,1.48469359616199
## P10,5,40,1.49489598614829
## P10,5,41,1.49603157516912
## P10,5,42,1.49139172744751
## P10,5,43,1.49040533078683
## P10,5,44,1.49234819757766
## P10,5,45,1.49069409254121
## P10,5,46,1.49486981232961
## P10,5,47,1.48763251304626
## P10,5,48,1.48534334823489
## P10,5,49,1.49765964023402
## P10,5,50,1.49132169153272
## P10,6,1,1.49855560302734
## P10,6,2,1.49082342698612
## P10,6,3,1.49187030348667
## P10,6,4,1.4912368902686
## P10,6,5,1.49093120656115
## P10,6,6,1.48910112434861
## P10,6,7,1.4922009408474
## P10,6,8,1.49152870178223
## P10,6,9,1.49029392787388
## P10,6,10,1.49140373764524
## P10,6,11,1.49025055473926
## P10,6,12,1.49100913792631
## P10,6,13,1.49130348420479
## P10,6,14,1.49135717830142
## P10,6,15,1.49007254592643
## P10,6,16,1.49117171568949
## P10,6,17,1.49105771619882
## P10,6,18,1.49086522407272
## P10,6,19,1.49079376970019
## P10,6,20,1.49139952505788
## P10,6,21,1.49087740799476
## P10,6,22,1.49117702997031
## P10,6,23,1.49196658414953
## P10,6,24,1.490469678243
## P10,6,25,1.49063265609741
## P10,6,26,1.49081026762724
## P10,6,27,1.49165393688061
## P10,6,28,1.49025558680296
## P10,6,29,1.49071746246487
## P10,6,30,1.49063197014824
## P10,6,31,1.4909616463057
## P10,6,32,1.4915435679324
## P10,6,33,1.49053634007772
## P10,6,34,1.49190417519451
## P10,6,35,1.49074737875311
## P10,6,36,1.4918678212328
## P10,6,37,1.49035853279961
## P10,6,38,1.49177120515964
## P10,6,39,1.49080799738566
## P10,6,40,1.49031785896846
## P10,6,41,1.48969370290774
## P10,6,42,1.49136401855782
## P10,6,43,1.49013989961066
## P10,6,44,1.49199412739466
## P10,6,45,1.49148119442047
## P10,6,46,1.49105354065591
## P10,6,47,1.49111061553433
## P10,6,48,1.49070750164385
## P10,6,49,1.48993748710269
## P10,6,50,1.49095882992995
## P10,7,1,1.49060713819095
## P10,7,2,1.49123127801078
## P10,7,3,1.49031880322625
## P10,7,4,1.49082997373042
## P10,7,5,1.49302052342614
## P10,7,6,1.49054218518852
## P10,7,7,1.49033572457053
## P10,7,8,1.49149145903411
## P10,7,9,1.4910625541021
## P10,7,10,1.49054567019145
## P10,7,11,1.4910597608547
## P10,7,12,1.49042421254245
## P10,7,13,1.49016482554949
## P10,7,14,1.49190447970134
## P10,7,15,1.49013902626786
## P10,7,16,1.49132742200579
## P10,7,17,1.48971552805069
## P10,7,18,1.49082836944066
## P10,7,19,1.49068356148991
## P10,7,20,1.49106484711772
## P10,7,21,1.49014199599055
## P10,7,22,1.48987131748559
## P10,7,23,1.49275369134568
## P10,7,24,1.48890206833516
## P10,7,25,1.49247591927548
## P10,7,26,1.49052177270254
## P10,7,27,1.49094068568988
## P10,7,28,1.49060407015357
## P10,7,29,1.49093009233475
## P10,7,30,1.49148635466894
## P10,7,31,1.4904650145886
## P10,7,32,1.49235568160102
## P10,7,33,1.49068733920222
## P10,7,34,1.49100039899349
## P10,7,35,1.49008033801983
## P10,7,36,1.49114166088958
## P10,7,37,1.49067994414783
## P10,7,38,1.49074149953908
## P10,7,39,1.49104043570432
## P10,7,40,1.48890176841191
## P10,7,41,1.49153908183066
## P10,7,42,1.49155008151967
## P10,7,43,1.49021509921912
## P10,7,44,1.49110362664709
## P10,7,45,1.49022130862526
## P10,7,46,1.49134749836392
## P10,7,47,1.49021215809202
## P10,7,48,1.49055051058531
## P10,7,49,1.49202387105851
## P10,7,50,1.48970199131465
## P10,8,1,1.49127116570106
## P10,8,2,1.49065439937679
## P10,8,3,1.4912103900203
## P10,8,4,1.49062344146101
## P10,8,5,1.49090052420093
## P10,8,6,1.49068242352025
## P10,8,7,1.49025440216064
## P10,8,8,1.491376168486
## P10,8,9,1.49088573825452
## P10,8,10,1.49064568624105
## P10,8,11,1.49082370719524
## P10,8,12,1.48983814886638
## P10,8,13,1.49160514852052
## P10,8,14,1.48964949785653
## P10,8,15,1.49188011487325
## P10,8,16,1.49073334909835
## P10,8,17,1.49047658113929
## P10,8,18,1.49206550518672
## P10,8,19,1.49105100009752
## P10,8,20,1.49104282237865
## P10,8,21,1.49029464633377
## P10,8,22,1.49147927649667
## P10,8,23,1.49060608189681
## P10,8,24,1.49007836632107
## P10,8,25,1.49036871345298
## P10,8,26,1.49059309830537
## P10,8,27,1.49063588047887
## P10,8,28,1.49090194702148
## P10,8,29,1.4905714903559
## P10,8,30,1.49044523839875
## P10,8,31,1.49078852522607
## P10,8,32,1.49052887134724
## P10,8,33,1.49160953737655
## P10,8,34,1.4905033574521
## P10,8,35,1.4904004243704
## P10,8,36,1.49173612892628
## P10,8,37,1.49113395100548
## P10,8,38,1.49065214709232
## P10,8,39,1.49079875477025
## P10,8,40,1.4910383706141
## P10,8,41,1.49075816571712
## P10,8,42,1.49114435710264
## P10,8,43,1.49161021223346
## P10,8,44,1.48997978444369
## P10,8,45,1.49066166046563
## P10,8,46,1.49066492877429
## P10,8,47,1.49141586556727
## P10,8,48,1.49134951708268
## P10,8,49,1.49014779896412
## P10,8,50,1.49067800203959
## P10,9,1,1.49131098622861
## P10,9,2,1.49110115343525
## P10,9,3,1.48991243197368
## P10,9,4,1.49128703488648
## P10,9,5,1.49104075544462
## P10,9,6,1.48872247556361
## P10,9,7,1.49119329882098
## P10,9,8,1.4913515437733
## P10,9,9,1.49131412152891
## P10,9,10,1.49126616277193
## P10,9,11,1.49035860810961
## P10,9,12,1.49116461686414
## P10,9,13,1.48943527178331
## P10,9,14,1.49089060827743
## P10,9,15,1.49135494657925
## P10,9,16,1.4900783795989
## P10,9,17,1.49115323602108
## P10,9,18,1.48981944120155
## P10,9,19,1.49138382223786
## P10,9,20,1.49122561488235
## P10,9,21,1.48899465742565
## P10,9,22,1.4920897594718
## P10,9,23,1.48972219228745
## P10,9,24,1.49044681495091
## P10,9,25,1.49105786501877
## P10,9,26,1.49177471160889
## P10,9,27,1.49038031395901
## P10,9,28,1.49090698733926
## P10,9,29,1.49079700273888
## P10,9,30,1.4902492089705
## P10,9,31,1.49067971110344
## P10,9,32,1.4900998381881
## P10,9,33,1.49023742530182
## P10,9,34,1.49206458994773
## P10,9,35,1.49151029936764
## P10,9,36,1.49006603925656
## P10,9,37,1.49261949001214
## P10,9,38,1.49131416180812
## P10,9,39,1.49084084966908
## P10,9,40,1.48956819831348
## P10,9,41,1.49136177257255
## P10,9,42,1.49059775023334
## P10,9,43,1.49157667771364
## P10,9,44,1.49081150333533
## P10,9,45,1.49111426245306
## P10,9,46,1.48933289488968
## P10,9,47,1.49142612870207
## P10,9,48,1.49058545154074
## P10,9,49,1.49102307462144
## P10,9,50,1.49074244499207
## P10,10,1,1.49156318328999
## P10,10,2,1.49045810791162
## P10,10,3,1.49087151543039
## P10,10,4,1.4922327768235
## P10,10,5,1.49167874936135
## P10,10,6,1.49111708383712
## P10,10,7,1.49156335930326
## P10,10,8,1.49128852402868
## P10,10,9,1.49092944338918
## P10,10,10,1.49146885950057
## P10,10,11,1.49050659906297
## P10,10,12,1.4912228345871
## P10,10,13,1.49018316011171
## P10,10,14,1.49058038361219
## P10,10,15,1.49136347733727
## P10,10,16,1.49049224399385
## P10,10,17,1.49034727665416
## P10,10,18,1.49116863807042
## P10,10,19,1.49211759368579
## P10,10,20,1.49025525446013
## P10,10,21,1.49075725398113
## P10,10,22,1.49144673101681
## P10,10,23,1.4902576573041
## P10,10,24,1.49111834168434
## P10,10,25,1.49189814616894
## P10,10,26,1.49115539732433
## P10,10,27,1.49062139208954
## P10,10,28,1.49181757178358
## P10,10,29,1.49114550862994
## P10,10,30,1.49209447260256
## P10,10,31,1.49036787013815
## P10,10,32,1.49061862230301
## P10,10,33,1.49109948619028
## P10,10,34,1.49119671400603
## P10,10,35,1.49140265854922
## P10,10,36,1.49089302391302
## P10,10,37,1.49105281364627
## P10,10,38,1.49036779809505
## P10,10,39,1.49125836997904
## P10,10,40,1.4914299141277
## P10,10,41,1.49124999046326
## P10,10,42,1.49040598794818
## P10,10,43,1.49194217242783
## P10,10,44,1.4903376288712
## P10,10,45,1.49139414772843
## P10,10,46,1.4916005219732
## P10,10,47,1.49009738862514
## P10,10,48,1.49208223819733
## P10,10,49,1.4910681660014
## P10,10,50,1.48993610252034
## P11,1,1,1.49131427091711
## P11,1,2,1.50979290558742
## P11,1,3,1.49821122615568
## P11,1,4,1.49160935960967
## P11,1,5,1.45608144582704
## P11,1,6,1.49539331956343
## P11,1,7,1.49465663809525
## P11,1,8,1.48710703849792
## P11,1,9,1.50285280667818
## P11,1,10,1.49150824546814
## P11,1,11,1.4920324531256
## P11,1,12,1.48628277498133
## P11,1,13,1.51349664315945
## P11,1,14,1.49195058486041
## P11,1,15,1.50167094258701
## P11,1,16,1.49002382082817
## P11,1,17,1.47656889756521
## P11,1,18,1.48676867098422
## P11,1,19,1.49053031108418
## P11,1,20,1.50506234991139
## P11,1,21,1.4927203314645
## P11,1,22,1.48047850113506
## P11,1,23,1.49000212284907
## P11,1,24,1.49336957931519
## P11,1,25,1.49389270941416
## P11,1,26,1.48880094214331
## P11,1,27,1.48946421689326
## P11,1,28,1.47494950438991
## P11,1,29,1.48728118061034
## P11,1,30,1.4944949795429
## P11,1,31,1.49812823183396
## P11,1,32,1.49565060060103
## P11,1,33,1.5093605464155
## P11,1,34,1.49022887882433
## P11,1,35,1.46404071581566
## P11,1,36,1.48041413227717
## P11,1,37,1.49777758375127
## P11,1,38,1.49258600025002
## P11,1,39,1.48066105445226
## P11,1,40,1.47687849100085
## P11,1,41,1.48097538125926
## P11,1,42,1.48065840018975
## P11,1,43,1.47855925559998
## P11,1,44,1.50169619437187
## P11,1,45,1.5329777544195
## P11,1,46,1.48327532741759
## P11,1,47,1.48828391347613
## P11,1,48,1.48909750351539
## Warning: There are no valid values for INTERVALS=49 in LISTP11[[1]]
## Warning: There are no valid values for INTERVALS=50 in LISTP11[[1]]
## P11,2,1,1.49065130598405
## P11,2,2,1.49065371446831
## P11,2,3,1.49161529955657
## P11,2,4,1.48756117723426
## P11,2,5,1.49112028299376
## P11,2,6,1.49185342099293
## P11,2,7,1.49228109227549
## P11,2,8,1.48922344048818
## P11,2,9,1.49195092916489
## P11,2,10,1.49129038507288
## P11,2,11,1.49104353266025
## P11,2,12,1.49152240361253
## P11,2,13,1.49140819311142
## P11,2,14,1.49197116552615
## P11,2,15,1.49180116281881
## P11,2,16,1.49102034189005
## P11,2,17,1.4910154877422
## P11,2,18,1.49144245179232
## P11,2,19,1.49172705509624
## P11,2,20,1.49135065078735
## P11,2,21,1.49124632090548
## P11,2,22,1.49163396017892
## P11,2,23,1.49216229844801
## P11,2,24,1.49009993443122
## P11,2,25,1.49369205747332
## P11,2,26,1.49251814339105
## P11,2,27,1.49285129138402
## P11,2,28,1.49110990709963
## P11,2,29,1.49297857284546
## P11,2,30,1.49530506915733
## P11,2,31,1.48787927627563
## P11,2,32,1.49038606048912
## P11,2,33,1.49147065634866
## P11,2,34,1.4921859056895
## P11,2,35,1.49198724483622
## P11,2,36,1.48610635904165
## P11,2,37,1.49028537891529
## P11,2,38,1.49220736308764
## P11,2,39,1.491386585925
## P11,2,40,1.49283637382366
## P11,2,41,1.50637077402186
## P11,2,42,1.49019047121207
## P11,2,43,1.4901565840078
## P11,2,44,1.49070273661146
## P11,2,45,1.49031963348389
## P11,2,46,1.49209647226815
## P11,2,47,1.48837736962547
## P11,2,48,1.49202114602794
## P11,2,49,1.49279336219138
## P11,2,50,1.49447596498898
## P11,3,1,1.49152076969976
## P11,3,2,1.4912110438218
## P11,3,3,1.49041295051575
## P11,3,4,1.49153339862823
## P11,3,5,1.49155801476784
## P11,3,6,1.49086256649183
## P11,3,7,1.49190091746194
## P11,3,8,1.49071324148843
## P11,3,9,1.49240835507711
## P11,3,10,1.49377175381309
## P11,3,11,1.49104792193363
## P11,3,12,1.49195474553331
## P11,3,13,1.49277208180263
## P11,3,14,1.49187309459104
## P11,3,15,1.48744043376711
## P11,3,16,1.49484498400084
## P11,3,17,1.48969619870186
## P11,3,18,1.49357427491082
## P11,3,19,1.48734631761909
## P11,3,20,1.48960354017175
## P11,3,21,1.4909683402258
## P11,3,22,1.49119972277291
## P11,3,23,1.48889820235116
## P11,3,24,1.49069974655496
## P11,3,25,1.49244010725687
## P11,3,26,1.49124097152495
## P11,3,27,1.49161758025487
## P11,3,28,1.49084196219573
## P11,3,29,1.49180941721972
## P11,3,30,1.4909090922429
## P11,3,31,1.49155178395185
## P11,3,32,1.48874256511529
## P11,3,33,1.49268456260757
## P11,3,34,1.49165872941937
## P11,3,35,1.48905214631414
## P11,3,36,1.50141206038626
## P11,3,37,1.48525803287824
## P11,3,38,1.49214352788152
## P11,3,39,1.49047940178255
## P11,3,40,1.5008414540972
## P11,3,41,1.47570323944092
## P11,3,42,1.49416841014048
## P11,3,43,1.48929339408875
## P11,3,44,1.49079642030928
## P11,3,45,1.50333077080396
## P11,3,46,1.48936853986798
## P11,3,47,1.49337468036385
## P11,3,48,1.48882892439442
## P11,3,49,1.49288946209532
## P11,3,50,1.49117905454537
## P11,4,1,1.49266041649712
## P11,4,2,1.49178009827932
## P11,4,3,1.49152122139931
## P11,4,4,1.4913502269321
## P11,4,5,1.49191005413349
## P11,4,6,1.49192994622623
## P11,4,7,1.49139330365242
## P11,4,8,1.49217958298941
## P11,4,9,1.49185269149308
## P11,4,10,1.49167101433937
## P11,4,11,1.49061238765717
## P11,4,12,1.49201181060389
## P11,4,13,1.49173159738189
## P11,4,14,1.49180625103138
## P11,4,15,1.49267992307973
## P11,4,16,1.49231667131991
## P11,4,17,1.49252762938991
## P11,4,18,1.49074885845184
## P11,4,19,1.49190459795446
## P11,4,20,1.49212295406467
## P11,4,21,1.49129737691676
## P11,4,22,1.49228555400197
## P11,4,23,1.49102776745955
## P11,4,24,1.49273920059204
## P11,4,25,1.49116972130789
## P11,4,26,1.49182689189911
## P11,4,27,1.49174679490857
## P11,4,28,1.48856251012711
## P11,4,29,1.4897312171319
## P11,4,30,1.49178745435632
## P11,4,31,1.49214763267367
## P11,4,32,1.4916261604854
## P11,4,33,1.49138579126132
## P11,4,34,1.49479182748234
## P11,4,35,1.49030308540051
## P11,4,36,1.48791389031844
## P11,4,37,1.49297696853352
## P11,4,38,1.49110719622398
## P11,4,39,1.49213692790172
## P11,4,40,1.48751695030614
## P11,4,41,1.49404148051613
## P11,4,42,1.49159444275723
## P11,4,43,1.49158062331978
## P11,4,44,1.49153173380885
## P11,4,45,1.49311055635151
## P11,4,46,1.49113000672439
## P11,4,47,1.48911149878251
## P11,4,48,1.4920278304332
## P11,4,49,1.49725982599091
## P11,4,50,1.4882020578756
## P11,5,1,1.49130497688104
## P11,5,2,1.49167323793684
## P11,5,3,1.49247818355319
## P11,5,4,1.49148113219464
## P11,5,5,1.4916051789826
## P11,5,6,1.48971262574196
## P11,5,7,1.49069534283932
## P11,5,8,1.49143969921665
## P11,5,9,1.49112946959748
## P11,5,10,1.4924909376329
## P11,5,11,1.49537428942594
## P11,5,12,1.49386776818169
## P11,5,13,1.49231096205673
## P11,5,14,1.49273440417121
## P11,5,15,1.49066746551379
## P11,5,16,1.4935819478262
## P11,5,17,1.48139214279628
## P11,5,18,1.49341212702161
## P11,5,19,1.49262016395043
## P11,5,20,1.50413330863504
## P11,5,21,1.49090602618306
## P11,5,22,1.49105227284315
## P11,5,23,1.51816825179366
## P11,5,24,1.4870720374875
## P11,5,25,1.48363021214803
## P11,5,26,1.48995374704336
## P11,5,27,1.50067012960261
## P11,5,28,1.47913552503117
## P11,5,29,1.48995676135073
## P11,5,30,1.48937074617408
## P11,5,31,1.48057833424321
## P11,5,32,1.46799833048945
## P11,5,33,1.49580982844035
## P11,5,34,1.46008690141088
## P11,5,35,1.44871740715176
## P11,5,36,1.53956538897294
## P11,5,37,1.49612740516663
## P11,5,38,1.49290829896927
## P11,5,39,1.49185719490051
## P11,5,40,1.49240079036979
## P11,5,41,1.49119899224262
## P11,5,42,1.49419799927742
## P11,5,43,1.4947850227356
## P11,5,44,1.4890347844676
## P11,5,45,1.50155747890472
## P11,5,46,1.5189829826355
## P11,5,47,1.50430512110392
## P11,5,48,1.49318851947784
## P11,5,49,1.47727866470814
## P11,5,50,1.49020597224927
## P11,6,1,1.49196637760509
## P11,6,2,1.49287938302563
## P11,6,3,1.4914883425538
## P11,6,4,1.49088153024999
## P11,6,5,1.49297968864441
## P11,6,6,1.49205959390063
## P11,6,7,1.49092136202632
## P11,6,8,1.49175639306345
## P11,6,9,1.49186863437776
## P11,6,10,1.4908786714077
## P11,6,11,1.49114158716095
## P11,6,12,1.49260314132856
## P11,6,13,1.49223469257355
## P11,6,14,1.49335795435412
## P11,6,15,1.48678631602593
## P11,6,16,1.49045095945659
## P11,6,17,1.49555028003195
## P11,6,18,1.49620303010519
## P11,6,19,1.49302637343313
## P11,6,20,1.49191152715237
## P11,6,21,1.4902818812071
## P11,6,22,1.49286562204361
## P11,6,23,1.49070144872196
## P11,6,24,1.47670497522726
## P11,6,25,1.48596200942993
## P11,6,26,1.4925138547823
## P11,6,27,1.4918840272086
## P11,6,28,1.49176024568492
## P11,6,29,1.4907963244946
## P11,6,30,1.49296917758145
## P11,6,31,1.49322957052311
## P11,6,32,1.49078113968308
## P11,6,33,1.49311930673164
## P11,6,34,1.49122326714652
## P11,6,35,1.49127067052401
## P11,6,36,1.49221481736173
## P11,6,37,1.49091838817207
## P11,6,38,1.49375579883526
## P11,6,39,1.49182320159415
## P11,6,40,1.49133013390206
## P11,6,41,1.49287656870755
## P11,6,42,1.49013134741014
## P11,6,43,1.49073775325503
## P11,6,44,1.49334706313221
## P11,6,45,1.48848328156905
## P11,6,46,1.4929465112232
## P11,6,47,1.4922168226803
## P11,6,48,1.49174167525094
## P11,6,49,1.49348788550406
## P11,6,50,1.49084087749859
## P11,7,1,1.49064960008786
## P11,7,2,1.49146843910217
## P11,7,3,1.49150466442108
## P11,7,4,1.4941845350368
## P11,7,5,1.49285641988118
## P11,7,6,1.49223748842875
## P11,7,7,1.49144840240479
## P11,7,8,1.49167744318644
## P11,7,9,1.49186319112778
## P11,7,10,1.49108762542407
## P11,7,11,1.49178647994995
## P11,7,12,1.49149334707925
## P11,7,13,1.49186240964466
## P11,7,14,1.49135614653765
## P11,7,15,1.49044356626623
## P11,7,16,1.49252435772918
## P11,7,17,1.49101526596967
## P11,7,18,1.49088043023732
## P11,7,19,1.49244299121931
## P11,7,20,1.49147427082062
## P11,7,21,1.49101146263412
## P11,7,22,1.49090448718205
## P11,7,23,1.49265720844269
## P11,7,24,1.49144468307495
## P11,7,25,1.49040006787589
## P11,7,26,1.49203192103993
## P11,7,27,1.49188193553636
## P11,7,28,1.49200686059817
## P11,7,29,1.49198033077882
## P11,7,30,1.48954072336512
## P11,7,31,1.49253137060936
## P11,7,32,1.4906564207638
## P11,7,33,1.49225215558653
## P11,7,34,1.49149904801295
## P11,7,35,1.49122722625732
## P11,7,36,1.49321048674376
## P11,7,37,1.49048882849673
## P11,7,38,1.48860551149417
## P11,7,39,1.49350301424662
## P11,7,40,1.49403416100195
## P11,7,41,1.49105602502823
## P11,7,42,1.49385028415256
## P11,7,43,1.49074548971458
## P11,7,44,1.49144628754369
## P11,7,45,1.49149948143097
## P11,7,46,1.49164005161561
## P11,7,47,1.49119024957929
## P11,7,48,1.4910537363535
## P11,7,49,1.49202367746941
## P11,7,50,1.49246525987286
## P11,8,1,1.49195031091279
## P11,8,2,1.49155924320221
## P11,8,3,1.49132181507672
## P11,8,4,1.49166613098577
## P11,8,5,1.49118421798529
## P11,8,6,1.49262737074206
## P11,8,7,1.49092196129464
## P11,8,8,1.49129871142808
## P11,8,9,1.49098913934496
## P11,8,10,1.4918068911122
## P11,8,11,1.49149375491672
## P11,8,12,1.49235008784703
## P11,8,13,1.48984190312828
## P11,8,14,1.49101807208771
## P11,8,15,1.49217381242846
## P11,8,16,1.49231625699449
## P11,8,17,1.49063022513139
## P11,8,18,1.49199115208217
## P11,8,19,1.49104942249346
## P11,8,20,1.49071512800274
## P11,8,21,1.49196543344637
## P11,8,22,1.49243209381734
## P11,8,23,1.49093447233501
## P11,8,24,1.49247895073645
## P11,8,25,1.49133035114833
## P11,8,26,1.49170830105775
## P11,8,27,1.49066838038336
## P11,8,28,1.4906864624757
## P11,8,29,1.49199535344776
## P11,8,30,1.49220568537712
## P11,8,31,1.49241785504925
## P11,8,32,1.49242558198817
## P11,8,33,1.49200695753098
## P11,8,34,1.49215697800672
## P11,8,35,1.49139417434225
## P11,8,36,1.4917519280785
## P11,8,37,1.49152568054199
## P11,8,38,1.49078152472513
## P11,8,39,1.49327060955913
## P11,8,40,1.48794041535793
## P11,8,41,1.48756020863851
## P11,8,42,1.49055258600335
## P11,8,43,1.49266329789773
## P11,8,44,1.49041058800437
## P11,8,45,1.49110480524459
## P11,8,46,1.49190956193048
## P11,8,47,1.49427917599678
## P11,8,48,1.49048435547773
## P11,8,49,1.4925175432889
## P11,8,50,1.49120717415443
## P11,9,1,1.49244910127976
## P11,9,2,1.49127330278095
## P11,9,3,1.49118862730084
## P11,9,4,1.49142198562622
## P11,9,5,1.49097274100944
## P11,9,6,1.49057504108974
## P11,9,7,1.49132899677052
## P11,9,8,1.49159884640551
## P11,9,9,1.49100771084638
## P11,9,10,1.49187023561079
## P11,9,11,1.49169280218041
## P11,9,12,1.49436739183241
## P11,9,13,1.49018111027462
## P11,9,14,1.49185830668399
## P11,9,15,1.49325374984741
## P11,9,16,1.48990749601108
## P11,9,17,1.49096799898548
## P11,9,18,1.49064488231011
## P11,9,19,1.4906754383674
## P11,9,20,1.48992948317796
## P11,9,21,1.49161884744289
## P11,9,22,1.49467150260662
## P11,9,23,1.48549064583735
## P11,9,24,1.49531313879737
## P11,9,25,1.48446325778961
## P11,9,26,1.49564974396317
## P11,9,27,1.4905998799708
## P11,9,28,1.4907858492148
## P11,9,29,1.49155351571869
## P11,9,30,1.49111207049826
## P11,9,31,1.49568767774673
## P11,9,32,1.49149573898315
## P11,9,33,1.49569282406255
## P11,9,34,1.49243868453593
## P11,9,35,1.49151164635845
## P11,9,36,1.49194093261446
## P11,9,37,1.49124168313068
## P11,9,38,1.49168487028642
## P11,9,39,1.49123654809109
## P11,9,40,1.49095877408981
## P11,9,41,1.49043931279864
## P11,9,42,1.48931814494886
## P11,9,43,1.49074743514837
## P11,9,44,1.4908613257938
## P11,9,45,1.49203078614341
## P11,9,46,1.49160442779313
## P11,9,47,1.4934063419219
## P11,9,48,1.49573430011147
## P11,9,49,1.48881694248744
## P11,9,50,1.4918939927045
## P11,10,1,1.49213717460632
## P11,10,2,1.49084738650954
## P11,10,3,1.49132756183022
## P11,10,4,1.49009824650628
## P11,10,5,1.4917322012686
## P11,10,6,1.49169581989909
## P11,10,7,1.49455701268238
## P11,10,8,1.48930849852385
## P11,10,9,1.49125259337218
## P11,10,10,1.49297253290812
## P11,10,11,1.49137343008687
## P11,10,12,1.48996176880397
## P11,10,13,1.49216216443533
## P11,10,14,1.49170272217857
## P11,10,15,1.49015229940414
## P11,10,16,1.48236385392554
## P11,10,17,1.48513931612815
## P11,10,18,1.48998983282792
## P11,10,19,1.49080378834794
## P11,10,20,1.4918171564738
## P11,10,21,1.49212553921868
## P11,10,22,1.4909809919504
## P11,10,23,1.49151691860623
## P11,10,24,1.4916344425895
## P11,10,25,1.49123491757158
## P11,10,26,1.49173487787661
## P11,10,27,1.49155824155693
## P11,10,28,1.49184804552057
## P11,10,29,1.49364934648786
## P11,10,30,1.48771411425447
## P11,10,31,1.49661146799723
## P11,10,32,1.49060872124463
## P11,10,33,1.49118012189865
## P11,10,34,1.49603211636446
## P11,10,35,1.49143967628479
## P11,10,36,1.4925148634784
## P11,10,37,1.4907768368721
## P11,10,38,1.49461947999349
## P11,10,39,1.49054363907361
## P11,10,40,1.49275338131448
## P11,10,41,1.49697875295367
## P11,10,42,1.48921067679106
## P11,10,43,1.4922127416057
## P11,10,44,1.49067831039429
## P11,10,45,1.48976906863126
## P11,10,46,1.49136362931667
## P11,10,47,1.4928293301509
## P11,10,48,1.49226527120553
## P11,10,49,1.49183392524719
## P11,10,50,1.49500212630605
## P12,1,1,1.48972179906831
## P12,1,2,1.49282140266605
## P12,1,3,1.4907519409531
## P12,1,4,1.49154389515901
## P12,1,5,1.49126364938144
## P12,1,6,1.49014481726815
## P12,1,7,1.49135459793939
## P12,1,8,1.49161311515472
## P12,1,9,1.4929052696747
## P12,1,10,1.48833461667671
## P12,1,11,1.4928500134012
## P12,1,12,1.49008656453483
## P12,1,13,1.4928432514793
## P12,1,14,1.49064800262451
## P12,1,15,1.49209419085825
## P12,1,16,1.49189075179722
## P12,1,17,1.48967223624661
## P12,1,18,1.49425959587097
## P12,1,19,1.49057420970887
## P12,1,20,1.49235983027352
## P12,1,21,1.48607358624858
## P12,1,22,1.49179548815072
## P12,1,23,1.48870915875715
## P12,1,24,1.49385571774141
## P12,1,25,1.49467318766826
## P12,1,26,1.49006551962632
## P12,1,27,1.49056213955547
## P12,1,28,1.4885388985845
## P12,1,29,1.49049293249846
## P12,1,30,1.49123380091283
## P12,1,31,1.4922990600268
## P12,1,32,1.49289015413241
## P12,1,33,1.49606179382841
## P12,1,34,1.48807062705358
## P12,1,35,1.49253135068076
## P12,1,36,1.48839960098267
## P12,1,37,1.48921652634939
## P12,1,38,1.49440443711203
## P12,1,39,1.49451279449463
## P12,1,40,1.49240049949059
## P12,1,41,1.49220555336749
## P12,1,42,1.49415138656018
## P12,1,43,1.49452249918665
## P12,1,44,1.49019136507649
## P12,1,45,1.49571765214205
## P12,1,46,1.48660645822082
## P12,1,47,1.49016519103731
## P12,1,48,1.49312883723866
## P12,1,49,1.49094297839146
## P12,1,50,1.49951499782196
## P12,2,1,1.48918447494507
## P12,2,2,1.49809979617111
## P12,2,3,1.48837574270387
## P12,2,4,1.50172785476402
## P12,2,5,1.49236308783293
## P12,2,6,1.4896004574358
## P12,2,7,1.49255398644341
## P12,2,8,1.49205382454474
## P12,2,9,1.49070708072969
## P12,2,10,1.48841277213946
## P12,2,11,1.49415450842202
## P12,2,12,1.49076907655113
## P12,2,13,1.49036088210857
## P12,2,14,1.48837703677779
## P12,2,15,1.49241476816847
## P12,2,16,1.47962661009086
## P12,2,17,1.49309034605284
## P12,2,18,1.49122977566409
## P12,2,19,1.4921311175122
## P12,2,20,1.49221023362258
## P12,2,21,1.49246851990863
## P12,2,22,1.48452385676276
## P12,2,23,1.49755662679672
## P12,2,24,1.49319725770217
## P12,2,25,1.49382700398564
## P12,2,26,1.49286470063236
## P12,2,27,1.4877296594473
## P12,2,28,1.49709973529894
## P12,2,29,1.4915085195381
## P12,2,30,1.49775282694743
## P12,2,31,1.48261660131915
## P12,2,32,1.48209289846749
## P12,2,33,1.49475497465867
## P12,2,34,1.49267183031355
## P12,2,35,1.49212844031198
## P12,2,36,1.49722282736151
## P12,2,37,1.50101322642827
## P12,2,38,1.49045852550025
## P12,2,39,1.49048528576841
## P12,2,40,1.48816374752009
## P12,2,41,1.48495206236839
## P12,2,42,1.49102669647059
## P12,2,43,1.49223908256082
## P12,2,44,1.49346216865208
## P12,2,45,1.49523663109746
## P12,2,46,1.4951849637493
## P12,2,47,1.48499232819937
## P12,2,48,1.5105997312187
## P12,2,49,1.48987934281749
## P12,2,50,1.49631847922258
## P12,3,1,1.49236936711553
## P12,3,2,1.48921025105012
## P12,3,3,1.48682604895698
## P12,3,4,1.49587584686279
## P12,3,5,1.4888035532028
## P12,3,6,1.48910668471764
## P12,3,7,1.49291975157601
## P12,3,8,1.49248123914003
## P12,3,9,1.49036488651244
## P12,3,10,1.49108069225893
## P12,3,11,1.49990923516452
## P12,3,12,1.48481434729041
## P12,3,13,1.49175586052311
## P12,3,14,1.48980855941772
## P12,3,15,1.49417707125346
## P12,3,16,1.50096349631037
## P12,3,17,1.48681521623031
## P12,3,18,1.50415962433147
## P12,3,19,1.4885412508303
## P12,3,20,1.49275383907082
## P12,3,21,1.49045134756876
## P12,3,22,1.48987307115035
## P12,3,23,1.49004196864302
## P12,3,24,1.48732675524319
## P12,3,25,1.49276553046319
## P12,3,26,1.50590488928875
## P12,3,27,1.49127451089712
## P12,3,28,1.49082338223692
## P12,3,29,1.49114488709903
## P12,3,30,1.49158737911441
## P12,3,31,1.50387939621532
## P12,3,32,1.48931806286176
## P12,3,33,1.49080036986958
## P12,3,34,1.4900698982367
## P12,3,35,1.49214917510303
## P12,3,36,1.48096636677465
## P12,3,37,1.48806776470608
## P12,3,38,1.4934398911216
## P12,3,39,1.49067386659254
## P12,3,40,1.49529297334434
## P12,3,41,1.53932768581925
## P12,3,42,1.48011495926801
## P12,3,43,1.49364478323195
## P12,3,44,1.49071262280146
## P12,3,45,1.50202694627428
## P12,3,46,1.49347497271253
## P12,3,47,1.47460670037703
## P12,3,48,1.51216798964001
## P12,3,49,1.48978541524787
## P12,3,50,1.49118954794747
## P12,4,1,1.49218681736996
## P12,4,2,1.48794455755325
## P12,4,3,1.4930270482909
## P12,4,4,1.49414754622053
## P12,4,5,1.49209120421283
## P12,4,6,1.49056551035713
## P12,4,7,1.49323659719423
## P12,4,8,1.49183921704347
## P12,4,9,1.49021172956987
## P12,4,10,1.48753171114577
## P12,4,11,1.45228099293179
## P12,4,12,1.48947357663921
## P12,4,13,1.48824492478982
## P12,4,14,1.49169797794793
## P12,4,15,1.48730188210805
## P12,4,16,1.48941526914898
## P12,4,17,1.48708269959789
## P12,4,18,1.49752358680076
## P12,4,19,1.48849563500316
## P12,4,20,1.48119783401489
## P12,4,21,1.49311899902797
## P12,4,22,1.49279731633712
## P12,4,23,1.48685957431793
## P12,4,24,1.46523414487424
## P12,4,25,1.48587142504179
## P12,4,26,1.48329729383642
## P12,4,27,1.49452057176707
## P12,4,28,1.48916270997789
## P12,4,29,1.49388617341236
## P12,4,30,1.49264122708009
## P12,4,31,1.49206416341994
## P12,4,32,1.49142360687256
## P12,4,33,1.4909679943865
## P12,4,34,1.48933832390794
## P12,4,35,1.48295248513934
## P12,4,36,1.45797166824341
## P12,4,37,1.52911997649629
## P12,4,38,1.48488935382887
## P12,4,39,1.49371876436121
## P12,4,40,1.48742799501161
## P12,4,41,1.49887308249107
## P12,4,42,1.49086062691428
## P12,4,43,1.49253940582275
## P12,4,44,1.49510731195149
## P12,4,45,1.48722702881386
## P12,4,46,1.48999976648868
## P12,4,47,1.4897463592616
## P12,4,48,1.49458279329188
## P12,4,49,1.49326930664204
## P12,4,50,1.49161561635824
## P12,5,1,1.49513856887817
## P12,5,2,1.49493982315063
## P12,5,3,1.49005890496169
## P12,5,4,1.49223805582801
## P12,5,5,1.4899349699215
## P12,5,6,1.48486615298839
## P12,5,7,1.49760737174597
## P12,5,8,1.49124969482422
## P12,5,9,1.48979619612177
## P12,5,10,1.49129100406871
## P12,5,11,1.49105708067082
## P12,5,12,1.49004799859566
## P12,5,13,1.49000417618524
## P12,5,14,1.4877795138991
## P12,5,15,1.49001599351565
## P12,5,16,1.49297311829358
## P12,5,17,1.48878196401334
## P12,5,18,1.4891533946991
## P12,5,19,1.49073221998395
## P12,5,20,1.49260125748099
## P12,5,21,1.4863055407346
## P12,5,22,1.48971651792526
## P12,5,23,1.48976646342748
## P12,5,24,1.49065611161381
## P12,5,25,1.4944273630778
## P12,5,26,1.49426665902138
## P12,5,27,1.49844599432415
## P12,5,28,1.49184886614482
## P12,5,29,1.48920798301697
## P12,5,30,1.48680997261634
## P12,5,31,1.49461310408836
## P12,5,32,1.49147195958379
## P12,5,33,1.48735099885522
## P12,5,34,1.48768156521941
## P12,5,35,1.4929430625018
## P12,5,36,1.48959598039326
## P12,5,37,1.47944101388904
## P12,5,38,1.49791678675899
## P12,5,39,1.48873143835166
## P12,5,40,1.49130153656006
## P12,5,41,1.48714408596742
## P12,5,42,1.49019325004434
## P12,5,43,1.49143846035004
## P12,5,44,1.49269427094504
## P12,5,45,1.49243076642354
## P12,5,46,1.48902839660645
## P12,5,47,1.48996512920826
## P12,5,48,1.49306373085294
## P12,5,49,1.49119154920856
## P12,5,50,1.47572421028976
## P12,6,1,1.49556061365072
## P12,6,2,1.49245848178864
## P12,6,3,1.4937638695707
## P12,6,4,1.49399834185575
## P12,6,5,1.49577345973567
## P12,6,6,1.49556455110249
## P12,6,7,1.48892079307919
## P12,6,8,1.49279831931705
## P12,6,9,1.49361272443805
## P12,6,10,1.49399207152572
## P12,6,11,1.49607908158075
## P12,6,12,1.49550529888698
## P12,6,13,1.4915364373405
## P12,6,14,1.49247731102837
## P12,6,15,1.49066511500965
## P12,6,16,1.49229910080893
## P12,6,17,1.48948034104847
## P12,6,18,1.48597046181008
## P12,6,19,1.4905154197774
## P12,6,20,1.49297914505005
## P12,6,21,1.48854818798247
## P12,6,22,1.49112153709482
## P12,6,23,1.49373046330043
## P12,6,24,1.48922203608922
## P12,6,25,1.48710578315112
## P12,6,26,1.49114230222869
## P12,6,27,1.50353727340698
## P12,6,28,1.49084038888254
## P12,6,29,1.49301777633966
## P12,6,30,1.49241521766594
## P12,6,31,1.49004357085269
## P12,6,32,1.49009614832261
## P12,6,33,1.4923534600631
## P12,6,34,1.4909029177257
## P12,6,35,1.49181865462175
## P12,6,36,1.49061970029558
## P12,6,37,1.49130911704821
## P12,6,38,1.49206391842135
## P12,6,39,1.48846745283707
## P12,6,40,1.49168478209397
## P12,6,41,1.49020092189312
## P12,6,42,1.48843945397271
## P12,6,43,1.49134977090926
## P12,6,44,1.49318764759944
## P12,6,45,1.48547833573584
## P12,6,46,1.48494322927375
## P12,6,47,1.49080135467205
## P12,6,48,1.49121319845821
## P12,6,49,1.4926460626963
## P12,6,50,1.4910264084809
## P12,7,1,1.48964213371277
## P12,7,2,1.48718233542009
## P12,7,3,1.49145483473937
## P12,7,4,1.48516384579919
## P12,7,5,1.52314304050646
## P12,7,6,1.48489555399469
## P12,7,7,1.500290507362
## P12,7,8,1.49044332833126
## P12,7,9,1.49045846105992
## P12,7,10,1.49094970836196
## P12,7,11,1.49219074343691
## P12,7,12,1.49078547253328
## P12,7,13,1.48942378891839
## P12,7,14,1.4916669804117
## P12,7,15,1.49234770173612
## P12,7,16,1.49218985678136
## P12,7,17,1.49278353422116
## P12,7,18,1.49115979317391
## P12,7,19,1.49143753732954
## P12,7,20,1.49308586120605
## P12,7,21,1.48264025648435
## P12,7,22,1.49386486968374
## P12,7,23,1.48949125029824
## P12,7,24,1.49272808145594
## P12,7,25,1.49375511591251
## P12,7,26,1.4897076824437
## P12,7,27,1.49003888059545
## P12,7,28,1.48995496915734
## P12,7,29,1.49220154245021
## P12,7,30,1.49031118626864
## P12,7,31,1.47591687573327
## P12,7,32,1.49246230531246
## P12,7,33,1.48875634037718
## P12,7,34,1.49328032823709
## P12,7,35,1.49243121628368
## P12,7,36,1.49187553801188
## P12,7,37,1.48829125936052
## P12,7,38,1.49045730692095
## P12,7,39,1.49271952222895
## P12,7,40,1.48996704001176
## P12,7,41,1.47535926818848
## P12,7,42,1.48869770169258
## P12,7,43,1.49246973395348
## P12,7,44,1.48860110775117
## P12,7,45,1.49144084769559
## P12,7,46,1.49554309580061
## P12,7,47,1.49592628845802
## P12,7,48,1.49560896346444
## P12,7,49,1.49200245360254
## P12,7,50,1.49252943956215
## P12,8,1,1.49209716243129
## P12,8,2,1.48766956044667
## P12,8,3,1.49467162404742
## P12,8,4,1.49261266252269
## P12,8,5,1.48559140496784
## P12,8,6,1.48964926989182
## P12,8,7,1.49454122270857
## P12,8,8,1.48513047099113
## P12,8,9,1.4892875778843
## P12,8,10,1.49383202512214
## P12,8,11,1.49395286335665
## P12,8,12,1.48794870507227
## P12,8,13,1.491944183474
## P12,8,14,1.4892566031304
## P12,8,15,1.53499761191748
## P12,8,16,1.47256697890579
## P12,8,17,1.48664872419266
## P12,8,18,1.48593810442332
## P12,8,19,1.48907204128447
## P12,8,20,1.49279317372962
## P12,8,21,1.4913441936175
## P12,8,22,1.49095139574649
## P12,8,23,1.49056455730337
## P12,8,24,1.49353803055627
## P12,8,25,1.49459960022751
## P12,8,26,1.48890790343285
## P12,8,27,1.49090976998357
## P12,8,28,1.49739677523389
## P12,8,29,1.4941729582273
## P12,8,30,1.4912482831896
## P12,8,31,1.48998863121559
## P12,8,32,1.48997948480689
## P12,8,33,1.49313577604883
## P12,8,34,1.48881311308254
## P12,8,35,1.4985765606524
## P12,8,36,1.49287542512145
## P12,8,37,1.48966112528762
## P12,8,38,1.49782611342037
## P12,8,39,1.48910622098553
## P12,8,40,1.49279968989523
## P12,8,41,1.48486899607109
## P12,8,42,1.48846901849259
## P12,8,43,1.49030401110649
## P12,8,44,1.49212519013055
## P12,8,45,1.48608864615945
## P12,8,46,1.48911121098892
## P12,8,47,1.49202365760344
## P12,8,48,1.5064044919881
## P12,8,49,1.48290606907436
## P12,8,50,1.49003401884796
## P12,9,1,1.48726209417566
## P12,9,2,1.48838618744251
## P12,9,3,1.49838968423697
## P12,9,4,1.49342896812841
## P12,9,5,1.49061907394023
## P12,9,6,1.4896877564882
## P12,9,7,1.49311550039994
## P12,9,8,1.48830019632975
## P12,9,9,1.48983499904474
## P12,9,10,1.48974397375777
## P12,9,11,1.49027256685145
## P12,9,12,1.48629720160302
## P12,9,13,1.49101871075016
## P12,9,14,1.48600343808736
## P12,9,15,1.48863982070576
## P12,9,16,1.48765066416577
## P12,9,17,1.49020311444305
## P12,9,18,1.49565367418177
## P12,9,19,1.49309290002245
## P12,9,20,1.49148012547011
## P12,9,21,1.51110777956374
## P12,9,22,1.49107830952375
## P12,9,23,1.48708574631635
## P12,9,24,1.4925336596332
## P12,9,25,1.50752514600754
## P12,9,26,1.49121469974518
## P12,9,27,1.49243672100114
## P12,9,28,1.49371146464693
## P12,9,29,1.48940286403749
## P12,9,30,1.49028333441004
## P12,9,31,1.49007191413488
## P12,9,32,1.49074387288356
## P12,9,33,1.4921907842829
## P12,9,34,1.48986243052655
## P12,9,35,1.50192004662973
## P12,9,36,1.49363937522426
## P12,9,37,1.48665172975142
## P12,9,38,1.49520281288359
## P12,9,39,1.48957590758801
## P12,9,40,1.49160061384502
## P12,9,41,1.49027625719706
## P12,9,42,1.48954294152456
## P12,9,43,1.4944627874641
## P12,9,44,1.49091358278312
## P12,9,45,1.48734673824939
## P12,9,46,1.48784121820482
## P12,9,47,1.49309557610816
## P12,9,48,1.49074703398205
## P12,9,49,1.48912678446089
## P12,9,50,1.49084704146426
## P12,10,1,1.4912553315752
## P12,10,2,1.4933000483983
## P12,10,3,1.49489143761722
## P12,10,4,1.48615503311157
## P12,10,5,1.48541953715872
## P12,10,6,1.488230631465
## P12,10,7,1.49329627852842
## P12,10,8,1.48492310138849
## P12,10,9,1.49019991966986
## P12,10,10,1.4931177783322
## P12,10,11,1.51031314986093
## P12,10,12,1.48672292872173
## P12,10,13,1.49264608202754
## P12,10,14,1.49192640611104
## P12,10,15,1.48742696537691
## P12,10,16,1.49385405198122
## P12,10,17,1.49708182161505
## P12,10,18,1.51236652227548
## P12,10,19,1.48698207310268
## P12,10,20,1.49151457935931
## P12,10,21,1.49898849507814
## P12,10,22,1.49463121330037
## P12,10,23,1.48852070640115
## P12,10,24,1.49238145735956
## P12,10,25,1.49472917914391
## P12,10,26,1.50130836486816
## P12,10,27,1.48117241227483
## P12,10,28,1.5067418319423
## P12,10,29,1.49109319278172
## P12,10,30,1.49275382633867
## P12,10,31,1.48622972876937
## P12,10,32,1.49403436978658
## P12,10,33,1.49017448608692
## P12,10,34,1.49507301084457
## P12,10,35,1.48949109183417
## P12,10,36,1.49955375571
## P12,10,37,1.48582956314087
## P12,10,38,1.4662593374861
## P12,10,39,1.48774627122012
## P12,10,40,1.48813834360668
## P12,10,41,1.49440465551434
## P12,10,42,1.49219426938466
## P12,10,43,1.4877970790863
## P12,10,44,1.48908543100162
## P12,10,45,1.49438765886668
## P12,10,46,1.5000720500946
## P12,10,47,1.4835678756237
## P12,10,48,1.50755890065973
## P12,10,49,1.48496736364162
## P12,10,50,1.4898976440161
## P13,1,1,1.48944612390855
## P13,1,2,1.49274649954679
## P13,1,3,1.49268327156703
## P13,1,4,1.4968545301394
## P13,1,5,1.48848311747274
## P13,1,6,1.48254447350135
## P13,1,7,1.4916960099586
## P13,1,8,1.49145607576303
## P13,1,9,1.49270341946529
## P13,1,10,1.48218198392376
## P13,1,11,1.48179576752034
## P13,1,12,1.4979741088057
## P13,1,13,1.48650509602315
## P13,1,14,1.48527570565542
## P13,1,15,1.49584945749353
## P13,1,16,1.46944438354878
## P13,1,17,1.49572508962531
## P13,1,18,1.4987981054518
## P13,1,19,1.48747097292254
## P13,1,20,1.48540657416157
## P13,1,21,1.49881094021905
## P13,1,22,1.49235181877579
## P13,1,23,1.49716993967692
## P13,1,24,1.48988317342905
## P13,1,25,1.4946922155527
## P13,1,26,1.48788628180822
## P13,1,27,1.49089000207915
## P13,1,28,1.48816568156083
## P13,1,29,1.50351336185749
## P13,1,30,1.48229252930843
## P13,1,31,1.49783619844689
## P13,1,32,1.49147513989479
## P13,1,33,1.49139981920069
## P13,1,34,1.49333267533377
## P13,1,35,1.48643503504351
## P13,1,36,1.49741696572119
## P13,1,37,1.49048744339541
## P13,1,38,1.49206393192976
## P13,1,39,1.49220922665718
## P13,1,40,1.48925611417587
## P13,1,41,1.49449841360028
## P13,1,42,1.49128564487804
## P13,1,43,1.49211419070209
## P13,1,44,1.49048570417008
## P13,1,45,1.49147966819081
## P13,1,46,1.49119249399561
## P13,1,47,1.49448116909374
## P13,1,48,1.49158588615624
## P13,1,49,1.49159297993574
## P13,1,50,1.49127494317514
## P13,2,1,1.49312102794647
## P13,2,2,1.48686993823332
## P13,2,3,1.49370275878906
## P13,2,4,1.48855814933777
## P13,2,5,1.49003728230794
## P13,2,6,1.4927695006655
## P13,2,7,1.49335598438344
## P13,2,8,1.49140136400859
## P13,2,9,1.49207066870355
## P13,2,10,1.49351636388085
## P13,2,11,1.49256601739437
## P13,2,12,1.49104024115063
## P13,2,13,1.49190723896027
## P13,2,14,1.49064846515656
## P13,2,15,1.48873148612606
## P13,2,16,1.49276879628499
## P13,2,17,1.49326052077829
## P13,2,18,1.49000647193507
## P13,2,19,1.49188742476903
## P13,2,20,1.493616759175
## P13,2,21,1.49384566240532
## P13,2,22,1.49449573944662
## P13,2,23,1.49235979878173
## P13,2,24,1.48570542957472
## P13,2,25,1.49446551835359
## P13,2,26,1.48966243301613
## P13,2,27,1.19421904497423
## P13,2,28,1.10379441415637
## P13,2,29,1.49879820450493
## P13,2,30,1.49904789243426
## P13,2,31,1.50042158961296
## P13,2,32,1.49405936668256
## P13,2,33,1.56060486180442
## P13,2,34,1.54720045799433
## P13,2,35,1.493805688525
## P13,2,36,1.51108444167907
## P13,2,37,1.59067679226883
## P13,2,38,1.4525477424804
## P13,2,39,1.08965774683938
## P13,2,40,1.14268853016782
## P13,2,41,1.37858163216941
## P13,2,42,1.69223638978843
## P13,2,43,0.975970568902352
## P13,2,44,0.233607015948229
## P13,2,45,1.0124441752981
## P13,2,46,1.24165361169758
## P13,2,47,0.000728062357174585
## P13,2,48,1.1465138354777
## P13,2,49,0.42048525752034
## P13,2,50,1.1346967046665
## P13,3,1,0.972878433705773
## P13,3,2,0.789900280209258
## Warning: There are no valid values for INTERVALS=3 in LISTP13[[3]]
## P13,3,4,1.51942059624565
## P13,3,5,0.826263737394566
## P13,3,6,1.53265505802782
## P13,3,7,1.51621044158936
## P13,3,8,1.50845110837151
## P13,3,9,1.50385463351295
## P13,3,10,1.50155422665657
## P13,3,11,1.49926696606536
## P13,3,12,1.49885987616205
## P13,3,13,1.50187739203958
## P13,3,14,1.49946132838297
## P13,3,15,1.49538861215115
## P13,3,16,1.49350111068241
## P13,3,17,1.49510973769349
## P13,3,18,1.49667117496332
## P13,3,19,1.4905348867178
## P13,3,20,1.49471761198605
## P13,3,21,1.49667180804756
## P13,3,22,1.49551648452502
## P13,3,23,1.49471008512709
## P13,3,24,1.49586162073859
## P13,3,25,1.49713543969758
## P13,3,26,1.49576170516737
## P13,3,27,1.49551823798646
## P13,3,28,1.49649127162233
## P13,3,29,1.49246770685369
## P13,3,30,1.50023244449071
## P13,3,31,1.48699608627631
## P13,3,32,1.49463831559392
## P13,3,33,1.49481399701192
## P13,3,34,1.49499577166987
## P13,3,35,1.49271077290177
## P13,3,36,1.49398730271054
## P13,3,37,1.49966860842961
## P13,3,38,1.48731221591725
## P13,3,39,1.49557062335636
## P13,3,40,1.48793097517707
## P13,3,41,1.49287995425138
## P13,3,42,1.49838680379531
## P13,3,43,1.48594389892206
## P13,3,44,1.49457367566916
## P13,3,45,1.49224666907237
## P13,3,46,1.49607491795021
## P13,3,47,1.49035006761551
## P13,3,48,1.49268606434698
## P13,3,49,1.49145369720459
## P13,3,50,1.49293731898069
## P13,4,1,1.45396454397311
## P13,4,2,0.856321742980774
## P13,4,3,1.64572605682493
## P13,4,4,1.08188678456235
## P13,4,5,1.53237630072094
## P13,4,6,1.50853243652655
## P13,4,7,1.50163581245824
## P13,4,8,1.50154089138208
## P13,4,9,1.50000592249974
## P13,4,10,1.49883801672194
## P13,4,11,1.49303555739553
## P13,4,12,1.49663861898276
## P13,4,13,1.49900984345821
## P13,4,14,1.4906977891922
## P13,4,15,1.49494972363324
## P13,4,16,1.4890081185561
## P13,4,17,1.49064613791073
## P13,4,18,1.49226814635257
## P13,4,19,1.49176907539368
## P13,4,20,1.49515919766184
## P13,4,21,1.49312076697478
## P13,4,22,1.49609969932342
## P13,4,23,1.49117311059612
## P13,4,24,1.49322170110849
## P13,4,25,1.49304351152158
## P13,4,26,1.49441981661147
## P13,4,27,1.49333189427853
## P13,4,28,1.49730131543916
## P13,4,29,1.49215051210844
## P13,4,30,1.48855457522652
## P13,4,31,1.4854117833651
## P13,4,32,1.49404803702706
## P13,4,33,1.49425064535702
## P13,4,34,1.4893686859696
## P13,4,35,1.4949376490209
## P13,4,36,1.49256129825816
## P13,4,37,1.48743186870091
## P13,4,38,1.49426607827883
## P13,4,39,1.49347421450493
## P13,4,40,1.4947225600481
## P13,4,41,1.4905617128719
## P13,4,42,1.49895950643028
## P13,4,43,1.4951988759667
## P13,4,44,1.50179982185364
## P13,4,45,1.49051000104092
## P13,4,46,1.49460339546204
## P13,4,47,1.48462783495585
## P13,4,48,1.49276357347315
## P13,4,49,1.49012801382277
## P13,4,50,1.4932420881171
## P13,5,1,0.211446980549954
## P13,5,2,1.42318986713766
## P13,5,3,0.735532081217195
## P13,5,4,0.340187410337709
## P13,5,5,1.43302829214867
## P13,5,6,1.52523496491568
## P13,5,7,1.51634354469104
## P13,5,8,1.51070074918793
## P13,5,9,1.50699363970289
## P13,5,10,1.50771759296286
## P13,5,11,1.51055417742048
## P13,5,12,1.51076195240021
## P13,5,13,1.49752799044834
## P13,5,14,1.50190971598906
## P13,5,15,1.49650189413953
## P13,5,16,1.49896160761515
## P13,5,17,1.49932217943496
## P13,5,18,1.49937512045321
## P13,5,19,1.49533399895056
## P13,5,20,1.49519962783254
## P13,5,21,1.49279685815175
## P13,5,22,1.48952101372384
## P13,5,23,1.48442979653676
## P13,5,24,1.49091958999634
## P13,5,25,1.49288684443424
## P13,5,26,1.4972323179245
## P13,5,27,1.49781988859177
## P13,5,28,1.49515358194128
## P13,5,29,1.49659083170049
## P13,5,30,1.49503093295627
## P13,5,31,1.4925954277451
## P13,5,32,1.4971906542778
## P13,5,33,1.49210167875384
## P13,5,34,1.4939151077627
## P13,5,35,1.49477272875169
## P13,5,36,1.49515443935729
## P13,5,37,1.49224502494536
## P13,5,38,1.49337452855603
## P13,5,39,1.49616274152483
## P13,5,40,1.49521703720093
## P13,5,41,1.49187109205458
## P13,5,42,1.49050961494446
## P13,5,43,1.49732286538651
## P13,5,44,1.50975578709653
## P13,5,45,1.49199120028988
## P13,5,46,1.49664714119651
## P13,5,47,1.49331310216118
## P13,5,48,1.49129861654695
## P13,5,49,1.49306140899658
## P13,5,50,1.49168397088087
## P13,6,1,1.14935683349476
## P13,6,2,1.09390974185953
## P13,6,3,1.52080335881975
## P13,6,4,1.51295834429124
## P13,6,5,1.50366562037241
## P13,6,6,1.49808469252153
## P13,6,7,1.49883815284087
## P13,6,8,1.49715405174449
## P13,6,9,1.49746157771857
## P13,6,10,1.49590480769122
## P13,6,11,1.49512438882481
## P13,6,12,1.49553309753537
## P13,6,13,1.4956240385351
## P13,6,14,1.49731448759516
## P13,6,15,1.49374350497597
## P13,6,16,1.49585902200986
## P13,6,17,1.49551856726931
## P13,6,18,1.49083427863546
## P13,6,19,1.485986654382
## P13,6,20,1.49377308721128
## P13,6,21,1.49425112483013
## P13,6,22,1.49482943638262
## P13,6,23,1.49295799099669
## P13,6,24,1.49650049209595
## P13,6,25,1.4923422168678
## P13,6,26,1.49011877436697
## P13,6,27,1.49358209923132
## P13,6,28,1.4923164602639
## P13,6,29,1.49506026707338
## P13,6,30,1.48736957750822
## P13,6,31,1.49491490946188
## P13,6,32,1.49334254961335
## P13,6,33,1.49198781381739
## P13,6,34,1.49201137754652
## P13,6,35,1.49537156359984
## P13,6,36,1.49447274488561
## P13,6,37,1.48880154821608
## P13,6,38,1.49455803813356
## P13,6,39,1.4912172371233
## P13,6,40,1.49285172714907
## P13,6,41,1.49387592181825
## P13,6,42,1.49192880547565
## P13,6,43,1.4929650240931
## P13,6,44,1.49277218182882
## P13,6,45,1.49019203015736
## P13,6,46,1.49022263187473
## P13,6,47,1.49386028448741
## P13,6,48,1.49317558421645
## P13,6,49,1.49357651952487
## P13,6,50,1.49233106058887
## P13,7,1,0.37741716701368
## P13,7,2,0.820079665062791
## P13,7,3,0.297778016962585
## P13,7,4,0.701214054776238
## P13,7,5,0.736731911434032
## P13,7,6,1.00684678019024
## P13,7,7,1.31135751984336
## P13,7,8,0.233156980527565
## P13,7,9,1.54619028351524
## P13,7,10,1.54644771207843
## P13,7,11,1.53095956075759
## P13,7,12,1.51673236223731
## P13,7,13,1.51344036102295
## P13,7,14,1.50993055658242
## P13,7,15,1.50715812560051
## P13,7,16,1.50550098980174
## P13,7,17,1.50364371349937
## P13,7,18,1.50006156263098
## P13,7,19,1.49957903948697
## P13,7,20,1.50026721424527
## P13,7,21,1.50677499463481
## P13,7,22,1.49768294844516
## P13,7,23,1.49658760898992
## P13,7,24,1.49620391176893
## P13,7,25,1.4957206149896
## P13,7,26,1.49631049484015
## P13,7,27,1.49698735713959
## P13,7,28,1.49383372132496
## P13,7,29,1.49648109747439
## P13,7,30,1.49438103823595
## P13,7,31,1.4949870790754
## P13,7,32,1.49671272203034
## P13,7,33,1.49193589775651
## P13,7,34,1.49336207218659
## P13,7,35,1.49949750406989
## P13,7,36,1.49218406051886
## P13,7,37,1.49484381956213
## P13,7,38,1.49468927383423
## P13,7,39,1.49222108762558
## P13,7,40,1.49405458394219
## P13,7,41,1.49454998473326
## P13,7,42,1.49649487071567
## P13,7,43,1.49343010610785
## P13,7,44,1.49541169664134
## P13,7,45,1.49231135472655
## P13,7,46,1.49311976799598
## P13,7,47,1.49424012005329
## P13,7,48,1.49418874330158
## P13,7,49,1.49021939255975
## P13,7,50,1.49182718218738
## P13,8,1,1.52506479289797
## P13,8,2,1.51835094949474
## P13,8,3,0.834192178030715
## P13,8,4,0.503101399376257
## P13,8,5,0.640672138257957
## P13,8,6,0.445878930262883
## P13,8,7,0.255224040327907
## P13,8,8,1.48243721111739
## P13,8,9,0.591231601907456
## P13,8,10,0.977261017780842
## P13,8,11,0.997293044776215
## P13,8,12,0.742048152787725
## P13,8,13,0.312928762752563
## P13,8,14,0.51167865061096
## P13,8,15,0.972049675608955
## P13,8,16,0.330021397684348
## P13,8,17,1.29984884545801
## P13,8,18,0.821360274517832
## P13,8,19,0.864825333977394
## P13,8,20,0.599802976343781
## P13,8,21,1.26868673370424
## P13,8,22,0.245204609193024
## P13,8,23,0.550147737975931
## P13,8,24,0.552518390734414
## P13,8,25,0.559267910953562
## P13,8,26,0.443300046040403
## P13,8,27,0.498698047942705
## P13,8,28,0.236914138366373
## P13,8,29,0.358367908141249
## P13,8,30,1.19432795744438
## P13,8,31,0.72871343805151
## P13,8,32,1.17148466388999
## P13,8,33,0.118995018529846
## P13,8,34,0.0749962965325851
## P13,8,35,0.814375518513022
## P13,8,36,0.412070879725085
## P13,8,37,0.810022595974088
## P13,8,38,0.474532872428006
## P13,8,39,0.545651108873161
## P13,8,40,0.582254967179615
## P13,8,41,0.859740402725226
## P13,8,42,1.00563646347678
## P13,8,43,1.57303504020937
## P13,8,44,1.55681658482206
## P13,8,45,1.53729609383477
## P13,8,46,1.5288557745006
## P13,8,47,1.52577722514117
## P13,8,48,1.51963758468628
## P13,8,49,1.51804265310598
## P13,8,50,1.51354234974559
## P13,9,1,1.50135113031436
## P13,9,2,1.49676235198975
## P13,9,3,1.50171094374223
## P13,9,4,1.502716924463
## P13,9,5,1.51007028222084
## P13,9,6,0.644427961983288
## P13,9,7,0.644456806484746
## P13,9,8,0.791482956492868
## P13,9,9,0.0665941853134427
## P13,9,10,1.03026631264171
## P13,9,11,0.716913141144647
## P13,9,12,0.180682138371249
## P13,9,13,0.49177572081323
## P13,9,14,0.741438857114796
## P13,9,15,0.352821205446327
## P13,9,16,0.686057479136666
## P13,9,17,1.2438986776185
## P13,9,18,1.241838786913
## P13,9,19,1.48769656920519
## P13,9,20,0.19454666893283
## P13,9,21,0.0449196120921093
## P13,9,22,1.19497720291263
## P13,9,23,0.867317673847234
## P13,9,24,0.546719525988341
## P13,9,25,0.89924487278749
## P13,9,26,1.40262776119117
## P13,9,27,0.785206442988455
## P13,9,28,0.161843737814989
## P13,9,29,0.0189028406600383
## P13,9,30,1.43335248955381
## P13,9,31,1.22837020195134
## P13,9,32,0.258562749922276
## P13,9,33,0.196207289286475
## P13,9,34,0.252882555078637
## P13,9,35,0.893836355485165
## P13,9,36,0.610818676747827
## P13,9,37,1.50807138136875
## P13,9,38,0.475790779755423
## P13,9,39,0.656030489055885
## P13,9,40,0.556257552092486
## P13,9,41,0.236757093155757
## P13,9,42,0.350837880468351
## P13,9,43,1.36597312859127
## P13,9,44,1.50987195968628
## P13,9,45,0.752002745781774
## P13,9,46,1.38784218851316
## P13,9,47,0.957710310381855
## P13,9,48,1.51569098856912
## P13,9,49,1.52591562271118
## P13,9,50,1.51101346285838
## P13,10,1,1.32072621464824
## P13,10,2,1.76269540373456
## P13,10,3,1.08959070939964
## P13,10,4,0.696035587922761
## P13,10,5,1.53393262863159
## P13,10,6,1.52329018841619
## P13,10,7,1.51415683912194
## P13,10,8,1.51732985377312
## P13,10,9,1.50545244538382
## P13,10,10,1.50597482919693
## P13,10,11,1.50114132960637
## P13,10,12,1.5039224354726
## P13,10,13,1.50124237160934
## P13,10,14,1.49880645149633
## P13,10,15,1.50240337583754
## P13,10,16,1.49529659244376
## P13,10,17,1.47822141647339
## P13,10,18,1.49721474525256
## P13,10,19,1.50691786518803
## P13,10,20,1.50109388517297
## P13,10,21,1.49690893240142
## P13,10,22,1.49881622267932
## P13,10,23,1.50088486075401
## P13,10,24,1.50072684721513
## P13,10,25,1.48961902309108
## P13,10,26,1.49839717691595
## P13,10,27,1.51135450497008
## P13,10,28,1.4811772108078
## P13,10,29,1.49974396354274
## P13,10,30,1.49798769870047
## P13,10,31,1.43679969787598
## P13,10,32,1.51621206601461
## P13,10,33,1.48090377449989
## P13,10,34,1.56483860810598
## P13,10,35,1.60157793501149
## P13,10,36,1.51103150403058
## P13,10,37,0.701898650547567
## P13,10,38,0.669172862926239
## P13,10,39,0.735493254871705
## P13,10,40,1.41094085718214
## P13,10,41,1.59683883445821
## P13,10,42,0.442710321416321
## P13,10,43,1.28651777867021
## P13,10,44,1.61806512687984
## P13,10,45,1.92491892801115
## P13,10,46,0.221908295431678
## P13,10,47,1.39250008265177
## P13,10,48,1.55754136357989
## P13,10,49,1.53784582413823
## P13,10,50,1.37847327616117
## P14,1,1,1.49225143285898
## P14,1,2,1.49073213338852
## P14,1,3,1.48918883617108
## P14,1,4,1.50101375579834
## P14,1,5,1.49193759191604
## Warning: There are no valid values for INTERVALS=6 in LISTP14[[1]]
## Warning: There are no valid values for INTERVALS=7 in LISTP14[[1]]
## P14,1,8,1.48588824272156
## P14,1,9,1.49835481246312
## P14,1,10,1.48515550295512
## Warning: There are no valid values for INTERVALS=11 in LISTP14[[1]]
## P14,1,12,1.49950742721558
## P14,1,13,1.49116961161296
## P14,1,14,1.49133511323195
## P14,1,15,1.49192373214229
## P14,1,16,1.49559478759766
## P14,1,17,1.48126316070557
## P14,1,18,1.49500317043728
## P14,1,19,1.49041956663132
## P14,1,20,1.54033362865448
## P14,1,21,1.48011312484741
## P14,1,22,1.48426566979824
## P14,1,23,1.48888527154922
## P14,1,24,1.48858063907947
## P14,1,25,1.49033854458783
## P14,1,26,1.48495135408767
## P14,1,27,1.50357003211975
## Warning: There are no valid values for INTERVALS=28 in LISTP14[[1]]
## P14,1,29,1.48928068302296
## P14,1,30,1.49206160210274
## P14,1,31,1.50183161293588
## Warning: There are no valid values for INTERVALS=32 in LISTP14[[1]]
## P14,1,33,1.50392007827759
## P14,1,34,1.48515603349016
## Warning: There are no valid values for INTERVALS=35 in LISTP14[[1]]
## P14,1,36,1.49589484532674
## Warning: There are no valid values for INTERVALS=37 in LISTP14[[1]]
## P14,1,38,1.48929452896118
## P14,1,39,1.49272918701172
## P14,1,40,1.45583522319794
## P14,1,41,1.53772106170654
## Warning: There are no valid values for INTERVALS=42 in LISTP14[[1]]
## P14,1,43,1.48970091342926
## P14,1,44,1.49563322997675
## P14,1,45,1.49172372167761
## P14,1,46,1.48286924362183
## P14,1,47,1.50332000732422
## P14,1,48,1.49136859720403
## Warning: There are no valid values for INTERVALS=49 in LISTP14[[1]]
## P14,1,50,1.48576051538641
## P14,2,1,1.49196265637875
## P14,2,2,1.49257317456332
## P14,2,3,1.49425792694092
## P14,2,4,1.48152080742089
## P14,2,5,1.47579431533813
## P14,2,6,1.50349504947662
## P14,2,7,1.47740681171417
## P14,2,8,1.49974233225772
## P14,2,9,1.51312875747681
## P14,2,10,1.48516988754272
## Warning: There are no valid values for INTERVALS=11 in LISTP14[[2]]
## Warning: There are no valid values for INTERVALS=12 in LISTP14[[2]]
## P14,2,13,1.49111964702606
## P14,2,14,1.47474654515584
## P14,2,15,1.48579454421997
## P14,2,16,1.49086110293865
## P14,2,17,1.51350386937459
## P14,2,18,1.486732006073
## P14,2,19,1.49791991370065
## P14,2,20,1.48933254588734
## P14,2,21,1.44415058408465
## P14,2,22,1.49221283814003
## P14,2,23,1.48139433860779
## P14,2,24,1.48813336895358
## P14,2,25,1.49158225059509
## P14,2,26,1.49363332986832
## P14,2,27,1.49001916573972
## Warning: There are no valid values for INTERVALS=28 in LISTP14[[2]]
## P14,2,29,1.49080063047863
## P14,2,30,1.48950617129986
## P14,2,31,1.46946585178375
## P14,2,32,1.50133673350016
## P14,2,33,1.49047199515409
## P14,2,34,1.48725293080012
## P14,2,35,1.49229120526995
## P14,2,36,1.49092795054118
## P14,2,37,1.49257453282674
## P14,2,38,1.48491978645325
## Warning: There are no valid values for INTERVALS=39 in LISTP14[[2]]
## P14,2,40,1.48879464467367
## P14,2,41,1.48482784695095
## P14,2,42,1.57457505332099
## P14,2,43,1.49190528576191
## P14,2,44,1.48729467391968
## P14,2,45,1.4802496773856
## P14,2,46,1.4902336888197
## P14,2,47,1.47205912590027
## P14,2,48,1.48755331926568
## P14,2,49,1.49145543007624
## P14,2,50,1.47264053735388
## P14,3,1,1.4895474963718
## P14,3,2,1.48061937604632
## P14,3,3,1.4889958834244
## P14,3,4,1.47753697772359
## P14,3,5,1.50777085622152
## P14,3,6,1.46083222902738
## P14,3,7,1.50212982722691
## P14,3,8,1.48951658606529
## P14,3,9,1.49177683616171
## P14,3,10,1.48739876633599
## P14,3,11,1.4875606952175
## P14,3,12,1.48635998226347
## P14,3,13,1.52590657364238
## P14,3,14,1.50342886788504
## P14,3,15,1.5060418154064
## P14,3,16,1.52070188522339
## P14,3,17,1.48870636435116
## P14,3,18,1.49100701449669
## P14,3,19,1.48981065953031
## P14,3,20,1.49171704234499
## P14,3,21,1.49289736818911
## P14,3,22,1.49312790234884
## P14,3,23,1.48347416520119
## P14,3,24,1.4893268692878
## P14,3,25,1.49345094627804
## P14,3,26,1.49807880265372
## Warning: There are no valid values for INTERVALS=27 in LISTP14[[3]]
## P14,3,28,1.48967284422654
## P14,3,29,1.48791968822479
## P14,3,30,1.49150303999583
## P14,3,31,1.49859706560771
## P14,3,32,1.49130474090576
## P14,3,33,1.50093555450439
## P14,3,34,1.49139194488525
## P14,3,35,1.48716974258423
## P14,3,36,1.48810227100666
## P14,3,37,1.49357811609904
## P14,3,38,1.48829947985136
## P14,3,39,1.49220636098281
## P14,3,40,1.49448227882385
## P14,3,41,1.46008739915005
## P14,3,42,1.49715955970214
## P14,3,43,1.48917585611343
## P14,3,44,1.4913482552483
## P14,3,45,1.50524363097023
## P14,3,46,1.48705652781895
## P14,3,47,1.49025414441083
## P14,3,48,1.46655707610281
## P14,3,49,1.49185709953308
## P14,3,50,1.48504918476321
## P14,4,1,1.48751958847046
## P14,4,2,1.48499950408936
## P14,4,3,1.49132298287891
## P14,4,4,1.50674281009408
## P14,4,5,1.50934988260269
## P14,4,6,1.46695233186086
## P14,4,7,1.48351327180862
## P14,4,8,1.48822482839807
## P14,4,9,1.49069781303406
## P14,4,10,1.5035117149353
## P14,4,11,1.50705462694168
## P14,4,12,1.49076583752265
## P14,4,13,1.49103480891178
## P14,4,14,1.49087409715395
## P14,4,15,1.49081000110559
## P14,4,16,1.46289699077606
## P14,4,17,1.49800087423886
## P14,4,18,1.4918808778127
## P14,4,19,1.49182915687561
## P14,4,20,1.48931467056274
## P14,4,21,1.49670722887113
## P14,4,22,1.49349995281385
## P14,4,23,1.48747787197817
## P14,4,24,1.45597063411366
## P14,4,25,1.49912825497714
## P14,4,26,1.48530925021452
## P14,4,27,1.48693827390671
## P14,4,28,1.48937459879143
## P14,4,29,1.53510443369548
## P14,4,30,1.48112512540214
## P14,4,31,1.49083369970322
## P14,4,32,1.52597183892221
## P14,4,33,1.47102288480075
## P14,4,34,1.49446332093441
## P14,4,35,1.49501144091288
## P14,4,36,1.50313203231148
## P14,4,37,1.49672884311316
## P14,4,38,1.49625324591612
## P14,4,39,1.48457693170618
## P14,4,40,1.48249648167537
## P14,4,41,1.48969100161297
## P14,4,42,1.49826366106669
## P14,4,43,1.48109650044214
## P14,4,44,1.48816580483408
## P14,4,45,1.48916823140691
## P14,4,46,1.49297964740807
## P14,4,47,1.51160411273732
## P14,4,48,1.48206985741854
## P14,4,49,1.5080630847386
## Warning: There are no valid values for INTERVALS=50 in LISTP14[[4]]
## P14,5,1,1.49096771386953
## P14,5,2,1.48995848359733
## P14,5,3,1.49131414538524
## P14,5,4,1.48822726958837
## P14,5,5,1.49318728595972
## P14,5,6,1.51343723361412
## P14,5,7,1.4900634209315
## P14,5,8,1.49173536947218
## P14,5,9,1.50060749053955
## P14,5,10,1.50086468916673
## P14,5,11,1.48327790989595
## P14,5,12,1.47804428401746
## P14,5,13,1.4903966385184
## P14,5,14,1.49132001077807
## P14,5,15,1.48730305078867
## P14,5,16,1.4921583479101
## P14,5,17,1.48418213957447
## P14,5,18,1.48152657917568
## P14,5,19,1.48084845414033
## P14,5,20,1.48963591859147
## P14,5,21,1.4949648475647
## P14,5,22,1.48474505890247
## P14,5,23,1.48746512152932
## P14,5,24,1.48602919211754
## P14,5,25,1.54535889625549
## P14,5,26,1.48348788988023
## P14,5,27,1.48969420142796
## P14,5,28,1.48584049626401
## P14,5,29,1.48934155702591
## P14,5,30,1.48450276345918
## P14,5,31,1.49664203325907
## P14,5,32,1.48369087491717
## P14,5,33,1.50688683191935
## P14,5,34,1.48107422953067
## P14,5,35,1.49385370398467
## P14,5,36,1.46570467267718
## P14,5,37,1.47304413053725
## P14,5,38,1.50420580213032
## P14,5,39,1.4894310055357
## P14,5,40,1.4877678496497
## P14,5,41,1.49093529582024
## P14,5,42,1.49102007259022
## P14,5,43,1.48799520417264
## P14,5,44,1.49478855133057
## P14,5,45,1.49957966804504
## P14,5,46,1.48841625935323
## P14,5,47,1.49350500106812
## P14,5,48,1.4769661873579
## P14,5,49,1.49570520868841
## P14,5,50,1.49417660334339
## P14,6,1,1.49965044657389
## P14,6,2,1.49766983212651
## P14,6,3,1.49590344507186
## P14,6,4,1.49547588581942
## P14,6,5,1.48515476899989
## P14,6,6,1.49432190355048
## P14,6,7,1.49144471319098
## P14,6,8,1.48851429332386
## P14,6,9,1.49289178220849
## P14,6,10,1.50449541287544
## P14,6,11,1.48129295193872
## P14,6,12,1.49564135702033
## P14,6,13,1.48852048136971
## P14,6,14,1.48070846498013
## P14,6,15,1.47954152930867
## P14,6,16,1.48553168467986
## P14,6,17,1.49596268790109
## P14,6,18,1.48491961956024
## P14,6,19,1.47115927867675
## P14,6,20,1.48752380552746
## P14,6,21,1.47707143037216
## P14,6,22,1.50386653627668
## P14,6,23,1.51032656973059
## P14,6,24,1.48942319325038
## P14,6,25,1.55893329570168
## P14,6,26,1.48792823429765
## P14,6,27,1.49612548274379
## P14,6,28,1.48578880750216
## P14,6,29,1.49116639087075
## P14,6,30,1.49100622764001
## P14,6,31,1.48883882164955
## P14,6,32,1.38612007177793
## P14,6,33,1.48955021964179
## P14,6,34,1.4943804414305
## P14,6,35,1.48964332279406
## P14,6,36,1.51138024452405
## P14,6,37,1.49932846580584
## P14,6,38,1.48695046178411
## P14,6,39,1.49515640735626
## P14,6,40,1.49077939500614
## P14,6,41,1.50066141424508
## P14,6,42,1.49061567133123
## P14,6,43,1.4921166824572
## P14,6,44,1.49077293147211
## P14,6,45,1.4839835533729
## P14,6,46,1.50453726947308
## P14,6,47,1.47447830546986
## P14,6,48,1.49242581390753
## P14,6,49,1.48984684872983
## P14,6,50,1.49438556185309
## P14,7,1,1.48910895756313
## P14,7,2,1.491212839172
## P14,7,3,1.4977502822876
## P14,7,4,1.49055778148562
## P14,7,5,1.48316942728483
## P14,7,6,1.49020538524706
## P14,7,7,1.5008181980678
## P14,7,8,1.48631564686807
## P14,7,9,1.49023788625544
## P14,7,10,1.48566246932408
## P14,7,11,1.48271632194519
## P14,7,12,1.49522482781183
## P14,7,13,1.48781785299612
## P14,7,14,1.49076344285692
## P14,7,15,1.475909486413
## P14,7,16,1.47863522442904
## P14,7,17,1.50171088305387
## P14,7,18,1.48867217861876
## P14,7,19,1.4904593437437
## P14,7,20,1.49593908970173
## P14,7,21,1.48202657699585
## P14,7,22,1.49099780453576
## P14,7,23,1.49250774030332
## P14,7,24,1.49277420186285
## P14,7,25,1.49460339546204
## P14,7,26,1.53410283001986
## P14,7,27,1.43352632522583
## P14,7,28,1.48732348588797
## P14,7,29,1.4831236041322
## P14,7,30,1.49293816790861
## P14,7,31,1.50520504352658
## P14,7,32,1.49064810522671
## P14,7,33,1.49434129170009
## P14,7,34,1.49092970848084
## P14,7,35,1.50792715284559
## P14,7,36,1.48798211663961
## Warning: There are no valid values for INTERVALS=37 in LISTP14[[7]]
## P14,7,38,1.49126050243639
## P14,7,39,1.49340013095311
## P14,7,40,1.48703142634609
## P14,7,41,1.49158864407926
## P14,7,42,1.48057109969003
## P14,7,43,1.49005358559745
## P14,7,44,1.49097798665365
## P14,7,45,1.47879421710968
## P14,7,46,1.50679765963087
## P14,7,47,1.46310780769171
## P14,7,48,1.48827204938795
## P14,7,49,1.48804925989222
## P14,7,50,1.49351725101471
## P14,8,1,1.50400336583455
## P14,8,2,1.48616061891828
## P14,8,3,1.48938729686122
## P14,8,4,1.47499507665634
## P14,8,5,1.43317755674705
## P14,8,6,1.38916683197021
## P14,8,7,1.50084072787587
## P14,8,8,1.48774647712708
## P14,8,9,1.48958633059547
## P14,8,10,1.49726991653442
## P14,8,11,1.49406401927655
## P14,8,12,1.48851824478364
## P14,8,13,1.49015946290931
## P14,8,14,1.4929336309433
## P14,8,15,1.37397261588804
## P14,8,16,1.41294177718784
## P14,8,17,1.52579954220698
## P14,8,18,1.48266481470179
## P14,8,19,1.49045792747946
## P14,8,20,1.49018211364746
## P14,8,21,1.49609556794167
## P14,8,22,1.48963629404704
## P14,8,23,1.49382917284966
## P14,8,24,1.49067669094733
## P14,8,25,1.46347842897688
## P14,8,26,1.49456310272217
## P14,8,27,1.49095094745809
## P14,8,28,1.48527002334595
## P14,8,29,1.49395544674932
## P14,8,30,1.49100471205182
## P14,8,31,1.48950117567311
## P14,8,32,1.48738607546178
## P14,8,33,1.48817286993328
## P14,8,34,1.49248215556145
## P14,8,35,1.4832336838181
## P14,8,36,1.47201150396596
## P14,8,37,1.48641713765951
## P14,8,38,1.49835119247437
## P14,8,39,1.49539418098254
## P14,8,40,1.48270251470454
## P14,8,41,1.49206030368805
## P14,8,42,1.48643204371134
## P14,8,43,1.49195382811806
## P14,8,44,1.48905243724585
## P14,8,45,1.50925935506821
## P14,8,46,1.48839551524112
## P14,8,47,1.49475739002228
## P14,8,48,1.50158661487056
## P14,8,49,1.49124170561968
## P14,8,50,1.48899389965699
## P14,9,1,1.49002052122547
## P14,9,2,1.49277636584114
## P14,9,3,1.48728408311543
## P14,9,4,1.4930153687795
## P14,9,5,1.51860802261918
## P14,9,6,1.50405525516819
## P14,9,7,1.48047092225817
## P14,9,8,1.48776646063361
## P14,9,9,1.48862499509539
## P14,9,10,1.48783197108003
## P14,9,11,1.49453436003791
## P14,9,12,1.4908572435379
## P14,9,13,1.48857105695284
## P14,9,14,1.48918531338374
## P14,9,15,1.47604449590047
## P14,9,16,1.49356302400915
## P14,9,17,1.48369322882758
## Warning: There are no valid values for INTERVALS=18 in LISTP14[[9]]
## P14,9,19,1.48803774515788
## P14,9,20,1.51628247622786
## P14,9,21,1.47863691824454
## P14,9,22,1.49396380671748
## P14,9,23,1.49297654989994
## P14,9,24,1.49196463364821
## P14,9,25,1.49879497951931
## P14,9,26,1.49110698699951
## P14,9,27,1.48882316861834
## P14,9,28,1.46926271915436
## P14,9,29,1.52176867304622
## P14,9,30,1.49931331241832
## P14,9,31,1.46844401359558
## P14,9,32,1.48560392661173
## P14,9,33,1.49935143993747
## P14,9,34,1.49174109716264
## P14,9,35,1.48065047485884
## P14,9,36,1.49174113176307
## P14,9,37,1.49903065817697
## P14,9,38,1.48663957595825
## P14,9,39,1.4923588842959
## P14,9,40,1.49287487910344
## P14,9,41,1.50927014350891
## P14,9,42,1.49620176883454
## P14,9,43,1.493664712322
## P14,9,44,1.48960721492767
## P14,9,45,1.49243553857955
## P14,9,46,1.5233635357448
## P14,9,47,1.48552563696197
## P14,9,48,1.47382197909885
## P14,9,49,1.5071702003479
## P14,9,50,1.48949900127593
## P14,10,1,1.49405834985816
## P14,10,2,1.48845160284708
## P14,10,3,1.49123969078064
## P14,10,4,1.49189316142689
## P14,10,5,1.4793159870001
## P14,10,6,1.49092685835702
## P14,10,7,1.50231967550335
## P14,10,8,1.48761594295502
## P14,10,9,1.4939936652328
## P14,10,10,1.4903808544422
## P14,10,11,1.48677914692805
## P14,10,12,1.48597214514749
## P14,10,13,1.4891695894044
## P14,10,14,1.49846426133187
## P14,10,15,1.48471950954861
## P14,10,16,1.47603822889782
## P14,10,17,1.49257252834461
## P14,10,18,1.49253984526092
## P14,10,19,1.48981091250544
## P14,10,20,1.4916591159368
## P14,10,21,1.49086836056832
## P14,10,22,1.48744551888828
## P14,10,23,1.49488008723539
## P14,10,24,1.49214010489614
## P14,10,25,1.49045705795288
## P14,10,26,1.49052870527227
## P14,10,27,1.4933545174806
## P14,10,28,1.48555815219879
## P14,10,29,1.49077094355716
## P14,10,30,1.49144059816996
## P14,10,31,1.49360103011131
## P14,10,32,1.49097177187602
## P14,10,33,1.49063548019954
## P14,10,34,1.489688455242
## P14,10,35,1.49924040707675
## P14,10,36,1.48066383997599
## P14,10,37,1.49340986827063
## P14,10,38,1.49891835603959
## P14,10,39,1.49213382601738
## P14,10,40,1.49167273684246
## P14,10,41,1.49594137586396
## P14,10,42,1.48748210072517
## P14,10,43,1.49387539586713
## P14,10,44,1.47397234084758
## P14,10,45,1.49823940065172
## P14,10,46,1.49543633550968
## P14,10,47,1.4749427601911
## P14,10,48,1.49562592119784
## P14,10,49,1.48767326859867
## P14,10,50,1.49359212250545
## P15,1,1,1.49181697864344
## P15,1,2,1.49052785023922
## P15,1,3,1.49014149912146
## P15,1,4,1.49388206416163
## P15,1,5,1.49294119335356
## P15,1,6,1.49373307409166
## P15,1,7,1.49211145343637
## P15,1,8,1.49318790435791
## P15,1,9,1.49186290394176
## P15,1,10,1.49290554912378
## P15,1,11,1.4917559522978
## P15,1,12,1.495254443242
## P15,1,13,1.49346877433158
## P15,1,14,1.49115741252899
## P15,1,15,1.49423368104542
## P15,1,16,1.4890738788404
## P15,1,17,1.49348229746665
## P15,1,18,1.49307791067629
## P15,1,19,1.49204559190899
## P15,1,20,1.49361127767807
## P15,1,21,1.49143143494924
## P15,1,22,1.4929548355571
## P15,1,23,1.48549797368604
## P15,1,24,1.49344324072202
## P15,1,25,1.49208992349226
## P15,1,26,1.49401535356746
## P15,1,27,1.49129938367587
## P15,1,28,1.49132489500375
## P15,1,29,1.49294337700671
## P15,1,30,1.49010842323303
## P15,1,31,1.4915603991155
## P15,1,32,1.49224435509025
## P15,1,33,1.49353457956898
## P15,1,34,1.48823511032831
## P15,1,35,1.49377902098528
## P15,1,36,1.49088735239846
## P15,1,37,1.49200222969055
## P15,1,38,1.49313195361647
## P15,1,39,1.4899236822641
## P15,1,40,1.49442402254634
## P15,1,41,1.492888544287
## P15,1,42,1.49424587332684
## P15,1,43,1.49108495250825
## P15,1,44,1.4898637512274
## P15,1,45,1.49153404540204
## P15,1,46,1.49327764324113
## P15,1,47,1.48999976500487
## P15,1,48,1.48888108070861
## P15,1,49,1.49108772590512
## P15,1,50,1.49087007121145
## P15,2,1,1.49256181283431
## P15,2,2,1.48952486640529
## P15,2,3,1.48866855700811
## P15,2,4,1.49231435444729
## P15,2,5,1.49114152029449
## P15,2,6,1.48910942944613
## P15,2,7,1.48745598376376
## P15,2,8,1.49442473496541
## P15,2,9,1.49552025965282
## P15,2,10,1.4925180215102
## P15,2,11,1.49338166610054
## P15,2,12,1.49177910685539
## P15,2,13,1.49086968898773
## P15,2,14,1.49148775401868
## P15,2,15,1.49176195121947
## P15,2,16,1.49408248685441
## P15,2,17,1.50430522738276
## P15,2,18,1.47217838852494
## P15,2,19,1.48718403547238
## P15,2,20,1.49322944337671
## P15,2,21,1.50469128560212
## P15,2,22,1.48691954151277
## P15,2,23,1.49225534333123
## P15,2,24,1.49379285899076
## P15,2,25,1.49152316718266
## P15,2,26,1.49537731738801
## P15,2,27,1.4966699055263
## P15,2,28,1.49365819825066
## P15,2,29,1.49506709405354
## P15,2,30,1.4917439520359
## P15,2,31,1.49014767429285
## P15,2,32,1.48889990856773
## P15,2,33,1.49015497693829
## P15,2,34,1.49346436773028
## P15,2,35,1.50306584040324
## P15,2,36,1.49209498811042
## P15,2,37,1.49671789550781
## P15,2,38,1.49427966757135
## P15,2,39,1.494298239549
## P15,2,40,1.49327586731821
## P15,2,41,1.49482488632202
## P15,2,42,1.48906626383464
## P15,2,43,1.48972093180606
## P15,2,44,1.49770267804464
## P15,2,45,1.48978290018046
## P15,2,46,1.49680380310331
## P15,2,47,1.49462910585625
## P15,2,48,1.4937218758795
## P15,2,49,1.49280495059733
## P15,2,50,1.49436869934528
## P15,3,1,1.49593234062195
## P15,3,2,1.49251405109059
## P15,3,3,1.49274567195347
## P15,3,4,1.50056266303014
## P15,3,5,1.4878623227039
## P15,3,6,1.49074390033881
## P15,3,7,1.49214892727988
## P15,3,8,1.49120094684454
## P15,3,9,1.49067119904506
## P15,3,10,1.49264735171669
## P15,3,11,1.49135876924564
## P15,3,12,1.49167592525482
## P15,3,13,1.48849745516507
## P15,3,14,1.49020792986896
## P15,3,15,1.4947243531545
## P15,3,16,1.49692946213942
## P15,3,17,1.49308696969763
## P15,3,18,1.49314433940943
## P15,3,19,1.49129467640283
## P15,3,20,1.49152557055155
## P15,3,21,1.48813257394014
## P15,3,22,1.49090330941337
## P15,3,23,1.49602901524511
## P15,3,24,1.49383917607759
## P15,3,25,1.49007690567331
## P15,3,26,1.49272097812759
## P15,3,27,1.49266529083252
## P15,3,28,1.4891185760498
## P15,3,29,1.49220538448978
## P15,3,30,1.48948410474337
## P15,3,31,1.492200179722
## P15,3,32,1.49247368357398
## P15,3,33,1.49192989849653
## P15,3,34,1.4916910824475
## P15,3,35,1.49222726737503
## P15,3,36,1.48969649822912
## P15,3,37,1.49150383138211
## P15,3,38,1.49414382340773
## P15,3,39,1.49100529629251
## P15,3,40,1.49311916700756
## P15,3,41,1.49115411192179
## P15,3,42,1.49298142115275
## P15,3,43,1.49114313800778
## P15,3,44,1.49111635843913
## P15,3,45,1.49337845333552
## P15,3,46,1.49105866241455
## P15,3,47,1.49141966445105
## P15,3,48,1.4932144320741
## P15,3,49,1.49136227148551
## P15,3,50,1.49190642602982
## P15,4,1,1.49212488145319
## P15,4,2,1.49181291406805
## P15,4,3,1.49093699455261
## P15,4,4,1.52248561537111
## P15,4,5,1.49003303882688
## P15,4,6,1.49100486524812
## P15,4,7,1.49338814855992
## P15,4,8,1.49401038885117
## P15,4,9,1.49377570981565
## P15,4,10,1.49304475784302
## P15,4,11,1.49057289861864
## P15,4,12,1.49198683296762
## P15,4,13,1.48995034044439
## P15,4,14,1.49032382965088
## P15,4,15,1.49015499002793
## P15,4,16,1.49335528165102
## P15,4,17,1.48967745527625
## P15,4,18,1.49203722953796
## P15,4,19,1.49131189593832
## P15,4,20,1.49171100139618
## P15,4,21,1.49221659165162
## P15,4,22,1.49281282801377
## P15,4,23,1.48877215653323
## P15,4,24,1.4927691883511
## P15,4,25,1.49349955294995
## P15,4,26,1.49412806828817
## P15,4,27,1.49488762446812
## P15,4,28,1.49151804712084
## P15,4,29,1.49289968490601
## P15,4,30,1.48701331615448
## P15,4,31,1.4913227898734
## P15,4,32,1.49338751454507
## P15,4,33,1.49052176475525
## P15,4,34,1.49229957543167
## P15,4,35,1.49064134201914
## P15,4,36,1.49017262458801
## P15,4,37,1.49084899736487
## P15,4,38,1.49138713401297
## P15,4,39,1.4919278652637
## P15,4,40,1.48904288654596
## P15,4,41,1.49229875812686
## P15,4,42,1.49286075656334
## P15,4,43,1.49074216842651
## P15,4,44,1.49053350135462
## P15,4,45,1.48847617421831
## P15,4,46,1.49208520163952
## P15,4,47,1.49025979152946
## P15,4,48,1.49239065480787
## P15,4,49,1.49183173532839
## P15,4,50,1.49123937893758
## P15,5,1,1.491017162253
## P15,5,2,1.49290549213236
## P15,5,3,1.48872156898574
## P15,5,4,1.49196442332836
## P15,5,5,1.49081425168621
## P15,5,6,1.49350681049483
## P15,5,7,1.49113193547951
## P15,5,8,1.49126673305736
## P15,5,9,1.48978793621063
## P15,5,10,1.49118314301672
## P15,5,11,1.4913890226832
## P15,5,12,1.49004467072025
## P15,5,13,1.49271362706235
## P15,5,14,1.49049978378492
## P15,5,15,1.49259766410379
## P15,5,16,1.49145891619664
## P15,5,17,1.49126633730802
## P15,5,18,1.49210417386398
## P15,5,19,1.4907507980079
## P15,5,20,1.4922470172853
## P15,5,21,1.49138893064905
## P15,5,22,1.49027480776348
## P15,5,23,1.48684346157572
## P15,5,24,1.49124232724182
## P15,5,25,1.49272715078818
## P15,5,26,1.49137714568605
## P15,5,27,1.49058348557045
## P15,5,28,1.49087422234671
## P15,5,29,1.49383889927584
## P15,5,30,1.49104991210134
## P15,5,31,1.49297014035677
## P15,5,32,1.49109768145012
## P15,5,33,1.49301719665527
## P15,5,34,1.4891130159486
## P15,5,35,1.49138982260405
## P15,5,36,1.49212447802226
## P15,5,37,1.49312476476034
## P15,5,38,1.4915999479072
## P15,5,39,1.48850212097168
## P15,5,40,1.49415552616119
## P15,5,41,1.49193280083793
## P15,5,42,1.4903433291943
## P15,5,43,1.49147851326886
## P15,5,44,1.49021772025288
## P15,5,45,1.48958739751502
## P15,5,46,1.49200345474539
## P15,5,47,1.49119034680453
## P15,5,48,1.49200650056203
## P15,5,49,1.49268063287886
## P15,5,50,1.49188719008492
## P15,6,1,1.49275933571582
## P15,6,2,1.49227928232264
## P15,6,3,1.49137910576754
## P15,6,4,1.49517520268758
## P15,6,5,1.49296914145004
## P15,6,6,1.49201815898024
## P15,6,7,1.49481874831179
## P15,6,8,1.49372977256775
## P15,6,9,1.49423349604887
## P15,6,10,1.49150803296462
## P15,6,11,1.49725209620961
## P15,6,12,1.49175539470854
## P15,6,13,1.49350338639884
## P15,6,14,1.49156823705454
## P15,6,15,1.49399818940596
## P15,6,16,1.49309069597268
## P15,6,17,1.49319940743987
## P15,6,18,1.49218417719791
## P15,6,19,1.48929960892932
## P15,6,20,1.49240988806674
## P15,6,21,1.49265702296112
## P15,6,22,1.49263225396474
## P15,6,23,1.50046873092651
## P15,6,24,1.49255446328057
## P15,6,25,1.49056351409768
## P15,6,26,1.49087545688336
## P15,6,27,1.49515440039439
## P15,6,28,1.49258578845433
## P15,6,29,1.49110025829739
## P15,6,30,1.48865208774805
## P15,6,31,1.49451182285945
## P15,6,32,1.49055731447437
## P15,6,33,1.49425728321075
## P15,6,34,1.4910852329151
## P15,6,35,1.49319717360706
## P15,6,36,1.49097884667886
## P15,6,37,1.49140536198851
## P15,6,38,1.49325251243484
## P15,6,39,1.49155462330038
## P15,6,40,1.49283639589945
## P15,6,41,1.49390256815943
## P15,6,42,1.49021633347469
## P15,6,43,1.49437491710369
## P15,6,44,1.49090799689293
## P15,6,45,1.49354032107762
## P15,6,46,1.49543473969645
## P15,6,47,1.48983172531966
## P15,6,48,1.49281886585972
## P15,6,49,1.49227824631859
## P15,6,50,1.49122136132011
## P15,7,1,1.49266662126706
## P15,7,2,1.49119733847105
## P15,7,3,1.49162102364875
## P15,7,4,1.49099842118628
## P15,7,5,1.4913392654837
## P15,7,6,1.49128008396068
## P15,7,7,1.49088633325365
## P15,7,8,1.48968723416328
## P15,7,9,1.49193633763136
## P15,7,10,1.49057654945218
## P15,7,11,1.49258167635311
## P15,7,12,1.49197371212053
## P15,7,13,1.49188842773437
## P15,7,14,1.49227618582455
## P15,7,15,1.4904593374671
## P15,7,16,1.49399740045721
## P15,7,17,1.49204471999524
## P15,7,18,1.49084650597921
## P15,7,19,1.49244836398533
## P15,7,20,1.49194660186768
## P15,7,21,1.49009949700874
## P15,7,22,1.49333238601685
## P15,7,23,1.49109179856347
## P15,7,24,1.49224185943604
## P15,7,25,1.49369529702447
## P15,7,26,1.4911567507119
## P15,7,27,1.49155608090487
## P15,7,28,1.4931370345029
## P15,7,29,1.49026826711801
## P15,7,30,1.49123790047385
## P15,7,31,1.4937346806893
## P15,7,32,1.49252252578735
## P15,7,33,1.49127326011658
## P15,7,34,1.49250896204086
## P15,7,35,1.49191969745564
## P15,7,36,1.48919599934628
## P15,7,37,1.477388048172
## P15,7,38,1.49344697205917
## P15,7,39,1.49063952215787
## P15,7,40,1.49198115458254
## P15,7,41,1.49070324826596
## P15,7,42,1.49289344486437
## P15,7,43,1.49334537660753
## P15,7,44,1.4908499274143
## P15,7,45,1.4907915353775
## P15,7,46,1.49163051680023
## P15,7,47,1.49158805847168
## P15,7,48,1.49131870269775
## P15,7,49,1.49085112540953
## P15,7,50,1.4926913197224
## P15,8,1,1.49018384109844
## P15,8,2,1.49043565608085
## P15,8,3,1.49036640591092
## P15,8,4,1.49184829166957
## P15,8,5,1.49183589149924
## P15,8,6,1.49124690364389
## P15,8,7,1.4913784302387
## P15,8,8,1.49268156773335
## P15,8,9,1.49184908690276
## P15,8,10,1.49076305586716
## P15,8,11,1.48999933574511
## P15,8,12,1.49231327340958
## P15,8,13,1.49141590522997
## P15,8,14,1.49233736775138
## P15,8,15,1.49102224447788
## P15,8,16,1.49366298881737
## P15,8,17,1.49105806861605
## P15,8,18,1.49224102497101
## P15,8,19,1.49189267287383
## P15,8,20,1.49031477412958
## P15,8,21,1.49021529506993
## P15,8,22,1.4924002594418
## P15,8,23,1.49046906129813
## P15,8,24,1.49106841473966
## P15,8,25,1.49804512659709
## P15,8,26,1.49024354327809
## P15,8,27,1.49288650705845
## P15,8,28,1.48810708522797
## P15,8,29,1.49189703805106
## P15,8,30,1.49272327763694
## P15,8,31,1.49085117155506
## P15,8,32,1.49111762311723
## P15,8,33,1.4895237993311
## P15,8,34,1.49182599782944
## P15,8,35,1.49046712086119
## P15,8,36,1.48940401673317
## P15,8,37,1.49051226509942
## P15,8,38,1.49142429563734
## P15,8,39,1.49097888093246
## P15,8,40,1.49249204836394
## P15,8,41,1.49167581883872
## P15,8,42,1.49244722269349
## P15,8,43,1.4932096862793
## P15,8,44,1.49003018503604
## P15,8,45,1.49048695197472
## P15,8,46,1.48981966442532
## P15,8,47,1.49191755261914
## P15,8,48,1.49154206116994
## P15,8,49,1.49331339369429
## P15,8,50,1.49221025930869
## P15,9,1,1.49080817149236
## P15,9,2,1.49067614295266
## P15,9,3,1.49316683480906
## P15,9,4,1.49014466285706
## P15,9,5,1.49071306652493
## P15,9,6,1.49159390027406
## P15,9,7,1.49210382276966
## P15,9,8,1.49255254119635
## P15,9,9,1.4896825131248
## P15,9,10,1.48884816746135
## P15,9,11,1.49087014691583
## P15,9,12,1.49153951803843
## P15,9,13,1.48615708351135
## P15,9,14,1.49052853738108
## P15,9,15,1.4898372102291
## P15,9,16,1.49204262892405
## P15,9,17,1.49116971757677
## P15,9,18,1.49203475952148
## P15,9,19,1.49199592776415
## P15,9,20,1.49182977174458
## P15,9,21,1.49089098621059
## P15,9,22,1.49180479203501
## P15,9,23,1.49172896454015
## P15,9,24,1.48897317099193
## P15,9,25,1.4887737929821
## P15,9,26,1.49112055131367
## P15,9,27,1.48890038637015
## P15,9,28,1.49281780343307
## P15,9,29,1.48468742565233
## P15,9,30,1.49014985207284
## P15,9,31,1.49164532452095
## P15,9,32,1.49171732342432
## P15,9,33,1.50220413099636
## P15,9,34,1.49330790001049
## P15,9,35,1.49343489878105
## P15,9,36,1.48979465484619
## P15,9,37,1.49444829333912
## P15,9,38,1.48906447247761
## P15,9,39,1.49081526589148
## P15,9,40,1.49306311326868
## P15,9,41,1.49059552661443
## P15,9,42,1.49188126050509
## P15,9,43,1.49007672232551
## P15,9,44,1.49178437105159
## P15,9,45,1.48772994403181
## P15,9,46,1.48553786379226
## P15,9,47,1.49307207018137
## P15,9,48,1.49264661348783
## P15,9,49,1.49152298595594
## P15,9,50,1.49272806909349
## P15,10,1,1.49072623252869
## P15,10,2,1.49122700591882
## P15,10,3,1.49397253990173
## P15,10,4,1.49034469922384
## P15,10,5,1.48990704138068
## P15,10,6,1.49590276949333
## P15,10,7,1.49070483446121
## P15,10,8,1.4918331244053
## P15,10,9,1.49400362154333
## P15,10,10,1.49051968630622
## P15,10,11,1.49014590058146
## P15,10,12,1.49437542884581
## P15,10,13,1.49231472015381
## P15,10,14,1.4916872141654
## P15,10,15,1.49188622406551
## P15,10,16,1.49225750423613
## P15,10,17,1.4911868751049
## P15,10,18,1.49075597808475
## P15,10,19,1.49070437749227
## P15,10,20,1.49164260400308
## P15,10,21,1.49263780675036
## P15,10,22,1.48963237227055
## P15,10,23,1.49543938040733
## P15,10,24,1.49158265319052
## P15,10,25,1.49182713473285
## P15,10,26,1.49055606668646
## P15,10,27,1.4921103477478
## P15,10,28,1.49065182160358
## P15,10,29,1.4921607375145
## P15,10,30,1.49114794316499
## P15,10,31,1.4924387770184
## P15,10,32,1.49104470339688
## P15,10,33,1.49350303411484
## P15,10,34,1.49287401757589
## P15,10,35,1.49345551899501
## P15,10,36,1.49166553815206
## P15,10,37,1.49192863702774
## P15,10,38,1.49106590702849
## P15,10,39,1.48830530984061
## P15,10,40,1.49165245582317
## P15,10,41,1.49246734286112
## P15,10,42,1.48963160100191
## P15,10,43,1.49053769111633
## P15,10,44,1.49261255264282
## P15,10,45,1.49033827005431
## P15,10,46,1.49152574394688
## P15,10,47,1.49207771486706
## P15,10,48,1.49362813101874
## P15,10,49,1.4909196886523
## P15,10,50,1.49248452834141
## P16,1,1,1.49011782166871
## P16,1,2,1.49115978730352
## P16,1,3,1.48944613733902
## P16,1,4,1.4899357698297
## P16,1,5,1.49141200383504
## P16,1,6,1.49089780569077
## P16,1,7,1.4909921239634
## P16,1,8,1.49028068629618
## P16,1,9,1.49128283450478
## P16,1,10,1.49037177765623
## P16,1,11,1.49081906748981
## P16,1,12,1.49090757062358
## P16,1,13,1.49193868337501
## P16,1,14,1.49078830352611
## P16,1,15,1.49105704385181
## P16,1,16,1.49097633888708
## P16,1,17,1.49048147512519
## P16,1,18,1.49026060682355
## P16,1,19,1.49176309529473
## P16,1,20,1.49098317332999
## P16,1,21,1.49161457759078
## P16,1,22,1.49030657041641
## P16,1,23,1.4901702984627
## P16,1,24,1.49065978378899
## P16,1,25,1.48996484786906
## P16,1,26,1.49126648201662
## P16,1,27,1.49111391595528
## P16,1,28,1.49164033412933
## P16,1,29,1.49018382086542
## P16,1,30,1.49139796132627
## P16,1,31,1.49042517731829
## P16,1,32,1.4906782863337
## P16,1,33,1.49101256668021
## P16,1,34,1.49103796423935
## P16,1,35,1.49170279736612
## P16,1,36,1.49242033210455
## P16,1,37,1.49003664217039
## P16,1,38,1.48948583883398
## P16,1,39,1.49099466478502
## P16,1,40,1.49094042167844
## P16,1,41,1.49089009787447
## P16,1,42,1.4912389200286
## P16,1,43,1.49006825807143
## P16,1,44,1.49048368040338
## P16,1,45,1.48976242615401
## P16,1,46,1.49080976383798
## P16,1,47,1.49079903629091
## P16,1,48,1.49105712630986
## P16,1,49,1.49060605347522
## P16,1,50,1.49093782517218
## P16,2,1,1.49080718040466
## P16,2,2,1.49121221309991
## P16,2,3,1.49012579834252
## P16,2,4,1.49121755055019
## P16,2,5,1.49159890772348
## P16,2,6,1.49366975614163
## P16,2,7,1.49058269757276
## P16,2,8,1.49113341093063
## P16,2,9,1.48918359533784
## P16,2,10,1.49068474644766
## P16,2,11,1.49169424417857
## P16,2,12,1.49050648013751
## P16,2,13,1.50031953198569
## P16,2,14,1.48491353080386
## P16,2,15,1.48971282785589
## P16,2,16,1.48576253329137
## P16,2,17,1.49121847966822
## P16,2,18,1.49316722519544
## P16,2,19,1.49042747616768
## P16,2,20,1.4879187571457
## P16,2,21,1.49093513055281
## P16,2,22,1.49058391752034
## P16,2,23,1.49131874549083
## P16,2,24,1.49196744976622
## P16,2,25,1.49058997391054
## P16,2,26,1.48997215906779
## P16,2,27,1.49037507864145
## P16,2,28,1.48809170031893
## P16,2,29,1.4915732483805
## P16,2,30,1.49048361559024
## P16,2,31,1.49152672492852
## P16,2,32,1.48828791844026
## P16,2,33,1.49007651309839
## P16,2,34,1.48927664928299
## P16,2,35,1.49128314164969
## P16,2,36,1.49092227095491
## P16,2,37,1.49039921370692
## P16,2,38,1.48951499278729
## P16,2,39,1.488591200386
## P16,2,40,1.49374937684569
## P16,2,41,1.48882613219614
## P16,2,42,1.49044112660992
## P16,2,43,1.4926449571337
## P16,2,44,1.4911084842015
## P16,2,45,1.49031710997224
## P16,2,46,1.48980378329269
## P16,2,47,1.49175974070016
## P16,2,48,1.49003875335591
## P16,2,49,1.49091607032062
## P16,2,50,1.49059200729064
## P16,3,1,1.48906199413797
## P16,3,2,1.49211600642876
## P16,3,3,1.49184567744915
## P16,3,4,1.48977253253643
## P16,3,5,1.49165853857994
## P16,3,6,1.49210642529772
## P16,3,7,1.49070593751507
## P16,3,8,1.49217266548337
## P16,3,9,1.49010400977924
## P16,3,10,1.4910350148107
## P16,3,11,1.49182575981089
## P16,3,12,1.4910837059021
## P16,3,13,1.48972418484272
## P16,3,14,1.49137828207963
## P16,3,15,1.49101544964698
## P16,3,16,1.49201682570634
## P16,3,17,1.49112369092696
## P16,3,18,1.49055625185554
## P16,3,19,1.49033663742734
## P16,3,20,1.49158723817931
## P16,3,21,1.49000844297738
## P16,3,22,1.48966169964736
## P16,3,23,1.49076365513407
## P16,3,24,1.48997217814128
## P16,3,25,1.49373331617136
## P16,3,26,1.48844305872917
## P16,3,27,1.49246801836737
## P16,3,28,1.48926070194371
## P16,3,29,1.49105323415224
## P16,3,30,1.49046399019942
## P16,3,31,1.48976967811584
## P16,3,32,1.48902252079111
## P16,3,33,1.49059470327277
## P16,3,34,1.48988525145644
## P16,3,35,1.49183153855173
## P16,3,36,1.4920148156647
## P16,3,37,1.49163703383686
## P16,3,38,1.48962136832151
## P16,3,39,1.49176852362497
## P16,3,40,1.49286083991711
## P16,3,41,1.49009487277172
## P16,3,42,1.49063679105357
## P16,3,43,1.49191718149667
## P16,3,44,1.49002266937578
## P16,3,45,1.49144958394819
## P16,3,46,1.49047342410758
## P16,3,47,1.49012710319625
## P16,3,48,1.49179263909658
## P16,3,49,1.48985077085949
## P16,3,50,1.4907084115794
## P16,4,1,1.49021779872753
## P16,4,2,1.49195840996756
## P16,4,3,1.49098084790863
## P16,4,4,1.48799705111291
## P16,4,5,1.49030022444548
## P16,4,6,1.48974851094759
## P16,4,7,1.48991079405537
## P16,4,8,1.48806311995895
## P16,4,9,1.49127775531704
## P16,4,10,1.48786172290776
## P16,4,11,1.48891068186079
## P16,4,12,1.49250133766616
## P16,4,13,1.49044528807172
## P16,4,14,1.49087610370234
## P16,4,15,1.49262554471086
## P16,4,16,1.49046254513869
## P16,4,17,1.49103843867779
## P16,4,18,1.49134083882274
## P16,4,19,1.49049355548883
## P16,4,20,1.49080734309696
## P16,4,21,1.49158489773845
## P16,4,22,1.49164916292022
## P16,4,23,1.49173357538933
## P16,4,24,1.48984449534189
## P16,4,25,1.49086209897245
## P16,4,26,1.49077793737737
## P16,4,27,1.4917771662885
## P16,4,28,1.4905363371878
## P16,4,29,1.48884366842417
## P16,4,30,1.49044375751108
## P16,4,31,1.48923710145448
## P16,4,32,1.49220557425432
## P16,4,33,1.4911696840735
## P16,4,34,1.49004461367925
## P16,4,35,1.49196346700192
## P16,4,36,1.48821178974549
## P16,4,37,1.4922304839304
## P16,4,38,1.49157574228997
## P16,4,39,1.49067569066243
## P16,4,40,1.49115658139849
## P16,4,41,1.49199340719926
## P16,4,42,1.49083825207632
## P16,4,43,1.49140941482229
## P16,4,44,1.48971334012967
## P16,4,45,1.49369701064459
## P16,4,46,1.48958499232928
## P16,4,47,1.49044005767159
## P16,4,48,1.49150771680086
## P16,4,49,1.49122188903473
## P16,4,50,1.4910642346635
## P16,5,1,1.49045444216047
## P16,5,2,1.49028512178841
## P16,5,3,1.49049758257931
## P16,5,4,1.49062101312932
## P16,5,5,1.49144348481885
## P16,5,6,1.49268445547889
## P16,5,7,1.49180585997445
## P16,5,8,1.48980758601222
## P16,5,9,1.48986273277097
## P16,5,10,1.49098215232024
## P16,5,11,1.49174887169408
## P16,5,12,1.49097173947554
## P16,5,13,1.49208573441007
## P16,5,14,1.49017922286015
## P16,5,15,1.49267336942148
## P16,5,16,1.49023868788534
## P16,5,17,1.49133302869588
## P16,5,18,1.48990216955438
## P16,5,19,1.49114011107264
## P16,5,20,1.49277230205699
## P16,5,21,1.49051742399892
## P16,5,22,1.49370949918574
## P16,5,23,1.4904720669701
## P16,5,24,1.48989050388336
## P16,5,25,1.49140598478108
## P16,5,26,1.49089756011963
## P16,5,27,1.49071421481595
## P16,5,28,1.48954370938815
## P16,5,29,1.48982897969603
## P16,5,30,1.49134131083413
## P16,5,31,1.4915047576747
## P16,5,32,1.49085825476153
## P16,5,33,1.49028849837804
## P16,5,34,1.48984298385492
## P16,5,35,1.48986988623165
## P16,5,36,1.49293007338343
## P16,5,37,1.49205348784463
## P16,5,38,1.48993339643374
## P16,5,39,1.49165998245108
## P16,5,40,1.48924206603657
## P16,5,41,1.49060011985607
## P16,5,42,1.49090978137234
## P16,5,43,1.48993780920582
## P16,5,44,1.49072000384331
## P16,5,45,1.4910946932706
## P16,5,46,1.49160000708251
## P16,5,47,1.49092315302955
## P16,5,48,1.49077533332395
## P16,5,49,1.49125607420759
## P16,5,50,1.49061772341285
## P16,6,1,1.49721356472337
## P16,6,2,1.49696610190652
## P16,6,3,1.49527020357093
## P16,6,4,1.49500314544582
## P16,6,5,1.49451606849144
## P16,6,6,1.49434836356194
## P16,6,7,1.4944178605691
## P16,6,8,1.49508044173598
## P16,6,9,1.49409329891205
## P16,6,10,1.49480597000548
## P16,6,11,1.49363068829883
## P16,6,12,1.49405355453491
## P16,6,13,1.49249679748326
## P16,6,14,1.49482155981518
## P16,6,15,1.4931498129675
## P16,6,16,1.49223154650794
## P16,6,17,1.49223542077201
## P16,6,18,1.49343226657194
## P16,6,19,1.4921395925828
## P16,6,20,1.49294295066442
## P16,6,21,1.49189308535668
## P16,6,22,1.49225498909174
## P16,6,23,1.49285012559046
## P16,6,24,1.49303548078279
## P16,6,25,1.49256144443028
## P16,6,26,1.49290893872579
## P16,6,27,1.49319733942256
## P16,6,28,1.4911382117239
## P16,6,29,1.49409759896142
## P16,6,30,1.49279113467649
## P16,6,31,1.49137219240968
## P16,6,32,1.49210242736034
## P16,6,33,1.49818048678653
## P16,6,34,1.4934249657851
## P16,6,35,1.49126274424388
## P16,6,36,1.49210565984249
## P16,6,37,1.49272839228312
## P16,6,38,1.49240820345126
## P16,6,39,1.49113516744814
## P16,6,40,1.49194919381823
## P16,6,41,1.49149066925049
## P16,6,42,1.49143291488896
## P16,6,43,1.49159034646076
## P16,6,44,1.49388808990592
## P16,6,45,1.49136706760951
## P16,6,46,1.49201280850891
## P16,6,47,1.4928971529007
## P16,6,48,1.49272725423177
## P16,6,49,1.49107223045169
## P16,6,50,1.49231271150047
## P16,7,1,1.49126385009452
## P16,7,2,1.49248125404119
## P16,7,3,1.49137052009846
## P16,7,4,1.49156554539998
## P16,7,5,1.49186061527915
## P16,7,6,1.49094078339726
## P16,7,7,1.49225775288864
## P16,7,8,1.49065139171851
## P16,7,9,1.49145822329064
## P16,7,10,1.49125303060581
## P16,7,11,1.49017133906081
## P16,7,12,1.49170489487825
## P16,7,13,1.49132668325143
## P16,7,14,1.49172210693359
## P16,7,15,1.48996686601972
## P16,7,16,1.49242723436284
## P16,7,17,1.49115988213246
## P16,7,18,1.49090993150752
## P16,7,19,1.49197831749916
## P16,7,20,1.49174291746957
## P16,7,21,1.48891718247358
## P16,7,22,1.49146720568339
## P16,7,23,1.49145518997569
## P16,7,24,1.493195263963
## P16,7,25,1.4903608490439
## P16,7,26,1.49129546851647
## P16,7,27,1.49135417609379
## P16,7,28,1.49098699332694
## P16,7,29,1.4913606511222
## P16,7,30,1.49150746209281
## P16,7,31,1.49186144036762
## P16,7,32,1.49163330258347
## P16,7,33,1.49003645638439
## P16,7,34,1.49104155302048
## P16,7,35,1.49124644095438
## P16,7,36,1.49201207374459
## P16,7,37,1.49079857394099
## P16,7,38,1.49204807453327
## P16,7,39,1.48927889643489
## P16,7,40,1.49173429943868
## P16,7,41,1.49136483240471
## P16,7,42,1.49075101292323
## P16,7,43,1.48994522744959
## P16,7,44,1.49182527871441
## P16,7,45,1.49204881464849
## P16,7,46,1.4922657634901
## P16,7,47,1.49174880638397
## P16,7,48,1.49078504122221
## P16,7,49,1.49199808483392
## P16,7,50,1.49163713885678
## P16,8,1,1.49225419097477
## P16,8,2,1.49079033401277
## P16,8,3,1.49238225051335
## P16,8,4,1.49077805605802
## P16,8,5,1.49272561434544
## P16,8,6,1.48992660899221
## P16,8,7,1.49074922241531
## P16,8,8,1.49143741669193
## P16,8,9,1.49074176191552
## P16,8,10,1.49162461806317
## P16,8,11,1.49185982220609
## P16,8,12,1.48990245832913
## P16,8,13,1.49192072677612
## P16,8,14,1.49087919262673
## P16,8,15,1.49191530545553
## P16,8,16,1.48971795674526
## P16,8,17,1.49072668426915
## P16,8,18,1.48873559188843
## P16,8,19,1.49173565361443
## P16,8,20,1.49083605087061
## P16,8,21,1.49097601572673
## P16,8,22,1.49076256236515
## P16,8,23,1.49121913978522
## P16,8,24,1.49063795886628
## P16,8,25,1.49338442087173
## P16,8,26,1.48985789242913
## P16,8,27,1.49045337187616
## P16,8,28,1.49248985664265
## P16,8,29,1.49192426152473
## P16,8,30,1.49139323895865
## P16,8,31,1.49135673683108
## P16,8,32,1.49184470971425
## P16,8,33,1.48975085814794
## P16,8,34,1.49057129172028
## P16,8,35,1.49154663830996
## P16,8,36,1.49122495059819
## P16,8,37,1.49133956779554
## P16,8,38,1.49249925035419
## P16,8,39,1.4907711416051
## P16,8,40,1.49158724318159
## P16,8,41,1.49139711552096
## P16,8,42,1.49199745288262
## P16,8,43,1.49019120315026
## P16,8,44,1.48985802796152
## P16,8,45,1.49187671542168
## P16,8,46,1.49120531202872
## P16,8,47,1.49250827630361
## P16,8,48,1.4912915015832
## P16,8,49,1.49263608272259
## P16,8,50,1.49114650622752
## P16,9,1,1.49099614403465
## P16,9,2,1.49143415517201
## P16,9,3,1.49004544152154
## P16,9,4,1.48863669698553
## P16,9,5,1.49168178981001
## P16,9,6,1.49154021058764
## P16,9,7,1.49053242627312
## P16,9,8,1.49286919789957
## P16,9,9,1.49094123182626
## P16,9,10,1.49111289577884
## P16,9,11,1.4915070117466
## P16,9,12,1.49255780759065
## P16,9,13,1.49070888018086
## P16,9,14,1.49190721511841
## P16,9,15,1.49093609513908
## P16,9,16,1.49094966888428
## P16,9,17,1.49116968608403
## P16,9,18,1.49186955055181
## P16,9,19,1.49332019434137
## P16,9,20,1.49087176287085
## P16,9,21,1.49195322437563
## P16,9,22,1.49105037703659
## P16,9,23,1.4901558711611
## P16,9,24,1.49144285719916
## P16,9,25,1.49115754829513
## P16,9,26,1.49570906771361
## P16,9,27,1.48547263862261
## P16,9,28,1.49253047392672
## P16,9,29,1.49250462320116
## P16,9,30,1.49024258388413
## P16,9,31,1.49081623143163
## P16,9,32,1.49125559019006
## P16,9,33,1.49123738582869
## P16,9,34,1.48927874888404
## P16,9,35,1.49115198790425
## P16,9,36,1.4931950000448
## P16,9,37,1.49190155536898
## P16,9,38,1.49332302808762
## P16,9,39,1.49100175499916
## P16,9,40,1.49262474536896
## P16,9,41,1.49016282341697
## P16,9,42,1.49110974677622
## P16,9,43,1.49181816273166
## P16,9,44,1.49023065567017
## P16,9,45,1.49105252419318
## P16,9,46,1.49121103653541
## P16,9,47,1.48968395505633
## P16,9,48,1.49106034110574
## P16,9,49,1.49013291036381
## P16,9,50,1.49021883403764
## P16,10,1,1.49062278709914
## P16,10,2,1.49118023723751
## P16,10,3,1.4911997336194
## P16,10,4,1.4911798759743
## P16,10,5,1.49055408176623
## P16,10,6,1.49254313299928
## P16,10,7,1.49109191894531
## P16,10,8,1.49065516071935
## P16,10,9,1.49082345070599
## P16,10,10,1.49071584385671
## P16,10,11,1.49132164593401
## P16,10,12,1.49021534297777
## P16,10,13,1.49110197226206
## P16,10,14,1.49148607578407
## P16,10,15,1.49081650612846
## P16,10,16,1.4914169169184
## P16,10,17,1.4911040887765
## P16,10,18,1.49163871748835
## P16,10,19,1.49045770893926
## P16,10,20,1.490717148596
## P16,10,21,1.49079313278198
## P16,10,22,1.49006561771516
## P16,10,23,1.49091734290123
## P16,10,24,1.49186544145857
## P16,10,25,1.48976170369821
## P16,10,26,1.49013802151621
## P16,10,27,1.49283068180084
## P16,10,28,1.49134097570254
## P16,10,29,1.49158249372317
## P16,10,30,1.49057915883187
## P16,10,31,1.49059071457177
## P16,10,32,1.49069856703281
## P16,10,33,1.49015366762204
## P16,10,34,1.49152703958055
## P16,10,35,1.49008986101312
## P16,10,36,1.49217066370455
## P16,10,37,1.4918125643049
## P16,10,38,1.4905745578262
## P16,10,39,1.49147839662505
## P16,10,40,1.4904802393469
## P16,10,41,1.49144839067928
## P16,10,42,1.49090081340862
## P16,10,43,1.49155357691247
## P16,10,44,1.49017056712398
## P16,10,45,1.49118332902924
## P16,10,46,1.49048082434016
## P16,10,47,1.49145944190748
## P16,10,48,1.49034572655046
## P16,10,49,1.49062315622966
## P16,10,50,1.49096611704145
## P17,1,1,1.48896809013522
## P17,1,2,1.49232183762316
## P17,1,3,1.49257907271385
## P17,1,4,1.4923402697353
## P17,1,5,1.49112571610345
## P17,1,6,1.49075971623903
## P17,1,7,1.49162718772888
## P17,1,8,1.4975272975862
## P17,1,9,1.48333256931628
## P17,1,10,1.50273350935716
## P17,1,11,1.48168151609359
## P17,1,12,1.48097365031871
## P17,1,13,1.50080675237319
## P17,1,14,1.48593830381121
## P17,1,15,1.49316972933317
## P17,1,16,1.48788651553067
## P17,1,17,1.49690550407477
## P17,1,18,1.49101806128467
## P17,1,19,1.487111371139
## P17,1,20,1.48964429868234
## P17,1,21,1.49185484494918
## P17,1,22,1.48877425227605
## P17,1,23,1.48900808908243
## P17,1,24,1.4925954277451
## P17,1,25,1.49248979247619
## P17,1,26,1.49027694396253
## P17,1,27,1.48358656230726
## P17,1,28,1.49403990951239
## P17,1,29,1.49134142153731
## P17,1,30,1.48881746789683
## P17,1,31,1.49270786673336
## P17,1,32,1.49021563889845
## P17,1,33,1.48967796961466
## P17,1,34,1.49294122572868
## P17,1,35,1.48389446918781
## P17,1,36,1.4925529719978
## P17,1,37,1.4917667926626
## P17,1,38,1.49044677019119
## P17,1,39,1.49357348918915
## P17,1,40,1.49026343615159
## P17,1,41,1.49215008777642
## P17,1,42,1.49143960571289
## P17,1,43,1.49042173226674
## P17,1,44,1.49163120312798
## P17,1,45,1.48701694783042
## P17,1,46,1.49774911370076
## P17,1,47,1.48585790136586
## P17,1,48,1.49162322129959
## P17,1,49,1.49336173568947
## P17,1,50,1.48903506000837
## P17,2,1,1.49134437147393
## P17,2,2,1.49147895666269
## P17,2,3,1.49088797361954
## P17,2,4,1.49053934787182
## P17,2,5,1.4918621148956
## P17,2,6,1.49108557152537
## P17,2,7,1.49073378141824
## P17,2,8,1.49168202502668
## P17,2,9,1.4925259411335
## P17,2,10,1.4911574853205
## P17,2,11,1.49171443379253
## P17,2,12,1.49091323828086
## P17,2,13,1.49058054863138
## P17,2,14,1.49137939862757
## P17,2,15,1.48981042084871
## P17,2,16,1.49220245783446
## P17,2,17,1.49212311295902
## P17,2,18,1.49032840251923
## P17,2,19,1.49124559955062
## P17,2,20,1.491151214446
## P17,2,21,1.49125660334202
## P17,2,22,1.49112360818045
## P17,2,23,1.49065660718662
## P17,2,24,1.49190747600862
## P17,2,25,1.49092106313013
## P17,2,26,1.49170297895159
## P17,2,27,1.49225635691123
## P17,2,28,1.48972189005683
## P17,2,29,1.49720835852456
## P17,2,30,1.48793444633484
## P17,2,31,1.49128688943797
## P17,2,32,1.49073260819831
## P17,2,33,1.4960025127669
## P17,2,34,1.49043145050874
## P17,2,35,1.48945292154948
## P17,2,36,1.49165969848633
## P17,2,37,1.49171611590263
## P17,2,38,1.49491164281771
## P17,2,39,1.49762638755467
## P17,2,40,1.49012643054016
## P17,2,41,1.49264783580808
## P17,2,42,1.490563682363
## P17,2,43,1.49095582567956
## P17,2,44,1.49825398705222
## P17,2,45,1.48690825739215
## P17,2,46,1.48485105403148
## P17,2,47,1.49144161878711
## P17,2,48,1.48630040152031
## P17,2,49,1.49242974472046
## P17,2,50,1.48967441754562
## P17,3,1,1.49071451916414
## P17,3,2,1.49073327363595
## P17,3,3,1.49128504758756
## P17,3,4,1.49085949361324
## P17,3,5,1.49345724980036
## P17,3,6,1.49228386516156
## P17,3,7,1.49148174455971
## P17,3,8,1.49144463729858
## P17,3,9,1.49121652280583
## P17,3,10,1.49090585597726
## P17,3,11,1.49121042610942
## P17,3,12,1.4911140954053
## P17,3,13,1.49117562430246
## P17,3,14,1.49091418120113
## P17,3,15,1.49114841020026
## P17,3,16,1.49142429563734
## P17,3,17,1.49032839896187
## P17,3,18,1.49165256350648
## P17,3,19,1.49129388000392
## P17,3,20,1.49073962990297
## P17,3,21,1.49199982635847
## P17,3,22,1.49119708596206
## P17,3,23,1.49133697120092
## P17,3,24,1.49027521545823
## P17,3,25,1.49251124747964
## P17,3,26,1.49115044920595
## P17,3,27,1.49129833894617
## P17,3,28,1.49096893038069
## P17,3,29,1.49163570845058
## P17,3,30,1.49129554108306
## P17,3,31,1.49068990223844
## P17,3,32,1.49167990293659
## P17,3,33,1.49132094132273
## P17,3,34,1.49113862410836
## P17,3,35,1.49065844692401
## P17,3,36,1.49117541587216
## P17,3,37,1.49107271797803
## P17,3,38,1.49139129277822
## P17,3,39,1.49124779513008
## P17,3,40,1.49107926309445
## P17,3,41,1.49047444484852
## P17,3,42,1.49095685141427
## P17,3,43,1.49106011765726
## P17,3,44,1.49142698498515
## P17,3,45,1.49092518558818
## P17,3,46,1.49133995650471
## P17,3,47,1.49038426681135
## P17,3,48,1.49135011350605
## P17,3,49,1.49160009060266
## P17,3,50,1.49120466332687
## P17,4,1,1.49079231862669
## P17,4,2,1.49155542626977
## P17,4,3,1.4898093367825
## P17,4,4,1.49172683459956
## P17,4,5,1.491271243854
## P17,4,6,1.49145416555734
## P17,4,7,1.48997904047554
## P17,4,8,1.49072084490885
## P17,4,9,1.49149652741711
## P17,4,10,1.49104687448084
## P17,4,11,1.49113842099905
## P17,4,12,1.49081159534311
## P17,4,13,1.49082446256221
## P17,4,14,1.49103576889455
## P17,4,15,1.49185544753743
## P17,4,16,1.4915863275528
## P17,4,17,1.49075274932675
## P17,4,18,1.4911994603964
## P17,4,19,1.49149958996833
## P17,4,20,1.49109449265878
## P17,4,21,1.4907365770901
## P17,4,22,1.49146391616927
## P17,4,23,1.49110770858495
## P17,4,24,1.49075757339597
## P17,4,25,1.49074083175102
## P17,4,26,1.49114425303572
## P17,4,27,1.49070979039603
## P17,4,28,1.49141022844135
## P17,4,29,1.49202701905194
## P17,4,30,1.49119666476309
## P17,4,31,1.4910085953322
## P17,4,32,1.49144837340793
## P17,4,33,1.49100639382187
## P17,4,34,1.49101234942066
## P17,4,35,1.49181121237138
## P17,4,36,1.49023902809227
## P17,4,37,1.49088694105212
## P17,4,38,1.49195279393877
## P17,4,39,1.4910079647681
## P17,4,40,1.49081964946928
## P17,4,41,1.49137092337889
## P17,4,42,1.49099913324629
## P17,4,43,1.49111220851448
## P17,4,44,1.49152026325464
## P17,4,45,1.49095503789074
## P17,4,46,1.49045322581035
## P17,4,47,1.49100919818202
## P17,4,48,1.49150581267274
## P17,4,49,1.49092186542979
## P17,4,50,1.49108709356442
## P17,5,1,1.49067527256655
## P17,5,2,1.49148405132009
## P17,5,3,1.49106017904344
## P17,5,4,1.49117937992359
## P17,5,5,1.49047284614383
## P17,5,6,1.49209625666378
## P17,5,7,1.49150381638454
## P17,5,8,1.49141737764532
## P17,5,9,1.49101629978468
## P17,5,10,1.4917814940737
## P17,5,11,1.49104936499345
## P17,5,12,1.49091142088502
## P17,5,13,1.49472146767836
## P17,5,14,1.48980209879253
## P17,5,15,1.49261441139074
## P17,5,16,1.49126892931321
## P17,5,17,1.49091718054765
## P17,5,18,1.49126916677773
## P17,5,19,1.4911239019462
## P17,5,20,1.49134993207627
## P17,5,21,1.49094549951882
## P17,5,22,1.49073027707859
## P17,5,23,1.49114813960967
## P17,5,24,1.49200590067896
## P17,5,25,1.49048278355362
## P17,5,26,1.49332747572944
## P17,5,27,1.49107968902588
## P17,5,28,1.49141965279212
## P17,5,29,1.49015274970762
## P17,5,30,1.49188257476031
## P17,5,31,1.49088612998404
## P17,5,32,1.49137156233828
## P17,5,33,1.4910496711731
## P17,5,34,1.49175771189408
## P17,5,35,1.49064042661097
## P17,5,36,1.49047509530433
## P17,5,37,1.49104809925474
## P17,5,38,1.49159301284456
## P17,5,39,1.49017550641258
## P17,5,40,1.49117400479871
## P17,5,41,1.4902441960956
## P17,5,42,1.49062336815728
## P17,5,43,1.49157465526036
## P17,5,44,1.49123033796038
## P17,5,45,1.49126830068575
## P17,5,46,1.49122167374036
## P17,5,47,1.49105661219739
## P17,5,48,1.49131377335567
## P17,5,49,1.49112982174446
## P17,5,50,1.49103118303724
## P17,6,1,1.49198800381099
## P17,6,2,1.49316463931914
## P17,6,3,1.49239441444134
## P17,6,4,1.49124854319804
## P17,6,5,1.49188360479689
## P17,6,6,1.49096591505286
## P17,6,7,1.4916535137462
## P17,6,8,1.49137292621292
## P17,6,9,1.49241638434561
## P17,6,10,1.49217705060077
## P17,6,11,1.49190867591549
## P17,6,12,1.4917846691389
## P17,6,13,1.49191300392151
## P17,6,14,1.49213998152478
## P17,6,15,1.49141125390994
## P17,6,16,1.49156700538484
## P17,6,17,1.4906313196818
## P17,6,18,1.49206398934433
## P17,6,19,1.49096275198049
## P17,6,20,1.49233281457579
## P17,6,21,1.49163160738738
## P17,6,22,1.49087845624148
## P17,6,23,1.49125954810153
## P17,6,24,1.49191965320246
## P17,6,25,1.49137822694557
## P17,6,26,1.49161779119613
## P17,6,27,1.49110354454287
## P17,6,28,1.49064136301197
## P17,6,29,1.49234314714925
## P17,6,30,1.4920143599462
## P17,6,31,1.49219918684526
## P17,6,32,1.4901336613348
## P17,6,33,1.49253939825391
## P17,6,34,1.49104722779373
## P17,6,35,1.49116965307706
## P17,6,36,1.49033998133062
## P17,6,37,1.4911303019818
## P17,6,38,1.49170626750609
## P17,6,39,1.49229017779124
## P17,6,40,1.4908427458543
## P17,6,41,1.49111962999616
## P17,6,42,1.49125419344221
## P17,6,43,1.49177722413411
## P17,6,44,1.49211440118803
## P17,6,45,1.49132837568011
## P17,6,46,1.48997551329592
## P17,6,47,1.49179279356075
## P17,6,48,1.4911290672934
## P17,6,49,1.49043820228106
## P17,6,50,1.4918115487026
## P17,7,1,1.49099031531292
## P17,7,2,1.49140913241378
## P17,7,3,1.49196238457402
## P17,7,4,1.49146966934204
## P17,7,5,1.49155300060908
## P17,7,6,1.49045108699199
## P17,7,7,1.49147413117545
## P17,7,8,1.49105193217595
## P17,7,9,1.49070318346101
## P17,7,10,1.49144546754899
## P17,7,11,1.49159498934476
## P17,7,12,1.49076597026137
## P17,7,13,1.4911760933259
## P17,7,14,1.49122761643451
## P17,7,15,1.49132873795249
## P17,7,16,1.49203075099195
## P17,7,17,1.4914830327034
## P17,7,18,1.49042051132411
## P17,7,19,1.49144262776655
## P17,7,20,1.49102843581856
## P17,7,21,1.49138797884402
## P17,7,22,1.49069093136077
## P17,7,23,1.49164871408158
## P17,7,24,1.4908449092758
## P17,7,25,1.49106011163621
## P17,7,26,1.491571151849
## P17,7,27,1.49092708870217
## P17,7,28,1.49103147211209
## P17,7,29,1.49142536250028
## P17,7,30,1.49168056654699
## P17,7,31,1.4913348538535
## P17,7,32,1.49177066421509
## P17,7,33,1.49170355039222
## P17,7,34,1.49138716220856
## P17,7,35,1.4923801223437
## P17,7,36,1.49198888998765
## P17,7,37,1.4915113910552
## P17,7,38,1.49136471917443
## P17,7,39,1.49140809200428
## P17,7,40,1.49101067515253
## P17,7,41,1.49142797258165
## P17,7,42,1.49180261801321
## P17,7,43,1.49152032885931
## P17,7,44,1.49105444141463
## P17,7,45,1.49110637133635
## P17,7,46,1.49164741322146
## P17,7,47,1.49133753095354
## P17,7,48,1.4919753546762
## P17,7,49,1.4912030061086
## P17,7,50,1.49127104502766
## P17,8,1,1.49113128896345
## P17,8,2,1.49105536597116
## P17,8,3,1.49028422832489
## P17,8,4,1.49160583900369
## P17,8,5,1.48977962970734
## P17,8,6,1.49138393694041
## P17,8,7,1.49058605583621
## P17,8,8,1.49138176210465
## P17,8,9,1.49076140311457
## P17,8,10,1.49106948996243
## P17,8,11,1.49118471720132
## P17,8,12,1.49148678582562
## P17,8,13,1.49095643267912
## P17,8,14,1.49056241191025
## P17,8,15,1.49225626673017
## P17,8,16,1.49190461366696
## P17,8,17,1.49128727850161
## P17,8,18,1.49154905534126
## P17,8,19,1.49124686507618
## P17,8,20,1.4913699902021
## P17,8,21,1.4909797952145
## P17,8,22,1.49131456605948
## P17,8,23,1.49159594071217
## P17,8,24,1.49122466087341
## P17,8,25,1.49124192329774
## P17,8,26,1.49090363836696
## P17,8,27,1.49157521459791
## P17,8,28,1.49127092046186
## P17,8,29,1.49102713422077
## P17,8,30,1.49136283662584
## P17,8,31,1.49145570961205
## P17,8,32,1.49066069546868
## P17,8,33,1.4912249303497
## P17,8,34,1.49094113707542
## P17,8,35,1.49029154816935
## P17,8,36,1.49061871182387
## P17,8,37,1.49090135388258
## P17,8,38,1.49055120991726
## P17,8,39,1.49262088682593
## P17,8,40,1.4906044699188
## P17,8,41,1.4918334599199
## P17,8,42,1.49098910932188
## P17,8,43,1.49134595883198
## P17,8,44,1.49098214736352
## P17,8,45,1.49137739140353
## P17,8,46,1.4909813466825
## P17,8,47,1.49067437873696
## P17,8,48,1.49182144233159
## P17,8,49,1.49075819764818
## P17,8,50,1.49147606718129
## P17,9,1,1.49096101873061
## P17,9,2,1.4906339435787
## P17,9,3,1.49135010197478
## P17,9,4,1.49165999242502
## P17,9,5,1.49112705083994
## P17,9,6,1.49073693843988
## P17,9,7,1.49154256966154
## P17,9,8,1.49188161369981
## P17,9,9,1.49085714552138
## P17,9,10,1.49193705788142
## P17,9,11,1.49182639122009
## P17,9,12,1.4906075872224
## P17,9,13,1.4922196320125
## P17,9,14,1.49112254544034
## P17,9,15,1.49114615374272
## P17,9,16,1.49177522783156
## P17,9,17,1.49075835366403
## P17,9,18,1.49152415348933
## P17,9,19,1.49083390901255
## P17,9,20,1.49103820323944
## P17,9,21,1.49165703741352
## P17,9,22,1.49109493131223
## P17,9,23,1.49114054112347
## P17,9,24,1.49085388267249
## P17,9,25,1.4908288514839
## P17,9,26,1.49103024067023
## P17,9,27,1.49096314803414
## P17,9,28,1.49162917225449
## P17,9,29,1.49122538437714
## P17,9,30,1.48987428814757
## P17,9,31,1.49093784418973
## P17,9,32,1.49045795323897
## P17,9,33,1.4905911600867
## P17,9,34,1.49135020573934
## P17,9,35,1.49041188955307
## P17,9,36,1.49092738818278
## P17,9,37,1.49072532784449
## P17,9,38,1.49135306634401
## P17,9,39,1.49075438878308
## P17,9,40,1.49077592372894
## P17,9,41,1.49060836663613
## P17,9,42,1.49021339893341
## P17,9,43,1.49108974269179
## P17,9,44,1.49085246324539
## P17,9,45,1.4913519769907
## P17,9,46,1.49138363846787
## P17,9,47,1.49016371227446
## P17,9,48,1.49258590828289
## P17,9,49,1.49114119855663
## P17,9,50,1.49083409051003
## P17,10,1,1.49078666947105
## P17,10,2,1.49056064275871
## P17,10,3,1.49078777643639
## P17,10,4,1.4935519695282
## P17,10,5,1.48999464670817
## P17,10,6,1.49132128556569
## P17,10,7,1.49328469682014
## P17,10,8,1.49240515487535
## P17,10,9,1.48965016278354
## P17,10,10,1.4909864869611
## P17,10,11,1.491417682077
## P17,10,12,1.49050865936279
## P17,10,13,1.49118266296387
## P17,10,14,1.49184090797215
## P17,10,15,1.4913151437586
## P17,10,16,1.49137725415437
## P17,10,17,1.49120764638863
## P17,10,18,1.49038476803724
## P17,10,19,1.49346073742571
## P17,10,20,1.49155095326815
## P17,10,21,1.49145840255307
## P17,10,22,1.49049402105397
## P17,10,23,1.49114114778084
## P17,10,24,1.49211906564647
## P17,10,25,1.48988878593016
## P17,10,26,1.49159697599189
## P17,10,27,1.49114602320903
## P17,10,28,1.49162589550018
## P17,10,29,1.49017639417906
## P17,10,30,1.49169124287667
## P17,10,31,1.49130667172945
## P17,10,32,1.49067166494945
## P17,10,33,1.49112340927124
## P17,10,34,1.48953345874408
## P17,10,35,1.49099402957492
## P17,10,36,1.49119021141366
## P17,10,37,1.49112352224497
## P17,10,38,1.49106878565069
## P17,10,39,1.49130481320458
## P17,10,40,1.49137530788299
## P17,10,41,1.49081575226139
## P17,10,42,1.49149765520014
## P17,10,43,1.49106109351443
## P17,10,44,1.4907298640507
## P17,10,45,1.49142145252914
## P17,10,46,1.49048583647784
## P17,10,47,1.49125238459745
## P17,10,48,1.49091354812064
## P17,10,49,1.49094049771627
## P17,10,50,1.4906811440128
## P18,1,1,1.49066249803565
## P18,1,2,1.4900466449677
## P18,1,3,1.48614070048699
## P18,1,4,1.48914943560205
## P18,1,5,1.49114609664341
## P18,1,6,1.49137331930439
## P18,1,7,1.49260551317603
## P18,1,8,1.49331055335628
## P18,1,9,1.48614371118467
## P18,1,10,1.49263919659746
## P18,1,11,1.4922348030475
## P18,1,12,1.49109550653878
## P18,1,13,1.48674050915626
## P18,1,14,1.48754617059307
## P18,1,15,1.49432066955952
## P18,1,16,1.48945745853109
## P18,1,17,1.49810935541527
## P18,1,18,1.49114149969977
## P18,1,19,1.491434839464
## P18,1,20,1.49016150875368
## P18,1,21,1.49479303826819
## P18,1,22,1.4894671175215
## P18,1,23,1.49178298428762
## P18,1,24,1.49872786157271
## P18,1,25,1.4969148346872
## P18,1,26,1.49330228805542
## P18,1,27,1.49309096063019
## P18,1,28,1.48596117331547
## P18,1,29,1.49159531342356
## P18,1,30,1.4895528649029
## P18,1,31,1.48723630003027
## P18,1,32,1.49288936342512
## P18,1,33,1.49183347307403
## P18,1,34,1.49151306267244
## P18,1,35,1.49177777690272
## P18,1,36,1.48968453926615
## P18,1,37,1.49051031271617
## P18,1,38,1.48973994851112
## P18,1,39,1.48953329974955
## P18,1,40,1.49134235775348
## P18,1,41,1.49169452606686
## P18,1,42,1.48897384430145
## P18,1,43,1.48942040189912
## P18,1,44,1.49161711725695
## P18,1,45,1.48804902193839
## P18,1,46,1.491231757284
## P18,1,47,1.48954793791108
## P18,1,48,1.49151655435562
## P18,1,49,1.49202122166753
## P18,1,50,1.49222460194169
## P18,2,1,1.49220880843301
## P18,2,2,1.49221381954118
## P18,2,3,1.49109402424147
## P18,2,4,1.49443663542087
## P18,2,5,1.48865365982056
## P18,2,6,1.49143608620292
## P18,2,7,1.48927537132712
## P18,2,8,1.49201878429165
## P18,2,9,1.49041197071337
## P18,2,10,1.49127272485008
## P18,2,11,1.49203141004044
## P18,2,12,1.49852789721443
## P18,2,13,1.48339414028894
## P18,2,14,1.48434028625488
## P18,2,15,1.49415498621324
## P18,2,16,1.49120311226164
## P18,2,17,1.49264891251274
## P18,2,18,1.48948061935545
## P18,2,19,1.49193971575671
## P18,2,20,1.49187065887451
## P18,2,21,1.48733694674605
## P18,2,22,1.48495718218246
## P18,2,23,1.4921357188906
## P18,2,24,1.49234007945103
## P18,2,25,1.49195743407179
## P18,2,26,1.48831062235384
## P18,2,27,1.48720865249634
## P18,2,28,1.48896580254472
## P18,2,29,1.48933116536941
## P18,2,30,1.48966262709927
## P18,2,31,1.49299596470489
## P18,2,32,1.49115297198296
## P18,2,33,1.48688913036037
## P18,2,34,1.48581327915192
## P18,2,35,1.49468784862094
## P18,2,36,1.48258943008862
## P18,2,37,1.49778410072984
## P18,2,38,1.47859428405762
## P18,2,39,1.49849620342255
## P18,2,40,1.47940212488174
## P18,2,41,1.49435196366421
## P18,2,42,1.50361035830939
## P18,2,43,1.51236138253842
## P18,2,44,1.49045872262546
## P18,2,45,1.49315215216743
## P18,2,46,1.49354241718756
## P18,2,47,1.48836408721076
## P18,2,48,1.49125834398491
## P18,2,49,1.49079466695371
## P18,2,50,1.48935422254968
## P18,3,1,1.49034695292628
## P18,3,2,1.49068597710651
## P18,3,3,1.49370255470276
## P18,3,4,1.49102287992425
## P18,3,5,1.49015428836529
## P18,3,6,1.49087368767217
## P18,3,7,1.49222465661856
## P18,3,8,1.4906236121529
## P18,3,9,1.49037007627816
## P18,3,10,1.49093444479836
## P18,3,11,1.49584009140495
## P18,3,12,1.48821404733156
## P18,3,13,1.49228350795917
## P18,3,14,1.49137567002096
## P18,3,15,1.4921360321534
## P18,3,16,1.49068324168523
## P18,3,17,1.49084365690077
## P18,3,18,1.49381142192417
## P18,3,19,1.48481035232544
## P18,3,20,1.49178106051225
## P18,3,21,1.49169393083942
## P18,3,22,1.49166082397221
## P18,3,23,1.49052784076104
## P18,3,24,1.49183715431436
## P18,3,25,1.49013911353217
## P18,3,26,1.49088043714092
## P18,3,27,1.49115638660662
## P18,3,28,1.48978670816573
## P18,3,29,1.49094672345403
## P18,3,30,1.48991239902585
## P18,3,31,1.49118009209633
## P18,3,32,1.49154466580433
## P18,3,33,1.49049042755703
## P18,3,34,1.49084901809692
## P18,3,35,1.49042603917366
## P18,3,36,1.49113702418199
## P18,3,37,1.49155875998484
## P18,3,38,1.49051343750309
## P18,3,39,1.49281743439761
## P18,3,40,1.48995655150641
## P18,3,41,1.49110931604087
## P18,3,42,1.49166969667401
## P18,3,43,1.49108827945798
## P18,3,44,1.48859890972275
## P18,3,45,1.49157592654228
## P18,3,46,1.49029242253937
## P18,3,47,1.49032527405695
## P18,3,48,1.49316254991
## P18,3,49,1.48931875981783
## P18,3,50,1.49149065547519
## P18,4,1,1.49138325679151
## P18,4,2,1.49143374805719
## P18,4,3,1.49091230420505
## P18,4,4,1.49157711747405
## P18,4,5,1.49142875960379
## P18,4,6,1.49046241191396
## P18,4,7,1.49116171730889
## P18,4,8,1.49073811561342
## P18,4,9,1.49059286462255
## P18,4,10,1.49152072823566
## P18,4,11,1.49115726119238
## P18,4,12,1.49039207984661
## P18,4,13,1.49115146711035
## P18,4,14,1.49055489164884
## P18,4,15,1.49081631978353
## P18,4,16,1.491941886478
## P18,4,17,1.48999380661269
## P18,4,18,1.49166776194717
## P18,4,19,1.49131454485599
## P18,4,20,1.49144648532478
## P18,4,21,1.49015826528723
## P18,4,22,1.49292694312939
## P18,4,23,1.49046528907049
## P18,4,24,1.49117451329385
## P18,4,25,1.48985140411942
## P18,4,26,1.49178750239886
## P18,4,27,1.48968064880371
## P18,4,28,1.49179932364711
## P18,4,29,1.49120672160181
## P18,4,30,1.4911760137051
## P18,4,31,1.49007949281911
## P18,4,32,1.49047940268236
## P18,4,33,1.49321726342322
## P18,4,34,1.48970198350794
## P18,4,35,1.49395361561929
## P18,4,36,1.48808918799554
## P18,4,37,1.49103182197636
## P18,4,38,1.49139695817774
## P18,4,39,1.48993248817248
## P18,4,40,1.48992389339512
## P18,4,41,1.49115715622902
## P18,4,42,1.49159261158534
## P18,4,43,1.49036659814615
## P18,4,44,1.49451167766864
## P18,4,45,1.48477421580134
## P18,4,46,1.49694960003807
## P18,4,47,1.48547615645067
## P18,4,48,1.49114932939988
## P18,4,49,1.49179779291153
## P18,4,50,1.49358585664442
## P18,5,1,1.49581533963563
## P18,5,2,1.49162112072015
## P18,5,3,1.49167993297316
## P18,5,4,1.489664743473
## P18,5,5,1.49048494936815
## P18,5,6,1.49035715706208
## P18,5,7,1.48680735385324
## P18,5,8,1.49618896455255
## P18,5,9,1.49223954956253
## P18,5,10,1.49136768945373
## P18,5,11,1.4906130601775
## P18,5,12,1.48067808705707
## P18,5,13,1.49137991124933
## P18,5,14,1.49150162272983
## P18,5,15,1.49117798981843
## P18,5,16,1.49126055220927
## P18,5,17,1.49109269916147
## P18,5,18,1.49092938005924
## P18,5,19,1.49052942089918
## P18,5,20,1.49064489313074
## P18,5,21,1.49090975325629
## P18,5,22,1.48907514697029
## P18,5,23,1.49240457168733
## P18,5,24,1.49022200983814
## P18,5,25,1.49139414028246
## P18,5,26,1.4916490020266
## P18,5,27,1.48973919975926
## P18,5,28,1.49326417085936
## P18,5,29,1.49173684914907
## P18,5,30,1.49154903822475
## P18,5,31,1.49120504751145
## P18,5,32,1.4897179523436
## P18,5,33,1.49095445553932
## P18,5,34,1.49163843812169
## P18,5,35,1.49012397652242
## P18,5,36,1.49174548118345
## P18,5,37,1.49177433446396
## P18,5,38,1.48973858074879
## P18,5,39,1.49206767114652
## P18,5,40,1.4917905550254
## P18,5,41,1.49176270462746
## P18,5,42,1.49238138800269
## P18,5,43,1.4920433362325
## P18,5,44,1.48752892559225
## P18,5,45,1.49325787226359
## P18,5,46,1.49084003942984
## P18,5,47,1.4910030075998
## P18,5,48,1.49179466935091
## P18,5,49,1.4905905329853
## P18,5,50,1.49132173625153
## P18,6,1,1.49554236527461
## P18,6,2,1.49438913263005
## P18,6,3,1.49401139418284
## P18,6,4,1.4931174456063
## P18,6,5,1.49322343709176
## P18,6,6,1.4923891965733
## P18,6,7,1.49328057510031
## P18,6,8,1.49243248120332
## P18,6,9,1.49345698952675
## P18,6,10,1.49273218647126
## P18,6,11,1.49315985766324
## P18,6,12,1.4922216341093
## P18,6,13,1.49165618969844
## P18,6,14,1.49171736314125
## P18,6,15,1.49094150152551
## P18,6,16,1.49263612695988
## P18,6,17,1.49240714280063
## P18,6,18,1.49038103925503
## P18,6,19,1.49190563280907
## P18,6,20,1.49142073362302
## P18,6,21,1.4925829902772
## P18,6,22,1.49953093813426
## P18,6,23,1.48182647248619
## P18,6,24,1.49354199524764
## P18,6,25,1.49289949494179
## P18,6,26,1.4924081655649
## P18,6,27,1.49166133006414
## P18,6,28,1.4918833349505
## P18,6,29,1.49157965789407
## P18,6,30,1.49113482695359
## P18,6,31,1.49123653885006
## P18,6,32,1.49169448044923
## P18,6,33,1.49157486290767
## P18,6,34,1.49089189009233
## P18,6,35,1.49155784071537
## P18,6,36,1.49186645640005
## P18,6,37,1.49067927140456
## P18,6,38,1.49029088020325
## P18,6,39,1.49251967668533
## P18,6,40,1.49165384449176
## P18,6,41,1.4961508437048
## P18,6,42,1.48952225784757
## P18,6,43,1.49145120710838
## P18,6,44,1.49129570596586
## P18,6,45,1.49087429431177
## P18,6,46,1.49253326615477
## P18,6,47,1.48958670967504
## P18,6,48,1.49254201820918
## P18,6,49,1.49231219642303
## P18,6,50,1.49124087718938
## P18,7,1,1.4930410522681
## P18,7,2,1.49148045986071
## P18,7,3,1.49168008168538
## P18,7,4,1.49192199442122
## P18,7,5,1.49066225148864
## P18,7,6,1.49132996365644
## P18,7,7,1.49041677795294
## P18,7,8,1.49122531222601
## P18,7,9,1.49092950139727
## P18,7,10,1.49134482866452
## P18,7,11,1.49110522866249
## P18,7,12,1.49102232471997
## P18,7,13,1.49173446161201
## P18,7,14,1.4903157705284
## P18,7,15,1.49142668130515
## P18,7,16,1.49048264571062
## P18,7,17,1.49037617393162
## P18,7,18,1.49084723563421
## P18,7,19,1.4917237264616
## P18,7,20,1.49246597290039
## P18,7,21,1.48933338934137
## P18,7,22,1.49079668521881
## P18,7,23,1.49079612753857
## P18,7,24,1.49000578019225
## P18,7,25,1.49064309000969
## P18,7,26,1.49048216475381
## P18,7,27,1.49087280697293
## P18,7,28,1.49125547130613
## P18,7,29,1.49135350830415
## P18,7,30,1.49200092156728
## P18,7,31,1.49156297125467
## P18,7,32,1.49144424536289
## P18,7,33,1.49094652144377
## P18,7,34,1.49127622272657
## P18,7,35,1.49063094615936
## P18,7,36,1.49108690611074
## P18,7,37,1.49097322931095
## P18,7,38,1.49055226751276
## P18,7,39,1.49069290752559
## P18,7,40,1.49227167892456
## P18,7,41,1.49140278498332
## P18,7,42,1.49229376763105
## P18,7,43,1.49170031937413
## P18,7,44,1.49094448380798
## P18,7,45,1.49075612448212
## P18,7,46,1.49187451050061
## P18,7,47,1.49110830480402
## P18,7,48,1.49099465476142
## P18,7,49,1.49108170285637
## P18,7,50,1.49115397713401
## P18,8,1,1.49033941971628
## P18,8,2,1.49065403727924
## P18,8,3,1.49237927816864
## P18,8,4,1.49039012302052
## P18,8,5,1.49128952893344
## P18,8,6,1.49107947690146
## P18,8,7,1.49090603048151
## P18,8,8,1.49095938138873
## P18,8,9,1.49099720848931
## P18,8,10,1.49151478058253
## P18,8,11,1.49150424380954
## P18,8,12,1.49016401462985
## P18,8,13,1.49142623365971
## P18,8,14,1.49107246045713
## P18,8,15,1.49083777953838
## P18,8,16,1.49086922622589
## P18,8,17,1.49083399772644
## P18,8,18,1.49117601855417
## P18,8,19,1.49112472259741
## P18,8,20,1.49118464217227
## P18,8,21,1.48972298548772
## P18,8,22,1.49190909645774
## P18,8,23,1.49040962831817
## P18,8,24,1.49036693572998
## P18,8,25,1.49102197993885
## P18,8,26,1.49062982503919
## P18,8,27,1.49195802596308
## P18,8,28,1.49110919685774
## P18,8,29,1.49108243468624
## P18,8,30,1.49170692077536
## P18,8,31,1.49036035746554
## P18,8,32,1.48961745832384
## P18,8,33,1.49156004364728
## P18,8,34,1.49057766476517
## P18,8,35,1.49079313510802
## P18,8,36,1.49076553893416
## P18,8,37,1.49095634230994
## P18,8,38,1.49126709905164
## P18,8,39,1.49057110024508
## P18,8,40,1.49102083382579
## P18,8,41,1.4909599433511
## P18,8,42,1.49102831738336
## P18,8,43,1.490432653787
## P18,8,44,1.49226940130886
## P18,8,45,1.4911507678633
## P18,8,46,1.49236278023039
## P18,8,47,1.49102271975893
## P18,8,48,1.49210435207759
## P18,8,49,1.48805407516095
## P18,8,50,1.49116624580635
## P18,9,1,1.49110568414523
## P18,9,2,1.49208888484211
## P18,9,3,1.49121526502213
## P18,9,4,1.49044138452281
## P18,9,5,1.49137470626831
## P18,9,6,1.49093894061879
## P18,9,7,1.49054884645674
## P18,9,8,1.49092323575701
## P18,9,9,1.49122270309564
## P18,9,10,1.49102428930777
## P18,9,11,1.49114521690037
## P18,9,12,1.4904059318647
## P18,9,13,1.49093401754225
## P18,9,14,1.49119496647316
## P18,9,15,1.49188722024752
## P18,9,16,1.48939461390177
## P18,9,17,1.49108457966011
## P18,9,18,1.49011439273232
## P18,9,19,1.49092090606689
## P18,9,20,1.49117595744583
## P18,9,21,1.49152592023214
## P18,9,22,1.49055315508987
## P18,9,23,1.49067069235302
## P18,9,24,1.49026862780253
## P18,9,25,1.49030545251123
## P18,9,26,1.49044593041684
## P18,9,27,1.49197409998986
## P18,9,28,1.4914417477215
## P18,9,29,1.49027791619301
## P18,9,30,1.49030065536499
## P18,9,31,1.49142768138494
## P18,9,32,1.4904705286026
## P18,9,33,1.49071600930444
## P18,9,34,1.49116565642818
## P18,9,35,1.49069034795967
## P18,9,36,1.4933970151854
## P18,9,37,1.49169355028131
## P18,9,38,1.49113579591115
## P18,9,39,1.49075778585966
## P18,9,40,1.49068738097575
## P18,9,41,1.49118012984594
## P18,9,42,1.49065113067627
## P18,9,43,1.49115693569183
## P18,9,44,1.49113466739655
## P18,9,45,1.4899149743196
## P18,9,46,1.49101041441094
## P18,9,47,1.49099825006543
## P18,9,48,1.49108167071091
## P18,9,49,1.49092946800531
## P18,9,50,1.49064901500072
## P18,10,1,1.49111161269541
## P18,10,2,1.48944263458252
## P18,10,3,1.48914738877179
## P18,10,4,1.49133633053492
## P18,10,5,1.4909228076454
## P18,10,6,1.49139500252994
## P18,10,7,1.49032431042071
## P18,10,8,1.49042136510213
## P18,10,9,1.491461354333
## P18,10,10,1.49073310396565
## P18,10,11,1.48933374509215
## P18,10,12,1.49093768403337
## P18,10,13,1.49043648059552
## P18,10,14,1.4904608028691
## P18,10,15,1.49024569193522
## P18,10,16,1.49178900863185
## P18,10,17,1.49007732684796
## P18,10,18,1.4918490368387
## P18,10,19,1.49110242814729
## P18,10,20,1.49024289777909
## P18,10,21,1.49046194639137
## P18,10,22,1.49103235837185
## P18,10,23,1.49077123403549
## P18,10,24,1.49060253954645
## P18,10,25,1.49104038189197
## P18,10,26,1.49065230290095
## P18,10,27,1.49123929490979
## P18,10,28,1.49150301959064
## P18,10,29,1.49100879159304
## P18,10,30,1.49080717346885
## P18,10,31,1.49300408650594
## P18,10,32,1.49036854324919
## P18,10,33,1.49110847419792
## P18,10,34,1.49185783556192
## P18,10,35,1.49004153013229
## P18,10,36,1.49280931423237
## P18,10,37,1.49088897345201
## P18,10,38,1.490057819768
## P18,10,39,1.49077932458175
## P18,10,40,1.49187008539836
## P18,10,41,1.49068494243476
## P18,10,42,1.49104767535106
## P18,10,43,1.49132359757715
## P18,10,44,1.4913489896743
## P18,10,45,1.49064003006887
## P18,10,46,1.49058555888238
## P18,10,47,1.49093366337714
## P18,10,48,1.49046755851583
## P18,10,49,1.49158396831779
## P18,10,50,1.49095011172087
## P19,1,1,1.49159654756872
## P19,1,2,1.49034744898478
## P19,1,3,1.49239225503875
## P19,1,4,1.49040643567961
## P19,1,5,1.49276532846339
## P19,1,6,1.48927684930655
## P19,1,7,1.49529156559392
## P19,1,8,1.48946676756206
## P19,1,9,1.48862112102224
## P19,1,10,1.48615141837828
## P19,1,11,1.48939333045692
## P19,1,12,1.49900680118137
## P19,1,13,1.4882263019681
## P19,1,14,1.49234517998652
## P19,1,15,1.49197781363199
## P19,1,16,1.48994433149999
## P19,1,17,1.49125487463815
## P19,1,18,1.49234186576692
## P19,1,19,1.4932295768819
## P19,1,20,1.49035612323828
## P19,1,21,1.49392505946912
## P19,1,22,1.49502849011194
## P19,1,23,1.48410473198726
## P19,1,24,1.49125732694353
## P19,1,25,1.48993436729207
## P19,1,26,1.49625440204845
## P19,1,27,1.4906432912984
## P19,1,28,1.4919014270489
## P19,1,29,1.49135872721672
## P19,1,30,1.48785185813904
## P19,1,31,1.49326428147249
## P19,1,32,1.49082985818386
## P19,1,33,1.49276540897511
## P19,1,34,1.49599021589252
## P19,1,35,1.49095443443016
## P19,1,36,1.49063795004318
## P19,1,37,1.4910433239407
## P19,1,38,1.49228693757738
## P19,1,39,1.48996963500977
## P19,1,40,1.49088268377343
## P19,1,41,1.5016186097089
## P19,1,42,1.4925068508495
## P19,1,43,1.49100520557031
## P19,1,44,1.49143063812925
## P19,1,45,1.49064322245323
## P19,1,46,1.49025072894254
## P19,1,47,1.49254223879646
## P19,1,48,1.49407290553187
## P19,1,49,1.49218961466914
## P19,1,50,1.49167306573541
## P19,2,1,1.49330756264011
## P19,2,2,1.48898120424641
## P19,2,3,1.49145322117379
## P19,2,4,1.4914920276269
## P19,2,5,1.4925547606193
## P19,2,6,1.49290382628347
## P19,2,7,1.49175462907958
## P19,2,8,1.49091384566833
## P19,2,9,1.49192116301873
## P19,2,10,1.49187725042206
## P19,2,11,1.49479877572311
## P19,2,12,1.49134959755363
## P19,2,13,1.49172148833404
## P19,2,14,1.49273076312233
## P19,2,15,1.49177934277442
## P19,2,16,1.49137125733078
## P19,2,17,1.49189465840658
## P19,2,18,1.49162148485089
## P19,2,19,1.49138042355372
## P19,2,20,1.48956379925248
## P19,2,21,1.49170451132667
## P19,2,22,1.49079954469359
## P19,2,23,1.49243263478549
## P19,2,24,1.49005987399664
## P19,2,25,1.48824528016542
## P19,2,26,1.49274304984272
## P19,2,27,1.48984675274955
## P19,2,28,1.49189402627163
## P19,2,29,1.49200627253606
## P19,2,30,1.4921071880004
## P19,2,31,1.49216706482406
## P19,2,32,1.49071596842732
## P19,2,33,1.49250790652107
## P19,2,34,1.49085205915023
## P19,2,35,1.49133528470993
## P19,2,36,1.4928920313164
## P19,2,37,1.49110076558872
## P19,2,38,1.49062976938613
## P19,2,39,1.49141707022985
## P19,2,40,1.49115400454577
## P19,2,41,1.49256781118887
## P19,2,42,1.49093464730491
## P19,2,43,1.49106233288543
## P19,2,44,1.48994412864606
## P19,2,45,1.49047540007411
## P19,2,46,1.49108268641218
## P19,2,47,1.49158387397652
## P19,2,48,1.49104095907772
## P19,2,49,1.49352397835046
## P19,2,50,1.49149073395011
## P19,3,1,1.4910130281558
## P19,3,2,1.4912864378769
## P19,3,3,1.49091081908255
## P19,3,4,1.49153847733805
## P19,3,5,1.49136428704998
## P19,3,6,1.49113054690154
## P19,3,7,1.49234253633107
## P19,3,8,1.49103823686257
## P19,3,9,1.49129785635532
## P19,3,10,1.49157915773063
## P19,3,11,1.49193841814995
## P19,3,12,1.49074307275475
## P19,3,13,1.49219952768354
## P19,3,14,1.49232664403989
## P19,3,15,1.49116736429709
## P19,3,16,1.49106044676697
## P19,3,17,1.49161709301055
## P19,3,18,1.49110051926146
## P19,3,19,1.49074533529449
## P19,3,20,1.49478742499757
## P19,3,21,1.49263598409931
## P19,3,22,1.49069822856358
## P19,3,23,1.49215806882406
## P19,3,24,1.49174496948078
## P19,3,25,1.49493270084776
## P19,3,26,1.49196551105764
## P19,3,27,1.48783777500021
## P19,3,28,1.49235446556755
## P19,3,29,1.49147706615682
## P19,3,30,1.49404221534729
## P19,3,31,1.49256603504584
## P19,3,32,1.49106968773736
## P19,3,33,1.491655058675
## P19,3,34,1.49138842225075
## P19,3,35,1.49130208893578
## P19,3,36,1.49207592672772
## P19,3,37,1.49194965362549
## P19,3,38,1.49067493223808
## P19,3,39,1.49180404245853
## P19,3,40,1.4911961372082
## P19,3,41,1.48764327701769
## P19,3,42,1.4916479193646
## P19,3,43,1.49265816746926
## P19,3,44,1.4897634243143
## P19,3,45,1.49201467425324
## P19,3,46,1.48992339888615
## P19,3,47,1.49066963861155
## P19,3,48,1.49131810665131
## P19,3,49,1.49289977851034
## P19,3,50,1.49142836059727
## P19,4,1,1.49078504448263
## P19,4,2,1.49233239889145
## P19,4,3,1.49183232525745
## P19,4,4,1.49186295821887
## P19,4,5,1.48979619261506
## P19,4,6,1.49194419150259
## P19,4,7,1.48991466522217
## P19,4,8,1.49171293698824
## P19,4,9,1.49121221070437
## P19,4,10,1.49103561346082
## P19,4,11,1.49036630770055
## P19,4,12,1.49182646316394
## P19,4,13,1.49064715385437
## P19,4,14,1.49121036085972
## P19,4,15,1.49178839130562
## P19,4,16,1.49183719092553
## P19,4,17,1.49055331945419
## P19,4,18,1.48912240952019
## P19,4,19,1.49295745893966
## P19,4,20,1.49318260159986
## P19,4,21,1.49277794238218
## P19,4,22,1.49157970601862
## P19,4,23,1.49335791211609
## P19,4,24,1.49103986299955
## P19,4,25,1.49115800857544
## P19,4,26,1.49110820254342
## P19,4,27,1.49172504642342
## P19,4,28,1.49159045983817
## P19,4,29,1.49061593256499
## P19,4,30,1.49104006500805
## P19,4,31,1.49067309580812
## P19,4,32,1.49230893840635
## P19,4,33,1.49083757044664
## P19,4,34,1.49210856014625
## P19,4,35,1.49139365253833
## P19,4,36,1.49181677011343
## P19,4,37,1.49122401113095
## P19,4,38,1.49186087355894
## P19,4,39,1.49198680849218
## P19,4,40,1.490170655712
## P19,4,41,1.4919685632333
## P19,4,42,1.48857546488444
## P19,4,43,1.4923476477464
## P19,4,44,1.49134219532282
## P19,4,45,1.49189584595816
## P19,4,46,1.49207732484147
## P19,4,47,1.49108632405599
## P19,4,48,1.49214952222763
## P19,4,49,1.49401858647664
## P19,4,50,1.49094493543556
## P19,5,1,1.48909071872109
## P19,5,2,1.49232342243195
## P19,5,3,1.49165847437169
## P19,5,4,1.49095406663527
## P19,5,5,1.49110043599055
## P19,5,6,1.49148578229158
## P19,5,7,1.49160860860071
## P19,5,8,1.49185208694355
## P19,5,9,1.49126417656255
## P19,5,10,1.49217422658747
## P19,5,11,1.49038008848826
## P19,5,12,1.48952847102593
## P19,5,13,1.49212756448862
## P19,5,14,1.49146132336722
## P19,5,15,1.4912133540922
## P19,5,16,1.49231311949817
## P19,5,17,1.49115212758382
## P19,5,18,1.49189299901326
## P19,5,19,1.4910167498248
## P19,5,20,1.49159803041598
## P19,5,21,1.49115342140198
## P19,5,22,1.4912631150448
## P19,5,23,1.49180400705783
## P19,5,24,1.49128771963574
## P19,5,25,1.49162222325117
## P19,5,26,1.49147949320205
## P19,5,27,1.49033078087701
## P19,5,28,1.49197494105289
## P19,5,29,1.49102137135524
## P19,5,30,1.49235597940592
## P19,5,31,1.49101465702057
## P19,5,32,1.49108932358878
## P19,5,33,1.49202234972091
## P19,5,34,1.49116369088491
## P19,5,35,1.49176690072724
## P19,5,36,1.49160715218248
## P19,5,37,1.4913751262508
## P19,5,38,1.49134698764298
## P19,5,39,1.49173743702541
## P19,5,40,1.49155902862549
## P19,5,41,1.49216700112948
## P19,5,42,1.49136158914277
## P19,5,43,1.4926309299469
## P19,5,44,1.4916045646037
## P19,5,45,1.49132307370504
## P19,5,46,1.49194667556069
## P19,5,47,1.49094743402595
## P19,5,48,1.49126639988111
## P19,5,49,1.49191213515868
## P19,5,50,1.49157923109391
## P19,6,1,1.49485554315348
## P19,6,2,1.4937466107882
## P19,6,3,1.4937958858981
## P19,6,4,1.49405466349779
## P19,6,5,1.49370665452918
## P19,6,6,1.49337915137962
## P19,6,7,1.49285767718059
## P19,6,8,1.49329463640849
## P19,6,9,1.49273000914475
## P19,6,10,1.49342683104218
## P19,6,11,1.49260893491941
## P19,6,12,1.49325688546445
## P19,6,13,1.49274757634039
## P19,6,14,1.49338479683949
## P19,6,15,1.49400303098891
## P19,6,16,1.49247657401221
## P19,6,17,1.49318651511119
## P19,6,18,1.492860235819
## P19,6,19,1.49224499622023
## P19,6,20,1.49300460462217
## P19,6,21,1.49245520199046
## P19,6,22,1.49262457597451
## P19,6,23,1.49204466721722
## P19,6,24,1.4924196423711
## P19,6,25,1.49253904997413
## P19,6,26,1.49303192983974
## P19,6,27,1.49256658135799
## P19,6,28,1.49212933099398
## P19,6,29,1.49231928045099
## P19,6,30,1.49211832849603
## P19,6,31,1.49083436481536
## P19,6,32,1.49153315470769
## P19,6,33,1.49135071244733
## P19,6,34,1.49242123961449
## P19,6,35,1.49093839327494
## P19,6,36,1.49216064246925
## P19,6,37,1.4916617719433
## P19,6,38,1.49219517805138
## P19,6,39,1.49237798584832
## P19,6,40,1.49177366722631
## P19,6,41,1.492469897637
## P19,6,42,1.49142570380705
## P19,6,43,1.49170605187277
## P19,6,44,1.49243034635271
## P19,6,45,1.49161853934779
## P19,6,46,1.49146549701691
## P19,6,47,1.49034245575176
## P19,6,48,1.49201454024717
## P19,6,49,1.49248633066813
## P19,6,50,1.49179465864219
## P19,7,1,1.49226748425028
## P19,7,2,1.49203191369267
## P19,7,3,1.49087661993308
## P19,7,4,1.49219145468616
## P19,7,5,1.49174621701241
## P19,7,6,1.49142312350338
## P19,7,7,1.49174693281
## P19,7,8,1.49232312004165
## P19,7,9,1.49140522113213
## P19,7,10,1.49116116863186
## P19,7,11,1.49162698955071
## P19,7,12,1.49197175326171
## P19,7,13,1.49235374324924
## P19,7,14,1.49206808805466
## P19,7,15,1.49140254572818
## P19,7,16,1.4916478035942
## P19,7,17,1.49260485613788
## P19,7,18,1.49135457972686
## P19,7,19,1.49147545712665
## P19,7,20,1.49162530899048
## P19,7,21,1.49266971860613
## P19,7,22,1.49092420231212
## P19,7,23,1.48992904424667
## P19,7,24,1.49284822600228
## P19,7,25,1.49199900260338
## P19,7,26,1.49189147641582
## P19,7,27,1.49156025797129
## P19,7,28,1.49183740113911
## P19,7,29,1.49155135472616
## P19,7,30,1.49110261944757
## P19,7,31,1.49154822939918
## P19,7,32,1.49174108505249
## P19,7,33,1.49191707925698
## P19,7,34,1.49140826138583
## P19,7,35,1.49167658223046
## P19,7,36,1.49161965847015
## P19,7,37,1.49132124921109
## P19,7,38,1.49282487746208
## P19,7,39,1.49404958650178
## P19,7,40,1.4907975361265
## P19,7,41,1.49212323247859
## P19,7,42,1.49151365816101
## P19,7,43,1.49185355635714
## P19,7,44,1.4921446351444
## P19,7,45,1.49179091598048
## P19,7,46,1.49185509210104
## P19,7,47,1.49246687219854
## P19,7,48,1.49147779997005
## P19,7,49,1.49115376957392
## P19,7,50,1.49145683404562
## P19,8,1,1.49155990088858
## P19,8,2,1.49163899505348
## P19,8,3,1.49229214668274
## P19,8,4,1.4917036243107
## P19,8,5,1.49176828066508
## P19,8,6,1.49069945995624
## P19,8,7,1.49179684182872
## P19,8,8,1.49041073662894
## P19,8,9,1.49160716268751
## P19,8,10,1.49228315791865
## P19,8,11,1.4905939572294
## P19,8,12,1.49144744116162
## P19,8,13,1.49091774500333
## P19,8,14,1.49173094712052
## P19,8,15,1.49168255894454
## P19,8,16,1.49193944429096
## P19,8,17,1.4915679388268
## P19,8,18,1.4920211955905
## P19,8,19,1.49107269583077
## P19,8,20,1.49190597981215
## P19,8,21,1.49219563772094
## P19,8,22,1.49112897695497
## P19,8,23,1.49144329895844
## P19,8,24,1.49143710247306
## P19,8,25,1.49151930937896
## P19,8,26,1.49106292724609
## P19,8,27,1.49276093831138
## P19,8,28,1.4917757583387
## P19,8,29,1.49192217826843
## P19,8,30,1.49069521102038
## P19,8,31,1.49152981667292
## P19,8,32,1.49155852529738
## P19,8,33,1.49171133268447
## P19,8,34,1.49127381188529
## P19,8,35,1.49130987539524
## P19,8,36,1.49203059077263
## P19,8,37,1.49094126548296
## P19,8,38,1.49205290092217
## P19,8,39,1.49134715080261
## P19,8,40,1.49090853797065
## P19,8,41,1.4910839211707
## P19,8,42,1.49079269170761
## P19,8,43,1.49167897808018
## P19,8,44,1.49152046634305
## P19,8,45,1.49119468488191
## P19,8,46,1.49127860900459
## P19,8,47,1.49249270792758
## P19,8,48,1.49113357984103
## P19,8,49,1.49257882436117
## P19,8,50,1.49200518925985
## P19,9,1,1.49130947307005
## P19,9,2,1.4912207939408
## P19,9,3,1.49188626223597
## P19,9,4,1.49189468383789
## P19,9,5,1.49104880756802
## P19,9,6,1.49079175328099
## P19,9,7,1.49195828004317
## P19,9,8,1.49109675089518
## P19,9,9,1.4911593843679
## P19,9,10,1.49095900139112
## P19,9,11,1.49101260177091
## P19,9,12,1.49142482600261
## P19,9,13,1.49254211114377
## P19,9,14,1.49117625920118
## P19,9,15,1.4914016788953
## P19,9,16,1.49111083675833
## P19,9,17,1.49157407704522
## P19,9,18,1.49116216445791
## P19,9,19,1.49050510724386
## P19,9,20,1.49169909603455
## P19,9,21,1.49111638303663
## P19,9,22,1.4914401401173
## P19,9,23,1.49103515044503
## P19,9,24,1.49214633036468
## P19,9,25,1.49096879788807
## P19,9,26,1.49157627697649
## P19,9,27,1.49193070916569
## P19,9,28,1.49253233385758
## P19,9,29,1.49109352594134
## P19,9,30,1.49235715184893
## P19,9,31,1.49031065231146
## P19,9,32,1.49134577404369
## P19,9,33,1.49245614475674
## P19,9,34,1.4915775650426
## P19,9,35,1.49169025982127
## P19,9,36,1.49128754633778
## P19,9,37,1.49809244317068
## P19,9,38,1.49094225497956
## P19,9,39,1.49146032907877
## P19,9,40,1.49139715413578
## P19,9,41,1.49048938907561
## P19,9,42,1.49265483151311
## P19,9,43,1.49021497964859
## P19,9,44,1.49234493573507
## P19,9,45,1.4925023665795
## P19,9,46,1.49322255758139
## P19,9,47,1.49138668081263
## P19,9,48,1.49134401898635
## P19,9,49,1.49214308312599
## P19,9,50,1.49088733824924
## P19,10,1,1.4914589541299
## P19,10,2,1.49102270330182
## P19,10,3,1.49198583528107
## P19,10,4,1.49225799753032
## P19,10,5,1.49073622159869
## P19,10,6,1.49133911662632
## P19,10,7,1.4922661781311
## P19,10,8,1.49180395514877
## P19,10,9,1.49142130111393
## P19,10,10,1.49180636295052
## P19,10,11,1.49126891991527
## P19,10,12,1.49226201130794
## P19,10,13,1.49158382990274
## P19,10,14,1.49206162087711
## P19,10,15,1.49109535389118
## P19,10,16,1.48969549602932
## P19,10,17,1.49024089690178
## P19,10,18,1.49223861938868
## P19,10,19,1.49157274012663
## P19,10,20,1.49040026500307
## P19,10,21,1.48862465858459
## P19,10,22,1.49169705063105
## P19,10,23,1.49143550509498
## P19,10,24,1.49040882483773
## P19,10,25,1.49106440627784
## P19,10,26,1.49172140853574
## P19,10,27,1.49010375629772
## P19,10,28,1.49194032706103
## P19,10,29,1.49229241300512
## P19,10,30,1.49286359395736
## P19,10,31,1.49212318200331
## P19,10,32,1.49183484911919
## P19,10,33,1.49116231880936
## P19,10,34,1.49234797674067
## P19,10,35,1.49093653704669
## P19,10,36,1.49133986107847
## P19,10,37,1.4910789938534
## P19,10,38,1.49177195809104
## P19,10,39,1.49176071519437
## P19,10,40,1.49087746143341
## P19,10,41,1.49050245285034
## P19,10,42,1.4917471345547
## P19,10,43,1.49066580258883
## P19,10,44,1.4919446627299
## P19,10,45,1.49167356391748
## P19,10,46,1.49227179763138
## P19,10,47,1.49074593236891
## P19,10,48,1.49036238590876
## P19,10,49,1.49163758432543
## P19,10,50,1.4907959432018
## P20,1,1,1.49858181817191
## P20,1,2,1.49161471557617
## P20,1,3,1.49171507093641
## P20,1,4,1.48877741550577
## P20,1,5,1.4911413602531
## P20,1,6,1.49176472671761
## P20,1,7,1.49137128168537
## P20,1,8,1.4910612654897
## P20,1,9,1.49043094134722
## P20,1,10,1.49236472721758
## P20,1,11,1.49375224113464
## P20,1,12,1.49551185146793
## P20,1,13,1.48932629320995
## P20,1,14,1.49549738364884
## P20,1,15,1.48814524092325
## P20,1,16,1.49312929546132
## P20,1,17,1.49179311287709
## P20,1,18,1.49007648554715
## P20,1,19,1.49213925997416
## P20,1,20,1.4917960802714
## P20,1,21,1.48552077293396
## P20,1,22,1.49425838390986
## P20,1,23,1.48870143555758
## P20,1,24,1.489700211419
## P20,1,25,1.49995370864868
## P20,1,26,1.49003318377904
## P20,1,27,1.49375469707748
## P20,1,28,1.49003122698876
## P20,1,29,1.49527209455317
## P20,1,30,1.51393328499548
## P20,1,31,1.48996414976605
## P20,1,32,1.49550511012568
## P20,1,33,1.48682817336052
## P20,1,34,1.49798556474539
## P20,1,35,1.54697291254997
## P20,1,36,1.38689182300379
## P20,1,37,1.54838248159065
## P20,1,38,1.45287758059206
## P20,1,39,1.56671195030212
## P20,1,40,1.44859756363763
## P20,1,41,1.49558580451541
## P20,1,42,1.50329958674419
## P20,1,43,1.51922927446813
## P20,1,44,1.48955992062887
## P20,1,45,1.48546143678518
## P20,1,46,1.49312290407362
## P20,1,47,1.48644443224835
## P20,1,48,1.49240255355835
## P20,1,49,1.48382260203362
## P20,1,50,1.49213264387866
## P20,2,1,1.49830948842036
## P20,2,2,1.491895016871
## P20,2,3,1.48812120191513
## P20,2,4,1.49332297016198
## P20,2,5,1.49585549759142
## P20,2,6,1.49300435139583
## P20,2,7,1.49100432029137
## P20,2,8,1.48921746366164
## P20,2,9,1.49272607012493
## P20,2,10,1.49178573744638
## P20,2,11,1.49186242636988
## P20,2,12,1.49300780663123
## P20,2,13,1.48888676793952
## P20,2,14,1.48477643943695
## P20,2,15,1.49546599955786
## P20,2,16,1.491714057102
## P20,2,17,1.49121932422414
## P20,2,18,1.49154623055164
## P20,2,19,1.48016617894173
## P20,2,20,1.50029646214985
## P20,2,21,1.50156826410234
## P20,2,22,1.48845003102277
## P20,2,23,1.48960676193237
## P20,2,24,1.48959465920925
## P20,2,25,1.4897422171731
## P20,2,26,1.48988349186747
## P20,2,27,1.49207281142242
## P20,2,28,1.49115013568959
## P20,2,29,1.49398947735222
## P20,2,30,1.4905032716739
## P20,2,31,1.49418333414439
## P20,2,32,1.48881602968488
## P20,2,33,1.49484313964844
## P20,2,34,1.48915063882176
## P20,2,35,1.49803273545371
## P20,2,36,1.48502423956588
## P20,2,37,1.5103785878136
## P20,2,38,1.46818936702817
## P20,2,39,1.49557209014893
## P20,2,40,1.48015401546772
## P20,2,41,1.48964909331439
## P20,2,42,1.50947564161277
## P20,2,43,1.44264163374901
## P20,2,44,1.48600969158235
## P20,2,45,1.49220846068691
## P20,2,46,1.54757414923774
## P20,2,47,1.42722658830531
## P20,2,48,1.50885107669425
## P20,2,49,1.5082911599067
## P20,2,50,1.49038988057305
## P20,3,1,1.49733131408691
## P20,3,2,1.49116524725759
## P20,3,3,1.49073504178952
## P20,3,4,1.49386169693687
## P20,3,5,1.48896493605517
## P20,3,6,1.48937359723178
## P20,3,7,1.49273918293141
## P20,3,8,1.4909414866614
## P20,3,9,1.491171014372
## P20,3,10,1.49112167984548
## P20,3,11,1.49110007672697
## P20,3,12,1.49046646509415
## P20,3,13,1.49156823711119
## P20,3,14,1.49203088659989
## P20,3,15,1.4898291980519
## P20,3,16,1.49196583152617
## P20,3,17,1.49103433233469
## P20,3,18,1.4907263247172
## P20,3,19,1.49199839479783
## P20,3,20,1.49008472716611
## P20,3,21,1.49389028774118
## P20,3,22,1.4917098815952
## P20,3,23,1.49019920574462
## P20,3,24,1.49229771357316
## P20,3,25,1.49223218609889
## P20,3,26,1.49034353530053
## P20,3,27,1.49194187013974
## P20,3,28,1.49028903178954
## P20,3,29,1.49237457534971
## P20,3,30,1.49134435392406
## P20,3,31,1.48873829505813
## P20,3,32,1.4898763698536
## P20,3,33,1.48615095921052
## P20,3,34,1.48875317281606
## P20,3,35,1.4937372384248
## P20,3,36,1.49292837105361
## P20,3,37,1.4993849052954
## P20,3,38,1.49438731193542
## P20,3,39,1.49225178631869
## P20,3,40,1.48916726292304
## P20,3,41,1.48207033597506
## P20,3,42,1.49241512312609
## P20,3,43,1.49200741037146
## P20,3,44,1.49146224365753
## P20,3,45,1.4848054377702
## P20,3,46,1.49644882631618
## P20,3,47,1.4848305445451
## P20,3,48,1.49726784873653
## P20,3,49,1.49162771754021
## P20,3,50,1.49173634424411
## P20,4,1,1.49301474094391
## P20,4,2,1.49140128036218
## P20,4,3,1.48996620054369
## P20,4,4,1.49248022358167
## P20,4,5,1.49336480046367
## P20,4,6,1.48400912140355
## P20,4,7,1.49402436674858
## P20,4,8,1.49549325461527
## P20,4,9,1.48963735662579
## P20,4,10,1.49439048538938
## P20,4,11,1.49377312046466
## P20,4,12,1.48209469981447
## P20,4,13,1.49599091534687
## P20,4,14,1.50041862654556
## P20,4,15,1.49296329770769
## P20,4,16,1.49303144533959
## P20,4,17,1.49167345762253
## P20,4,18,1.51549646589491
## P20,4,19,1.49060469966824
## P20,4,20,1.50148850908646
## P20,4,21,1.48669231959752
## P20,4,22,1.48893181870623
## P20,4,23,1.49495662454648
## P20,4,24,1.49225653577971
## P20,4,25,1.49143520314643
## P20,4,26,1.49059793256944
## P20,4,27,1.48741044554599
## P20,4,28,1.49210186116397
## P20,4,29,1.49070576376112
## P20,4,30,1.49159086106428
## P20,4,31,1.49156084757173
## P20,4,32,1.49114297748951
## P20,4,33,1.49181048477752
## P20,4,34,1.4910194039932
## P20,4,35,1.48963382806671
## P20,4,36,1.49141970522263
## P20,4,37,1.49552075148839
## P20,4,38,1.49106596066402
## P20,4,39,1.49153810581833
## P20,4,40,1.49064388963365
## P20,4,41,1.49179527178333
## P20,4,42,1.49078010488873
## P20,4,43,1.49114508578118
## P20,4,44,1.49069003308757
## P20,4,45,1.48886860425199
## P20,4,46,1.49284948123975
## P20,4,47,1.49277163654394
## P20,4,48,1.49064973160461
## P20,4,49,1.49370314587246
## P20,4,50,1.49086336327308
## P20,5,1,1.49155786763067
## P20,5,2,1.49173126549556
## P20,5,3,1.49112532526401
## P20,5,4,1.4907435001211
## P20,5,5,1.49126287869045
## P20,5,6,1.49144905159272
## P20,5,7,1.49169084597857
## P20,5,8,1.49094950245117
## P20,5,9,1.49093324017812
## P20,5,10,1.4921324949586
## P20,5,11,1.48896533045275
## P20,5,12,1.4932662422894
## P20,5,13,1.49190086959511
## P20,5,14,1.49216738852059
## P20,5,15,1.49097283769049
## P20,5,16,1.49111333260169
## P20,5,17,1.49169751094735
## P20,5,18,1.49094946439876
## P20,5,19,1.49130443487753
## P20,5,20,1.49111234762107
## P20,5,21,1.49089411766298
## P20,5,22,1.4932261147251
## P20,5,23,1.49081302362647
## P20,5,24,1.48984804252783
## P20,5,25,1.49411698203673
## P20,5,26,1.49101287227566
## P20,5,27,1.4902802911298
## P20,5,28,1.49208803881298
## P20,5,29,1.48856182756095
## P20,5,30,1.48044117916836
## P20,5,31,1.50515793591011
## P20,5,32,1.49176610234272
## P20,5,33,1.491168989454
## P20,5,34,1.49193291634506
## P20,5,35,1.49236748316517
## P20,5,36,1.48865164285419
## P20,5,37,1.49231170902591
## P20,5,38,1.49205134709676
## P20,5,39,1.49177905104377
## P20,5,40,1.49166816653627
## P20,5,41,1.49145780443611
## P20,5,42,1.49199620558291
## P20,5,43,1.49209688216683
## P20,5,44,1.49088955587811
## P20,5,45,1.49243786254367
## P20,5,46,1.49090787627934
## P20,5,47,1.49121496142173
## P20,5,48,1.49338187180556
## P20,5,49,1.49078324981358
## P20,5,50,1.49116779020034
## P20,6,1,1.49212179116323
## P20,6,2,1.49263519528268
## P20,6,3,1.49235463628964
## P20,6,4,1.49214937388897
## P20,6,5,1.49230704988752
## P20,6,6,1.49232888221741
## P20,6,7,1.49170621969761
## P20,6,8,1.49173786152493
## P20,6,9,1.49209514417146
## P20,6,10,1.4922348736254
## P20,6,11,1.49147158763448
## P20,6,12,1.49141665949966
## P20,6,13,1.491516533494
## P20,6,14,1.49130424611709
## P20,6,15,1.49125909805298
## P20,6,16,1.49140801207389
## P20,6,17,1.49167198899352
## P20,6,18,1.49152479930357
## P20,6,19,1.49131494986044
## P20,6,20,1.49176293708183
## P20,6,21,1.49171864268291
## P20,6,22,1.49059075214824
## P20,6,23,1.49174614794114
## P20,6,24,1.4915853803472
## P20,6,25,1.48933211863041
## P20,6,26,1.4923806889042
## P20,6,27,1.49335812514936
## P20,6,28,1.49123930771079
## P20,6,29,1.49125500924573
## P20,6,30,1.49151708358942
## P20,6,31,1.49154192209244
## P20,6,32,1.48972691098849
## P20,6,33,1.49282483513474
## P20,6,34,1.48925783536206
## P20,6,35,1.49538957371431
## P20,6,36,1.49240950824452
## P20,6,37,1.49174402211163
## P20,6,38,1.49134028924478
## P20,6,39,1.49143691720634
## P20,6,40,1.49164704508429
## P20,6,41,1.4912746222514
## P20,6,42,1.49063203411718
## P20,6,43,1.4918199473239
## P20,6,44,1.49182505257386
## P20,6,45,1.49061291641984
## P20,6,46,1.49151094705781
## P20,6,47,1.49246345890893
## P20,6,48,1.49113406896591
## P20,6,49,1.49158211286903
## P20,6,50,1.49295749657315
## P20,7,1,1.49163915352388
## P20,7,2,1.4933588541471
## P20,7,3,1.49350779883716
## P20,7,4,1.48565387207529
## P20,7,5,1.49548763878601
## P20,7,6,1.49113311412487
## P20,7,7,1.49212407813501
## P20,7,8,1.4899321144791
## P20,7,9,1.49166284929408
## P20,7,10,1.48957080257182
## P20,7,11,1.49284753543419
## P20,7,12,1.49004695751916
## P20,7,13,1.49237569772972
## P20,7,14,1.48971861287167
## P20,7,15,1.49390761658952
## P20,7,16,1.48923454495425
## P20,7,17,1.47595547219
## P20,7,18,1.48924990955152
## P20,7,19,1.49175638070136
## P20,7,20,1.4920764906558
## P20,7,21,1.49261392737335
## P20,7,22,1.4973392668969
## P20,7,23,1.48815810269323
## P20,7,24,1.49350512874582
## P20,7,25,1.48993305649076
## P20,7,26,1.49213295041418
## P20,7,27,1.48994374423294
## P20,7,28,1.49305448703423
## P20,7,29,1.48678582489111
## P20,7,30,1.48779771079315
## P20,7,31,1.49759872116312
## P20,7,32,1.49148671674413
## P20,7,33,1.49132615548593
## P20,7,34,1.49122412905974
## P20,7,35,1.49078596631686
## P20,7,36,1.4911481741887
## P20,7,37,1.49083271085846
## P20,7,38,1.4914538774559
## P20,7,39,1.49075873196125
## P20,7,40,1.49108062382617
## P20,7,41,1.49130909870832
## P20,7,42,1.49139757272674
## P20,7,43,1.48977407020859
## P20,7,44,1.49160059188542
## P20,7,45,1.49198665926533
## P20,7,46,1.48341855728369
## P20,7,47,1.49860099156698
## P20,7,48,1.48776235272807
## P20,7,49,1.49123847564595
## P20,7,50,1.48926114991654
## P20,8,1,1.49176681041718
## P20,8,2,1.49140303710411
## P20,8,3,1.49099877190455
## P20,8,4,1.49091453307714
## P20,8,5,1.49120833728854
## P20,8,6,1.49116100415145
## P20,8,7,1.49239188565148
## P20,8,8,1.49133807230213
## P20,8,9,1.49154528900607
## P20,8,10,1.49175364420964
## P20,8,11,1.49168080499727
## P20,8,12,1.49147722909325
## P20,8,13,1.49173337961334
## P20,8,14,1.49114990861792
## P20,8,15,1.49145367779309
## P20,8,16,1.48816412389278
## P20,8,17,1.49481801929588
## P20,8,18,1.49250985894884
## P20,8,19,1.49127687134358
## P20,8,20,1.49130342717756
## P20,8,21,1.4913780067278
## P20,8,22,1.49131667781884
## P20,8,23,1.49136563270323
## P20,8,24,1.49096375353196
## P20,8,25,1.49185568166066
## P20,8,26,1.49100349589092
## P20,8,27,1.49165839172271
## P20,8,28,1.49039499015565
## P20,8,29,1.49165398189
## P20,8,30,1.49141079729254
## P20,8,31,1.49148100870519
## P20,8,32,1.48940955232454
## P20,8,33,1.49325646892671
## P20,8,34,1.49164870921397
## P20,8,35,1.4918485809775
## P20,8,36,1.49112825159646
## P20,8,37,1.49183048921473
## P20,8,38,1.49035755481595
## P20,8,39,1.49184001372165
## P20,8,40,1.49144963042377
## P20,8,41,1.49150974923672
## P20,8,42,1.49137893434388
## P20,8,43,1.49106458944777
## P20,8,44,1.49128305357556
## P20,8,45,1.49106413635177
## P20,8,46,1.49108232901647
## P20,8,47,1.49201381637389
## P20,8,48,1.49158582687378
## P20,8,49,1.49112196835605
## P20,8,50,1.49102215891733
## P20,9,1,1.49113349794592
## P20,9,2,1.49088575499398
## P20,9,3,1.49191067093297
## P20,9,4,1.49184468686581
## P20,9,5,1.49137579767328
## P20,9,6,1.49179292387433
## P20,9,7,1.48994221364645
## P20,9,8,1.49180562872636
## P20,9,9,1.49171211038317
## P20,9,10,1.49123784267541
## P20,9,11,1.48065994210439
## P20,9,12,1.49902428265276
## P20,9,13,1.49221900376407
## P20,9,14,1.49219628882735
## P20,9,15,1.4976790933048
## P20,9,16,1.51290385228283
## P20,9,17,1.47809198341872
## P20,9,18,1.4972211703276
## P20,9,19,1.49066700398082
## P20,9,20,1.49409971071806
## P20,9,21,1.492504554709
## P20,9,22,1.4885418985201
## P20,9,23,1.49389384227729
## P20,9,24,1.49106892994472
## P20,9,25,1.5001408915187
## P20,9,26,1.49302938249376
## P20,9,27,1.49310690130891
## P20,9,28,1.49333858764035
## P20,9,29,1.49094665128421
## P20,9,30,1.49097882270813
## P20,9,31,1.49123702730451
## P20,9,32,1.49131423924245
## P20,9,33,1.49130693973939
## P20,9,34,1.49034398166757
## P20,9,35,1.49116441715195
## P20,9,36,1.49121581656592
## P20,9,37,1.49151127717712
## P20,9,38,1.49176538194929
## P20,9,39,1.49135253893449
## P20,9,40,1.49135399134146
## P20,9,41,1.49101622680138
## P20,9,42,1.49247212245547
## P20,9,43,1.49087244139777
## P20,9,44,1.49206131319456
## P20,9,45,1.49120486139537
## P20,9,46,1.4913610458374
## P20,9,47,1.49166559654733
## P20,9,48,1.49166814140652
## P20,9,49,1.49159825983502
## P20,9,50,1.49143045406623
## P20,10,1,1.49234701176079
## P20,10,2,1.49164110456194
## P20,10,3,1.4918947925373
## P20,10,4,1.49028404474258
## P20,10,5,1.49145473052408
## P20,10,6,1.49162454005935
## P20,10,7,1.49169928324971
## P20,10,8,1.49077616419111
## P20,10,9,1.49149119853973
## P20,10,10,1.49140985598739
## P20,10,11,1.49141188338399
## P20,10,12,1.49320774452359
## P20,10,13,1.49009282873311
## P20,10,14,1.49237075577611
## P20,10,15,1.49027223668547
## P20,10,16,1.4914226363687
## P20,10,17,1.49127670288086
## P20,10,18,1.49113762695177
## P20,10,19,1.49026165390015
## P20,10,20,1.49224809468803
## P20,10,21,1.49170573858114
## P20,10,22,1.49011687166202
## P20,10,23,1.49163210757671
## P20,10,24,1.49144023827144
## P20,10,25,1.49024065696832
## P20,10,26,1.49065596763402
## P20,10,27,1.49148311822311
## P20,10,28,1.49103360840037
## P20,10,29,1.49171550821814
## P20,10,30,1.49149906313097
## P20,10,31,1.49186001439248
## P20,10,32,1.49187803606615
## P20,10,33,1.49176149434977
## P20,10,34,1.4907689747745
## P20,10,35,1.49176545266981
## P20,10,36,1.49137941142857
## P20,10,37,1.49181049993668
## P20,10,38,1.49063589821564
## P20,10,39,1.49089131794923
## P20,10,40,1.49133800057804
## P20,10,41,1.49214916569846
## P20,10,42,1.48547159963184
## P20,10,43,1.49316036253047
## P20,10,44,1.49222720626497
## P20,10,45,1.49042371297494
## P20,10,46,1.49214114121028
## P20,10,47,1.48756555434196
## P20,10,48,1.49260107676188
## P20,10,49,1.48980697443787
## P20,10,50,1.49131553942763
## P21,1,1,1.49020490890894
## P21,1,2,1.48077667293264
## P21,1,3,1.49399223652753
## P21,1,4,1.51825557787394
## P21,1,5,1.50327744691268
## P21,1,6,1.51280674067411
## P21,1,7,1.51295553147793
## P21,1,8,1.52255197718174
## P21,1,9,1.49111881509291
## P21,1,10,1.47463012735049
## P21,1,11,1.58019740581512
## P21,1,12,1.49442271853602
## P21,1,13,1.50389705833636
## P21,1,14,1.45373333351953
## P21,1,15,1.48395396923197
## P21,1,16,1.4450695514679
## P21,1,17,1.48641955410993
## P21,1,18,1.51710801654392
## P21,1,19,1.50021263448203
## P21,1,20,1.44576992094517
## P21,1,21,1.46813224343693
## P21,1,22,1.52030993424929
## P21,1,23,1.49581883652042
## P21,1,24,1.49098920822144
## P21,1,25,1.49740848216144
## P21,1,26,1.51399506462945
## P21,1,27,1.49719159499459
## P21,1,28,1.48225987211187
## P21,1,29,1.48064624527354
## P21,1,30,1.49517214739764
## P21,1,31,1.5039800453186
## P21,1,32,1.490334977044
## P21,1,33,1.50197897317275
## P21,1,34,1.498004870537
## P21,1,35,1.50383370062884
## P21,1,36,1.48306665881988
## P21,1,37,1.47677760124207
## P21,1,38,1.48587964950724
## P21,1,39,1.49505591392517
## P21,1,40,1.47242126626483
## P21,1,41,1.49241489171982
## P21,1,42,1.49514277956702
## P21,1,43,1.4583707704936
## P21,1,44,1.49481163798152
## P21,1,45,1.5442743581884
## P21,1,46,1.50637991953704
## P21,1,47,1.48697216887223
## P21,1,48,1.49377492341128
## P21,1,49,1.50091383457184
## P21,1,50,1.51303886545116
## P21,2,1,1.49154934793148
## P21,2,2,1.4843494386384
## P21,2,3,1.47242126793697
## P21,2,4,1.47255512384268
## P21,2,5,1.49389631549517
## P21,2,6,1.50076260237858
## P21,2,7,1.49599031691856
## P21,2,8,1.48382369508135
## P21,2,9,1.53325794054114
## P21,2,10,1.49534031839082
## P21,2,11,1.45950025060902
## P21,2,12,1.49019867181778
## P21,2,13,1.47877847644645
## P21,2,14,1.54030807813009
## P21,2,15,1.48986431530544
## P21,2,16,1.49224011441495
## P21,2,17,1.49993557589395
## P21,2,18,1.49137908142883
## P21,2,19,1.49243730894277
## P21,2,20,1.49728593372163
## P21,2,21,1.47581020066904
## P21,2,22,1.49431602498318
## P21,2,23,1.49512412914863
## P21,2,24,1.49338991962262
## P21,2,25,1.49351015090942
## P21,2,26,1.48713111877441
## Warning: There are no valid values for INTERVALS=27 in LISTP21[[2]]
## P21,2,28,1.4884753807171
## P21,2,29,1.51186315083908
## P21,2,30,1.48818826257137
## P21,2,31,1.49094748497009
## P21,2,32,1.49393056940149
## P21,2,33,1.48587079048157
## P21,2,34,1.47748090851475
## P21,2,35,1.51533177982677
## P21,2,36,1.53620237112045
## P21,2,37,1.48522205352783
## P21,2,38,1.48818858062165
## P21,2,39,1.47252886469771
## P21,2,40,1.49172855825985
## P21,2,41,1.5272808265686
## P21,2,42,1.48503348406623
## P21,2,43,1.48937192396684
## P21,2,44,1.5390145280859
## P21,2,45,1.48063679363417
## P21,2,46,1.49748601352467
## P21,2,47,1.45845750830639
## P21,2,48,1.47894361946318
## P21,2,49,1.49451564153035
## P21,2,50,1.48904802348163
## P21,3,1,1.49220534733364
## P21,3,2,1.49148547021966
## P21,3,3,1.49331128453634
## P21,3,4,1.49882626533508
## P21,3,5,1.5121917111533
## P21,3,6,1.49162988229231
## P21,3,7,1.48891973495483
## P21,3,8,1.49125073407147
## P21,3,9,1.49306102302985
## P21,3,10,1.4949679007897
## P21,3,11,1.4528477191925
## P21,3,12,1.5174629177366
## P21,3,13,1.49216744729451
## P21,3,14,1.48582584857941
## P21,3,15,1.48665910959244
## P21,3,16,1.49063991364979
## P21,3,17,1.51287690452907
## P21,3,18,1.52523317337036
## P21,3,19,1.49346519058401
## P21,3,20,1.45348670265891
## P21,3,21,1.49139145369171
## P21,3,22,1.485248002139
## P21,3,23,1.49468137599804
## P21,3,24,1.49107500278589
## P21,3,25,1.50178930253694
## P21,3,26,1.49318673246998
## P21,3,27,1.52545397191108
## P21,3,28,1.4919417886173
## P21,3,29,1.50330974541458
## P21,3,30,1.49235396532668
## P21,3,31,1.49353996312843
## P21,3,32,1.48745620493986
## P21,3,33,1.4796232968046
## P21,3,34,1.49915973507628
## P21,3,35,1.48279581899228
## P21,3,36,1.48922696378496
## P21,3,37,1.50612886206618
## P21,3,38,1.50115200624628
## P21,3,39,1.4823496570954
## P21,3,40,1.49322178959846
## P21,3,41,1.4556485073907
## P21,3,42,1.50502825642491
## P21,3,43,1.47610949758273
## P21,3,44,1.49563089745944
## P21,3,45,1.48057632446289
## P21,3,46,1.48940749322214
## P21,3,47,1.48629564472607
## P21,3,48,1.49805991814054
## P21,3,49,1.48183542734956
## P21,3,50,1.49535588200173
## P21,4,1,1.49329912557011
## P21,4,2,1.49259652385005
## P21,4,3,1.49147199094296
## P21,4,4,1.49214023237775
## P21,4,5,1.49050045885691
## P21,4,6,1.49193992163684
## P21,4,7,1.49099420760729
## P21,4,8,1.4902481788244
## P21,4,9,1.49197902267785
## P21,4,10,1.49131563980214
## P21,4,11,1.48915754851475
## P21,4,12,1.49069812380034
## P21,4,13,1.4921424258839
## P21,4,14,1.49180044951262
## P21,4,15,1.49276087696391
## P21,4,16,1.49611870086554
## P21,4,17,1.49188146326277
## P21,4,18,1.49165730442561
## P21,4,19,1.4911178820061
## P21,4,20,1.49157773747164
## P21,4,21,1.49148967759363
## P21,4,22,1.49242182846727
## P21,4,23,1.49402585174098
## P21,4,24,1.48939246716707
## P21,4,25,1.47994566591162
## P21,4,26,1.49733394810132
## P21,4,27,1.48981392092821
## P21,4,28,1.49170842647552
## P21,4,29,1.49163659881143
## P21,4,30,1.49009370803833
## P21,4,31,1.49169564955305
## P21,4,32,1.49159540646318
## P21,4,33,1.49209285001142
## P21,4,34,1.49196825588451
## P21,4,35,1.49503274117747
## P21,4,36,1.49062691508113
## P21,4,37,1.49055903780777
## P21,4,38,1.49113255280715
## P21,4,39,1.48935908877972
## P21,4,40,1.49119744749151
## P21,4,41,1.49161749904596
## P21,4,42,1.49112799962362
## P21,4,43,1.4917799169367
## P21,4,44,1.48998685153026
## P21,4,45,1.48716793060303
## P21,4,46,1.48930112657876
## P21,4,47,1.49208419573934
## P21,4,48,1.49230703895475
## P21,4,49,1.49017280264746
## P21,4,50,1.49304471435128
## P21,5,1,1.48846205711365
## P21,5,2,1.49163005410171
## P21,5,3,1.49168810688081
## P21,5,4,1.49177213617273
## P21,5,5,1.49331879004454
## P21,5,6,1.48637975345958
## P21,5,7,1.49199555601392
## P21,5,8,1.49049357123997
## P21,5,9,1.4906324910688
## P21,5,10,1.4908790466113
## P21,5,11,1.49030467605591
## P21,5,12,1.49354152679443
## P21,5,13,1.49173516318912
## P21,5,14,1.49288644703156
## P21,5,15,1.48913934826851
## P21,5,16,1.48818290074666
## P21,5,17,1.48753233828576
## P21,5,18,1.49071940508756
## P21,5,19,1.49147961890861
## P21,5,20,1.49104954979636
## P21,5,21,1.49231698399498
## P21,5,22,1.49160047179287
## P21,5,23,1.48774638889343
## P21,5,24,1.4932901487438
## P21,5,25,1.49127965927124
## P21,5,26,1.49096886056368
## P21,5,27,1.49104889019116
## P21,5,28,1.49116704199049
## P21,5,29,1.49129350230379
## P21,5,30,1.48797776601086
## P21,5,31,1.49397420883179
## P21,5,32,1.49144353223651
## P21,5,33,1.49156963560316
## P21,5,34,1.48991963940282
## P21,5,35,1.49225346078264
## P21,5,36,1.49169862443122
## P21,5,37,1.49054790472055
## P21,5,38,1.49201841707583
## P21,5,39,1.4908946624169
## P21,5,40,1.49020009427457
## P21,5,41,1.49083350499471
## P21,5,42,1.49023751531328
## P21,5,43,1.49006197269146
## P21,5,44,1.49154730637868
## P21,5,45,1.48737900965923
## P21,5,46,1.49138392039708
## P21,5,47,1.49209462895113
## P21,5,48,1.48602034968715
## P21,5,49,1.49344877347554
## P21,5,50,1.49144153594971
## P21,6,1,1.49328234754963
## P21,6,2,1.49350158921604
## P21,6,3,1.49273955588247
## P21,6,4,1.49300305048625
## P21,6,5,1.49313050092653
## P21,6,6,1.49278319567099
## P21,6,7,1.49254732827346
## P21,6,8,1.4932633638382
## P21,6,9,1.4938181390365
## P21,6,10,1.49307509370752
## P21,6,11,1.49058776066221
## P21,6,12,1.49354043249357
## P21,6,13,1.49108517337853
## P21,6,14,1.49319647891181
## P21,6,15,1.49232371790068
## P21,6,16,1.49833235740662
## P21,6,17,1.49297587725581
## P21,6,18,1.48316949605942
## P21,6,19,1.4910951506707
## P21,6,20,1.49419650350298
## P21,6,21,1.4941742550243
## P21,6,22,1.49240508874257
## P21,6,23,1.49113017634342
## P21,6,24,1.49205187650827
## P21,6,25,1.49170994354507
## P21,6,26,1.49266705614455
## P21,6,27,1.49255467727121
## P21,6,28,1.49090404808521
## P21,6,29,1.49254116541903
## P21,6,30,1.49237538591216
## P21,6,31,1.49517304018924
## P21,6,32,1.492206774652
## P21,6,33,1.49185499651679
## P21,6,34,1.49067220882494
## P21,6,35,1.49133460998535
## P21,6,36,1.49245362281799
## P21,6,37,1.49180972165075
## P21,6,38,1.49142583799951
## P21,6,39,1.49212173566426
## P21,6,40,1.49138216972351
## P21,6,41,1.49326840199922
## P21,6,42,1.49236883551387
## P21,6,43,1.49143453371727
## P21,6,44,1.49377618012605
## P21,6,45,1.49186251504081
## P21,6,46,1.48068252362703
## P21,6,47,1.49096466064453
## P21,6,48,1.493267837959
## P21,6,49,1.49104821341378
## P21,6,50,1.49171807689051
## P21,7,1,1.49025092124939
## P21,7,2,1.49225294022333
## P21,7,3,1.49126259485881
## P21,7,4,1.49153118507535
## P21,7,5,1.50753808702741
## P21,7,6,1.49065971916372
## P21,7,7,1.49311550458272
## P21,7,8,1.4911901520901
## P21,7,9,1.49268054962158
## P21,7,10,1.49173374665089
## P21,7,11,1.49363783294079
## P21,7,12,1.49182243195791
## P21,7,13,1.48958012220022
## P21,7,14,1.49209747180133
## P21,7,15,1.49156784716948
## P21,7,16,1.49357553890773
## P21,7,17,1.49318465732393
## P21,7,18,1.49110880876199
## P21,7,19,1.49143436175435
## P21,7,20,1.49205137553968
## P21,7,21,1.49230474810446
## P21,7,22,1.49136409053096
## P21,7,23,1.49274106252761
## Warning: There are no valid values for INTERVALS=24 in LISTP21[[7]]
## P21,7,25,1.4916765646501
## P21,7,26,1.54294204711914
## P21,7,27,1.49099106107439
## P21,7,28,1.49359587105838
## P21,7,29,1.49252434372902
## P21,7,30,1.49163096291678
## P21,7,31,1.49841391472589
## P21,7,32,1.50029492378235
## P21,7,33,1.49198964118958
## P21,7,34,1.49072173237801
## P21,7,35,1.49474997790355
## P21,7,36,1.47740049362183
## P21,7,37,1.48370629198411
## P21,7,38,1.49414249766957
## P21,7,39,1.49353830630963
## P21,7,40,1.49181589090599
## P21,7,41,1.49213728198299
## P21,7,42,1.49147227772495
## P21,7,43,1.49147698283195
## P21,7,44,1.49165260430538
## P21,7,45,1.50132712157997
## P21,7,46,1.48680478817708
## P21,7,47,1.49082687593275
## P21,7,48,1.4907112121582
## P21,7,49,1.49245269158307
## P21,7,50,1.49177691499157
## P21,8,1,1.49095513369586
## P21,8,2,1.49140883669441
## P21,8,3,1.4914665222168
## P21,8,4,1.49196660518646
## P21,8,5,1.49667536511141
## P21,8,6,1.49576862468276
## P21,8,7,1.49148741414991
## P21,8,8,1.49055629552797
## P21,8,9,1.4921220484234
## P21,8,10,1.49165178480602
## P21,8,11,1.49106706717075
## P21,8,12,1.49016340970993
## P21,8,13,1.49197523682206
## P21,8,14,1.49256185456818
## P21,8,15,1.51100708378686
## P21,8,16,1.49423035708341
## P21,8,17,1.48879465006166
## P21,8,18,1.49156737327576
## P21,8,19,1.49275625669039
## P21,8,20,1.48393897712231
## P21,8,21,1.49460890486434
## P21,8,22,1.49052122235298
## P21,8,23,1.49063837528229
## P21,8,24,1.49071417116139
## P21,8,25,1.49078200227123
## P21,8,26,1.50489095846812
## P21,8,27,1.52960844039917
## P21,8,28,1.48941801144527
## P21,8,29,1.47791934013367
## P21,8,30,1.49896993637085
## P21,8,31,1.48357858802333
## P21,8,32,1.51426315307617
## P21,8,33,1.49080329105772
## P21,8,34,1.49653535178213
## P21,8,35,1.49582603573799
## P21,8,36,1.49067194678567
## P21,8,37,1.49089719772339
## P21,8,38,1.49025807729582
## P21,8,39,1.49118910895454
## P21,8,40,1.49037396035543
## P21,8,41,1.49132594267527
## P21,8,42,1.49132706206522
## P21,8,43,1.49055065427508
## P21,8,44,1.49161808074467
## P21,8,45,1.49112005891471
## P21,8,46,1.48659565232017
## P21,8,47,1.4949197769165
## P21,8,48,1.49631701575385
## P21,8,49,1.49056545893351
## P21,8,50,1.491577816732
## P21,9,1,1.49176202649656
## P21,9,2,1.49228135575639
## P21,9,3,1.49449459711711
## P21,9,4,1.4979198773702
## P21,9,5,1.48804473876953
## P21,9,6,1.49027299880981
## P21,9,7,1.48952496679206
## P21,9,8,1.49236006963821
## P21,9,9,1.49130234426382
## P21,9,10,1.4917796421051
## P21,9,11,1.49162379105886
## P21,9,12,1.49193414421969
## P21,9,13,1.49206846100943
## P21,9,14,1.49134883880615
## P21,9,15,1.4906259732074
## P21,9,16,1.45278564095497
## P21,9,17,1.48126848812761
## P21,9,18,1.48903503784767
## P21,9,19,1.49322833120823
## P21,9,20,1.49241623813159
## P21,9,21,1.49060407232066
## P21,9,22,1.49115773609706
## P21,9,23,1.49096134636137
## P21,9,24,1.49365273388949
## P21,9,25,1.47874076025827
## P21,9,26,1.49401813142755
## P21,9,27,1.49030300776164
## Warning: There are no valid values for INTERVALS=28 in LISTP21[[9]]
## P21,9,29,1.49221129644485
## P21,9,30,1.48716958363851
## P21,9,31,1.4933211442196
## P21,9,32,1.49167269032176
## P21,9,33,1.49175302910082
## P21,9,34,1.4943119739664
## P21,9,35,1.48879461765289
## P21,9,36,1.48145575301592
## P21,9,37,1.48693251609802
## P21,9,38,1.49150098562241
## P21,9,39,1.49113840609789
## P21,9,40,1.49133632801197
## P21,9,41,1.49213019588537
## P21,9,42,1.49037462234497
## P21,9,43,1.48959707444714
## P21,9,44,1.49200300943284
## P21,9,45,1.48946194581583
## P21,9,46,1.49185023837619
## P21,9,47,1.48704469203949
## P21,9,48,1.48929460120924
## P21,9,49,1.48999265829722
## P21,9,50,1.49368009964625
## P21,10,1,1.49240206927061
## P21,10,2,1.48967745900154
## P21,10,3,1.49118213653564
## P21,10,4,1.48876728117466
## P21,10,5,1.47250433401628
## Warning: There are no valid values for INTERVALS=6 in LISTP21[[10]]
## P21,10,7,1.49188146326277
## P21,10,8,1.49129467010498
## P21,10,9,1.48995714187622
## P21,10,10,1.49314077083881
## P21,10,11,1.49176266027051
## P21,10,12,1.49129836699542
## P21,10,13,1.49128053265233
## P21,10,14,1.48928793839046
## P21,10,15,1.49010985830556
## P21,10,16,1.49092412846429
## P21,10,17,1.50101372328672
## P21,10,18,1.49249527778155
## P21,10,19,1.49382592737675
## P21,10,20,1.490163397789
## P21,10,21,1.49096133708954
## P21,10,22,1.49466345310211
## P21,10,23,1.49266962707043
## P21,10,24,1.49334879179259
## P21,10,25,1.50097007751465
## P21,10,26,1.49056646098261
## P21,10,27,1.49333246170528
## P21,10,28,1.49031337102254
## P21,10,29,1.49070297876994
## P21,10,30,1.49231155498608
## P21,10,31,1.49129464076116
## P21,10,32,1.49087137525732
## P21,10,33,1.49310081832263
## P21,10,34,1.49099056756319
## P21,10,35,1.48483325695169
## P21,10,36,1.49613983154297
## P21,10,37,1.49660488128662
## P21,10,38,1.49164691838351
## P21,10,39,1.49053361836602
## P21,10,40,1.49082089239551
## P21,10,41,1.49055950520402
## P21,10,42,1.49231254486811
## P21,10,43,1.48964873949687
## P21,10,44,1.49281384394719
## P21,10,45,1.49418586339706
## P21,10,46,1.48812994142858
## P21,10,47,1.49709575459109
## P21,10,48,1.4892069643194
## P21,10,49,1.49152958804163
## P21,10,50,1.49129636320349
## P22,1,1,1.48786129068445
## P22,1,2,1.50827791335735
## P22,1,3,1.51215199374278
## P22,1,4,1.48127516023405
## P22,1,5,1.49271323991858
## P22,1,6,1.48815157557979
## P22,1,7,1.49087888316104
## P22,1,8,1.49573987257396
## P22,1,9,1.51445918247618
## P22,1,10,1.50584782710692
## P22,1,11,1.50063355267048
## P22,1,12,1.48548833727837
## P22,1,13,1.46258143455751
## P22,1,14,1.5095319964669
## P22,1,15,1.4891632991501
## P22,1,16,1.49216970255677
## P22,1,17,1.49184911533938
## P22,1,18,1.4918838430334
## P22,1,19,1.49900906156785
## P22,1,20,1.49693300610497
## P22,1,21,1.48831979366912
## P22,1,22,1.50695480184352
## P22,1,23,1.48332126935323
## P22,1,24,1.4979563554128
## P22,1,25,1.4903175005546
## P22,1,26,1.50899153006704
## P22,1,27,1.49488275129716
## P22,1,28,1.49554188420453
## P22,1,29,1.4897380065918
## P22,1,30,1.49371386135326
## P22,1,31,1.49548406733407
## P22,1,32,1.49584499211379
## P22,1,33,1.48519387477782
## P22,1,34,1.52426230112712
## P22,1,35,1.49658901551191
## P22,1,36,1.49340724945068
## P22,1,37,1.49267892225073
## P22,1,38,1.49080660797301
## P22,1,39,1.48804620024446
## P22,1,40,1.48673959025021
## P22,1,41,1.50778620877712
## P22,1,42,1.49008335386004
## P22,1,43,1.48488597559735
## P22,1,44,1.49106515687087
## P22,1,45,1.49556043473157
## P22,1,46,1.49283989270528
## P22,1,47,1.48428515533903
## P22,1,48,1.50212831850405
## P22,1,49,1.49107974872254
## P22,1,50,1.48617873794731
## P22,2,1,1.49083888214246
## P22,2,2,1.4876587121383
## P22,2,3,1.4905660956569
## P22,2,4,1.48971340315683
## P22,2,5,1.49060986524711
## P22,2,6,1.49390625953674
## P22,2,7,1.49337413621985
## P22,2,8,1.49255453859057
## P22,2,9,1.49401521682739
## P22,2,10,1.48408684422893
## P22,2,11,1.48960189730208
## P22,2,12,1.48767305745019
## P22,2,13,1.47586068020591
## P22,2,14,1.49156772462945
## P22,2,15,1.49031295219477
## P22,2,16,1.49307955909021
## P22,2,17,1.49063663373048
## P22,2,18,1.49130105564737
## P22,2,19,1.49079468544949
## P22,2,20,1.48555918782949
## P22,2,21,1.49401211582757
## P22,2,22,1.49239741478648
## P22,2,23,1.49685921999488
## P22,2,24,1.51766558069932
## P22,2,25,1.48463673669784
## P22,2,26,1.48969418394799
## P22,2,27,1.49222854656332
## P22,2,28,1.49520878125263
## P22,2,29,1.49345838373358
## P22,2,30,1.48534843839448
## P22,2,31,1.47678534396283
## P22,2,32,1.49859391021729
## P22,2,33,1.48837361907959
## P22,2,34,1.48811531806177
## P22,2,35,1.49225225448608
## P22,2,36,1.4915143985941
## P22,2,37,1.49411012165582
## P22,2,38,1.49155749106894
## P22,2,39,1.47724339851113
## P22,2,40,1.48839419575061
## P22,2,41,1.4885650231288
## P22,2,42,1.49638414783638
## P22,2,43,1.49630137781302
## P22,2,44,1.48945084959269
## P22,2,45,1.5084530418202
## P22,2,46,1.4983090914733
## P22,2,47,1.49133552954747
## P22,2,48,1.49086055090261
## P22,2,49,1.49130641151877
## P22,2,50,1.49061056999933
## P22,3,1,1.49113446558026
## P22,3,2,1.49196166846588
## P22,3,3,1.49093417153842
## P22,3,4,1.49293488302049
## P22,3,5,1.48901662826538
## P22,3,6,1.49078925105109
## P22,3,7,1.49365981701201
## P22,3,8,1.4905951796778
## P22,3,9,1.48871079644004
## P22,3,10,1.49287060387114
## P22,3,11,1.49245213579248
## P22,3,12,1.49297549894878
## P22,3,13,1.48913360046128
## P22,3,14,1.49018920958042
## P22,3,15,1.49113782246908
## P22,3,16,1.49137856619699
## P22,3,17,1.49251162304598
## P22,3,18,1.4872371699359
## P22,3,19,1.49435966748458
## P22,3,20,1.49108700191273
## P22,3,21,1.48974847793579
## P22,3,22,1.49221362294378
## P22,3,23,1.49004634439129
## P22,3,24,1.49257126260311
## P22,3,25,1.49056578301764
## P22,3,26,1.49272531933255
## P22,3,27,1.49137532326483
## P22,3,28,1.49254264831543
## P22,3,29,1.49108516847765
## P22,3,30,1.49298641416762
## P22,3,31,1.48945973954111
## P22,3,32,1.50200105357814
## P22,3,33,1.49112931031447
## P22,3,34,1.49160044009869
## P22,3,35,1.49020014739618
## P22,3,36,1.49311267593761
## P22,3,37,1.49170541763306
## P22,3,38,1.49759595624862
## P22,3,39,1.48416672812568
## P22,3,40,1.49034561051263
## P22,3,41,1.47291912635167
## P22,3,42,1.49551982879639
## P22,3,43,1.48192300115313
## P22,3,44,1.5037258368272
## P22,3,45,1.47648177363656
## P22,3,46,1.49075708389282
## P22,3,47,1.48859728010077
## P22,3,48,1.49062623148379
## P22,3,49,1.4983314304817
## P22,3,50,1.49101781046638
## P22,4,1,1.49099170125049
## P22,4,2,1.49109719276428
## P22,4,3,1.49152287771535
## P22,4,4,1.49137554086488
## P22,4,5,1.49042427392653
## P22,4,6,1.49047518438763
## P22,4,7,1.48826680801533
## P22,4,8,1.47920308241973
## P22,4,9,1.49265235587011
## P22,4,10,1.48791457176208
## P22,4,11,1.48739970248678
## P22,4,12,1.48952519628737
## P22,4,13,1.49266156424647
## P22,4,14,1.49212702890722
## P22,4,15,1.49119666489688
## P22,4,16,1.48683954874674
## P22,4,17,1.49555629613448
## P22,4,18,1.48854460035052
## P22,4,19,1.48811742948449
## P22,4,20,1.49374268849691
## P22,4,21,1.49518181526498
## P22,4,22,1.4904475997476
## P22,4,23,1.49241550429528
## P22,4,24,1.49071002775623
## P22,4,25,1.50175854563713
## P22,4,26,1.49238990653645
## P22,4,27,1.48944655931913
## P22,4,28,1.49054647854396
## P22,4,29,1.49285883169908
## P22,4,30,1.49224893645485
## P22,4,31,1.48952299871562
## P22,4,32,1.48894382496269
## P22,4,33,1.48821632789843
## P22,4,34,1.49009531359129
## P22,4,35,1.49146515672857
## P22,4,36,1.49214614414778
## P22,4,37,1.49392533302307
## P22,4,38,1.49729382058849
## P22,4,39,1.49142878705805
## P22,4,40,1.48973158546116
## P22,4,41,1.49197852611542
## P22,4,42,1.48826871047149
## P22,4,43,1.49029468536377
## P22,4,44,1.51680885893958
## P22,4,45,1.47817662984383
## P22,4,46,1.49030486020175
## P22,4,47,1.49607569211489
## P22,4,48,1.49271661043167
## P22,4,49,1.49178405505855
## P22,4,50,1.48786034910646
## P22,5,1,1.49090682680362
## P22,5,2,1.49145674705505
## P22,5,3,1.49132313294844
## P22,5,4,1.49113367543076
## P22,5,5,1.49273893662861
## P22,5,6,1.4927560488383
## P22,5,7,1.49252120186301
## P22,5,8,1.48750784817864
## P22,5,9,1.49059500296911
## P22,5,10,1.48770585958508
## P22,5,11,1.4922093763584
## P22,5,12,1.48857851351722
## P22,5,13,1.49434564881406
## P22,5,14,1.48784524579591
## P22,5,15,1.49141309135839
## P22,5,16,1.48903255052464
## P22,5,17,1.49229169473415
## P22,5,18,1.4923732225285
## P22,5,19,1.49153063330852
## P22,5,20,1.48823210867968
## P22,5,21,1.48985708676852
## P22,5,22,1.49173767426435
## P22,5,23,1.48907633681795
## P22,5,24,1.49043630758921
## P22,5,25,1.48588636943272
## P22,5,26,1.4905465029288
## P22,5,27,1.49111773750999
## P22,5,28,1.49177444947732
## P22,5,29,1.48898214101791
## P22,5,30,1.49088619395
## P22,5,31,1.48926290825232
## P22,5,32,1.48988108322999
## P22,5,33,1.49602085986036
## P22,5,34,1.49104780056438
## P22,5,35,1.49077212810516
## P22,5,36,1.48834566403461
## P22,5,37,1.4920175490172
## P22,5,38,1.49090347760989
## P22,5,39,1.48993684053421
## P22,5,40,1.49219751358032
## P22,5,41,1.49966991588634
## P22,5,42,1.49112898044372
## P22,5,43,1.49136229923793
## P22,5,44,1.4918270111084
## P22,5,45,1.48998737004068
## P22,5,46,1.49214970270793
## P22,5,47,1.49145916052032
## P22,5,48,1.49305877256929
## P22,5,49,1.49156032158778
## P22,5,50,1.49059978653403
## P22,6,1,1.49496944511638
## P22,6,2,1.49033828951278
## P22,6,3,1.49152428276685
## P22,6,4,1.49143527448177
## P22,6,5,1.48849612839368
## P22,6,6,1.49302217759282
## P22,6,7,1.49037591616313
## P22,6,8,1.49313657473674
## P22,6,9,1.49207592711729
## P22,6,10,1.49135414142053
## P22,6,11,1.49500418524457
## P22,6,12,1.48962111259574
## P22,6,13,1.49143595424125
## P22,6,14,1.49149230218703
## P22,6,15,1.49166329539552
## P22,6,16,1.49210311220838
## P22,6,17,1.48925973648249
## P22,6,18,1.48889267855677
## P22,6,19,1.49298388439676
## P22,6,20,1.49829686433077
## P22,6,21,1.48966221014659
## P22,6,22,1.49444782977201
## P22,6,23,1.49118132273356
## P22,6,24,1.49222636540731
## P22,6,25,1.48976306544924
## P22,6,26,1.4961873485196
## P22,6,27,1.49127262713862
## P22,6,28,1.49082326889038
## P22,6,29,1.49240187236241
## P22,6,30,1.47902056537097
## P22,6,31,1.4920095577836
## P22,6,32,1.4916503646157
## P22,6,33,1.48667880046515
## P22,6,34,1.49434183906106
## P22,6,35,1.48610887527466
## P22,6,36,1.48825902938843
## P22,6,37,1.49356706175086
## P22,6,38,1.49539457483495
## P22,6,39,1.49206600797937
## P22,6,40,1.49664909640948
## P22,6,41,1.50059641108793
## P22,6,42,1.48961909969201
## P22,6,43,1.49197741655203
## P22,6,44,1.48370071557852
## P22,6,45,1.48811056878832
## P22,6,46,1.4930251133011
## P22,6,47,1.49142320496695
## P22,6,48,1.48007033087991
## P22,6,49,1.49213025444432
## P22,6,50,1.49470687698532
## P22,7,1,1.49091361795814
## P22,7,2,1.49078816872138
## P22,7,3,1.4909278848669
## P22,7,4,1.4900203678343
## P22,7,5,1.4903791392291
## P22,7,6,1.49129608544436
## P22,7,7,1.49000220928552
## P22,7,8,1.49166098884914
## P22,7,9,1.49211075620831
## P22,7,10,1.49107670172667
## P22,7,11,1.49334043409766
## P22,7,12,1.49098594983419
## P22,7,13,1.49079704284668
## P22,7,14,1.49105602322203
## P22,7,15,1.49125302784027
## P22,7,16,1.49448498435642
## P22,7,17,1.49023351669312
## P22,7,18,1.49137385686239
## P22,7,19,1.490597397089
## P22,7,20,1.49257489730572
## P22,7,21,1.48993272212014
## P22,7,22,1.49097820038491
## P22,7,23,1.49016295750936
## P22,7,24,1.49195201643582
## P22,7,25,1.49075228480969
## P22,7,26,1.49244148731232
## P22,7,27,1.49033972474395
## P22,7,28,1.49041968700933
## P22,7,29,1.48939190970527
## P22,7,30,1.49155270799677
## P22,7,31,1.49030389283833
## P22,7,32,1.49013651118559
## P22,7,33,1.49216203689575
## P22,7,34,1.49092280864716
## P22,7,35,1.4934810201327
## P22,7,36,1.49157791721578
## P22,7,37,1.48704945339876
## P22,7,38,1.49223102775275
## P22,7,39,1.49137281179428
## P22,7,40,1.49187910556793
## P22,7,41,1.48961476581853
## P22,7,42,1.49066642614511
## P22,7,43,1.49155822315732
## P22,7,44,1.4932077863942
## P22,7,45,1.49123843510946
## P22,7,46,1.49222882877697
## P22,7,47,1.49169166023667
## P22,7,48,1.49128819008668
## P22,7,49,1.49101210137208
## P22,7,50,1.49181068750252
## P22,8,1,1.49112801168157
## P22,8,2,1.49248912599352
## P22,8,3,1.49274346155998
## P22,8,4,1.49066584760493
## P22,8,5,1.49148652105048
## P22,8,6,1.49135872033926
## P22,8,7,1.49123877357034
## P22,8,8,1.49061734459617
## P22,8,9,1.49133191210158
## P22,8,10,1.49231829733219
## P22,8,11,1.49180091619492
## P22,8,12,1.49053614247929
## P22,8,13,1.49240583843655
## P22,8,14,1.49131706433418
## P22,8,15,1.49175299538506
## P22,8,16,1.49134783034629
## P22,8,17,1.49135881815201
## P22,8,18,1.49253816771926
## P22,8,19,1.49137651352655
## P22,8,20,1.49076503818318
## P22,8,21,1.49308357567623
## P22,8,22,1.49131645672563
## P22,8,23,1.49158945368297
## P22,8,24,1.49135718175343
## P22,8,25,1.49126625061035
## P22,8,26,1.4911171387935
## P22,8,27,1.49122196977789
## P22,8,28,1.49013555411137
## P22,8,29,1.49057388924933
## P22,8,30,1.49074962527253
## P22,8,31,1.49101926512637
## P22,8,32,1.48983574566776
## P22,8,33,1.4933045611662
## P22,8,34,1.49080523525376
## P22,8,35,1.49219148746435
## P22,8,36,1.49044312536716
## P22,8,37,1.49146317399066
## P22,8,38,1.48977400835823
## P22,8,39,1.49199073379104
## P22,8,40,1.48968597080397
## P22,8,41,1.4915696978569
## P22,8,42,1.49164395472583
## P22,8,43,1.49133704319473
## P22,8,44,1.4919482573219
## P22,8,45,1.4911685383648
## P22,8,46,1.49168371667667
## P22,8,47,1.49111531091773
## P22,8,48,1.49228950341543
## P22,8,49,1.49141119294247
## P22,8,50,1.49132793321522
## P22,9,1,1.49099690072677
## P22,9,2,1.49083688855171
## P22,9,3,1.49188889542671
## P22,9,4,1.49145632776721
## P22,9,5,1.49029465843649
## P22,9,6,1.490557427309
## P22,9,7,1.49217865296773
## P22,9,8,1.48982920144734
## P22,9,9,1.48999431535795
## P22,9,10,1.48914151191711
## P22,9,11,1.49219315052032
## P22,9,12,1.49083245077799
## P22,9,13,1.48998675522981
## P22,9,14,1.49239430807333
## P22,9,15,1.49249706770244
## P22,9,16,1.49060443518818
## P22,9,17,1.48985712017332
## P22,9,18,1.49242860930307
## P22,9,19,1.488625004178
## P22,9,20,1.49180632968282
## P22,9,21,1.490782783145
## P22,9,22,1.49203250466323
## P22,9,23,1.48991196705745
## P22,9,24,1.49178080606942
## P22,9,25,1.49043401082357
## P22,9,26,1.49158359103733
## P22,9,27,1.49226570820463
## P22,9,28,1.4914653766446
## P22,9,29,1.49207886782559
## P22,9,30,1.49093299723686
## P22,9,31,1.49044123996388
## P22,9,32,1.49196525522181
## P22,9,33,1.49290919303894
## P22,9,34,1.49213281224986
## P22,9,35,1.4914383532396
## P22,9,36,1.49209736755916
## P22,9,37,1.49076341787974
## P22,9,38,1.49060652428067
## P22,9,39,1.49032825498439
## P22,9,40,1.49160552024841
## P22,9,41,1.49172088986351
## P22,9,42,1.49210591519133
## P22,9,43,1.48857678789081
## P22,9,44,1.4939843416214
## P22,9,45,1.4907397883279
## P22,9,46,1.49065655885741
## P22,9,47,1.49230788524886
## P22,9,48,1.48911384173802
## P22,9,49,1.49218348026276
## P22,9,50,1.49183941275124
## P22,10,1,1.49118488971318
## P22,10,2,1.49345370701381
## P22,10,3,1.49057287554587
## P22,10,4,1.48845351752588
## P22,10,5,1.49350120082046
## P22,10,6,1.4895544052124
## P22,10,7,1.49097162717349
## P22,10,8,1.4916106528706
## P22,10,9,1.4914829466078
## P22,10,10,1.49258417832224
## P22,10,11,1.49111271964179
## P22,10,12,1.49289895428552
## P22,10,13,1.49226538091898
## P22,10,14,1.49238346625065
## P22,10,15,1.49112757910853
## P22,10,16,1.49112319946289
## P22,10,17,1.49234473705292
## P22,10,18,1.49019211329771
## P22,10,19,1.49073388841417
## P22,10,20,1.48956252279736
## P22,10,21,1.49053825476231
## P22,10,22,1.49369062317742
## P22,10,23,1.49288921821408
## P22,10,24,1.49148666858673
## P22,10,25,1.49075717926025
## P22,10,26,1.49293158167884
## P22,10,27,1.49165277223329
## P22,10,28,1.49113322628869
## P22,10,29,1.49357606470585
## P22,10,30,1.49488765171596
## P22,10,31,1.48845728782758
## P22,10,32,1.48907073338826
## P22,10,33,1.49116219520569
## P22,10,34,1.48964008720972
## P22,10,35,1.49398591600615
## P22,10,36,1.49074433685897
## P22,10,37,1.48966776240956
## P22,10,38,1.49159824280512
## P22,10,39,1.4938043814439
## P22,10,40,1.4905446891127
## P22,10,41,1.48990847383227
## P22,10,42,1.49326273290122
## P22,10,43,1.49235370923888
## P22,10,44,1.49010839649275
## P22,10,45,1.49168469111125
## P22,10,46,1.48926449673516
## P22,10,47,1.49354470693148
## P22,10,48,1.48964775204659
## P22,10,49,1.49078104279258
## P22,10,50,1.49025138524862
## P23,1,1,1.49246911179248
## P23,1,2,1.49333405936206
## P23,1,3,1.49074714575241
## P23,1,4,1.48978561401367
## P23,1,5,1.49827009912521
## P23,1,6,1.47775421979773
## P23,1,7,1.51999867707491
## P23,1,8,1.4896612523207
## P23,1,9,1.4984833754026
## P23,1,10,1.4702162337753
## P23,1,11,1.46120303950898
## P23,1,12,1.48564558813017
## P23,1,13,1.45674830588742
## P23,1,14,1.49721987107221
## P23,1,15,1.60692854608808
## P23,1,16,1.45391856299506
## P23,1,17,1.44968386638312
## P23,1,18,1.54984088947898
## P23,1,19,1.4494941402489
## P23,1,20,1.47608539534778
## P23,1,21,1.53391346931458
## P23,1,22,1.51954781472146
## P23,1,23,1.47331955374741
## P23,1,24,1.50669808590666
## P23,1,25,1.53892499086808
## P23,1,26,1.5047355064979
## P23,1,27,1.49116178297661
## P23,1,28,1.47576923370361
## P23,1,29,1.52222436771058
## P23,1,30,1.48229443749716
## P23,1,31,1.50669237490623
## P23,1,32,1.48995837550009
## P23,1,33,1.51583769391565
## P23,1,34,1.47593746913804
## P23,1,35,1.47418222836922
## P23,1,36,1.48896739763372
## P23,1,37,1.48970010406093
## P23,1,38,1.5061579350825
## P23,1,39,1.49407878862757
## P23,1,40,1.48733331116152
## P23,1,41,1.49007171768326
## P23,1,42,1.49116539544073
## P23,1,43,1.49375990262398
## P23,1,44,1.48938572406769
## P23,1,45,1.4962599513767
## P23,1,46,1.46803747674693
## P23,1,47,1.49654592611851
## P23,1,48,1.48816186347894
## P23,1,49,1.47130739161399
## P23,1,50,1.50695254648332
## P23,2,1,1.49105766790885
## P23,2,2,1.49039402578631
## P23,2,3,1.48949767439157
## P23,2,4,1.48181440353394
## P23,2,5,1.49682462215424
## P23,2,6,1.48792417610393
## P23,2,7,1.49779857256833
## P23,2,8,1.48875327217848
## P23,2,9,1.49034468127835
## P23,2,10,1.49317322505845
## P23,2,11,1.48646785273696
## P23,2,12,1.49411622456142
## P23,2,13,1.4922321660178
## P23,2,14,1.4917619376347
## P23,2,15,1.491867302181
## P23,2,16,1.49044377761975
## P23,2,17,1.49073215152906
## P23,2,18,1.49307177517865
## P23,2,19,1.48967164562595
## P23,2,20,1.4884425337988
## P23,2,21,1.48515563540988
## P23,2,22,1.49042980657148
## P23,2,23,1.48920908413435
## P23,2,24,1.49176919146588
## P23,2,25,1.49159472988498
## P23,2,26,1.49456475895537
## P23,2,27,1.49317353317537
## P23,2,28,1.49033027887344
## P23,2,29,1.49409304965626
## P23,2,30,1.49177154262414
## P23,2,31,1.4924036026001
## P23,2,32,1.49135131761432
## P23,2,33,1.49237309561835
## P23,2,34,1.49030265045166
## P23,2,35,1.49515762561705
## P23,2,36,1.49080278347065
## P23,2,37,1.48936390705246
## P23,2,38,1.49596939860164
## P23,2,39,1.49364351625202
## P23,2,40,1.48997632344564
## P23,2,41,1.49065565240794
## P23,2,42,1.4910791627292
## P23,2,43,1.49146349409707
## P23,2,44,1.49069734020088
## P23,2,45,1.49175045553562
## P23,2,46,1.49071768569946
## P23,2,47,1.49204286407022
## P23,2,48,1.49116670052836
## P23,2,49,1.4876216981644
## P23,2,50,1.49121477564827
## P23,3,1,1.49122730642557
## P23,3,2,1.49187050100233
## P23,3,3,1.49266779513759
## P23,3,4,1.49249359333154
## P23,3,5,1.49239124067678
## P23,3,6,1.48337420101823
## P23,3,7,1.49460446473324
## P23,3,8,1.46888867897146
## P23,3,9,1.50569590357424
## P23,3,10,1.49315403558158
## P23,3,11,1.49030290331159
## P23,3,12,1.49089706965855
## P23,3,13,1.49710001665003
## P23,3,14,1.4892476431214
## P23,3,15,1.48763442784548
## P23,3,16,1.49646484642698
## P23,3,17,1.48995972605585
## P23,3,18,1.48080529518498
## P23,3,19,1.50033174309076
## P23,3,20,1.49005189217812
## P23,3,21,1.49869299668532
## P23,3,22,1.49289878068772
## P23,3,23,1.48720817643452
## P23,3,24,1.50011432257882
## P23,3,25,1.48779733975728
## P23,3,26,1.49081552028656
## P23,3,27,1.48681496221123
## P23,3,28,1.49252156672939
## P23,3,29,1.48888042821723
## P23,3,30,1.4889397499925
## P23,3,31,1.4936781167984
## P23,3,32,1.49276030532957
## P23,3,33,1.49293214856213
## P23,3,34,1.49420718696174
## P23,3,35,1.49340753627003
## P23,3,36,1.48792743310332
## P23,3,37,1.49265750727259
## P23,3,38,1.49249759087196
## P23,3,39,1.48470004278285
## P23,3,40,1.4947030171752
## P23,3,41,1.49242302827668
## P23,3,42,1.49323508936331
## P23,3,43,1.49152094742347
## P23,3,44,1.49137883461439
## P23,3,45,1.4914294831893
## P23,3,46,1.49355611801147
## P23,3,47,1.49060157792909
## P23,3,48,1.49240122256072
## P23,3,49,1.49210152350181
## P23,3,50,1.49018638556083
## P23,4,1,1.49229920932225
## P23,4,2,1.49006498150709
## P23,4,3,1.49272078863332
## P23,4,4,1.49090997942032
## P23,4,5,1.49119421016951
## P23,4,6,1.49165298772413
## P23,4,7,1.49096097484712
## P23,4,8,1.49090443975557
## P23,4,9,1.49110070141879
## P23,4,10,1.49146858653667
## P23,4,11,1.4909875529153
## P23,4,12,1.49154108033763
## P23,4,13,1.48962850006003
## P23,4,14,1.49249453275976
## P23,4,15,1.48694122570187
## P23,4,16,1.49545814347093
## P23,4,17,1.49090209975839
## P23,4,18,1.49165936502917
## P23,4,19,1.49178704462553
## P23,4,20,1.49156008133521
## P23,4,21,1.49207218805949
## P23,4,22,1.49107783490961
## P23,4,23,1.49098081039868
## P23,4,24,1.49184117575949
## P23,4,25,1.49051391510736
## P23,4,26,1.49180347598784
## P23,4,27,1.48786102022443
## P23,4,28,1.49713841324332
## P23,4,29,1.49244132535211
## P23,4,30,1.49353094988091
## P23,4,31,1.49424495939481
## P23,4,32,1.49087055320414
## P23,4,33,1.4897337078063
## P23,4,34,1.49097691740945
## P23,4,35,1.48978985272921
## P23,4,36,1.49339520931244
## P23,4,37,1.48454086597149
## P23,4,38,1.50033983409914
## P23,4,39,1.48931498405261
## P23,4,40,1.49345642533796
## P23,4,41,1.49049171233019
## P23,4,42,1.4838625620573
## P23,4,43,1.49710317055384
## P23,4,44,1.49147176411417
## P23,4,45,1.49339456700567
## P23,4,46,1.48797136750715
## P23,4,47,1.49248038832821
## P23,4,48,1.49102628581664
## P23,4,49,1.49244172136549
## P23,4,50,1.48977388446614
## P23,5,1,1.49194480908797
## P23,5,2,1.49084371554701
## P23,5,3,1.49117364701192
## P23,5,4,1.4917913036687
## P23,5,5,1.49233836670444
## P23,5,6,1.49039806554347
## P23,5,7,1.49243612665879
## P23,5,8,1.49161662619098
## P23,5,9,1.49193891898665
## P23,5,10,1.48895511897743
## P23,5,11,1.48384656328144
## P23,5,12,1.50057319053134
## P23,5,13,1.49220287247209
## P23,5,14,1.49106779419074
## P23,5,15,1.49184416764535
## P23,5,16,1.49077082231555
## P23,5,17,1.48884365375225
## P23,5,18,1.49086796501536
## P23,5,19,1.49265082315965
## P23,5,20,1.48418498909386
## P23,5,21,1.49153509006634
## P23,5,22,1.49409586423403
## P23,5,23,1.48772864546513
## P23,5,24,1.49932601686158
## P23,5,25,1.49214191325227
## P23,5,26,1.48832910362331
## P23,5,27,1.48977688820131
## P23,5,28,1.49303614399421
## P23,5,29,1.49573380322683
## P23,5,30,1.48962120458382
## P23,5,31,1.49204468159449
## P23,5,32,1.49144022639205
## P23,5,33,1.49151897103819
## P23,5,34,1.49173319800783
## P23,5,35,1.49088428208702
## P23,5,36,1.49125906787341
## P23,5,37,1.49165341625475
## P23,5,38,1.49116876465934
## P23,5,39,1.49193048477173
## P23,5,40,1.49262778726343
## P23,5,41,1.49118438421511
## P23,5,42,1.49168110828774
## P23,5,43,1.48456985363062
## P23,5,44,1.49644657990028
## P23,5,45,1.5012217387557
## P23,5,46,1.49342068657279
## P23,5,47,1.49340517880165
## P23,5,48,1.49154286140943
## P23,5,49,1.49139854215807
## P23,5,50,1.49000043239234
## P23,6,1,1.49398683036506
## P23,6,2,1.49255050169794
## P23,6,3,1.49354194893556
## P23,6,4,1.49198821439581
## P23,6,5,1.49365770551893
## P23,6,6,1.49242229559987
## P23,6,7,1.49196281761959
## P23,6,8,1.49272361294977
## P23,6,9,1.49293692708015
## P23,6,10,1.4928141611065
## P23,6,11,1.49180217107137
## P23,6,12,1.49230988025665
## P23,6,13,1.49214355930004
## P23,6,14,1.49163801905135
## P23,6,15,1.4921195582979
## P23,6,16,1.49088463309216
## P23,6,17,1.49204007191445
## P23,6,18,1.49257057124171
## P23,6,19,1.49231460899304
## P23,6,20,1.49049281760266
## P23,6,21,1.49435180425644
## P23,6,22,1.49075402030649
## P23,6,23,1.49279564751519
## P23,6,24,1.49439381085909
## P23,6,25,1.49161779330327
## P23,6,26,1.49134299334358
## P23,6,27,1.48833563491588
## P23,6,28,1.49299142991795
## P23,6,29,1.49000573358616
## P23,6,30,1.50935881824817
## P23,6,31,1.48882780969143
## P23,6,32,1.48478249942555
## P23,6,33,1.49613968257246
## P23,6,34,1.5005440376699
## P23,6,35,1.48698522375642
## P23,6,36,1.49560888511379
## P23,6,37,1.47981683813411
## P23,6,38,1.50198382344739
## P23,6,39,1.49428306519985
## P23,6,40,1.4848075442844
## P23,6,41,1.50076539474621
## P23,6,42,1.4909732395545
## P23,6,43,1.49082742040119
## P23,6,44,1.49462061882019
## P23,6,45,1.49302041328559
## P23,6,46,1.49182052197664
## P23,6,47,1.49092172403805
## P23,6,48,1.49229200335516
## P23,6,49,1.49155723708017
## P23,6,50,1.49128834521713
## P23,7,1,1.49183290831897
## P23,7,2,1.49132442020235
## P23,7,3,1.49149197586312
## P23,7,4,1.49148786910857
## P23,7,5,1.4914438801427
## P23,7,6,1.49094445750398
## P23,7,7,1.49159538520957
## P23,7,8,1.49152013659477
## P23,7,9,1.49231824667557
## P23,7,10,1.4927025419293
## P23,7,11,1.49120115652317
## P23,7,12,1.49036010863289
## P23,7,13,1.49002665739793
## P23,7,14,1.49256274333367
## P23,7,15,1.49261587652667
## P23,7,16,1.49060150020379
## P23,7,17,1.49145188189969
## P23,7,18,1.4919136149212
## P23,7,19,1.49086747586148
## P23,7,20,1.49083796586141
## P23,7,21,1.49028343200684
## P23,7,22,1.49890222189561
## P23,7,23,1.4884312435732
## P23,7,24,1.4726405620575
## P23,7,25,1.51071755621168
## P23,7,26,1.48806201825376
## P23,7,27,1.49322038051511
## P23,7,28,1.49407990116718
## P23,7,29,1.49237731351691
## P23,7,30,1.49169424322785
## P23,7,31,1.49117647951299
## P23,7,32,1.49092691847422
## P23,7,33,1.49160404205322
## P23,7,34,1.49269772549065
## P23,7,35,1.489294629986
## P23,7,36,1.49338790949653
## P23,7,37,1.49098087847233
## P23,7,38,1.4893394616934
## P23,7,39,1.49301225185394
## P23,7,40,1.49258940847296
## P23,7,41,1.49124709272807
## P23,7,42,1.49428009051903
## P23,7,43,1.4967948787815
## P23,7,44,1.49219264896638
## P23,7,45,1.4923049887431
## P23,7,46,1.49100651991995
## P23,7,47,1.49174668090512
## P23,7,48,1.49124921451915
## P23,7,49,1.49059140125168
## P23,7,50,1.49177325929914
## P23,8,1,1.49099029653213
## P23,8,2,1.49269419863708
## P23,8,3,1.49135871761101
## P23,8,4,1.4907661009643
## P23,8,5,1.49297371673584
## P23,8,6,1.49043085516953
## P23,8,7,1.49076575287117
## P23,8,8,1.49104965209961
## P23,8,9,1.48993165969849
## P23,8,10,1.49309904458093
## P23,8,11,1.49128998450513
## P23,8,12,1.49060979485512
## P23,8,13,1.48836213542569
## P23,8,14,1.48598328291201
## P23,8,15,1.50327455997467
## P23,8,16,1.49192064492277
## P23,8,17,1.4833473609044
## P23,8,18,1.49443040459843
## P23,8,19,1.49448121221442
## P23,8,20,1.49195910967313
## P23,8,21,1.4864725139406
## P23,8,22,1.48349795853796
## P23,8,23,1.49447027423926
## P23,8,24,1.49155827536099
## P23,8,25,1.48910447869982
## P23,8,26,1.49205376640443
## P23,8,27,1.49126033200562
## P23,8,28,1.49288391882135
## P23,8,29,1.49036224038751
## P23,8,30,1.49177004124996
## P23,8,31,1.49156406550731
## P23,8,32,1.49164227435463
## P23,8,33,1.48344107316091
## P23,8,34,1.49853054401094
## P23,8,35,1.4931990776533
## P23,8,36,1.49269586744763
## P23,8,37,1.49019396305084
## P23,8,38,1.48749565559885
## P23,8,39,1.49565007184681
## P23,8,40,1.49152228067506
## P23,8,41,1.48156003015382
## P23,8,42,1.49948898042951
## P23,8,43,1.49108591485531
## P23,8,44,1.49165310479898
## P23,8,45,1.49243153521889
## P23,8,46,1.49053595999013
## P23,8,47,1.49285856018896
## P23,8,48,1.49132544247072
## P23,8,49,1.49162450758349
## P23,8,50,1.49231234243361
## P23,9,1,1.49174550863413
## P23,9,2,1.49111488963781
## P23,9,3,1.49227459941592
## P23,9,4,1.49225596200048
## P23,9,5,1.48997800615099
## P23,9,6,1.49142524415413
## P23,9,7,1.48975333752839
## P23,9,8,1.49133637307704
## P23,9,9,1.4914404992704
## P23,9,10,1.49189470767975
## P23,9,11,1.49122717736781
## P23,9,12,1.49146637290415
## P23,9,13,1.48927655662458
## P23,9,14,1.49474000930786
## P23,9,15,1.49123216243017
## P23,9,16,1.49259810308808
## P23,9,17,1.49194467181251
## P23,9,18,1.49101648143694
## P23,9,19,1.49171100699383
## P23,9,20,1.49156257608435
## P23,9,21,1.49107246687918
## P23,9,22,1.49168891784472
## P23,9,23,1.49117860502126
## P23,9,24,1.49431630386703
## P23,9,25,1.48916701768574
## P23,9,26,1.4925638367148
## P23,9,27,1.49015692533073
## P23,9,28,1.49347772249361
## P23,9,29,1.49373601464664
## P23,9,30,1.49361860895731
## P23,9,31,1.49243817947529
## P23,9,32,1.49112583927273
## P23,9,33,1.49333936827523
## P23,9,34,1.49096593135545
## P23,9,35,1.48940073141531
## P23,9,36,1.49651090009713
## P23,9,37,1.49248639742533
## P23,9,38,1.49850324998822
## P23,9,39,1.49048533102479
## P23,9,40,1.48980388817964
## P23,9,41,1.49248533537894
## P23,9,42,1.490638088394
## P23,9,43,1.49120502760916
## P23,9,44,1.49220036110788
## P23,9,45,1.49223418486746
## P23,9,46,1.49122007025613
## P23,9,47,1.48980519036266
## P23,9,48,1.49466477394104
## P23,9,49,1.47646944437708
## P23,9,50,1.49497227115526
## P23,10,1,1.49249114990234
## P23,10,2,1.49094080589187
## P23,10,3,1.49305363382612
## P23,10,4,1.48987563451131
## P23,10,5,1.49293438931729
## P23,10,6,1.4910627732794
## P23,10,7,1.49303523926508
## P23,10,8,1.4897562867344
## P23,10,9,1.49171264725502
## P23,10,10,1.49088173234061
## P23,10,11,1.49136947308268
## P23,10,12,1.49268755685715
## P23,10,13,1.49185648928867
## P23,10,14,1.4891549465703
## P23,10,15,1.48052329327687
## P23,10,16,1.49696906764856
## P23,10,17,1.4943326285126
## P23,10,18,1.48978989464896
## P23,10,19,1.49103894364943
## P23,10,20,1.49156433928247
## P23,10,21,1.48881233413264
## P23,10,22,1.49230919987702
## P23,10,23,1.49204593716246
## P23,10,24,1.4914238007514
## P23,10,25,1.49095656531198
## P23,10,26,1.48974038519949
## P23,10,27,1.4928050994873
## P23,10,28,1.4931993681131
## P23,10,29,1.48994118167508
## P23,10,30,1.49294715384914
## P23,10,31,1.49267138305463
## P23,10,32,1.49507644377559
## P23,10,33,1.49119682197111
## P23,10,34,1.49278576033456
## P23,10,35,1.49232002522083
## P23,10,36,1.48975710339016
## P23,10,37,1.49299359863455
## P23,10,38,1.49309476216634
## P23,10,39,1.48821385456966
## P23,10,40,1.49034748863928
## P23,10,41,1.4914114537992
## P23,10,42,1.49175298213959
## P23,10,43,1.49117346965905
## P23,10,44,1.49232683181763
## P23,10,45,1.4903449182925
## P23,10,46,1.4927535200119
## P23,10,47,1.48961877822876
## P23,10,48,1.49431532130522
## P23,10,49,1.49087473515714
## P23,10,50,1.49120991021995
## P24,1,1,1.49278894979127
## P24,1,2,1.49207009606183
## P24,1,3,1.49302052426082
## P24,1,4,1.49299697393782
## P24,1,5,1.49227526187897
## P24,1,6,1.49339160129163
## P24,1,7,1.4913438578121
## P24,1,8,1.49232279196293
## P24,1,9,1.49287620565509
## P24,1,10,1.49140555003904
## P24,1,11,1.49252437396222
## P24,1,12,1.4914509333097
## P24,1,13,1.49193187126747
## P24,1,14,1.49134533882141
## P24,1,15,1.49203800587427
## P24,1,16,1.49191849048321
## P24,1,17,1.4919479457281
## P24,1,18,1.49165511594235
## P24,1,19,1.49117977770767
## P24,1,20,1.49110138481432
## P24,1,21,1.49218760217939
## P24,1,22,1.49207577462924
## P24,1,23,1.49175585461202
## P24,1,24,1.49286677977618
## P24,1,25,1.49253834510336
## P24,1,26,1.49174642562866
## P24,1,27,1.49128323910283
## P24,1,28,1.49200932950859
## P24,1,29,1.49185881247887
## P24,1,30,1.49111531144482
## P24,1,31,1.49175008050688
## P24,1,32,1.49148478592641
## P24,1,33,1.49094377541394
## P24,1,34,1.49211675980512
## P24,1,35,1.48951584880889
## P24,1,36,1.49100153546938
## P24,1,37,1.49142592463327
## P24,1,38,1.49109411509024
## P24,1,39,1.49066110066005
## P24,1,40,1.49122521738527
## P24,1,41,1.49121758000768
## P24,1,42,1.4920241693971
## P24,1,43,1.49136539420696
## P24,1,44,1.49169089624791
## P24,1,45,1.49120565042263
## P24,1,46,1.49159231412978
## P24,1,47,1.49149625441607
## P24,1,48,1.49056130888834
## P24,1,49,1.49150627354781
## P24,1,50,1.49170828356174
## P24,2,1,1.49178127575946
## P24,2,2,1.4915858521181
## P24,2,3,1.49181760891829
## P24,2,4,1.49189070443422
## P24,2,5,1.49138703657754
## P24,2,6,1.49169134427715
## P24,2,7,1.49142744850978
## P24,2,8,1.49129466666389
## P24,2,9,1.4913474965223
## P24,2,10,1.49133029417558
## P24,2,11,1.49099540710449
## P24,2,12,1.4923521289119
## P24,2,13,1.49132393954093
## P24,2,14,1.49159123897552
## P24,2,15,1.49058389148197
## P24,2,16,1.49142335442936
## P24,2,17,1.49205621357622
## P24,2,18,1.49107136958983
## P24,2,19,1.49109325475163
## P24,2,20,1.49149427361251
## P24,2,21,1.49172086604157
## P24,2,22,1.49181225862396
## P24,2,23,1.49089408339116
## P24,2,24,1.49163780163745
## P24,2,25,1.49371729599186
## P24,2,26,1.49059367179871
## P24,2,27,1.49059100097485
## P24,2,28,1.49121795550431
## P24,2,29,1.49280892027185
## P24,2,30,1.49125099756632
## P24,2,31,1.49123927489998
## P24,2,32,1.49194808439775
## P24,2,33,1.49139367087039
## P24,2,34,1.49124922364522
## P24,2,35,1.49212824310387
## P24,2,36,1.49142355525617
## P24,2,37,1.49094453202673
## P24,2,38,1.49140469959804
## P24,2,39,1.4910159494685
## P24,2,40,1.49198123386928
## P24,2,41,1.49200746713095
## P24,2,42,1.49168029343341
## P24,2,43,1.49147295300426
## P24,2,44,1.49089207570197
## P24,2,45,1.49199604859223
## P24,2,46,1.4915312643105
## P24,2,47,1.49141788823264
## P24,2,48,1.49216009234334
## P24,2,49,1.48996345476172
## P24,2,50,1.49143084561439
## P24,3,1,1.49054155647755
## P24,3,2,1.48986642425125
## P24,3,3,1.49075930089836
## P24,3,4,1.49101825104546
## P24,3,5,1.49118417156629
## P24,3,6,1.49230553774998
## P24,3,7,1.49151300040769
## P24,3,8,1.49152019657666
## P24,3,9,1.49171080714778
## P24,3,10,1.49226686438999
## P24,3,11,1.49223410367966
## P24,3,12,1.4930200005571
## P24,3,13,1.49173406600952
## P24,3,14,1.49104913169816
## P24,3,15,1.49162475058907
## P24,3,16,1.49124447018819
## P24,3,17,1.49216168079901
## P24,3,18,1.49000015097149
## P24,3,19,1.49113747458788
## P24,3,20,1.49142577259551
## P24,3,21,1.49140580826335
## P24,3,22,1.49040462095526
## P24,3,23,1.49188901421553
## P24,3,24,1.49033578749626
## P24,3,25,1.49149712593325
## P24,3,26,1.49091968255885
## P24,3,27,1.49113691988445
## P24,3,28,1.49113250369868
## P24,3,29,1.49169549866328
## P24,3,30,1.49235293880012
## P24,3,31,1.4913751292736
## P24,3,32,1.49236756233714
## P24,3,33,1.49146191816072
## P24,3,34,1.49057848648455
## P24,3,35,1.49198554201824
## P24,3,36,1.49029057403731
## P24,3,37,1.49224233627319
## P24,3,38,1.49113286927689
## P24,3,39,1.49085809903986
## P24,3,40,1.49146898027877
## P24,3,41,1.49135027368084
## P24,3,42,1.49153057734172
## P24,3,43,1.49122969727767
## P24,3,44,1.49179262225911
## P24,3,45,1.49219310771652
## P24,3,46,1.49060338615571
## P24,3,47,1.49053677006772
## P24,3,48,1.4928725083669
## P24,3,49,1.49194385846456
## P24,3,50,1.49130788122363
## P24,4,1,1.49159693006259
## P24,4,2,1.49162090967779
## P24,4,3,1.49285601622221
## P24,4,4,1.49231114136545
## P24,4,5,1.48945073548912
## P24,4,6,1.49184024272821
## P24,4,7,1.49207339013458
## P24,4,8,1.49151343405247
## P24,4,9,1.49179068303877
## P24,4,10,1.49022997407352
## P24,4,11,1.49350420526556
## P24,4,12,1.49018667153353
## P24,4,13,1.49098820858691
## P24,4,14,1.49095271655491
## P24,4,15,1.49125067215392
## P24,4,16,1.49156658428231
## P24,4,17,1.49343204498291
## P24,4,18,1.49066569703691
## P24,4,19,1.49130308169585
## P24,4,20,1.49173537167636
## P24,4,21,1.49136359569354
## P24,4,22,1.49212579270627
## P24,4,23,1.49137965213047
## P24,4,24,1.4913022718697
## P24,4,25,1.49181051911979
## P24,4,26,1.49109005601439
## P24,4,27,1.49188871872731
## P24,4,28,1.49191058083866
## P24,4,29,1.49095028258385
## P24,4,30,1.49189657323501
## P24,4,31,1.49184546122948
## P24,4,32,1.49148280152651
## P24,4,33,1.4916550274553
## P24,4,34,1.4919965181006
## P24,4,35,1.49101899200016
## P24,4,36,1.49139978668906
## P24,4,37,1.4909114644985
## P24,4,38,1.49147552618101
## P24,4,39,1.49078331571637
## P24,4,40,1.49161469459534
## P24,4,41,1.49192096779384
## P24,4,42,1.49074679881603
## P24,4,43,1.4916362076803
## P24,4,44,1.49132295733406
## P24,4,45,1.49095281843322
## P24,4,46,1.49190937656246
## P24,4,47,1.49183615129821
## P24,4,48,1.49124427764646
## P24,4,49,1.49125157905917
## P24,4,50,1.49112726757858
## P24,5,1,1.4911124909571
## P24,5,2,1.4912892450457
## P24,5,3,1.49189977281413
## P24,5,4,1.4914352227442
## P24,5,5,1.49203576701028
## P24,5,6,1.49182978847571
## P24,5,7,1.49201626613222
## P24,5,8,1.49036676898324
## P24,5,9,1.49125227796922
## P24,5,10,1.4915714945112
## P24,5,11,1.49041413657273
## P24,5,12,1.49177862678826
## P24,5,13,1.49101229274974
## P24,5,14,1.49107547816385
## P24,5,15,1.49134226248298
## P24,5,16,1.49198439541985
## P24,5,17,1.49219083476376
## P24,5,18,1.49140634218852
## P24,5,19,1.49083425733778
## P24,5,20,1.4924371733385
## P24,5,21,1.48979319528092
## P24,5,22,1.49108696628261
## P24,5,23,1.48898868811758
## P24,5,24,1.49118172404278
## P24,5,25,1.49178567564631
## P24,5,26,1.49146194317762
## P24,5,27,1.49223786515075
## P24,5,28,1.48948966344198
## P24,5,29,1.49175488948822
## P24,5,30,1.49084218025208
## P24,5,31,1.49061968452052
## P24,5,32,1.49257338467766
## P24,5,33,1.49088875631268
## P24,5,34,1.49102605016608
## P24,5,35,1.4911397834497
## P24,5,36,1.49194369866298
## P24,5,37,1.49090957049257
## P24,5,38,1.49172828346491
## P24,5,39,1.49117309219983
## P24,5,40,1.49089921604503
## P24,5,41,1.49035394346559
## P24,5,42,1.49092202516472
## P24,5,43,1.4914541683314
## P24,5,44,1.49241583846336
## P24,5,45,1.49082719306557
## P24,5,46,1.49117382897271
## P24,5,47,1.49161206558347
## P24,5,48,1.49148953560344
## P24,5,49,1.49076559756062
## P24,5,50,1.49132199642897
## P24,6,1,1.49182357490063
## P24,6,2,1.49105188887932
## P24,6,3,1.49238418990915
## P24,6,4,1.49109380327422
## P24,6,5,1.4911249478658
## P24,6,6,1.49202119264027
## P24,6,7,1.49162541902982
## P24,6,8,1.49117815292488
## P24,6,9,1.49220389127731
## P24,6,10,1.49125266985129
## P24,6,11,1.49130760169611
## P24,6,12,1.49226704469094
## P24,6,13,1.49250943045462
## P24,6,14,1.49155595533309
## P24,6,15,1.49077950886318
## P24,6,16,1.49193966674805
## P24,6,17,1.49067450028199
## P24,6,18,1.49185667193033
## P24,6,19,1.49168980041606
## P24,6,20,1.49058524767558
## P24,6,21,1.49087006081152
## P24,6,22,1.4914632159702
## P24,6,23,1.49143590865197
## P24,6,24,1.49384632706642
## P24,6,25,1.4921036929619
## P24,6,26,1.49141780595134
## P24,6,27,1.49122706899103
## P24,6,28,1.49164922882176
## P24,6,29,1.49142820332326
## P24,6,30,1.49181391642644
## P24,6,31,1.49136046777692
## P24,6,32,1.49197581181159
## P24,6,33,1.49101219338886
## P24,6,34,1.49082709814756
## P24,6,35,1.49136966207753
## P24,6,36,1.48987730074737
## P24,6,37,1.49203333421187
## P24,6,38,1.49154144102527
## P24,6,39,1.49112778181558
## P24,6,40,1.49176905399714
## P24,6,41,1.49240907709649
## P24,6,42,1.49098493050838
## P24,6,43,1.49117703531303
## P24,6,44,1.49114968299866
## P24,6,45,1.49563083052635
## P24,6,46,1.49150427650003
## P24,6,47,1.49144761813314
## P24,6,48,1.49184027929155
## P24,6,49,1.49077803293864
## P24,6,50,1.49154559276334
## P24,7,1,1.49165579124733
## P24,7,2,1.49069716380193
## P24,7,3,1.49086233026841
## P24,7,4,1.49092868420718
## P24,7,5,1.4905996799469
## P24,7,6,1.49139140087104
## P24,7,7,1.4910727511631
## P24,7,8,1.49153254098362
## P24,7,9,1.49152609139435
## P24,7,10,1.49128533833062
## P24,7,11,1.49137054170881
## P24,7,12,1.49128057723655
## P24,7,13,1.49214676618576
## P24,7,14,1.49170844991442
## P24,7,15,1.49178351813216
## P24,7,16,1.49162344736596
## P24,7,17,1.49098218376957
## P24,7,18,1.49190247952938
## P24,7,19,1.49111594050384
## P24,7,20,1.49100940961104
## P24,7,21,1.49135825551789
## P24,7,22,1.49108663650408
## P24,7,23,1.49228783829571
## P24,7,24,1.49146483010716
## P24,7,25,1.49049594038624
## P24,7,26,1.49247061470408
## P24,7,27,1.49079095345956
## P24,7,28,1.49202116409151
## P24,7,29,1.49133860692382
## P24,7,30,1.49103537553586
## P24,7,31,1.49116965392967
## P24,7,32,1.49157202243805
## P24,7,33,1.49128080549694
## P24,7,34,1.49148068257741
## P24,7,35,1.49157020606493
## P24,7,36,1.49100700056697
## P24,7,37,1.49152896577949
## P24,7,38,1.49211391338632
## P24,7,39,1.49098574242941
## P24,7,40,1.490696144104
## P24,7,41,1.49155544465588
## P24,7,42,1.48993734471938
## P24,7,43,1.49411022095453
## P24,7,44,1.49138096688499
## P24,7,45,1.49069330284187
## P24,7,46,1.49186873730318
## P24,7,47,1.49139680513522
## P24,7,48,1.4908358469242
## P24,7,49,1.4915558558244
## P24,7,50,1.4911528823093
## P24,8,1,1.49220428568252
## P24,8,2,1.49068655119352
## P24,8,3,1.49297514647067
## P24,8,4,1.49072198000821
## P24,8,5,1.49083799890953
## P24,8,6,1.49164564120844
## P24,8,7,1.49108715375264
## P24,8,8,1.49133916359163
## P24,8,9,1.49154605036197
## P24,8,10,1.49106328533246
## P24,8,11,1.49067742187784
## P24,8,12,1.49171532405896
## P24,8,13,1.49060851814103
## P24,8,14,1.49122118805394
## P24,8,15,1.49124241810219
## P24,8,16,1.49268069458008
## P24,8,17,1.49075748397083
## P24,8,18,1.49113470315933
## P24,8,19,1.49102911183253
## P24,8,20,1.48980434786889
## P24,8,21,1.49177733790932
## P24,8,22,1.49231333756328
## P24,8,23,1.490989646186
## P24,8,24,1.49098082469857
## P24,8,25,1.49138725907714
## P24,8,26,1.49140127499898
## P24,8,27,1.49131841599187
## P24,8,28,1.49101619909305
## P24,8,29,1.49129333496094
## P24,8,30,1.49111385021395
## P24,8,31,1.49123353580021
## P24,8,32,1.49085921308269
## P24,8,33,1.49117484117419
## P24,8,34,1.49135226996049
## P24,8,35,1.49186836071868
## P24,8,36,1.49134985399453
## P24,8,37,1.49115527448037
## P24,8,38,1.49113829389532
## P24,8,39,1.49137469291687
## P24,8,40,1.49104055811147
## P24,8,41,1.49133724694724
## P24,8,42,1.49051630865667
## P24,8,43,1.49152710288763
## P24,8,44,1.49160797972428
## P24,8,45,1.49126504060161
## P24,8,46,1.49164568698468
## P24,8,47,1.49086274114148
## P24,8,48,1.49151340509072
## P24,8,49,1.49204321017211
## P24,8,50,1.49124864159208
## P24,9,1,1.49262336747987
## P24,9,2,1.49237995982719
## P24,9,3,1.49309601648799
## P24,9,4,1.49266430964837
## P24,9,5,1.49329590232451
## P24,9,6,1.49119624077986
## P24,9,7,1.4925990653038
## P24,9,8,1.49225668317264
## P24,9,9,1.49186393266083
## P24,9,10,1.49287829288217
## P24,9,11,1.49089861719796
## P24,9,12,1.49198826926095
## P24,9,13,1.49127898080008
## P24,9,14,1.49187283353372
## P24,9,15,1.49217223636995
## P24,9,16,1.49180581301627
## P24,9,17,1.49150279237719
## P24,9,18,1.49098252413566
## P24,9,19,1.49141822340926
## P24,9,20,1.49231651391876
## P24,9,21,1.49164876092244
## P24,9,22,1.492335064811
## P24,9,23,1.49223855843291
## P24,9,24,1.49272528017201
## P24,9,25,1.49164080107084
## P24,9,26,1.49139824198253
## P24,9,27,1.49168819310714
## P24,9,28,1.49205988392685
## P24,9,29,1.49168052810889
## P24,9,30,1.49124698228734
## P24,9,31,1.49090047004895
## P24,9,32,1.49088812555586
## P24,9,33,1.49065699093584
## P24,9,34,1.49106229435314
## P24,9,35,1.4912706975426
## P24,9,36,1.49097962616795
## P24,9,37,1.49089028692653
## P24,9,38,1.4912912285273
## P24,9,39,1.49202319399803
## P24,9,40,1.49175263159346
## P24,9,41,1.49146267947029
## P24,9,42,1.49141064992391
## P24,9,43,1.49140924319886
## P24,9,44,1.49108975066751
## P24,9,45,1.49125757609328
## P24,9,46,1.49114148209735
## P24,9,47,1.49258305666582
## P24,9,48,1.49148321151733
## P24,9,49,1.49146672430493
## P24,9,50,1.4918338166989
## P24,10,1,1.49163791429194
## P24,10,2,1.49171918593113
## P24,10,3,1.49113483116275
## P24,10,4,1.49140234214033
## P24,10,5,1.49126482804616
## P24,10,6,1.49170247635039
## P24,10,7,1.49177953135761
## P24,10,8,1.49053879788047
## P24,10,9,1.489160425711
## P24,10,10,1.49093215200636
## P24,10,11,1.4912345379591
## P24,10,12,1.49101593775779
## P24,10,13,1.49124541282654
## P24,10,14,1.49111859815834
## P24,10,15,1.49164413051172
## P24,10,16,1.49072719820969
## P24,10,17,1.49090179715838
## P24,10,18,1.49150184567055
## P24,10,19,1.4922065597644
## P24,10,20,1.49096014920403
## P24,10,21,1.49118572015029
## P24,10,22,1.49181224886051
## P24,10,23,1.49111913582858
## P24,10,24,1.49208823750528
## P24,10,25,1.49060283816835
## P24,10,26,1.49339499555785
## P24,10,27,1.49173049978871
## P24,10,28,1.49166220426559
## P24,10,29,1.49642609755198
## P24,10,30,1.48890105111258
## P24,10,31,1.48917367825141
## P24,10,32,1.48961284172022
## P24,10,33,1.49161573837364
## P24,10,34,1.49124394983485
## P24,10,35,1.48968342903557
## P24,10,36,1.4928138050812
## P24,10,37,1.49234254647654
## P24,10,38,1.49060836228185
## P24,10,39,1.49187268831034
## P24,10,40,1.49008359340642
## P24,10,41,1.49138846180656
## P24,10,42,1.49042142552438
## P24,10,43,1.48988750321524
## P24,10,44,1.49116076012047
## P24,10,45,1.49100220319137
## P24,10,46,1.48948945008315
## P24,10,47,1.4894746714418
## P24,10,48,1.49013510885693
## P24,10,49,1.49407880956476
## P24,10,50,1.49154303880981
## P25,1,1,1.49094289593992
## P25,1,2,1.49196292803838
## P25,1,3,1.4923074537394
## P25,1,4,1.49353194640855
## P25,1,5,1.49124223186124
## P25,1,6,1.4928747177124
## P25,1,7,1.49294091170689
## P25,1,8,1.48984798431396
## P25,1,9,1.49240664581754
## P25,1,10,1.49121079793791
## P25,1,11,1.49271796123091
## P25,1,12,1.49317882371985
## P25,1,13,1.49445695065437
## P25,1,14,1.4911446762085
## P25,1,15,1.49147473848783
## P25,1,16,1.49278846383095
## P25,1,17,1.49182590685393
## P25,1,18,1.49050944068215
## P25,1,19,1.49138717341229
## P25,1,20,1.49020897320339
## P25,1,21,1.49151013759857
## P25,1,22,1.492018699646
## P25,1,23,1.49484162032604
## P25,1,24,1.48958507706137
## P25,1,25,1.48957589425539
## P25,1,26,1.49099891958102
## P25,1,27,1.49278143680457
## P25,1,28,1.49518970732993
## P25,1,29,1.4909017767225
## P25,1,30,1.49355758638943
## P25,1,31,1.49098334930561
## P25,1,32,1.49158451522606
## P25,1,33,1.49187503542219
## P25,1,34,1.49111754364438
## P25,1,35,1.48976582013644
## P25,1,36,1.49004226866223
## P25,1,37,1.49143750326974
## P25,1,38,1.49166968850528
## P25,1,39,1.49030432334313
## P25,1,40,1.49271137286455
## P25,1,41,1.49122844022863
## P25,1,42,1.49179637432098
## P25,1,43,1.49021873587654
## P25,1,44,1.49079875324083
## P25,1,45,1.49254299843148
## P25,1,46,1.49376969337463
## P25,1,47,1.49325578329993
## P25,1,48,1.49150410565463
## P25,1,49,1.48991461057921
## P25,1,50,1.492687999454
## P25,2,1,1.49118576767624
## P25,2,2,1.49099241797604
## P25,2,3,1.49057770323479
## P25,2,4,1.49166577557723
## P25,2,5,1.4932946878321
## P25,2,6,1.49225491465944
## P25,2,7,1.49347574319412
## P25,2,8,1.49005012926848
## P25,2,9,1.48988741094416
## P25,2,10,1.49158497093138
## P25,2,11,1.49129467174925
## P25,2,12,1.49211391302255
## P25,2,13,1.49048218971644
## P25,2,14,1.49196212696579
## P25,2,15,1.49112210954939
## P25,2,16,1.49333444508639
## P25,2,17,1.49190362038151
## P25,2,18,1.49351884578836
## P25,2,19,1.49127976574115
## P25,2,20,1.49264268617372
## P25,2,21,1.48825158744023
## P25,2,22,1.49216953913371
## P25,2,23,1.49056902164366
## P25,2,24,1.49250300725301
## P25,2,25,1.48883624303909
## P25,2,26,1.49429482999055
## P25,2,27,1.48846129311456
## P25,2,28,1.48988045898138
## P25,2,29,1.49255049045269
## P25,2,30,1.49179467287931
## P25,2,31,1.49185729026794
## P25,2,32,1.49082589149475
## P25,2,33,1.49260061665585
## P25,2,34,1.49059329209504
## P25,2,35,1.4922947883606
## P25,2,36,1.49441973368327
## P25,2,37,1.49223676541956
## P25,2,38,1.48989930444834
## P25,2,39,1.48910713195801
## P25,2,40,1.49020370570096
## P25,2,41,1.48993681926353
## P25,2,42,1.49267490704854
## P25,2,43,1.49088031274301
## P25,2,44,1.49111519104395
## P25,2,45,1.49182143665495
## P25,2,46,1.49038288640041
## P25,2,47,1.49044469197591
## P25,2,48,1.49336070834466
## P25,2,49,1.49098483375881
## P25,2,50,1.49163620599679
## P25,3,1,1.49168059229851
## P25,3,2,1.49061313129607
## P25,3,3,1.49059319215662
## P25,3,4,1.49032849704518
## P25,3,5,1.49310723218051
## P25,3,6,1.48984621167183
## P25,3,7,1.48789880010817
## P25,3,8,1.49202027528182
## P25,3,9,1.49089619517326
## P25,3,10,1.49212493425534
## P25,3,11,1.49200006212507
## P25,3,12,1.49113725732874
## P25,3,13,1.49186689588759
## P25,3,14,1.49046132299635
## P25,3,15,1.49271349562812
## P25,3,16,1.49039673010508
## P25,3,17,1.48936608859471
## P25,3,18,1.49136124028788
## P25,3,19,1.49315754378714
## P25,3,20,1.49155315302186
## P25,3,21,1.49150581730222
## P25,3,22,1.49012503169832
## P25,3,23,1.49107283605656
## P25,3,24,1.49227800369263
## P25,3,25,1.49148057057307
## P25,3,26,1.49257142203195
## P25,3,27,1.49274919249795
## P25,3,28,1.49075475003984
## P25,3,29,1.48949067159133
## P25,3,30,1.49000142170833
## P25,3,31,1.49096286947077
## P25,3,32,1.49273129584084
## P25,3,33,1.49082062976195
## P25,3,34,1.49065321370175
## P25,3,35,1.49312170468844
## P25,3,36,1.49150959650675
## P25,3,37,1.4919422333499
## P25,3,38,1.4941997718811
## P25,3,39,1.49156964619954
## P25,3,40,1.49244262734238
## P25,3,41,1.49189288275582
## P25,3,42,1.49168940594322
## P25,3,43,1.48688427261684
## P25,3,44,1.49459961004425
## P25,3,45,1.49126046612149
## P25,3,46,1.48865868495061
## P25,3,47,1.49204613180722
## P25,3,48,1.48721130688985
## P25,3,49,1.48885298834907
## P25,3,50,1.49025136620861
## P25,4,1,1.49051566745924
## P25,4,2,1.49178825891935
## P25,4,3,1.49110840777962
## P25,4,4,1.49120265245438
## P25,4,5,1.49092560722714
## P25,4,6,1.49012185545529
## P25,4,7,1.48990438249376
## P25,4,8,1.49212800131904
## P25,4,9,1.49023605883121
## P25,4,10,1.49130638688803
## P25,4,11,1.49169997012976
## P25,4,12,1.49177716255188
## P25,4,13,1.49088145626916
## P25,4,14,1.49204464519725
## P25,4,15,1.49123910873655
## P25,4,16,1.49066111716357
## P25,4,17,1.49353330785578
## P25,4,18,1.48966494146383
## P25,4,19,1.49146871005788
## P25,4,20,1.49158927372524
## P25,4,21,1.49181350289959
## P25,4,22,1.49356876886808
## P25,4,23,1.49261413680183
## P25,4,24,1.49120141589452
## P25,4,25,1.49282596111298
## P25,4,26,1.48980934479657
## P25,4,27,1.49238124260536
## P25,4,28,1.48933334577651
## P25,4,29,1.49077575856989
## P25,4,30,1.49268832077851
## P25,4,31,1.49170036483229
## P25,4,32,1.49011732811152
## P25,4,33,1.48969939776829
## P25,4,34,1.49116229543499
## P25,4,35,1.49184017057543
## P25,4,36,1.49157765037135
## P25,4,37,1.4912571811676
## P25,4,38,1.49132560503365
## P25,4,39,1.49106399785905
## P25,4,40,1.49228425820669
## P25,4,41,1.49133599230221
## P25,4,42,1.49072919573103
## P25,4,43,1.49029468277753
## P25,4,44,1.49148714542389
## P25,4,45,1.49101194881258
## P25,4,46,1.49074500448564
## P25,4,47,1.49092336261974
## P25,4,48,1.49254627227783
## P25,4,49,1.49202729596032
## P25,4,50,1.49069221586568
## P25,5,1,1.49049301147461
## P25,5,2,1.49041093227475
## P25,5,3,1.4913039472368
## P25,5,4,1.49241969320509
## P25,5,5,1.49264469146729
## P25,5,6,1.49237184321627
## P25,5,7,1.49101205494093
## P25,5,8,1.49080888791518
## P25,5,9,1.49258162758567
## P25,5,10,1.49066236744756
## P25,5,11,1.48986242585263
## P25,5,12,1.49102387163374
## P25,5,13,1.49109895893785
## P25,5,14,1.48973410204053
## P25,5,15,1.49118501956646
## P25,5,16,1.48789960861206
## P25,5,17,1.49137133901769
## P25,5,18,1.48841961692361
## P25,5,19,1.4916932688819
## P25,5,20,1.48970801180059
## P25,5,21,1.49125683307648
## P25,5,22,1.49055771032969
## P25,5,23,1.49080390400357
## P25,5,24,1.48986003615639
## P25,5,25,1.49024259050687
## P25,5,26,1.491330742836
## P25,5,27,1.49207179951218
## P25,5,28,1.4919348182259
## P25,5,29,1.49209617165958
## P25,5,30,1.49066968824043
## P25,5,31,1.49253241742244
## P25,5,32,1.48995027136295
## P25,5,33,1.49227524863349
## P25,5,34,1.49175378626043
## P25,5,35,1.48976540255856
## P25,5,36,1.49326532027301
## P25,5,37,1.49317473888397
## P25,5,38,1.48982223342447
## P25,5,39,1.49045351147652
## P25,5,40,1.49146713184405
## P25,5,41,1.4918476848279
## P25,5,42,1.49201922277802
## P25,5,43,1.49244939713251
## P25,5,44,1.49197852153044
## P25,5,45,1.49073475599289
## P25,5,46,1.49607086181641
## P25,5,47,1.48884192028561
## P25,5,48,1.48970578511556
## P25,5,49,1.49196247858544
## P25,5,50,1.49189663609714
## P25,6,1,1.49058692556032
## P25,6,2,1.48969700187445
## P25,6,3,1.49159606297811
## P25,6,4,1.49018676313635
## P25,6,5,1.49013110149054
## P25,6,6,1.48900689718858
## P25,6,7,1.49102614249712
## P25,6,8,1.49094500412812
## P25,6,9,1.49069822175162
## P25,6,10,1.49064838632624
## P25,6,11,1.48981121007134
## P25,6,12,1.49107060342465
## P25,6,13,1.49032379176519
## P25,6,14,1.49225027826097
## P25,6,15,1.49176022626352
## P25,6,16,1.49059012441924
## P25,6,17,1.49083533919001
## P25,6,18,1.49201864997546
## P25,6,19,1.49087051127819
## P25,6,20,1.49134094626815
## P25,6,21,1.49249620826877
## P25,6,22,1.49098973027591
## P25,6,23,1.48997552851413
## P25,6,24,1.49064563482236
## P25,6,25,1.49029468018332
## P25,6,26,1.49258870809851
## P25,6,27,1.49060720205307
## P25,6,28,1.48929462432861
## P25,6,29,1.49162399478075
## P25,6,30,1.49027824401855
## P25,6,31,1.49207758903503
## P25,6,32,1.49103249443902
## P25,6,33,1.48979695927013
## P25,6,34,1.49086041701467
## P25,6,35,1.49037231098522
## P25,6,36,1.49211922058692
## P25,6,37,1.49145090579987
## P25,6,38,1.48896040087161
## P25,6,39,1.49160714944204
## P25,6,40,1.49080300331116
## P25,6,41,1.4904470294714
## P25,6,42,1.49116382487985
## P25,6,43,1.48930778001484
## P25,6,44,1.49588859081268
## P25,6,45,1.48990436476104
## P25,6,46,1.49091173740143
## P25,6,47,1.49192552268505
## P25,6,48,1.49089961392539
## P25,6,49,1.4900776755135
## P25,6,50,1.49192872254745
## P25,7,1,1.491131327369
## P25,7,2,1.49036510225753
## P25,7,3,1.49135108110381
## P25,7,4,1.49134344589419
## P25,7,5,1.49010493074145
## P25,7,6,1.49192643165588
## P25,7,7,1.49208322484443
## P25,7,8,1.49219595355752
## P25,7,9,1.4904182434082
## P25,7,10,1.49123513130915
## P25,7,11,1.48942438161598
## P25,7,12,1.49079135217165
## P25,7,13,1.48997088729358
## P25,7,14,1.49076626517556
## P25,7,15,1.49121586726262
## P25,7,16,1.49132351691906
## P25,7,17,1.49146808385849
## P25,7,18,1.49172200713047
## P25,7,19,1.49066332639274
## P25,7,20,1.49072436988354
## P25,7,21,1.49360573001024
## P25,7,22,1.4911913940872
## P25,7,23,1.49107696164039
## P25,7,24,1.4913644419088
## P25,7,25,1.48858085431551
## P25,7,26,1.49105019429151
## P25,7,27,1.49070612589518
## P25,7,28,1.49300590091281
## P25,7,29,1.49107983708382
## P25,7,30,1.49065546014092
## P25,7,31,1.49134489468166
## P25,7,32,1.49126517110401
## P25,7,33,1.49199786037207
## P25,7,34,1.49061796582978
## P25,7,35,1.49021776822897
## P25,7,36,1.49189344406128
## P25,7,37,1.49061813059541
## P25,7,38,1.4918006639632
## P25,7,39,1.4908525196474
## P25,7,40,1.49144525425408
## P25,7,41,1.48939743041992
## P25,7,42,1.49086609908513
## P25,7,43,1.49108691954277
## P25,7,44,1.49091238199278
## P25,7,45,1.49019495078496
## P25,7,46,1.49109726203115
## P25,7,47,1.49132027409293
## P25,7,48,1.49087712981484
## P25,7,49,1.49093632698059
## P25,7,50,1.49154808749891
## P25,8,1,1.49059955085196
## P25,8,2,1.48810720443726
## P25,8,3,1.49150484195654
## P25,8,4,1.49030045575874
## P25,8,5,1.49119515338186
## P25,8,6,1.49031799930637
## P25,8,7,1.49307839687054
## P25,8,8,1.49090004648481
## P25,8,9,1.49050514321578
## P25,8,10,1.49196971893311
## P25,8,11,1.49090064582178
## P25,8,12,1.49133824747662
## P25,8,13,1.49115347552609
## P25,8,14,1.49279471990224
## P25,8,15,1.49089229923405
## P25,8,16,1.49100003923689
## P25,8,17,1.49242996842894
## P25,8,18,1.49030851434778
## P25,8,19,1.49390781493414
## P25,8,20,1.49195854398939
## P25,8,21,1.48994048436483
## P25,8,22,1.48934010716228
## P25,8,23,1.4911860037541
## P25,8,24,1.49107598341428
## P25,8,25,1.4921875
## P25,8,26,1.49190381973509
## P25,8,27,1.49223770113552
## P25,8,28,1.49123310686937
## P25,8,29,1.49126557416694
## P25,8,30,1.49274304817463
## P25,8,31,1.49140148361524
## P25,8,32,1.49047038175058
## P25,8,33,1.49115126273211
## P25,8,34,1.49192639943716
## P25,8,35,1.49095492485242
## P25,8,36,1.49379478891691
## P25,8,37,1.49164589246114
## P25,8,38,1.49215027983759
## P25,8,39,1.49111641777886
## P25,8,40,1.49101966619492
## P25,8,41,1.49187317559885
## P25,8,42,1.49082006842403
## P25,8,43,1.49097879471317
## P25,8,44,1.48865977086519
## P25,8,45,1.49226751534835
## P25,8,46,1.48978717803955
## P25,8,47,1.49111219406128
## P25,8,48,1.49156709927232
## P25,8,49,1.49058543080869
## P25,8,50,1.49150884068096
## P25,9,1,1.49017691266709
## P25,9,2,1.49074799978911
## P25,9,3,1.49109794813044
## P25,9,4,1.49113965988159
## P25,9,5,1.49157978359022
## P25,9,6,1.49066796818295
## P25,9,7,1.49136568199505
## P25,9,8,1.49030101097236
## P25,9,9,1.48994134820026
## P25,9,10,1.49091971362079
## P25,9,11,1.4906843550065
## P25,9,12,1.49108266830444
## P25,9,13,1.49083128208067
## P25,9,14,1.4906813176473
## P25,9,15,1.49134277197031
## P25,9,16,1.49341733639057
## P25,9,17,1.49129669897018
## P25,9,18,1.4904400864426
## P25,9,19,1.4898296546936
## P25,9,20,1.49045179912022
## P25,9,21,1.49223766828838
## P25,9,22,1.49311484360113
## P25,9,23,1.48885349198884
## P25,9,24,1.49205034429377
## P25,9,25,1.49138620537771
## P25,9,26,1.48936485917601
## P25,9,27,1.49196025922701
## P25,9,28,1.49293310301644
## P25,9,29,1.48829465253013
## P25,9,30,1.49125000408718
## P25,9,31,1.49253858503748
## P25,9,32,1.48726780073983
## P25,9,33,1.49006549517314
## P25,9,34,1.49196878501347
## P25,9,35,1.49101967281765
## P25,9,36,1.49181081630565
## P25,9,37,1.49144716262817
## P25,9,38,1.49217754602432
## P25,9,39,1.49265162568343
## P25,9,40,1.49072629213333
## P25,9,41,1.49058038847787
## P25,9,42,1.49320487678051
## P25,9,43,1.48929262918139
## P25,9,44,1.49214531735676
## P25,9,45,1.49056965827942
## P25,9,46,1.49080493352185
## P25,9,47,1.49180832776156
## P25,9,48,1.49215152046897
## P25,9,49,1.48975129030189
## P25,9,50,1.49139013290405
## P25,10,1,1.49227899312973
## P25,10,2,1.48893748862403
## P25,10,3,1.49361531630806
## P25,10,4,1.49098996520042
## P25,10,5,1.4906717206611
## P25,10,6,1.48870492592836
## P25,10,7,1.49395629836292
## P25,10,8,1.49154260510304
## P25,10,9,1.49081548849742
## P25,10,10,1.49060099124908
## P25,10,11,1.49116510911421
## P25,10,12,1.4911071896553
## P25,10,13,1.49196412828234
## P25,10,14,1.49190465927124
## P25,10,15,1.49043475348374
## P25,10,16,1.49047827234074
## P25,10,17,1.4911632144574
## P25,10,18,1.49082476121408
## P25,10,19,1.49240532288185
## P25,10,20,1.49117949839388
## P25,10,21,1.49159432068849
## P25,10,22,1.49323236942291
## P25,10,23,1.49594759411282
## P25,10,24,1.49003852781702
## P25,10,25,1.49062799745136
## P25,10,26,1.4907888479011
## P25,10,27,1.49160632695237
## P25,10,28,1.49161408742269
## P25,10,29,1.49081505381543
## P25,10,30,1.49177299029585
## P25,10,31,1.4909363190333
## P25,10,32,1.48979206879934
## P25,10,33,1.49208560483209
## P25,10,34,1.49180279768907
## P25,10,35,1.49175678599964
## P25,10,36,1.49182010442019
## P25,10,37,1.48909786895469
## P25,10,38,1.49422825143692
## P25,10,39,1.4907725088058
## P25,10,40,1.4920415699482
## P25,10,41,1.49200162731233
## P25,10,42,1.49170093644749
## P25,10,43,1.4929816344074
## P25,10,44,1.48812500408718
## P25,10,45,1.49020575560056
## P25,10,46,1.4918636928002
## P25,10,47,1.49148836240664
## P25,10,48,1.48888673280415
## P25,10,49,1.49185349894505
## P25,10,50,1.4913724977143
## P26,1,1,1.49412046487515
## P26,1,2,1.48801802744908
## P26,1,3,1.49088639401375
## P26,1,4,1.47927780871121
## P26,1,5,1.49169859519372
## P26,1,6,1.49510260990688
## P26,1,7,1.49494651255717
## P26,1,8,1.49073864673746
## P26,1,9,1.49614281267733
## P26,1,10,1.49253581251417
## P26,1,11,1.48827322504737
## P26,1,12,1.48787229201373
## P26,1,13,1.48778266415877
## P26,1,14,1.49072420902741
## P26,1,15,1.48640546491069
## P26,1,16,1.48434521420167
## P26,1,17,1.48862405135253
## P26,1,18,1.49609946002479
## P26,1,19,1.49755606350598
## P26,1,20,1.49537920554479
## P26,1,21,1.49955114987817
## P26,1,22,1.48996875551012
## P26,1,23,1.49726988139905
## P26,1,24,1.49526090725608
## P26,1,25,1.48863633619536
## P26,1,26,1.49591617023244
## P26,1,27,1.49228854648402
## P26,1,28,1.4941447628869
## P26,1,29,1.48783360671997
## P26,1,30,1.48459409966188
## P26,1,31,1.49403635423575
## P26,1,32,1.49198704091912
## P26,1,33,1.4894706327088
## P26,1,34,1.49098785821494
## P26,1,35,1.4873848689927
## P26,1,36,1.4867283783707
## P26,1,37,1.49230264711984
## P26,1,38,1.48625767230988
## P26,1,39,1.49575225512187
## P26,1,40,1.49652582666148
## P26,1,41,1.49665004488022
## P26,1,42,1.48945626576742
## P26,1,43,1.49241238201366
## P26,1,44,1.49186280020352
## P26,1,45,1.48846603208973
## P26,1,46,1.48897976345486
## P26,1,47,1.49187427991396
## P26,1,48,1.50965827987308
## P26,1,49,1.4847908162359
## P26,1,50,1.49039996486821
## P26,2,1,1.49238842725754
## P26,2,2,1.48293697624876
## P26,2,3,1.49769022933438
## P26,2,4,1.49137669801712
## P26,2,5,1.48441706712429
## P26,2,6,1.49138803482056
## P26,2,7,1.49389717952315
## P26,2,8,1.49042925991855
## P26,2,9,1.49560602336911
## P26,2,10,1.49566980600357
## P26,2,11,1.49850200116634
## P26,2,12,1.50749398841233
## P26,2,13,1.4959901048896
## P26,2,14,1.49346202261308
## P26,2,15,1.49304172469348
## P26,2,16,1.51690195224903
## P26,2,17,1.50833687517378
## P26,2,18,1.48188592706408
## P26,2,19,1.49196142861337
## P26,2,20,1.49034906470257
## P26,2,21,1.49368030252591
## P26,2,22,1.49296393761268
## P26,2,23,1.48954207880967
## P26,2,24,1.48773206131799
## P26,2,25,1.49485340204325
## P26,2,26,1.49552257146154
## P26,2,27,1.49221252713885
## P26,2,28,1.49107324558756
## P26,2,29,1.50556880074578
## P26,2,30,1.49049429191175
## P26,2,31,1.49295135297273
## P26,2,32,1.48613029302553
## P26,2,33,1.49658732144338
## P26,2,34,1.48556624288144
## P26,2,35,1.49626783422522
## P26,2,36,1.48914349356363
## P26,2,37,1.49677429618416
## P26,2,38,1.49434493293225
## P26,2,39,1.49110209619677
## P26,2,40,1.49198028776381
## P26,2,41,1.48874414951429
## P26,2,42,1.48404449329042
## P26,2,43,1.4900198117742
## P26,2,44,1.49076825763107
## P26,2,45,1.48540402821132
## P26,2,46,1.49105141321818
## P26,2,47,1.50102541550346
## P26,2,48,1.49035305397533
## P26,2,49,1.492326548225
## P26,2,50,1.48837267851629
## P26,3,1,1.48662739576295
## P26,3,2,1.49302424490452
## P26,3,3,1.49089766873254
## P26,3,4,1.48667523716435
## P26,3,5,1.49293649991353
## P26,3,6,1.49626731872559
## P26,3,7,1.48889918290367
## P26,3,8,1.48478250320141
## P26,3,9,1.45640246073405
## P26,3,10,1.49042907750831
## P26,3,11,1.49412325925605
## P26,3,12,1.50248372113263
## P26,3,13,1.48149096338372
## P26,3,14,1.48768330273563
## P26,3,15,1.49016850703471
## P26,3,16,1.49289433026718
## P26,3,17,1.49814978413198
## P26,3,18,1.5092100415911
## P26,3,19,1.4892446729872
## P26,3,20,1.50313280998392
## P26,3,21,1.48963391780853
## P26,3,22,1.49299709002177
## P26,3,23,1.48941501864681
## P26,3,24,1.48612858355045
## P26,3,25,1.48849172469897
## P26,3,26,1.49758159001668
## P26,3,27,1.48581746598365
## P26,3,28,1.47793931325277
## P26,3,29,1.49948963571767
## P26,3,30,1.48414926271181
## P26,3,31,1.49496029518746
## P26,3,32,1.49010501236751
## P26,3,33,1.48875119951036
## P26,3,34,1.49908883850296
## P26,3,35,1.49590385610407
## P26,3,36,1.49713420413789
## P26,3,37,1.49124159003204
## P26,3,38,1.48628367548404
## P26,3,39,1.48910394648916
## P26,3,40,1.49357985287178
## P26,3,41,1.5384374494138
## P26,3,42,1.49348520097278
## P26,3,43,1.49027758294886
## P26,3,44,1.50988694826762
## P26,3,45,1.45643830299377
## P26,3,46,1.49025716781616
## P26,3,47,1.49194472630819
## P26,3,48,1.4898114916104
## P26,3,49,1.46543351994004
## P26,3,50,1.51660066492417
## P26,4,1,1.49801750481129
## P26,4,2,1.49213528146549
## P26,4,3,1.49048138871978
## P26,4,4,1.49413942086576
## P26,4,5,1.49717850034887
## P26,4,6,1.4912382043818
## P26,4,7,1.48486149138299
## P26,4,8,1.50752231177934
## P26,4,9,1.48697529898749
## P26,4,10,1.48845621517726
## P26,4,11,1.49257169528441
## P26,4,12,1.49938618947589
## P26,4,13,1.48699266055845
## P26,4,14,1.49825192987919
## P26,4,15,1.49749342333369
## P26,4,16,1.49480085838132
## P26,4,17,1.47953610043777
## P26,4,18,1.49517324235704
## P26,4,19,1.48000532388687
## P26,4,20,1.50305368160379
## P26,4,21,1.49941648377313
## P26,4,22,1.48614148343547
## P26,4,23,1.49507185003974
## P26,4,24,1.49110397925744
## P26,4,25,1.48259293143429
## P26,4,26,1.49040400981903
## P26,4,27,1.48955987824334
## P26,4,28,1.49108158458363
## P26,4,29,1.48681468348349
## P26,4,30,1.49791261424189
## P26,4,31,1.48337217391007
## P26,4,32,1.48907618089156
## P26,4,33,1.48288702047788
## P26,4,34,1.47967806527781
## P26,4,35,1.49335941775092
## P26,4,36,1.49848025420616
## P26,4,37,1.49259468487331
## P26,4,38,1.48395375282534
## P26,4,39,1.48616335391998
## P26,4,40,1.48969723006426
## P26,4,41,1.47579419272287
## P26,4,42,1.50751324917408
## P26,4,43,1.4862431740576
## P26,4,44,1.49268186092377
## P26,4,45,1.5070625366988
## P26,4,46,1.4955364757114
## P26,4,47,1.48569692430042
## P26,4,48,1.48633156882392
## P26,4,49,1.49594552940297
## P26,4,50,1.49304228017826
## P26,5,1,1.47741702686657
## P26,5,2,1.48947550388093
## P26,5,3,1.49170655295962
## P26,5,4,1.49545181558487
## P26,5,5,1.49050731302422
## P26,5,6,1.48986862143692
## P26,5,7,1.49696686328986
## P26,5,8,1.49019467830658
## P26,5,9,1.49105534902433
## P26,5,10,1.49118851962155
## P26,5,11,1.48939778804779
## P26,5,12,1.49938874774509
## P26,5,13,1.4831191347791
## P26,5,14,1.48641953281328
## P26,5,15,1.49700718040926
## P26,5,16,1.47478494924657
## P26,5,17,1.49248339545052
## P26,5,18,1.49484434723854
## P26,5,19,1.48770083321465
## P26,5,20,1.49203651202352
## P26,5,21,1.49115407892636
## P26,5,22,1.47982816438417
## P26,5,23,1.49166798265013
## P26,5,24,1.50503579099128
## P26,5,25,1.49959024492201
## P26,5,26,1.49856244737857
## P26,5,27,1.50077847776742
## P26,5,28,1.49556070660788
## P26,5,29,1.49190304717239
## P26,5,30,1.48583313647439
## P26,5,31,1.49209007562376
## P26,5,32,1.49191471735636
## P26,5,33,1.48848980351498
## P26,5,34,1.49833220997076
## P26,5,35,1.48677706718445
## P26,5,36,1.48563899550327
## P26,5,37,1.49910599844796
## P26,5,38,1.49347912669182
## P26,5,39,1.49095314602519
## P26,5,40,1.49344745990449
## P26,5,41,1.48229832010171
## P26,5,42,1.48396573895993
## P26,5,43,1.4708149989446
## P26,5,44,1.48571955607488
## P26,5,45,1.48687791824341
## P26,5,46,1.49436907725291
## P26,5,47,1.47809210945578
## P26,5,48,1.49038574488267
## P26,5,49,1.48880353655134
## P26,5,50,1.4912190531507
## P26,6,1,1.49279549063706
## P26,6,2,1.49268633070446
## P26,6,3,1.49178643946378
## P26,6,4,1.49120169732629
## P26,6,5,1.49120990504389
## P26,6,6,1.49162713024351
## P26,6,7,1.49168354425675
## P26,6,8,1.49161965506417
## P26,6,9,1.49241828918457
## P26,6,10,1.49288873775031
## P26,6,11,1.49044071154648
## P26,6,12,1.49287422432387
## P26,6,13,1.49094982393857
## P26,6,14,1.49206975755237
## P26,6,15,1.49083126715894
## P26,6,16,1.49053740327376
## P26,6,17,1.49050155179254
## P26,6,18,1.49586153030396
## P26,6,19,1.49193658485069
## P26,6,20,1.49194441008013
## P26,6,21,1.49660590637562
## P26,6,22,1.48622311486138
## P26,6,23,1.48970118398252
## P26,6,24,1.47824432055155
## P26,6,25,1.49384548857405
## P26,6,26,1.49639486011706
## P26,6,27,1.49211446629014
## P26,6,28,1.49252298603887
## P26,6,29,1.49242121191586
## P26,6,30,1.49863868100303
## P26,6,31,1.48262332249614
## P26,6,32,1.49597418826559
## P26,6,33,1.48943996799085
## P26,6,34,1.48694661482057
## P26,6,35,1.49330351829529
## P26,6,36,1.49166847705841
## P26,6,37,1.49259881383365
## P26,6,38,1.4948177824215
## P26,6,39,1.49467576117743
## P26,6,40,1.48265990728064
## P26,6,41,1.50017791098737
## P26,6,42,1.49045916607505
## P26,6,43,1.50211869753324
## P26,6,44,1.49227960817106
## P26,6,45,1.47823266015537
## P26,6,46,1.51036116239187
## P26,6,47,1.4976818220956
## P26,6,48,1.48005171383128
## P26,6,49,1.5020756509569
## P26,6,50,1.48846992466548
## P26,7,1,1.50139230092367
## P26,7,2,1.49346213070851
## P26,7,3,1.48498040590531
## P26,7,4,1.49490510155173
## P26,7,5,1.48880617435162
## P26,7,6,1.4969230064979
## P26,7,7,1.49040327753339
## P26,7,8,1.49161322655216
## P26,7,9,1.49187401624826
## P26,7,10,1.4824313663301
## P26,7,11,1.4946800388702
## P26,7,12,1.4897472228127
## P26,7,13,1.49121365723787
## P26,7,14,1.48859230388295
## P26,7,15,1.49158401167795
## P26,7,16,1.48693435443075
## P26,7,17,1.49244718551636
## P26,7,18,1.495243208124
## P26,7,19,1.49936087052901
## P26,7,20,1.48710229457953
## P26,7,21,1.48740037456974
## P26,7,22,1.50160999774933
## P26,7,23,1.49547636284018
## P26,7,24,1.49002743315423
## P26,7,25,1.49149038815739
## P26,7,26,1.49125811503484
## P26,7,27,1.48990291502418
## P26,7,28,1.49055780862507
## P26,7,29,1.49296716163898
## P26,7,30,1.49020689091784
## P26,7,31,1.49088840051131
## P26,7,32,1.47788435913796
## P26,7,33,1.49276347593828
## P26,7,34,1.4892148176829
## P26,7,35,1.4919774711773
## P26,7,36,1.49139601475484
## P26,7,37,1.48940259037596
## P26,7,38,1.49365761972243
## P26,7,39,1.48954466831537
## P26,7,40,1.49266496300697
## P26,7,41,1.4904494990002
## P26,7,42,1.4909170301337
## P26,7,43,1.48976417867149
## P26,7,44,1.49223222452052
## P26,7,45,1.49104852676392
## P26,7,46,1.49143395846403
## P26,7,47,1.48413665959092
## P26,7,48,1.49394022050451
## P26,7,49,1.4908030072848
## P26,7,50,1.49017552768483
## P26,8,1,1.49029062640282
## P26,8,2,1.49015214920044
## P26,8,3,1.49007989319277
## P26,8,4,1.49113368988037
## P26,8,5,1.49069202624685
## P26,8,6,1.49103082550897
## P26,8,7,1.49031001643131
## P26,8,8,1.49177166035301
## P26,8,9,1.49055823485057
## P26,8,10,1.49052269416943
## P26,8,11,1.49310607730218
## P26,8,12,1.49298767457929
## P26,8,13,1.49271299288823
## P26,8,14,1.49166670299712
## P26,8,15,1.49080738813981
## P26,8,16,1.48891025185585
## P26,8,17,1.49349246458574
## P26,8,18,1.48937902894131
## P26,8,19,1.49339662945789
## P26,8,20,1.4901696741581
## P26,8,21,1.4915231987834
## P26,8,22,1.49281177765284
## P26,8,23,1.48826966603597
## P26,8,24,1.48997449388309
## P26,8,25,1.49171430724008
## P26,8,26,1.48927840709686
## P26,8,27,1.49144877706255
## P26,8,28,1.48876961602105
## P26,8,29,1.49098358983579
## P26,8,30,1.49203885022332
## P26,8,31,1.4919296836853
## P26,8,32,1.49196878134036
## P26,8,33,1.49963568102929
## P26,8,34,1.49179835941481
## P26,8,35,1.4913422289029
## P26,8,36,1.50624574849635
## P26,8,37,1.48182826931194
## P26,8,38,1.48588376953488
## P26,8,39,1.48471218202172
## P26,8,40,1.49874015152454
## P26,8,41,1.49279754812067
## P26,8,42,1.50304042420736
## P26,8,43,1.48258451315073
## P26,8,44,1.49034901632779
## P26,8,45,1.50029196796647
## P26,8,46,1.46876313177387
## P26,8,47,1.50459535449159
## P26,8,48,1.49567565807076
## P26,8,49,1.48080708616871
## P26,8,50,1.49208045315433
## P26,9,1,1.48858218987783
## P26,9,2,1.4906844769494
## P26,9,3,1.49227015177409
## P26,9,4,1.48589371079984
## P26,9,5,1.49426151843781
## P26,9,6,1.48823778737675
## P26,9,7,1.492112749874
## P26,9,8,1.4900134007136
## P26,9,9,1.48996992220824
## P26,9,10,1.4958464788354
## P26,9,11,1.49090190614973
## P26,9,12,1.48931149336008
## P26,9,13,1.48884467283885
## P26,9,14,1.492779991206
## P26,9,15,1.49047755312037
## P26,9,16,1.49050634138046
## P26,9,17,1.49066462179627
## P26,9,18,1.49245861710095
## P26,9,19,1.49074226040994
## P26,9,20,1.49023429463419
## P26,9,21,1.49249071545071
## P26,9,22,1.49126212890834
## P26,9,23,1.49085994264973
## P26,9,24,1.49038664799816
## P26,9,25,1.49238532781601
## P26,9,26,1.49022145952497
## P26,9,27,1.49134912113152
## P26,9,28,1.490831952346
## P26,9,29,1.4894352555275
## P26,9,30,1.49244295719058
## P26,9,31,1.48499090709384
## P26,9,32,1.49757653852052
## P26,9,33,1.4905289446266
## P26,9,34,1.49283746526211
## P26,9,35,1.49282148906163
## P26,9,36,1.48930302725898
## P26,9,37,1.48720341759759
## P26,9,38,1.49144742753771
## P26,9,39,1.49323919084337
## P26,9,40,1.49076512076638
## P26,9,41,1.48878555021424
## P26,9,42,1.49155948929867
## P26,9,43,1.48897134024521
## P26,9,44,1.49211973043588
## P26,9,45,1.48907034364465
## P26,9,46,1.49358761076834
## P26,9,47,1.49080976946601
## P26,9,48,1.49124636433341
## P26,9,49,1.4922475898475
## P26,9,50,1.49117531946727
## P26,10,1,1.49100926914046
## P26,10,2,1.48943556872281
## P26,10,3,1.48976433855816
## P26,10,4,1.48924756395644
## P26,10,5,1.49125214704533
## P26,10,6,1.49143561194925
## P26,10,7,1.4913884120829
## P26,10,8,1.48906174684182
## P26,10,9,1.49285778668847
## P26,10,10,1.48878553437024
## P26,10,11,1.49135771050917
## P26,10,12,1.48319878383559
## P26,10,13,1.4998464709834
## P26,10,14,1.48961308935414
## P26,10,15,1.49102707398243
## P26,10,16,1.49058497336603
## P26,10,17,1.49083694990943
## P26,10,18,1.49063278467227
## P26,10,19,1.48989591115638
## P26,10,20,1.49165290739478
## P26,10,21,1.49131298065186
## P26,10,22,1.48809523809524
## P26,10,23,1.4912005480598
## P26,10,24,1.4946784708235
## P26,10,25,1.49302296016527
## P26,10,26,1.48876640873571
## P26,10,27,1.49086763461431
## P26,10,28,1.4853863229557
## P26,10,29,1.49281137254503
## P26,10,30,1.48968163581744
## P26,10,31,1.4877152626331
## P26,10,32,1.49162727168628
## P26,10,33,1.49049826122466
## P26,10,34,1.49061104716087
## P26,10,35,1.49168800989787
## P26,10,36,1.49099765104406
## P26,10,37,1.48399784781716
## P26,10,38,1.50107198953629
## P26,10,39,1.49185710906982
## P26,10,40,1.49354647246885
## P26,10,41,1.48973740372702
## P26,10,42,1.49212803522746
## P26,10,43,1.49133402329904
## P26,10,44,1.4906480541596
## P26,10,45,1.49166709681352
## P26,10,46,1.49075977942523
## P26,10,47,1.49127063384423
## P26,10,48,1.4910087491026
## P26,10,49,1.48873737816499
## P26,10,50,1.49089841769009
## P27,1,1,1.49242770880984
## P27,1,2,1.49111338386759
## P27,1,3,1.49250188100906
## P27,1,4,1.49176567251032
## P27,1,5,1.49173252775862
## P27,1,6,1.49155414426649
## P27,1,7,1.49306685639998
## P27,1,8,1.49280853505515
## P27,1,9,1.49183349656354
## P27,1,10,1.49185973466045
## P27,1,11,1.49143373722933
## P27,1,12,1.49174738789464
## P27,1,13,1.49382692064558
## P27,1,14,1.49100074061641
## P27,1,15,1.49482927651241
## P27,1,16,1.49147524436315
## P27,1,17,1.48723415752034
## P27,1,18,1.49203585456399
## P27,1,19,1.49067470550537
## P27,1,20,1.49209308624268
## P27,1,21,1.48847968761738
## P27,1,22,1.49743944406509
## P27,1,23,1.48629454491844
## P27,1,24,1.49196340951575
## P27,1,25,1.48716743239041
## P27,1,26,1.48586597690335
## P27,1,27,1.4906361665183
## P27,1,28,1.48951969146729
## P27,1,29,1.48993482011737
## P27,1,30,1.49041819572449
## P27,1,31,1.49045272805225
## P27,1,32,1.49309314707274
## P27,1,33,1.49036894738674
## P27,1,34,1.49046081449927
## P27,1,35,1.48861839221074
## P27,1,36,1.49083095981229
## P27,1,37,1.49277361356295
## P27,1,38,1.49325799007042
## P27,1,39,1.48946397503217
## P27,1,40,1.4918676387696
## P27,1,41,1.49216383979434
## P27,1,42,1.49058921309723
## P27,1,43,1.49390437279219
## P27,1,44,1.49279041399901
## P27,1,45,1.49229308537075
## P27,1,46,1.49232897039962
## P27,1,47,1.49102687835693
## P27,1,48,1.49640897045965
## P27,1,49,1.48450421478789
## P27,1,50,1.49205997357002
## P27,2,1,1.49272612343847
## P27,2,2,1.4914335542255
## P27,2,3,1.49919232681616
## P27,2,4,1.49035192198224
## P27,2,5,1.45700670748341
## P27,2,6,1.48969877999404
## P27,2,7,1.48697286605835
## P27,2,8,1.49253203505177
## P27,2,9,1.48867358067992
## P27,2,10,1.49827295869261
## P27,2,11,1.48494536301185
## P27,2,12,1.50212915576234
## P27,2,13,1.49798627547276
## P27,2,14,1.48608023779733
## P27,2,15,1.49309372068285
## P27,2,16,1.49155985947811
## P27,2,17,1.49031446038223
## P27,2,18,1.4993489406727
## P27,2,19,1.49392393959893
## P27,2,20,1.49285942110522
## P27,2,21,1.50476597506424
## P27,2,22,1.4937338502998
## P27,2,23,1.49049517512321
## P27,2,24,1.48974707013085
## P27,2,25,1.49352767843949
## P27,2,26,1.49060054829246
## P27,2,27,1.48911317702263
## P27,2,28,1.4927839407554
## P27,2,29,1.49209619970883
## P27,2,30,1.51414317670076
## P27,2,31,1.48691221311981
## P27,2,32,1.49357891082764
## P27,2,33,1.48904254436493
## P27,2,34,1.49035561390412
## P27,2,35,1.492231700046
## P27,2,36,1.49421700901455
## P27,2,37,1.48959573557679
## P27,2,38,1.48641293927243
## P27,2,39,1.48119096098275
## P27,2,40,1.49780657450358
## P27,2,41,1.49044048289458
## P27,2,42,1.49113133748372
## P27,2,43,1.4922920309979
## P27,2,44,1.49102137809576
## P27,2,45,1.49160412042448
## P27,2,46,1.49310110597049
## P27,2,47,1.48731545607249
## P27,2,48,1.49309826870354
## P27,2,49,1.49258638752831
## P27,2,50,1.490807666407
## P27,3,1,1.49097900390625
## P27,3,2,1.49388571941491
## P27,3,3,1.49000652189608
## P27,3,4,1.49076856568802
## P27,3,5,1.49648236191791
## P27,3,6,1.49192512899205
## P27,3,7,1.48629941192328
## P27,3,8,1.49079977499472
## P27,3,9,1.48873210906982
## P27,3,10,1.49386085312942
## P27,3,11,1.49422764778137
## P27,3,12,1.48936105281749
## P27,3,13,1.49182638940932
## P27,3,14,1.49089885552724
## P27,3,15,1.4905855699019
## P27,3,16,1.49233438476684
## P27,3,17,1.48871959050496
## P27,3,18,1.47503319121244
## P27,3,19,1.49119582105039
## P27,3,20,1.49174785614014
## P27,3,21,1.49482509713424
## P27,3,22,1.49139233926932
## P27,3,23,1.49043784602996
## P27,3,24,1.4908678126785
## P27,3,25,1.49141833022401
## P27,3,26,1.49180121236033
## P27,3,27,1.49368288642482
## P27,3,28,1.48667932959164
## P27,3,29,1.4927926381429
## P27,3,30,1.48764654209739
## P27,3,31,1.49514836976022
## P27,3,32,1.49455925134512
## P27,3,33,1.4913382423058
## P27,3,34,1.48303610483805
## P27,3,35,1.49331584673249
## P27,3,36,1.49153220653534
## P27,3,37,1.48948389775044
## P27,3,38,1.49011045589782
## P27,3,39,1.499100473192
## P27,3,40,1.49072744296147
## P27,3,41,1.49313978830973
## P27,3,42,1.49161258987758
## P27,3,43,1.48949437288894
## P27,3,44,1.49043830654077
## P27,3,45,1.49312217651852
## P27,3,46,1.49253190966213
## P27,3,47,1.49089319537384
## P27,3,48,1.49020485579967
## P27,3,49,1.4891446352005
## P27,3,50,1.49033720016479
## P27,4,1,1.49079022237233
## P27,4,2,1.49220095361982
## P27,4,3,1.49244207582976
## P27,4,4,1.49082090688306
## P27,4,5,1.49785321553548
## P27,4,6,1.49286325516239
## P27,4,7,1.49183357556661
## P27,4,8,1.49072259206038
## P27,4,9,1.49160636266073
## P27,4,10,1.48889888127645
## P27,4,11,1.49180837720633
## P27,4,12,1.4905266073015
## P27,4,13,1.49019789439376
## P27,4,14,1.49171859285106
## P27,4,15,1.49158115519418
## P27,4,16,1.49050827871395
## P27,4,17,1.49142566680908
## P27,4,18,1.49171304066976
## P27,4,19,1.49177477940792
## P27,4,20,1.49328463141983
## P27,4,21,1.49063493587353
## P27,4,22,1.49033298492432
## P27,4,23,1.49158935035978
## P27,4,24,1.49192469190843
## P27,4,25,1.49184618276708
## P27,4,26,1.49071380671333
## P27,4,27,1.49145774737648
## P27,4,28,1.49155983298716
## P27,4,29,1.49114106074873
## P27,4,30,1.49101455499094
## P27,4,31,1.49157557075406
## P27,4,32,1.49191780944369
## P27,4,33,1.49032762024429
## P27,4,34,1.49153608289258
## P27,4,35,1.49226343631744
## P27,4,36,1.4925232231617
## P27,4,37,1.49086719801446
## P27,4,38,1.49198483427366
## P27,4,39,1.49137660388289
## P27,4,40,1.49246564332177
## P27,4,41,1.49118211083378
## P27,4,42,1.49082641132542
## P27,4,43,1.49199820673743
## P27,4,44,1.49128236888367
## P27,4,45,1.49146556854248
## P27,4,46,1.49292650738278
## P27,4,47,1.49131183998258
## P27,4,48,1.4904082775116
## P27,4,49,1.49082932839027
## P27,4,50,1.48829460144043
## P27,5,1,1.49024013172496
## P27,5,2,1.49154201808729
## P27,5,3,1.49118788043658
## P27,5,4,1.49157565884886
## P27,5,5,1.49252582496067
## P27,5,6,1.49187719345093
## P27,5,7,1.49182680674962
## P27,5,8,1.49130363975252
## P27,5,9,1.49133909612462
## P27,5,10,1.49251557985942
## P27,5,11,1.49147882206099
## P27,5,12,1.49207596302032
## P27,5,13,1.49144828175924
## P27,5,14,1.49184759457906
## P27,5,15,1.49347442984581
## P27,5,16,1.48557753422681
## P27,5,17,1.4918499818215
## P27,5,18,1.49241584585619
## P27,5,19,1.48996084928513
## P27,5,20,1.4911974756806
## P27,5,21,1.49009461402893
## P27,5,22,1.49053119324349
## P27,5,23,1.48955618784978
## P27,5,24,1.49270390241574
## P27,5,25,1.49079963476351
## P27,5,26,1.49153474244204
## P27,5,27,1.49178923731265
## P27,5,28,1.4911760456708
## P27,5,29,1.49278102078281
## P27,5,30,1.49380967154432
## P27,5,31,1.49280776580175
## P27,5,32,1.491452197506
## P27,5,33,1.49272165050754
## P27,5,34,1.49106148573068
## P27,5,35,1.49082260692821
## P27,5,36,1.49194551884443
## P27,5,37,1.48555661084359
## P27,5,38,1.49111893773079
## P27,5,39,1.48336947758993
## P27,5,40,1.49164692560832
## P27,5,41,1.49108257840891
## P27,5,42,1.49167499747328
## P27,5,43,1.49227491178011
## P27,5,44,1.48768728712331
## P27,5,45,1.49211387974875
## P27,5,46,1.49158275695074
## P27,5,47,1.49228879064322
## P27,5,48,1.49300794040456
## P27,5,49,1.49310869394347
## P27,5,50,1.49009160368655
## P27,6,1,1.49374692166438
## P27,6,2,1.49214491059509
## P27,6,3,1.49005170159497
## P27,6,4,1.49275169607069
## P27,6,5,1.49265741633478
## P27,6,6,1.4917846343347
## P27,6,7,1.49171300843961
## P27,6,8,1.49184497471513
## P27,6,9,1.49276125598961
## P27,6,10,1.49236582397321
## P27,6,11,1.491934062569
## P27,6,12,1.49149311694902
## P27,6,13,1.49283558238636
## P27,6,14,1.4932650190885
## P27,6,15,1.49304470723989
## P27,6,16,1.49124837363208
## P27,6,17,1.49202197248285
## P27,6,18,1.49705952996606
## P27,6,19,1.49249814538395
## P27,6,20,1.49139907219831
## P27,6,21,1.49198547162508
## P27,6,22,1.49230818275933
## P27,6,23,1.49217963564223
## P27,6,24,1.49244660957187
## P27,6,25,1.49209959707528
## P27,6,26,1.492996695992
## P27,6,27,1.48708922522409
## P27,6,28,1.48963778626685
## P27,6,29,1.4915574170925
## P27,6,30,1.49298021295568
## P27,6,31,1.49136199951172
## P27,6,32,1.49311858415604
## P27,6,33,1.49219158887863
## P27,6,34,1.49223675476877
## P27,6,35,1.49239289419992
## P27,6,36,1.49177660999528
## P27,6,37,1.49140996403164
## P27,6,38,1.49089117895199
## P27,6,39,1.49166345934496
## P27,6,40,1.49019874375442
## P27,6,41,1.49214649200439
## P27,6,42,1.49164488291976
## P27,6,43,1.49214120454426
## P27,6,44,1.49059932761722
## P27,6,45,1.49153755469756
## P27,6,46,1.48990548331783
## P27,6,47,1.49151535387392
## P27,6,48,1.4922947032111
## P27,6,49,1.49202906092008
## P27,6,50,1.49089332669973
## P27,7,1,1.49218124371988
## P27,7,2,1.49173317971777
## P27,7,3,1.49153809484683
## P27,7,4,1.49189046223958
## P27,7,5,1.49171257954018
## P27,7,6,1.4911885695024
## P27,7,7,1.49183188867933
## P27,7,8,1.49127876190912
## P27,7,9,1.49147357611821
## P27,7,10,1.49400512071756
## P27,7,11,1.4912342486843
## P27,7,12,1.49118173331545
## P27,7,13,1.49222603966208
## P27,7,14,1.49197706629018
## P27,7,15,1.49066966374715
## P27,7,16,1.49205238635723
## P27,7,17,1.4917418721696
## P27,7,18,1.49187277257442
## P27,7,19,1.49130729713825
## P27,7,20,1.49310049495182
## P27,7,21,1.49268848896027
## P27,7,22,1.49024848204393
## P27,7,23,1.49246830410428
## P27,7,24,1.4918163601233
## P27,7,25,1.49188511921809
## P27,7,26,1.4934976135475
## P27,7,27,1.49149794048733
## P27,7,28,1.49234067982641
## P27,7,29,1.49050301445855
## P27,7,30,1.49263584117095
## P27,7,31,1.48693456013997
## P27,7,32,1.49264192581177
## P27,7,33,1.49113879265723
## P27,7,34,1.49179028903737
## P27,7,35,1.4919730119927
## P27,7,36,1.49258303120188
## P27,7,37,1.49278678591289
## P27,7,38,1.49382782770582
## P27,7,39,1.49151618438855
## P27,7,40,1.49264948508319
## P27,7,41,1.49306593102924
## P27,7,42,1.49669611306838
## P27,7,43,1.49049699429384
## P27,7,44,1.49132822520697
## P27,7,45,1.49156022071838
## P27,7,46,1.49174597890753
## P27,7,47,1.49085225416033
## P27,7,48,1.49317782925021
## P27,7,49,1.49119878795049
## P27,7,50,1.49213731546196
## P27,8,1,1.4926430519591
## P27,8,2,1.49097505400452
## P27,8,3,1.4912816286087
## P27,8,4,1.49166960716248
## P27,8,5,1.49250176293509
## P27,8,6,1.49150122766909
## P27,8,7,1.49173864825019
## P27,8,8,1.49172175923983
## P27,8,9,1.49061199334952
## P27,8,10,1.49366968870163
## P27,8,11,1.50038429668971
## P27,8,12,1.49179458618164
## P27,8,13,1.48984296755357
## P27,8,14,1.4940520735348
## P27,8,15,1.49111534892649
## P27,8,16,1.4913446744283
## P27,8,17,1.49187701504405
## P27,8,18,1.48986724115187
## P27,8,19,1.4934642261929
## P27,8,20,1.49223217010498
## P27,8,21,1.48948219844273
## P27,8,22,1.4912971496582
## P27,8,23,1.49053557326154
## P27,8,24,1.49174108202495
## P27,8,25,1.49417563847133
## P27,8,26,1.49049048423767
## P27,8,27,1.4901997228212
## P27,8,28,1.49058397838048
## P27,8,29,1.49078332294117
## P27,8,30,1.49275300767687
## P27,8,31,1.49052026795178
## P27,8,32,1.48970478773117
## P27,8,33,1.49310146678578
## P27,8,34,1.4913608046139
## P27,8,35,1.49165137221174
## P27,8,36,1.49441200494766
## P27,8,37,1.48782866651362
## P27,8,38,1.49514846103947
## P27,8,39,1.49214628338814
## P27,8,40,1.49666986465454
## P27,8,41,1.493959213558
## P27,8,42,1.48609811919076
## P27,8,43,1.49459482828776
## P27,8,44,1.49228548120569
## P27,8,45,1.49211612769536
## P27,8,46,1.49251198401818
## P27,8,47,1.49068721972014
## Warning: There are no valid values for INTERVALS=48 in LISTP27[[8]]
## P27,8,49,1.48970483243465
## P27,8,50,1.49135425495125
## P27,9,1,1.49199320599924
## P27,9,2,1.49113886943762
## P27,9,3,1.49157752907067
## P27,9,4,1.49166263325114
## P27,9,5,1.49233265276308
## P27,9,6,1.49165502416676
## P27,9,7,1.49140952354254
## P27,9,8,1.49123554616361
## P27,9,9,1.49132472991943
## P27,9,10,1.49095931285765
## P27,9,11,1.4913447022438
## P27,9,12,1.49070479720831
## P27,9,13,1.49152008041007
## P27,9,14,1.49080434651442
## P27,9,15,1.49193356360918
## P27,9,16,1.49181175231934
## P27,9,17,1.49068859851722
## P27,9,18,1.49234769484576
## P27,9,19,1.49596416822044
## P27,9,20,1.48635382996392
## P27,9,21,1.49168378428409
## P27,9,22,1.49202817790913
## P27,9,23,1.49082175972535
## P27,9,24,1.49164742130344
## P27,9,25,1.49211863109044
## P27,9,26,1.4915747746934
## P27,9,27,1.49251076153346
## P27,9,28,1.49125299630342
## P27,9,29,1.49169820651673
## P27,9,30,1.49228034416835
## P27,9,31,1.49131785717207
## P27,9,32,1.49320194401692
## P27,9,33,1.49284971237183
## P27,9,34,1.49146819395178
## P27,9,35,1.4914016356835
## P27,9,36,1.49004120296902
## P27,9,37,1.49254930669611
## P27,9,38,1.49866430325942
## P27,9,39,1.49488726054152
## P27,9,40,1.49501732826233
## P27,9,41,1.49107589545073
## P27,9,42,1.49269837141037
## P27,9,43,1.48966755072276
## P27,9,44,1.49254635760659
## P27,9,45,1.49137405757486
## P27,9,46,1.49406902469806
## P27,9,47,1.49336860396645
## P27,9,48,1.49143752143497
## P27,9,49,1.49112873161789
## P27,9,50,1.49115668678284
## P27,10,1,1.49195483326912
## P27,10,2,1.49184598420796
## P27,10,3,1.49243661912821
## P27,10,4,1.49169010382432
## P27,10,5,1.49101837894373
## P27,10,6,1.49024075475232
## P27,10,7,1.49395239871481
## P27,10,8,1.49111879313434
## P27,10,9,1.49157694078261
## P27,10,10,1.49015813752225
## P27,10,11,1.49236181047228
## P27,10,12,1.49268149429897
## P27,10,13,1.4909283615822
## P27,10,14,1.48980164795779
## P27,10,15,1.49041969474705
## P27,10,16,1.49337888680972
## P27,10,17,1.47899430218865
## P27,10,18,1.49217799504598
## P27,10,19,1.49251805758867
## P27,10,20,1.49572729420018
## P27,10,21,1.48960715791453
## P27,10,22,1.4901313879052
## P27,10,23,1.490537800201
## P27,10,24,1.49163933481489
## P27,10,25,1.49264240264893
## P27,10,26,1.49181498289108
## P27,10,27,1.48961969216665
## P27,10,28,1.49038454890251
## P27,10,29,1.49023100115218
## P27,10,30,1.50173876285553
## P27,10,31,1.49004969725738
## P27,10,32,1.49125715664455
## P27,10,33,1.49224118797147
## P27,10,34,1.4922183142768
## P27,10,35,1.49161773023352
## P27,10,36,1.49357238481211
## P27,10,37,1.49235291023777
## P27,10,38,1.49039422601893
## P27,10,39,1.48963118210817
## P27,10,40,1.49526354670525
## P27,10,41,1.4917639365563
## P27,10,42,1.49222324575697
## P27,10,43,1.49216566388569
## P27,10,44,1.48770223964344
## P27,10,45,1.49547233443329
## P27,10,46,1.49304268008373
## P27,10,47,1.4929447333018
## P27,10,48,1.48929836500936
## P27,10,49,1.4925800613735
## P27,10,50,1.49563674467156
## Warning: There are no valid values for INTERVALS=1 in LISTP28[[1]]
## P28,1,2,1.48777419286417
## P28,1,3,1.48711422356692
## P28,1,4,1.49243922531605
## P28,1,5,1.51935807863871
## P28,1,6,1.48482575416565
## P28,1,7,1.49125560522079
## P28,1,8,1.50783333571061
## P28,1,9,1.52537989616394
## P28,1,10,1.48464172314375
## P28,1,11,1.51382660865784
## P28,1,12,1.47615982451529
## P28,1,13,1.56957768420784
## P28,1,14,1.4820714254637
## P28,1,15,1.5217692428165
## P28,1,16,1.49745274426644
## P28,1,17,1.48924135770954
## P28,1,18,1.4653128566164
## P28,1,19,1.4933638877057
## P28,1,20,1.51352564493815
## P28,1,21,1.47512338956197
## P28,1,22,1.51850589891759
## P28,1,23,1.47441641144131
## P28,1,24,1.50494508743286
## P28,1,25,1.48565783818563
## P28,1,26,1.47068647543589
## P28,1,27,1.46278133392334
## P28,1,28,1.50858985242389
## P28,1,29,1.48296408142362
## P28,1,30,1.48595080656164
## P28,1,31,1.48673692116371
## P28,1,32,1.49341974435029
## P28,1,33,1.50102115812756
## P28,1,34,1.53651887437572
## P28,1,35,1.4642749266191
## P28,1,36,1.49428487202478
## P28,1,37,1.53088965415955
## P28,1,38,1.4824764519407
## P28,1,39,1.51313911875089
## P28,1,40,1.48854462305705
## P28,1,41,1.49049164068819
## P28,1,42,1.51784706115723
## P28,1,43,1.4920327714149
## P28,1,44,1.48565654919065
## P28,1,45,1.50322421391805
## P28,1,46,1.50514741996666
## P28,1,47,1.4739677452844
## P28,1,48,1.48756101256923
## P28,1,49,1.49261791212065
## P28,1,50,1.48247133034926
## P28,2,1,1.46925637493395
## P28,2,2,1.48894470002916
## P28,2,3,1.48663836055332
## P28,2,4,1.44035850871693
## P28,2,5,1.46990737318993
## P28,2,6,1.48534289226737
## P28,2,7,1.50717378699261
## P28,2,8,1.48779456138611
## P28,2,9,1.49766371573931
## P28,2,10,1.47350896244318
## P28,2,11,1.50576084659946
## P28,2,12,1.50027153889338
## P28,2,13,1.52600945195844
## P28,2,14,1.52694286084643
## P28,2,15,1.53353518453138
## P28,2,16,1.48348570444498
## P28,2,17,1.47558589511447
## P28,2,18,1.52350276708603
## P28,2,19,1.48735225200653
## P28,2,20,1.49630522727966
## P28,2,21,1.50831217441744
## P28,2,22,1.46813098690178
## P28,2,23,1.50829001267751
## P28,2,24,1.51067405758482
## P28,2,25,1.4413334070626
## P28,2,26,1.48051941735404
## P28,2,27,1.48917963981628
## P28,2,28,1.51412575585502
## P28,2,29,1.48451326787472
## P28,2,30,1.60071468353271
## P28,2,31,1.49043531417847
## P28,2,32,1.50515920519829
## P28,2,33,1.46310384750366
## P28,2,34,1.49269816369721
## P28,2,35,1.49946737289429
## P28,2,36,1.52051881381444
## P28,2,37,1.47791745382197
## P28,2,38,1.49049527146095
## P28,2,39,1.53717378948046
## P28,2,40,1.40654214223226
## P28,2,41,1.49628356636548
## P28,2,42,1.47319254279137
## P28,2,43,1.49134238770134
## P28,2,44,1.47414073799596
## P28,2,45,1.49402195651357
## P28,2,46,1.50311947232894
## P28,2,47,1.45071632479444
## P28,2,48,1.48848209883037
## P28,2,49,1.50116514002235
## P28,2,50,1.48325727257547
## P28,3,1,1.49333411675912
## P28,3,2,1.46370881669065
## P28,3,3,1.49981231159634
## P28,3,4,1.48979062101115
## P28,3,5,1.49223026295298
## P28,3,6,1.47718195975581
## P28,3,7,1.50587922009555
## P28,3,8,1.46995028582486
## P28,3,9,1.48690526144845
## P28,3,10,1.51473561577175
## P28,3,11,1.48230154947801
## P28,3,12,1.45908267380761
## P28,3,13,1.48732574284077
## P28,3,14,1.47483774387475
## P28,3,15,1.48667122222282
## P28,3,16,1.4813887926997
## P28,3,17,1.5066762900934
## P28,3,18,1.46839125951131
## P28,3,19,1.4917488972346
## P28,3,20,1.48155343963439
## P28,3,21,1.49613345248028
## P28,3,22,1.53152512368702
## Warning: There are no valid values for INTERVALS=23 in LISTP28[[3]]
## P28,3,24,1.48137531841502
## P28,3,25,1.50260909010724
## P28,3,26,1.45815501147754
## P28,3,27,1.47775392731031
## P28,3,28,1.51896739006042
## P28,3,29,1.49421301511961
## P28,3,30,1.51867738203569
## P28,3,31,1.46836542657443
## P28,3,32,1.51944829357995
## P28,3,33,1.48604741963473
## P28,3,34,1.48502660478864
## P28,3,35,1.51066218482123
## P28,3,36,1.49557804561162
## P28,3,37,1.49930290972933
## P28,3,38,1.49699676953829
## P28,3,39,1.46487266723424
## P28,3,40,1.4939049700255
## P28,3,41,1.49414112170537
## P28,3,42,1.50038149592641
## P28,3,43,1.48148792789828
## P28,3,44,1.4802693939209
## P28,3,45,1.52528506372033
## P28,3,46,1.41239377856255
## P28,3,47,1.52663991030525
## P28,3,48,1.48805897214771
## P28,3,49,1.48972267924615
## P28,3,50,1.47627148483739
## P28,4,1,1.47676301002502
## P28,4,2,1.4992064459134
## P28,4,3,1.50238915852138
## P28,4,4,1.48368508021037
## P28,4,5,1.46495251157391
## P28,4,6,1.49031931245831
## P28,4,7,1.47823178768158
## P28,4,8,1.48614726747785
## P28,4,9,1.51839361311514
## P28,4,10,1.484276597462
## P28,4,11,1.50888389210368
## P28,4,12,1.48212270851595
## P28,4,13,1.47980962480818
## P28,4,14,1.48853926962995
## P28,4,15,1.48799548404557
## P28,4,16,1.45136569096492
## P28,4,17,1.4920311606074
## P28,4,18,1.49250197992092
## P28,4,19,1.48228648875622
## P28,4,20,1.46950894594193
## P28,4,21,1.47174070278804
## P28,4,22,1.50061410538694
## P28,4,23,1.48083983045636
## P28,4,24,1.50453916192055
## P28,4,25,1.47812826974051
## P28,4,26,1.49966723379427
## P28,4,27,1.49778497029865
## P28,4,28,1.48878618014061
## P28,4,29,1.42837089300156
## P28,4,30,1.51328945916796
## P28,4,31,1.50999796068346
## P28,4,32,1.48763130187988
## P28,4,33,1.48034086227417
## P28,4,34,1.49328085870454
## P28,4,35,1.56347285376655
## P28,4,36,1.47211197444371
## P28,4,37,1.49908734984317
## P28,4,38,1.51337377697814
## P28,4,39,1.48818811663875
## P28,4,40,1.48682383447886
## P28,4,41,1.48187082343631
## P28,4,42,1.53095475832621
## P28,4,43,1.47158792562652
## P28,4,44,1.47442056355851
## P28,4,45,1.49974182248116
## P28,4,46,1.50240902339711
## P28,4,47,1.50399151529585
## P28,4,48,1.50534005042834
## P28,4,49,1.4924588835383
## P28,4,50,1.49482989979682
## P28,5,1,1.48039430890765
## P28,5,2,1.46578115072006
## P28,5,3,1.50076375557826
## P28,5,4,1.48868214607239
## P28,5,5,1.52614462553565
## P28,5,6,1.48265647066051
## P28,5,7,1.48964814482064
## P28,5,8,1.49232590198517
## P28,5,9,1.46784774206018
## P28,5,10,1.53388191759586
## P28,5,11,1.47669977611966
## P28,5,12,1.48097034376495
## P28,5,13,1.45008606606341
## P28,5,14,1.49462985992432
## P28,5,15,1.49881335308677
## P28,5,16,1.49172562047055
## P28,5,17,1.47732957549717
## P28,5,18,1.48238774199984
## P28,5,19,1.48483296279069
## P28,5,20,1.48381997037817
## P28,5,21,1.43127208948135
## P28,5,22,1.50211555529863
## P28,5,23,1.45985862841973
## P28,5,24,1.50935986946369
## P28,5,25,1.4812666764335
## P28,5,26,1.49407793527626
## P28,5,27,1.49299477663907
## P28,5,28,1.48601948420207
## P28,5,29,1.4818888452318
## P28,5,30,1.48621779680252
## P28,5,31,1.50298740313603
## P28,5,32,1.48372316360474
## P28,5,33,1.53678374894908
## P28,5,34,1.48416290785137
## P28,5,35,1.489779749913
## P28,5,36,1.47833215643507
## P28,5,37,1.50704114995104
## P28,5,38,1.49280434388381
## P28,5,39,1.43530827033811
## P28,5,40,1.46898522096522
## P28,5,41,1.55963397580524
## P28,5,42,1.49906037025845
## P28,5,43,1.48841959635417
## P28,5,44,1.52105698802254
## P28,5,45,1.49703820262636
## P28,5,46,1.50975251197815
## P28,5,47,1.47665109496186
## P28,5,48,1.50288781299386
## P28,5,49,1.49818481717791
## P28,5,50,1.4596061706543
## P28,6,1,1.50702094262646
## P28,6,2,1.49500141541163
## P28,6,3,1.41350485086441
## P28,6,4,1.48162415931965
## P28,6,5,1.48591818760351
## P28,6,6,1.52618538538615
## P28,6,7,1.51897373905888
## P28,6,8,1.50104871216942
## P28,6,9,1.47137416899204
## P28,6,10,1.48486739397049
## P28,6,11,1.49310138090601
## P28,6,12,1.46750671305555
## P28,6,13,1.49493956984135
## P28,6,14,1.49366503357887
## P28,6,15,1.48787967363993
## P28,6,16,1.50523248314857
## P28,6,17,1.49349315026227
## P28,6,18,1.49292659759521
## P28,6,19,1.47184379895528
## P28,6,20,1.50673592718024
## P28,6,21,1.49874598271138
## P28,6,22,1.48630513607616
## P28,6,23,1.5028472778409
## P28,6,24,1.4970448811849
## P28,6,25,1.4737959239218
## P28,6,26,1.49743547806373
## P28,6,27,1.49578882032825
## P28,6,28,1.47309109568596
## P28,6,29,1.48964800284459
## P28,6,30,1.47362749160282
## P28,6,31,1.49398717754766
## Warning: There are no valid values for INTERVALS=32 in LISTP28[[6]]
## P28,6,33,1.57156785329183
## P28,6,34,1.49339240044355
## P28,6,35,1.45338824301055
## P28,6,36,1.54504802420333
## P28,6,37,1.47324096395614
## P28,6,38,1.48293693442094
## P28,6,39,1.48797748706959
## P28,6,40,1.48520781916957
## P28,6,41,1.48193781516131
## P28,6,42,1.49190413100379
## P28,6,43,1.49273806994723
## P28,6,44,1.48916515282222
## P28,6,45,1.4923868005926
## P28,6,46,1.5109580282181
## P28,6,47,1.51496590990009
## P28,6,48,1.49089991418939
## P28,6,49,1.48294876828606
## P28,6,50,1.47372033379295
## P28,7,1,1.49364644427632
## P28,7,2,1.49440992579741
## P28,7,3,1.47945749153525
## P28,7,4,1.51093331972758
## P28,7,5,1.49176464080811
## P28,7,6,1.44695466564548
## P28,7,7,1.48116763659886
## P28,7,8,1.52126673551706
## P28,7,9,1.46591854095459
## P28,7,10,1.48724181916979
## P28,7,11,1.48830518075975
## P28,7,12,1.45404734540342
## P28,7,13,1.49686233520508
## P28,7,14,1.49233846664429
## P28,7,15,1.4916242686185
## P28,7,16,1.49791988959679
## P28,7,17,1.49183405467442
## P28,7,18,1.49215549155127
## P28,7,19,1.47570111704808
## P28,7,20,1.51609168881955
## P28,7,21,1.48337911790417
## P28,7,22,1.5165284763683
## P28,7,23,1.46825114994833
## P28,7,24,1.55093996613114
## P28,7,25,1.45311433474223
## P28,7,26,1.44788488319942
## P28,7,27,1.48445658385754
## P28,7,28,1.51076815093773
## P28,7,29,1.48811687529087
## P28,7,30,1.50525535236705
## P28,7,31,1.46718863759722
## P28,7,32,1.51027437618801
## P28,7,33,1.48890745349047
## P28,7,34,1.49184551090002
## P28,7,35,1.50727299584283
## P28,7,36,1.46878339889202
## P28,7,37,1.50152850600908
## P28,7,38,1.50570167676367
## P28,7,39,1.48549692971366
## P28,7,40,1.49608300791846
## P28,7,41,1.49409567868268
## P28,7,42,1.48973214626312
## P28,7,43,1.50266632889256
## P28,7,44,1.50583792895806
## P28,7,45,1.47214372456074
## P28,7,46,1.5112024307251
## P28,7,47,1.46780447165171
## P28,7,48,1.52452152006088
## P28,7,49,1.48315194129944
## P28,7,50,1.49170145534334
## P28,8,1,1.44895367744641
## P28,8,2,1.46153394172066
## P28,8,3,1.50249896551433
## P28,8,4,1.47247347624406
## P28,8,5,1.56583069998121
## P28,8,6,1.47792447606723
## P28,8,7,1.51706422567368
## P28,8,8,1.4927426510387
## P28,8,9,1.46389230768731
## P28,8,10,1.45285815206067
## P28,8,11,1.47363384910252
## P28,8,12,1.48308786418703
## P28,8,13,1.48399704900281
## P28,8,14,1.4896026134491
## P28,8,15,1.51937885773488
## P28,8,16,1.51351164482735
## P28,8,17,1.54329478597066
## P28,8,18,1.52012736063737
## P28,8,19,1.48023184140523
## P28,8,20,1.48127328575432
## P28,8,21,1.52603249838858
## P28,8,22,1.49787300825119
## P28,8,23,1.48798777840354
## P28,8,24,1.50015211956842
## P28,8,25,1.49657736778259
## P28,8,26,1.52679006981127
## P28,8,27,1.47729731187588
## P28,8,28,1.48450092438164
## P28,8,29,1.47940838855246
## P28,8,30,1.46586304832907
## P28,8,31,1.48191795349121
## P28,8,32,1.40478642420335
## P28,8,33,1.51621932544927
## P28,8,34,1.48383992368525
## P28,8,35,1.49683294088944
## P28,8,36,1.51172287567802
## P28,8,37,1.51161387658888
## P28,8,38,1.4667610494714
## P28,8,39,1.48556011915207
## P28,8,40,1.50157246938566
## P28,8,41,1.5165303403681
## P28,8,42,1.49367309570313
## P28,8,43,1.49167198605008
## P28,8,44,1.53148353099823
## P28,8,45,1.48057626156097
## P28,8,46,1.53284919008296
## P28,8,47,1.4622403553554
## P28,8,48,1.46907426371719
## P28,8,49,1.46699714660645
## P28,8,50,1.48871793111165
## P28,9,1,1.49207071463267
## P28,9,2,1.48712440331777
## P28,9,3,1.49442879358927
## P28,9,4,1.47103818444645
## P28,9,5,1.5174934387207
## P28,9,6,1.48557674756614
## P28,9,7,1.51821113824844
## P28,9,8,1.48930631577969
## P28,9,9,1.48431781768799
## P28,9,10,1.53010095596313
## P28,9,11,1.48129181959191
## P28,9,12,1.49021859790968
## P28,9,13,1.48775889532907
## P28,9,14,1.49224611123403
## P28,9,15,1.48483283289017
## P28,9,16,1.48665647757681
## P28,9,17,1.48535271348624
## P28,9,18,1.52056678735985
## P28,9,19,1.48357835412025
## P28,9,20,1.48772468566895
## P28,9,21,1.50287311077118
## P28,9,22,1.49442338943481
## P28,9,23,1.48303031021694
## P28,9,24,1.51751524826576
## P28,9,25,1.47185659408569
## P28,9,26,1.53282316871311
## P28,9,27,1.49718944699157
## P28,9,28,1.49939594818996
## P28,9,29,1.48819460435347
## P28,9,30,1.49432292276499
## P28,9,31,1.4979968217703
## P28,9,32,1.4922572517395
## P28,9,33,1.49430133167066
## P28,9,34,1.49407598972321
## P28,9,35,1.49002066636697
## P28,9,36,1.51345309477586
## P28,9,37,1.48322056640278
## P28,9,38,1.50673709913742
## P28,9,39,1.47745094836598
## P28,9,40,1.53993207475413
## P28,9,41,1.47501763701439
## P28,9,42,1.50914393977115
## P28,9,43,1.48094701766968
## P28,9,44,1.48881758054097
## P28,9,45,1.49199591613397
## P28,9,46,1.48919361702939
## P28,9,47,1.48053426896372
## P28,9,48,1.48242067823223
## P28,9,49,1.52864380316301
## P28,9,50,1.50776544071379
## P28,10,1,1.50409158979143
## P28,10,2,1.47849255594714
## P28,10,3,1.49339846285378
## P28,10,4,1.49252576539011
## P28,10,5,1.49557766161467
## P28,10,6,1.49287796020508
## P28,10,7,1.49786892643681
## P28,10,8,1.49668545193142
## P28,10,9,1.49221134185791
## P28,10,10,1.49169888496399
## P28,10,11,1.48136734962463
## P28,10,12,1.43854038611702
## P28,10,13,1.4805401802063
## P28,10,14,1.5221563747951
## P28,10,15,1.4885525405407
## P28,10,16,1.50868586983
## P28,10,17,1.4404626539198
## P28,10,18,1.54691176231091
## P28,10,19,1.47314944183617
## P28,10,20,1.50347998738289
## P28,10,21,1.4863695526123
## P28,10,22,1.48064758466638
## P28,10,23,1.45280673629359
## P28,10,24,1.48869926646604
## P28,10,25,1.46641489767259
## P28,10,26,1.50905790975538
## P28,10,27,1.50259285814622
## P28,10,28,1.49170169424503
## P28,10,29,1.49399371214316
## P28,10,30,1.48679167574102
## P28,10,31,1.48064852483345
## P28,10,32,1.49795464674632
## P28,10,33,1.49414612151481
## P28,10,34,1.48438485952524
## P28,10,35,1.48483623020233
## P28,10,36,1.50270079099215
## P28,10,37,1.44807523380626
## P28,10,38,1.5024616877238
## P28,10,39,1.46684350638554
## P28,10,40,1.47528686710432
## P28,10,41,1.50509405136108
## P28,10,42,1.48996008143705
## P28,10,43,1.49350405775982
## P28,10,44,1.49418022235235
## P28,10,45,1.48977606384842
## P28,10,46,1.49175163956939
## P28,10,47,1.49652986526489
## P28,10,48,1.48782523173206
## P28,10,49,1.47166585922241
## P28,10,50,1.51043631008693
## P29,1,1,1.49179228911033
## P29,1,2,1.48936754465103
## P29,1,3,1.49341205674775
## P29,1,4,1.49098323563398
## P29,1,5,1.49345659958689
## P29,1,6,1.49245926457593
## P29,1,7,1.49312533272637
## P29,1,8,1.48908788186532
## P29,1,9,1.49353985823402
## P29,1,10,1.4894008398056
## P29,1,11,1.49161225899883
## P29,1,12,1.48996881578789
## P29,1,13,1.49046301841736
## P29,1,14,1.4872253027307
## P29,1,15,1.50160882226352
## P29,1,16,1.50392327731169
## P29,1,17,1.49353965447873
## P29,1,18,1.33969843122694
## P29,1,19,1.49380662934533
## P29,1,20,1.49304461479187
## P29,1,21,1.49067221855631
## P29,1,22,1.49429483790147
## P29,1,23,1.49940813712354
## P29,1,24,1.48908234992117
## P29,1,25,1.49293018380801
## P29,1,26,1.50099096427093
## P29,1,27,1.49088062984603
## P29,1,28,1.49325070056048
## P29,1,29,1.49225648568601
## P29,1,30,1.48899424965702
## P29,1,31,1.49223111039501
## P29,1,32,1.48880506356557
## P29,1,33,1.48860859303247
## P29,1,34,1.49193069437048
## P29,1,35,1.48766960416521
## P29,1,36,1.49946717518132
## P29,1,37,1.48986922648915
## P29,1,38,1.49265341136767
## P29,1,39,1.4955311671342
## P29,1,40,1.49438333014647
## P29,1,41,1.49339957156424
## P29,1,42,1.49079226240327
## P29,1,43,1.49267174767666
## P29,1,44,1.49109777032513
## P29,1,45,1.49703395366669
## P29,1,46,1.49192454513994
## P29,1,47,1.49117201510991
## P29,1,48,1.50177030814321
## P29,1,49,1.48939733845847
## P29,1,50,1.49145252413029
## P29,2,1,1.49177743167412
## P29,2,2,1.4902757346028
## P29,2,3,1.49200081406978
## P29,2,4,1.48859798035971
## P29,2,5,1.49038380985112
## P29,2,6,1.48989440323016
## P29,2,7,1.48602079523021
## P29,2,8,1.49313344346716
## P29,2,9,1.48993028334852
## P29,2,10,1.49065382715682
## P29,2,11,1.4928674697876
## P29,2,12,1.49244312445323
## P29,2,13,1.49107115551577
## P29,2,14,1.49098393676478
## P29,2,15,1.49155577526817
## P29,2,16,1.48830091953278
## P29,2,17,1.4920904602803
## P29,2,18,1.49542471474292
## P29,2,19,1.49031473909106
## P29,2,20,1.49086255791747
## P29,2,21,1.49188524005057
## P29,2,22,1.48866590331582
## P29,2,23,1.49264080282571
## P29,2,24,1.49151849413252
## P29,2,25,1.4962387907094
## P29,2,26,1.49292688808222
## P29,2,27,1.49426274421888
## P29,2,28,1.50916629367405
## P29,2,29,1.49339526461572
## P29,2,30,1.49492298028408
## P29,2,31,1.4919136762619
## P29,2,32,1.49325181543827
## P29,2,33,1.49234483242035
## P29,2,34,1.49273491577363
## P29,2,35,1.4847007393837
## P29,2,36,1.49113939184892
## P29,2,37,1.49112020744072
## P29,2,38,1.48978267303885
## P29,2,39,1.48762790105676
## P29,2,40,1.48976912790415
## P29,2,41,1.4906099319458
## P29,2,42,1.48941106665624
## P29,2,43,1.4938169832099
## P29,2,44,1.49260845962836
## P29,2,45,1.49143565261124
## P29,2,46,1.49102258682251
## P29,2,47,1.49015604623474
## P29,2,48,1.4937976024769
## P29,2,49,1.49276001585854
## P29,2,50,1.49149171115766
## P29,3,1,1.48001744007242
## P29,3,2,1.49044246931334
## P29,3,3,1.49083440444049
## P29,3,4,1.48181441358028
## P29,3,5,1.49594515788404
## P29,3,6,1.49402392216218
## P29,3,7,1.49190093517303
## P29,3,8,1.49874583350288
## P29,3,9,1.4922313563029
## P29,3,10,1.49428228139877
## P29,3,11,1.49034364803417
## P29,3,12,1.49236007170244
## P29,3,13,1.49187183380127
## P29,3,14,1.4901238600413
## P29,3,15,1.48591954567853
## P29,3,16,1.48997524711821
## P29,3,17,1.49162563596453
## P29,3,18,1.48683028261201
## P29,3,19,1.4355143289097
## P29,3,20,1.51373453899822
## P29,3,21,1.48695417387145
## P29,3,22,1.49199925459825
## P29,3,23,1.49588574929671
## P29,3,24,1.49411201477051
## P29,3,25,1.49065252688291
## P29,3,26,1.48879243220602
## P29,3,27,1.49106947580973
## P29,3,28,1.49034646919795
## P29,3,29,1.49371311705926
## P29,3,30,1.48716313077002
## P29,3,31,1.49197235609356
## P29,3,32,1.49062278866768
## P29,3,33,1.49365929595563
## P29,3,34,1.48955335115132
## P29,3,35,1.49042570243761
## P29,3,36,1.49171139399211
## P29,3,37,1.49085721563786
## P29,3,38,1.49266833199395
## P29,3,39,1.49108303705851
## P29,3,40,1.49203291500316
## P29,3,41,1.48954947350434
## P29,3,42,1.4918396435678
## P29,3,43,1.48925175666809
## P29,3,44,1.49282424404936
## P29,3,45,1.49045891801188
## P29,3,46,1.493619539908
## P29,3,47,1.49039595754523
## P29,3,48,1.49183064168042
## P29,3,49,1.49243036306129
## P29,3,50,1.48969481208108
## P29,4,1,1.49937430587975
## P29,4,2,1.49045130718185
## P29,4,3,1.4919291138649
## P29,4,4,1.49432332175119
## P29,4,5,1.4942004806117
## P29,4,6,1.49549462293324
## P29,4,7,1.49285724163055
## P29,4,8,1.49117614672734
## P29,4,9,1.49049680026961
## P29,4,10,1.49056025193288
## P29,4,11,1.4932998064402
## P29,4,12,1.49293489745169
## P29,4,13,1.48965733701533
## P29,4,14,1.49101602955229
## P29,4,15,1.48583244200676
## P29,4,16,1.4891319192689
## P29,4,17,1.50021787001708
## P29,4,18,1.48885629601675
## P29,4,19,1.48991327063982
## P29,4,20,1.49135605052665
## P29,4,21,1.48971621533658
## P29,4,22,1.49146162156136
## P29,4,23,1.49071913898581
## P29,4,24,1.49076845260437
## P29,4,25,1.49166779481728
## P29,4,26,1.49078655630592
## P29,4,27,1.49206738173962
## P29,4,28,1.49669545529837
## P29,4,29,1.4905373208663
## P29,4,30,1.48717301512418
## P29,4,31,1.4883482229142
## P29,4,32,1.49146870070813
## P29,4,33,1.48816960829276
## P29,4,34,1.50644746422768
## P29,4,35,1.49276188553357
## P29,4,36,1.493010428644
## P29,4,37,1.49032818398825
## P29,4,38,1.49410155325225
## P29,4,39,1.49389425400765
## P29,4,40,1.49062303468293
## P29,4,41,1.49137871382666
## P29,4,42,1.49097932150605
## P29,4,43,1.49079467137655
## P29,4,44,1.49312328523205
## P29,4,45,1.48939819633961
## P29,4,46,1.48920413269394
## P29,4,47,1.49032352062372
## P29,4,48,1.47559536587108
## P29,4,49,1.49105384912384
## P29,4,50,1.49115699018751
## P29,5,1,1.48942414351872
## P29,5,2,1.49069205334312
## P29,5,3,1.49038231929886
## P29,5,4,1.49153315777681
## P29,5,5,1.49144919713338
## P29,5,6,1.48684139251709
## P29,5,7,1.4901901028373
## P29,5,8,1.4917519510838
## P29,5,9,1.49037660492791
## P29,5,10,1.49320593058506
## P29,5,11,1.48966001852965
## P29,5,12,1.49160494804382
## P29,5,13,1.4917542632197
## P29,5,14,1.4973000020397
## P29,5,15,1.49504481228915
## P29,5,16,1.48751516903148
## P29,5,17,1.49123762272022
## P29,5,18,1.49168913109789
## P29,5,19,1.49003311834837
## P29,5,20,1.49103015522624
## P29,5,21,1.48917107249415
## P29,5,22,1.49402090672697
## P29,5,23,1.49132492542267
## P29,5,24,1.49261295795441
## P29,5,25,1.49421536811044
## P29,5,26,1.49167891810922
## P29,5,27,1.49298389116923
## P29,5,28,1.49026602009932
## P29,5,29,1.49148218720048
## P29,5,30,1.4903000618914
## P29,5,31,1.48962758025345
## P29,5,32,1.49168767929077
## P29,5,33,1.49096590198883
## P29,5,34,1.49107621297115
## P29,5,35,1.49095032261867
## P29,5,36,1.49048868560791
## P29,5,37,1.49041705735972
## P29,5,38,1.49069841384888
## P29,5,39,1.48580935849982
## P29,5,40,1.49248338612643
## P29,5,41,1.49091314772765
## P29,5,42,1.48954458369149
## P29,5,43,1.48983665581407
## P29,5,44,1.49071906843493
## P29,5,45,1.49051965304783
## P29,5,46,1.48661336111366
## P29,5,47,1.49134425397189
## P29,5,48,1.4929731041193
## P29,5,49,1.48860062414141
## P29,5,50,1.49194904963175
## P29,6,1,1.49442998406027
## P29,6,2,1.49394994974136
## P29,6,3,1.49122843101843
## P29,6,4,1.49307524603467
## P29,6,5,1.49515801236249
## P29,6,6,1.49415287670788
## P29,6,7,1.49400702418897
## P29,6,8,1.49271122961586
## P29,6,9,1.49246188700199
## P29,6,10,1.49210858168425
## P29,6,11,1.49145616690318
## P29,6,12,1.49453416921325
## P29,6,13,1.49170681359111
## P29,6,14,1.49454975763957
## P29,6,15,1.49258071227039
## P29,6,16,1.49417346271116
## P29,6,17,1.49204169165704
## P29,6,18,1.48992661193565
## P29,6,19,1.49196117994737
## P29,6,20,1.49186263913694
## P29,6,21,1.49156680571294
## P29,6,22,1.49099089827719
## P29,6,23,1.49183637376816
## P29,6,24,1.49046274291144
## P29,6,25,1.49081872671078
## P29,6,26,1.49152223179849
## P29,6,27,1.49159449460555
## P29,6,28,1.49196718215942
## P29,6,29,1.4915104722077
## P29,6,30,1.48978966533548
## P29,6,31,1.48547241320977
## P29,6,32,1.49222726670523
## P29,6,33,1.48930998568265
## P29,6,34,1.49298078431858
## P29,6,35,1.49065192745578
## P29,6,36,1.4915582987727
## P29,6,37,1.49315569333941
## P29,6,38,1.49142703449025
## P29,6,39,1.49089387367512
## P29,6,40,1.48898572852646
## P29,6,41,1.49086506065281
## P29,6,42,1.48478651046753
## P29,6,43,1.4922005479986
## P29,6,44,1.49038524802672
## P29,6,45,1.49277765456944
## P29,6,46,1.49105873703957
## P29,6,47,1.49537241869959
## P29,6,48,1.49012275988405
## P29,6,49,1.49309200193824
## P29,6,50,1.49179670510703
## P29,7,1,1.4872546500348
## P29,7,2,1.49023597551429
## P29,7,3,1.49066440875714
## P29,7,4,1.49188749119639
## P29,7,5,1.49155499514411
## P29,7,6,1.49057208645728
## P29,7,7,1.49135546657921
## P29,7,8,1.49079851370591
## P29,7,9,1.49244718233744
## P29,7,10,1.49123218324449
## P29,7,11,1.4941595221219
## P29,7,12,1.49246279613392
## P29,7,13,1.49144159242945
## P29,7,14,1.49037766847454
## P29,7,15,1.49013617282777
## P29,7,16,1.48676557200296
## P29,7,17,1.49151806478147
## P29,7,18,1.49081749207265
## P29,7,19,1.48995007204087
## P29,7,20,1.49173598641517
## P29,7,21,1.48997033464498
## P29,7,22,1.49135875701904
## P29,7,23,1.48868151714927
## P29,7,24,1.4928346136783
## P29,7,25,1.49239235593562
## P29,7,26,1.49025767190116
## P29,7,27,1.49008339907216
## P29,7,28,1.4911178050398
## P29,7,29,1.48921381213708
## P29,7,30,1.49193049654549
## P29,7,31,1.49024235472387
## P29,7,32,1.49186140840704
## P29,7,33,1.49106091499329
## P29,7,34,1.49109519288895
## P29,7,35,1.49079006527542
## P29,7,36,1.49160616905963
## P29,7,37,1.49120619591702
## P29,7,38,1.49261661370595
## P29,7,39,1.49140407030399
## P29,7,40,1.4903402030468
## P29,7,41,1.49024839100875
## P29,7,42,1.49262219746908
## P29,7,43,1.48867087364197
## P29,7,44,1.49173615376155
## P29,7,45,1.49187462056269
## P29,7,46,1.4911096572876
## P29,7,47,1.49781197999653
## P29,7,48,1.48477402018077
## P29,7,49,1.48985716590175
## P29,7,50,1.49318430264002
## P29,8,1,1.49059697559902
## P29,8,2,1.49578255512675
## P29,8,3,1.4973525588329
## P29,8,4,1.5020495207913
## P29,8,5,1.49138604310843
## P29,8,6,1.49579611209908
## P29,8,7,1.49162079631418
## P29,8,8,1.49668374988768
## P29,8,9,1.4864880671868
## P29,8,10,1.489367461033
## P29,8,11,1.48867151316474
## P29,8,12,1.48782240019904
## P29,8,13,1.48627883737737
## P29,8,14,1.50435923902612
## P29,8,15,1.48892271518707
## P29,8,16,1.49174524776971
## P29,8,17,1.48556166692497
## P29,8,18,1.49014224657198
## P29,8,19,1.488251824128
## P29,8,20,1.49002289410793
## P29,8,21,1.49052818316334
## P29,8,22,1.48727573374266
## P29,8,23,1.4846390595957
## P29,8,24,1.49086901089093
## P29,8,25,1.49085401296616
## P29,8,26,1.48342736896716
## P29,8,27,1.4696454641954
## P29,8,28,1.49252430273562
## P29,8,29,1.50199174880981
## P29,8,30,1.49098664522171
## P29,8,31,1.48658464505122
## P29,8,32,1.48923304718985
## P29,8,33,1.48823980267128
## P29,8,34,1.4902126416564
## P29,8,35,1.49386502220517
## P29,8,36,1.5101702728787
## P29,8,37,1.49194378676238
## P29,8,38,1.48748326751421
## P29,8,39,1.49260156410785
## P29,8,40,1.48506572286961
## P29,8,41,1.49336812973022
## P29,8,42,1.49222993850708
## P29,8,43,1.49118871792503
## P29,8,44,1.48853838443756
## P29,8,45,1.49149516122095
## P29,8,46,1.491190327024
## P29,8,47,1.47426476665572
## P29,8,48,1.46161712646484
## P29,8,49,1.48280333904993
## P29,8,50,1.49264603883792
## P29,9,1,1.48766553597372
## P29,9,2,1.48934481360696
## P29,9,3,1.49149731932015
## P29,9,4,1.48632606008778
## P29,9,5,1.49989218182034
## P29,9,6,1.4907727492483
## P29,9,7,1.49747313827765
## P29,9,8,1.49082053940872
## P29,9,9,1.49842446988767
## P29,9,10,1.4911945031421
## P29,9,11,1.49222662778405
## P29,9,12,1.48569802392887
## P29,9,13,1.48639803919299
## P29,9,14,1.4935131072998
## P29,9,15,1.48218360814181
## P29,9,16,1.49352775974038
## P29,9,17,1.48619257776361
## P29,9,18,1.49918913196873
## P29,9,19,1.4898962477843
## P29,9,20,1.48970536277408
## P29,9,21,1.49100788901834
## P29,9,22,1.49179167919848
## P29,9,23,1.48985512794987
## P29,9,24,1.49735665595394
## P29,9,25,1.4897609930772
## P29,9,26,1.48902678489685
## P29,9,27,1.49193686597488
## P29,9,28,1.49298398835318
## P29,9,29,1.49291786025552
## P29,9,30,1.49232631990279
## P29,9,31,1.49170336815027
## P29,9,32,1.49176258359637
## P29,9,33,1.49140346341017
## P29,9,34,1.49286376862299
## P29,9,35,1.48909255663554
## P29,9,36,1.49272063721058
## P29,9,37,1.49282656582919
## P29,9,38,1.49225459908539
## P29,9,39,1.48956329771813
## P29,9,40,1.49278004964193
## P29,9,41,1.49183674959036
## P29,9,42,1.48481706251581
## P29,9,43,1.49473319537398
## P29,9,44,1.49281358718872
## P29,9,45,1.46492201604961
## P29,9,46,1.48827103848727
## P29,9,47,1.49137068439174
## P29,9,48,1.49147863112963
## P29,9,49,1.49107918246039
## P29,9,50,1.48923342568534
## P29,10,1,1.49215721130371
## P29,10,2,1.49135907009394
## P29,10,3,1.50644590340409
## P29,10,4,1.49445105226416
## P29,10,5,1.48965881610739
## P29,10,6,1.48664424992815
## P29,10,7,1.49093128914057
## P29,10,8,1.49184492066151
## P29,10,9,1.48996618960766
## P29,10,10,1.49116239732909
## P29,10,11,1.49363277882946
## P29,10,12,1.48886676178765
## P29,10,13,1.49077002207438
## P29,10,14,1.49030493126541
## P29,10,15,1.48901815125436
## P29,10,16,1.48734657416183
## P29,10,17,1.49369750552707
## P29,10,18,1.50347776203365
## P29,10,19,1.49059823202708
## P29,10,20,1.48957625750838
## P29,10,21,1.49350843121929
## P29,10,22,1.48812489450714
## P29,10,23,1.48951491401309
## P29,10,24,1.49175156298138
## P29,10,25,1.47447421073914
## P29,10,26,1.48948349422879
## P29,10,27,1.48932883270785
## P29,10,28,1.49153918378493
## P29,10,29,1.49117148090416
## P29,10,30,1.49059527260917
## P29,10,31,1.49103478022984
## P29,10,32,1.49236689151173
## P29,10,33,1.49083587971139
## P29,10,34,1.48620408459714
## P29,10,35,1.48886730219867
## P29,10,36,1.48849066182187
## P29,10,37,1.49068733362051
## P29,10,38,1.48041938275707
## P29,10,39,1.49082631949919
## P29,10,40,1.48962014264399
## P29,10,41,1.49038040297372
## P29,10,42,1.49155592918396
## P29,10,43,1.4914084001021
## P29,10,44,1.48371879050606
## P29,10,45,1.49755821876156
## P29,10,46,1.48281009197235
## P29,10,47,1.48519615267144
## P29,10,48,1.49586065191972
## P29,10,49,1.48989881613316
## P29,10,50,1.48993308112125
## P30,1,1,1.49457846972959
## P30,1,2,1.49107401659994
## P30,1,3,1.49349864891597
## P30,1,4,1.49399833421449
## P30,1,5,1.492703368746
## P30,1,6,1.49122425109621
## P30,1,7,1.49434823989868
## P30,1,8,1.4906263764449
## P30,1,9,1.49084338370491
## P30,1,10,1.49600435847001
## P30,1,11,1.48956392157791
## P30,1,12,1.49153399094939
## P30,1,13,1.49188542750574
## P30,1,14,1.49088089219455
## P30,1,15,1.48952517743971
## P30,1,16,1.4916933352553
## P30,1,17,1.49126483737559
## P30,1,18,1.49260436938359
## P30,1,19,1.49243864892912
## P30,1,20,1.49231535618699
## P30,1,21,1.49172270900071
## P30,1,22,1.49223378926766
## P30,1,23,1.493117247309
## P30,1,24,1.49238909865325
## P30,1,25,1.49227868526354
## P30,1,26,1.49234427202929
## P30,1,27,1.49253542561176
## P30,1,28,1.49139676203255
## P30,1,29,1.49196906675372
## P30,1,30,1.49134049557223
## P30,1,31,1.49199886719386
## P30,1,32,1.49212138493856
## P30,1,33,1.49338155634263
## P30,1,34,1.4909867850217
## P30,1,35,1.4923951826363
## P30,1,36,1.49233820127404
## P30,1,37,1.49020278884704
## P30,1,38,1.49200112053326
## P30,1,39,1.49174179042782
## P30,1,40,1.49202645818392
## P30,1,41,1.4922152608633
## P30,1,42,1.49251534518074
## P30,1,43,1.49249563484548
## P30,1,44,1.49289136571982
## P30,1,45,1.49233065767491
## P30,1,46,1.48859135458403
## P30,1,47,1.49551164576438
## P30,1,48,1.49634063361895
## P30,1,49,1.49663163353415
## P30,1,50,1.49059128317033
## P30,2,1,1.48843479602136
## P30,2,2,1.49170963051393
## P30,2,3,1.49239168361742
## P30,2,4,1.491350852837
## P30,2,5,1.48800254068455
## P30,2,6,1.49429864490155
## P30,2,7,1.48673606933431
## P30,2,8,1.49175507007259
## P30,2,9,1.49233592598184
## P30,2,10,1.48906469345093
## P30,2,11,1.49513331978722
## P30,2,12,1.49112292762115
## P30,2,13,1.4905339950739
## P30,2,14,1.49315048967089
## P30,2,15,1.49174470106761
## P30,2,16,1.48958099972118
## P30,2,17,1.49210522300319
## P30,2,18,1.49095591545105
## P30,2,19,1.49182994549091
## P30,2,20,1.49245056825526
## P30,2,21,1.49281506205714
## P30,2,22,1.48992382155524
## P30,2,23,1.49075218200684
## P30,2,24,1.49064234395822
## P30,2,25,1.48651823244597
## P30,2,26,1.51378119533712
## P30,2,27,1.48863840579987
## P30,2,28,1.4840980738151
## P30,2,29,1.4967619494388
## P30,2,30,1.49299256778458
## P30,2,31,1.48982412834478
## P30,2,32,1.49079566408497
## P30,2,33,1.49228484588757
## P30,2,34,1.49151944655638
## P30,2,35,1.49180905164871
## P30,2,36,1.49263947625314
## P30,2,37,1.49232096231284
## P30,2,38,1.49088963375816
## P30,2,39,1.49266436976245
## P30,2,40,1.49201969623566
## P30,2,41,1.49070789673749
## P30,2,42,1.48941861996885
## P30,2,43,1.49319998423258
## P30,2,44,1.49136841773987
## P30,2,45,1.49244169185036
## P30,2,46,1.49187319337829
## P30,2,47,1.49145706290873
## P30,2,48,1.49337629140434
## P30,2,49,1.49038726665356
## P30,2,50,1.49233390490214
## P30,3,1,1.49078375697136
## P30,3,2,1.4914946615696
## P30,3,3,1.49151966431562
## P30,3,4,1.49205602840944
## P30,3,5,1.49131965107388
## P30,3,6,1.49189135233561
## P30,3,7,1.4922706190362
## P30,3,8,1.49298736697338
## P30,3,9,1.49091381185195
## P30,3,10,1.49225430628833
## P30,3,11,1.49308795928955
## P30,3,12,1.49100538662502
## P30,3,13,1.49023459793685
## P30,3,14,1.4895710670031
## P30,3,15,1.49310818172636
## P30,3,16,1.49221660941839
## P30,3,17,1.48902121931314
## P30,3,18,1.49422267331915
## P30,3,19,1.49018551811339
## P30,3,20,1.4931038423018
## P30,3,21,1.48984310578327
## P30,3,22,1.49101969855172
## P30,3,23,1.49280134836833
## P30,3,24,1.49124661225539
## P30,3,25,1.49355154904452
## P30,3,26,1.48746567441706
## P30,3,27,1.49166553815206
## P30,3,28,1.49045995938576
## P30,3,29,1.48096813806673
## P30,3,30,1.50048587105491
## P30,3,31,1.49441733360291
## P30,3,32,1.49190912408344
## P30,3,33,1.48977384964625
## P30,3,34,1.49156214470087
## P30,3,35,1.49320157368978
## P30,3,36,1.49231100082397
## P30,3,37,1.48980896813529
## P30,3,38,1.49005019929674
## P30,3,39,1.48673687531398
## P30,3,40,1.49364971160889
## P30,3,41,1.48987503278823
## P30,3,42,1.49396817538203
## P30,3,43,1.49181774579562
## P30,3,44,1.49083008766174
## P30,3,45,1.49150377053481
## P30,3,46,1.49166967022804
## P30,3,47,1.49325226783752
## P30,3,48,1.49086331386192
## P30,3,49,1.49265888462896
## P30,3,50,1.49196730308162
## P30,4,1,1.49229617960313
## P30,4,2,1.49097881572587
## P30,4,3,1.49144926071167
## P30,4,4,1.49098103263161
## P30,4,5,1.49288066104054
## P30,4,6,1.49180136335657
## P30,4,7,1.49106967714098
## P30,4,8,1.49182862346455
## P30,4,9,1.49220673831893
## P30,4,10,1.49024497378956
## P30,4,11,1.49184675514698
## P30,4,12,1.49106838785369
## P30,4,13,1.49047864608045
## P30,4,14,1.49068106063689
## P30,4,15,1.49234289641774
## P30,4,16,1.49244296317007
## P30,4,17,1.4912946917794
## P30,4,18,1.49091967757867
## P30,4,19,1.49150513629524
## P30,4,20,1.49126498533948
## P30,4,21,1.49291327595711
## P30,4,22,1.49067204793294
## P30,4,23,1.49026080603911
## P30,4,24,1.49163842719534
## P30,4,25,1.49137099443284
## P30,4,26,1.49121251812688
## P30,4,27,1.49330479523231
## P30,4,28,1.49103386019483
## P30,4,29,1.4917931843953
## P30,4,30,1.49010454306082
## P30,4,31,1.49137386745877
## P30,4,32,1.48965706956496
## P30,4,33,1.4912905902653
## P30,4,34,1.4920030683279
## P30,4,35,1.4921651993479
## P30,4,36,1.49153376221657
## P30,4,37,1.49195398603167
## P30,4,38,1.48864352052862
## P30,4,39,1.49318664782756
## P30,4,40,1.49059498447111
## P30,4,41,1.49135428251222
## P30,4,42,1.49136426276767
## P30,4,43,1.49093139668306
## P30,4,44,1.49120871225993
## P30,4,45,1.49054607978234
## P30,4,46,1.49028713731881
## P30,4,47,1.49182976745978
## P30,4,48,1.49096039284107
## P30,4,49,1.49190082660941
## P30,4,50,1.49106986323992
## P30,5,1,1.49171233457678
## P30,5,2,1.49198572590666
## P30,5,3,1.49032153358942
## P30,5,4,1.49077181118291
## P30,5,5,1.4902884989609
## P30,5,6,1.49034495189272
## P30,5,7,1.49349943399429
## P30,5,8,1.49210536125863
## P30,5,9,1.49151430903254
## P30,5,10,1.49159616582534
## P30,5,11,1.49136851592497
## P30,5,12,1.49178684134232
## P30,5,13,1.49264393639319
## P30,5,14,1.49009238567549
## P30,5,15,1.49107391184027
## P30,5,16,1.48987758618135
## P30,5,17,1.48998971561809
## P30,5,18,1.49179790570186
## P30,5,19,1.49012921838199
## P30,5,20,1.49271780894353
## P30,5,21,1.49043077758596
## P30,5,22,1.4936888558524
## P30,5,23,1.4910363424392
## P30,5,24,1.49028521213891
## P30,5,25,1.49400216882879
## P30,5,26,1.49161211828168
## P30,5,27,1.49216967022296
## P30,5,28,1.49192390971714
## P30,5,29,1.49225867163275
## P30,5,30,1.4918507323868
## P30,5,31,1.49168640772502
## P30,5,32,1.49363149755141
## P30,5,33,1.49033527970314
## P30,5,34,1.4915635618445
## P30,5,35,1.49507318121014
## P30,5,36,1.49162423765505
## P30,5,37,1.49063633600871
## P30,5,38,1.4914570210585
## P30,5,39,1.49035820718539
## P30,5,40,1.49269532008343
## P30,5,41,1.48883034690978
## P30,5,42,1.492210930044
## P30,5,43,1.49147881688298
## P30,5,44,1.49117124080658
## P30,5,45,1.48922049797187
## P30,5,46,1.49320524710196
## P30,5,47,1.49149906067621
## P30,5,48,1.49083823836252
## P30,5,49,1.49468739827474
## P30,5,50,1.49320824162943
## P30,6,1,1.49113494555155
## P30,6,2,1.49269143902526
## P30,6,3,1.49312885230947
## P30,6,4,1.491293420597
## P30,6,5,1.49272330869146
## P30,6,6,1.49178216722276
## P30,6,7,1.49195051193237
## P30,6,8,1.49215584036745
## P30,6,9,1.49076531257158
## P30,6,10,1.49210651104267
## P30,6,11,1.49391356553182
## P30,6,12,1.49309099674225
## P30,6,13,1.48974109547479
## P30,6,14,1.49257052981335
## P30,6,15,1.49204468240543
## P30,6,16,1.49137602037596
## P30,6,17,1.49162909984589
## P30,6,18,1.4920520361732
## P30,6,19,1.48988939641596
## P30,6,20,1.49150672613406
## P30,6,21,1.49437360029954
## P30,6,22,1.49399688903322
## P30,6,23,1.48833696720964
## P30,6,24,1.49364612367418
## P30,6,25,1.49079802831014
## P30,6,26,1.48995263708962
## P30,6,27,1.49297390778859
## P30,6,28,1.49397818938546
## P30,6,29,1.48800522660556
## P30,6,30,1.49421947548188
## P30,6,31,1.48723704474313
## P30,6,32,1.49677162946657
## P30,6,33,1.48814279692514
## P30,6,34,1.49209982661878
## P30,6,35,1.49299248652672
## P30,6,36,1.49317995382815
## P30,6,37,1.48969591817548
## P30,6,38,1.49180608807188
## P30,6,39,1.4921880531311
## P30,6,40,1.48821451958646
## P30,6,41,1.48934984207153
## P30,6,42,1.49337550676786
## P30,6,43,1.49295169253682
## P30,6,44,1.49126635857348
## P30,6,45,1.49715490976969
## P30,6,46,1.49120971043905
## P30,6,47,1.48770529883248
## P30,6,48,1.49152274717364
## P30,6,49,1.49560398804514
## P30,6,50,1.48858751867809
## P30,7,1,1.49051057642156
## P30,7,2,1.49264858809995
## P30,7,3,1.49054467110407
## P30,7,4,1.49364442438693
## P30,7,5,1.49211417966419
## P30,7,6,1.49118775436559
## P30,7,7,1.48738974955545
## P30,7,8,1.49299100399017
## P30,7,9,1.49124934673309
## P30,7,10,1.49168593542916
## P30,7,11,1.49359371351159
## P30,7,12,1.49493685635653
## P30,7,13,1.4909196246754
## P30,7,14,1.49284473306992
## P30,7,15,1.49009259759563
## P30,7,16,1.48895320607655
## P30,7,17,1.49149297714233
## P30,7,18,1.49200103396461
## P30,7,19,1.48983870089894
## P30,7,20,1.49150672743592
## P30,7,21,1.48999974250793
## P30,7,22,1.4909330368042
## P30,7,23,1.49001258772773
## P30,7,24,1.49238761493138
## P30,7,25,1.49277446721051
## P30,7,26,1.49153063893318
## P30,7,27,1.49000735069389
## P30,7,28,1.49264523775681
## P30,7,29,1.4934801975886
## P30,7,30,1.49398784107632
## P30,7,31,1.4885801150475
## P30,7,32,1.48958559036255
## P30,7,33,1.49241093514671
## P30,7,34,1.49370035833242
## P30,7,35,1.49248390448721
## P30,7,36,1.49184182402375
## P30,7,37,1.48827304511235
## P30,7,38,1.49277041794418
## P30,7,39,1.49055837094784
## P30,7,40,1.49233566481492
## P30,7,41,1.49126839219478
## P30,7,42,1.49188218797956
## P30,7,43,1.48674031023709
## P30,7,44,1.48551570452177
## P30,7,45,1.49504700200311
## P30,7,46,1.49750603856267
## P30,7,47,1.4827174956982
## P30,7,48,1.49491108295529
## P30,7,49,1.4926451092035
## P30,7,50,1.48919015243405
## P30,8,1,1.49142786125084
## P30,8,2,1.490970674314
## P30,8,3,1.48879830814102
## P30,8,4,1.49113416671753
## P30,8,5,1.49149564549893
## P30,8,6,1.49328416698384
## P30,8,7,1.4851947896024
## P30,8,8,1.4990466372172
## P30,8,9,1.49136383393232
## P30,8,10,1.49452183164399
## P30,8,11,1.49373146692912
## P30,8,12,1.49452246938433
## P30,8,13,1.49144055445989
## P30,8,14,1.4939632208451
## P30,8,15,1.48462721880744
## P30,8,16,1.49702114894472
## P30,8,17,1.49293419947991
## P30,8,18,1.4944071493287
## P30,8,19,1.48651386562147
## P30,8,20,1.49534612894058
## P30,8,21,1.49484289609469
## P30,8,22,1.49529297672101
## P30,8,23,1.49313068389893
## P30,8,24,1.49408185482025
## P30,8,25,1.49085467338562
## P30,8,26,1.49123340494492
## P30,8,27,1.48298838220794
## P30,8,28,1.49757222831249
## P30,8,29,1.49521290844884
## P30,8,30,1.49728350928335
## P30,8,31,1.4883738437169
## P30,8,32,1.49218363232083
## P30,8,33,1.49076966444651
## P30,8,34,1.48887343602638
## P30,8,35,1.49227536564142
## P30,8,36,1.49219189151641
## P30,8,37,1.49259344197936
## P30,8,38,1.4889112552007
## P30,8,39,1.48949579149485
## P30,8,40,1.49051181057043
## P30,8,41,1.4930447245401
## P30,8,42,1.50802773475647
## P30,8,43,1.49331322422734
## P30,8,44,1.49300957397676
## P30,8,45,1.49383965134621
## P30,8,46,1.48980238408218
## P30,8,47,1.48845470160769
## P30,8,48,1.49040130306693
## P30,8,49,1.49599516697419
## P30,8,50,1.49223470687866
## P30,9,1,1.491021245718
## P30,9,2,1.49250752217061
## P30,9,3,1.48949282925303
## P30,9,4,1.49289907376791
## P30,9,5,1.4915216596503
## P30,9,6,1.49163961410522
## P30,9,7,1.49120476187729
## P30,9,8,1.49070134091733
## P30,9,9,1.49079010544754
## P30,9,10,1.49230697575737
## P30,9,11,1.49038084133251
## P30,9,12,1.49226969991411
## P30,9,13,1.49017477035522
## P30,9,14,1.49226865503523
## P30,9,15,1.49128171995089
## P30,9,16,1.49104241457852
## P30,9,17,1.48668220978749
## P30,9,18,1.49307599994871
## P30,9,19,1.49033819545399
## P30,9,20,1.49207113158535
## P30,9,21,1.4912882591116
## P30,9,22,1.49116539681095
## P30,9,23,1.48930322960631
## P30,9,24,1.49242806434631
## P30,9,25,1.49363277999448
## P30,9,26,1.4900820282684
## P30,9,27,1.48930301030477
## P30,9,28,1.49060321759574
## P30,9,29,1.4911929793277
## P30,9,30,1.49457011706587
## P30,9,31,1.48544036547343
## P30,9,32,1.48980660665603
## P30,9,33,1.48996187448502
## P30,9,34,1.49483831377997
## P30,9,35,1.49011256959703
## P30,9,36,1.49027753856084
## P30,9,37,1.48737124473818
## P30,9,38,1.49162586013992
## P30,9,39,1.49525529459903
## P30,9,40,1.48678369107454
## P30,9,41,1.49699399430873
## P30,9,42,1.49172575794049
## P30,9,43,1.49414068378814
## P30,9,44,1.48879067859952
## P30,9,45,1.48930245637894
## P30,9,46,1.49473058210837
## P30,9,47,1.48778899747934
## P30,9,48,1.49124783939785
## P30,9,49,1.49256191253662
## P30,9,50,1.4818518129555
## P30,10,1,1.49162174904183
## P30,10,2,1.4920380338033
## P30,10,3,1.48874754836594
## P30,10,4,1.49060121301102
## P30,10,5,1.49061699917442
## P30,10,6,1.4908423674734
## P30,10,7,1.49218781789144
## P30,10,8,1.49166969631029
## P30,10,9,1.48775947093964
## P30,10,10,1.49409526128035
## P30,10,11,1.4916855516568
## P30,10,12,1.47929201302705
## P30,10,13,1.50818839380818
## P30,10,14,1.49437133633361
## P30,10,15,1.48833172768354
## P30,10,16,1.47760247531003
## P30,10,17,1.50060179739287
## P30,10,18,1.49449345043727
## P30,10,19,1.48286627708597
## P30,10,20,1.49719224759002
## P30,10,21,1.48963756174655
## P30,10,22,1.48970151397417
## P30,10,23,1.49157921891463
## P30,10,24,1.49411515356268
## P30,10,25,1.48757237328423
## P30,10,26,1.48869532697341
## P30,10,27,1.49218895343634
## P30,10,28,1.49374569518657
## P30,10,29,1.48948585846845
## P30,10,30,1.49234958974327
## P30,10,31,1.49099306076292
## P30,10,32,1.49478399342504
## P30,10,33,1.49255378695502
## P30,10,34,1.49373585156032
## P30,10,35,1.4656530769778
## P30,10,36,1.51258820806231
## P30,10,37,1.47230037053426
## P30,10,38,1.48117979367574
## P30,10,39,1.5097436526465
## P30,10,40,1.45296559817549
## P30,10,41,1.51984259370085
## P30,10,42,1.51402718790116
## P30,10,43,1.49412151805142
## P30,10,44,1.48992806511956
## P30,10,45,1.49188628666837
## P30,10,46,1.49241444405089
## P30,10,47,1.49535436857314
## P30,10,48,1.48339487294682
## P30,10,49,1.49643026457893
## P30,10,50,1.48291946319212
## P31,1,1,1.49464481060322
## P31,1,2,1.49893877506256
## P31,1,3,1.50066777638027
## P31,1,4,1.49830327987671
## P31,1,5,1.4972323008946
## P31,1,6,1.49865375795672
## P31,1,7,1.49662907227226
## P31,1,8,1.49934496879578
## P31,1,9,1.49900257789483
## P31,1,10,1.49838715249842
## P31,1,11,1.4928231456063
## P31,1,12,1.49540813579116
## P31,1,13,1.49664781607834
## P31,1,14,1.49816998191502
## P31,1,15,1.49431643119225
## P31,1,16,1.49609478314718
## P31,1,17,1.49675182436333
## P31,1,18,1.49655861324734
## P31,1,19,1.49514932632446
## P31,1,20,1.49843760899135
## P31,1,21,1.50256171756321
## P31,1,22,1.49379472732544
## P31,1,23,1.4939692663768
## P31,1,24,1.4937973121802
## P31,1,25,1.4951114209493
## P31,1,26,1.49426878160901
## P31,1,27,1.4966055052621
## P31,1,28,1.49512543216828
## P31,1,29,1.49881417934711
## P31,1,30,1.49448118371479
## P31,1,31,1.49281111516451
## P31,1,32,1.49381608497806
## P31,1,33,1.49401587706346
## P31,1,34,1.49057964324951
## P31,1,35,1.49307602643967
## P31,1,36,1.49154462814331
## P31,1,37,1.4968416839838
## P31,1,38,1.49781095064603
## P31,1,39,1.49322066483674
## P31,1,40,1.49617878595988
## P31,1,41,1.50007911161943
## P31,1,42,1.49272645603527
## P31,1,43,1.49163222312927
## P31,1,44,1.49537152574773
## P31,1,45,1.49485249397082
## P31,1,46,1.49454900773905
## P31,1,47,1.48955902686486
## P31,1,48,1.49091003491328
## Warning: There are no valid values for INTERVALS=49 in LISTP31[[1]]
## P31,1,50,1.49438119545961
## P31,2,1,1.49287967681885
## P31,2,2,1.49154472351074
## P31,2,3,1.49614583528959
## P31,2,4,1.49322112868814
## P31,2,5,1.49278423190117
## P31,2,6,1.49236860080641
## P31,2,7,1.48990271542523
## P31,2,8,1.49001238423009
## P31,2,9,1.4899384021759
## P31,2,10,1.49251247221424
## P31,2,11,1.49197882100155
## P31,2,12,1.49393156596592
## P31,2,13,1.4970031314426
## P31,2,14,1.49033771712205
## P31,2,15,1.49244669321421
## P31,2,16,1.49272285699844
## P31,2,17,1.49090648952283
## P31,2,18,1.49253538802818
## P31,2,19,1.49160721898079
## P31,2,20,1.48654898575374
## P31,2,21,1.49491474151611
## P31,2,22,1.49416955312093
## P31,2,23,1.49050856553591
## P31,2,24,1.49237062249865
## P31,2,25,1.49308976189035
## P31,2,26,1.48891274134318
## P31,2,27,1.52124357223511
## P31,2,28,1.50085756182671
## P31,2,29,1.47170426552756
## P31,2,30,1.49280799062628
## P31,2,31,1.48520450592041
## Warning: There are no valid values for INTERVALS=32 in LISTP31[[2]]
## P31,2,33,1.49355908540579
## P31,2,34,1.48848216874259
## P31,2,35,1.49217649408289
## P31,2,36,1.48785322904587
## P31,2,37,1.4941849564061
## P31,2,38,1.49075492945584
## P31,2,39,1.48956736651334
## P31,2,40,1.4927435354753
## P31,2,41,1.49200601804824
## Warning: There are no valid values for INTERVALS=42 in LISTP31[[2]]
## P31,2,43,1.4903951626198
## P31,2,44,1.49292758107185
## P31,2,45,1.49186815935023
## P31,2,46,1.48976052891124
## P31,2,47,1.4937636256218
## P31,2,48,1.49209150671959
## P31,2,49,1.491419672966
## P31,2,50,1.49114476352099
## P31,3,1,1.49050299326579
## P31,3,2,1.49036909285046
## P31,3,3,1.49235232059772
## P31,3,4,1.49182536467066
## P31,3,5,1.49181707088764
## P31,3,6,1.49152378808884
## P31,3,7,1.49056641951851
## P31,3,8,1.47241926193237
## P31,3,9,1.49662472142114
## P31,3,10,1.49574562481471
## P31,3,11,1.48352360725403
## P31,3,12,1.48795086996896
## P31,3,13,1.49169470923288
## P31,3,14,1.48926055070126
## P31,3,15,1.49351405124275
## P31,3,16,1.49046966552734
## P31,3,17,1.49190931850009
## P31,3,18,1.49198560714722
## Warning: There are no valid values for INTERVALS=19 in LISTP31[[3]]
## P31,3,20,1.49255330809231
## P31,3,21,1.49256371643584
## P31,3,22,1.49235993882884
## P31,3,23,1.49140780312674
## P31,3,24,1.48996517874978
## P31,3,25,1.49034813472203
## P31,3,26,1.49011001803658
## P31,3,27,1.49148218448345
## P31,3,28,1.49164876672957
## P31,3,29,1.49406713094467
## P31,3,30,1.48975305557251
## P31,3,31,1.49478091133965
## Warning: There are no valid values for INTERVALS=32 in LISTP31[[3]]
## P31,3,33,1.49366969532437
## P31,3,34,1.49357393582662
## P31,3,35,1.49118002255758
## Warning: There are no valid values for INTERVALS=36 in LISTP31[[3]]
## P31,3,37,1.49274289898756
## P31,3,38,1.49277540353628
## Warning: There are no valid values for INTERVALS=39 in LISTP31[[3]]
## P31,3,40,1.49103606980422
## P31,3,41,1.49216985702515
## P31,3,42,1.49474473953247
## P31,3,43,1.49433847268422
## P31,3,44,1.49057219392162
## P31,3,45,1.49385245029743
## P31,3,46,1.49249243302779
## P31,3,47,1.4895584848192
## P31,3,48,1.48926963806152
## P31,3,49,1.48947462081909
## P31,3,50,1.49494017607777
## P31,4,1,1.42209750850026
## P31,4,2,1.49883787333965
## P31,4,3,1.49516986398136
## P31,4,4,1.49131029844284
## P31,4,5,1.47177027899121
## P31,4,6,1.47263126662283
## P31,4,7,1.4778911113739
## P31,4,8,1.49622452259064
## P31,4,9,1.54631255291126
## P31,4,10,1.44927411813002
## P31,4,11,1.47383388605985
## P31,4,12,1.47904419898987
## P31,4,13,1.48781583664265
## Warning: There are no valid values for INTERVALS=14 in LISTP31[[4]]
## P31,4,15,1.44375161329905
## P31,4,16,1.49103152124505
## P31,4,17,1.49247859506046
## P31,4,18,1.49456710474832
## P31,4,19,1.49441976325456
## P31,4,20,1.50798277854919
## P31,4,21,1.48175439834595
## P31,4,22,1.49094582712928
## P31,4,23,1.49198554691515
## P31,4,24,1.48798908127679
## P31,4,25,1.4983643160926
## P31,4,26,1.48821129943385
## P31,4,27,1.49939913219876
## Warning: There are no valid values for INTERVALS=28 in LISTP31[[4]]
## Warning: There are no valid values for INTERVALS=29 in LISTP31[[4]]
## P31,4,30,1.48762796322505
## P31,4,31,1.4975929076855
## P31,4,32,1.48795863986015
## P31,4,33,1.50179507182195
## P31,4,34,1.48538208007812
## P31,4,35,1.49314546585083
## P31,4,36,1.49610294614519
## P31,4,37,1.48644733428955
## P31,4,38,1.49922793252128
## Warning: There are no valid values for INTERVALS=39 in LISTP31[[4]]
## P31,4,40,1.51062002182007
## P31,4,41,1.49239620566368
## P31,4,42,1.4884717464447
## P31,4,43,1.47434979014926
## P31,4,44,1.49623237337385
## P31,4,45,1.48314027786255
## P31,4,46,1.49815653051649
## P31,4,47,1.49760742620988
## Warning: There are no valid values for INTERVALS=48 in LISTP31[[4]]
## P31,4,49,1.49135054933264
## P31,4,50,1.48999679342229
## P31,5,1,1.49406400093665
## P31,5,2,1.49520314534505
## P31,5,3,1.49348928310253
## P31,5,4,1.49700983047485
## Warning: There are no valid values for INTERVALS=5 in LISTP31[[5]]
## P31,5,6,1.49633661905924
## P31,5,7,1.48710091114044
## P31,5,8,1.49724126997448
## Warning: There are no valid values for INTERVALS=9 in LISTP31[[5]]
## P31,5,10,1.47290529145135
## P31,5,11,1.5018218926021
## P31,5,12,1.49879495302836
## P31,5,13,1.47923882802327
## P31,5,14,1.49219881693522
## P31,5,15,1.49063085687572
## P31,5,16,1.49126348892848
## P31,5,17,1.48769412721906
## P31,5,18,1.49582851850069
## P31,5,19,1.49089287008558
## Warning: There are no valid values for INTERVALS=20 in LISTP31[[5]]
## P31,5,21,1.49491563920052
## P31,5,22,1.48878567559378
## P31,5,23,1.49127564222916
## P31,5,24,1.49044966697693
## P31,5,25,1.49172873930498
## P31,5,26,1.48911366337224
## Warning: There are no valid values for INTERVALS=27 in LISTP31[[5]]
## P31,5,28,1.49076520695406
## P31,5,29,1.49391965866089
## P31,5,30,1.49121648073196
## P31,5,31,1.49248861444407
## P31,5,32,1.48978718757629
## P31,5,33,1.49416967233022
## P31,5,34,1.49090827595104
## P31,5,35,1.49085018369887
## P31,5,36,1.4931392283053
## P31,5,37,1.49276354312897
## P31,5,38,1.48978155537655
## P31,5,39,1.49191971482902
## P31,5,40,1.49156739495017
## P31,5,41,1.49181029200554
## P31,5,42,1.49487595558167
## P31,5,43,1.49403025553777
## P31,5,44,1.4928859930772
## P31,5,45,1.49200304349264
## P31,5,46,1.49241971969604
## P31,5,47,1.49171962738037
## P31,5,48,1.48841400579973
## P31,5,49,1.49429468313853
## P31,5,50,1.49166856800114
## P31,6,1,1.48998216787974
## P31,6,2,1.49156576478985
## P31,6,3,1.4868447303772
## P31,6,4,1.49206964174906
## P31,6,5,1.49252967834473
## P31,6,6,1.49059287288733
## P31,6,7,1.49509476025899
## P31,6,8,1.49002121388912
## P31,6,9,1.49264766188229
## P31,6,10,1.49368376885691
## P31,6,11,1.4891608101981
## P31,6,12,1.49106793070948
## P31,6,13,1.4915678412826
## P31,6,14,1.49205718040466
## P31,6,15,1.49252801471286
## P31,6,16,1.49026966094971
## P31,6,17,1.48665576510959
## P31,6,18,1.49132528110426
## P31,6,19,1.4924946308136
## P31,6,20,1.49248220026493
## Warning: There are no valid values for INTERVALS=21 in LISTP31[[6]]
## P31,6,22,1.49143248337966
## P31,6,23,1.48624546187265
## P31,6,24,1.49117436498966
## P31,6,25,1.49231549104055
## P31,6,26,1.48669457435608
## P31,6,27,1.49004471820334
## Warning: There are no valid values for INTERVALS=28 in LISTP31[[6]]
## P31,6,29,1.49366455662007
## P31,6,30,1.49073219299316
## P31,6,31,1.49012672901154
## P31,6,32,1.49174353209409
## P31,6,33,1.49292439680833
## Warning: There are no valid values for INTERVALS=34 in LISTP31[[6]]
## P31,6,35,1.49189809273029
## P31,6,36,1.49036010106405
## P31,6,37,1.4918900021052
## P31,6,38,1.49121774159945
## P31,6,39,1.49354945696317
## P31,6,40,1.47936930656433
## P31,6,41,1.49566197395325
## P31,6,42,1.49391096691753
## P31,6,43,1.4890030225118
## P31,6,44,1.48830511172613
## P31,6,45,1.48816960198539
## P31,6,46,1.49191965375628
## P31,6,47,1.49223213195801
## P31,6,48,1.49182417609475
## P31,6,49,1.4880931328754
## P31,6,50,1.49097079750877
## P31,7,1,1.48973214626312
## P31,7,2,1.49203566142491
## P31,7,3,1.49593614495319
## P31,7,4,1.49200741788174
## P31,7,5,1.48838839928309
## P31,7,6,1.49039402986184
## P31,7,7,1.49366112413078
## P31,7,8,1.49389050801595
## P31,7,9,1.4915846824646
## Warning: There are no valid values for INTERVALS=10 in LISTP31[[7]]
## P31,7,11,1.49419693324877
## P31,7,12,1.48889125477184
## P31,7,13,1.48992927257831
## Warning: There are no valid values for INTERVALS=14 in LISTP31[[7]]
## P31,7,15,1.48965721130371
## P31,7,16,1.4914169818797
## P31,7,17,1.49017384847005
## P31,7,18,1.49146294593811
## P31,7,19,1.49213213920593
## P31,7,20,1.49105828892101
## P31,7,21,1.49238589003279
## P31,7,22,1.49083547202908
## Warning: There are no valid values for INTERVALS=23 in LISTP31[[7]]
## P31,7,24,1.49064883391062
## P31,7,25,1.4911411012922
## P31,7,26,1.49089586167108
## P31,7,27,1.49051878370088
## P31,7,28,1.48907934294807
## P31,7,29,1.49411017554147
## P31,7,30,1.48966369174776
## P31,7,31,1.49150992764367
## P31,7,32,1.4893884062767
## P31,7,33,1.48998078240289
## P31,7,34,1.48949463367462
## P31,7,35,1.49421789095952
## Warning: There are no valid values for INTERVALS=36 in LISTP31[[7]]
## P31,7,37,1.49257051533666
## P31,7,38,1.48553635279338
## P31,7,39,1.49252883737737
## P31,7,40,1.48702320238439
## P31,7,41,1.48743534088135
## P31,7,42,1.49300222396851
## P31,7,43,1.49173212051392
## P31,7,44,1.4917008638382
## P31,7,45,1.4900688048332
## Warning: There are no valid values for INTERVALS=46 in LISTP31[[7]]
## P31,7,47,1.49132831280048
## P31,7,48,1.48785710334778
## P31,7,49,1.49412652162405
## P31,7,50,1.49240961970899
## P31,8,1,1.4913272443025
## Warning: There are no valid values for INTERVALS=2 in LISTP31[[8]]
## P31,8,3,1.48854446411133
## P31,8,4,1.49043958774511
## P31,8,5,1.48988389968872
## P31,8,6,1.48857684289255
## P31,8,7,1.49030065536499
## P31,8,8,1.4926925780068
## P31,8,9,1.4889064086111
## P31,8,10,1.49025297164917
## P31,8,11,1.49517383883076
## P31,8,12,1.49448977447138
## P31,8,13,1.49101057919589
## Warning: There are no valid values for INTERVALS=14 in LISTP31[[8]]
## P31,8,15,1.4801441192627
## P31,8,16,1.48698216676712
## P31,8,17,1.50594501495361
## Warning: There are no valid values for INTERVALS=18 in LISTP31[[8]]
## Warning: There are no valid values for INTERVALS=19 in LISTP31[[8]]
## P31,8,20,1.49148530960083
## P31,8,21,1.49309674898783
## P31,8,22,1.49350522693835
## P31,8,23,1.48977717399597
## P31,8,24,1.49435525387526
## P31,8,25,1.49205160140991
## P31,8,26,1.48216915130615
## P31,8,27,1.49508782090812
## P31,8,28,1.49823935826619
## P31,8,29,1.49047854367424
## P31,8,30,1.48971842556465
## P31,8,31,1.494697265625
## P31,8,32,1.49005107390575
## P31,8,33,1.49260238500742
## P31,8,34,1.48916959762573
## P31,8,35,1.49850685700126
## P31,8,36,1.49258300565904
## P31,8,37,1.49303864269722
## P31,8,38,1.49237795670827
## P31,8,39,1.48856337070465
## P31,8,40,1.49184985721813
## P31,8,41,1.49190175192697
## P31,8,42,1.49084190792508
## P31,8,43,1.49164414892391
## P31,8,44,1.49226160610423
## P31,8,45,1.49077878679548
## P31,8,46,1.48935517957134
## P31,8,47,1.49557849339076
## P31,8,48,1.49139914583804
## P31,8,49,1.4907084169059
## P31,8,50,1.49150573230181
## P31,9,1,1.4886725630079
## P31,9,2,1.49474602210812
## P31,9,3,1.4910605430603
## P31,9,4,1.49046732130505
## P31,9,5,1.48797250711001
## P31,9,6,1.49146300095778
## P31,9,7,1.49421264103481
## P31,9,8,1.49328696727753
## P31,9,9,1.48746570787932
## P31,9,10,1.49188019099988
## Warning: There are no valid values for INTERVALS=11 in LISTP31[[9]]
## P31,9,12,1.49133797792288
## P31,9,13,1.49288856983185
## P31,9,14,1.49069155454636
## P31,9,15,1.49377299111987
## P31,9,16,1.47453548741895
## P31,9,17,1.49671979904175
## P31,9,18,1.49554478603861
## P31,9,19,1.4939544333352
## P31,9,20,1.49262801387854
## P31,9,21,1.49320638470533
## P31,9,22,1.49051968256632
## P31,9,23,1.49047709800102
## P31,9,24,1.48907136917114
## P31,9,25,1.48814525836852
## P31,9,26,1.4930880344831
## P31,9,27,1.48978877812624
## P31,9,28,1.4954921571832
## P31,9,29,1.48679457212749
## P31,9,30,1.49105577468872
## P31,9,31,1.4890284538269
## P31,9,32,1.48755671901088
## P31,9,33,1.49246555964152
## P31,9,34,1.49363282593814
## P31,9,35,1.49004943554218
## P31,9,36,1.49092328207833
## P31,9,37,1.49500306447347
## P31,9,38,1.49077283143997
## P31,9,39,1.4922776222229
## P31,9,40,1.4875387590985
## Warning: There are no valid values for INTERVALS=41 in LISTP31[[9]]
## P31,9,42,1.49536665678024
## P31,9,43,1.49136224952904
## P31,9,44,1.49246237494729
## P31,9,45,1.4911892414093
## P31,9,46,1.50026381015778
## P31,9,47,1.49400908606393
## P31,9,48,1.49004798186453
## P31,9,49,1.48854060326853
## P31,9,50,1.49564063549042
## P31,10,1,1.49263327338479
## P31,10,2,1.48446386091171
## P31,10,3,1.48383024760655
## P31,10,4,1.49562379292079
## P31,10,5,1.49391973935641
## P31,10,6,1.4875517071418
## P31,10,7,1.50319107373555
## P31,10,8,1.49011415905423
## P31,10,9,1.4930072148641
## P31,10,10,1.49122849632712
## P31,10,11,1.49287312638526
## P31,10,12,1.4938424428304
## P31,10,13,1.49003081851535
## P31,10,14,1.49470368298617
## P31,10,15,1.49416971206665
## P31,10,16,1.47347128391266
## P31,10,17,1.49205008797024
## P31,10,18,1.48977982795845
## P31,10,19,1.49197676907415
## P31,10,20,1.49398043661407
## P31,10,21,1.4921947479248
## P31,10,22,1.49109251955722
## P31,10,23,1.492631203089
## P31,10,24,1.49046965837479
## P31,10,25,1.48869962692261
## P31,10,26,1.48964792749156
## P31,10,27,1.48798208766513
## P31,10,28,1.49312366937336
## P31,10,29,1.48569459915161
## P31,10,30,1.49035178593227
## P31,10,31,1.49165363800831
## P31,10,32,1.51727445920308
## P31,10,33,1.49378077189128
## P31,10,34,1.49022320338658
## Warning: There are no valid values for INTERVALS=35 in LISTP31[[10]]
## P31,10,36,1.49243622077139
## P31,10,37,1.49454820478285
## P31,10,38,1.49147360975092
## P31,10,39,1.49012699359801
## P31,10,40,1.49188086904328
## P31,10,41,1.49441193044186
## P31,10,42,1.49179464578629
## P31,10,43,1.49116162330874
## P31,10,44,1.49057078915973
## P31,10,45,1.49349917787494
## P31,10,46,1.49400313695272
## P31,10,47,1.49399709701538
## P31,10,48,1.48919242078608
## P31,10,49,1.48523896535238
## P31,10,50,1.49046058992369
## P32,1,1,1.49485868631407
## P32,1,2,1.49189671691583
## P32,1,3,1.49249214172363
## P32,1,4,1.49225516068308
## P32,1,5,1.48970170510121
## P32,1,6,1.4917321867413
## P32,1,7,1.49268241804473
## P32,1,8,1.49775741100311
## P32,1,9,1.49223377765753
## P32,1,10,1.49238400232224
## P32,1,11,1.49203080601162
## P32,1,12,1.49407604607669
## P32,1,13,1.493011034452
## P32,1,14,1.49250624730037
## P32,1,15,1.49275003647318
## P32,1,16,1.49362180657583
## P32,1,17,1.49230489619943
## P32,1,18,1.49453403594646
## P32,1,19,1.49374035130376
## P32,1,20,1.49290654533788
## P32,1,21,1.4930166984672
## P32,1,22,1.49302387237549
## P32,1,23,1.49142507884813
## P32,1,24,1.4920324344261
## P32,1,25,1.49345301787059
## P32,1,26,1.49214002641581
## P32,1,27,1.49061082391178
## P32,1,28,1.49160602857482
## P32,1,29,1.49478847980499
## P32,1,30,1.49176342146737
## P32,1,31,1.49231999433493
## P32,1,32,1.49269895350679
## P32,1,33,1.48911702005487
## P32,1,34,1.50354528427124
## P32,1,35,1.49064160585403
## P32,1,36,1.49302950772372
## P32,1,37,1.49323566754659
## P32,1,38,1.49213492870331
## P32,1,39,1.491908458563
## P32,1,40,1.4910089969635
## P32,1,41,1.49416072028024
## P32,1,42,1.49368575007416
## P32,1,43,1.49153003692627
## P32,1,44,1.4931790471077
## P32,1,45,1.49163122666188
## P32,1,46,1.49182736873627
## P32,1,47,1.49378661186464
## P32,1,48,1.49283217906952
## P32,1,49,1.49312120554399
## P32,1,50,1.4934592828518
## P32,2,1,1.49343328890593
## P32,2,2,1.4896867275238
## P32,2,3,1.49276579343356
## P32,2,4,1.49219320822453
## P32,2,5,1.49294630686442
## P32,2,6,1.49286063512166
## P32,2,7,1.4928794503212
## P32,2,8,1.49120902132105
## P32,2,9,1.4936310450236
## P32,2,10,1.49304149089715
## P32,2,11,1.49276861879561
## P32,2,12,1.49333375692368
## P32,2,13,1.49252619508837
## P32,2,14,1.49401971817017
## P32,2,15,1.49104238856922
## P32,2,16,1.49299612606273
## P32,2,17,1.49261030554771
## P32,2,18,1.48913634618123
## P32,2,19,1.49121069908142
## P32,2,20,1.49452087614271
## P32,2,21,1.489336321089
## P32,2,22,1.4931458865895
## P32,2,23,1.49237014662545
## P32,2,24,1.48939494144769
## P32,2,25,1.49170613288879
## P32,2,26,1.49159675552731
## P32,2,27,1.49168749082656
## P32,2,28,1.4894195927514
## P32,2,29,1.4915411063603
## P32,2,30,1.49290831677325
## P32,2,31,1.49216480348624
## P32,2,32,1.49298156168043
## P32,2,33,1.49192364672397
## P32,2,34,1.49233513332549
## P32,2,35,1.49182735589834
## P32,2,36,1.49260846614838
## P32,2,37,1.49099070375616
## P32,2,38,1.49210380738781
## P32,2,39,1.49124107068899
## P32,2,40,1.49184561364445
## P32,2,41,1.4918545131952
## P32,2,42,1.4927443105783
## P32,2,43,1.48905201519237
## P32,2,44,1.49136245856851
## P32,2,45,1.49056488626144
## P32,2,46,1.49211635309107
## P32,2,47,1.48899733053671
## P32,2,48,1.48966967718942
## P32,2,49,1.49072407137963
## P32,2,50,1.49215172862147
## P32,3,1,1.498092515128
## P32,3,2,1.49118218421936
## P32,3,3,1.49174111230033
## P32,3,4,1.49124464988709
## P32,3,5,1.49129463831584
## P32,3,6,1.49209396462691
## P32,3,7,1.49309826516486
## P32,3,8,1.48985867384003
## P32,3,9,1.49273219861482
## P32,3,10,1.49084330488134
## P32,3,11,1.49272556507841
## P32,3,12,1.49142129699905
## P32,3,13,1.49185257423215
## P32,3,14,1.49175115944683
## P32,3,15,1.49041519846235
## P32,3,16,1.49211248670306
## P32,3,17,1.49071063370001
## P32,3,18,1.49118526279926
## P32,3,19,1.49227505104215
## P32,3,20,1.49194985422595
## P32,3,21,1.49199749388785
## P32,3,22,1.49078868684315
## P32,3,23,1.49249456112201
## P32,3,24,1.49049961090088
## P32,3,25,1.4919120759675
## P32,3,26,1.49206283688545
## P32,3,27,1.49207492627596
## P32,3,28,1.49243300011817
## P32,3,29,1.49136538254587
## P32,3,30,1.49268354015586
## Warning: There are no valid values for INTERVALS=31 in LISTP32[[3]]
## P32,3,32,1.49221710501046
## P32,3,33,1.49074684872347
## P32,3,34,1.49310414753263
## P32,3,35,1.49009727176867
## P32,3,36,1.49263520076357
## P32,3,37,1.49049659875723
## P32,3,38,1.49069610008827
## P32,3,39,1.49183680063271
## P32,3,40,1.49230218656135
## P32,3,41,1.49199421363964
## P32,3,42,1.49157843718658
## P32,3,43,1.49219667589342
## P32,3,44,1.49096131936098
## P32,3,45,1.49217488368352
## P32,3,46,1.49125355237151
## P32,3,47,1.49327381451925
## P32,3,48,1.49137193506414
## P32,3,49,1.49041270326685
## P32,3,50,1.49186442619146
## P32,4,1,1.49396017907371
## P32,4,2,1.49325802533523
## P32,4,3,1.48938687121282
## P32,4,4,1.48947465896606
## P32,4,5,1.49214152097702
## P32,4,6,1.49133633507623
## P32,4,7,1.49145845435132
## P32,4,8,1.49272284507751
## P32,4,9,1.49264626701673
## P32,4,10,1.49211150202258
## P32,4,11,1.49141339063644
## P32,4,12,1.49143164715868
## P32,4,13,1.49162323815482
## P32,4,14,1.49124073514751
## P32,4,15,1.49205427903395
## P32,4,16,1.49198556590725
## P32,4,17,1.49289464950562
## P32,4,18,1.49200371828946
## P32,4,19,1.49094434432041
## P32,4,20,1.49157789412965
## P32,4,21,1.4922163166217
## P32,4,22,1.49110656465803
## P32,4,23,1.49281152395102
## P32,4,24,1.49248213603579
## P32,4,25,1.49179808081013
## P32,4,26,1.49127382943124
## P32,4,27,1.49134711866026
## P32,4,28,1.49173432383044
## P32,4,29,1.4923863252004
## P32,4,30,1.4914095474012
## P32,4,31,1.49236318372911
## P32,4,32,1.49229467299677
## P32,4,33,1.49092399662939
## P32,4,34,1.49114880561829
## P32,4,35,1.49134500821431
## P32,4,36,1.49195793696812
## P32,4,37,1.49335718154907
## P32,4,38,1.49139722188314
## P32,4,39,1.49000789137448
## P32,4,40,1.49417673866704
## P32,4,41,1.49162192291088
## P32,4,42,1.4906867562908
## P32,4,43,1.49171182908208
## P32,4,44,1.49084464179145
## P32,4,45,1.49116967475578
## P32,4,46,1.49111201212956
## P32,4,47,1.4909651149403
## P32,4,48,1.49129466215769
## P32,4,49,1.49149181473423
## P32,4,50,1.49280112365196
## P32,5,1,1.49067568778992
## P32,5,2,1.49153076277839
## P32,5,3,1.49147112930522
## P32,5,4,1.49191577732563
## P32,5,5,1.49180752389571
## P32,5,6,1.49176236121885
## P32,5,7,1.49151339795854
## P32,5,8,1.49096547022904
## P32,5,9,1.49016963917276
## P32,5,10,1.49455605420199
## P32,5,11,1.49097142900739
## P32,5,12,1.49139693867077
## P32,5,13,1.49181825709793
## P32,5,14,1.4917703023771
## P32,5,15,1.49184615939271
## P32,5,16,1.49188469814998
## P32,5,17,1.49162133534749
## P32,5,18,1.492285660335
## P32,5,19,1.49117380777995
## P32,5,20,1.49291730376909
## P32,5,21,1.49114731947581
## P32,5,22,1.49149563733269
## P32,5,23,1.49022848465863
## P32,5,24,1.49212986772711
## P32,5,25,1.49080163461191
## P32,5,26,1.49202294280564
## P32,5,27,1.4908502013595
## P32,5,28,1.48924812616086
## P32,5,29,1.49219591617584
## P32,5,30,1.49195834073153
## P32,5,31,1.4910082022349
## P32,5,32,1.49103330482136
## P32,5,33,1.49189049402873
## P32,5,34,1.49205234967745
## P32,5,35,1.49110485006262
## P32,5,36,1.49147288004557
## P32,5,37,1.49059636017372
## P32,5,38,1.4924863243103
## P32,5,39,1.49136943083543
## P32,5,40,1.49176642440614
## P32,5,41,1.49198938333071
## P32,5,42,1.4914126342602
## P32,5,43,1.4922036371733
## P32,5,44,1.49093433922412
## P32,5,45,1.4893577467535
## P32,5,46,1.49173452884336
## P32,5,47,1.49092500767809
## P32,5,48,1.4914306752822
## P32,5,49,1.49253254401975
## P32,5,50,1.49233431322821
## P32,6,1,1.49044668996656
## P32,6,2,1.49122822284698
## P32,6,3,1.49195478856564
## P32,6,4,1.4910974184672
## P32,6,5,1.49110066205606
## P32,6,6,1.49166966647637
## P32,6,7,1.49184117206307
## P32,6,8,1.49177503585815
## P32,6,9,1.49161347098972
## P32,6,10,1.49148932865688
## P32,6,11,1.49013891376433
## P32,6,12,1.49115629423232
## P32,6,13,1.49129655144431
## P32,6,14,1.49130805901119
## P32,6,15,1.49138092041016
## P32,6,16,1.4922220320315
## P32,6,17,1.4909619478079
## P32,6,18,1.49355939556571
## P32,6,19,1.49206477595914
## P32,6,20,1.49168219566345
## P32,6,21,1.49175912726159
## P32,6,22,1.49028422832489
## P32,6,23,1.49114426225424
## P32,6,24,1.49253858589545
## P32,6,25,1.49148827908086
## P32,6,26,1.49080615922024
## P32,6,27,1.49110215833817
## P32,6,28,1.49234750237263
## P32,6,29,1.49256370378577
## P32,6,30,1.49432310191068
## P32,6,31,1.49165990203619
## P32,6,32,1.49154945520254
## P32,6,33,1.49216737747192
## P32,6,34,1.49096789694669
## P32,6,35,1.49193755217961
## P32,6,36,1.49155629512876
## P32,6,37,1.49131389764639
## P32,6,38,1.49115937176873
## P32,6,39,1.49131549729241
## P32,6,40,1.49143911997477
## P32,6,41,1.49181258489215
## P32,6,42,1.49062458022696
## P32,6,43,1.49165620055853
## P32,6,44,1.49069564992731
## P32,6,45,1.49227522981578
## P32,6,46,1.4911183998233
## P32,6,47,1.49111916468694
## P32,6,48,1.49100241190951
## P32,6,49,1.49043922126293
## P32,6,50,1.49180758136442
## P32,7,1,1.49173059463501
## P32,7,2,1.49138975143433
## P32,7,3,1.49139355565165
## P32,7,4,1.49114095198142
## P32,7,5,1.49109306643086
## P32,7,6,1.49169513031288
## P32,7,7,1.49136361308481
## P32,7,8,1.49263540390999
## P32,7,9,1.49130035891677
## P32,7,10,1.49110071412448
## P32,7,11,1.49076913327587
## P32,7,12,1.49132716178894
## P32,7,13,1.49166454587664
## P32,7,14,1.49143437217264
## P32,7,15,1.49159154891968
## P32,7,16,1.49100764592489
## P32,7,17,1.49187034956166
## P32,7,18,1.49064794830654
## P32,7,19,1.49192432761192
## P32,7,20,1.49169464844924
## P32,7,21,1.49125105281209
## P32,7,22,1.49045342368049
## P32,7,23,1.49191471099854
## P32,7,24,1.49116700760862
## P32,7,25,1.49142234043408
## P32,7,26,1.49132814541669
## P32,7,27,1.49177857672814
## P32,7,28,1.49173218011856
## P32,7,29,1.49228647777012
## P32,7,30,1.49251054994988
## P32,7,31,1.49106459921979
## P32,7,32,1.49165746642322
## P32,7,33,1.49178648776695
## P32,7,34,1.49026130040487
## P32,7,35,1.4932252102428
## P32,7,36,1.49102565516596
## P32,7,37,1.49114995253714
## P32,7,38,1.49224420303994
## P32,7,39,1.49106427734973
## P32,7,40,1.49062336815728
## P32,7,41,1.49157841243441
## P32,7,42,1.49183314274519
## P32,7,43,1.49168330105868
## P32,7,44,1.49066960811615
## P32,7,45,1.49302941996877
## P32,7,46,1.4929967535303
## P32,7,47,1.48985844470085
## P32,7,48,1.49927154183388
## P32,7,49,1.49132820455039
## P32,7,50,1.49158103786298
## P32,8,1,1.48343609174093
## P32,8,2,1.49113211631775
## P32,8,3,1.4868030386456
## P32,8,4,1.49287165128268
## P32,8,5,1.49155539785113
## P32,8,6,1.49183471679688
## P32,8,7,1.48976557753807
## P32,8,8,1.49267673492432
## P32,8,9,1.49387132525444
## P32,8,10,1.488159643809
## P32,8,11,1.49133286211226
## P32,8,12,1.49143751689366
## P32,8,13,1.49099129583777
## P32,8,14,1.49249063955771
## P32,8,15,1.49215179914004
## P32,8,16,1.49007319567496
## P32,8,17,1.49119660304143
## P32,8,18,1.48919207010514
## P32,8,19,1.49035131186247
## P32,8,20,1.49215458251618
## P32,8,21,1.49206999764926
## P32,8,22,1.49186794932296
## P32,8,23,1.49036820729574
## P32,8,24,1.48963025498064
## P32,8,25,1.49269891714121
## P32,8,26,1.49088047511542
## P32,8,27,1.49002904891968
## P32,8,28,1.49275681466767
## P32,8,29,1.4893901348114
## P32,8,30,1.49226072856358
## P32,8,31,1.49296479754978
## P32,8,32,1.48505599570997
## P32,8,33,1.4923801924053
## P32,8,34,1.49199606754162
## P32,8,35,1.48891967626718
## P32,8,36,1.49291968345642
## P32,8,37,1.49119980581875
## P32,8,38,1.48993362320794
## P32,8,39,1.4908209767258
## P32,8,40,1.49272028403946
## P32,8,41,1.4922786064637
## P32,8,42,1.49093231370177
## P32,8,43,1.4905863404274
## P32,8,44,1.48761753241221
## P32,8,45,1.49160849794428
## P32,8,46,1.48942857129233
## P32,8,47,1.49023443819529
## P32,8,48,1.49102844132317
## P32,8,49,1.49023910805031
## P32,8,50,1.49063812181788
## P32,9,1,1.49317132509672
## P32,9,2,1.49334439810585
## P32,9,3,1.48985341823462
## P32,9,4,1.49155200930203
## P32,9,5,1.49170232855755
## P32,9,6,1.49051667232903
## P32,9,7,1.48727675846645
## P32,9,8,1.49031375514136
## P32,9,9,1.49377788724126
## P32,9,10,1.49200300278702
## P32,9,11,1.48982200026512
## P32,9,12,1.49433502100282
## P32,9,13,1.48769184661238
## P32,9,14,1.49378926857658
## P32,9,15,1.49183119260348
## P32,9,16,1.48845982551575
## P32,9,17,1.49045595046013
## P32,9,18,1.49217236560324
## P32,9,19,1.48971044498941
## P32,9,20,1.49316969624272
## P32,9,21,1.49360806700112
## P32,9,22,1.48957902987798
## P32,9,23,1.49200578795539
## P32,9,24,1.49078637758891
## P32,9,25,1.48992928725023
## P32,9,26,1.49290580942173
## P32,9,27,1.49229960065139
## P32,9,28,1.49294954279195
## P32,9,29,1.49171420897561
## P32,9,30,1.49113765576991
## P32,9,31,1.49155418250872
## P32,9,32,1.48729905911854
## P32,9,33,1.49134511278387
## P32,9,34,1.48720292534147
## P32,9,35,1.49730240821838
## P32,9,36,1.49079804807096
## P32,9,37,1.49055284002553
## P32,9,38,1.4917921192792
## P32,9,39,1.49293353822496
## P32,9,40,1.49414089398506
## P32,9,41,1.49049657430404
## P32,9,42,1.48992211085099
## P32,9,43,1.48872648585926
## P32,9,44,1.4928721241329
## P32,9,45,1.49096498627594
## P32,9,46,1.49276116999184
## P32,9,47,1.49353536367416
## P32,9,48,1.48829831095303
## P32,9,49,1.49239424527702
## P32,9,50,1.49152740527844
## P32,10,1,1.49127260095933
## P32,10,2,1.49101231015962
## P32,10,3,1.49103755842556
## P32,10,4,1.48952751533658
## P32,10,5,1.49351014861141
## P32,10,6,1.48899139298333
## P32,10,7,1.49018896709789
## P32,10,8,1.49303245544434
## P32,10,9,1.49003938889839
## P32,10,10,1.49183840349496
## P32,10,11,1.49292689356311
## P32,10,12,1.49129339059194
## P32,10,13,1.4892826630519
## P32,10,14,1.49335969714668
## P32,10,15,1.49541871036802
## P32,10,16,1.48536134588307
## P32,10,17,1.49348812021761
## P32,10,18,1.49199216842651
## P32,10,19,1.48924857691715
## P32,10,20,1.49051389694214
## P32,10,21,1.49339117486793
## P32,10,22,1.49271503407904
## P32,10,23,1.49538229942322
## P32,10,24,1.49464182195992
## P32,10,25,1.49119169670239
## P32,10,26,1.48979460565667
## P32,10,27,1.49174591390098
## P32,10,28,1.49113851243799
## P32,10,29,1.49072588682175
## P32,10,30,1.49281160895889
## P32,10,31,1.4915371573115
## P32,10,32,1.48901397116641
## P32,10,33,1.49816656748454
## P32,10,34,1.48644769787788
## P32,10,35,1.49096074744837
## P32,10,36,1.49103765273362
## P32,10,37,1.49111681718093
## P32,10,38,1.48988709242448
## P32,10,39,1.49400202224129
## P32,10,40,1.49105587983743
## P32,10,41,1.49139714631878
## P32,10,42,1.49116668140187
## P32,10,43,1.492687890927
## P32,10,44,1.49073479880749
## P32,10,45,1.49024041193836
## P32,10,46,1.49060568698617
## P32,10,47,1.49420336576609
## P32,10,48,1.48914303678147
## P32,10,49,1.49247462727199
## P32,10,50,1.49147051988646
## P33,1,1,1.48582833910745
## Warning: There are no valid values for INTERVALS=2 in LISTP33[[1]]
## P33,1,3,1.48829682119961
## P33,1,4,1.48527537859403
## P33,1,5,1.48756669549381
## P33,1,6,1.48727146620603
## P33,1,7,1.48979139328003
## P33,1,8,1.48832117427479
## P33,1,9,1.48775294621785
## P33,1,10,1.49175135905926
## P33,1,11,1.48874802271525
## P33,1,12,1.4900850758833
## P33,1,13,1.4863250577772
## P33,1,14,1.49084245165189
## P33,1,15,1.49109509683424
## P33,1,16,1.48933547170539
## P33,1,17,1.48909673425886
## P33,1,18,1.48850234838632
## P33,1,19,1.48997916494097
## P33,1,20,1.48861226520023
## P33,1,21,1.49155599420721
## P33,1,22,1.48895579073803
## P33,1,23,1.49055099005651
## P33,1,24,1.48690788447857
## P33,1,25,1.48869796026321
## P33,1,26,1.48899109704154
## P33,1,27,1.49002681459699
## P33,1,28,1.49131440614399
## P33,1,29,1.49069487547674
## P33,1,30,1.49218421758607
## P33,1,31,1.48966757590029
## P33,1,32,1.4896451861588
## P33,1,33,1.49008326963945
## P33,1,34,1.49023077223036
## P33,1,35,1.48602946051236
## P33,1,36,1.49168559252206
## P33,1,37,1.49041196382963
## P33,1,38,1.49048696326081
## P33,1,39,1.49003125088555
## P33,1,40,1.49125127889672
## P33,1,41,1.49147414007495
## P33,1,42,1.49296834355309
## P33,1,43,1.4880907194955
## P33,1,44,1.48976411819458
## P33,1,45,1.48965563399068
## P33,1,46,1.49115608567777
## P33,1,47,1.4891155626356
## P33,1,48,1.49210024468693
## Warning: There are no valid values for INTERVALS=49 in LISTP33[[1]]
## P33,1,50,1.49049489091082
## P33,2,1,1.49170180729457
## P33,2,2,1.49318513673605
## Warning: There are no valid values for INTERVALS=3 in LISTP33[[2]]
## P33,2,4,1.49048631985982
## P33,2,5,1.49092735742268
## P33,2,6,1.49142335442936
## P33,2,7,1.491052591348
## P33,2,8,1.49121461770473
## P33,2,9,1.49072896828086
## P33,2,10,1.49126920422304
## P33,2,11,1.49355249851942
## P33,2,12,1.48929293950399
## P33,2,13,1.49226791518075
## P33,2,14,1.49443306821458
## P33,2,15,1.49232425484606
## P33,2,16,1.49088813812752
## P33,2,17,1.49169636554405
## P33,2,18,1.49112803595407
## P33,2,19,1.49026413851006
## P33,2,20,1.49428521669828
## P33,2,21,1.49064874649048
## P33,2,22,1.49172229515879
## P33,2,23,1.49210343360901
## P33,2,24,1.49113534011093
## P33,2,25,1.49165141582489
## P33,2,26,1.49328078163995
## P33,2,27,1.49281112771285
## P33,2,28,1.49102208126022
## P33,2,29,1.49043546145475
## P33,2,30,1.48964672185937
## P33,2,31,1.49129465648106
## P33,2,32,1.49123011865923
## P33,2,33,1.49070198371493
## P33,2,34,1.49064464569092
## P33,2,35,1.48852149645487
## P33,2,36,1.49092135558257
## P33,2,37,1.49230644106865
## P33,2,38,1.49202791655936
## P33,2,39,1.4910333517826
## P33,2,40,1.49095316631038
## P33,2,41,1.4914752178722
## P33,2,42,1.49005816433881
## P33,2,43,1.49144679195476
## P33,2,44,1.49034860087376
## P33,2,45,1.49215759713966
## P33,2,46,1.49087192795493
## P33,2,47,1.49236278822928
## P33,2,48,1.491241122049
## P33,2,49,1.4911024928093
## P33,2,50,1.49135208729678
## P33,3,1,1.49184657042881
## P33,3,2,1.49111003613253
## P33,3,3,1.4915884991282
## P33,3,4,1.49052758650346
## P33,3,5,1.49115647767719
## P33,3,6,1.49136450711419
## P33,3,7,1.49040750064681
## P33,3,8,1.49307875199751
## P33,3,9,1.49152282684568
## P33,3,10,1.49103076722887
## P33,3,11,1.48955143148249
## P33,3,12,1.49030416426451
## P33,3,13,1.48939068142961
## P33,3,14,1.49150159441192
## P33,3,15,1.48747117935665
## P33,3,16,1.49097001707399
## P33,3,17,1.49072493498142
## P33,3,18,1.48916380904442
## P33,3,19,1.49139782988909
## P33,3,20,1.49035055586632
## P33,3,21,1.49077196121216
## P33,3,22,1.49292262395223
## P33,3,23,1.48873455707843
## P33,3,24,1.48632482002521
## P33,3,25,1.48999555621828
## P33,3,26,1.49083177745342
## P33,3,27,1.49197328658331
## P33,3,28,1.49123444380584
## P33,3,29,1.49158445813439
## P33,3,30,1.49215036172133
## P33,3,31,1.49165361949376
## P33,3,32,1.49107587337494
## P33,3,33,1.49168527126312
## P33,3,34,1.4928908256384
## P33,3,35,1.49142845720053
## P33,3,36,1.4905446803931
## P33,3,37,1.49139784574509
## P33,3,38,1.48650926198715
## P33,3,39,1.49066714566163
## P33,3,40,1.49036163943154
## P33,3,41,1.49009907666375
## P33,3,42,1.49063919811714
## P33,3,43,1.49175135930379
## P33,3,44,1.49103780369182
## P33,3,45,1.48601059480147
## P33,3,46,1.49089230597019
## P33,3,47,1.49304827281407
## P33,3,48,1.49232590198517
## P33,3,49,1.4953281932407
## P33,3,50,1.4920268195016
## P33,4,1,1.49181738766757
## P33,4,2,1.49054465574377
## P33,4,3,1.49105839613007
## P33,4,4,1.4907800624897
## P33,4,5,1.49028659795786
## P33,4,6,1.49249227585331
## P33,4,7,1.49095013245292
## P33,4,8,1.49344754219055
## Warning: There are no valid values for INTERVALS=9 in LISTP33[[4]]
## P33,4,10,1.49126919993648
## P33,4,11,1.49061881081533
## P33,4,12,1.49164412098546
## P33,4,13,1.49078831430209
## P33,4,14,1.49225303238513
## P33,4,15,1.49134926412297
## P33,4,16,1.49138481108869
## Warning: There are no valid values for INTERVALS=17 in LISTP33[[4]]
## P33,4,18,1.49166305441605
## P33,4,19,1.49060619794405
## P33,4,20,1.49089747534858
## P33,4,21,1.49049016145559
## P33,4,22,1.49372283467707
## P33,4,23,1.49025300343831
## P33,4,24,1.48439063781347
## P33,4,25,1.49340431778519
## P33,4,26,1.49253314071231
## P33,4,27,1.48966714314052
## P33,4,28,1.49181941151619
## P33,4,29,1.4904844849198
## P33,4,30,1.49094552555303
## P33,4,31,1.49003944794337
## P33,4,32,1.49150923887889
## P33,4,33,1.49100863016569
## P33,4,34,1.49091455413074
## P33,4,35,1.49142775884489
## P33,4,36,1.49165607535321
## P33,4,37,1.49062972598606
## P33,4,38,1.49112966537476
## P33,4,39,1.49180582591466
## P33,4,40,1.49167172244338
## P33,4,41,1.49148215850194
## P33,4,42,1.49210261607516
## P33,4,43,1.49216062476836
## P33,4,44,1.49205415663512
## P33,4,45,1.49010580049144
## P33,4,46,1.48980215072632
## P33,4,47,1.4913359498078
## P33,4,48,1.49245320878378
## P33,4,49,1.49176810979843
## P33,4,50,1.49062537329538
## P33,5,1,1.49223528533685
## P33,5,2,1.49076266621434
## P33,5,3,1.48973216329302
## P33,5,4,1.49051404449175
## P33,5,5,1.49150945770908
## P33,5,6,1.48979855328798
## P33,5,7,1.493785069539
## P33,5,8,1.49196137746175
## P33,5,9,1.48975764969249
## P33,5,10,1.49160713950793
## P33,5,11,1.49271368336033
## P33,5,12,1.49081249237061
## P33,5,13,1.49200535589649
## P33,5,14,1.49209640766012
## P33,5,15,1.49244556207766
## P33,5,16,1.49310225706834
## P33,5,17,1.49121688206991
## P33,5,18,1.4912175193746
## P33,5,19,1.49140245672585
## P33,5,20,1.49069021172719
## P33,5,21,1.49488693768861
## P33,5,22,1.49205565920063
## P33,5,23,1.49253118221576
## P33,5,24,1.49158139789806
## P33,5,25,1.49183778927244
## P33,5,26,1.49210105623518
## P33,5,27,1.49198502463263
## P33,5,28,1.49245469093323
## P33,5,29,1.49399980520591
## P33,5,30,1.49184139482268
## P33,5,31,1.48577856463055
## P33,5,32,1.49060171528866
## P33,5,33,1.48002428667886
## P33,5,34,1.49545976638794
## P33,5,35,1.49096421019672
## P33,5,36,1.49229732980119
## P33,5,37,1.49018034253802
## P33,5,38,1.49189053692864
## P33,5,39,1.49192105399238
## P33,5,40,1.49056849854716
## P33,5,41,1.49338646984975
## P33,5,42,1.4915212392807
## P33,5,43,1.49158571015543
## P33,5,44,1.49155532552841
## P33,5,45,1.49037543932597
## P33,5,46,1.49171211134713
## P33,5,47,1.49162082374096
## P33,5,48,1.49171789068925
## P33,5,49,1.49144511752658
## P33,5,50,1.49260929977002
## P33,6,1,1.48898453048513
## P33,6,2,1.49252406849581
## P33,6,3,1.49071304165587
## P33,6,4,1.49167524973551
## P33,6,5,1.49183977974786
## P33,6,6,1.49147523395599
## P33,6,7,1.49197993959699
## P33,6,8,1.49095701897281
## P33,6,9,1.4911876927625
## P33,6,10,1.49178463525146
## P33,6,11,1.48971300654941
## P33,6,12,1.49207120953184
## P33,6,13,1.4913189980836
## P33,6,14,1.49238903382245
## P33,6,15,1.49204871965491
## P33,6,16,1.49107838433886
## P33,6,17,1.49129191073743
## P33,6,18,1.49159404377878
## P33,6,19,1.49268149325722
## P33,6,20,1.49089816957712
## P33,6,21,1.49163053011653
## P33,6,22,1.49164158038879
## P33,6,23,1.49157590525491
## P33,6,24,1.4918164032093
## P33,6,25,1.49166966375904
## P33,6,26,1.49170031637516
## P33,6,27,1.49106220613446
## P33,6,28,1.49129149883608
## P33,6,29,1.49112592339516
## P33,6,30,1.4910779900021
## P33,6,31,1.49324115530237
## P33,6,32,1.49121064097941
## P33,6,33,1.49252328747197
## P33,6,34,1.4912612068821
## P33,6,35,1.49133352703518
## P33,6,36,1.49204469268972
## P33,6,37,1.49238508305651
## P33,6,38,1.49218168166968
## P33,6,39,1.4917672024986
## P33,6,40,1.4914707920768
## P33,6,41,1.49332270330312
## P33,6,42,1.4921843584846
## P33,6,43,1.49142969767253
## P33,6,44,1.49151840209961
## P33,6,45,1.49079201069284
## P33,6,46,1.49152451945889
## P33,6,47,1.49249948339259
## P33,6,48,1.49167948143155
## P33,6,49,1.49320520589381
## P33,6,50,1.49000340826968
## P33,7,1,1.49026841881834
## P33,7,2,1.49203073536908
## P33,7,3,1.48996742655722
## P33,7,4,1.49090786237974
## P33,7,5,1.49203405541889
## P33,7,6,1.49163086660977
## P33,7,7,1.49261156941803
## P33,7,8,1.491912050945
## P33,7,9,1.49189241582697
## P33,7,10,1.4933097076416
## P33,7,11,1.49146192138259
## P33,7,12,1.4874570778438
## P33,7,13,1.49409600666591
## P33,7,14,1.49370322057179
## P33,7,15,1.49255279872728
## P33,7,16,1.49084800627173
## P33,7,17,1.49192617465923
## P33,7,18,1.49186654090881
## P33,7,19,1.49243216514587
## P33,7,20,1.49312470436096
## P33,7,21,1.4884084548269
## P33,7,22,1.49291281306416
## P33,7,23,1.49241352862999
## P33,7,24,1.49273032853098
## P33,7,25,1.49132805446099
## P33,7,26,1.49239023593294
## P33,7,27,1.49257652432311
## P33,7,28,1.49107461330319
## P33,7,29,1.49197864532471
## P33,7,30,1.49224065445565
## P33,7,31,1.49197390850853
## P33,7,32,1.4906071536243
## P33,7,33,1.492322644191
## P33,7,34,1.49170915704024
## P33,7,35,1.49244309107463
## P33,7,36,1.49184923610468
## P33,7,37,1.49200000081744
## P33,7,38,1.49224845222805
## P33,7,39,1.4918124963949
## P33,7,40,1.49223912556966
## P33,7,41,1.49183940012521
## P33,7,42,1.4919505440787
## P33,7,43,1.49202950073011
## P33,7,44,1.49139467688168
## P33,7,45,1.49086609908513
## P33,7,46,1.49239055392812
## P33,7,47,1.49168867650239
## P33,7,48,1.49233308205238
## P33,7,49,1.49298506559328
## P33,7,50,1.49131992961584
## P33,8,1,1.49017112956328
## P33,8,2,1.48939879735311
## P33,8,3,1.49122800297207
## P33,8,4,1.4914484665944
## P33,8,5,1.49165644553991
## P33,8,6,1.49256009198307
## P33,8,7,1.49156967163086
## P33,8,8,1.49155028482501
## P33,8,9,1.49107679639544
## P33,8,10,1.49198784611442
## P33,8,11,1.49128359906814
## P33,8,12,1.49168748174395
## P33,8,13,1.4916745447645
## P33,8,14,1.49143639299058
## P33,8,15,1.49373215895433
## P33,8,16,1.49224502612383
## P33,8,17,1.49092093080577
## P33,8,18,1.49219195615678
## P33,8,19,1.4922340470131
## P33,8,20,1.49237265138545
## P33,8,21,1.49197308222453
## P33,8,22,1.49247922216143
## P33,8,23,1.49207945111432
## P33,8,24,1.49071584689389
## P33,8,25,1.49211025904942
## P33,8,26,1.49104466063253
## P33,8,27,1.49203318754832
## P33,8,28,1.49204335610072
## P33,8,29,1.4914759515642
## P33,8,30,1.49190325486033
## P33,8,31,1.49062936570909
## P33,8,32,1.49475360218483
## P33,8,33,1.49211406707764
## P33,8,34,1.49121802740724
## P33,8,35,1.4918150128545
## P33,8,36,1.49187330953006
## P33,8,37,1.49105358123779
## P33,8,38,1.49168622350118
## P33,8,39,1.49180843419042
## P33,8,40,1.4921493086704
## P33,8,41,1.49126734832923
## P33,8,42,1.49292911000612
## P33,8,43,1.49265313635067
## P33,8,44,1.49140914132662
## P33,8,45,1.49127733524029
## P33,8,46,1.49459139980487
## P33,8,47,1.49087763243708
## P33,8,48,1.49230566653577
## P33,8,49,1.49083106957593
## P33,8,50,1.49170963655268
## P33,9,1,1.49086121769695
## P33,9,2,1.49278917417421
## P33,9,3,1.49255014775874
## P33,9,4,1.49161492302304
## P33,9,5,1.49140613787883
## P33,9,6,1.49170767092237
## P33,9,7,1.49117361553132
## P33,9,8,1.49124751592937
## P33,9,9,1.49136631647746
## P33,9,10,1.49099864457783
## P33,9,11,1.49178877437816
## P33,9,12,1.49387803342607
## P33,9,13,1.4919830479034
## P33,9,14,1.49094927679632
## P33,9,15,1.49115808363314
## P33,9,16,1.49177485559045
## P33,9,17,1.49162509653828
## P33,9,18,1.492302997907
## P33,9,19,1.49177243974474
## P33,9,20,1.49195763042995
## P33,9,21,1.49215599149466
## P33,9,22,1.49153890959713
## P33,9,23,1.49159601756505
## P33,9,24,1.49265575408936
## P33,9,25,1.4910258332344
## P33,9,26,1.49132166189306
## P33,9,27,1.49235581844411
## P33,9,28,1.49196195602417
## P33,9,29,1.49149022563811
## P33,9,30,1.49141032660185
## P33,9,31,1.49123217608478
## P33,9,32,1.49150732585362
## P33,9,33,1.49163894486009
## P33,9,34,1.49075301488241
## P33,9,35,1.49186775500958
## P33,9,36,1.49202476848255
## P33,9,37,1.49105391678987
## P33,9,38,1.49153489571113
## P33,9,39,1.49126637549627
## P33,9,40,1.49245830944606
## P33,9,41,1.49210126444979
## P33,9,42,1.49182809785355
## P33,9,43,1.49206085999807
## P33,9,44,1.49155297809177
## P33,9,45,1.49088394398592
## P33,9,46,1.49467621094141
## P33,9,47,1.49216056906659
## P33,9,48,1.49226459068588
## P33,9,49,1.49165863037109
## P33,9,50,1.49137632369995
## P33,10,1,1.49418528874715
## P33,10,2,1.49212439163871
## P33,10,3,1.49201690414805
## P33,10,4,1.49073862618413
## P33,10,5,1.49188838899136
## P33,10,6,1.491339524587
## P33,10,7,1.49279667901211
## P33,10,8,1.49060349183924
## P33,10,9,1.49184978709501
## P33,10,10,1.49208006394648
## P33,10,11,1.49134038134319
## P33,10,12,1.49271672259095
## P33,10,13,1.49360723495483
## P33,10,14,1.49239596005144
## P33,10,15,1.49104709350146
## P33,10,16,1.49177384873231
## P33,10,17,1.49278871596806
## P33,10,18,1.4920470897968
## P33,10,19,1.49176438984118
## P33,10,20,1.49143506402839
## P33,10,21,1.49189379571498
## P33,10,22,1.49108037494478
## P33,10,23,1.49196834564209
## P33,10,24,1.49094685782557
## P33,10,25,1.49100987444219
## P33,10,26,1.49190796415011
## P33,10,27,1.4914609660273
## P33,10,28,1.49038677466543
## P33,10,29,1.49192204248338
## P33,10,30,1.49180872440338
## P33,10,31,1.49145964304606
## P33,10,32,1.49155765384823
## P33,10,33,1.49090597074326
## P33,10,34,1.49230810391006
## P33,10,35,1.49145689923713
## P33,10,36,1.49122236435672
## P33,10,37,1.49164219600398
## P33,10,38,1.4919920780442
## P33,10,39,1.4925533135732
## P33,10,40,1.49085219701131
## P33,10,41,1.49237433075905
## P33,10,42,1.49223221143087
## P33,10,43,1.49148895079831
## P33,10,44,1.49162703521492
## P33,10,45,1.49022918655759
## P33,10,46,1.49160553907093
## P33,10,47,1.49196492761805
## P33,10,48,1.49227300468756
## P33,10,49,1.49114171196433
## P33,10,50,1.49150541216828
## P34,1,1,1.49107950241839
## P34,1,2,1.48807209014893
## P34,1,3,1.48983269152434
## P34,1,4,1.49366450817027
## P34,1,5,1.48143717220851
## P34,1,6,1.49610274012496
## P34,1,7,1.48865359894773
## P34,1,8,1.48408497081083
## P34,1,9,1.49997652144659
## P34,1,10,1.49132597446442
## P34,1,11,1.4939349564639
## P34,1,12,1.49357193103735
## P34,1,13,1.49241977471572
## P34,1,14,1.48641958501604
## P34,1,15,1.51075065135956
## P34,1,16,1.49037938733255
## P34,1,17,1.50345656275749
## P34,1,18,1.50508689880371
## P34,1,19,1.48542688874637
## P34,1,20,1.48913939793905
## P34,1,21,1.49301501682826
## P34,1,22,1.49204709394923
## P34,1,23,1.49838092923164
## P34,1,24,1.50690792121139
## P34,1,25,1.48952901363373
## P34,1,26,1.61661112308502
## P34,1,27,1.47130175999233
## P34,1,28,1.48539030805547
## P34,1,29,1.49172735214233
## P34,1,30,1.49089269077077
## P34,1,31,1.4896695891092
## P34,1,32,1.48579049879505
## P34,1,33,1.49240501254213
## P34,1,34,1.493760200257
## Warning: There are no valid values for INTERVALS=35 in LISTP34[[1]]
## P34,1,36,1.45759665049039
## P34,1,37,1.48410565802392
## P34,1,38,1.48166592915853
## P34,1,39,1.48721415655954
## P34,1,40,1.48346951802572
## P34,1,41,1.48147453981287
## P34,1,42,1.49144692854448
## P34,1,43,1.48976337909698
## P34,1,44,1.49057644132584
## P34,1,45,1.49017596244812
## P34,1,46,1.49739415505353
## P34,1,47,1.49709298060491
## P34,1,48,1.49213565479625
## P34,1,49,1.48382078973871
## P34,1,50,1.49114201409476
## P34,2,1,1.49204745822483
## P34,2,2,1.47957931518555
## P34,2,3,1.47996505407187
## P34,2,4,1.49759251730783
## P34,2,5,1.45330911874771
## P34,2,6,1.4815401537665
## P34,2,7,1.48984829584757
## P34,2,8,1.48513542522084
## P34,2,9,1.48502072833833
## P34,2,10,1.49178214073181
## P34,2,11,1.48966979980469
## P34,2,12,1.50077831480238
## P34,2,13,1.49315842715177
## P34,2,14,1.49104473931449
## P34,2,15,1.499644947052
## P34,2,16,1.52533552863381
## P34,2,17,1.45699826153842
## P34,2,18,1.49092334859511
## P34,2,19,1.49508053915841
## P34,2,20,1.49042453017889
## P34,2,21,1.48850548267365
## P34,2,22,1.48372154765659
## P34,2,23,1.52622079849243
## P34,2,24,1.48658433827487
## P34,2,25,1.50080237669103
## P34,2,26,1.52469275979435
## P34,2,27,1.48783850025486
## P34,2,28,1.49334830897195
## P34,2,29,1.49129467010498
## P34,2,30,1.51319117016262
## P34,2,31,1.47024166968561
## P34,2,32,1.47794794645466
## Warning: There are no valid values for INTERVALS=33 in LISTP34[[2]]
## P34,2,34,1.46004370848338
## P34,2,35,1.5004764833758
## P34,2,36,1.41603056589762
## Warning: There are no valid values for INTERVALS=37 in LISTP34[[2]]
## P34,2,38,1.48063796758652
## P34,2,39,1.47635677882603
## P34,2,40,1.49794487953186
## P34,2,41,1.48817917016836
## P34,2,42,1.50354528427124
## P34,2,43,1.48559135198593
## Warning: There are no valid values for INTERVALS=44 in LISTP34[[2]]
## P34,2,45,1.47241914272308
## P34,2,46,1.47412030593209
## P34,2,47,1.48468253016472
## P34,2,48,1.48958035877773
## P34,2,49,1.50560529585238
## P34,2,50,1.49139909183278
## P34,3,1,1.48836648464203
## P34,3,2,1.4690660869374
## P34,3,3,1.49250306023492
## P34,3,4,1.49174814446028
## P34,3,5,1.50008361989802
## P34,3,6,1.49187335660381
## P34,3,7,1.4317253087018
## P34,3,8,1.50186940786001
## P34,3,9,1.48615390062332
## P34,3,10,1.4802774867496
## Warning: There are no valid values for INTERVALS=11 in LISTP34[[3]]
## P34,3,12,1.49237801811912
## P34,3,13,1.51904582977295
## P34,3,14,1.50092780590057
## P34,3,15,1.50456595420837
## P34,3,16,1.49933338165283
## P34,3,17,1.48346341622842
## P34,3,18,1.48838748931885
## P34,3,19,1.50761658804757
## P34,3,20,1.48176941871643
## P34,3,21,1.48369155210607
## P34,3,22,1.49310108259612
## Warning: There are no valid values for INTERVALS=23 in LISTP34[[3]]
## Warning: There are no valid values for INTERVALS=24 in LISTP34[[3]]
## P34,3,25,1.49398222991398
## P34,3,26,1.48576327164968
## P34,3,27,1.48699807011804
## P34,3,28,1.48833624521891
## P34,3,29,1.49616956710815
## P34,3,30,1.5137017250061
## P34,3,31,1.49129000416508
## P34,3,32,1.48496246337891
## P34,3,33,1.47630855015346
## Warning: There are no valid values for INTERVALS=34 in LISTP34[[3]]
## P34,3,35,1.49667365623243
## P34,3,36,1.49072253704071
## P34,3,37,1.50299152306148
## P34,3,38,1.4890244943755
## P34,3,39,1.49111973047256
## P34,3,40,1.49304015548141
## P34,3,41,1.48440760657901
## P34,3,42,1.50092737347472
## Warning: There are no valid values for INTERVALS=43 in LISTP34[[3]]
## P34,3,44,1.48629167468049
## P34,3,45,1.48387136214819
## P34,3,46,1.48712217396703
## Warning: There are no valid values for INTERVALS=47 in LISTP34[[3]]
## P34,3,48,1.49020627649819
## P34,3,49,1.49630746841431
## P34,3,50,1.48334219122446
## P34,4,1,1.48776092896095
## P34,4,2,1.48750525050693
## P34,4,3,1.48781644105911
## P34,4,4,1.48943616759102
## P34,4,5,1.49177911877632
## Warning: There are no valid values for INTERVALS=6 in LISTP34[[4]]
## P34,4,7,1.48847014170427
## P34,4,8,1.49411229481773
## P34,4,9,1.4894574916724
## P34,4,10,1.49631168292119
## P34,4,11,1.48958629720351
## P34,4,12,1.49518549442291
## P34,4,13,1.49227977752686
## P34,4,14,1.48871964454651
## P34,4,15,1.49097439646721
## P34,4,16,1.48579807281494
## P34,4,17,1.48884886105855
## P34,4,18,1.48685539090956
## P34,4,19,1.49948247273763
## P34,4,20,1.48849317606758
## P34,4,21,1.49050751247922
## P34,4,22,1.48455801525631
## P34,4,23,1.48787324659286
## P34,4,24,1.49028538774561
## P34,4,25,1.49838184273761
## P34,4,26,1.48141609994989
## P34,4,27,1.48769039577908
## P34,4,28,1.49305939674377
## P34,4,29,1.48037373102628
## P34,4,30,1.48150273731777
## P34,4,31,1.49333318074544
## P34,4,32,1.49832900365194
## P34,4,33,1.49496893371855
## P34,4,34,1.48805773885627
## P34,4,35,1.49706503652757
## P34,4,36,1.48984557610971
## P34,4,37,1.50437725612095
## P34,4,38,1.49125624619997
## P34,4,39,1.49824492931366
## P34,4,40,1.49129693848746
## P34,4,41,1.50043823660874
## P34,4,42,1.49707819620768
## P34,4,43,1.5002012014389
## P34,4,44,1.48591956784648
## P34,4,45,1.4922426144282
## P34,4,46,1.49115044031388
## P34,4,47,1.50457731370003
## P34,4,48,1.47975099330046
## P34,4,49,1.48669186660222
## P34,4,50,1.49805082179405
## P34,5,1,1.49065147837003
## P34,5,2,1.51414749622345
## P34,5,3,1.48584059665078
## P34,5,4,1.48963128603422
## P34,5,5,1.48940965652466
## P34,5,6,1.49328457579321
## P34,5,7,1.47999195898733
## P34,5,8,1.48852646567605
## P34,5,9,1.4928301413854
## P34,5,10,1.50881919494042
## P34,5,11,1.49799200204703
## P34,5,12,1.48976172898945
## P34,5,13,1.49919222082411
## P34,5,14,1.48858764767647
## P34,5,15,1.49276347671236
## P34,5,16,1.48247501585219
## P34,5,17,1.47375106811523
## P34,5,18,1.49569867207454
## P34,5,19,1.46447249821254
## P34,5,20,1.50453192309329
## P34,5,21,1.47618138405585
## P34,5,22,1.48952589035034
## P34,5,23,1.51396213259016
## P34,5,24,1.49474894205729
## P34,5,25,1.49330991687197
## P34,5,26,1.46760075742548
## P34,5,27,1.45485428401402
## P34,5,28,1.4979583300077
## P34,5,29,1.48831491212587
## P34,5,30,1.49484716459762
## P34,5,31,1.48273085739653
## P34,5,32,1.49757989883423
## P34,5,33,1.48502747579054
## P34,5,34,1.48911809921265
## P34,5,35,1.49756724493844
## P34,5,36,1.48604996308036
## P34,5,37,1.4902400848193
## P34,5,38,1.48306010663509
## P34,5,39,1.49636502382232
## P34,5,40,1.45802542567253
## P34,5,41,1.50480362502011
## P34,5,42,1.49615283739769
## P34,5,43,1.49246917768966
## P34,5,44,1.49206660985947
## P34,5,45,1.48768213589986
## P34,5,46,1.48804053322214
## P34,5,47,1.49001438386979
## P34,5,48,1.48332098758582
## P34,5,49,1.49942577716916
## P34,5,50,1.48976285678824
## P34,6,1,1.49451198075947
## P34,6,2,1.4958341053554
## P34,6,3,1.48933893442154
## P34,6,4,1.49688011227232
## P34,6,5,1.49202228660014
## P34,6,6,1.52525577545166
## P34,6,7,1.48615241518208
## P34,6,8,1.47622766494751
## P34,6,9,1.50354671478271
## P34,6,10,1.49002730184131
## P34,6,11,1.49566122581219
## P34,6,12,1.49469141776745
## P34,6,13,1.48870368437334
## P34,6,14,1.48489938243743
## P34,6,15,1.47520281718327
## P34,6,16,1.52274158838633
## P34,6,17,1.49559881172928
## P34,6,18,1.49775231968273
## P34,6,19,1.51764547030131
## P34,6,20,1.5017192291491
## Warning: There are no valid values for INTERVALS=21 in LISTP34[[6]]
## P34,6,22,1.48710706316192
## P34,6,23,1.47711226814672
## P34,6,24,1.49537547942131
## P34,6,25,1.49601493711057
## P34,6,26,1.53192361872247
## Warning: There are no valid values for INTERVALS=27 in LISTP34[[6]]
## P34,6,28,1.49811183838617
## P34,6,29,1.49419880764825
## P34,6,30,1.48755746052183
## P34,6,31,1.47065875927607
## P34,6,32,1.49562389996587
## P34,6,33,1.49091626502372
## P34,6,34,1.47585020394161
## P34,6,35,1.48131197377255
## P34,6,36,1.50535530514187
## P34,6,37,1.47704432560847
## P34,6,38,1.52296858628591
## P34,6,39,1.50059800437002
## P34,6,40,1.51404547691345
## P34,6,41,1.47010144671878
## P34,6,42,1.49635324478149
## P34,6,43,1.49909505844116
## P34,6,44,1.47613172531128
## P34,6,45,1.48234139382839
## P34,6,46,1.47311452031136
## P34,6,47,1.59342276531717
## P34,6,48,1.47468841992892
## P34,6,49,1.48182357152303
## P34,6,50,1.48522859615284
## P34,7,1,1.48870907331768
## P34,7,2,1.48729452010124
## P34,7,3,1.4887406500903
## P34,7,4,1.48806407716539
## P34,7,5,1.48748574537389
## P34,7,6,1.48594109765415
## Warning: There are no valid values for INTERVALS=7 in LISTP34[[7]]
## P34,7,8,1.48496629297733
## P34,7,9,1.48402485192991
## P34,7,10,1.49590076340569
## P34,7,11,1.49072786819103
## P34,7,12,1.49683232307434
## P34,7,13,1.49300305048625
## P34,7,14,1.48928644346154
## P34,7,15,1.49059467315674
## P34,7,16,1.47210336986341
## P34,7,17,1.49530389959162
## P34,7,18,1.50737574895223
## P34,7,19,1.48076993663137
## P34,7,20,1.48257394631704
## P34,7,21,1.4715910255909
## P34,7,22,1.50833040475845
## P34,7,23,1.49970226903116
## P34,7,24,1.56485372890126
## P34,7,25,1.5540816116333
## P34,7,26,1.49110196034114
## P34,7,27,1.48192774454753
## P34,7,28,1.49159591706073
## P34,7,29,1.48336371859989
## P34,7,30,1.52454244463067
## P34,7,31,1.47668418599598
## P34,7,32,1.50807245427912
## P34,7,33,1.49503767830985
## P34,7,34,1.49123761313302
## P34,7,35,1.46786077269192
## P34,7,36,1.61165904998779
## P34,7,37,1.47733184814453
## P34,7,38,1.46036238824168
## P34,7,39,1.50740038402497
## P34,7,40,1.47917246222496
## P34,7,41,1.38341617584229
## P34,7,42,1.52452859691545
## P34,7,43,1.46279051429347
## P34,7,44,1.62669885158539
## P34,7,45,1.41361738840739
## P34,7,46,1.47504413127899
## P34,7,47,1.48287538921132
## Warning: There are no valid values for INTERVALS=48 in LISTP34[[7]]
## P34,7,49,1.5138819034283
## P34,7,50,1.48966242411198
## P34,8,1,1.49716311532098
## P34,8,2,1.48958308880146
## P34,8,3,1.49002271729547
## P34,8,4,1.49431330258729
## P34,8,5,1.4938433876744
## P34,8,6,1.49269716914107
## P34,8,7,1.48920445109523
## P34,8,8,1.49039055580317
## P34,8,9,1.49090240918673
## P34,8,10,1.5096283753713
## P34,8,11,1.49252767996355
## P34,8,12,1.4926981420228
## P34,8,13,1.48831547101339
## P34,8,14,1.49183635358457
## P34,8,15,1.48963396889823
## Warning: There are no valid values for INTERVALS=16 in LISTP34[[8]]
## P34,8,17,1.4852806992001
## P34,8,18,1.48819959640503
## P34,8,19,1.48136586234683
## P34,8,20,1.49451700846354
## P34,8,21,1.4926394404787
## P34,8,22,1.4902197043101
## P34,8,23,1.50849062204361
## P34,8,24,1.50197564231025
## P34,8,25,1.48718976974487
## Warning: There are no valid values for INTERVALS=26 in LISTP34[[8]]
## P34,8,27,1.49565596050686
## P34,8,28,1.50637322664261
## P34,8,29,1.48633302175082
## P34,8,30,1.51592040061951
## P34,8,31,1.49438985824585
## P34,8,32,1.49573234717051
## P34,8,33,1.48523211479187
## P34,8,34,1.49175814884465
## P34,8,35,1.4889110203447
## P34,8,36,1.49010866444285
## P34,8,37,1.50121180216471
## P34,8,38,1.49445883929729
## P34,8,39,1.48805046081543
## P34,8,40,1.49026340246201
## P34,8,41,1.4998664855957
## P34,8,42,1.48442464073499
## P34,8,43,1.50358084269932
## P34,8,44,1.54284994942801
## P34,8,45,1.48852535394522
## P34,8,46,1.49192428588867
## P34,8,47,1.54593169689178
## P34,8,48,1.46517720222473
## P34,8,49,1.4924161366054
## P34,8,50,1.48780570560031
## P34,9,1,1.49250403115916
## P34,9,2,1.50611326911233
## P34,9,3,1.48725967407227
## P34,9,4,1.49520859225043
## P34,9,5,1.48700340227647
## P34,9,6,1.48627999771473
## P34,9,7,1.48886492103338
## P34,9,8,1.5040951183864
## P34,9,9,1.49229009063156
## P34,9,10,1.47861873535883
## P34,9,11,1.49080165227254
## P34,9,12,1.49040099944191
## P34,9,13,1.49121125539144
## P34,9,14,1.49193824662103
## P34,9,15,1.47395042578379
## P34,9,16,1.48796358814946
## P34,9,17,1.50102416674296
## P34,9,18,1.48344027996063
## P34,9,19,1.48273191244706
## Warning: There are no valid values for INTERVALS=20 in LISTP34[[9]]
## P34,9,21,1.49775745073954
## P34,9,22,1.475856701533
## P34,9,23,1.49483429758172
## P34,9,24,1.49546985626221
## P34,9,25,1.48620226269677
## P34,9,26,1.49834857668195
## Warning: There are no valid values for INTERVALS=27 in LISTP34[[9]]
## P34,9,28,1.47895073890686
## P34,9,29,1.48721508546309
## P34,9,30,1.48027166453275
## P34,9,31,1.48041927814484
## P34,9,32,1.49535220378154
## P34,9,33,1.49675680243451
## P34,9,34,1.49264691092751
## P34,9,35,1.48522317977179
## P34,9,36,1.491919700916
## Warning: There are no valid values for INTERVALS=37 in LISTP34[[9]]
## P34,9,38,1.51973295211792
## P34,9,39,1.48877117037773
## P34,9,40,1.50156396808046
## P34,9,41,1.4985409528017
## P34,9,42,1.4906384394719
## P34,9,43,1.48866960276728
## P34,9,44,1.49533204829439
## P34,9,45,1.4866654130279
## P34,9,46,1.4822526772817
## P34,9,47,1.49683339779194
## Warning: There are no valid values for INTERVALS=48 in LISTP34[[9]]
## P34,9,49,1.48434228055617
## P34,9,50,1.48876391795644
## P34,10,1,1.49720237873219
## P34,10,2,1.49120465446921
## P34,10,3,1.4926902505218
## P34,10,4,1.48168258499681
## P34,10,5,1.49583241144816
## P34,10,6,1.48939460118612
## P34,10,7,1.49940953652064
## P34,10,8,1.49862555534609
## P34,10,9,1.49612818342267
## P34,10,10,1.48424057302804
## P34,10,11,1.4921756585439
## P34,10,12,1.49746425690189
## P34,10,13,1.49279917989458
## P34,10,14,1.49559375514155
## P34,10,15,1.57062206268311
## P34,10,16,1.48438146839971
## Warning: There are no valid values for INTERVALS=17 in LISTP34[[10]]
## P34,10,18,1.48972260749946
## P34,10,19,1.4842631816864
## P34,10,20,1.49629479785298
## P34,10,21,1.49630742073059
## P34,10,22,1.49341976642609
## P34,10,23,1.49315766365297
## P34,10,24,1.49885736978971
## P34,10,25,1.51121890103375
## P34,10,26,1.47303456526536
## P34,10,27,1.49540124040969
## P34,10,28,1.48879480361938
## Warning: There are no valid values for INTERVALS=29 in LISTP34[[10]]
## P34,10,30,1.48397062041543
## P34,10,31,1.48888624509176
## P34,10,32,1.49047528372871
## P34,10,33,1.49704005168034
## P34,10,34,1.48713358965787
## P34,10,35,1.46516493828066
## P34,10,36,1.47337297771288
## P34,10,37,1.48284654815992
## P34,10,38,1.49652273514692
## P34,10,39,1.47543485462666
## P34,10,40,1.47942436218262
## P34,10,41,1.48320058981578
## P34,10,42,1.49479983329773
## P34,10,43,1.48675403079471
## P34,10,44,1.47988184293111
## Warning: There are no valid values for INTERVALS=45 in LISTP34[[10]]
## P34,10,46,1.49419861573439
## P34,10,47,1.48141479492188
## P34,10,48,1.48442706194791
## P34,10,49,1.4918572584788
## P34,10,50,1.50133839432074
# Close the file
sink()
close(output_file)
# Open a file for writing
output_file <- file("output60.txt", open="w")

# Redirect the output to the file
sink(output_file)

# The code that generates the output
for (p in 5:34) {
  for (b in 1:10) {
    for (i in 1:50) {
      subset_list <- subset(get(paste0("LISTP", p))[[b]], ID == 60 & INTERVALS == i)
      subset_list$VALUE <- as.numeric(subset_list$VALUE)
      
      # Exclude missing values
      subset_list <- subset_list[!is.na(subset_list$VALUE),]
      
      if(nrow(subset_list) == 0){
        cat(paste0("Warning: There are no valid values for INTERVALS=", i, " in LISTP", p, "[[", b, "]]\n"))
      } else if(all(is.na(subset_list$VALUE)) || all(!is.numeric(subset_list$VALUE))) {
        cat(paste0("Warning: All values are missing or non-numeric for INTERVALS=", i, " in LISTP", p, "[[", b, "]]\n"))
      } else {
        subset_list$VALUE[!is.numeric(subset_list$VALUE)] <- NA
        
        mean_value <- mean(subset_list$VALUE, na.rm = TRUE)
        
        if (is.nan(mean_value)) {
          cat(paste0("Warning: There are missing or non-numeric values in the VALUE variable for INTERVALS=", i, " in LISTP", p, "[[", b, "]]\n"))
          non_numeric_values <- subset_list[!is.numeric(subset_list$VALUE), "VALUE"]
          cat("Non-numeric values in VALUE variable:", non_numeric_values, "\n")
        } else {
          cat(paste0("P", p, ",", b, ",", i, ",", mean_value, "\n"))
        }
      }
    }
  }
}
## P5,1,1,1.51110766577895
## P5,1,2,1.50661514169079
## P5,1,3,1.52153234794492
## P5,1,4,1.51244246598446
## P5,1,5,1.50564238406994
## P5,1,6,1.50956699348265
## P5,1,7,1.51085059257115
## P5,1,8,1.51086863659158
## P5,1,9,1.51051845840628
## P5,1,10,1.50845183588523
## P5,1,11,1.50873514272399
## P5,1,12,1.51879085405043
## P5,1,13,1.51300447599023
## P5,1,14,1.50759328650745
## P5,1,15,1.51293744170477
## P5,1,16,1.5084952268845
## P5,1,17,1.51656405806081
## P5,1,18,1.51241442963884
## P5,1,19,1.51150836299747
## P5,1,20,1.51089110551057
## P5,1,21,1.50158356733925
## P5,1,22,1.50095972118762
## P5,1,23,1.50811097364732
## P5,1,24,1.50693179487772
## P5,1,25,1.51503674389812
## P5,1,26,1.50690486942019
## P5,1,27,1.51129096445411
## P5,1,28,1.51000829214273
## P5,1,29,1.50896924670025
## P5,1,30,1.51144138780464
## P5,1,31,1.50948487027153
## P5,1,32,1.52025677957608
## P5,1,33,1.51221153328011
## P5,1,34,1.50891225287255
## P5,1,35,1.50991625273267
## P5,1,36,1.51200421739754
## P5,1,37,1.50999547716171
## P5,1,38,1.51302680652307
## P5,1,39,1.5092210217824
## P5,1,40,1.51146846706584
## P5,1,41,1.51009601934411
## P5,1,42,1.51003903593038
## P5,1,43,1.51003190021889
## P5,1,44,1.51106067664723
## P5,1,45,1.51105741487033
## P5,1,46,1.50963359946138
## P5,1,47,1.51030060552782
## P5,1,48,1.51038061983232
## P5,1,49,1.50931908201984
## P5,1,50,1.51107395501528
## P5,2,1,1.51173536334418
## P5,2,2,1.50855309312994
## P5,2,3,1.51659073441793
## P5,2,4,1.50827982436576
## P5,2,5,1.51368413061466
## P5,2,6,1.51224546950327
## P5,2,7,1.51089121574579
## P5,2,8,1.50795792035407
## P5,2,9,1.51003209749858
## P5,2,10,1.50895093705919
## P5,2,11,1.50046098537934
## P5,2,12,1.51129028949832
## P5,2,13,1.52777058663576
## P5,2,14,1.51132261440549
## P5,2,15,1.50972296755601
## P5,2,16,1.51891036808784
## P5,2,17,1.5059618378679
## P5,2,18,1.51434638602602
## P5,2,19,1.52799357087524
## P5,2,20,1.50701071408169
## P5,2,21,1.50975788340849
## P5,2,22,1.50767713478903
## P5,2,23,1.51391376736008
## P5,2,24,1.50924498574776
## P5,2,25,1.51122472512776
## P5,2,26,1.50313684167383
## P5,2,27,1.50992850578978
## P5,2,28,1.51566643789025
## P5,2,29,1.51181717949945
## P5,2,30,1.50615483806247
## P5,2,31,1.50836738456379
## P5,2,32,1.50788546115794
## P5,2,33,1.51073225271904
## P5,2,34,1.50708634893321
## P5,2,35,1.50797989859653
## P5,2,36,1.51358166958423
## P5,2,37,1.51002841588308
## P5,2,38,1.50965762549433
## P5,2,39,1.51727802034408
## P5,2,40,1.50574629481246
## P5,2,41,1.51126673573353
## P5,2,42,1.51083341645606
## P5,2,43,1.50617792699244
## P5,2,44,1.51166426480471
## P5,2,45,1.50874335798499
## P5,2,46,1.51544692868092
## P5,2,47,1.51218020241216
## P5,2,48,1.51002810869603
## P5,2,49,1.50966561791356
## P5,2,50,1.51042121165508
## P5,3,1,1.51106887597304
## P5,3,2,1.50980959800964
## P5,3,3,1.51186742639183
## P5,3,4,1.50984407961369
## P5,3,5,1.51070780072893
## P5,3,6,1.50984828355836
## P5,3,7,1.51262744350137
## P5,3,8,1.51006241698763
## P5,3,9,1.51013270801401
## P5,3,10,1.51240114821601
## P5,3,11,1.51143066947525
## P5,3,12,1.51180326388432
## P5,3,13,1.50825628622984
## P5,3,14,1.50748559750548
## P5,3,15,1.51084240784882
## P5,3,16,1.50981007029095
## P5,3,17,1.51073170445629
## P5,3,18,1.51199609483991
## P5,3,19,1.51094507689428
## P5,3,20,1.50911433754898
## P5,3,21,1.50871741277932
## P5,3,22,1.51280692815781
## P5,3,23,1.51113602035066
## P5,3,24,1.51214967427715
## P5,3,25,1.50866530247224
## P5,3,26,1.5107861321706
## P5,3,27,1.5095117688179
## P5,3,28,1.50640954768404
## P5,3,29,1.50737868434978
## P5,3,30,1.50929891940245
## P5,3,31,1.51348458034236
## P5,3,32,1.51155062891402
## P5,3,33,1.50980745887756
## P5,3,34,1.5123800944399
## P5,3,35,1.50956630210082
## P5,3,36,1.50963165646508
## P5,3,37,1.51526486208891
## P5,3,38,1.50600235986068
## P5,3,39,1.51044514007175
## P5,3,40,1.51017107517261
## P5,3,41,1.50729728514148
## P5,3,42,1.50928231858716
## P5,3,43,1.51249944701675
## P5,3,44,1.50877241274206
## P5,3,45,1.51414493791985
## P5,3,46,1.50669454611265
## P5,3,47,1.51210627107989
## P5,3,48,1.51687812805176
## P5,3,49,1.50614367259873
## P5,3,50,1.50993165691881
## P5,4,1,1.50978135580968
## P5,4,2,1.50798530792922
## P5,4,3,1.52056499587165
## P5,4,4,1.50360503404037
## P5,4,5,1.51471386581171
## P5,4,6,1.50884381119086
## P5,4,7,1.51039530567287
## P5,4,8,1.51248927386302
## P5,4,9,1.51393087387085
## P5,4,10,1.51153635156566
## P5,4,11,1.50853239289866
## P5,4,12,1.51069220167692
## P5,4,13,1.51115407393529
## P5,4,14,1.50077112579346
## P5,4,15,1.50880107879639
## P5,4,16,1.51015804346325
## P5,4,17,1.50917177989071
## P5,4,18,1.52027245993926
## P5,4,19,1.51543093173303
## P5,4,20,1.50574479827398
## P5,4,21,1.51474267454708
## P5,4,22,1.50821440593869
## P5,4,23,1.50266362939562
## P5,4,24,1.50463904653277
## P5,4,25,1.51315047765019
## P5,4,26,1.509953259133
## P5,4,27,1.51579036281607
## P5,4,28,1.51107717514038
## P5,4,29,1.51181838607788
## P5,4,30,1.50878135637305
## P5,4,31,1.50908682598331
## P5,4,32,1.50944328308105
## P5,4,33,1.51123852555345
## P5,4,34,1.51111188994514
## P5,4,35,1.5129090592831
## P5,4,36,1.50298473414253
## P5,4,37,1.50978923573786
## P5,4,38,1.51072210543083
## P5,4,39,1.50994907609568
## P5,4,40,1.51361204045159
## P5,4,41,1.5064389705658
## P5,4,42,1.5097339034926
## P5,4,43,1.50867320051288
## P5,4,44,1.51007172775269
## P5,4,45,1.51461022813744
## P5,4,46,1.50830138404414
## P5,4,47,1.51262281714259
## P5,4,48,1.51182236805768
## P5,4,49,1.51024906826715
## P5,4,50,1.50899334183021
## P5,5,1,1.50966349919637
## P5,5,2,1.5092686499008
## P5,5,3,1.51285596551566
## P5,5,4,1.51140402179015
## P5,5,5,1.5106439706051
## P5,5,6,1.50681867138032
## P5,5,7,1.51168511913669
## P5,5,8,1.51108367028444
## P5,5,9,1.51102928979056
## P5,5,10,1.50980015234514
## P5,5,11,1.51075719708773
## P5,5,12,1.51004006569846
## P5,5,13,1.51036342444447
## P5,5,14,1.51021099768544
## P5,5,15,1.50950058963564
## P5,5,16,1.51064284275033
## P5,5,17,1.51514257464493
## P5,5,18,1.50591375340115
## P5,5,19,1.50971316695213
## P5,5,20,1.5114340182862
## P5,5,21,1.5105413856791
## P5,5,22,1.51106599941375
## P5,5,23,1.51083069505363
## P5,5,24,1.51039445049622
## P5,5,25,1.51016732881654
## P5,5,26,1.51033796615971
## P5,5,27,1.50955195497409
## P5,5,28,1.50959204014949
## P5,5,29,1.51052782323101
## P5,5,30,1.51132452487946
## P5,5,31,1.51036187120386
## P5,5,32,1.51066495107373
## P5,5,33,1.51137528166307
## P5,5,34,1.51138565795762
## P5,5,35,1.51043838519229
## P5,5,36,1.51172905049082
## P5,5,37,1.51067325955346
## P5,5,38,1.50866828387297
## P5,5,39,1.50643448160784
## P5,5,40,1.50949605451811
## P5,5,41,1.50981009456347
## P5,5,42,1.51089063314634
## P5,5,43,1.50877859213642
## P5,5,44,1.50933259286922
## P5,5,45,1.51117646529378
## P5,5,46,1.51027886310027
## P5,5,47,1.51184384963092
## P5,5,48,1.51042185447834
## P5,5,49,1.5106462889938
## P5,5,50,1.51040612810993
## P5,6,1,1.50937095245758
## P5,6,2,1.51078817234483
## P5,6,3,1.5084005183187
## P5,6,4,1.51223087310791
## P5,6,5,1.5104299807081
## P5,6,6,1.5099366687593
## P5,6,7,1.51053833000122
## P5,6,8,1.51050192064944
## P5,6,9,1.50937367468765
## P5,6,10,1.51106988082286
## P5,6,11,1.5105716993313
## P5,6,12,1.50935567611767
## P5,6,13,1.50811005779431
## P5,6,14,1.51078468227979
## P5,6,15,1.50999644941884
## P5,6,16,1.51061954582315
## P5,6,17,1.51028659635661
## P5,6,18,1.51033586179706
## P5,6,19,1.50900822385735
## P5,6,20,1.51031831865725
## P5,6,21,1.5098799970001
## P5,6,22,1.510414793094
## P5,6,23,1.50960204313541
## P5,6,24,1.51055808431173
## P5,6,25,1.5095256669768
## P5,6,26,1.50911168272857
## P5,6,27,1.50952340089358
## P5,6,28,1.50922671212988
## P5,6,29,1.51227219288166
## P5,6,30,1.50605642094332
## P5,6,31,1.5085991330715
## P5,6,32,1.51018631908129
## P5,6,33,1.51060064969488
## P5,6,34,1.51109243890514
## P5,6,35,1.51163862331493
## P5,6,36,1.50863178536361
## P5,6,37,1.51099426801815
## P5,6,38,1.51109323070277
## P5,6,39,1.51088084616103
## P5,6,40,1.51027810687111
## P5,6,41,1.51123462953875
## P5,6,42,1.51111566142032
## P5,6,43,1.51044951252003
## P5,6,44,1.50765620977029
## P5,6,45,1.50851851351121
## P5,6,46,1.51189226113656
## P5,6,47,1.51073037758075
## P5,6,48,1.50765156471866
## P5,6,49,1.50829711495614
## P5,6,50,1.51003039995667
## P5,7,1,1.50983067850272
## P5,7,2,1.5112258871806
## P5,7,3,1.50969049092886
## P5,7,4,1.5114493894577
## P5,7,5,1.50986881689592
## P5,7,6,1.51079066453782
## P5,7,7,1.51048958173362
## P5,7,8,1.51192099008805
## P5,7,9,1.51079223837171
## P5,7,10,1.51226045888498
## P5,7,11,1.50861434936523
## P5,7,12,1.50831122287484
## P5,7,13,1.51079488418263
## P5,7,14,1.51032831971074
## P5,7,15,1.509920562239
## P5,7,16,1.51103848934174
## P5,7,17,1.51052499153245
## P5,7,18,1.51010377384792
## P5,7,19,1.51040360853844
## P5,7,20,1.51144095630181
## P5,7,21,1.51060678088476
## P5,7,22,1.50962360420419
## P5,7,23,1.50970231325198
## P5,7,24,1.51333181770684
## P5,7,25,1.51023361069
## P5,7,26,1.51043170968486
## P5,7,27,1.51121064890986
## P5,7,28,1.50977797417124
## P5,7,29,1.5104662988244
## P5,7,30,1.5099356784377
## P5,7,31,1.50774992618364
## P5,7,32,1.51361417545463
## P5,7,33,1.51087753960256
## P5,7,34,1.50958249670394
## P5,7,35,1.51039839959612
## P5,7,36,1.51192820006313
## P5,7,37,1.5118064275602
## P5,7,38,1.51084134819802
## P5,7,39,1.50785863608645
## P5,7,40,1.51447294507708
## P5,7,41,1.50857406457265
## P5,7,42,1.51306285421833
## P5,7,43,1.50964642642589
## P5,7,44,1.50847547285018
## P5,7,45,1.50841314142401
## P5,7,46,1.51118615695408
## P5,7,47,1.51033757792579
## P5,7,48,1.51177935285883
## P5,7,49,1.51139729560455
## P5,7,50,1.50978049016235
## P5,8,1,1.50850968549747
## P5,8,2,1.50985245248105
## P5,8,3,1.51062974145141
## P5,8,4,1.51208485662937
## P5,8,5,1.51034189213467
## P5,8,6,1.50822526972059
## P5,8,7,1.50755205509826
## P5,8,8,1.51005609781464
## P5,8,9,1.50744972333231
## P5,8,10,1.51129094211535
## P5,8,11,1.50731908191334
## P5,8,12,1.50911258786453
## P5,8,13,1.51003600455619
## P5,8,14,1.51066524957873
## P5,8,15,1.51073393409635
## P5,8,16,1.50864569875929
## P5,8,17,1.51217427898098
## P5,8,18,1.5118438092024
## P5,8,19,1.50823495615667
## P5,8,20,1.50861760919744
## P5,8,21,1.50811119915284
## P5,8,22,1.50928640151772
## P5,8,23,1.51007706436081
## P5,8,24,1.51070192125109
## P5,8,25,1.5108057961392
## P5,8,26,1.51065983533859
## P5,8,27,1.50722239973358
## P5,8,28,1.51162478026994
## P5,8,29,1.51045187596742
## P5,8,30,1.50990913419301
## P5,8,31,1.50749457966198
## P5,8,32,1.51202039460878
## P5,8,33,1.506768315703
## P5,8,34,1.51121827221792
## P5,8,35,1.51586413383484
## P5,8,36,1.50943061217521
## P5,8,37,1.51137733931589
## P5,8,38,1.51089803672131
## P5,8,39,1.51067507952109
## P5,8,40,1.51049368083477
## P5,8,41,1.51090317356343
## P5,8,42,1.51137176170168
## P5,8,43,1.51069279006033
## P5,8,44,1.50910944914698
## P5,8,45,1.50969752735562
## P5,8,46,1.50877536376777
## P5,8,47,1.50906077416047
## P5,8,48,1.51064052681128
## P5,8,49,1.50998683749693
## P5,8,50,1.51108366890144
## P5,9,1,1.50895979886498
## P5,9,2,1.50761285270612
## P5,9,3,1.51198203151763
## P5,9,4,1.50951451942569
## P5,9,5,1.50901255812696
## P5,9,6,1.50863726705098
## P5,9,7,1.51103868649874
## P5,9,8,1.5114726153287
## P5,9,9,1.50984711499558
## P5,9,10,1.51044050852458
## P5,9,11,1.51298128945487
## P5,9,12,1.50642195646314
## P5,9,13,1.51012629230006
## P5,9,14,1.51040338306892
## P5,9,15,1.50901749216277
## P5,9,16,1.50963943323512
## P5,9,17,1.51415871154694
## P5,9,18,1.5104938214914
## P5,9,19,1.50892432199584
## P5,9,20,1.51046344637871
## P5,9,21,1.50946860735108
## P5,9,22,1.51403271153643
## P5,9,23,1.51146269953528
## P5,9,24,1.51148275752644
## P5,9,25,1.510308073968
## P5,9,26,1.51051177796285
## P5,9,27,1.5108108997345
## P5,9,28,1.51379047995583
## P5,9,29,1.50723324964444
## P5,9,30,1.51039690228563
## P5,9,31,1.50900824011826
## P5,9,32,1.51151819281526
## P5,9,33,1.51014958222707
## P5,9,34,1.51224353550616
## P5,9,35,1.50783634998582
## P5,9,36,1.50873968165408
## P5,9,37,1.50662347793579
## P5,9,38,1.51069148523467
## P5,9,39,1.51104027960036
## P5,9,40,1.50928502938686
## P5,9,41,1.50879339315952
## P5,9,42,1.51025109465529
## P5,9,43,1.50936393534884
## P5,9,44,1.51153293905411
## P5,9,45,1.51024529549383
## P5,9,46,1.50965764016816
## P5,9,47,1.50809172473887
## P5,9,48,1.5111360060863
## P5,9,49,1.51095222657727
## P5,9,50,1.51086841752734
## P5,10,1,1.51107925807728
## P5,10,2,1.50960278128558
## P5,10,3,1.51063841546488
## P5,10,4,1.51155412128993
## P5,10,5,1.51047243048611
## P5,10,6,1.50792684402058
## P5,10,7,1.51072025558223
## P5,10,8,1.51034594032
## P5,10,9,1.50825943666346
## P5,10,10,1.51120830892207
## P5,10,11,1.51094499832304
## P5,10,12,1.51165669267349
## P5,10,13,1.50949417094074
## P5,10,14,1.51052093019291
## P5,10,15,1.51144079079375
## P5,10,16,1.50933627739638
## P5,10,17,1.50439952009468
## P5,10,18,1.5098535767917
## P5,10,19,1.51060550157414
## P5,10,20,1.50949346477335
## P5,10,21,1.50989489075999
## P5,10,22,1.51152885448166
## P5,10,23,1.50634666567757
## P5,10,24,1.50790730321595
## P5,10,25,1.51163100677988
## P5,10,26,1.51170525831335
## P5,10,27,1.50846384924811
## P5,10,28,1.51046362999947
## P5,10,29,1.51006495088771
## P5,10,30,1.51008397611705
## P5,10,31,1.50977959785056
## P5,10,32,1.5108199863899
## P5,10,33,1.50910104132448
## P5,10,34,1.51178232656943
## P5,10,35,1.50925580908855
## P5,10,36,1.50964637558059
## P5,10,37,1.51072872531029
## P5,10,38,1.51046129067739
## P5,10,39,1.51179352896554
## P5,10,40,1.50768404057685
## P5,10,41,1.51190954274525
## P5,10,42,1.50851315475372
## P5,10,43,1.5109686978658
## P5,10,44,1.50910241263253
## P5,10,45,1.51206216013244
## P5,10,46,1.50917686695276
## P5,10,47,1.51086821085141
## P5,10,48,1.50815628588885
## P5,10,49,1.51264161689609
## P5,10,50,1.50986897489563
## P6,1,1,1.51416259620622
## P6,1,2,1.51206343093615
## P6,1,3,1.50522972816645
## P6,1,4,1.50896989353119
## P6,1,5,1.50914068091406
## P6,1,6,1.50649275779724
## P6,1,7,1.49789790184267
## P6,1,8,1.50978535456015
## P6,1,9,1.50618590648819
## P6,1,10,1.51893906897687
## P6,1,11,1.49978880783946
## P6,1,12,1.51558863474223
## P6,1,13,1.51406898041685
## P6,1,14,1.51383300508772
## P6,1,15,1.51343515295731
## P6,1,16,1.50980877116987
## P6,1,17,1.52376356064898
## P6,1,18,1.52107931279588
## P6,1,19,1.51484107971191
## P6,1,20,1.51181627853572
## P6,1,21,1.51850587299892
## P6,1,22,1.51257674519609
## P6,1,23,1.50782818513758
## P6,1,24,1.51295553772143
## P6,1,25,1.52309105525146
## P6,1,26,1.51032235090015
## P6,1,27,1.5139658950096
## P6,1,28,1.51039712121882
## P6,1,29,1.51585883516254
## P6,1,30,1.51597344816612
## P6,1,31,1.51014677207627
## P6,1,32,1.52610792257847
## P6,1,33,1.50360182398244
## P6,1,34,1.50861214001973
## P6,1,35,1.50633321400561
## P6,1,36,1.51274943351746
## P6,1,37,1.50534475074624
## P6,1,38,1.5097721029211
## P6,1,39,1.5083501036738
## P6,1,40,1.51170054871832
## P6,1,41,1.50826226046056
## P6,1,42,1.49676858520508
## P6,1,43,1.50695585334388
## P6,1,44,1.51893402099609
## P6,1,45,1.51345047819505
## P6,1,46,1.5106840057373
## P6,1,47,1.5151282808055
## P6,1,48,1.49019828107622
## P6,1,49,1.51473840702786
## P6,1,50,1.51177327207817
## P6,2,1,1.51160499084094
## P6,2,2,1.50937077105045
## P6,2,3,1.51027427400861
## P6,2,4,1.51434016558859
## P6,2,5,1.50846059649598
## P6,2,6,1.5190965735394
## P6,2,7,1.51447343334709
## P6,2,8,1.5134506198947
## P6,2,9,1.51275251461909
## P6,2,10,1.50784281364777
## P6,2,11,1.51675154292394
## P6,2,12,1.50281030671638
## P6,2,13,1.5116920683794
## P6,2,14,1.51067248922195
## P6,2,15,1.50980239255088
## P6,2,16,1.51292640327388
## P6,2,17,1.49753473486219
## P6,2,18,1.51195949755217
## P6,2,19,1.50974961037331
## P6,2,20,1.51511641766163
## P6,2,21,1.49799750745296
## P6,2,22,1.51399267150695
## P6,2,23,1.51442814234531
## P6,2,24,1.51271229836999
## P6,2,25,1.49879022466725
## P6,2,26,1.51279239943533
## P6,2,27,1.50842229803125
## P6,2,28,1.52126284231219
## P6,2,29,1.51386607134784
## P6,2,30,1.51168220207609
## P6,2,31,1.51293462443064
## P6,2,32,1.51137914657593
## P6,2,33,1.50400269031525
## P6,2,34,1.51198687962123
## P6,2,35,1.50941107544718
## P6,2,36,1.51232039928436
## P6,2,37,1.51161418726415
## P6,2,38,1.50607083006675
## P6,2,39,1.52276252365112
## P6,2,40,1.50742933941984
## P6,2,41,1.51161064041985
## P6,2,42,1.51311948018916
## P6,2,43,1.51324580551742
## P6,2,44,1.50876456425514
## P6,2,45,1.50998481114705
## P6,2,46,1.51148968696594
## P6,2,47,1.51998224258423
## P6,2,48,1.51045048678363
## P6,2,49,1.5258839896747
## P6,2,50,1.50664275458233
## P6,3,1,1.5100131938332
## P6,3,2,1.51190439548368
## P6,3,3,1.51261002409692
## P6,3,4,1.51218145171557
## P6,3,5,1.51081387840923
## P6,3,6,1.50769115530926
## P6,3,7,1.50977062698979
## P6,3,8,1.51074141414226
## P6,3,9,1.51118524700192
## P6,3,10,1.5092891028168
## P6,3,11,1.51309887000493
## P6,3,12,1.51123524487503
## P6,3,13,1.50937521769738
## P6,3,14,1.51357365411425
## P6,3,15,1.51190375923214
## P6,3,16,1.51151174506885
## P6,3,17,1.51010785553906
## P6,3,18,1.51082208835879
## P6,3,19,1.51188059623197
## P6,3,20,1.51142035622195
## P6,3,21,1.51133152495983
## P6,3,22,1.51124543197884
## P6,3,23,1.51242471637582
## P6,3,24,1.51199590024494
## P6,3,25,1.51250441280412
## P6,3,26,1.50956408922062
## P6,3,27,1.51180662500097
## P6,3,28,1.50922843297323
## P6,3,29,1.51243682373735
## P6,3,30,1.51225358331707
## P6,3,31,1.51066695241367
## P6,3,32,1.50844566164346
## P6,3,33,1.5126081119383
## P6,3,34,1.49963370958964
## P6,3,35,1.51456781647961
## P6,3,36,1.51342270591042
## P6,3,37,1.50867844464486
## P6,3,38,1.50868598319389
## P6,3,39,1.51257745646898
## P6,3,40,1.51345648043083
## P6,3,41,1.51109860716639
## P6,3,42,1.50935107089104
## P6,3,43,1.5136038340055
## P6,3,44,1.5121653218602
## P6,3,45,1.51422791278109
## P6,3,46,1.51134848756855
## P6,3,47,1.50473944108878
## P6,3,48,1.51209348510293
## P6,3,49,1.51413040439578
## P6,3,50,1.5118673818107
## P6,4,1,1.51046234223901
## P6,4,2,1.50995245708781
## P6,4,3,1.51010126976451
## P6,4,4,1.5125636363375
## P6,4,5,1.50454662627533
## P6,4,6,1.50910690203816
## P6,4,7,1.50979224787462
## P6,4,8,1.51112199855107
## P6,4,9,1.50995374388165
## P6,4,10,1.51211727276827
## P6,4,11,1.50962958304711
## P6,4,12,1.51240075065429
## P6,4,13,1.51488893614041
## P6,4,14,1.50861320803242
## P6,4,15,1.51067021807785
## P6,4,16,1.51477130766838
## P6,4,17,1.50700593695921
## P6,4,18,1.50977192570766
## P6,4,19,1.51168729311012
## P6,4,20,1.50852866399856
## P6,4,21,1.51282495681686
## P6,4,22,1.51113225887348
## P6,4,23,1.5098908376158
## P6,4,24,1.51224467958723
## P6,4,25,1.51536824001985
## P6,4,26,1.50519040683368
## P6,4,27,1.51217006587382
## P6,4,28,1.50984295127318
## P6,4,29,1.51063394972256
## P6,4,30,1.5157570002915
## P6,4,31,1.50269398057317
## P6,4,32,1.51537090285212
## P6,4,33,1.50601578731926
## P6,4,34,1.51115194677609
## P6,4,35,1.51110870497567
## P6,4,36,1.51553514033933
## P6,4,37,1.50774761648739
## P6,4,38,1.51455582209996
## P6,4,39,1.51173827852522
## P6,4,40,1.51934575712359
## P6,4,41,1.50367694430881
## P6,4,42,1.5129843924543
## P6,4,43,1.51334066896249
## P6,4,44,1.51884126088705
## P6,4,45,1.51486517881092
## P6,4,46,1.52161842683402
## P6,4,47,1.49610396562997
## P6,4,48,1.51553212917917
## P6,4,49,1.52721623959749
## P6,4,50,1.51044718202694
## P6,5,1,1.51108669633625
## P6,5,2,1.50949918106198
## P6,5,3,1.51602693076606
## P6,5,4,1.5096614747434
## P6,5,5,1.51176805360943
## P6,5,6,1.51409287982517
## P6,5,7,1.50625481448331
## P6,5,8,1.51453533242731
## P6,5,9,1.50705689683967
## P6,5,10,1.51539330170533
## P6,5,11,1.51177803675334
## P6,5,12,1.50928474460128
## P6,5,13,1.51084747753645
## P6,5,14,1.51021673565819
## P6,5,15,1.50940271574875
## P6,5,16,1.5129394761051
## P6,5,17,1.51405574614743
## P6,5,18,1.50952033269203
## P6,5,19,1.50924476571039
## P6,5,20,1.51260686803747
## P6,5,21,1.50811444222927
## P6,5,22,1.50996681199457
## P6,5,23,1.51470719378419
## P6,5,24,1.51151473298032
## P6,5,25,1.51159648444709
## P6,5,26,1.51122926591753
## P6,5,27,1.5156869000402
## P6,5,28,1.50314636230469
## P6,5,29,1.51276801881336
## P6,5,30,1.51174193415149
## P6,5,31,1.50886932323719
## P6,5,32,1.51087098426007
## P6,5,33,1.51305277715593
## P6,5,34,1.50651426679769
## P6,5,35,1.50926605224609
## P6,5,36,1.51413247515174
## P6,5,37,1.51155182634081
## P6,5,38,1.50428249231025
## P6,5,39,1.51058774245413
## P6,5,40,1.51129093624297
## P6,5,41,1.50771388851228
## P6,5,42,1.51312607659234
## P6,5,43,1.50557392734592
## P6,5,44,1.51076660365084
## P6,5,45,1.50819432978727
## P6,5,46,1.51001664976411
## P6,5,47,1.51125527173281
## P6,5,48,1.52653451332679
## P6,5,49,1.52004880375332
## P6,5,50,1.5093598933447
## P6,6,1,1.51019902805706
## P6,6,2,1.51102010543737
## P6,6,3,1.5132170505211
## P6,6,4,1.51080612383391
## P6,6,5,1.51078165212327
## P6,6,6,1.51092606523763
## P6,6,7,1.51186466758901
## P6,6,8,1.51160336738855
## P6,6,9,1.510947810279
## P6,6,10,1.51180206832065
## P6,6,11,1.50998977204444
## P6,6,12,1.5111598183127
## P6,6,13,1.51156945287445
## P6,6,14,1.51182240163776
## P6,6,15,1.51193433890313
## P6,6,16,1.51008071527853
## P6,6,17,1.51064020853776
## P6,6,18,1.51336794372991
## P6,6,19,1.51218081328828
## P6,6,20,1.50806039641885
## P6,6,21,1.51298254789765
## P6,6,22,1.51303654601893
## P6,6,23,1.50995488405228
## P6,6,24,1.5138422067834
## P6,6,25,1.50851783545121
## P6,6,26,1.51094870741774
## P6,6,27,1.51121410329074
## P6,6,28,1.51222623703797
## P6,6,29,1.50937630803452
## P6,6,30,1.50845082416091
## P6,6,31,1.51243732273579
## P6,6,32,1.51012192754184
## P6,6,33,1.51057286884474
## P6,6,34,1.50979513900225
## P6,6,35,1.50894399656766
## P6,6,36,1.51476745679975
## P6,6,37,1.50916850182318
## P6,6,38,1.50984870945966
## P6,6,39,1.51213547116832
## P6,6,40,1.51260513490246
## P6,6,41,1.50897790539649
## P6,6,42,1.50935914911375
## P6,6,43,1.51104475723373
## P6,6,44,1.51008587430237
## P6,6,45,1.51088163651616
## P6,6,46,1.51115817434332
## P6,6,47,1.51073745983403
## P6,6,48,1.51179909238628
## P6,6,49,1.51081387575935
## P6,6,50,1.51169786802152
## P6,7,1,1.51146268474963
## P6,7,2,1.51300480985266
## P6,7,3,1.51186549077269
## P6,7,4,1.51005701764801
## P6,7,5,1.51030455496078
## P6,7,6,1.50986759503682
## P6,7,7,1.51319961604618
## P6,7,8,1.50959255669143
## P6,7,9,1.51178448264663
## P6,7,10,1.51215129722784
## P6,7,11,1.50645095042968
## P6,7,12,1.51264845452658
## P6,7,13,1.5126071709853
## P6,7,14,1.5115409201764
## P6,7,15,1.50972109939415
## P6,7,16,1.5107636135935
## P6,7,17,1.5114206809782
## P6,7,18,1.51086912725283
## P6,7,19,1.51187392729747
## P6,7,20,1.51077029012865
## P6,7,21,1.51031235482195
## P6,7,22,1.51158542242664
## P6,7,23,1.51180260557877
## P6,7,24,1.50998467466106
## P6,7,25,1.51207845533216
## P6,7,26,1.51138387582241
## P6,7,27,1.50768901033011
## P6,7,28,1.5052813672695
## P6,7,29,1.51159234757119
## P6,7,30,1.51008399779146
## P6,7,31,1.51138166479162
## P6,7,32,1.51266800849996
## P6,7,33,1.51104444673617
## P6,7,34,1.50732209682465
## P6,7,35,1.51530248257849
## P6,7,36,1.51034937253812
## P6,7,37,1.50455982344491
## P6,7,38,1.51311491373423
## P6,7,39,1.51033220757971
## P6,7,40,1.50767766345631
## P6,7,41,1.51197096352936
## P6,7,42,1.51111114361865
## P6,7,43,1.50889794599442
## P6,7,44,1.508766971739
## P6,7,45,1.51040351324241
## P6,7,46,1.51182576896107
## P6,7,47,1.51072637547446
## P6,7,48,1.51114277455999
## P6,7,49,1.50779752001736
## P6,7,50,1.51144854585457
## P6,8,1,1.51158146135735
## P6,8,2,1.51221086964104
## P6,8,3,1.51117103750055
## P6,8,4,1.51195634543563
## P6,8,5,1.51185904016028
## P6,8,6,1.50863978339405
## P6,8,7,1.50916664520006
## P6,8,8,1.51321712307546
## P6,8,9,1.505931609869
## P6,8,10,1.51158452168696
## P6,8,11,1.51368579123784
## P6,8,12,1.50894461598313
## P6,8,13,1.51303655110048
## P6,8,14,1.50487080713113
## P6,8,15,1.51682904871499
## P6,8,16,1.50798974397048
## P6,8,17,1.51315375241366
## P6,8,18,1.50848970790901
## P6,8,19,1.51342292221225
## P6,8,20,1.50571700359913
## P6,8,21,1.51448673360488
## P6,8,22,1.50605682807394
## P6,8,23,1.51634204721896
## P6,8,24,1.5082436970302
## P6,8,25,1.51328177037446
## P6,8,26,1.50434802560245
## P6,8,27,1.51769734765882
## P6,8,28,1.50824784161
## P6,8,29,1.51121085718137
## P6,8,30,1.51200067145484
## P6,8,31,1.51172500155693
## P6,8,32,1.51028667381424
## P6,8,33,1.50921088201137
## P6,8,34,1.51154880090193
## P6,8,35,1.5108897511552
## P6,8,36,1.51199589740662
## P6,8,37,1.5075170238566
## P6,8,38,1.51215465970941
## P6,8,39,1.50957588715987
## P6,8,40,1.51191130163949
## P6,8,41,1.51086858402599
## P6,8,42,1.5090654638947
## P6,8,43,1.51202590366792
## P6,8,44,1.50955820083618
## P6,8,45,1.50923580234334
## P6,8,46,1.51259251616218
## P6,8,47,1.50954237563834
## P6,8,48,1.51030684144873
## P6,8,49,1.50987551642246
## P6,8,50,1.5104512075168
## P6,9,1,1.51115354549053
## P6,9,2,1.51065396099556
## P6,9,3,1.51100588123701
## P6,9,4,1.51180708656708
## P6,9,5,1.50929396374281
## P6,9,6,1.51067598610167
## P6,9,7,1.51097656866747
## P6,9,8,1.51151573791933
## P6,9,9,1.50992966840367
## P6,9,10,1.51317646974575
## P6,9,11,1.51027658501187
## P6,9,12,1.51040068113735
## P6,9,13,1.51069710471413
## P6,9,14,1.5122591570804
## P6,9,15,1.50889379598878
## P6,9,16,1.51119272500877
## P6,9,17,1.51171549628763
## P6,9,18,1.50838463454597
## P6,9,19,1.51084615290165
## P6,9,20,1.51043439355696
## P6,9,21,1.51138837541853
## P6,9,22,1.51152973432799
## P6,9,23,1.51258697299009
## P6,9,24,1.51269053495847
## P6,9,25,1.50938113076346
## P6,9,26,1.50772216749487
## P6,9,27,1.51105703846101
## P6,9,28,1.50986588385797
## P6,9,29,1.51142021736003
## P6,9,30,1.51064487527178
## P6,9,31,1.51291259741172
## P6,9,32,1.51160557590314
## P6,9,33,1.51542980530683
## P6,9,34,1.50716673863399
## P6,9,35,1.51202945960195
## P6,9,36,1.50905063905214
## P6,9,37,1.52148050528306
## P6,9,38,1.49580666893407
## P6,9,39,1.51604438622793
## P6,9,40,1.51991349742526
## P6,9,41,1.50851244192857
## P6,9,42,1.5066404051897
## P6,9,43,1.51284428618171
## P6,9,44,1.5089830805858
## P6,9,45,1.50770423338585
## P6,9,46,1.50706456899643
## P6,9,47,1.50959346429357
## P6,9,48,1.50477421030085
## P6,9,49,1.51701801322227
## P6,9,50,1.51080642526141
## P6,10,1,1.51127961744745
## P6,10,2,1.51079046364987
## P6,10,3,1.50885642784229
## P6,10,4,1.51146947944557
## P6,10,5,1.51283019344981
## P6,10,6,1.51026146146986
## P6,10,7,1.51238478971331
## P6,10,8,1.51024243679452
## P6,10,9,1.51148458781995
## P6,10,10,1.51224024351253
## P6,10,11,1.50966281692187
## P6,10,12,1.51003129141671
## P6,10,13,1.51068074190164
## P6,10,14,1.51212345759074
## P6,10,15,1.50936443429244
## P6,10,16,1.51157471568314
## P6,10,17,1.51338993039047
## P6,10,18,1.51134187325664
## P6,10,19,1.50953459421794
## P6,10,20,1.51025027698941
## P6,10,21,1.50945004596505
## P6,10,22,1.51020426111123
## P6,10,23,1.51055635190478
## P6,10,24,1.50752254363594
## P6,10,25,1.51005034343056
## P6,10,26,1.51167699694633
## P6,10,27,1.51027566049157
## P6,10,28,1.50974856840598
## P6,10,29,1.50876298676366
## P6,10,30,1.50936341029342
## P6,10,31,1.51272061291863
## P6,10,32,1.50854785101754
## P6,10,33,1.51051777287533
## P6,10,34,1.51108220544192
## P6,10,35,1.50872181786431
## P6,10,36,1.51067485528834
## P6,10,37,1.50951487747664
## P6,10,38,1.51014890293084
## P6,10,39,1.51139163970947
## P6,10,40,1.50945215809102
## P6,10,41,1.51289727952745
## P6,10,42,1.50920198537126
## P6,10,43,1.51166474711788
## P6,10,44,1.51138492584229
## P6,10,45,1.51107494934745
## P6,10,46,1.51039893286569
## P6,10,47,1.51085149880612
## P6,10,48,1.5132597957749
## P6,10,49,1.50939125311179
## P6,10,50,1.51073357108924
## P7,1,1,1.50810875957959
## P7,1,2,1.50937967486196
## P7,1,3,1.5098932576297
## P7,1,4,1.51245257358423
## P7,1,5,1.50855505737391
## P7,1,6,1.50351283579697
## P7,1,7,1.50964428933614
## P7,1,8,1.51087836527454
## P7,1,9,1.51153226665684
## P7,1,10,1.50999150224911
## P7,1,11,1.51098576459018
## P7,1,12,1.50764308041996
## P7,1,13,1.50880324346779
## P7,1,14,1.51079258182705
## P7,1,15,1.51076031305704
## P7,1,16,1.50438277861651
## P7,1,17,1.50687171235869
## P7,1,18,1.51316246688366
## P7,1,19,1.50881524856933
## P7,1,20,1.5108156580674
## P7,1,21,1.50908807376484
## P7,1,22,1.50867648886031
## P7,1,23,1.51086813338259
## P7,1,24,1.51263371968673
## P7,1,25,1.50872049587114
## P7,1,26,1.49934892756965
## P7,1,27,1.51300057768822
## P7,1,28,1.50881765222037
## P7,1,29,1.5103435560509
## P7,1,30,1.51345953941345
## P7,1,31,1.50531949681684
## P7,1,32,1.51400188927178
## P7,1,33,1.51310313831676
## P7,1,34,1.50619574893605
## P7,1,35,1.50944495423932
## P7,1,36,1.50758818070666
## P7,1,37,1.50688987764819
## P7,1,38,1.50698277660619
## P7,1,39,1.50900158212205
## P7,1,40,1.5152267826928
## P7,1,41,1.49233189962244
## P7,1,42,1.51146252508517
## P7,1,43,1.50745656755235
## P7,1,44,1.50134085537343
## P7,1,45,1.53647578594296
## P7,1,46,1.51327669162017
## P7,1,47,1.49750925658585
## P7,1,48,1.5103406722729
## P7,1,49,1.50463617324829
## P7,1,50,1.50551174896691
## P7,2,1,1.51061244137519
## P7,2,2,1.48616014048457
## P7,2,3,1.52523658563803
## P7,2,4,1.51349016397941
## P7,2,5,1.50635253058539
## P7,2,6,1.512341796488
## P7,2,7,1.50834294521447
## P7,2,8,1.51465546859885
## P7,2,9,1.51057968045225
## P7,2,10,1.50834146861372
## P7,2,11,1.51345517121109
## P7,2,12,1.50961708840523
## P7,2,13,1.50539347555785
## P7,2,14,1.5103509886223
## P7,2,15,1.50965867786232
## P7,2,16,1.51378711064657
## P7,2,17,1.50797840201336
## P7,2,18,1.51141784825456
## P7,2,19,1.51126274140943
## P7,2,20,1.51085367773333
## P7,2,21,1.51322994232178
## P7,2,22,1.51403403849829
## P7,2,23,1.51405188808702
## P7,2,24,1.51424503880878
## P7,2,25,1.5044871395074
## P7,2,26,1.51524338514908
## P7,2,27,1.51140004893144
## P7,2,28,1.5101983926513
## P7,2,29,1.50846187547706
## P7,2,30,1.50968708815398
## P7,2,31,1.51479317712002
## P7,2,32,1.51106478038587
## P7,2,33,1.51090856220411
## P7,2,34,1.51109285950661
## P7,2,35,1.51324372972761
## P7,2,36,1.51675266623497
## P7,2,37,1.50539615948995
## P7,2,38,1.50732449199376
## P7,2,39,1.51067642324111
## P7,2,40,1.51059113670798
## P7,2,41,1.50894465571956
## P7,2,42,1.50973057472843
## P7,2,43,1.51357970077
## P7,2,44,1.5133132501082
## P7,2,45,1.51423668861389
## P7,2,46,1.50975132914423
## P7,2,47,1.51149929528949
## P7,2,48,1.51698521205357
## P7,2,49,1.50620761144729
## P7,2,50,1.51359268627336
## P7,3,1,1.52478724844912
## P7,3,2,1.50337867736816
## P7,3,3,1.51077902813752
## P7,3,4,1.46805522147189
## P7,3,5,1.54268188383973
## P7,3,6,1.50380176113498
## P7,3,7,1.51825659970442
## P7,3,8,1.51178971926371
## P7,3,9,1.50222601457076
## P7,3,10,1.52641222914871
## P7,3,11,1.50439854258115
## P7,3,12,1.50296112586712
## P7,3,13,1.50687042085251
## P7,3,14,1.50672058411586
## P7,3,15,1.50311738188549
## P7,3,16,1.51529834467337
## P7,3,17,1.51005748815315
## P7,3,18,1.50564300064492
## P7,3,19,1.51441864851044
## P7,3,20,1.50365575941482
## P7,3,21,1.51638539440661
## P7,3,22,1.50284673409028
## P7,3,23,1.52783851927899
## P7,3,24,1.49387661067919
## P7,3,25,1.51411077711317
## P7,3,26,1.52622671616383
## P7,3,27,1.50339546203613
## P7,3,28,1.51735626890304
## P7,3,29,1.50856334059986
## P7,3,30,1.5196065221514
## P7,3,31,1.48162829875946
## P7,3,32,1.51851989973837
## P7,3,33,1.51848176430012
## P7,3,34,1.49605317433675
## P7,3,35,1.5066244774258
## P7,3,36,1.53216614955809
## P7,3,37,1.49700388908386
## P7,3,38,1.51592672438849
## P7,3,39,1.49959094789293
## P7,3,40,1.54776487852398
## P7,3,41,1.50148874416686
## P7,3,42,1.51036859731205
## P7,3,43,1.53696027066973
## P7,3,44,1.50103643066005
## P7,3,45,1.51766911745071
## P7,3,46,1.52122470310756
## P7,3,47,1.5060744465522
## P7,3,48,1.51606804637586
## P7,3,49,1.51485859063955
## P7,3,50,1.50423622131348
## P7,4,1,1.51112687146222
## P7,4,2,1.50563277869389
## P7,4,3,1.53143864328211
## P7,4,4,1.50636644141619
## P7,4,5,1.50838669368199
## P7,4,6,1.49684658504668
## P7,4,7,1.51588993271192
## P7,4,8,1.50375534057617
## P7,4,9,1.51171293428966
## P7,4,10,1.52055607477824
## P7,4,11,1.52067117463975
## P7,4,12,1.4943543200223
## P7,4,13,1.51448002457619
## P7,4,14,1.50852770554392
## P7,4,15,1.51068400065104
## P7,4,16,1.5062152226766
## P7,4,17,1.50282282983103
## P7,4,18,1.51526764722971
## P7,4,19,1.52264695508139
## P7,4,20,1.50903062025706
## P7,4,21,1.49702934214943
## P7,4,22,1.50830766429072
## P7,4,23,1.50604831654093
## P7,4,24,1.5273203253746
## P7,4,25,1.50858622505551
## P7,4,26,1.50749762852987
## P7,4,27,1.48912211162288
## P7,4,28,1.5097690820694
## P7,4,29,1.50423627021985
## P7,4,30,1.52513942718506
## P7,4,31,1.50373691831316
## P7,4,32,1.51884059516751
## P7,4,33,1.5038964583956
## P7,4,34,1.51468145847321
## P7,4,35,1.49710743767875
## P7,4,36,1.52628529513324
## P7,4,37,1.50668495754863
## P7,4,38,1.49885683059692
## P7,4,39,1.50867550269417
## P7,4,40,1.50159616470337
## P7,4,41,1.50974064740268
## P7,4,42,1.54999941045588
## P7,4,43,1.4998773950519
## P7,4,44,1.52232531940236
## P7,4,45,1.50216770172119
## P7,4,46,1.51152194023132
## P7,4,47,1.50025708922024
## P7,4,48,1.51801697413127
## P7,4,49,1.51036443710327
## P7,4,50,1.50712440644993
## P7,5,1,1.51648533971686
## P7,5,2,1.51445056954209
## P7,5,3,1.52696979747099
## P7,5,4,1.51260149002075
## P7,5,5,1.50274382805338
## P7,5,6,1.53153702064797
## P7,5,7,1.49047797066825
## P7,5,8,1.51610256565942
## P7,5,9,1.50504568644932
## P7,5,10,1.49242377731035
## P7,5,11,1.51870600382487
## P7,5,12,1.48733754060706
## P7,5,13,1.49652838239483
## P7,5,14,1.5004145304362
## P7,5,15,1.51285415325525
## P7,5,16,1.50565968453884
## P7,5,17,1.50793401400248
## P7,5,18,1.5041367730429
## P7,5,19,1.5076944057758
## P7,5,20,1.50569605827332
## P7,5,21,1.50070748184666
## P7,5,22,1.5003911619601
## P7,5,23,1.50528207421303
## P7,5,24,1.51828684012095
## P7,5,25,1.52019656858137
## P7,5,26,1.5011150871498
## P7,5,27,1.51549101984778
## P7,5,28,1.51258116183074
## P7,5,29,1.50450676206558
## P7,5,30,1.51167585584852
## P7,5,31,1.52211166777701
## P7,5,32,1.51087533103095
## P7,5,33,1.50339375436306
## P7,5,34,1.49728139241536
## P7,5,35,1.51200323519499
## P7,5,36,1.51154458081281
## P7,5,37,1.5086690250196
## P7,5,38,1.5119695921202
## P7,5,39,1.50665443083819
## P7,5,40,1.50506705206794
## P7,5,41,1.50787527859211
## P7,5,42,1.50354768170251
## P7,5,43,1.50332117080688
## P7,5,44,1.51088080535064
## P7,5,45,1.5089890843346
## P7,5,46,1.50395046340095
## P7,5,47,1.50483348152854
## P7,5,48,1.51952216625214
## P7,5,49,1.50373483426643
## P7,5,50,1.51051268772203
## P7,6,1,1.50061783109392
## P7,6,2,1.51519291541156
## P7,6,3,1.51178596980536
## P7,6,4,1.51299183456986
## P7,6,5,1.51789832937306
## P7,6,6,1.51443386077881
## P7,6,7,1.51339990952436
## P7,6,8,1.50727878570557
## P7,6,9,1.51231424561862
## P7,6,10,1.50757729829247
## P7,6,11,1.50407758712769
## P7,6,12,1.50610086192255
## P7,6,13,1.509017095461
## P7,6,14,1.49941925909005
## P7,6,15,1.50576981376199
## P7,6,16,1.51723747026353
## P7,6,17,1.52082463673183
## P7,6,18,1.51215193318386
## P7,6,19,1.5121805369854
## P7,6,20,1.51009736237703
## P7,6,21,1.5085063449672
## P7,6,22,1.51102243150984
## P7,6,23,1.50793406457612
## P7,6,24,1.50340989919809
## P7,6,25,1.50336860656738
## P7,6,26,1.51596628535878
## P7,6,27,1.51289194058149
## P7,6,28,1.50785725457328
## P7,6,29,1.49993802655128
## P7,6,30,1.50476511319478
## P7,6,31,1.49289496128376
## P7,6,32,1.51545355055067
## P7,6,33,1.51037598765174
## P7,6,34,1.51719479407034
## P7,6,35,1.47533144950867
## P7,6,36,1.50155588984489
## P7,6,37,1.50699410438538
## P7,6,38,1.51265200701627
## P7,6,39,1.50497992588924
## P7,6,40,1.50827931222462
## P7,6,41,1.50693303888494
## P7,6,42,1.51253064843111
## P7,6,43,1.51091639619125
## P7,6,44,1.5250595166133
## P7,6,45,1.52601199401052
## P7,6,46,1.5004877466144
## P7,6,47,1.50862458774022
## P7,6,48,1.51545357704163
## P7,6,49,1.49185916355678
## P7,6,50,1.50511854438372
## P7,7,1,1.51001542806625
## P7,7,2,1.48216496814381
## P7,7,3,1.50882447393317
## P7,7,4,1.50657543481565
## P7,7,5,1.51921955374784
## P7,7,6,1.50916651317051
## P7,7,7,1.51570534706116
## P7,7,8,1.51535635158933
## P7,7,9,1.5047244909333
## P7,7,10,1.52398624203422
## P7,7,11,1.50099090250527
## P7,7,12,1.51184147198995
## P7,7,13,1.51044692311968
## P7,7,14,1.51927620299319
## P7,7,15,1.50119190048753
## P7,7,16,1.51550388336182
## P7,7,17,1.50788606916155
## P7,7,18,1.51991576414842
## P7,7,19,1.51059784760346
## P7,7,20,1.5110391775767
## P7,7,21,1.51067417759006
## P7,7,22,1.49563425609044
## P7,7,23,1.52791894806756
## P7,7,24,1.5374481678009
## P7,7,25,1.5184748002461
## P7,7,26,1.51648782395028
## P7,7,27,1.50848627762056
## P7,7,28,1.50129692895072
## P7,7,29,1.49194545405252
## P7,7,30,1.5234027226766
## P7,7,31,1.5128308154167
## P7,7,32,1.51787057012882
## P7,7,33,1.50506214219697
## P7,7,34,1.4938324841586
## P7,7,35,1.51086414711816
## P7,7,36,1.50674144292282
## P7,7,37,1.51053387053469
## P7,7,38,1.49643419470106
## P7,7,39,1.49685008309104
## P7,7,40,1.51860124011372
## P7,7,41,1.49718636882548
## P7,7,42,1.51313518991276
## P7,7,43,1.50653506434241
## P7,7,44,1.5119776725769
## P7,7,45,1.51969133377075
## P7,7,46,1.48828385738616
## P7,7,47,1.50844578473073
## P7,7,48,1.50221766744341
## P7,7,49,1.51863061257128
## P7,7,50,1.50435538624608
## P7,8,1,1.51677188873291
## P7,8,2,1.50222724676132
## P7,8,3,1.50592879189385
## P7,8,4,1.51008676713513
## P7,8,5,1.50763720796819
## P7,8,6,1.51125143088546
## P7,8,7,1.49891376495361
## P7,8,8,1.50446199519294
## P7,8,9,1.51278936862946
## P7,8,10,1.49593858718872
## P7,8,11,1.50688665707906
## P7,8,12,1.50790421168009
## P7,8,13,1.51209657722049
## P7,8,14,1.50931805830735
## P7,8,15,1.50547121792305
## P7,8,16,1.50801664743668
## P7,8,17,1.5067197136257
## P7,8,18,1.53178532648895
## P7,8,19,1.50754892601157
## P7,8,20,1.50280870825557
## P7,8,21,1.51087051923158
## P7,8,22,1.51022894454725
## P7,8,23,1.51025175011676
## P7,8,24,1.51199457168579
## P7,8,25,1.52296841555628
## P7,8,26,1.51321896966898
## P7,8,27,1.51450844911429
## P7,8,28,1.51873588562012
## P7,8,29,1.51069822544005
## P7,8,30,1.50892064882361
## P7,8,31,1.50909532083047
## P7,8,32,1.50807723999023
## P7,8,33,1.5128431892395
## P7,8,34,1.50872051148188
## P7,8,35,1.51133893217359
## P7,8,36,1.52270450592041
## P7,8,37,1.50384544839664
## P7,8,38,1.50687558978212
## P7,8,39,1.52535856471342
## P7,8,40,1.5132379680872
## P7,8,41,1.51620887219906
## P7,8,42,1.51331080781653
## P7,8,43,1.5117351091825
## P7,8,44,1.50822178522746
## P7,8,45,1.51219344693561
## P7,8,46,1.50827717781067
## P7,8,47,1.51036783059438
## P7,8,48,1.5042387008667
## P7,8,49,1.50981392463048
## P7,8,50,1.50547574727963
## P7,9,1,1.50845259633558
## P7,9,2,1.51625919342041
## P7,9,3,1.5134067342088
## P7,9,4,1.50561138101526
## P7,9,5,1.49192819595337
## P7,9,6,1.51019301133997
## P7,9,7,1.5143173352266
## P7,9,8,1.51330925868108
## P7,9,9,1.50781893730164
## P7,9,10,1.51630952954292
## P7,9,11,1.51388956518734
## P7,9,12,1.51189749816368
## P7,9,13,1.50761971575149
## P7,9,14,1.50537058801362
## P7,9,15,1.49584912031125
## P7,9,16,1.50728502538469
## P7,9,17,1.50473328025974
## P7,9,18,1.51165139047723
## P7,9,19,1.51170219480991
## P7,9,20,1.50898990847848
## P7,9,21,1.50991897997649
## P7,9,22,1.50994629402683
## P7,9,23,1.51510831287929
## P7,9,24,1.50841835566929
## P7,9,25,1.50712225653908
## P7,9,26,1.51051878929138
## P7,9,27,1.51353366324242
## P7,9,28,1.51370087004544
## P7,9,29,1.51211579356875
## P7,9,30,1.52492016553879
## P7,9,31,1.51088230506234
## P7,9,32,1.51134330135281
## P7,9,33,1.51036512642576
## P7,9,34,1.51010683233088
## P7,9,35,1.51102238893509
## P7,9,36,1.51221256906336
## P7,9,37,1.52355630057199
## P7,9,38,1.50139922565884
## P7,9,39,1.51064642270406
## P7,9,40,1.50807533766094
## P7,9,41,1.50562445322673
## P7,9,42,1.5102929682345
## P7,9,43,1.51541039773396
## P7,9,44,1.50544721603394
## P7,9,45,1.51457466645674
## P7,9,46,1.5119060162575
## P7,9,47,1.50964723784348
## P7,9,48,1.50261032815073
## P7,9,49,1.51742299397786
## P7,9,50,1.50575200716654
## P7,10,1,1.48959561756679
## P7,10,2,1.51581606864929
## P7,10,3,1.52436727158567
## P7,10,4,1.49856240173866
## P7,10,5,1.50745250438822
## P7,10,6,1.52415139334542
## P7,10,7,1.50795905534611
## P7,10,8,1.5245018127637
## P7,10,9,1.4825047295669
## P7,10,10,1.52257019281387
## P7,10,11,1.53223592143948
## P7,10,12,1.48918905258179
## P7,10,13,1.56465659822736
## P7,10,14,1.48656904255902
## P7,10,15,1.48789988623725
## P7,10,16,1.51596149154331
## P7,10,17,1.49083398109259
## P7,10,18,1.57006597518921
## P7,10,19,1.47177733824803
## P7,10,20,1.53513476962135
## P7,10,21,1.49796591085546
## P7,10,22,1.49479776747683
## P7,10,23,1.50272402763367
## P7,10,24,1.50430487297677
## P7,10,25,1.52026235312223
## P7,10,26,1.41398236626073
## P7,10,27,1.50995279180593
## P7,10,28,1.54439988590422
## P7,10,29,1.51814751327038
## P7,10,30,1.52731695175171
## P7,10,31,1.48552091916402
## P7,10,32,1.50471653388097
## P7,10,33,1.51767244495329
## P7,10,34,1.50238104789488
## P7,10,35,1.52123453742579
## P7,10,36,1.51603439242341
## P7,10,37,1.46326447416235
## P7,10,38,1.5286389211329
## P7,10,39,1.52011966705322
## P7,10,40,1.51583119481802
## P7,10,41,1.50293479515956
## P7,10,42,1.52764313561576
## P7,10,43,1.49753719284421
## P7,10,44,1.51741016762597
## P7,10,45,1.49246528148651
## P7,10,46,1.52813089595121
## P7,10,47,1.54958827872025
## P7,10,48,1.45211744308472
## P7,10,49,1.53131363732474
## P7,10,50,1.50564980774783
## P8,1,1,1.51483290731622
## P8,1,2,1.51092513676347
## P8,1,3,1.51217938775886
## P8,1,4,1.51189477897129
## P8,1,5,1.51377663224242
## P8,1,6,1.51478895629193
## P8,1,7,1.51345940848082
## P8,1,8,1.5098281413053
## P8,1,9,1.51177803986992
## P8,1,10,1.51115538400896
## P8,1,11,1.50782211290465
## P8,1,12,1.51420201838595
## P8,1,13,1.51018354752484
## P8,1,14,1.51290129571065
## P8,1,15,1.50958059492154
## P8,1,16,1.51085309705872
## P8,1,17,1.50714222692674
## P8,1,18,1.52233297960746
## P8,1,19,1.51085549033149
## P8,1,20,1.51147893269857
## P8,1,21,1.50913544147335
## P8,1,22,1.51520885184959
## P8,1,23,1.51088650829821
## P8,1,24,1.50941927578984
## P8,1,25,1.51305009537384
## P8,1,26,1.52351016738788
## P8,1,27,1.50947065466254
## P8,1,28,1.51590433007195
## P8,1,29,1.51607544380322
## P8,1,30,1.51500532660686
## P8,1,31,1.51062851481967
## P8,1,32,1.51434576511383
## P8,1,33,1.50709537595336
## P8,1,34,1.51450709000375
## P8,1,35,1.513319843418
## P8,1,36,1.5108235997039
## P8,1,37,1.51805950094152
## P8,1,38,1.50921695590637
## P8,1,39,1.51181191635132
## P8,1,40,1.51447062015533
## P8,1,41,1.50976974996802
## P8,1,42,1.51339269029921
## P8,1,43,1.51335759987508
## P8,1,44,1.51248985528946
## P8,1,45,1.50975467176998
## P8,1,46,1.5114519293137
## P8,1,47,1.51026391123866
## P8,1,48,1.51281962944911
## P8,1,49,1.51159565571027
## P8,1,50,1.51258482467531
## P8,2,1,1.50831770410343
## P8,2,2,1.51123230222245
## P8,2,3,1.51066651853543
## P8,2,4,1.52370880074697
## P8,2,5,1.51151849847091
## P8,2,6,1.51422778878893
## P8,2,7,1.50998210382986
## P8,2,8,1.51367993320493
## P8,2,9,1.51234101563049
## P8,2,10,1.51059270699819
## P8,2,11,1.5084912776947
## P8,2,12,1.51446779475493
## P8,2,13,1.50985261568656
## P8,2,14,1.50996037272664
## P8,2,15,1.5147821353032
## P8,2,16,1.51145139297882
## P8,2,17,1.51399814313458
## P8,2,18,1.51235063011582
## P8,2,19,1.50959636211395
## P8,2,20,1.51109392843514
## P8,2,21,1.51024591404459
## P8,2,22,1.51678256091909
## P8,2,23,1.51265406849408
## P8,2,24,1.50786567167802
## P8,2,25,1.51432409910398
## P8,2,26,1.51288392418309
## P8,2,27,1.51293146437493
## P8,2,28,1.51178858326931
## P8,2,29,1.51076603899098
## P8,2,30,1.51269213479894
## P8,2,31,1.50728435025496
## P8,2,32,1.51125736369027
## P8,2,33,1.51102891870447
## P8,2,34,1.51551632447676
## P8,2,35,1.50643325319477
## P8,2,36,1.51267116014348
## P8,2,37,1.5217394723997
## P8,2,38,1.52052301993737
## P8,2,39,1.51303652524948
## P8,2,40,1.51031262858384
## P8,2,41,1.50979692057559
## P8,2,42,1.5083104627473
## P8,2,43,1.5114658136162
## P8,2,44,1.50294111212906
## P8,2,45,1.50864378611247
## P8,2,46,1.51799074571524
## P8,2,47,1.50636946217398
## P8,2,48,1.51675299290688
## P8,2,49,1.51044269015149
## P8,2,50,1.50900060389981
## P8,3,1,1.51241320559853
## P8,3,2,1.51059462852085
## P8,3,3,1.51306496788474
## P8,3,4,1.51215138560847
## P8,3,5,1.5078247629363
## P8,3,6,1.50910835153252
## P8,3,7,1.51243548544626
## P8,3,8,1.50982899069786
## P8,3,9,1.51198740057893
## P8,3,10,1.50922090148926
## P8,3,11,1.51219460341307
## P8,3,12,1.51144051551819
## P8,3,13,1.50973265110946
## P8,3,14,1.51098530229769
## P8,3,15,1.51977325500326
## P8,3,16,1.51018776301465
## P8,3,17,1.51815443947202
## P8,3,18,1.51213454681894
## P8,3,19,1.51145562285897
## P8,3,20,1.51272354537635
## P8,3,21,1.50875476504979
## P8,3,22,1.51191847989348
## P8,3,23,1.50973224317705
## P8,3,24,1.51272849475636
## P8,3,25,1.51121146013948
## P8,3,26,1.51258001724879
## P8,3,27,1.51332088233599
## P8,3,28,1.50717930136056
## P8,3,29,1.51351995160503
## P8,3,30,1.5097485651841
## P8,3,31,1.51328504619314
## P8,3,32,1.51165796209265
## P8,3,33,1.5108380317688
## P8,3,34,1.51095689106457
## P8,3,35,1.51058538610285
## P8,3,36,1.5128076699647
## P8,3,37,1.5114989405364
## P8,3,38,1.51385687047785
## P8,3,39,1.51150235470305
## P8,3,40,1.51429933859101
## P8,3,41,1.51150382728111
## P8,3,42,1.50933509554182
## P8,3,43,1.51061086757209
## P8,3,44,1.50662853099682
## P8,3,45,1.510468067267
## P8,3,46,1.51036421718493
## P8,3,47,1.5122489741679
## P8,3,48,1.50944521063465
## P8,3,49,1.51194314275469
## P8,3,50,1.51079069317638
## P8,4,1,1.51380809652742
## P8,4,2,1.50370196309583
## P8,4,3,1.51467955782172
## P8,4,4,1.50736974598317
## P8,4,5,1.51408649875272
## P8,4,6,1.51527266599694
## P8,4,7,1.51041688259293
## P8,4,8,1.51212272379133
## P8,4,9,1.51163336192592
## P8,4,10,1.51179741697702
## P8,4,11,1.51212758284349
## P8,4,12,1.50928311908946
## P8,4,13,1.51223087062438
## P8,4,14,1.51152808361865
## P8,4,15,1.52562802380855
## P8,4,16,1.5117952903492
## P8,4,17,1.51283922000807
## P8,4,18,1.50982154376134
## P8,4,19,1.51423950717874
## P8,4,20,1.51038037737211
## P8,4,21,1.51216375360302
## P8,4,22,1.51028154362207
## P8,4,23,1.51060205179712
## P8,4,24,1.51068400144577
## P8,4,25,1.51084383238446
## P8,4,26,1.51197834631697
## P8,4,27,1.51227017844596
## P8,4,28,1.51350904048834
## P8,4,29,1.510000130639
## P8,4,30,1.51313189218736
## P8,4,31,1.51047349115561
## P8,4,32,1.51169093365365
## P8,4,33,1.50998432361163
## P8,4,34,1.5150021390712
## P8,4,35,1.51425728075432
## P8,4,36,1.51264961769706
## P8,4,37,1.51204815353315
## P8,4,38,1.51448969168166
## P8,4,39,1.50829106810465
## P8,4,40,1.50841381782439
## P8,4,41,1.51140711816509
## P8,4,42,1.51136243807805
## P8,4,43,1.51320049651833
## P8,4,44,1.5114197406639
## P8,4,45,1.51449680328369
## P8,4,46,1.5111817580003
## P8,4,47,1.50863057374954
## P8,4,48,1.51197454062375
## P8,4,49,1.51021908877189
## P8,4,50,1.51113607061034
## P8,5,1,1.513955218036
## P8,5,2,1.51243103809238
## P8,5,3,1.51740680738937
## P8,5,4,1.51012591912713
## P8,5,5,1.51081008846695
## P8,5,6,1.50358001898367
## P8,5,7,1.51008112605025
## P8,5,8,1.514806045345
## P8,5,9,1.50730830907822
## P8,5,10,1.51390754596607
## P8,5,11,1.50879133664645
## P8,5,12,1.51051321126483
## P8,5,13,1.51004930904933
## P8,5,14,1.50960755929714
## P8,5,15,1.50933324477889
## P8,5,16,1.51264402193901
## P8,5,17,1.51010910791295
## P8,5,18,1.51094892789733
## P8,5,19,1.51202070639
## P8,5,20,1.51027341418796
## P8,5,21,1.51230700016022
## P8,5,22,1.50993783323915
## P8,5,23,1.50828979577229
## P8,5,24,1.51056695104244
## P8,5,25,1.51181245034979
## P8,5,26,1.51631290515264
## P8,5,27,1.50923028359046
## P8,5,28,1.51730301095255
## P8,5,29,1.51283072381124
## P8,5,30,1.5134325512385
## P8,5,31,1.51081859083737
## P8,5,32,1.51176779288945
## P8,5,33,1.50856479378634
## P8,5,34,1.51013097455425
## P8,5,35,1.51123847708797
## P8,5,36,1.51031668383376
## P8,5,37,1.51350484192371
## P8,5,38,1.50715197753906
## P8,5,39,1.51025534329349
## P8,5,40,1.51012816327683
## P8,5,41,1.51144272348155
## P8,5,42,1.51280228635098
## P8,5,43,1.51014994299986
## P8,5,44,1.51069556992009
## P8,5,45,1.51285061469445
## P8,5,46,1.51101554450342
## P8,5,47,1.51033663931694
## P8,5,48,1.51541873555125
## P8,5,49,1.50278988690443
## P8,5,50,1.51175356810948
## P8,6,1,1.51198655660035
## P8,6,2,1.50887632091143
## P8,6,3,1.51239509946981
## P8,6,4,1.51243743407421
## P8,6,5,1.51305069282041
## P8,6,6,1.51160228645409
## P8,6,7,1.51287187102937
## P8,6,8,1.51296065510183
## P8,6,9,1.51097152765515
## P8,6,10,1.51213016976481
## P8,6,11,1.51247913615648
## P8,6,12,1.51079183254602
## P8,6,13,1.51154246800382
## P8,6,14,1.51260620022412
## P8,6,15,1.50919705877701
## P8,6,16,1.51084482952317
## P8,6,17,1.51014347509904
## P8,6,18,1.51233976982735
## P8,6,19,1.50155129215934
## P8,6,20,1.52296893535516
## P8,6,21,1.51046023934574
## P8,6,22,1.51014171139947
## P8,6,23,1.51063590114181
## P8,6,24,1.51227565459263
## P8,6,25,1.51310028464107
## P8,6,26,1.50981389151679
## P8,6,27,1.51255666753633
## P8,6,28,1.51037237048149
## P8,6,29,1.51142940373001
## P8,6,30,1.50981389586605
## P8,6,31,1.51196634947364
## P8,6,32,1.51016261209896
## P8,6,33,1.51207253009598
## P8,6,34,1.50857067519221
## P8,6,35,1.50951795188748
## P8,6,36,1.51170190175374
## P8,6,37,1.50848080614488
## P8,6,38,1.5086110813517
## P8,6,39,1.51079186400926
## P8,6,40,1.51097015539805
## P8,6,41,1.50946357679663
## P8,6,42,1.51199416300697
## P8,6,43,1.51225701747117
## P8,6,44,1.51025557154931
## P8,6,45,1.51045921473827
## P8,6,46,1.51167040055501
## P8,6,47,1.51030782718754
## P8,6,48,1.50983908772469
## P8,6,49,1.51205228859524
## P8,6,50,1.51199342200124
## P8,7,1,1.5138065582883
## P8,7,2,1.50566018752332
## P8,7,3,1.5137869236516
## P8,7,4,1.51188503130518
## P8,7,5,1.50680227506728
## P8,7,6,1.5144710308168
## P8,7,7,1.50799158868336
## P8,7,8,1.51669864871285
## P8,7,9,1.50948490522295
## P8,7,10,1.51162293442973
## P8,7,11,1.51279913630462
## P8,7,12,1.50993580947051
## P8,7,13,1.51019553134316
## P8,7,14,1.50960767836798
## P8,7,15,1.5081152111651
## P8,7,16,1.50648237692343
## P8,7,17,1.51052748271397
## P8,7,18,1.51026815556465
## P8,7,19,1.51141275818815
## P8,7,20,1.50882516124032
## P8,7,21,1.51265933472297
## P8,7,22,1.50985564592589
## P8,7,23,1.51364079366128
## P8,7,24,1.51179837427641
## P8,7,25,1.50900387635102
## P8,7,26,1.51008243201881
## P8,7,27,1.51225165730899
## P8,7,28,1.50808686841259
## P8,7,29,1.50868105767342
## P8,7,30,1.50968480505337
## P8,7,31,1.5095431726487
## P8,7,32,1.51167755336552
## P8,7,33,1.51028031048022
## P8,7,34,1.51099783327521
## P8,7,35,1.51409224258072
## P8,7,36,1.50965274908604
## P8,7,37,1.50983219796961
## P8,7,38,1.51003317014706
## P8,7,39,1.50998795474017
## P8,7,40,1.51039907555831
## P8,7,41,1.51255502920041
## P8,7,42,1.51007764396213
## P8,7,43,1.51098057741676
## P8,7,44,1.50978436894442
## P8,7,45,1.50893338521322
## P8,7,46,1.5159863996758
## P8,7,47,1.51287241923956
## P8,7,48,1.50868768076743
## P8,7,49,1.51696364963474
## P8,7,50,1.51163510962536
## P8,8,1,1.51042752685942
## P8,8,2,1.51203543476804
## P8,8,3,1.5073083626045
## P8,8,4,1.51306910707493
## P8,8,5,1.50992779457132
## P8,8,6,1.51101007510205
## P8,8,7,1.51049301137475
## P8,8,8,1.50970678108965
## P8,8,9,1.51066218734418
## P8,8,10,1.5106195586821
## P8,8,11,1.50921171965058
## P8,8,12,1.51324203030375
## P8,8,13,1.51135962785676
## P8,8,14,1.51290412471719
## P8,8,15,1.51375887585782
## P8,8,16,1.51424304051186
## P8,8,17,1.51054680424352
## P8,8,18,1.50932947593399
## P8,8,19,1.51086959071543
## P8,8,20,1.50722674257267
## P8,8,21,1.51196695196218
## P8,8,22,1.50943449313048
## P8,8,23,1.51271266553869
## P8,8,24,1.5117569734706
## P8,8,25,1.51147044678124
## P8,8,26,1.51050178070515
## P8,8,27,1.51161969941238
## P8,8,28,1.50722569823265
## P8,8,29,1.51262293779914
## P8,8,30,1.50999871422263
## P8,8,31,1.51558783319261
## P8,8,32,1.50907135584268
## P8,8,33,1.50930161558824
## P8,8,34,1.51084281163043
## P8,8,35,1.51028474584802
## P8,8,36,1.51097008469817
## P8,8,37,1.50945308310854
## P8,8,38,1.51107091501535
## P8,8,39,1.51135585165971
## P8,8,40,1.50934466686878
## P8,8,41,1.5088322655908
## P8,8,42,1.50919605617874
## P8,8,43,1.51150620677484
## P8,8,44,1.50928269375812
## P8,8,45,1.50861944985944
## P8,8,46,1.50750676610253
## P8,8,47,1.51233495755142
## P8,8,48,1.51068783075796
## P8,8,49,1.50999130521502
## P8,8,50,1.51015637228298
## P8,9,1,1.51126872206763
## P8,9,2,1.51227826581282
## P8,9,3,1.51233093722973
## P8,9,4,1.51211741272832
## P8,9,5,1.511833888897
## P8,9,6,1.50891927122338
## P8,9,7,1.51019464127005
## P8,9,8,1.51048616384039
## P8,9,9,1.51176845674684
## P8,9,10,1.51094302625367
## P8,9,11,1.5118672185474
## P8,9,12,1.50915313967698
## P8,9,13,1.51036116162186
## P8,9,14,1.51318857204989
## P8,9,15,1.50723353966133
## P8,9,16,1.51417874082734
## P8,9,17,1.51430257358906
## P8,9,18,1.50945730287521
## P8,9,19,1.50535222086413
## P8,9,20,1.51253482681549
## P8,9,21,1.50948617013834
## P8,9,22,1.51424218915033
## P8,9,23,1.50999222820952
## P8,9,24,1.5089081476426
## P8,9,25,1.51327196653787
## P8,9,26,1.5114484244971
## P8,9,27,1.51063384953335
## P8,9,28,1.51021044701338
## P8,9,29,1.51250127243669
## P8,9,30,1.51085965364974
## P8,9,31,1.50984612782796
## P8,9,32,1.50906829063937
## P8,9,33,1.51442095931147
## P8,9,34,1.50706412481225
## P8,9,35,1.51113814869146
## P8,9,36,1.5104526993791
## P8,9,37,1.50756999121772
## P8,9,38,1.51091479070438
## P8,9,39,1.50872623622417
## P8,9,40,1.51033648284706
## P8,9,41,1.51127872219333
## P8,9,42,1.50922273351001
## P8,9,43,1.50654121067213
## P8,9,44,1.51602984866957
## P8,9,45,1.5121986656189
## P8,9,46,1.50904508590698
## P8,9,47,1.51270037932362
## P8,9,48,1.51225142570058
## P8,9,49,1.51097863333566
## P8,9,50,1.51058774454552
## P8,10,1,1.51117928906491
## P8,10,2,1.51140314585542
## P8,10,3,1.51231039197821
## P8,10,4,1.51030248211276
## P8,10,5,1.5114831821524
## P8,10,6,1.51059977993643
## P8,10,7,1.51079612562101
## P8,10,8,1.51079108638148
## P8,10,9,1.51135964171831
## P8,10,10,1.51078806671442
## P8,10,11,1.51046764373779
## P8,10,12,1.51206693815631
## P8,10,13,1.51132982341867
## P8,10,14,1.50982754917468
## P8,10,15,1.51301491820572
## P8,10,16,1.5101476082435
## P8,10,17,1.50960004182509
## P8,10,18,1.51118294842593
## P8,10,19,1.51145205815633
## P8,10,20,1.51197812136482
## P8,10,21,1.50968062608762
## P8,10,22,1.51184555314342
## P8,10,23,1.5084595186957
## P8,10,24,1.51046885346337
## P8,10,25,1.51274719708402
## P8,10,26,1.50565952184249
## P8,10,27,1.51436451879041
## P8,10,28,1.51150072813034
## P8,10,29,1.5063315190767
## P8,10,30,1.51187770660609
## P8,10,31,1.51013231277466
## P8,10,32,1.51182243890233
## P8,10,33,1.51278257888296
## P8,10,34,1.50883558818272
## P8,10,35,1.51012496103214
## P8,10,36,1.51226226075903
## P8,10,37,1.50918086782678
## P8,10,38,1.51063852310181
## P8,10,39,1.51063061087099
## P8,10,40,1.50992097733896
## P8,10,41,1.50937884012858
## P8,10,42,1.51038785697588
## P8,10,43,1.5120479958189
## P8,10,44,1.51239891613231
## P8,10,45,1.51014711533064
## P8,10,46,1.51086473761138
## P8,10,47,1.50937135118834
## P8,10,48,1.51139037415788
## P8,10,49,1.51074387114725
## P8,10,50,1.51037551712816
## P9,1,1,1.50193536909003
## P9,1,2,1.51871646317569
## P9,1,3,1.50630400077156
## P9,1,4,1.51270042899196
## P9,1,5,1.51140473858785
## P9,1,6,1.51258819971124
## P9,1,7,1.51203251364243
## P9,1,8,1.5140336622106
## P9,1,9,1.51398307293445
## P9,1,10,1.51149596935365
## P9,1,11,1.50355572546682
## P9,1,12,1.51675947351393
## P9,1,13,1.50681099615806
## P9,1,14,1.52626149832797
## P9,1,15,1.50968521163308
## P9,1,16,1.50815752278204
## P9,1,17,1.51446731063141
## P9,1,18,1.50666922600039
## P9,1,19,1.5083874848371
## P9,1,20,1.51060398765232
## P9,1,21,1.51148626659856
## P9,1,22,1.51061407725016
## P9,1,23,1.50727239522067
## P9,1,24,1.51268510050422
## P9,1,25,1.51758533241475
## P9,1,26,1.50770626068115
## P9,1,27,1.51329828371668
## P9,1,28,1.50440551616527
## P9,1,29,1.50117672190947
## P9,1,30,1.5576210494869
## P9,1,31,1.48171234321594
## P9,1,32,1.51107913675443
## P9,1,33,1.51002554166115
## P9,1,34,1.51294302940369
## P9,1,35,1.51130721219786
## P9,1,36,1.51149298765949
## P9,1,37,1.50575660458572
## P9,1,38,1.5198619140769
## P9,1,39,1.51115029198783
## P9,1,40,1.50737928822093
## P9,1,41,1.50685270258922
## P9,1,42,1.50842436243979
## P9,1,43,1.51347887749765
## P9,1,44,1.51286725721497
## P9,1,45,1.51355370315346
## P9,1,46,1.50709854055334
## P9,1,47,1.49655846529787
## P9,1,48,1.50651345088564
## P9,1,49,1.51559043086432
## P9,1,50,1.510774100071
## P9,2,1,1.51088484903661
## P9,2,2,1.51248090020541
## P9,2,3,1.50756779584018
## P9,2,4,1.51086873614911
## P9,2,5,1.50926036575214
## P9,2,6,1.51208989620209
## P9,2,7,1.51013088617168
## P9,2,8,1.51345996090966
## P9,2,9,1.50982688703845
## P9,2,10,1.5075112355722
## P9,2,11,1.50905989072262
## P9,2,12,1.51142521162291
## P9,2,13,1.51445258747448
## P9,2,14,1.51205020084559
## P9,2,15,1.51423485067826
## P9,2,16,1.51091012016672
## P9,2,17,1.51270044069349
## P9,2,18,1.50683458059426
## P9,2,19,1.50807667970657
## P9,2,20,1.5072777789572
## P9,2,21,1.51237383965523
## P9,2,22,1.51442813873291
## P9,2,23,1.50572869637433
## P9,2,24,1.50806401793365
## P9,2,25,1.50645453135173
## P9,2,26,1.50662555085852
## P9,2,27,1.51358413696289
## P9,2,28,1.51060696939627
## P9,2,29,1.49948598476166
## P9,2,30,1.50679869280604
## P9,2,31,1.50356996059418
## P9,2,32,1.50263005495071
## P9,2,33,1.49531189600627
## P9,2,34,1.53275777982629
## P9,2,35,1.52512168884277
## P9,2,36,1.49919388510964
## P9,2,37,1.51303660869598
## P9,2,38,1.51135806242625
## P9,2,39,1.50471131006877
## P9,2,40,1.48446658941416
## P9,2,41,1.51257173373149
## P9,2,42,1.51517792751915
## P9,2,43,1.50534203882967
## P9,2,44,1.51103350000644
## P9,2,45,1.51112495335666
## P9,2,46,1.51843773269653
## P9,2,47,1.50743760484638
## P9,2,48,1.50356441405084
## P9,2,49,1.51200210312266
## P9,2,50,1.50944375235399
## P9,3,1,1.51035573419216
## P9,3,2,1.50907668880388
## P9,3,3,1.51140360864217
## P9,3,4,1.50851457794278
## P9,3,5,1.50952277864729
## P9,3,6,1.50868092477322
## P9,3,7,1.51044740839901
## P9,3,8,1.50933521214653
## P9,3,9,1.50982093811035
## P9,3,10,1.51113845534244
## P9,3,11,1.50942963820237
## P9,3,12,1.50980315208435
## P9,3,13,1.51033805364586
## P9,3,14,1.5105593137652
## P9,3,15,1.50987934470177
## P9,3,16,1.51291016036389
## P9,3,17,1.51090668110137
## P9,3,18,1.51081753989397
## P9,3,19,1.51157273708935
## P9,3,20,1.51069508865476
## P9,3,21,1.51109791174531
## P9,3,22,1.51086744895348
## P9,3,23,1.51253405950403
## P9,3,24,1.50954333348061
## P9,3,25,1.51124474334717
## P9,3,26,1.51001668787327
## P9,3,27,1.51675447870473
## P9,3,28,1.51017334277813
## P9,3,29,1.51116506755352
## P9,3,30,1.51149525849716
## P9,3,31,1.50894571583847
## P9,3,32,1.5067873954773
## P9,3,33,1.51078603287374
## P9,3,34,1.51071434161242
## P9,3,35,1.50872717901718
## P9,3,36,1.51132629628767
## P9,3,37,1.50869207140766
## P9,3,38,1.50741140692084
## P9,3,39,1.5100300893551
## P9,3,40,1.512360068987
## P9,3,41,1.51108951228006
## P9,3,42,1.51100561022758
## P9,3,43,1.50787404439982
## P9,3,44,1.51119198924617
## P9,3,45,1.5110186193591
## P9,3,46,1.51132451946085
## P9,3,47,1.50936528769406
## P9,3,48,1.50922103198069
## P9,3,49,1.51244158378014
## P9,3,50,1.51131554049347
## P9,4,1,1.51184010362911
## P9,4,2,1.50996598175594
## P9,4,3,1.51194983859395
## P9,4,4,1.50935161830298
## P9,4,5,1.50914023555605
## P9,4,6,1.50566200244646
## P9,4,7,1.51095129716843
## P9,4,8,1.51053976068402
## P9,4,9,1.50971720695496
## P9,4,10,1.50878803478265
## P9,4,11,1.51082525862024
## P9,4,12,1.50994143383108
## P9,4,13,1.50844518162987
## P9,4,14,1.51189750227435
## P9,4,15,1.51124517078506
## P9,4,16,1.51176591055734
## P9,4,17,1.50988265653936
## P9,4,18,1.51060072283878
## P9,4,19,1.50794192201951
## P9,4,20,1.50948921364931
## P9,4,21,1.51120671175294
## P9,4,22,1.51001081996494
## P9,4,23,1.51107151333879
## P9,4,24,1.50978948130752
## P9,4,25,1.51039815495032
## P9,4,26,1.50678655836317
## P9,4,27,1.51181347973375
## P9,4,28,1.50806365067931
## P9,4,29,1.50768517572945
## P9,4,30,1.511919805319
## P9,4,31,1.51190861293248
## P9,4,32,1.50987706932367
## P9,4,33,1.51202444990804
## P9,4,34,1.50917865679814
## P9,4,35,1.50835207319751
## P9,4,36,1.51021672040224
## P9,4,37,1.51028835508558
## P9,4,38,1.5092045719884
## P9,4,39,1.51148787604438
## P9,4,40,1.50993714052088
## P9,4,41,1.51111357616928
## P9,4,42,1.51015918285816
## P9,4,43,1.51226516480141
## P9,4,44,1.50995907912383
## P9,4,45,1.50507331931073
## P9,4,46,1.51336380342642
## P9,4,47,1.5124498139257
## P9,4,48,1.50901477705172
## P9,4,49,1.51054519139803
## P9,4,50,1.51133855025607
## P9,5,1,1.50974169317281
## P9,5,2,1.50983052805436
## P9,5,3,1.51082799209291
## P9,5,4,1.51083775560061
## P9,5,5,1.50936202588289
## P9,5,6,1.51087155111036
## P9,5,7,1.51029236347915
## P9,5,8,1.51135329902172
## P9,5,9,1.50960031110187
## P9,5,10,1.5108755847155
## P9,5,11,1.5107806901674
## P9,5,12,1.51120096137843
## P9,5,13,1.51026624791762
## P9,5,14,1.50973113034223
## P9,5,15,1.5110822897691
## P9,5,16,1.51138878108269
## P9,5,17,1.51047962841235
## P9,5,18,1.51133904737585
## P9,5,19,1.51148880908364
## P9,5,20,1.50958252442189
## P9,5,21,1.5095577337803
## P9,5,22,1.51170455750509
## P9,5,23,1.51105527245269
## P9,5,24,1.51042692557625
## P9,5,25,1.51057095982921
## P9,5,26,1.51079857084486
## P9,5,27,1.50970448682338
## P9,5,28,1.510419229559
## P9,5,29,1.51031005382538
## P9,5,30,1.51047845614158
## P9,5,31,1.51090982381035
## P9,5,32,1.50939354985397
## P9,5,33,1.50975633286811
## P9,5,34,1.51028511059359
## P9,5,35,1.50991201400757
## P9,5,36,1.50904121454696
## P9,5,37,1.50959789234659
## P9,5,38,1.50944120705533
## P9,5,39,1.51081870646959
## P9,5,40,1.51098901299155
## P9,5,41,1.50976057262982
## P9,5,42,1.51087165689793
## P9,5,43,1.51118762370868
## P9,5,44,1.51127093903562
## P9,5,45,1.50789126844117
## P9,5,46,1.5102553465595
## P9,5,47,1.51030516042942
## P9,5,48,1.50987966693178
## P9,5,49,1.5108403523763
## P9,5,50,1.50979663474219
## P9,6,1,1.50372140859467
## P9,6,2,1.51206864251031
## P9,6,3,1.50751140494096
## P9,6,4,1.5114383775255
## P9,6,5,1.50627400875092
## P9,6,6,1.51316635873583
## P9,6,7,1.51031804503056
## P9,6,8,1.51593782341545
## P9,6,9,1.50997205160878
## P9,6,10,1.51147127696446
## P9,6,11,1.51513235553417
## P9,6,12,1.51534124143196
## P9,6,13,1.51163239819663
## P9,6,14,1.50959732199228
## P9,6,15,1.50797239371708
## P9,6,16,1.51024896621704
## P9,6,17,1.52648696342072
## P9,6,18,1.50236599886859
## P9,6,19,1.51742296748691
## P9,6,20,1.49649130088696
## P9,6,21,1.51475720064981
## P9,6,22,1.51962572336197
## P9,6,23,1.50439803335402
## P9,6,24,1.50736572204098
## P9,6,25,1.52565696965093
## P9,6,26,1.50772833655067
## P9,6,27,1.50542572021484
## P9,6,28,1.51115836501122
## P9,6,29,1.5129161922411
## P9,6,30,1.51294756813283
## P9,6,31,1.51458964864892
## P9,6,32,1.51019574453433
## P9,6,33,1.51173651489345
## P9,6,34,1.50697100390295
## P9,6,35,1.51023524931107
## P9,6,36,1.51389727977492
## P9,6,37,1.51684597324085
## P9,6,38,1.50846079068306
## P9,6,39,1.50923842702593
## P9,6,40,1.50475048113473
## P9,6,41,1.50963721358985
## P9,6,42,1.51639500628696
## P9,6,43,1.510809583484
## P9,6,44,1.5166921259752
## P9,6,45,1.50720848575715
## P9,6,46,1.50514603152718
## P9,6,47,1.50597810745239
## P9,6,48,1.50896129330385
## P9,6,49,1.50091836378746
## P9,6,50,1.51442139215737
## P9,7,1,1.50932110629035
## P9,7,2,1.51037474626994
## P9,7,3,1.5105957421176
## P9,7,4,1.5101520039257
## P9,7,5,1.51018185340441
## P9,7,6,1.50843829567255
## P9,7,7,1.51133374652347
## P9,7,8,1.50964230519754
## P9,7,9,1.51067710166075
## P9,7,10,1.51043807543241
## P9,7,11,1.51103496799866
## P9,7,12,1.51062345504761
## P9,7,13,1.51034546635815
## P9,7,14,1.51133348918197
## P9,7,15,1.50967888960967
## P9,7,16,1.51144932558437
## P9,7,17,1.51013438082532
## P9,7,18,1.51100992664848
## P9,7,19,1.51009545787688
## P9,7,20,1.51077886085726
## P9,7,21,1.51024630379542
## P9,7,22,1.51034172650041
## P9,7,23,1.50996162891388
## P9,7,24,1.51045931505235
## P9,7,25,1.5100564153827
## P9,7,26,1.50943818611185
## P9,7,27,1.50988841470266
## P9,7,28,1.50991879403591
## P9,7,29,1.5105957515134
## P9,7,30,1.50879971840802
## P9,7,31,1.51068543788022
## P9,7,32,1.51037248929342
## P9,7,33,1.51029334039045
## P9,7,34,1.50963602127967
## P9,7,35,1.51036294654564
## P9,7,36,1.51080912858053
## P9,7,37,1.50994573361946
## P9,7,38,1.51026148577921
## P9,7,39,1.51134417889386
## P9,7,40,1.51110524995953
## P9,7,41,1.50842227782795
## P9,7,42,1.51178385519212
## P9,7,43,1.50824135000055
## P9,7,44,1.50909544512169
## P9,7,45,1.51169706414814
## P9,7,46,1.50906879226596
## P9,7,47,1.50974754165201
## P9,7,48,1.51091160774231
## P9,7,49,1.51022694195588
## P9,7,50,1.51063956715702
## P9,8,1,1.51947019065636
## P9,8,2,1.51528341281488
## P9,8,3,1.51704098383586
## P9,8,4,1.50629600975084
## P9,8,5,1.50908362238031
## P9,8,6,1.50922555358786
## P9,8,7,1.51102946933947
## P9,8,8,1.51224725258532
## P9,8,9,1.51123512193058
## P9,8,10,1.50270710242422
## P9,8,11,1.51978127054266
## P9,8,12,1.49862849133686
## P9,8,13,1.50898471887964
## P9,8,14,1.50721644973755
## P9,8,15,1.50962653640629
## P9,8,16,1.50461710367771
## P9,8,17,1.51529505213753
## P9,8,18,1.50764166252523
## P9,8,19,1.5245765097001
## P9,8,20,1.51109987650162
## P9,8,21,1.52739994389236
## P9,8,22,1.5057381994584
## P9,8,23,1.50909868065192
## P9,8,24,1.50545508433611
## P9,8,25,1.50877488234947
## P9,8,26,1.50883914511881
## P9,8,27,1.51301506360372
## P9,8,28,1.5087094622732
## P9,8,29,1.5144176864624
## P9,8,30,1.50735986917868
## P9,8,31,1.50919506169748
## P9,8,32,1.50259221683849
## P9,8,33,1.50900244884354
## P9,8,34,1.50859373203222
## P9,8,35,1.51580362977653
## P9,8,36,1.50485844460745
## P9,8,37,1.51144325911109
## P9,8,38,1.51350114293342
## P9,8,39,1.51569466695298
## P9,8,40,1.51014241894472
## P9,8,41,1.51336106657982
## P9,8,42,1.50357170265262
## P9,8,43,1.50608271064488
## P9,8,44,1.50711617686532
## P9,8,45,1.50553383305669
## P9,8,46,1.51358614781106
## P9,8,47,1.5164525642395
## P9,8,48,1.50751807277364
## P9,8,49,1.51060312945827
## P9,8,50,1.51558728040007
## P9,9,1,1.50636592945019
## P9,9,2,1.5071545461329
## P9,9,3,1.51066132651435
## P9,9,4,1.50848458210627
## P9,9,5,1.50793402989705
## P9,9,6,1.51340001328547
## P9,9,7,1.51695069741076
## P9,9,8,1.49619822161538
## P9,9,9,1.5199974861145
## P9,9,10,1.50635530267443
## P9,9,11,1.51425779744198
## P9,9,12,1.50366433662704
## P9,9,13,1.5114332485199
## P9,9,14,1.50534921884537
## P9,9,15,1.50789270034203
## P9,9,16,1.51991059364529
## P9,9,17,1.51270788594296
## P9,9,18,1.51171883486085
## P9,9,19,1.52608992355038
## P9,9,20,1.49887599783429
## P9,9,21,1.49103257563207
## P9,9,22,1.51022160771381
## P9,9,23,1.50186030809269
## P9,9,24,1.49775468034947
## P9,9,25,1.51654570367601
## P9,9,26,1.52714053119522
## P9,9,27,1.50500397895699
## P9,9,28,1.50837583439324
## P9,9,29,1.4992001834123
## P9,9,30,1.51718277466006
## P9,9,31,1.5048658573522
## P9,9,32,1.52416579863604
## P9,9,33,1.50183474100553
## P9,9,34,1.50925956078626
## P9,9,35,1.50761176215278
## P9,9,36,1.5184298192174
## P9,9,37,1.51269372980645
## P9,9,38,1.50277984142303
## P9,9,39,1.50891870514959
## P9,9,40,1.49350947444722
## P9,9,41,1.50554831387246
## P9,9,42,1.50438498717088
## P9,9,43,1.51483708078211
## P9,9,44,1.51237930122175
## P9,9,45,1.51072254396023
## P9,9,46,1.51573580024886
## P9,9,47,1.51071558567072
## P9,9,48,1.51029469505433
## P9,9,49,1.51171525319417
## P9,9,50,1.51227039215611
## P9,10,1,1.51123212388724
## P9,10,2,1.51066430740886
## P9,10,3,1.50953335421426
## P9,10,4,1.50950568154354
## P9,10,5,1.50999937469153
## P9,10,6,1.5106133717757
## P9,10,7,1.51092895126343
## P9,10,8,1.50709628702989
## P9,10,9,1.50492575990052
## P9,10,10,1.51102542160149
## P9,10,11,1.50958067910713
## P9,10,12,1.51029184309103
## P9,10,13,1.50987196827794
## P9,10,14,1.51073012164995
## P9,10,15,1.51485485111902
## P9,10,16,1.50251962805307
## P9,10,17,1.51178405264846
## P9,10,18,1.51599931716919
## P9,10,19,1.51845988079354
## P9,10,20,1.50994685552653
## P9,10,21,1.51098927406416
## P9,10,22,1.50441321680101
## P9,10,23,1.50417424478839
## P9,10,24,1.51498805152045
## P9,10,25,1.50958195599643
## P9,10,26,1.50925790088277
## P9,10,27,1.50685980103233
## P9,10,28,1.51311645034916
## P9,10,29,1.5184996030102
## P9,10,30,1.49967238375249
## P9,10,31,1.49728135267893
## P9,10,32,1.50652881001317
## P9,10,33,1.51151092001732
## P9,10,34,1.5155677830995
## P9,10,35,1.51084681046315
## P9,10,36,1.50660943626461
## P9,10,37,1.50687268008925
## P9,10,38,1.50681168178342
## P9,10,39,1.51464170676011
## P9,10,40,1.50184804285076
## P9,10,41,1.52025187166431
## P9,10,42,1.50784075046014
## P9,10,43,1.51224667106579
## P9,10,44,1.51283749973073
## P9,10,45,1.50820257127747
## P9,10,46,1.51032709012366
## P9,10,47,1.51122382554141
## P9,10,48,1.51077762434754
## P9,10,49,1.52125280308274
## P9,10,50,1.5135589429777
## P10,1,1,1.50773777411534
## P10,1,2,1.5100102584903
## P10,1,3,1.51855314109061
## P10,1,4,1.51732404415424
## P10,1,5,1.5086509372877
## P10,1,6,1.5140281530527
## P10,1,7,1.50659124458892
## P10,1,8,1.54534245259834
## P10,1,9,1.52207743507071
## P10,1,10,1.51677191257477
## P10,1,11,1.5162685860035
## P10,1,12,1.50771430333455
## P10,1,13,1.52472619536501
## P10,1,14,1.53553279240926
## P10,1,15,1.48180296387471
## P10,1,16,1.52340508543927
## P10,1,17,1.48137568412943
## P10,1,18,1.50834676341007
## P10,1,19,1.50899949281112
## P10,1,20,1.47779325483781
## P10,1,21,1.4844937554325
## P10,1,22,1.55071583938599
## P10,1,23,1.48113330306521
## P10,1,24,1.49998484111968
## P10,1,25,1.55537502619685
## P10,1,26,1.48039474683939
## P10,1,27,1.6019785006841
## P10,1,28,1.48932964410355
## P10,1,29,1.49995029653822
## P10,1,30,1.51574792617407
## P10,1,31,1.53312195179074
## P10,1,32,1.50383617196764
## P10,1,33,1.48062494316617
## P10,1,34,1.52805872038593
## P10,1,35,1.5602312036923
## P10,1,36,1.5132350437883
## P10,1,37,1.42118072509766
## P10,1,38,1.65215912185797
## P10,1,39,1.48893643927386
## P10,1,40,1.52503474675692
## P10,1,41,1.51475813514308
## P10,1,42,1.57571720759074
## P10,1,43,1.57780541117127
## P10,1,44,1.51100920849159
## P10,1,45,1.50511937875014
## P10,1,46,1.49523789307167
## P10,1,47,1.52676063296439
## P10,1,48,1.50128045698412
## P10,1,49,1.50955454943931
## P10,1,50,1.51960486365503
## P10,2,1,1.50144872259586
## P10,2,2,1.50353386463263
## P10,2,3,1.49987389824607
## P10,2,4,1.51633384051146
## P10,2,5,1.51749078787057
## P10,2,6,1.50895421970181
## P10,2,7,1.51697193292471
## P10,2,8,1.50507288407057
## P10,2,9,1.50560823776437
## P10,2,10,1.52071570016287
## P10,2,11,1.51756230644558
## P10,2,12,1.54545624394062
## P10,2,13,1.50911041380654
## P10,2,14,1.52210749047143
## P10,2,15,1.51536518189965
## P10,2,16,1.50872826068959
## P10,2,17,1.5266617361237
## P10,2,18,1.53376623131763
## P10,2,19,1.52023200331063
## P10,2,20,1.5029557756156
## P10,2,21,1.50655947860919
## P10,2,22,1.50881430249155
## P10,2,23,1.38179848983254
## P10,2,24,1.51958643935109
## P10,2,25,1.50182088634424
## P10,2,26,1.49581464539226
## P10,2,27,1.53864668533865
## P10,2,28,1.50285903816549
## P10,2,29,1.49488547549528
## P10,2,30,1.49855684083084
## P10,2,31,1.51599376876919
## P10,2,32,1.51905755360921
## P10,2,33,1.4889173071725
## P10,2,34,1.48938033724791
## P10,2,35,1.50984207233349
## P10,2,36,1.5199522716087
## P10,2,37,1.50080724396458
## P10,2,38,1.50695068286015
## P10,2,39,1.58784150522809
## P10,2,40,1.49851498177381
## P10,2,41,1.48505808223378
## P10,2,42,1.48130149841309
## P10,2,43,1.53373148355139
## P10,2,44,1.50720134753625
## P10,2,45,1.51421586326931
## P10,2,46,1.50628532940828
## P10,2,47,1.432174417037
## P10,2,48,1.5958399620462
## P10,2,49,1.51393011700023
## P10,2,50,1.50834289515553
## P10,3,1,1.49934033068215
## P10,3,2,1.49275519896527
## P10,3,3,1.49932168813852
## P10,3,4,1.51358718666241
## P10,3,5,1.49303089854229
## P10,3,6,1.50808372263049
## P10,3,7,1.54813872117263
## P10,3,8,1.48121286861932
## P10,3,9,1.48824084656579
## P10,3,10,1.50552600754632
## P10,3,11,1.49567898644341
## P10,3,12,1.51289379144017
## P10,3,13,1.50602730837735
## P10,3,14,1.51961778158165
## P10,3,15,1.59663279851278
## P10,3,16,1.47210185838782
## P10,3,17,1.43496302997365
## P10,3,18,1.46069281992286
## P10,3,19,1.47519638845997
## P10,3,20,1.4650137307214
## P10,3,21,1.63260821638436
## P10,3,22,1.51447527749198
## P10,3,23,1.51920625201443
## P10,3,24,1.54326891190935
## P10,3,25,1.51461210780674
## P10,3,26,1.63416092894798
## P10,3,27,1.54173207655549
## P10,3,28,1.47472920304253
## P10,3,29,1.50821723937988
## P10,3,30,1.52833729523879
## P10,3,31,1.53222008009215
## P10,3,32,1.52374257491185
## P10,3,33,1.49994057767531
## P10,3,34,1.53305938610664
## P10,3,35,1.52025248693383
## P10,3,36,1.60984553819821
## P10,3,37,1.46939775318775
## P10,3,38,1.47691712659948
## P10,3,39,1.51596051655459
## P10,3,40,1.55189700329557
## P10,3,41,1.49496286312739
## P10,3,42,1.61842977817242
## P10,3,43,1.49185692347013
## P10,3,44,1.43721781458173
## P10,3,45,1.47475049865078
## P10,3,46,1.54350365167377
## P10,3,47,1.48243833341097
## P10,3,48,1.55786217167264
## P10,3,49,1.41710140131697
## P10,3,50,1.46126730811787
## P10,4,1,1.49691433906555
## P10,4,2,1.51531303206155
## P10,4,3,1.49275037569877
## P10,4,4,1.53074438373248
## P10,4,5,1.51622799939887
## P10,4,6,1.52628089451208
## P10,4,7,1.54289054495143
## P10,4,8,1.48517455453948
## P10,4,9,1.49615694255364
## P10,4,10,1.51981304613359
## P10,4,11,1.51870159089096
## P10,4,12,1.50517712773143
## P10,4,13,1.51370994368596
## P10,4,14,1.50599841801625
## P10,4,15,1.52838445504506
## P10,4,16,1.50645143335516
## P10,4,17,1.48326503105883
## P10,4,18,1.5310146353218
## P10,4,19,1.50287232971191
## P10,4,20,1.51973317522521
## P10,4,21,1.52857999103825
## P10,4,22,1.54952882868903
## P10,4,23,1.50032873313968
## P10,4,24,1.51371333440145
## P10,4,25,1.53778836462233
## P10,4,26,1.48284593143979
## P10,4,27,1.57426702319168
## P10,4,28,1.50313229878743
## P10,4,29,1.51789651891237
## P10,4,30,1.52831765583583
## P10,4,31,1.51887763513101
## P10,4,32,1.4823370945999
## P10,4,33,1.52584793528572
## P10,4,34,1.51478045499778
## P10,4,35,1.52383369911374
## P10,4,36,1.54166298646193
## P10,4,37,1.51725222898084
## P10,4,38,1.49414222515546
## P10,4,39,1.48007150129838
## P10,4,40,1.53888541334993
## P10,4,41,1.52937438058071
## P10,4,42,1.45506811141968
## P10,4,43,1.49621530735131
## P10,4,44,1.47849376002947
## P10,4,45,1.52828022790334
## P10,4,46,1.42111231641072
## P10,4,47,1.49710236655341
## P10,4,48,1.5180197291904
## P10,4,49,1.52867986361186
## P10,4,50,1.51009655767871
## P10,5,1,1.48998319821095
## P10,5,2,1.4845870350479
## P10,5,3,1.44954406909454
## P10,5,4,1.5080189073787
## P10,5,5,1.49509225108407
## P10,5,6,1.51305833163562
## P10,5,7,1.53725899820742
## P10,5,8,1.49768566828902
## P10,5,9,1.5072264946424
## P10,5,10,1.51307785816682
## P10,5,11,1.49997734469037
## P10,5,12,1.522306671849
## P10,5,13,1.50285452433995
## P10,5,14,1.50900822132826
## P10,5,15,1.51275405636081
## P10,5,16,1.50666797728766
## P10,5,17,1.53061629948991
## P10,5,18,1.49149024792207
## P10,5,19,1.51979428894666
## P10,5,20,1.4902094523112
## P10,5,21,1.50725277850502
## P10,5,22,1.52016755875121
## P10,5,23,1.50337634178308
## P10,5,24,1.51058119819278
## P10,5,25,1.50423844092715
## P10,5,26,1.50560535255231
## P10,5,27,1.53338945107382
## P10,5,28,1.49612853978131
## P10,5,29,1.50344331485709
## P10,5,30,1.50767295890384
## P10,5,31,1.50175727738274
## P10,5,32,1.43848989594657
## P10,5,33,1.54176349937916
## P10,5,34,1.51220047248984
## P10,5,35,1.49664883561187
## P10,5,36,1.5191859420465
## P10,5,37,1.48859161283912
## P10,5,38,1.508816412517
## P10,5,39,1.50667419854332
## P10,5,40,1.50953611012163
## P10,5,41,1.50889176058482
## P10,5,42,1.5030929540333
## P10,5,43,1.49736685163519
## P10,5,44,1.51415661486184
## P10,5,45,1.50999207221545
## P10,5,46,1.4922752502637
## P10,5,47,1.53849951426188
## P10,5,48,1.50781365098624
## P10,5,49,1.51689419908039
## P10,5,50,1.51663614295379
## P10,6,1,1.49041962278062
## P10,6,2,1.52002723400409
## P10,6,3,1.49647166512229
## P10,6,4,1.51161276472026
## P10,6,5,1.51602047019535
## P10,6,6,1.51595860452794
## P10,6,7,1.49975187363832
## P10,6,8,1.51595114726646
## P10,6,9,1.5024248168582
## P10,6,10,1.51096401698347
## P10,6,11,1.4970894253131
## P10,6,12,1.51181023099781
## P10,6,13,1.51213515158927
## P10,6,14,1.50934908023247
## P10,6,15,1.51247444818186
## P10,6,16,1.52372993844928
## P10,6,17,1.50856590270996
## P10,6,18,1.51841723493167
## P10,6,19,1.51473049832205
## P10,6,20,1.50872583979184
## P10,6,21,1.51087963674951
## P10,6,22,1.50666919831307
## P10,6,23,1.51413225809733
## P10,6,24,1.51022950808207
## P10,6,25,1.51025643818815
## P10,6,26,1.50490388330424
## P10,6,27,1.51029405690203
## P10,6,28,1.51589901868035
## P10,6,29,1.50755627076704
## P10,6,30,1.50814006246369
## P10,6,31,1.50991929134476
## P10,6,32,1.50834298790048
## P10,6,33,1.50822478656111
## P10,6,34,1.50768846330189
## P10,6,35,1.5136526332182
## P10,6,36,1.50821497990535
## P10,6,37,1.50621650939764
## P10,6,38,1.51203325109662
## P10,6,39,1.51309590590628
## P10,6,40,1.51043537684849
## P10,6,41,1.50864606384837
## P10,6,42,1.50438037029532
## P10,6,43,1.50847900147532
## P10,6,44,1.51409351716348
## P10,6,45,1.50937208052604
## P10,6,46,1.5110735287742
## P10,6,47,1.50627965747185
## P10,6,48,1.50998234315352
## P10,6,49,1.51503578821818
## P10,6,50,1.50924137399552
## P10,7,1,1.5132951795319
## P10,7,2,1.51005907473357
## P10,7,3,1.51868679021534
## P10,7,4,1.51312412386355
## P10,7,5,1.50891665978865
## P10,7,6,1.51129599787154
## P10,7,7,1.51884580285926
## P10,7,8,1.51518498857816
## P10,7,9,1.50956974607525
## P10,7,10,1.51278250067084
## P10,7,11,1.51165539877755
## P10,7,12,1.50271063645681
## P10,7,13,1.51463073365232
## P10,7,14,1.50649056434631
## P10,7,15,1.50168585475487
## P10,7,16,1.53008790865336
## P10,7,17,1.51565493856158
## P10,7,18,1.50560500704009
## P10,7,19,1.51484532917247
## P10,7,20,1.51604903262594
## P10,7,21,1.50611347930376
## P10,7,22,1.51165117287054
## P10,7,23,1.51090187496609
## P10,7,24,1.51437651483636
## P10,7,25,1.5103439343603
## P10,7,26,1.49590785304705
## P10,7,27,1.52303410443393
## P10,7,28,1.50836067556221
## P10,7,29,1.50752580006917
## P10,7,30,1.51150404370349
## P10,7,31,1.50629047393799
## P10,7,32,1.51035888054792
## P10,7,33,1.51805785644886
## P10,7,34,1.51041165474922
## P10,7,35,1.50206584118782
## P10,7,36,1.5074617396826
## P10,7,37,1.51957661497827
## P10,7,38,1.50058824875776
## P10,7,39,1.513971118927
## P10,7,40,1.50870606303215
## P10,7,41,1.51579884120396
## P10,7,42,1.507748684413
## P10,7,43,1.49992369783336
## P10,7,44,1.50873201915196
## P10,7,45,1.51159481625808
## P10,7,46,1.50160622596741
## P10,7,47,1.52341278830727
## P10,7,48,1.50423624576666
## P10,7,49,1.50522994995117
## P10,7,50,1.51480901381549
## P10,8,1,1.50845321019491
## P10,8,2,1.51293400417675
## P10,8,3,1.51177050811904
## P10,8,4,1.50868842801975
## P10,8,5,1.50349510602715
## P10,8,6,1.51104251742363
## P10,8,7,1.5102342263512
## P10,8,8,1.50668889825994
## P10,8,9,1.50902640192132
## P10,8,10,1.51225388731275
## P10,8,11,1.50861363994832
## P10,8,12,1.51284090450832
## P10,8,13,1.52091232611209
## P10,8,14,1.50932698197417
## P10,8,15,1.50604865988907
## P10,8,16,1.50909685611725
## P10,8,17,1.51235903934999
## P10,8,18,1.50665952391544
## P10,8,19,1.50786239835951
## P10,8,20,1.51000432534651
## P10,8,21,1.50895186424255
## P10,8,22,1.50977554018535
## P10,8,23,1.51214380522032
## P10,8,24,1.5144943850381
## P10,8,25,1.50742170260503
## P10,8,26,1.50967751282912
## P10,8,27,1.51705734306407
## P10,8,28,1.50457000732422
## P10,8,29,1.5102958721774
## P10,8,30,1.51075092087621
## P10,8,31,1.50932063861769
## P10,8,32,1.50755252621391
## P10,8,33,1.50906445259272
## P10,8,34,1.51173285137523
## P10,8,35,1.50717439197359
## P10,8,36,1.51096949432835
## P10,8,37,1.51169377849216
## P10,8,38,1.50822025864989
## P10,8,39,1.50988570770415
## P10,8,40,1.513240820925
## P10,8,41,1.50968144037952
## P10,8,42,1.51489244188581
## P10,8,43,1.50909238075142
## P10,8,44,1.51584484236581
## P10,8,45,1.50980206096874
## P10,8,46,1.50871942628105
## P10,8,47,1.51615635892178
## P10,8,48,1.50855655381174
## P10,8,49,1.50655901908875
## P10,8,50,1.51182538784103
## P10,9,1,1.50688421942971
## P10,9,2,1.50727781627489
## P10,9,3,1.50739692506336
## P10,9,4,1.50899180587457
## P10,9,5,1.50583412561072
## P10,9,6,1.51349151835722
## P10,9,7,1.5134760125891
## P10,9,8,1.50497991522563
## P10,9,9,1.51377344712978
## P10,9,10,1.51329549721309
## P10,9,11,1.50929132667748
## P10,9,12,1.51115666956141
## P10,9,13,1.51240506902471
## P10,9,14,1.51608018080393
## P10,9,15,1.50793401082357
## P10,9,16,1.51688070297241
## P10,9,17,1.51708427107478
## P10,9,18,1.50438058085558
## P10,9,19,1.51161934956011
## P10,9,20,1.51019156724215
## P10,9,21,1.49882767417214
## P10,9,22,1.51364078692028
## P10,9,23,1.50389228820801
## P10,9,24,1.51720779172836
## P10,9,25,1.50509653593365
## P10,9,26,1.50634954316275
## P10,9,27,1.51226516480141
## P10,9,28,1.50746312206739
## P10,9,29,1.5119062181729
## P10,9,30,1.51225324913307
## P10,9,31,1.51311988392095
## P10,9,32,1.51142522110336
## P10,9,33,1.50954534068252
## P10,9,34,1.51127750873566
## P10,9,35,1.51133123238881
## P10,9,36,1.51019867142635
## P10,9,37,1.50886771845263
## P10,9,38,1.50819297631582
## P10,9,39,1.51277627211351
## P10,9,40,1.51167634245637
## P10,9,41,1.51110086812601
## P10,9,42,1.50773870583737
## P10,9,43,1.51009221510454
## P10,9,44,1.51085491930501
## P10,9,45,1.5101203918457
## P10,9,46,1.50952616759709
## P10,9,47,1.51101364260134
## P10,9,48,1.50777926687467
## P10,9,49,1.51014563055599
## P10,9,50,1.51151966555365
## P10,10,1,1.51113580962987
## P10,10,2,1.510039478302
## P10,10,3,1.51377897636563
## P10,10,4,1.51267036091198
## P10,10,5,1.50779975292295
## P10,10,6,1.51164771942865
## P10,10,7,1.50717965672525
## P10,10,8,1.51265634579605
## P10,10,9,1.51160868087617
## P10,10,10,1.50747079149299
## P10,10,11,1.51218048731486
## P10,10,12,1.50380430902754
## P10,10,13,1.51395539212818
## P10,10,14,1.51299704289904
## P10,10,15,1.5062250585267
## P10,10,16,1.5118691629293
## P10,10,17,1.51113814869146
## P10,10,18,1.5070816433948
## P10,10,19,1.51669866388494
## P10,10,20,1.50955713712252
## P10,10,21,1.50810695906817
## P10,10,22,1.51450570891885
## P10,10,23,1.51116085797548
## P10,10,24,1.50983085632324
## P10,10,25,1.5056159810016
## P10,10,26,1.51389976058687
## P10,10,27,1.5092011371129
## P10,10,28,1.50783330202103
## P10,10,29,1.51177484584305
## P10,10,30,1.50806828339895
## P10,10,31,1.50925262858359
## P10,10,32,1.5073540515088
## P10,10,33,1.50942471875983
## P10,10,34,1.51245176407599
## P10,10,35,1.50820910833715
## P10,10,36,1.51071545055934
## P10,10,37,1.51068672868941
## P10,10,38,1.51053987230573
## P10,10,39,1.51076607270674
## P10,10,40,1.51150578922696
## P10,10,41,1.50957952412692
## P10,10,42,1.51013616215099
## P10,10,43,1.50909303364001
## P10,10,44,1.50927444540936
## P10,10,45,1.50936272144318
## P10,10,46,1.51067762546711
## P10,10,47,1.51092298928793
## P10,10,48,1.50906578557832
## P10,10,49,1.51118765121851
## P10,10,50,1.51130698038184
## P11,1,1,1.51624982301579
## P11,1,2,1.52666337325655
## P11,1,3,1.50950988283697
## P11,1,4,1.50995355923971
## P11,1,5,1.50362672157658
## P11,1,6,1.51982937607111
## P11,1,7,1.51252320804427
## P11,1,8,1.5148683134115
## P11,1,9,1.51445637765478
## P11,1,10,1.50627110336001
## P11,1,11,1.51495213275189
## P11,1,12,1.50755803982417
## P11,1,13,1.5066329117479
## P11,1,14,1.51513996809543
## P11,1,15,1.51924863614534
## P11,1,16,1.50353105529016
## P11,1,17,1.50636104515621
## P11,1,18,1.50359123631528
## P11,1,19,1.51616152488824
## P11,1,20,1.51630659664378
## P11,1,21,1.50544379335461
## P11,1,22,1.5108582885177
## P11,1,23,1.50707254781351
## P11,1,24,1.51462390025457
## P11,1,25,1.51069392791161
## P11,1,26,1.5092449337244
## P11,1,27,1.51203927736025
## P11,1,28,1.51825521658133
## P11,1,29,1.51749787363065
## P11,1,30,1.52361376966749
## P11,1,31,1.49432648931231
## P11,1,32,1.51701454321543
## P11,1,33,1.52647202649562
## P11,1,34,1.51604957503032
## P11,1,35,1.50006995411039
## P11,1,36,1.49842418009235
## P11,1,37,1.50883151803698
## P11,1,38,1.52675803378224
## P11,1,39,1.51025989509764
## P11,1,40,1.51160176148575
## P11,1,41,1.51720629757597
## P11,1,42,1.49903042133038
## P11,1,43,1.53048227842037
## P11,1,44,1.50088961674617
## P11,1,45,1.51175883039832
## P11,1,46,1.50445531135382
## P11,1,47,1.51108181672018
## P11,1,48,1.50779970486959
## Warning: There are no valid values for INTERVALS=49 in LISTP11[[1]]
## Warning: There are no valid values for INTERVALS=50 in LISTP11[[1]]
## P11,2,1,1.50954313356368
## P11,2,2,1.50890082120895
## P11,2,3,1.50968108334384
## P11,2,4,1.50915428351241
## P11,2,5,1.50797804066392
## P11,2,6,1.51167310201205
## P11,2,7,1.51088618546081
## P11,2,8,1.51109791795413
## P11,2,9,1.51079863593692
## P11,2,10,1.50734370609499
## P11,2,11,1.51127463634883
## P11,2,12,1.51289290420769
## P11,2,13,1.51051882207394
## P11,2,14,1.50963800390002
## P11,2,15,1.5107102646733
## P11,2,16,1.51223088086136
## P11,2,17,1.5111301250236
## P11,2,18,1.51127760646907
## P11,2,19,1.50857958426842
## P11,2,20,1.51104250748952
## P11,2,21,1.51134931177333
## P11,2,22,1.51209248209292
## P11,2,23,1.51069026244314
## P11,2,24,1.51290520377781
## P11,2,25,1.51261822688274
## P11,2,26,1.51099452132699
## P11,2,27,1.51015528986009
## P11,2,28,1.51052072443114
## P11,2,29,1.51235002866933
## P11,2,30,1.50495660132256
## P11,2,31,1.51424205921314
## P11,2,32,1.51413902483488
## P11,2,33,1.5085969304705
## P11,2,34,1.51280959894959
## P11,2,35,1.50901326835155
## P11,2,36,1.5076809724172
## P11,2,37,1.50960188581232
## P11,2,38,1.5127336602462
## P11,2,39,1.50900822683097
## P11,2,40,1.50990569440624
## P11,2,41,1.50435934840022
## P11,2,42,1.51175797849462
## P11,2,43,1.51261783584835
## P11,2,44,1.51186087219803
## P11,2,45,1.50832813436335
## P11,2,46,1.51149109474518
## P11,2,47,1.5120468934377
## P11,2,48,1.51290445119305
## P11,2,49,1.51139538965107
## P11,2,50,1.50723128962057
## P11,3,1,1.51163888109323
## P11,3,2,1.51072729924682
## P11,3,3,1.51056334584258
## P11,3,4,1.51258987713354
## P11,3,5,1.50968459506094
## P11,3,6,1.51156145684859
## P11,3,7,1.51175272173998
## P11,3,8,1.51036515235901
## P11,3,9,1.51201970988306
## P11,3,10,1.50380533877934
## P11,3,11,1.51289521602162
## P11,3,12,1.51264010156904
## P11,3,13,1.51069197761879
## P11,3,14,1.51211253397882
## P11,3,15,1.51360641746986
## P11,3,16,1.50996681895569
## P11,3,17,1.5121788940122
## P11,3,18,1.51471043558954
## P11,3,19,1.50555656888158
## P11,3,20,1.51315860748291
## P11,3,21,1.50982211560619
## P11,3,22,1.51131904587265
## P11,3,23,1.51076358123865
## P11,3,24,1.51131412078594
## P11,3,25,1.51367966752303
## P11,3,26,1.50968926255874
## P11,3,27,1.51149914680271
## P11,3,28,1.51144146119188
## P11,3,29,1.51007493780978
## P11,3,30,1.51080675799437
## P11,3,31,1.51296135902405
## P11,3,32,1.51126266780653
## P11,3,33,1.50950504938761
## P11,3,34,1.50964632415771
## P11,3,35,1.52159354561254
## P11,3,36,1.51638954527238
## P11,3,37,1.51030409192464
## P11,3,38,1.51163342829501
## P11,3,39,1.51207670753385
## P11,3,40,1.50715793997554
## P11,3,41,1.5023775100708
## P11,3,42,1.51223788468734
## P11,3,43,1.51120237593955
## P11,3,44,1.50926993035863
## P11,3,45,1.51387161756084
## P11,3,46,1.50922925071379
## P11,3,47,1.51220530933804
## P11,3,48,1.50814168952232
## P11,3,49,1.51168002022637
## P11,3,50,1.51117833268957
## P11,4,1,1.51062458050177
## P11,4,2,1.51195412919722
## P11,4,3,1.51108600382219
## P11,4,4,1.51139440961704
## P11,4,5,1.50938605604501
## P11,4,6,1.50908996402353
## P11,4,7,1.5119396692299
## P11,4,8,1.51052687231418
## P11,4,9,1.50858301586575
## P11,4,10,1.51278628724994
## P11,4,11,1.51292831862151
## P11,4,12,1.51047017558521
## P11,4,13,1.51077245447757
## P11,4,14,1.51093140725167
## P11,4,15,1.51114738727438
## P11,4,16,1.51158224121999
## P11,4,17,1.50971866954457
## P11,4,18,1.51097075552003
## P11,4,19,1.50915575363267
## P11,4,20,1.50871918583644
## P11,4,21,1.51127415895462
## P11,4,22,1.50938818129626
## P11,4,23,1.51077690720558
## P11,4,24,1.50698110749645
## P11,4,25,1.51259653384869
## P11,4,26,1.51101706843627
## P11,4,27,1.51135539690653
## P11,4,28,1.50819603989764
## P11,4,29,1.51121942115867
## P11,4,30,1.51241681984896
## P11,4,31,1.51051261783701
## P11,4,32,1.51061954273014
## P11,4,33,1.50737806788662
## P11,4,34,1.51339125783189
## P11,4,35,1.51250320085337
## P11,4,36,1.50954533314359
## P11,4,37,1.51143199856542
## P11,4,38,1.51068373064024
## P11,4,39,1.50856702384495
## P11,4,40,1.51082373645208
## P11,4,41,1.51057521137623
## P11,4,42,1.50995983248172
## P11,4,43,1.51132387785042
## P11,4,44,1.51106841904776
## P11,4,45,1.50453044991744
## P11,4,46,1.51406051266578
## P11,4,47,1.51787053214179
## P11,4,48,1.50394964796124
## P11,4,49,1.52092484929668
## P11,4,50,1.51160478591919
## P11,5,1,1.5114590071298
## P11,5,2,1.51180317666796
## P11,5,3,1.51090937998237
## P11,5,4,1.5098510998946
## P11,5,5,1.5087708575385
## P11,5,6,1.51258517173399
## P11,5,7,1.50898090863632
## P11,5,8,1.50964803415186
## P11,5,9,1.50965405267382
## P11,5,10,1.50895370755877
## P11,5,11,1.51825378473523
## P11,5,12,1.50552403152763
## P11,5,13,1.51252925837481
## P11,5,14,1.51116249872291
## P11,5,15,1.50624192077502
## P11,5,16,1.5166469335556
## P11,5,17,1.51560584219491
## P11,5,18,1.49804759025574
## P11,5,19,1.51689847137617
## P11,5,20,1.50222602757541
## P11,5,21,1.51086074075881
## P11,5,22,1.52175630789537
## P11,5,23,1.50612220372239
## P11,5,24,1.50539066277298
## P11,5,25,1.50629892602431
## P11,5,26,1.50793951384875
## P11,5,27,1.51250169257156
## P11,5,28,1.51166118894305
## P11,5,29,1.51452936845667
## P11,5,30,1.51008855574059
## P11,5,31,1.51163511516667
## P11,5,32,1.50221049359867
## P11,5,33,1.52008919349084
## P11,5,34,1.50243098571383
## P11,5,35,1.51376669406891
## P11,5,36,1.50918447971344
## P11,5,37,1.51205502765279
## P11,5,38,1.51042439774697
## P11,5,39,1.51045214046131
## P11,5,40,1.51167423941872
## P11,5,41,1.51421147584915
## P11,5,42,1.50978031754494
## P11,5,43,1.51118241597528
## P11,5,44,1.5099912349533
## P11,5,45,1.51116338173548
## P11,5,46,1.5101412050426
## P11,5,47,1.50629246629627
## P11,5,48,1.50838466866376
## P11,5,49,1.51103646271712
## P11,5,50,1.51048527382038
## P11,6,1,1.50900822195388
## P11,6,2,1.51241061137273
## P11,6,3,1.51111984637476
## P11,6,4,1.51168382609332
## P11,6,5,1.51116860001176
## P11,6,6,1.51104156554691
## P11,6,7,1.51134098589031
## P11,6,8,1.51243483265744
## P11,6,9,1.51127921494862
## P11,6,10,1.51299496312295
## P11,6,11,1.51078278410668
## P11,6,12,1.51028384764989
## P11,6,13,1.51118140785318
## P11,6,14,1.51467320904042
## P11,6,15,1.50877695613437
## P11,6,16,1.50791599926533
## P11,6,17,1.51787051448116
## P11,6,18,1.50977482940211
## P11,6,19,1.51189801792899
## P11,6,20,1.51172230541706
## P11,6,21,1.50433541238308
## P11,6,22,1.51311918160854
## P11,6,23,1.51068009117435
## P11,6,24,1.51232703436505
## P11,6,25,1.51091638085438
## P11,6,26,1.50964658507884
## P11,6,27,1.51144641324093
## P11,6,28,1.51039114686632
## P11,6,29,1.51240867746287
## P11,6,30,1.50795432855917
## P11,6,31,1.51281634012858
## P11,6,32,1.51241980914412
## P11,6,33,1.51091296290174
## P11,6,34,1.51121138054648
## P11,6,35,1.51174527325042
## P11,6,36,1.51103928274737
## P11,6,37,1.50833060409849
## P11,6,38,1.51027661400872
## P11,6,39,1.51111095847813
## P11,6,40,1.5092499256134
## P11,6,41,1.51005180410091
## P11,6,42,1.51040375516528
## P11,6,43,1.50777117206204
## P11,6,44,1.51494284405734
## P11,6,45,1.50878150448828
## P11,6,46,1.51788563728333
## P11,6,47,1.50668517212195
## P11,6,48,1.51365665955977
## P11,6,49,1.51058990092365
## P11,6,50,1.51125598715865
## P11,7,1,1.5114913591698
## P11,7,2,1.5116750862025
## P11,7,3,1.51051559755879
## P11,7,4,1.51337175647708
## P11,7,5,1.50661073192473
## P11,7,6,1.51212188215817
## P11,7,7,1.51173102246584
## P11,7,8,1.51052835752379
## P11,7,9,1.51519185253698
## P11,7,10,1.50906732241313
## P11,7,11,1.51035636901855
## P11,7,12,1.51115666695361
## P11,7,13,1.51159783204397
## P11,7,14,1.51017880159266
## P11,7,15,1.51023341353828
## P11,7,16,1.50988807803706
## P11,7,17,1.51220896130516
## P11,7,18,1.51123965456245
## P11,7,19,1.51158964390657
## P11,7,20,1.50959415146799
## P11,7,21,1.51004958963719
## P11,7,22,1.51120692837623
## P11,7,23,1.50843531643903
## P11,7,24,1.51061955640014
## P11,7,25,1.51113181031508
## P11,7,26,1.51154101788998
## P11,7,27,1.51109587189055
## P11,7,28,1.51077095134146
## P11,7,29,1.5111660901566
## P11,7,30,1.50870246772307
## P11,7,31,1.51203535935458
## P11,7,32,1.51135955033479
## P11,7,33,1.51136927141084
## P11,7,34,1.50997727400773
## P11,7,35,1.51088811026679
## P11,7,36,1.50976726043323
## P11,7,37,1.51017548343328
## P11,7,38,1.51135413085713
## P11,7,39,1.51199885177612
## P11,7,40,1.51001529693604
## P11,7,41,1.50957369656296
## P11,7,42,1.51101728028889
## P11,7,43,1.51139558019814
## P11,7,44,1.50852678461773
## P11,7,45,1.50999357374452
## P11,7,46,1.51010949663121
## P11,7,47,1.51088339543482
## P11,7,48,1.51119434542772
## P11,7,49,1.51151232783859
## P11,7,50,1.51090219136207
## P11,8,1,1.51202818962835
## P11,8,2,1.50987545980348
## P11,8,3,1.51094849998429
## P11,8,4,1.51056309110799
## P11,8,5,1.51112840328997
## P11,8,6,1.51132987942216
## P11,8,7,1.51085417873257
## P11,8,8,1.51053715023127
## P11,8,9,1.5103270536775
## P11,8,10,1.51115978108665
## P11,8,11,1.51110617106393
## P11,8,12,1.51148592609249
## P11,8,13,1.51231596503459
## P11,8,14,1.51156581968269
## P11,8,15,1.50998883928571
## P11,8,16,1.51094629381086
## P11,8,17,1.51114115042564
## P11,8,18,1.51060406978314
## P11,8,19,1.50992019640075
## P11,8,20,1.51127413577504
## P11,8,21,1.51202661890379
## P11,8,22,1.51073085634332
## P11,8,23,1.51004244080672
## P11,8,24,1.51030538666923
## P11,8,25,1.51057315730362
## P11,8,26,1.51101967472358
## P11,8,27,1.51054687069771
## P11,8,28,1.51140930464393
## P11,8,29,1.5106876366575
## P11,8,30,1.5089419000289
## P11,8,31,1.51136726612667
## P11,8,32,1.51129861899785
## P11,8,33,1.50903490837047
## P11,8,34,1.51172377642463
## P11,8,35,1.51010013254065
## P11,8,36,1.50904277733394
## P11,8,37,1.51202948156156
## P11,8,38,1.51102237952383
## P11,8,39,1.51048826641507
## P11,8,40,1.51056889468019
## P11,8,41,1.5087464094162
## P11,8,42,1.51401553597561
## P11,8,43,1.51036510610939
## P11,8,44,1.51159406993204
## P11,8,45,1.51104635567892
## P11,8,46,1.50980098724365
## P11,8,47,1.51449292439681
## P11,8,48,1.50470759835042
## P11,8,49,1.50916639573735
## P11,8,50,1.50999500030695
## P11,9,1,1.51285810918616
## P11,9,2,1.51066603721716
## P11,9,3,1.51127734365343
## P11,9,4,1.51110079464496
## P11,9,5,1.51132216009983
## P11,9,6,1.51098799705505
## P11,9,7,1.51019799432089
## P11,9,8,1.50963486565484
## P11,9,9,1.51119084213719
## P11,9,10,1.51108909384605
## P11,9,11,1.51040853772845
## P11,9,12,1.51755946497374
## P11,9,13,1.50534165878685
## P11,9,14,1.51063321000439
## P11,9,15,1.50909015149046
## P11,9,16,1.51172968953155
## P11,9,17,1.51032528334749
## P11,9,18,1.5112059243332
## P11,9,19,1.51124912011819
## P11,9,20,1.51171684265137
## P11,9,21,1.50904850278582
## P11,9,22,1.51413901228654
## P11,9,23,1.50148556500497
## P11,9,24,1.51524714004895
## P11,9,25,1.50580694817549
## P11,9,26,1.51102737438532
## P11,9,27,1.51106664898631
## P11,9,28,1.51127265049861
## P11,9,29,1.50813026917286
## P11,9,30,1.51039060738569
## P11,9,31,1.51305309713703
## P11,9,32,1.51261133948962
## P11,9,33,1.50721967379252
## P11,9,34,1.51292982164598
## P11,9,35,1.5126212131903
## P11,9,36,1.50983132027291
## P11,9,37,1.5112893775452
## P11,9,38,1.5098089200479
## P11,9,39,1.50958068119852
## P11,9,40,1.51060669472877
## P11,9,41,1.51369365394538
## P11,9,42,1.50748261999577
## P11,9,43,1.51184749932125
## P11,9,44,1.51051039541921
## P11,9,45,1.51084014915285
## P11,9,46,1.50994719704278
## P11,9,47,1.5114205354868
## P11,9,48,1.51057091015297
## P11,9,49,1.50902875973161
## P11,9,50,1.51028529802958
## P11,10,1,1.51020613783284
## P11,10,2,1.51120393712756
## P11,10,3,1.51009318351746
## P11,10,4,1.51287543223454
## P11,10,5,1.51027428834958
## P11,10,6,1.51080369949341
## P11,10,7,1.51395814707785
## P11,10,8,1.50672814736958
## P11,10,9,1.51254889839574
## P11,10,10,1.50924733684909
## P11,10,11,1.51208126544952
## P11,10,12,1.50958138984322
## P11,10,13,1.5133031150874
## P11,10,14,1.51004993839628
## P11,10,15,1.51630547007576
## P11,10,16,1.50911152057159
## P11,10,17,1.5206757941878
## P11,10,18,1.50710877188801
## P11,10,19,1.50817691292732
## P11,10,20,1.51101356005147
## P11,10,21,1.5098698536555
## P11,10,22,1.51204232290281
## P11,10,23,1.51130370866685
## P11,10,24,1.51183879216512
## P11,10,25,1.50967402921783
## P11,10,26,1.51195717163575
## P11,10,27,1.51007898699853
## P11,10,28,1.50893951386444
## P11,10,29,1.50962232709765
## P11,10,30,1.50867786338861
## P11,10,31,1.50993553197609
## P11,10,32,1.51267623901367
## P11,10,33,1.50860055383429
## P11,10,34,1.51165261590408
## P11,10,35,1.50825975787255
## P11,10,36,1.51187731379228
## P11,10,37,1.50990444950803
## P11,10,38,1.51010985925895
## P11,10,39,1.51224917354006
## P11,10,40,1.51104308809553
## P11,10,41,1.5115666338738
## P11,10,42,1.50807407589778
## P11,10,43,1.51052476505545
## P11,10,44,1.5114618323066
## P11,10,45,1.51034189752266
## P11,10,46,1.51105152555259
## P11,10,47,1.51073989001187
## P11,10,48,1.51218217283815
## P11,10,49,1.51026560116365
## P11,10,50,1.52016584078471
## P12,1,1,1.51317332825571
## P12,1,2,1.51204085350037
## P12,1,3,1.51098247906109
## P12,1,4,1.5110492515564
## P12,1,5,1.51065458629442
## P12,1,6,1.51046108026974
## P12,1,7,1.50966527161089
## P12,1,8,1.5104560955711
## P12,1,9,1.51236641964066
## P12,1,10,1.51073843143025
## P12,1,11,1.51207984771047
## P12,1,12,1.50782438686916
## P12,1,13,1.51247344478484
## P12,1,14,1.51189271903332
## P12,1,15,1.51122380947245
## P12,1,16,1.50607455813366
## P12,1,17,1.50985684712728
## P12,1,18,1.51191251508651
## P12,1,19,1.5144109365319
## P12,1,20,1.50936383543343
## P12,1,21,1.50429941381066
## P12,1,22,1.51390488942464
## P12,1,23,1.50843954487007
## P12,1,24,1.50884830314694
## P12,1,25,1.50982338961433
## P12,1,26,1.50702005047952
## P12,1,27,1.51415849615026
## P12,1,28,1.51043364940545
## P12,1,29,1.50761915075368
## P12,1,30,1.51197950744629
## P12,1,31,1.51469072889774
## P12,1,32,1.51099552154541
## P12,1,33,1.50806975102687
## P12,1,34,1.51713061819271
## P12,1,35,1.51146800539135
## P12,1,36,1.50576208633127
## P12,1,37,1.51171614505627
## P12,1,38,1.50798286572851
## P12,1,39,1.50956836882092
## P12,1,40,1.5107360460672
## P12,1,41,1.50810888201691
## P12,1,42,1.50864623249441
## P12,1,43,1.50810959400275
## P12,1,44,1.51303654670715
## P12,1,45,1.513936395769
## P12,1,46,1.51008247193836
## P12,1,47,1.51025252342224
## P12,1,48,1.51161532455616
## P12,1,49,1.50730275488519
## P12,1,50,1.50780978798866
## P12,2,1,1.50915977270296
## P12,2,2,1.50872718086538
## P12,2,3,1.50969485261224
## P12,2,4,1.51242715273148
## P12,2,5,1.49449704707354
## P12,2,6,1.50815422534943
## P12,2,7,1.50948854134633
## P12,2,8,1.51124836758869
## P12,2,9,1.51166936604664
## P12,2,10,1.50863362613477
## P12,2,11,1.5070045719976
## P12,2,12,1.50956598742978
## P12,2,13,1.51039825690972
## P12,2,14,1.50728111781046
## P12,2,15,1.50865508758858
## P12,2,16,1.51070015907288
## P12,2,17,1.51099554697673
## P12,2,18,1.51126836253478
## P12,2,19,1.50606010225084
## P12,2,20,1.51037543470209
## P12,2,21,1.50971104743633
## P12,2,22,1.50936899612199
## P12,2,23,1.50659125311333
## P12,2,24,1.51301286501043
## P12,2,25,1.50146867268121
## P12,2,26,1.51408063635534
## P12,2,27,1.50886516927559
## P12,2,28,1.50729294746153
## P12,2,29,1.50572282617742
## P12,2,30,1.50731211210552
## P12,2,31,1.50870878928531
## P12,2,32,1.50813253029533
## P12,2,33,1.51200301237781
## P12,2,34,1.5318137291939
## P12,2,35,1.51601868956836
## P12,2,36,1.51578176904608
## P12,2,37,1.51373285128747
## P12,2,38,1.50861726788913
## P12,2,39,1.51380680419587
## P12,2,40,1.52158291199628
## P12,2,41,1.51005388320761
## P12,2,42,1.51240918675407
## P12,2,43,1.51340403473168
## P12,2,44,1.50610431734022
## P12,2,45,1.50832026728084
## P12,2,46,1.51178586142404
## P12,2,47,1.50578556890073
## P12,2,48,1.50807863015395
## P12,2,49,1.51293090132416
## P12,2,50,1.50143685665998
## P12,3,1,1.50744167433845
## P12,3,2,1.50796914323468
## P12,3,3,1.51443682398115
## P12,3,4,1.50241236374757
## P12,3,5,1.51495001532815
## P12,3,6,1.51155455318498
## P12,3,7,1.51564621925354
## P12,3,8,1.50619227545602
## P12,3,9,1.503002372655
## P12,3,10,1.5072491923968
## P12,3,11,1.50815516640158
## P12,3,12,1.51149529996126
## P12,3,13,1.51074999854678
## P12,3,14,1.50908283834104
## P12,3,15,1.50757398186149
## P12,3,16,1.50651167645866
## P12,3,17,1.50799649260765
## P12,3,18,1.51316246390343
## P12,3,19,1.50941107386634
## P12,3,20,1.51073148515489
## P12,3,21,1.50791215896606
## P12,3,22,1.5103758162811
## P12,3,23,1.51120057014319
## P12,3,24,1.50952172541356
## P12,3,25,1.51005052686571
## P12,3,26,1.52098902340593
## P12,3,27,1.51057350976127
## P12,3,28,1.51121422222682
## P12,3,29,1.50941905912185
## P12,3,30,1.5102136798371
## P12,3,31,1.51005908198979
## P12,3,32,1.51085968659474
## P12,3,33,1.50924400585454
## P12,3,34,1.51030859194304
## P12,3,35,1.5095216292961
## P12,3,36,1.50711156924566
## P12,3,37,1.51531236687886
## P12,3,38,1.5112582067164
## P12,3,39,1.51072894202338
## P12,3,40,1.50556334133806
## P12,3,41,1.50747953317104
## P12,3,42,1.51356529444456
## P12,3,43,1.50830916797414
## P12,3,44,1.51125333150228
## P12,3,45,1.51262714823738
## P12,3,46,1.50621580846101
## P12,3,47,1.50991787449006
## P12,3,48,1.50625554720561
## P12,3,49,1.5087897413868
## P12,3,50,1.50763009723864
## P12,4,1,1.50790198169537
## P12,4,2,1.50258361376249
## P12,4,3,1.51279749713101
## P12,4,4,1.51804825137643
## P12,4,5,1.51936300465318
## P12,4,6,1.50910899043083
## P12,4,7,1.50933516543844
## P12,4,8,1.50852481842041
## P12,4,9,1.51127417385578
## P12,4,10,1.50863639207987
## P12,4,11,1.50966382026672
## P12,4,12,1.51606475073716
## P12,4,13,1.51558987544133
## P12,4,14,1.50983690534319
## P12,4,15,1.50951707572268
## P12,4,16,1.50775353634944
## P12,4,17,1.5089895337127
## P12,4,18,1.51279956452987
## P12,4,19,1.51176230274901
## P12,4,20,1.51100022452218
## P12,4,21,1.51126825035392
## P12,4,22,1.50625556707382
## P12,4,23,1.50694151546644
## P12,4,24,1.51789521684452
## P12,4,25,1.51071681236399
## P12,4,26,1.51095012518076
## P12,4,27,1.51080809248255
## P12,4,28,1.51196613992964
## P12,4,29,1.51453478294506
## P12,4,30,1.50696139722257
## P12,4,31,1.51227018309803
## P12,4,32,1.51039670376067
## P12,4,33,1.510758806158
## P12,4,34,1.49535799707685
## P12,4,35,1.50071581398569
## P12,4,36,1.51025642475612
## P12,4,37,1.51264265908135
## P12,4,38,1.50883381637101
## P12,4,39,1.51012151891535
## P12,4,40,1.51400566792143
## P12,4,41,1.51164839084332
## P12,4,42,1.5089858505461
## P12,4,43,1.51151113510132
## P12,4,44,1.50320137671705
## P12,4,45,1.50636226252506
## P12,4,46,1.50977886586949
## P12,4,47,1.51087854589735
## P12,4,48,1.50650888139551
## P12,4,49,1.51416758390573
## P12,4,50,1.51229995318822
## P12,5,1,1.50986487352395
## P12,5,2,1.50673510347094
## P12,5,3,1.50886068881398
## P12,5,4,1.50919586991611
## P12,5,5,1.51603541109297
## P12,5,6,1.50390033721924
## P12,5,7,1.51171565610309
## P12,5,8,1.50999013334513
## P12,5,9,1.51127795762913
## P12,5,10,1.50854342717391
## P12,5,11,1.50983910262585
## P12,5,12,1.50829098282791
## P12,5,13,1.50975422211635
## P12,5,14,1.51714251414839
## P12,5,15,1.50768172620523
## P12,5,16,1.508428453285
## P12,5,17,1.50785468925129
## P12,5,18,1.5099947501202
## P12,5,19,1.50814060064463
## P12,5,20,1.512024974823
## P12,5,21,1.50895621699672
## P12,5,22,1.51081654230754
## P12,5,23,1.5090732266826
## P12,5,24,1.51238886515299
## P12,5,25,1.50636504825793
## P12,5,26,1.50742872137772
## P12,5,27,1.50877368299267
## P12,5,28,1.50986504933191
## P12,5,29,1.508048290902
## P12,5,30,1.51137589435188
## P12,5,31,1.50904484951135
## P12,5,32,1.51064347276593
## P12,5,33,1.50518453688849
## P12,5,34,1.5124866470458
## P12,5,35,1.50800567203098
## P12,5,36,1.50397510207101
## P12,5,37,1.51732265472412
## P12,5,38,1.51160546352989
## P12,5,39,1.50878598772246
## P12,5,40,1.51301533297489
## P12,5,41,1.50940552149733
## P12,5,42,1.51072898323153
## P12,5,43,1.5087212536433
## P12,5,44,1.50859956464906
## P12,5,45,1.51280219338157
## P12,5,46,1.50874420775085
## P12,5,47,1.506373469894
## P12,5,48,1.50798773765564
## P12,5,49,1.51009928186735
## P12,5,50,1.50695686180051
## P12,6,1,1.51122380154473
## P12,6,2,1.50546755916194
## P12,6,3,1.51037437328394
## P12,6,4,1.50943272600892
## P12,6,5,1.48783077512469
## P12,6,6,1.51200995906707
## P12,6,7,1.51075609659745
## P12,6,8,1.51181511725149
## P12,6,9,1.50870444344693
## P12,6,10,1.51350244843816
## P12,6,11,1.51535287499428
## P12,6,12,1.50635319406336
## P12,6,13,1.51365038326808
## P12,6,14,1.51200238982243
## P12,6,15,1.50661193407499
## P12,6,16,1.51059300558908
## P12,6,17,1.50898092884128
## P12,6,18,1.51189298014487
## P12,6,19,1.50966349919637
## P12,6,20,1.51116085797548
## P12,6,21,1.50927676094903
## P12,6,22,1.51108772690232
## P12,6,23,1.51108796097511
## P12,6,24,1.51100485566734
## P12,6,25,1.5087300936381
## P12,6,26,1.51114827394485
## P12,6,27,1.50944302574037
## P12,6,28,1.5109233387181
## P12,6,29,1.50941743547954
## P12,6,30,1.50941104502291
## P12,6,31,1.51188332426782
## P12,6,32,1.50977555532304
## P12,6,33,1.51167965771859
## P12,6,34,1.51139298121134
## P12,6,35,1.50884340568022
## P12,6,36,1.51247065975553
## P12,6,37,1.51065458940423
## P12,6,38,1.50855831047157
## P12,6,39,1.51028937980777
## P12,6,40,1.50952345825905
## P12,6,41,1.50131642143681
## P12,6,42,1.51070710368778
## P12,6,43,1.51218348390916
## P12,6,44,1.50775006046034
## P12,6,45,1.51037542025248
## P12,6,46,1.51052060043603
## P12,6,47,1.5109456323442
## P12,6,48,1.51116627454758
## P12,6,49,1.50841005643209
## P12,6,50,1.50858970741173
## P12,7,1,1.51115668766082
## P12,7,2,1.50624881982803
## P12,7,3,1.51036325368014
## P12,7,4,1.50913936592812
## P12,7,5,1.49999575695749
## P12,7,6,1.5080726146698
## P12,7,7,1.51198510800378
## P12,7,8,1.51234785972103
## P12,7,9,1.51002139756174
## P12,7,10,1.50870365049781
## P12,7,11,1.5121576424801
## P12,7,12,1.51023504950783
## P12,7,13,1.51037955284119
## P12,7,14,1.51066194709979
## P12,7,15,1.50788732196974
## P12,7,16,1.50964863483722
## P12,7,17,1.51110995334128
## P12,7,18,1.51280413224147
## P12,7,19,1.51096658706665
## P12,7,20,1.50944657185498
## P12,7,21,1.51204846939951
## P12,7,22,1.5111683278844
## P12,7,23,1.50939245223999
## P12,7,24,1.51055651125701
## P12,7,25,1.5112888776339
## P12,7,26,1.50811304869475
## P12,7,27,1.50979868870861
## P12,7,28,1.50962151342364
## P12,7,29,1.50931308076188
## P12,7,30,1.50742288815078
## P12,7,31,1.5110173990697
## P12,7,32,1.51109079145036
## P12,7,33,1.51013003119939
## P12,7,34,1.50883860964524
## P12,7,35,1.51115663846334
## P12,7,36,1.51074678019473
## P12,7,37,1.5110499760876
## P12,7,38,1.5101850327481
## P12,7,39,1.51358777598331
## P12,7,40,1.51092167496681
## P12,7,41,1.50922799110413
## P12,7,42,1.51164497028698
## P12,7,43,1.50950932502747
## P12,7,44,1.51112507838829
## P12,7,45,1.50929594721113
## P12,7,46,1.50950697490147
## P12,7,47,1.50647405277599
## P12,7,48,1.51389841700709
## P12,7,49,1.50776312567971
## P12,7,50,1.5105518136069
## P12,8,1,1.5121224293342
## P12,8,2,1.50908620126786
## P12,8,3,1.51121036741469
## P12,8,4,1.50710806756649
## P12,8,5,1.51018988291423
## P12,8,6,1.51328068068533
## P12,8,7,1.50927681393094
## P12,8,8,1.51085169840667
## P12,8,9,1.51190600856658
## P12,8,10,1.51030768117597
## P12,8,11,1.50975832445868
## P12,8,12,1.51083540064948
## P12,8,13,1.51024693250656
## P12,8,14,1.51223092608982
## P12,8,15,1.50121005975975
## P12,8,16,1.51066431292781
## P12,8,17,1.50986272638494
## P12,8,18,1.5103716640682
## P12,8,19,1.50865125052537
## P12,8,20,1.51004606182292
## P12,8,21,1.50907766407934
## P12,8,22,1.50864094145158
## P12,8,23,1.50843649525796
## P12,8,24,1.50784659940143
## P12,8,25,1.512809301034
## P12,8,26,1.50928251794044
## P12,8,27,1.50909391362616
## P12,8,28,1.51320242180544
## P12,8,29,1.510305453155
## P12,8,30,1.51025334993998
## P12,8,31,1.51948165893555
## P12,8,32,1.50938326736976
## P12,8,33,1.51057636737823
## P12,8,34,1.51026321374453
## P12,8,35,1.50992500370946
## P12,8,36,1.50910491943359
## P12,8,37,1.50968234393061
## P12,8,38,1.51376800160659
## P12,8,39,1.50867152569899
## P12,8,40,1.50561046600342
## P12,8,41,1.50879133664645
## P12,8,42,1.5103105584236
## P12,8,43,1.50996816919205
## P12,8,44,1.5071915177738
## P12,8,45,1.50811775107133
## P12,8,46,1.5099691999964
## P12,8,47,1.51334414915605
## P12,8,48,1.50917945504189
## P12,8,49,1.50832519323929
## P12,8,50,1.50963603366505
## P12,9,1,1.50917867513803
## P12,9,2,1.51133890662875
## P12,9,3,1.51061955690384
## P12,9,4,1.50982969882442
## P12,9,5,1.51178215727021
## P12,9,6,1.50880683552135
## P12,9,7,1.51067326863607
## P12,9,8,1.50846323546241
## P12,9,9,1.5108373358443
## P12,9,10,1.50743464380503
## P12,9,11,1.51144669214884
## P12,9,12,1.51064348692941
## P12,9,13,1.50991343916132
## P12,9,14,1.51001223050631
## P12,9,15,1.50874928065709
## P12,9,16,1.51124105453491
## P12,9,17,1.50764691692659
## P12,9,18,1.51183895162634
## P12,9,19,1.50767712662185
## P12,9,20,1.50620329821551
## P12,9,21,1.51013361461579
## P12,9,22,1.5135844039917
## P12,9,23,1.50754794478416
## P12,9,24,1.50839436621893
## P12,9,25,1.50817032814026
## P12,9,26,1.51009737120734
## P12,9,27,1.51423681998739
## P12,9,28,1.51187121868134
## P12,9,29,1.51259284088577
## P12,9,30,1.50896408133311
## P12,9,31,1.5104895868609
## P12,9,32,1.50962089995543
## P12,9,33,1.50745437826429
## P12,9,34,1.50977805455526
## P12,9,35,1.50898756736364
## P12,9,36,1.50768465087527
## P12,9,37,1.51011367176854
## P12,9,38,1.50671434402466
## P12,9,39,1.50910891294479
## P12,9,40,1.51035104327732
## P12,9,41,1.50835362076759
## P12,9,42,1.5117049548361
## P12,9,43,1.50814761898734
## P12,9,44,1.51156449023588
## P12,9,45,1.51075588373037
## P12,9,46,1.51082101464272
## P12,9,47,1.50963261127472
## P12,9,48,1.51082095232877
## P12,9,49,1.51184418678284
## P12,9,50,1.50921523902151
## P12,10,1,1.51074041128159
## P12,10,2,1.5094170712713
## P12,10,3,1.51154546595331
## P12,10,4,1.50788925753699
## P12,10,5,1.50960187535537
## P12,10,6,1.50911112034574
## P12,10,7,1.51018011208737
## P12,10,8,1.51163314234826
## P12,10,9,1.51061955620261
## P12,10,10,1.50690648866736
## P12,10,11,1.50403206488665
## P12,10,12,1.51029127615469
## P12,10,13,1.50891344687518
## P12,10,14,1.50852482795715
## P12,10,15,1.51139164964358
## P12,10,16,1.50374266930989
## P12,10,17,1.5154266834259
## P12,10,18,1.50835295359294
## P12,10,19,1.51113748550415
## P12,10,20,1.50976356863976
## P12,10,21,1.5101456268161
## P12,10,22,1.50874663018561
## P12,10,23,1.51070289776243
## P12,10,24,1.51154031072344
## P12,10,25,1.51165794796414
## P12,10,26,1.50671518032367
## P12,10,27,1.51031068166097
## P12,10,28,1.51042836399402
## P12,10,29,1.50986130097333
## P12,10,30,1.50961250066757
## P12,10,31,1.50744974417765
## P12,10,32,1.51012795658435
## P12,10,33,1.50956867052161
## P12,10,34,1.51333339590775
## P12,10,35,1.51471902342404
## P12,10,36,1.51289554834366
## P12,10,37,1.51462610347851
## P12,10,38,1.50689813068935
## P12,10,39,1.50420648574829
## P12,10,40,1.50529796198795
## P12,10,41,1.5101719432407
## P12,10,42,1.50421659569991
## P12,10,43,1.50873429298401
## P12,10,44,1.5078319644928
## P12,10,45,1.51154917203463
## P12,10,46,1.51077715210293
## P12,10,47,1.51406776428223
## P12,10,48,1.50807196385152
## P12,10,49,1.50246703057062
## P12,10,50,1.50785343647003
## P13,1,1,1.5132054667319
## P13,1,2,1.51472154344831
## P13,1,3,1.50969413486687
## P13,1,4,1.50811991936121
## P13,1,5,1.51536998042354
## P13,1,6,1.52220480351508
## P13,1,7,1.50943259974472
## P13,1,8,1.50499669048521
## P13,1,9,1.50700933095571
## P13,1,10,1.51443173633358
## P13,1,11,1.49911167492738
## P13,1,12,1.50825921073556
## P13,1,13,1.51158727174518
## P13,1,14,1.50968608856201
## P13,1,15,1.51096308138943
## P13,1,16,1.51588424646629
## P13,1,17,1.50765053136849
## P13,1,18,1.51124107497079
## P13,1,19,1.50622504407709
## P13,1,20,1.50593412921415
## P13,1,21,1.50668537282498
## P13,1,22,1.52402811855465
## P13,1,23,1.51321701705456
## P13,1,24,1.51123379244663
## P13,1,25,1.51294993072428
## P13,1,26,1.50685542007613
## P13,1,27,1.49942684173584
## P13,1,28,1.52905459239565
## P13,1,29,1.52812016184737
## P13,1,30,1.51146865319349
## P13,1,31,1.49763204101333
## P13,1,32,1.5033089269406
## P13,1,33,1.51768460396009
## P13,1,34,1.51173604684433
## P13,1,35,1.50310587882996
## P13,1,36,1.5090571951471
## P13,1,37,1.50901621639138
## P13,1,38,1.51457157636944
## P13,1,39,1.51508202330436
## P13,1,40,1.50317776830573
## P13,1,41,1.50416091529045
## P13,1,42,1.51943681847235
## P13,1,43,1.51397894079035
## P13,1,44,1.5086171864069
## P13,1,45,1.49527641604928
## P13,1,46,1.51032170093421
## P13,1,47,1.51514092013611
## P13,1,48,1.50268253311515
## P13,1,49,1.50883014327601
## P13,1,50,1.50864949360931
## P13,2,1,1.5139730689872
## P13,2,2,1.50653799309218
## P13,2,3,1.51439182148423
## P13,2,4,1.52467971719721
## P13,2,5,1.50504621372947
## P13,2,6,1.48485899786664
## P13,2,7,1.50890124589205
## P13,2,8,1.50977598078111
## P13,2,9,1.50725000886356
## P13,2,10,1.51358379957811
## P13,2,11,1.50393044321161
## P13,2,12,1.50968515995852
## P13,2,13,1.50427497852416
## P13,2,14,1.50753484330736
## P13,2,15,1.51512502466591
## P13,2,16,1.51927879380017
## P13,2,17,1.52387849262783
## P13,2,18,1.50175205144015
## P13,2,19,1.509418018933
## P13,2,20,1.51583819543162
## P13,2,21,1.51071665373193
## P13,2,22,1.5084155647234
## P13,2,23,1.50502950228178
## P13,2,24,1.50965277764105
## P13,2,25,1.53047069886915
## P13,2,26,1.51056759126725
## P13,2,27,1.55126761180589
## P13,2,28,0.949458830542652
## P13,2,29,1.51664816511088
## P13,2,30,1.51320646247085
## P13,2,31,1.5128201675415
## P13,2,32,1.51413245823072
## P13,2,33,1.50994743431471
## P13,2,34,1.51042602315295
## P13,2,35,1.50304749737615
## P13,2,36,1.52613340956824
## P13,2,37,1.51275191621152
## P13,2,38,1.55813521352308
## P13,2,39,0.972719495501983
## P13,2,40,0.925462662722416
## P13,2,41,0.981095617871544
## P13,2,42,0.935743150791447
## P13,2,43,1.04670796440013
## P13,2,44,0.471106371654025
## P13,2,45,1.43180000826519
## P13,2,46,0.842275454849005
## P13,2,47,0.211658675581353
## P13,2,48,1.74208123040996
## P13,2,49,0.500957413327082
## P13,2,50,1.22477222805284
## P13,3,1,1.42157644568277
## P13,3,2,0.539794755143751
## P13,3,3,1.13505734631129
## P13,3,4,1.48602531011437
## P13,3,5,1.17861603875307
## P13,3,6,1.54458043411488
## P13,3,7,1.53149532887243
## P13,3,8,1.52482795715332
## P13,3,9,1.52328591494216
## P13,3,10,1.51995979325246
## P13,3,11,1.51824196282919
## P13,3,12,1.51637736956278
## P13,3,13,1.51688130897812
## P13,3,14,1.51385663236891
## P13,3,15,1.50650175034054
## P13,3,16,1.51888105828883
## P13,3,17,1.5118941798139
## P13,3,18,1.5137255241131
## P13,3,19,1.51576743497477
## P13,3,20,1.51140427899051
## P13,3,21,1.51505070021658
## P13,3,22,1.50608709545955
## P13,3,23,1.51709312723394
## P13,3,24,1.5089585617797
## P13,3,25,1.5118510893413
## P13,3,26,1.51471771945843
## P13,3,27,1.51338494790567
## P13,3,28,1.51428383721246
## P13,3,29,1.50957271247912
## P13,3,30,1.51127349246632
## P13,3,31,1.51001531038529
## P13,3,32,1.51208828613821
## P13,3,33,1.51806365951034
## P13,3,34,1.5131365677406
## P13,3,35,1.51353449291653
## P13,3,36,1.51031316837794
## P13,3,37,1.50952615624382
## P13,3,38,1.51200158045842
## P13,3,39,1.51172606854499
## P13,3,40,1.50758366553199
## P13,3,41,1.51091639870091
## P13,3,42,1.5164527600038
## P13,3,43,1.50700186144921
## P13,3,44,1.5182611581051
## P13,3,45,1.5152738241049
## P13,3,46,1.51667838161056
## P13,3,47,1.50976981967688
## P13,3,48,1.5089212939036
## P13,3,49,1.51139373332262
## P13,3,50,1.51212603098726
## P13,4,1,0.905108455844224
## P13,4,2,0.980450757722492
## P13,4,3,1.67994506265716
## P13,4,4,1.04797605416878
## P13,4,5,1.54250326055161
## P13,4,6,1.53628505509475
## P13,4,7,1.52600634856031
## P13,4,8,1.51902147522546
## P13,4,9,1.51899000933004
## P13,4,10,1.51177468070065
## P13,4,11,1.52105047486045
## P13,4,12,1.5000301361084
## P13,4,13,1.51464787682334
## P13,4,14,1.51099682611132
## P13,4,15,1.51471844902874
## P13,4,16,1.51385988110173
## P13,4,17,1.52009671194512
## P13,4,18,1.50933049243429
## P13,4,19,1.51313589043813
## P13,4,20,1.51300526591181
## P13,4,21,1.51308129893409
## P13,4,22,1.5169930552492
## P13,4,23,1.53775850931803
## P13,4,24,1.49248181856596
## P13,4,25,1.51111405800129
## P13,4,26,1.51875677108765
## P13,4,27,1.50953987666539
## P13,4,28,1.51843450410025
## P13,4,29,1.53111146843952
## P13,4,30,1.50651069421035
## P13,4,31,1.51335882005237
## P13,4,32,1.51466540668322
## P13,4,33,1.5073247631984
## P13,4,34,1.50341523777355
## P13,4,35,1.50555538869166
## P13,4,36,1.52408048544037
## P13,4,37,1.51495735534769
## P13,4,38,1.51168248633377
## P13,4,39,1.51629169910185
## P13,4,40,1.51019458456354
## P13,4,41,1.51063944969648
## P13,4,42,1.51582689983089
## P13,4,43,1.51156532246134
## P13,4,44,1.51055426210971
## P13,4,45,1.5148906838404
## P13,4,46,1.51242118745338
## P13,4,47,1.50789270034203
## P13,4,48,1.50492025304724
## P13,4,49,1.51251970597033
## P13,4,50,1.51455410595598
## P13,5,1,0.680021333755279
## P13,5,2,0.977456099966652
## P13,5,3,0.839586967602372
## P13,5,4,0.732611125497066
## P13,5,5,1.52939323584239
## P13,5,6,1.55297263075666
## P13,5,7,1.53632950149806
## P13,5,8,1.53477212434174
## P13,5,9,1.52474074494349
## P13,5,10,1.52498378916683
## P13,5,11,1.54236272970835
## P13,5,12,1.51782675929691
## P13,5,13,1.51665187082371
## P13,5,14,1.52346948180536
## P13,5,15,1.52366963028908
## P13,5,16,1.50701780880199
## P13,5,17,1.51430460059124
## P13,5,18,1.52148404923996
## P13,5,19,1.5028265953064
## P13,5,20,1.51232646683515
## P13,5,21,1.50906946085676
## P13,5,22,1.5093623989231
## P13,5,23,1.52054697780286
## P13,5,24,1.51961884021759
## P13,5,25,1.50864021277722
## P13,5,26,1.50894760829146
## P13,5,27,1.50986346464891
## P13,5,28,1.51470680934627
## P13,5,29,1.50944960221
## P13,5,30,1.51227691514151
## P13,5,31,1.51568876043723
## P13,5,32,1.52945816958392
## P13,5,33,1.51275172378078
## P13,5,34,1.51432561045108
## P13,5,35,1.51237001007409
## P13,5,36,1.51242045795216
## P13,5,37,1.51134938632741
## P13,5,38,1.51222561231626
## P13,5,39,1.51104157879239
## P13,5,40,1.51188060926354
## P13,5,41,1.51349065520547
## P13,5,42,1.51758444866287
## P13,5,43,1.50888308738042
## P13,5,44,1.51360995490272
## P13,5,45,1.50979270433125
## P13,5,46,1.49482857386271
## P13,5,47,1.51694765524431
## P13,5,48,1.51369509904281
## P13,5,49,1.5138591716164
## P13,5,50,1.51626342503812
## P13,6,1,0.778928456180974
## P13,6,2,1.31456519179235
## P13,6,3,1.55531337066573
## P13,6,4,1.53629251192975
## P13,6,5,1.52091027594901
## P13,6,6,1.52186049103106
## P13,6,7,1.51735984041391
## P13,6,8,1.51345197359721
## P13,6,9,1.51785802594121
## P13,6,10,1.51437793810343
## P13,6,11,1.51384221615434
## P13,6,12,1.5159268707037
## P13,6,13,1.51951264727647
## P13,6,14,1.51169722247276
## P13,6,15,1.52247591598614
## P13,6,16,1.50557518005371
## P13,6,17,1.5129579654554
## P13,6,18,1.52613543815353
## P13,6,19,1.50865999652493
## P13,6,20,1.5160074532032
## P13,6,21,1.51838674373969
## P13,6,22,1.50307072726163
## P13,6,23,1.5114054621363
## P13,6,24,1.50816596638073
## P13,6,25,1.50233123816696
## P13,6,26,1.50682532787323
## P13,6,27,1.51390418333885
## P13,6,28,1.50727374690353
## P13,6,29,1.51082099772788
## P13,6,30,1.51102238965322
## P13,6,31,1.51195821028489
## P13,6,32,1.51041148356255
## P13,6,33,1.51166217467364
## P13,6,34,1.51268328886766
## P13,6,35,1.51247325369982
## P13,6,36,1.51208723792734
## P13,6,37,1.51025077322839
## P13,6,38,1.51224298763992
## P13,6,39,1.5086822946563
## P13,6,40,1.51300130188465
## P13,6,41,1.51301865754304
## P13,6,42,1.51080677878689
## P13,6,43,1.50851366307476
## P13,6,44,1.51360563247923
## P13,6,45,1.50560365569207
## P13,6,46,1.51132605259235
## P13,6,47,1.50785090431334
## P13,6,48,1.51213149590926
## P13,6,49,1.51299338681357
## P13,6,50,1.51203521773929
## P13,7,1,0.675534932302278
## P13,7,2,0.907010482422806
## P13,7,3,0.258504889228127
## P13,7,4,0.766339700343826
## P13,7,5,0.724284671263345
## P13,7,6,0.693093094485009
## P13,7,7,1.48005095395175
## P13,7,8,0.722236607807799
## P13,7,9,1.56510605894286
## P13,7,10,1.56751443167864
## P13,7,11,1.54408669682731
## P13,7,12,1.53630012273788
## P13,7,13,1.535928072023
## P13,7,14,1.52960912757945
## P13,7,15,1.52822023538443
## P13,7,16,1.51588236131976
## P13,7,17,1.52067835295378
## P13,7,18,1.51984594418452
## P13,7,19,1.5175568192406
## P13,7,20,1.51906902139837
## P13,7,21,1.51738714036487
## P13,7,22,1.51367794425742
## P13,7,23,1.51448851889306
## P13,7,24,1.51543727065578
## P13,7,25,1.51487472682323
## P13,7,26,1.51580559706488
## P13,7,27,1.51388372342611
## P13,7,28,1.51453278016071
## P13,7,29,1.51203837858892
## P13,7,30,1.51060420445033
## P13,7,31,1.51243609302449
## P13,7,32,1.51419803698858
## P13,7,33,1.51165935320732
## P13,7,34,1.51190748684843
## P13,7,35,1.50702141907256
## P13,7,36,1.51302993493002
## P13,7,37,1.50791643713122
## P13,7,38,1.51416006438229
## P13,7,39,1.51379225605218
## P13,7,40,1.51274161679404
## P13,7,41,1.51319374689242
## P13,7,42,1.51077093066591
## P13,7,43,1.51037889022332
## P13,7,44,1.51219929900824
## P13,7,45,1.51290480295817
## P13,7,46,1.51170084978405
## P13,7,47,1.51098659038544
## P13,7,48,1.51247954074247
## P13,7,49,1.51028483014711
## P13,7,50,1.51382660126501
## P13,8,1,1.53776923347922
## P13,8,2,1.5404779622049
## P13,8,3,0.824395470820912
## P13,8,4,0.697155508454647
## P13,8,5,0.484387486996247
## P13,8,6,0.785418402700702
## P13,8,7,0.29474030110826
## P13,8,8,1.14178772248421
## P13,8,9,0.31811943772034
## P13,8,10,0.820082733441483
## P13,8,11,0.800163461637676
## P13,8,12,0.807167689154546
## P13,8,13,0.759318940417499
## P13,8,14,0.590297123772631
## P13,8,15,1.13396268823933
## P13,8,16,0.499410122183601
## P13,8,17,0.980567299150431
## P13,8,18,0.841844377867508
## P13,8,19,0.57776755947784
## P13,8,20,0.909667630525968
## P13,8,21,1.15528026936396
## P13,8,22,0.40028061035314
## P13,8,23,0.827552875123498
## P13,8,24,0.747426507215608
## P13,8,25,1.0211686398834
## P13,8,26,0.488746101623328
## P13,8,27,0.584532766945331
## P13,8,28,0.501073556831803
## P13,8,29,0.395655852071075
## P13,8,30,0.85609145221732
## P13,8,31,0.896447142627504
## P13,8,32,1.14077155044302
## P13,8,33,0.705443658378966
## P13,8,34,0.852956235609376
## P13,8,35,0.582365140918917
## P13,8,36,0.600310284316435
## P13,8,37,1.16198819061428
## P13,8,38,0.86372526710922
## P13,8,39,0.601830836949409
## P13,8,40,0.485580272902735
## P13,8,41,1.32481165653316
## P13,8,42,1.08934897331126
## P13,8,43,1.60410671590645
## P13,8,44,1.57625215148926
## P13,8,45,1.56266421621496
## P13,8,46,1.55217896942544
## P13,8,47,1.54424808156772
## P13,8,48,1.54156726882571
## P13,8,49,1.53925312719037
## P13,8,50,1.53430716196696
## P13,9,1,1.52449924577542
## P13,9,2,1.5364984502696
## P13,9,3,1.52173508279692
## P13,9,4,1.51302367782593
## P13,9,5,1.52056466674805
## P13,9,6,1.41671806078019
## P13,9,7,0.7702652962188
## P13,9,8,0.99305094300311
## P13,9,9,0.428050346316441
## P13,9,10,1.00242804052023
## P13,9,11,0.715588900862106
## P13,9,12,0.129645419163034
## P13,9,13,1.06267874743029
## P13,9,14,0.969422699077628
## P13,9,15,0.854718091792234
## P13,9,16,0.467659916525873
## P13,9,17,1.01084451024011
## P13,9,18,0.88479605872184
## P13,9,19,0.819563779637389
## P13,9,20,0.680129424174443
## P13,9,21,1.22937795925405
## P13,9,22,1.62527386161188
## P13,9,23,0.751996716864559
## P13,9,24,0.830252315109486
## P13,9,25,0.828642711691234
## P13,9,26,1.44636623938529
## P13,9,27,0.518128364808734
## P13,9,28,0.92379860031297
## P13,9,29,0.377410470300074
## P13,9,30,1.36459302860645
## P13,9,31,0.349852546005799
## P13,9,32,0.750390076514413
## P13,9,33,0.993962274511679
## P13,9,34,1.04555856182318
## P13,9,35,0.916636489521436
## P13,9,36,0.481941878079222
## P13,9,37,1.25214590104121
## P13,9,38,0.510263769565342
## P13,9,39,0.707358000543686
## P13,9,40,0.484687322200764
## P13,9,41,0.291617407254419
## P13,9,42,0.91620817350393
## P13,9,43,1.47142169101179
## P13,9,44,1.55024659756533
## P13,9,45,0.737359744052343
## P13,9,46,0.739904178222557
## P13,9,47,0.593759818884012
## P13,9,48,1.53939788341522
## P13,9,49,1.53797551068393
## P13,9,50,1.53581862911101
## P13,10,1,1.41652186302923
## P13,10,2,1.56341037254964
## P13,10,3,1.23814410874248
## P13,10,4,0.953726203830765
## P13,10,5,1.5620416655685
## P13,10,6,1.61810664790017
## P13,10,7,1.53778469562531
## P13,10,8,1.52036983601368
## P13,10,9,1.53518278392281
## P13,10,10,1.51918123729193
## P13,10,11,1.52364909648895
## P13,10,12,1.51662670938592
## P13,10,13,1.52103512136786
## P13,10,14,1.51855127571165
## P13,10,15,1.51964810537913
## P13,10,16,1.51734089851379
## P13,10,17,1.51951880411271
## P13,10,18,1.51635361090302
## P13,10,19,1.51523493981177
## P13,10,20,1.51455564353302
## P13,10,21,1.51541626894916
## P13,10,22,1.51462041247975
## P13,10,23,1.5120065974206
## P13,10,24,1.51327400709453
## P13,10,25,1.52330070972443
## P13,10,26,1.05640226092885
## P13,10,27,1.42144029427852
## P13,10,28,1.05445443520633
## P13,10,29,1.55144282974876
## P13,10,30,1.45534286076613
## P13,10,31,1.00104290918565
## P13,10,32,1.87130907843156
## P13,10,33,0.791480896856156
## P13,10,34,0.534030382033615
## P13,10,35,0.540296949712293
## P13,10,36,1.72873788194791
## P13,10,37,0.674675621230635
## P13,10,38,1.14639548800716
## P13,10,39,0.649276901531266
## P13,10,40,0.973733740397974
## P13,10,41,1.09500215481157
## P13,10,42,0.828850037147573
## P13,10,43,1.30458453460818
## P13,10,44,1.22875431170448
## P13,10,45,1.59975904060735
## P13,10,46,0.884953084738648
## P13,10,47,1.42678153100221
## P13,10,48,1.60995224750403
## P13,10,49,1.58560048031206
## P13,10,50,1.62325243922012
## P14,1,1,1.51408387819926
## P14,1,2,1.51845645904541
## P14,1,3,1.48963570594788
## P14,1,4,1.49891376495361
## P14,1,5,1.51477782957016
## P14,1,6,1.51838326454163
## P14,1,7,1.51898312190222
## P14,1,8,1.51422954522646
## P14,1,9,1.51520562783266
## P14,1,10,1.50961855686072
## P14,1,11,1.514721122655
## P14,1,12,1.49742335286634
## P14,1,13,1.51899847454495
## P14,1,14,1.48505528156574
## P14,1,15,1.49683382776048
## P14,1,16,1.51154033721439
## P14,1,17,1.51434953124435
## P14,1,18,1.5008086773657
## P14,1,19,1.52040835618973
## P14,1,20,1.50886024747576
## P14,1,21,1.51154369466445
## P14,1,22,1.51499578085813
## P14,1,23,1.50694497038678
## P14,1,24,1.50514377173731
## P14,1,25,1.51153508099643
## P14,1,26,1.51065187454224
## P14,1,27,1.5334198474884
## P14,1,28,1.50186569874103
## P14,1,29,1.50539769066705
## P14,1,30,1.49633855204428
## P14,1,31,1.50972439183129
## P14,1,32,1.51935782799354
## P14,1,33,1.51455833293774
## P14,1,34,1.51168421336583
## P14,1,35,1.50634511311849
## P14,1,36,1.5128806483361
## P14,1,37,1.50705162684123
## P14,1,38,1.52174539793105
## P14,1,39,1.55422616004944
## Warning: There are no valid values for INTERVALS=40 in LISTP14[[1]]
## P14,1,41,1.51975973721208
## P14,1,42,1.50505100278293
## P14,1,43,1.52123537484337
## P14,1,44,1.5018128033342
## P14,1,45,1.51886803763253
## P14,1,46,1.51473739412096
## P14,1,47,1.51391545209018
## P14,1,48,1.50457715988159
## P14,1,49,1.49440556764603
## P14,1,50,1.49620717101627
## P14,2,1,1.51017768921391
## P14,2,2,1.51437164034162
## Warning: There are no valid values for INTERVALS=3 in LISTP14[[2]]
## P14,2,4,1.50686592405493
## P14,2,5,1.49550376619611
## P14,2,6,1.50383857885997
## P14,2,7,1.5151082106999
## P14,2,8,1.50930122895674
## P14,2,9,1.46550239835467
## P14,2,10,1.51721137220209
## P14,2,11,1.50905859470367
## P14,2,12,1.49915066887351
## P14,2,13,1.52114518996208
## P14,2,14,1.5202673792839
## P14,2,15,1.49528601861769
## P14,2,16,1.50118176142375
## P14,2,17,1.50387952385879
## P14,2,18,1.51539385760272
## P14,2,19,1.51906514989919
## P14,2,20,1.49827831441706
## P14,2,21,1.51676646868388
## P14,2,22,1.51358325140817
## P14,2,23,1.51606322623588
## P14,2,24,1.49489303588867
## P14,2,25,1.52184602862499
## P14,2,26,1.50912759333481
## P14,2,27,1.51014566421509
## P14,2,28,1.50997776904349
## P14,2,29,1.5084082826655
## P14,2,30,1.50942909895484
## P14,2,31,1.51927469798497
## P14,2,32,1.50998743497408
## P14,2,33,1.50199424519258
## P14,2,34,1.50664744266244
## P14,2,35,1.5169202486674
## P14,2,36,1.50185800790787
## P14,2,37,1.49968267679214
## P14,2,38,1.5109740447998
## P14,2,39,1.49208927154541
## P14,2,40,1.51277471780777
## P14,2,41,1.50198109944661
## P14,2,42,1.50273753007253
## P14,2,43,1.51826303433149
## P14,2,44,1.52349630717574
## P14,2,45,1.51636349734138
## P14,2,46,1.50710397778135
## P14,2,47,1.50543187304241
## P14,2,48,1.50885373598909
## P14,2,49,1.50828591708479
## P14,2,50,1.53331827080768
## P14,3,1,1.50865906874339
## P14,3,2,1.52032588777088
## P14,3,3,1.51102774302165
## P14,3,4,1.50878690887283
## P14,3,5,1.51425466083345
## P14,3,6,1.51069899008308
## P14,3,7,1.51348159880865
## P14,3,8,1.51121911337209
## P14,3,9,1.51161403954029
## P14,3,10,1.49289499629628
## P14,3,11,1.50958371424413
## P14,3,12,1.50587232296283
## P14,3,13,1.51241851179567
## P14,3,14,1.52555270933769
## P14,3,15,1.50286985578991
## P14,3,16,1.51251222973778
## P14,3,17,1.50425762965761
## P14,3,18,1.5205561319987
## P14,3,19,1.50964950055492
## P14,3,20,1.51603947986256
## P14,3,21,1.51367437839508
## P14,3,22,1.51275765895844
## P14,3,23,1.51188877184097
## P14,3,24,1.50703885063292
## P14,3,25,1.5073413602237
## P14,3,26,1.50677029291789
## P14,3,27,1.5125087211872
## P14,3,28,1.51370066565436
## P14,3,29,1.50729331289019
## P14,3,30,1.50808905883574
## P14,3,31,1.51086126565933
## P14,3,32,1.51599066074078
## P14,3,33,1.5144007043405
## P14,3,34,1.5084785885281
## P14,3,35,1.50916936056955
## P14,3,36,1.50834903572545
## P14,3,37,1.5104874939215
## P14,3,38,1.50769133751209
## P14,3,39,1.50859183407901
## P14,3,40,1.50735969543457
## P14,3,41,1.50938420295715
## P14,3,42,1.50731720767178
## P14,3,43,1.51235481408926
## P14,3,44,1.50536526804385
## P14,3,45,1.50638108322586
## P14,3,46,1.51082587242126
## P14,3,47,1.51261877130579
## P14,3,48,1.51326165479772
## P14,3,49,1.50515000025431
## P14,3,50,1.50712513636394
## P14,4,1,1.50980045795441
## P14,4,2,1.51372915401793
## P14,4,3,1.50038763284683
## P14,4,4,1.50703070380471
## P14,4,5,1.49744060917905
## P14,4,6,1.50705165129441
## P14,4,7,1.51306368795673
## P14,4,8,1.51018986701965
## P14,4,9,1.50854785101754
## P14,4,10,1.50936631361643
## P14,4,11,1.51130261110223
## P14,4,12,1.50858054337678
## P14,4,13,1.51107871147894
## P14,4,14,1.51588518278939
## P14,4,15,1.50662826669627
## P14,4,16,1.50436666830262
## P14,4,17,1.51119883986544
## P14,4,18,1.50814057619144
## P14,4,19,1.50886023774439
## P14,4,20,1.51315945285862
## P14,4,21,1.50946019335491
## P14,4,22,1.50908588501344
## P14,4,23,1.50698899015596
## P14,4,24,1.51080911767249
## P14,4,25,1.51539796796338
## P14,4,26,1.51270783996582
## P14,4,27,1.50959353161673
## P14,4,28,1.51066194082561
## P14,4,29,1.5079340280271
## P14,4,30,1.50852484983556
## P14,4,31,1.50961250066757
## P14,4,32,1.51482694237321
## P14,4,33,1.51104042423305
## P14,4,34,1.5028218967574
## P14,4,35,1.50764479086949
## P14,4,36,1.50880286272834
## P14,4,37,1.50961993358753
## P14,4,38,1.52314575513204
## P14,4,39,1.5094040151228
## P14,4,40,1.5108440586778
## P14,4,41,1.51045517045624
## P14,4,42,1.50896467604079
## P14,4,43,1.5120858669281
## P14,4,44,1.52197939872742
## P14,4,45,1.51920538790086
## P14,4,46,1.50671761643653
## P14,4,47,1.50821805458802
## P14,4,48,1.50986947684452
## P14,4,49,1.50744855709565
## Warning: There are no valid values for INTERVALS=50 in LISTP14[[4]]
## P14,5,1,1.51166216064902
## P14,5,2,1.51264901704426
## P14,5,3,1.51238552729289
## P14,5,4,1.50869726298148
## P14,5,5,1.51007406413555
## P14,5,6,1.51677297509235
## P14,5,7,1.51241680291983
## P14,5,8,1.51190050385839
## P14,5,9,1.51114242127601
## P14,5,10,1.5108330270164
## P14,5,11,1.50937442887913
## P14,5,12,1.50938782325158
## P14,5,13,1.51078319549561
## P14,5,14,1.51316208653636
## P14,5,15,1.50617026853132
## P14,5,16,1.50440197405608
## P14,5,17,1.50374264944167
## P14,5,18,1.51161240086411
## P14,5,19,1.509059967251
## P14,5,20,1.50997313787771
## P14,5,21,1.5100222127191
## P14,5,22,1.51442630290985
## P14,5,23,1.51226540974208
## P14,5,24,1.50363712599783
## P14,5,25,1.50987873954334
## P14,5,26,1.49855701128642
## P14,5,27,1.51066782951355
## P14,5,28,1.51635989546776
## P14,5,29,1.50878266334534
## P14,5,30,1.50930901845296
## P14,5,31,1.51021673462608
## P14,5,32,1.51107366735285
## P14,5,33,1.50914832820063
## P14,5,34,1.51198733130167
## P14,5,35,1.50385199955532
## P14,5,36,1.5035400390625
## P14,5,37,1.52225547540383
## P14,5,38,1.50427932324617
## P14,5,39,1.51284469876971
## P14,5,40,1.50711255915025
## P14,5,41,1.51644006067393
## P14,5,42,1.51118825463688
## P14,5,43,1.51236155226424
## P14,5,44,1.51581162876553
## P14,5,45,1.51399624347687
## P14,5,46,1.52049642139011
## P14,5,47,1.51492480933666
## P14,5,48,1.51405359487065
## P14,5,49,1.50587507088979
## P14,5,50,1.51144411042333
## P14,6,1,1.51474377654848
## P14,6,2,1.51145778039489
## P14,6,3,1.51259378484778
## P14,6,4,1.51216039061546
## P14,6,5,1.51411453435119
## P14,6,6,1.51054056018007
## P14,6,7,1.51059624077617
## P14,6,8,1.5137093774565
## P14,6,9,1.51027428373999
## P14,6,10,1.51310976635326
## P14,6,11,1.51237976551056
## P14,6,12,1.51083571736406
## P14,6,13,1.51649194293552
## P14,6,14,1.50354545290877
## P14,6,15,1.51439905867857
## P14,6,16,1.51239502871478
## P14,6,17,1.50889173760472
## P14,6,18,1.50905611491439
## P14,6,19,1.51082748495122
## P14,6,20,1.5089976348375
## P14,6,21,1.51001528501511
## P14,6,22,1.51211977005005
## P14,6,23,1.51463074379779
## P14,6,24,1.50269926511324
## P14,6,25,1.51365424262153
## P14,6,26,1.50193412129472
## P14,6,27,1.51112594604492
## P14,6,28,1.51343371834553
## P14,6,29,1.50744426951689
## P14,6,30,1.5115863694085
## P14,6,31,1.45840107032231
## P14,6,32,1.52528265400937
## P14,6,33,1.5116799754255
## P14,6,34,1.50923546766623
## P14,6,35,1.51245926684282
## P14,6,36,1.51387813896131
## P14,6,37,1.52236969440014
## P14,6,38,1.50728498564826
## P14,6,39,1.50934243025603
## P14,6,40,1.51016715489901
## P14,6,41,1.51035344272579
## P14,6,42,1.51355591687289
## P14,6,43,1.51280120785317
## P14,6,44,1.50737647768817
## P14,6,45,1.50529642332168
## P14,6,46,1.50835414452128
## P14,6,47,1.51297459235558
## P14,6,48,1.50839987093089
## P14,6,49,1.50941495525027
## P14,6,50,1.51359745822375
## P14,7,1,1.51340836745042
## P14,7,2,1.51090223747387
## P14,7,3,1.50593087712272
## P14,7,4,1.50604809000251
## P14,7,5,1.50710549253099
## P14,7,6,1.51167526464353
## P14,7,7,1.51237051645915
## P14,7,8,1.50761237255363
## P14,7,9,1.50984429413418
## P14,7,10,1.51209077627763
## P14,7,11,1.50990805687842
## P14,7,12,1.50861838043377
## P14,7,13,1.51345198601484
## P14,7,14,1.50552350354482
## P14,7,15,1.49103270984087
## P14,7,16,1.51069853820053
## P14,7,17,1.50876653194427
## P14,7,18,1.50950059184322
## P14,7,19,1.51089113214043
## P14,7,20,1.51077574126574
## P14,7,21,1.5114251824676
## P14,7,22,1.51068487682858
## P14,7,23,1.51002209909846
## P14,7,24,1.51259642618674
## P14,7,25,1.51384219256314
## P14,7,26,1.4993162511
## P14,7,27,1.51749337987697
## P14,7,28,1.50986271916014
## P14,7,29,1.51554725336474
## P14,7,30,1.51302012618707
## P14,7,31,1.50746931118912
## P14,7,32,1.51076457023621
## P14,7,33,1.50618841730315
## P14,7,34,1.51355786417045
## P14,7,35,1.50909355948953
## P14,7,36,1.5047550811324
## P14,7,37,1.5157023528043
## P14,7,38,1.51967836007839
## P14,7,39,1.51040698422326
## P14,7,40,1.50465331850825
## P14,7,41,1.50694461454425
## P14,7,42,1.50601800588461
## P14,7,43,1.52355668177971
## P14,7,44,1.50763861111232
## P14,7,45,1.5111284130498
## P14,7,46,1.51594513553684
## P14,7,47,1.51531222828648
## P14,7,48,1.50740738038893
## P14,7,49,1.51370087004544
## P14,7,50,1.51199391308953
## P14,8,1,1.51512469077597
## P14,8,2,1.50952270232051
## P14,8,3,1.50646537542343
## P14,8,4,1.50596801289972
## P14,8,5,1.51386430165539
## P14,8,6,1.50376166366949
## P14,8,7,1.50759832064311
## P14,8,8,1.51275101794472
## P14,8,9,1.51252526503343
## P14,8,10,1.51075162262213
## P14,8,11,1.51983725323397
## P14,8,12,1.50778716057539
## P14,8,13,1.51175929278862
## P14,8,14,1.50946746826172
## P14,8,15,1.50445530026458
## P14,8,16,1.50876412247166
## P14,8,17,1.50880683792962
## P14,8,18,1.51308462513027
## P14,8,19,1.51105721202897
## P14,8,20,1.51142524719238
## P14,8,21,1.50886395440173
## P14,8,22,1.50754487271212
## P14,8,23,1.51322510901918
## P14,8,24,1.50871076583862
## P14,8,25,1.5062919821058
## P14,8,26,1.50598472423768
## P14,8,27,1.51156384457824
## P14,8,28,1.51183161271357
## P14,8,29,1.51084972563244
## P14,8,30,1.50991463661194
## P14,8,31,1.51180208882978
## P14,8,32,1.5109785898872
## P14,8,33,1.51246410922
## P14,8,34,1.51634211399976
## P14,8,35,1.51057715164988
## P14,8,36,1.50827584483407
## P14,8,37,1.51727688939948
## P14,8,38,1.51187278827031
## P14,8,39,1.50385200712416
## P14,8,40,1.51212784855865
## P14,8,41,1.51309025287628
## P14,8,42,1.51016250023475
## P14,8,43,1.51110119923301
## P14,8,44,1.50846416919262
## P14,8,45,1.50905921187582
## P14,8,46,1.51131304004524
## P14,8,47,1.51384222861564
## P14,8,48,1.51223086619723
## P14,8,49,1.51082098484039
## P14,8,50,1.50904464991079
## P14,9,1,1.51176510006189
## P14,9,2,1.5103444878648
## P14,9,3,1.50639391918572
## P14,9,4,1.50886279344559
## P14,9,5,1.51004686700292
## P14,9,6,1.51135414721919
## P14,9,7,1.51333670055165
## P14,9,8,1.51018988291423
## P14,9,9,1.50935944532737
## P14,9,10,1.5109955288115
## P14,9,11,1.51093651036747
## P14,9,12,1.51223088755752
## P14,9,13,1.51413841107312
## P14,9,14,1.51408289624499
## P14,9,15,1.50937208821697
## P14,9,16,1.51263372898102
## P14,9,17,1.51470985412598
## P14,9,18,1.50896668188351
## P14,9,19,1.51224940398644
## P14,9,20,1.51037495476859
## P14,9,21,1.51055010433855
## P14,9,22,1.50632813512063
## P14,9,23,1.50828521679609
## P14,9,24,1.50730212996988
## P14,9,25,1.51020374605733
## P14,9,26,1.51362448125272
## P14,9,27,1.51080371311733
## P14,9,28,1.50976457401198
## P14,9,29,1.51083282162161
## P14,9,30,1.51633519046711
## P14,9,31,1.51059148477954
## P14,9,32,1.50724024905099
## P14,9,33,1.51185549931093
## P14,9,34,1.51066989898682
## P14,9,35,1.50882559458415
## P14,9,36,1.51105117797852
## P14,9,37,1.51172562776986
## P14,9,38,1.50413112129484
## P14,9,39,1.51103624804267
## P14,9,40,1.50774221915703
## P14,9,41,1.51270995913325
## P14,9,42,1.50768070329319
## P14,9,43,1.51419853247129
## P14,9,44,1.51397648122576
## P14,9,45,1.51924486721263
## P14,9,46,1.51451898574829
## P14,9,47,1.50468899144067
## P14,9,48,1.51896711190542
## P14,9,49,1.51306433513247
## P14,9,50,1.51222290851102
## P14,10,1,1.51109411945082
## P14,10,2,1.51194315540547
## P14,10,3,1.50960755348206
## P14,10,4,1.50894109904766
## P14,10,5,1.51910472930746
## P14,10,6,1.51011340434735
## P14,10,7,1.51594500541687
## P14,10,8,1.51027426876865
## P14,10,9,1.51023283958435
## P14,10,10,1.51010596752167
## P14,10,11,1.51063475518856
## P14,10,12,1.50923018552819
## P14,10,13,1.50795846033578
## P14,10,14,1.51406852850753
## P14,10,15,1.51772405162002
## P14,10,16,1.51216948827108
## P14,10,17,1.50928200564338
## P14,10,18,1.51620106844558
## P14,10,19,1.51239201805808
## P14,10,20,1.50934745387027
## P14,10,21,1.51364305046167
## P14,10,22,1.5105771416112
## P14,10,23,1.50731553935041
## P14,10,24,1.51243230842409
## P14,10,25,1.50886176330875
## P14,10,26,1.49911966777983
## P14,10,27,1.50728901794979
## P14,10,28,1.51197695732117
## P14,10,29,1.51084512710571
## P14,10,30,1.50989819681922
## P14,10,31,1.51163470745087
## P14,10,32,1.51149493455887
## P14,10,33,1.51020181620563
## P14,10,34,1.51118164284285
## P14,10,35,1.51193717122078
## P14,10,36,1.51125081052485
## P14,10,37,1.50750269552674
## P14,10,38,1.51213017602762
## P14,10,39,1.50887396931648
## P14,10,40,1.5105447867482
## P14,10,41,1.50778646259517
## P14,10,42,1.51008475648946
## P14,10,43,1.51243230052616
## P14,10,44,1.51138084306629
## P14,10,45,1.51050105749392
## P14,10,46,1.51084975288028
## P14,10,47,1.51322303436421
## P14,10,48,1.51226553865658
## P14,10,49,1.50959215689143
## P14,10,50,1.50972680465595
## P15,1,1,1.51216810090201
## P15,1,2,1.51184887310554
## P15,1,3,1.51333208179953
## P15,1,4,1.51312970288227
## P15,1,5,1.51247554050066
## P15,1,6,1.5107039107078
## P15,1,7,1.51410493902538
## P15,1,8,1.50919053850383
## P15,1,9,1.51059314331722
## P15,1,10,1.51292203041503
## P15,1,11,1.51142089084912
## P15,1,12,1.51424287332071
## P15,1,13,1.51145681914161
## P15,1,14,1.50798013312685
## P15,1,15,1.51605565171493
## P15,1,16,1.51023911105262
## P15,1,17,1.51124342893943
## P15,1,18,1.51027483014918
## P15,1,19,1.51295106338732
## P15,1,20,1.51222738662323
## P15,1,21,1.51204983304056
## P15,1,22,1.51383496189977
## P15,1,23,1.51126050685651
## P15,1,24,1.51345579478205
## P15,1,25,1.51089211127058
## P15,1,26,1.51150438826897
## P15,1,27,1.511996282326
## P15,1,28,1.51163745951909
## P15,1,29,1.51069869313921
## P15,1,30,1.51114014845628
## P15,1,31,1.51464135472367
## P15,1,32,1.51225689149672
## P15,1,33,1.509671718934
## P15,1,34,1.51205785482522
## P15,1,35,1.51109770643033
## P15,1,36,1.51145682615392
## P15,1,37,1.51181715372446
## P15,1,38,1.51265104098987
## P15,1,39,1.51210973854352
## P15,1,40,1.51045580220416
## P15,1,41,1.51043141530659
## P15,1,42,1.5090679274665
## P15,1,43,1.51351884595391
## P15,1,44,1.50889675572233
## P15,1,45,1.51102239483005
## P15,1,46,1.51235042387439
## P15,1,47,1.51053385362557
## P15,1,48,1.50970161611384
## P15,1,49,1.51128753831115
## P15,1,50,1.51075350362367
## P15,2,1,1.51354711554771
## P15,2,2,1.51403922360876
## P15,2,3,1.50832398297036
## P15,2,4,1.51050924403327
## P15,2,5,1.51111961562058
## P15,2,6,1.51119117630261
## P15,2,7,1.51212399346488
## P15,2,8,1.51238009134928
## P15,2,9,1.51196844288797
## P15,2,10,1.51345159549906
## P15,2,11,1.51149906317393
## P15,2,12,1.51273052821788
## P15,2,13,1.50622504841198
## P15,2,14,1.51302140613772
## P15,2,15,1.51255794562916
## P15,2,16,1.51218563787053
## P15,2,17,1.51290760993958
## P15,2,18,1.51095921853009
## P15,2,19,1.51504065394402
## P15,2,20,1.51151750485102
## P15,2,21,1.51001324604467
## P15,2,22,1.51489451466774
## P15,2,23,1.51101415984485
## P15,2,24,1.51351312852242
## P15,2,25,1.51134217645704
## P15,2,26,1.51345491409302
## P15,2,27,1.51267120450042
## P15,2,28,1.50674471401033
## P15,2,29,1.51146185398102
## P15,2,30,1.51145266944712
## P15,2,31,1.51396038373311
## P15,2,32,1.50766720617971
## P15,2,33,1.51358466851907
## P15,2,34,1.49823750502674
## P15,2,35,1.51248950722777
## P15,2,36,1.51587792379516
## P15,2,37,1.51297848503869
## P15,2,38,1.51722171243313
## P15,2,39,1.51301460201237
## P15,2,40,1.51332090682342
## P15,2,41,1.50775501021632
## P15,2,42,1.50805608142506
## P15,2,43,1.50143989890513
## P15,2,44,1.5054986378918
## P15,2,45,1.5061485688765
## P15,2,46,1.51304635768983
## P15,2,47,1.50876874751873
## P15,2,48,1.51140175050902
## P15,2,49,1.51151583790779
## P15,2,50,1.50867441260957
## P15,3,1,1.50726431834547
## P15,3,2,1.50066051175517
## P15,3,3,1.50848757815199
## P15,3,4,1.51304290050597
## P15,3,5,1.51354880391816
## P15,3,6,1.51122759273217
## P15,3,7,1.51290227427627
## P15,3,8,1.51155771707234
## P15,3,9,1.51115085498707
## P15,3,10,1.50823436912737
## P15,3,11,1.51258584335967
## P15,3,12,1.51445172765981
## P15,3,13,1.51011380313957
## P15,3,14,1.50660888295974
## P15,3,15,1.51599554582076
## P15,3,16,1.50938619802028
## P15,3,17,1.50827348709106
## P15,3,18,1.51275285196976
## P15,3,19,1.51465794742107
## P15,3,20,1.5154325277909
## P15,3,21,1.51294836594691
## P15,3,22,1.51068342604288
## P15,3,23,1.50998219055466
## P15,3,24,1.51105338691646
## P15,3,25,1.50975265000996
## P15,3,26,1.51091832672523
## P15,3,27,1.51150834371173
## P15,3,28,1.51517924856632
## P15,3,29,1.50975234640969
## P15,3,30,1.50761383313399
## P15,3,31,1.5086821185218
## P15,3,32,1.51386272831328
## P15,3,33,1.51150901412964
## P15,3,34,1.51395462464917
## P15,3,35,1.50767106480069
## P15,3,36,1.50822977439777
## P15,3,37,1.51516540476818
## P15,3,38,1.51088987526141
## P15,3,39,1.51090698242188
## P15,3,40,1.50782723860307
## P15,3,41,1.51482511997223
## P15,3,42,1.51057262328065
## P15,3,43,1.50963822343296
## P15,3,44,1.50329891926533
## P15,3,45,1.5224407627469
## P15,3,46,1.50994818184965
## P15,3,47,1.5077997469902
## P15,3,48,1.50994204391133
## P15,3,49,1.51108988169077
## P15,3,50,1.51004630480057
## P15,4,1,1.5136239236401
## P15,4,2,1.51219199279259
## P15,4,3,1.51288138142339
## P15,4,4,1.51214266519477
## P15,4,5,1.51100609619493
## P15,4,6,1.511804750143
## P15,4,7,1.51231213577655
## P15,4,8,1.51090263675999
## P15,4,9,1.50862480646156
## P15,4,10,1.51247502818252
## P15,4,11,1.51103161309512
## P15,4,12,1.51484143888796
## P15,4,13,1.50858373539422
## P15,4,14,1.51029533293189
## P15,4,15,1.50779195908577
## P15,4,16,1.51333866516749
## P15,4,17,1.51162972817054
## P15,4,18,1.5132332596668
## P15,4,19,1.51274959355184
## P15,4,20,1.51527639821912
## P15,4,21,1.50854180988513
## P15,4,22,1.51290973469063
## P15,4,23,1.51097763026202
## P15,4,24,1.51289084617128
## P15,4,25,1.51308637795989
## P15,4,26,1.50836781966381
## P15,4,27,1.50932474931081
## P15,4,28,1.5159162011477
## P15,4,29,1.51075580891441
## P15,4,30,1.5094330440868
## P15,4,31,1.51258003446791
## P15,4,32,1.51152387443854
## P15,4,33,1.51397241245617
## P15,4,34,1.5112119457301
## P15,4,35,1.51105087453669
## P15,4,36,1.50913795778307
## P15,4,37,1.51519640455855
## P15,4,38,1.5106815296215
## P15,4,39,1.51108309340804
## P15,4,40,1.51132658063149
## P15,4,41,1.51176359653473
## P15,4,42,1.51354295639765
## P15,4,43,1.51007523407807
## P15,4,44,1.5120939678616
## P15,4,45,1.51111597485012
## P15,4,46,1.51329883309298
## P15,4,47,1.50962124700132
## P15,4,48,1.51199057227687
## P15,4,49,1.51379485223808
## P15,4,50,1.51036023070372
## P15,5,1,1.51251395543416
## P15,5,2,1.50959233045578
## P15,5,3,1.51111464793456
## P15,5,4,1.5139331817627
## P15,5,5,1.5065827268772
## P15,5,6,1.50931471845378
## P15,5,7,1.51471252794619
## P15,5,8,1.50755427032709
## P15,5,9,1.51597770150886
## P15,5,10,1.50899110618213
## P15,5,11,1.51141292630261
## P15,5,12,1.51144080315867
## P15,5,13,1.51372780038055
## P15,5,14,1.50945499160073
## P15,5,15,1.51228540463555
## P15,5,16,1.50923844405583
## P15,5,17,1.51647336875336
## P15,5,18,1.51057618214534
## P15,5,19,1.50772812366486
## P15,5,20,1.51170670555299
## P15,5,21,1.51404364109039
## P15,5,22,1.50790765881538
## P15,5,23,1.51172805677914
## P15,5,24,1.51187880299672
## P15,5,25,1.50978542215684
## P15,5,26,1.51217512717614
## P15,5,27,1.50863945316261
## P15,5,28,1.51246105678498
## P15,5,29,1.51194836566975
## P15,5,30,1.50741228783966
## P15,5,31,1.51250410909238
## P15,5,32,1.51038057925337
## P15,5,33,1.51216793060303
## P15,5,34,1.51131282850753
## P15,5,35,1.513051058795
## P15,5,36,1.51380657938729
## P15,5,37,1.50777718353271
## P15,5,38,1.51130437850952
## P15,5,39,1.51145718968104
## P15,5,40,1.51226284011962
## P15,5,41,1.50936567951256
## P15,5,42,1.51312909899531
## P15,5,43,1.50959463059148
## P15,5,44,1.50807619406507
## P15,5,45,1.50883436203003
## P15,5,46,1.51069556542163
## P15,5,47,1.51059734410253
## P15,5,48,1.5114530201616
## P15,5,49,1.51327720865027
## P15,5,50,1.51143612764759
## P15,6,1,1.51441624462605
## P15,6,2,1.51314953187617
## P15,6,3,1.51844323686807
## P15,6,4,1.51173793642144
## P15,6,5,1.51459754837884
## P15,6,6,1.51722045438043
## P15,6,7,1.51285100416704
## P15,6,8,1.51117187476008
## P15,6,9,1.51222631064328
## P15,6,10,1.51501363625556
## P15,6,11,1.51255214365223
## P15,6,12,1.51231546033153
## P15,6,13,1.51359955374017
## P15,6,14,1.51249798743621
## P15,6,15,1.50802558557147
## P15,6,16,1.51366611647476
## P15,6,17,1.51200815088609
## P15,6,18,1.51751661300659
## P15,6,19,1.51074507248462
## P15,6,20,1.51178705192612
## P15,6,21,1.50735287368298
## P15,6,22,1.51506309876075
## P15,6,23,1.50504998193271
## P15,6,24,1.51129304990172
## P15,6,25,1.51070982423322
## P15,6,26,1.50849428259093
## P15,6,27,1.51242864348672
## P15,6,28,1.51092008938865
## P15,6,29,1.51345547103882
## P15,6,30,1.50818781021538
## P15,6,31,1.51276376679188
## P15,6,32,1.50699409361809
## P15,6,33,1.51172485824459
## P15,6,34,1.50754584785269
## P15,6,35,1.51228262087621
## P15,6,36,1.51229034095514
## P15,6,37,1.51103162037507
## P15,6,38,1.5139066734314
## P15,6,39,1.51608922940875
## P15,6,40,1.50915471778428
## P15,6,41,1.51575242703961
## P15,6,42,1.51022725312606
## P15,6,43,1.5111106463841
## P15,6,44,1.51134041108583
## P15,6,45,1.51185773548327
## P15,6,46,1.51167370448603
## P15,6,47,1.51201922206555
## P15,6,48,1.5107514034618
## P15,6,49,1.51289437331405
## P15,6,50,1.51061682604455
## P15,7,1,1.51391641403499
## P15,7,2,1.50985454110538
## P15,7,3,1.51256177255086
## P15,7,4,1.51356598309108
## P15,7,5,1.50704975438312
## P15,7,6,1.51291846406871
## P15,7,7,1.51130523072912
## P15,7,8,1.51095471191406
## P15,7,9,1.51233718461461
## P15,7,10,1.50866210725572
## P15,7,11,1.50948174376237
## P15,7,12,1.51106447960014
## P15,7,13,1.51051087228079
## P15,7,14,1.51238603591919
## P15,7,15,1.51135197946848
## P15,7,16,1.51508521011897
## P15,7,17,1.5121121961017
## P15,7,18,1.51097892514236
## P15,7,19,1.51041463383457
## P15,7,20,1.5107806930542
## P15,7,21,1.51024319307647
## P15,7,22,1.51118163545002
## P15,7,23,1.51134041736
## P15,7,24,1.51209662538586
## P15,7,25,1.51170161170681
## P15,7,26,1.51198860039388
## P15,7,27,1.50958526134491
## P15,7,28,1.51219026180876
## P15,7,29,1.5111304763856
## P15,7,30,1.51263971826923
## P15,7,31,1.51298993481092
## P15,7,32,1.51056084036827
## P15,7,33,1.51297144937997
## P15,7,34,1.51296492152744
## P15,7,35,1.5109638556456
## P15,7,36,1.50902855496447
## P15,7,37,1.512311445583
## P15,7,38,1.50990496925686
## P15,7,39,1.50807468096415
## P15,7,40,1.512009148204
## P15,7,41,1.51452466179343
## P15,7,42,1.51009036045448
## P15,7,43,1.51293487919187
## P15,7,44,1.51061954100927
## P15,7,45,1.51117174277145
## P15,7,46,1.5085325331915
## P15,7,47,1.51180568006304
## P15,7,48,1.5105889356589
## P15,7,49,1.51140105247498
## P15,7,50,1.5096137301522
## P15,8,1,1.51507705171532
## P15,8,2,1.51034174294307
## P15,8,3,1.51099473283491
## P15,8,4,1.50890256928616
## P15,8,5,1.51044331118464
## P15,8,6,1.5124663903163
## P15,8,7,1.51119930499068
## P15,8,8,1.51047809251392
## P15,8,9,1.50993215053453
## P15,8,10,1.509600824561
## P15,8,11,1.51112410998104
## P15,8,12,1.51167311576697
## P15,8,13,1.51276547886501
## P15,8,14,1.51054810708569
## P15,8,15,1.51131241321564
## P15,8,16,1.51259776098388
## P15,8,17,1.5111828664454
## P15,8,18,1.50905677496669
## P15,8,19,1.5109594501555
## P15,8,20,1.51137530487196
## P15,8,21,1.51192036271095
## P15,8,22,1.50960502359602
## P15,8,23,1.50982985638156
## P15,8,24,1.51095646077936
## P15,8,25,1.51028921604156
## P15,8,26,1.51279241870148
## P15,8,27,1.51010065159555
## P15,8,28,1.50834829756554
## P15,8,29,1.50925613366641
## P15,8,30,1.50741422817271
## P15,8,31,1.51078874588013
## P15,8,32,1.50634418487549
## P15,8,33,1.51015141203597
## P15,8,34,1.51257388898642
## P15,8,35,1.51356294631958
## P15,8,36,1.50856809262876
## P15,8,37,1.51197156686892
## P15,8,38,1.51100024548206
## P15,8,39,1.51089766479674
## P15,8,40,1.51135343136174
## P15,8,41,1.50945581330193
## P15,8,42,1.51167389787274
## P15,8,43,1.50938988359351
## P15,8,44,1.51398233227108
## P15,8,45,1.5141365986604
## P15,8,46,1.50968469313855
## P15,8,47,1.507719151179
## P15,8,48,1.50861040162451
## P15,8,49,1.50855047594417
## P15,8,50,1.51146101951599
## P15,9,1,1.50576509055445
## P15,9,2,1.51643956597172
## P15,9,3,1.51198619559959
## P15,9,4,1.51059702559785
## P15,9,5,1.51106562102137
## P15,9,6,1.51067926618788
## P15,9,7,1.50957323668839
## P15,9,8,1.51193062859292
## P15,9,9,1.50939636160857
## P15,9,10,1.51056624861325
## P15,9,11,1.51140824870059
## P15,9,12,1.51109724973155
## P15,9,13,1.51637710013041
## P15,9,14,1.51022183140622
## P15,9,15,1.50716449664189
## P15,9,16,1.51557437896729
## P15,9,17,1.51862477241678
## P15,9,18,1.51291089539134
## P15,9,19,1.51103731437966
## P15,9,20,1.51079860734351
## P15,9,21,1.51163060524884
## P15,9,22,1.50972267816652
## P15,9,23,1.513269769518
## P15,9,24,1.51058226161533
## P15,9,25,1.50452308556468
## P15,9,26,1.51829412794605
## P15,9,27,1.51143386287074
## P15,9,28,1.51056148769619
## P15,9,29,1.50888562720755
## P15,9,30,1.51570880531084
## P15,9,31,1.51067998011907
## P15,9,32,1.50862121114544
## P15,9,33,1.51138082263977
## P15,9,34,1.50967853927612
## P15,9,35,1.51065755340288
## P15,9,36,1.51043160756429
## P15,9,37,1.51041815357824
## P15,9,38,1.51067192573858
## P15,9,39,1.50734272323737
## P15,9,40,1.51336829802569
## P15,9,41,1.50928710515683
## P15,9,42,1.51306002811321
## P15,9,43,1.50909874948223
## P15,9,44,1.51003117507763
## P15,9,45,1.50979899918592
## P15,9,46,1.51221723475699
## P15,9,47,1.51283942892196
## P15,9,48,1.5103146922481
## P15,9,49,1.5109871799506
## P15,9,50,1.50852669244525
## P15,10,1,1.51061957283358
## P15,10,2,1.5127811005445
## P15,10,3,1.51212834878401
## P15,10,4,1.51433581365666
## P15,10,5,1.51038191815932
## P15,10,6,1.51044565653629
## P15,10,7,1.5113311266377
## P15,10,8,1.51048747437899
## P15,10,9,1.51025061741054
## P15,10,10,1.50927680604001
## P15,10,11,1.50881867689245
## P15,10,12,1.51117439989774
## P15,10,13,1.51163540715757
## P15,10,14,1.51205287423245
## P15,10,15,1.50654646423128
## P15,10,16,1.51908563395016
## P15,10,17,1.5119989640785
## P15,10,18,1.50985769603563
## P15,10,19,1.51260944734137
## P15,10,20,1.51086743061359
## P15,10,21,1.51093441316451
## P15,10,22,1.51160145799319
## P15,10,23,1.51282959684319
## P15,10,24,1.50518844267901
## P15,10,25,1.51661269518794
## P15,10,26,1.50990417085845
## P15,10,27,1.51018822313559
## P15,10,28,1.50990871354645
## P15,10,29,1.51003587489225
## P15,10,30,1.51261758804321
## P15,10,31,1.51138637152063
## P15,10,32,1.51028781077441
## P15,10,33,1.5113494087668
## P15,10,34,1.51018826648442
## P15,10,35,1.5119535414899
## P15,10,36,1.50857664289929
## P15,10,37,1.51315862482244
## P15,10,38,1.51226705915472
## P15,10,39,1.51122138011886
## P15,10,40,1.50980343137469
## P15,10,41,1.50933996368857
## P15,10,42,1.50916467129605
## P15,10,43,1.51040897586129
## P15,10,44,1.51169609201366
## P15,10,45,1.51191463203074
## P15,10,46,1.51448292995062
## P15,10,47,1.50981391054913
## P15,10,48,1.50954762151686
## P15,10,49,1.51189871001662
## P15,10,50,1.51154357834724
## P16,1,1,1.5145711255452
## P16,1,2,1.51406555836744
## P16,1,3,1.51278822062767
## P16,1,4,1.51193937188701
## P16,1,5,1.51096918298014
## P16,1,6,1.51227016759113
## P16,1,7,1.51231964563919
## P16,1,8,1.51199970660002
## P16,1,9,1.51268405147961
## P16,1,10,1.51130437453588
## P16,1,11,1.51175975395461
## P16,1,12,1.51321340188747
## P16,1,13,1.51288831329346
## P16,1,14,1.51075385014216
## P16,1,15,1.51163193426634
## P16,1,16,1.51259203286007
## P16,1,17,1.51129988564385
## P16,1,18,1.50966109900639
## P16,1,19,1.51303655154085
## P16,1,20,1.51057215297923
## P16,1,21,1.51303652354649
## P16,1,22,1.51246825712068
## P16,1,23,1.51113348993762
## P16,1,24,1.51251523634967
## P16,1,25,1.51018340247018
## P16,1,26,1.51117416741191
## P16,1,27,1.51279737055302
## P16,1,28,1.50679118789896
## P16,1,29,1.51149992595445
## P16,1,30,1.51507684472319
## P16,1,31,1.51040390766028
## P16,1,32,1.50994480848312
## P16,1,33,1.51081961753384
## P16,1,34,1.51103133360545
## P16,1,35,1.5108078857521
## P16,1,36,1.51116326981527
## P16,1,37,1.51311710774899
## P16,1,38,1.51315787039607
## P16,1,39,1.51128348597774
## P16,1,40,1.51136730673784
## P16,1,41,1.50975577364263
## P16,1,42,1.51586726764301
## P16,1,43,1.51225295785355
## P16,1,44,1.51203381929466
## P16,1,45,1.5126212798443
## P16,1,46,1.51111397598729
## P16,1,47,1.5134204634084
## P16,1,48,1.51113224029541
## P16,1,49,1.51080389346107
## P16,1,50,1.51042858820136
## P16,2,1,1.51156982275156
## P16,2,2,1.5123615178976
## P16,2,3,1.51075724710392
## P16,2,4,1.5109177378865
## P16,2,5,1.51305794926871
## P16,2,6,1.51032346741766
## P16,2,7,1.5105224833431
## P16,2,8,1.510067542394
## P16,2,9,1.5099223622909
## P16,2,10,1.51194393471496
## P16,2,11,1.51081622491671
## P16,2,12,1.5108101342314
## P16,2,13,1.50827501061257
## P16,2,14,1.50893692421702
## P16,2,15,1.50553153871416
## P16,2,16,1.50976647769704
## P16,2,17,1.50858789596005
## P16,2,18,1.51430376370748
## P16,2,19,1.51150579886003
## P16,2,20,1.5134504200661
## P16,2,21,1.51113479636436
## P16,2,22,1.50428289777777
## P16,2,23,1.51544151021473
## P16,2,24,1.51426158539236
## P16,2,25,1.51064075921711
## P16,2,26,1.51034374065227
## P16,2,27,1.51178586142404
## P16,2,28,1.50950940950649
## P16,2,29,1.51164213052163
## P16,2,30,1.51142520904541
## P16,2,31,1.50659124873509
## P16,2,32,1.50986883857033
## P16,2,33,1.5087874980822
## P16,2,34,1.51163029670715
## P16,2,35,1.51005125471524
## P16,2,36,1.51161674202466
## P16,2,37,1.50718034211025
## P16,2,38,1.50933721462886
## P16,2,39,1.4947346051534
## P16,2,40,1.5143868822447
## P16,2,41,1.5095500819451
## P16,2,42,1.51111734204176
## P16,2,43,1.51176766753197
## P16,2,44,1.51262532174587
## P16,2,45,1.5107080910232
## P16,2,46,1.51184558453767
## P16,2,47,1.51109349493887
## P16,2,48,1.51214216827253
## P16,2,49,1.51283514976501
## P16,2,50,1.51085694914772
## P16,3,1,1.51464785469903
## P16,3,2,1.51112886954998
## P16,3,3,1.51392752142514
## P16,3,4,1.51194501307703
## P16,3,5,1.50958552698451
## P16,3,6,1.51010764141877
## P16,3,7,1.51337576988048
## P16,3,8,1.51027002404718
## P16,3,9,1.50931115722656
## P16,3,10,1.51211327531912
## P16,3,11,1.51133084511972
## P16,3,12,1.5111219069537
## P16,3,13,1.50798710002456
## P16,3,14,1.51196231941382
## P16,3,15,1.5107806968689
## P16,3,16,1.51096815329332
## P16,3,17,1.50909017708342
## P16,3,18,1.51268718516932
## P16,3,19,1.5147388058324
## P16,3,20,1.51002407765043
## P16,3,21,1.51037278046479
## P16,3,22,1.51037292091214
## P16,3,23,1.50910983214507
## P16,3,24,1.51182805514726
## P16,3,25,1.50825511890909
## P16,3,26,1.51070085578009
## P16,3,27,1.50933433146704
## P16,3,28,1.50769653793209
## P16,3,29,1.50986424088478
## P16,3,30,1.50875087247954
## P16,3,31,1.51406742936821
## P16,3,32,1.5061925711091
## P16,3,33,1.50838566910137
## P16,3,34,1.51008245883844
## P16,3,35,1.50977360725403
## P16,3,36,1.51034363655195
## P16,3,37,1.51057860810878
## P16,3,38,1.50856297057972
## P16,3,39,1.51484500093663
## P16,3,40,1.51293855744439
## P16,3,41,1.50980220324751
## P16,3,42,1.51455960861624
## P16,3,43,1.51134920570086
## P16,3,44,1.50971103729086
## P16,3,45,1.5096182346344
## P16,3,46,1.50809927475758
## P16,3,47,1.50883244601163
## P16,3,48,1.51211439845074
## P16,3,49,1.50785344839096
## P16,3,50,1.51018397788691
## P16,4,1,1.51047798105188
## P16,4,2,1.51286611648706
## P16,4,3,1.51065283373368
## P16,4,4,1.50958493885241
## P16,4,5,1.50960423195199
## P16,4,6,1.51005909546562
## P16,4,7,1.50850468211704
## P16,4,8,1.50986210097615
## P16,4,9,1.50868760323038
## P16,4,10,1.51025125412714
## P16,4,11,1.51499592971802
## P16,4,12,1.50932660795027
## P16,4,13,1.51014260101318
## P16,4,14,1.51135676826527
## P16,4,15,1.51185654148911
## P16,4,16,1.51069682264981
## P16,4,17,1.50820257928636
## P16,4,18,1.51142523386707
## P16,4,19,1.51064326716404
## P16,4,20,1.51266771914011
## P16,4,21,1.51309850399311
## P16,4,22,1.51039577287341
## P16,4,23,1.50810026744055
## P16,4,24,1.51009476950409
## P16,4,25,1.51243549679953
## P16,4,26,1.51087049578057
## P16,4,27,1.50743271863019
## P16,4,28,1.50968100852573
## P16,4,29,1.51107273101807
## P16,4,30,1.50675618554663
## P16,4,31,1.51113444880435
## P16,4,32,1.51267036091198
## P16,4,33,1.50961642171822
## P16,4,34,1.51030859194304
## P16,4,35,1.51006440154645
## P16,4,36,1.50895158573985
## P16,4,37,1.50945274583225
## P16,4,38,1.5110603773369
## P16,4,39,1.51273442308108
## P16,4,40,1.51038259057438
## P16,4,41,1.50937330722809
## P16,4,42,1.51011419296265
## P16,4,43,1.51246303623005
## P16,4,44,1.50855626129523
## P16,4,45,1.50838849832723
## P16,4,46,1.51037699176419
## P16,4,47,1.50866435213787
## P16,4,48,1.50890750189622
## P16,4,49,1.51143370176616
## P16,4,50,1.50942406676332
## P16,5,1,1.50834213842557
## P16,5,2,1.51393425805228
## P16,5,3,1.50708705252343
## P16,5,4,1.5074304872089
## P16,5,5,1.51048945788271
## P16,5,6,1.5072894944085
## P16,5,7,1.51055575361346
## P16,5,8,1.5133746436664
## P16,5,9,1.50797622123461
## P16,5,10,1.50628594850239
## P16,5,11,1.51320365623192
## P16,5,12,1.50981877933849
## P16,5,13,1.51342472163114
## P16,5,14,1.5096046026651
## P16,5,15,1.50939230586207
## P16,5,16,1.51342579488004
## P16,5,17,1.51042804170827
## P16,5,18,1.51200971883886
## P16,5,19,1.5070725540062
## P16,5,20,1.51349545732329
## P16,5,21,1.51014958222707
## P16,5,22,1.50674946819033
## P16,5,23,1.51075021640674
## P16,5,24,1.51069703010412
## P16,5,25,1.51153842279734
## P16,5,26,1.50820258169463
## P16,5,27,1.50991113432522
## P16,5,28,1.51004641818017
## P16,5,29,1.50900050309988
## P16,5,30,1.50993842211637
## P16,5,31,1.51247879786369
## P16,5,32,1.5096412386213
## P16,5,33,1.51030082493038
## P16,5,34,1.50849031039647
## P16,5,35,1.51397212859123
## P16,5,36,1.51486431662716
## P16,5,37,1.511007973126
## P16,5,38,1.50505889630785
## P16,5,39,1.51005369140988
## P16,5,40,1.51187889321336
## P16,5,41,1.51113826934605
## P16,5,42,1.5110736543482
## P16,5,43,1.5080604132484
## P16,5,44,1.50896346833971
## P16,5,45,1.51025644490417
## P16,5,46,1.51250823599393
## P16,5,47,1.50920962790648
## P16,5,48,1.51078273073027
## P16,5,49,1.50956973885045
## P16,5,50,1.50930814325374
## P16,6,1,1.51014916496988
## P16,6,2,1.51245002746582
## P16,6,3,1.50812435150146
## P16,6,4,1.51171970038578
## P16,6,5,1.5093006891747
## P16,6,6,1.51344970556406
## P16,6,7,1.50904110013222
## P16,6,8,1.51000724029541
## P16,6,9,1.51131161053975
## P16,6,10,1.511005768106
## P16,6,11,1.510160245628
## P16,6,12,1.51193929853893
## P16,6,13,1.50910300717634
## P16,6,14,1.50990634668069
## P16,6,15,1.51214378911096
## P16,6,16,1.51052396580324
## P16,6,17,1.50453024686769
## P16,6,18,1.50918135367149
## P16,6,19,1.51150095768464
## P16,6,20,1.51041298646193
## P16,6,21,1.51003237093909
## P16,6,22,1.51197701937532
## P16,6,23,1.50988942012191
## P16,6,24,1.51467473506927
## P16,6,25,1.50960109818656
## P16,6,26,1.51159148746067
## P16,6,27,1.51158633483084
## P16,6,28,1.51088085260477
## P16,6,29,1.51105487731195
## P16,6,30,1.5127713770806
## P16,6,31,1.5102754055875
## P16,6,32,1.51147558291753
## P16,6,33,1.51767130308254
## P16,6,34,1.51061959266663
## P16,6,35,1.51235903934999
## P16,6,36,1.50832089510831
## P16,6,37,1.50848803557749
## P16,6,38,1.51061956153428
## P16,6,39,1.50944405305581
## P16,6,40,1.51114851537377
## P16,6,41,1.51107122681358
## P16,6,42,1.51270746177351
## P16,6,43,1.50949604576881
## P16,6,44,1.51047417274991
## P16,6,45,1.50909687995911
## P16,6,46,1.50960410137971
## P16,6,47,1.51201314539523
## P16,6,48,1.5119017950246
## P16,6,49,1.50936727420143
## P16,6,50,1.51082708859684
## P16,7,1,1.50793110806009
## P16,7,2,1.51341817755448
## P16,7,3,1.50952151513869
## P16,7,4,1.50982690626575
## P16,7,5,1.50838630659538
## P16,7,6,1.50978789406438
## P16,7,7,1.51277275423033
## P16,7,8,1.50768411885137
## P16,7,9,1.51120721031638
## P16,7,10,1.51182806080785
## P16,7,11,1.51051884392897
## P16,7,12,1.50878487955226
## P16,7,13,1.51151564169903
## P16,7,14,1.50586790237984
## P16,7,15,1.51082098881404
## P16,7,16,1.50927679355328
## P16,7,17,1.5142353553772
## P16,7,18,1.51174343734228
## P16,7,19,1.50490049577095
## P16,7,20,1.51289729130121
## P16,7,21,1.51425124681913
## P16,7,22,1.50885668367443
## P16,7,23,1.5071495332216
## P16,7,24,1.50934451144675
## P16,7,25,1.5090619246165
## P16,7,26,1.50941593101226
## P16,7,27,1.5106255990222
## P16,7,28,1.51026231837722
## P16,7,29,1.51089086337965
## P16,7,30,1.51258895132277
## P16,7,31,1.51023283004761
## P16,7,32,1.51032196938455
## P16,7,33,1.50919881943733
## P16,7,34,1.5086155498729
## P16,7,35,1.51073165976483
## P16,7,36,1.51090105470405
## P16,7,37,1.51210059839136
## P16,7,38,1.5118016414955
## P16,7,39,1.50769266297546
## P16,7,40,1.50540289878845
## P16,7,41,1.51045842647552
## P16,7,42,1.51036844625101
## P16,7,43,1.51270338646451
## P16,7,44,1.5083395242691
## P16,7,45,1.50949158388026
## P16,7,46,1.60428673288097
## P16,7,47,1.51078817456268
## P16,7,48,1.51173326548408
## P16,7,49,1.50745377260096
## P16,7,50,1.511883626039
## P16,8,1,1.51320468653803
## P16,8,2,1.51063707082168
## P16,8,3,1.51028034979837
## P16,8,4,1.50910783081912
## P16,8,5,1.50907424629712
## P16,8,6,1.51028169611449
## P16,8,7,1.5103352097904
## P16,8,8,1.5122062040835
## P16,8,9,1.50948050104339
## P16,8,10,1.51120908085893
## P16,8,11,1.50801601911846
## P16,8,12,1.51196616036551
## P16,8,13,1.51057541860293
## P16,8,14,1.50783748924732
## P16,8,15,1.50957519036752
## P16,8,16,1.50987143365164
## P16,8,17,1.51107275485992
## P16,8,18,1.51023828983307
## P16,8,19,1.5112568513671
## P16,8,20,1.51185355005385
## P16,8,21,1.5114188383496
## P16,8,22,1.51164340476195
## P16,8,23,1.50723728143944
## P16,8,24,1.50899074388587
## P16,8,25,1.50955577035552
## P16,8,26,1.51047568661826
## P16,8,27,1.51155487148241
## P16,8,28,1.50983932896664
## P16,8,29,1.5110118948895
## P16,8,30,1.50946001248939
## P16,8,31,1.51105830220893
## P16,8,32,1.5117769644294
## P16,8,33,1.50888701244793
## P16,8,34,1.51249615157523
## P16,8,35,1.50897602081299
## P16,8,36,1.51051275988659
## P16,8,37,1.51156276609839
## P16,8,38,1.50908375531435
## P16,8,39,1.51227218065506
## P16,8,40,1.51000126572542
## P16,8,41,1.50865014875778
## P16,8,42,1.51252230177534
## P16,8,43,1.51077447487758
## P16,8,44,1.50699406010764
## P16,8,45,1.50892021676072
## P16,8,46,1.50759586287133
## P16,8,47,1.51027425357274
## P16,8,48,1.50920236541564
## P16,8,49,1.51114808654785
## P16,8,50,1.5107052833476
## P16,9,1,1.50874532398425
## P16,9,2,1.50897566477458
## P16,9,3,1.51213170931889
## P16,9,4,1.51056399838678
## P16,9,5,1.50996150679261
## P16,9,6,1.50724769521643
## P16,9,7,1.50953059144072
## P16,9,8,1.50926969762434
## P16,9,9,1.51043935198533
## P16,9,10,1.51031854650476
## P16,9,11,1.50972526550293
## P16,9,12,1.50913623560255
## P16,9,13,1.50902740160624
## P16,9,14,1.51027295201324
## P16,9,15,1.50921510361336
## P16,9,16,1.51149846568252
## P16,9,17,1.50739689495253
## P16,9,18,1.51098760557763
## P16,9,19,1.50902383304337
## P16,9,20,1.51082696064864
## P16,9,21,1.51479137760319
## P16,9,22,1.50629200254168
## P16,9,23,1.5120435260063
## P16,9,24,1.51043363259389
## P16,9,25,1.50998030538144
## P16,9,26,1.5003008879148
## P16,9,27,1.5190431103848
## P16,9,28,1.51072258727495
## P16,9,29,1.5098281413053
## P16,9,30,1.50954102700756
## P16,9,31,1.5099560583339
## P16,9,32,1.50984888491423
## P16,9,33,1.50968353187337
## P16,9,34,1.50911285970118
## P16,9,35,1.50966660181681
## P16,9,36,1.51162662631587
## P16,9,37,1.50846649860514
## P16,9,38,1.50584397108658
## P16,9,39,1.51317348003387
## P16,9,40,1.51143743775108
## P16,9,41,1.50736061302391
## P16,9,42,1.50803815102091
## P16,9,43,1.5093093303719
## P16,9,44,1.50965120242192
## P16,9,45,1.51026928943136
## P16,9,46,1.51047469792741
## P16,9,47,1.50995032248958
## P16,9,48,1.50986072628997
## P16,9,49,1.51163570730536
## P16,9,50,1.50976688464483
## P16,10,1,1.50964666762442
## P16,10,2,1.51350649639412
## P16,10,3,1.51164319655474
## P16,10,4,1.50865488303335
## P16,10,5,1.50979708631833
## P16,10,6,1.51185002760454
## P16,10,7,1.51125081052485
## P16,10,8,1.5123725094638
## P16,10,9,1.50818692827688
## P16,10,10,1.5074675877889
## P16,10,11,1.51051031128835
## P16,10,12,1.51152881213597
## P16,10,13,1.50950904794641
## P16,10,14,1.5105977960535
## P16,10,15,1.51243713378906
## P16,10,16,1.51241476639457
## P16,10,17,1.50968875236882
## P16,10,18,1.50891615322658
## P16,10,19,1.51145562135948
## P16,10,20,1.51040939144466
## P16,10,21,1.50741225651332
## P16,10,22,1.51125127618963
## P16,10,23,1.51000628542544
## P16,10,24,1.50886557499568
## P16,10,25,1.5111474127605
## P16,10,26,1.51026150304028
## P16,10,27,1.50999891139843
## P16,10,28,1.50799939943397
## P16,10,29,1.50833901666826
## P16,10,30,1.50989637600155
## P16,10,31,1.51103458982525
## P16,10,32,1.51063138597152
## P16,10,33,1.50739094769513
## P16,10,34,1.51060406519816
## P16,10,35,1.50888909084696
## P16,10,36,1.51324902524005
## P16,10,37,1.51447658088264
## P16,10,38,1.51034578767795
## P16,10,39,1.50707254162082
## P16,10,40,1.51062564777605
## P16,10,41,1.50819238831725
## P16,10,42,1.5123040954788
## P16,10,43,1.51028171662361
## P16,10,44,1.50829952734488
## P16,10,45,1.51127722798562
## P16,10,46,1.50728844220822
## P16,10,47,1.51335481949794
## P16,10,48,1.50950057771471
## P16,10,49,1.51191933314006
## P16,10,50,1.51066969242333
## P17,1,1,1.5089421819468
## P17,1,2,1.50718971661159
## P17,1,3,1.51139593991366
## P17,1,4,1.50666130107382
## P17,1,5,1.50872053418841
## P17,1,6,1.50612482271696
## P17,1,7,1.5132986378957
## P17,1,8,1.50524850118728
## P17,1,9,1.52125167064979
## P17,1,10,1.50089605101224
## P17,1,11,1.4935098154503
## P17,1,12,1.47673695617252
## P17,1,13,1.51538158314569
## P17,1,14,1.48109438840081
## P17,1,15,1.51163315003918
## P17,1,16,1.53362126350403
## P17,1,17,1.53764249016257
## P17,1,18,1.51882656097412
## P17,1,19,1.50645024776459
## P17,1,20,1.53156685829163
## P17,1,21,1.51652775870429
## P17,1,22,1.50086403929669
## P17,1,23,1.51240713149309
## P17,1,24,1.50719550251961
## P17,1,25,1.51354744376206
## P17,1,26,1.50783530403586
## P17,1,27,1.51262729130094
## P17,1,28,1.51506293181217
## P17,1,29,1.5155686279396
## P17,1,30,1.51518497467041
## P17,1,31,1.5158820761011
## P17,1,32,1.51605775952339
## P17,1,33,1.52169742584229
## P17,1,34,1.48755281154926
## P17,1,35,1.50503750358309
## P17,1,36,1.52351011949427
## P17,1,37,1.51218610339695
## P17,1,38,1.50776620705922
## P17,1,39,1.51335879325867
## P17,1,40,1.50958730777105
## P17,1,41,1.51235481408926
## P17,1,42,1.51033933611884
## P17,1,43,1.51086857535622
## P17,1,44,1.50991155162002
## P17,1,45,1.51418399810791
## P17,1,46,1.51382205486298
## P17,1,47,1.50879049301147
## P17,1,48,1.5067254781723
## P17,1,49,1.5139496421814
## P17,1,50,1.51050699107787
## P17,2,1,1.50909774097396
## P17,2,2,1.51126672400803
## P17,2,3,1.5131746837071
## P17,2,4,1.51112837540476
## P17,2,5,1.51212643693995
## P17,2,6,1.51809430122375
## P17,2,7,1.50840397675832
## P17,2,8,1.51077302296956
## P17,2,9,1.50630875376912
## P17,2,10,1.50960183143616
## P17,2,11,1.51290062823928
## P17,2,12,1.51175483790311
## P17,2,13,1.51129736219134
## P17,2,14,1.51162052154541
## P17,2,15,1.50973125604483
## P17,2,16,1.50948724231204
## P17,2,17,1.51085309705872
## P17,2,18,1.51079862206071
## P17,2,19,1.51047115576895
## P17,2,20,1.51257617133004
## P17,2,21,1.5131746837071
## P17,2,22,1.51117834737224
## P17,2,23,1.51030194300872
## P17,2,24,1.50793404049344
## P17,2,25,1.51437930707578
## P17,2,26,1.5099947501202
## P17,2,27,1.50911052643307
## P17,2,28,1.50525727819224
## P17,2,29,1.5252243813048
## P17,2,30,1.5081078117969
## P17,2,31,1.50902536067557
## P17,2,32,1.5083368547035
## P17,2,33,1.51084388660479
## P17,2,34,1.50894462434869
## P17,2,35,1.50932062888632
## P17,2,36,1.51155949632327
## P17,2,37,1.51154149438917
## P17,2,38,1.51078223265134
## P17,2,39,1.50636353700057
## P17,2,40,1.50975346565247
## P17,2,41,1.51282281291728
## P17,2,42,1.50565565786054
## P17,2,43,1.49261150536714
## P17,2,44,1.51048526499006
## P17,2,45,1.50166631514026
## P17,2,46,1.51738716426649
## P17,2,47,1.51066085619804
## P17,2,48,1.48245637313179
## P17,2,49,1.51369924699107
## P17,2,50,1.51077020271965
## P17,3,1,1.50999297036065
## P17,3,2,1.51099554697673
## P17,3,3,1.51174206680126
## P17,3,4,1.51080716799383
## P17,3,5,1.51120056555821
## P17,3,6,1.50717999384953
## P17,3,7,1.51092168688774
## P17,3,8,1.51062745206496
## P17,3,9,1.51194965164616
## P17,3,10,1.5102419257164
## P17,3,11,1.50996495783329
## P17,3,12,1.51352148611569
## P17,3,13,1.51099875394036
## P17,3,14,1.50957789565578
## P17,3,15,1.51030306305204
## P17,3,16,1.51091637109455
## P17,3,17,1.51129799558405
## P17,3,18,1.50993958939897
## P17,3,19,1.50999763555694
## P17,3,20,1.51083732295681
## P17,3,21,1.50954536806073
## P17,3,22,1.50946861154893
## P17,3,23,1.51169379552205
## P17,3,24,1.50932521507388
## P17,3,25,1.50845039807833
## P17,3,26,1.5124725818634
## P17,3,27,1.50873309809987
## P17,3,28,1.50967380274897
## P17,3,29,1.50984676030217
## P17,3,30,1.51107782398889
## P17,3,31,1.50926144009545
## P17,3,32,1.51188562029884
## P17,3,33,1.51123722394307
## P17,3,34,1.51012797274832
## P17,3,35,1.51212760729667
## P17,3,36,1.5079877614975
## P17,3,37,1.51142519170588
## P17,3,38,1.51114139231769
## P17,3,39,1.51057471169366
## P17,3,40,1.5097486006247
## P17,3,41,1.51013422012329
## P17,3,42,1.50945445574247
## P17,3,43,1.51075068185496
## P17,3,44,1.51027981057225
## P17,3,45,1.51265569166704
## P17,3,46,1.50922671010939
## P17,3,47,1.5125070980617
## P17,3,48,1.51182810465495
## P17,3,49,1.51243230274745
## P17,3,50,1.51020273400678
## P17,4,1,1.50949738706861
## P17,4,2,1.51023828983307
## P17,4,3,1.51015738553779
## P17,4,4,1.5096527338028
## P17,4,5,1.5098139444987
## P17,4,6,1.51259129925778
## P17,4,7,1.51005557775497
## P17,4,8,1.51087132096291
## P17,4,9,1.51008899037431
## P17,4,10,1.50974061272361
## P17,4,11,1.51139976099918
## P17,4,12,1.51145003392146
## P17,4,13,1.51201118122448
## P17,4,14,1.51358092153395
## P17,4,15,1.51101543985564
## P17,4,16,1.5103743698286
## P17,4,17,1.51157629489899
## P17,4,18,1.51038256813498
## P17,4,19,1.51167142391205
## P17,4,20,1.51047312129628
## P17,4,21,1.51004414331345
## P17,4,22,1.5099438313515
## P17,4,23,1.51039800643921
## P17,4,24,1.51075110143545
## P17,4,25,1.5116154551506
## P17,4,26,1.51021673414442
## P17,4,27,1.51162660121918
## P17,4,28,1.51145559886716
## P17,4,29,1.51095646511425
## P17,4,30,1.50847114660801
## P17,4,31,1.51066196592231
## P17,4,32,1.5094285633253
## P17,4,33,1.50811566091051
## P17,4,34,1.51251785069296
## P17,4,35,1.50914885505797
## P17,4,36,1.51061956617567
## P17,4,37,1.51082099974155
## P17,4,38,1.51030912311799
## P17,4,39,1.50875109814583
## P17,4,40,1.51048526763916
## P17,4,41,1.51242169580962
## P17,4,42,1.51076173782349
## P17,4,43,1.51088825861613
## P17,4,44,1.50927677608672
## P17,4,45,1.51073032021523
## P17,4,46,1.51467888171856
## P17,4,47,1.51068558458422
## P17,4,48,1.51125320691741
## P17,4,49,1.51139299869537
## P17,4,50,1.51133204803986
## P17,5,1,1.51094506966947
## P17,5,2,1.51009341162078
## P17,5,3,1.50908497401646
## P17,5,4,1.50884701410929
## P17,5,5,1.51278475920359
## P17,5,6,1.51155054304335
## P17,5,7,1.51065311829249
## P17,5,8,1.50895567562269
## P17,5,9,1.5095001870552
## P17,5,10,1.51117344200611
## P17,5,11,1.51164219929622
## P17,5,12,1.51061955658165
## P17,5,13,1.5072729526422
## P17,5,14,1.51217334611075
## P17,5,15,1.5115367595966
## P17,5,16,1.5096849822998
## P17,5,17,1.51048525174459
## P17,5,18,1.50887162806624
## P17,5,19,1.50975070280187
## P17,5,20,1.50903266126459
## P17,5,21,1.51180757910518
## P17,5,22,1.51070905614782
## P17,5,23,1.51043540409633
## P17,5,24,1.50643783145481
## P17,5,25,1.50954213199845
## P17,5,26,1.51174049377441
## P17,5,27,1.50873963038127
## P17,5,28,1.51074848175049
## P17,5,29,1.51165539877755
## P17,5,30,1.51107185765317
## P17,5,31,1.51081265693854
## P17,5,32,1.50574898719788
## P17,5,33,1.50930114225908
## P17,5,34,1.50922792608088
## P17,5,35,1.5126486354404
## P17,5,36,1.51024548496519
## P17,5,37,1.51167696714401
## P17,5,38,1.51167964098746
## P17,5,39,1.5104224225308
## P17,5,40,1.51050768516682
## P17,5,41,1.51053400799236
## P17,5,42,1.51297375443694
## P17,5,43,1.51021679242452
## P17,5,44,1.51029387940752
## P17,5,45,1.5105893611908
## P17,5,46,1.51080542344313
## P17,5,47,1.510068291112
## P17,5,48,1.51125379318887
## P17,5,49,1.5104830386275
## P17,5,50,1.50950304917463
## P17,6,1,1.51135197552768
## P17,6,2,1.51131702536967
## P17,6,3,1.51111113823066
## P17,6,4,1.51180436751422
## P17,6,5,1.51180688958419
## P17,6,6,1.51156689046503
## P17,6,7,1.51002179422686
## P17,6,8,1.50791818955365
## P17,6,9,1.51227331161499
## P17,6,10,1.5109776073032
## P17,6,11,1.50981388921323
## P17,6,12,1.51233248667674
## P17,6,13,1.51090673408886
## P17,6,14,1.50973989039051
## P17,6,15,1.5095721912384
## P17,6,16,1.5091363733465
## P17,6,17,1.51100879840637
## P17,6,18,1.51198917388916
## P17,6,19,1.51079991326403
## P17,6,20,1.50958371162415
## P17,6,21,1.51111268586126
## P17,6,22,1.51049464247948
## P17,6,23,1.50968143384751
## P17,6,24,1.51093487117601
## P17,6,25,1.51086367982807
## P17,6,26,1.51063237871443
## P17,6,27,1.5099347114563
## P17,6,28,1.50875040054321
## P17,6,29,1.51090729804266
## P17,6,30,1.50947466649507
## P17,6,31,1.51100485221199
## P17,6,32,1.51102241873741
## P17,6,33,1.51061954498291
## P17,6,34,1.50975636073521
## P17,6,35,1.50981387385616
## P17,6,36,1.51039841128331
## P17,6,37,1.50968798995018
## P17,6,38,1.50806362875577
## P17,6,39,1.51211584182013
## P17,6,40,1.50812929326838
## P17,6,41,1.50811464136297
## P17,6,42,1.50837773862092
## P17,6,43,1.51070013046265
## P17,6,44,1.50998760672177
## P17,6,45,1.50850185666765
## P17,6,46,1.5115746490417
## P17,6,47,1.51016300519307
## P17,6,48,1.51003767825939
## P17,6,49,1.51086518822647
## P17,6,50,1.51050564831701
## P17,7,1,1.50883733864987
## P17,7,2,1.5108881241236
## P17,7,3,1.51141713619232
## P17,7,4,1.51188560213361
## P17,7,5,1.5117332795087
## P17,7,6,1.51738710403442
## P17,7,7,1.51004137712366
## P17,7,8,1.51247607106748
## P17,7,9,1.50981380939484
## P17,7,10,1.51049318500594
## P17,7,11,1.51010482841068
## P17,7,12,1.51414442062378
## P17,7,13,1.50828548038707
## P17,7,14,1.5118088722229
## P17,7,15,1.51026766875695
## P17,7,16,1.51091394974635
## P17,7,17,1.50781193646518
## P17,7,18,1.51010445297742
## P17,7,19,1.51140557265863
## P17,7,20,1.510948168604
## P17,7,21,1.50988721847534
## P17,7,22,1.51000469609311
## P17,7,23,1.50941107749939
## P17,7,24,1.50990232607213
## P17,7,25,1.51207202589008
## P17,7,26,1.51095678639966
## P17,7,27,1.5073969066143
## P17,7,28,1.51077621512943
## P17,7,29,1.50965721077389
## P17,7,30,1.51084756851196
## P17,7,31,1.5116621466244
## P17,7,32,1.51047876043227
## P17,7,33,1.51072840432863
## P17,7,34,1.50947303955372
## P17,7,35,1.50674113561941
## P17,7,36,1.51231142282486
## P17,7,37,1.50972436534034
## P17,7,38,1.50941108835155
## P17,7,39,1.51103115081787
## P17,7,40,1.51185749798286
## P17,7,41,1.51036131687653
## P17,7,42,1.50962051391602
## P17,7,43,1.51177766919136
## P17,7,44,1.51033035302773
## P17,7,45,1.51050962101329
## P17,7,46,1.50990596498762
## P17,7,47,1.5085541118275
## P17,7,48,1.50944370836825
## P17,7,49,1.51077547381001
## P17,7,50,1.5065912882487
## P17,8,1,1.51109857816954
## P17,8,2,1.50848903656006
## P17,8,3,1.51245468854904
## P17,8,4,1.51289003545588
## P17,8,5,1.50923453556018
## P17,8,6,1.51104704214602
## P17,8,7,1.51235175132751
## P17,8,8,1.50974945068359
## P17,8,9,1.51401738498522
## P17,8,10,1.50914708499251
## P17,8,11,1.51196527481079
## P17,8,12,1.50942086010444
## P17,8,13,1.5111260005406
## P17,8,14,1.51011792668756
## P17,8,15,1.51303655306498
## P17,8,16,1.50945579740736
## P17,8,17,1.51154214336026
## P17,8,18,1.51061954952422
## P17,8,19,1.51118519965638
## P17,8,20,1.51116458107443
## P17,8,21,1.51175928115845
## P17,8,22,1.51094185511271
## P17,8,23,1.50981390292828
## P17,8,24,1.50960670879909
## P17,8,25,1.51229536056519
## P17,8,26,1.50893412513294
## P17,8,27,1.5105902671814
## P17,8,28,1.50908880233765
## P17,8,29,1.50941109657288
## P17,8,30,1.50971909130321
## P17,8,31,1.50820256895938
## P17,8,32,1.50837215624358
## P17,8,33,1.50846035003662
## P17,8,34,1.50894929723042
## P17,8,35,1.50633490085602
## P17,8,36,1.51242851761152
## P17,8,37,1.50809144151622
## P17,8,38,1.50882510705428
## P17,8,39,1.51088808907403
## P17,8,40,1.5110373026059
## P17,8,41,1.51073467163813
## P17,8,42,1.50977549098787
## P17,8,43,1.51050445984821
## P17,8,44,1.50815515892178
## P17,8,45,1.51033848385478
## P17,8,46,1.51015919276646
## P17,8,47,1.50946548822764
## P17,8,48,1.51055810815197
## P17,8,49,1.50945573382907
## P17,8,50,1.51044107690642
## P17,9,1,1.50876031777798
## P17,9,2,1.51214606301826
## P17,9,3,1.50947923660278
## P17,9,4,1.50981381961278
## P17,9,5,1.51099057574021
## P17,9,6,1.51278649527451
## P17,9,7,1.51083933223378
## P17,9,8,1.51201604207357
## P17,9,9,1.51077193182868
## P17,9,10,1.51054281280154
## P17,9,11,1.5113031575174
## P17,9,12,1.50961857131033
## P17,9,13,1.50951549153269
## P17,9,14,1.51054633747448
## P17,9,15,1.51257228851318
## P17,9,16,1.5082946232387
## P17,9,17,1.51045402762008
## P17,9,18,1.50802347395155
## P17,9,19,1.51272465336707
## P17,9,20,1.5091693673815
## P17,9,21,1.51080040542447
## P17,9,22,1.51269729513871
## P17,9,23,1.51343929767609
## P17,9,24,1.50827568227595
## P17,9,25,1.50993325975206
## P17,9,26,1.51031396306794
## P17,9,27,1.50743931218197
## P17,9,28,1.51040752310502
## P17,9,29,1.51082096248865
## P17,9,30,1.51407494015164
## P17,9,31,1.51166519205621
## P17,9,32,1.50784922482675
## P17,9,33,1.51368103027344
## P17,9,34,1.51114501123843
## P17,9,35,1.510385166515
## P17,9,36,1.5128664917416
## P17,9,37,1.50920218891568
## P17,9,38,1.50897466142972
## P17,9,39,1.50861763231682
## P17,9,40,1.51113746847425
## P17,9,41,1.51020063400269
## P17,9,42,1.5097715101744
## P17,9,43,1.51020584879695
## P17,9,44,1.51036777240889
## P17,9,45,1.50749761462212
## P17,9,46,1.51220880795832
## P17,9,47,1.50867570392669
## P17,9,48,1.51152287830006
## P17,9,49,1.51112838795311
## P17,9,50,1.51095771789551
## P17,10,1,1.50933433714367
## P17,10,2,1.51262282036446
## P17,10,3,1.51053473823949
## P17,10,4,1.50955845088494
## P17,10,5,1.50925998389721
## P17,10,6,1.50988714261488
## P17,10,7,1.50865703362685
## P17,10,8,1.51202013309185
## P17,10,9,1.50737748663109
## P17,10,10,1.51320515122525
## P17,10,11,1.50913460114423
## P17,10,12,1.50594663619995
## P17,10,13,1.51157175410878
## P17,10,14,1.50659120082855
## P17,10,15,1.50878441333771
## P17,10,16,1.50952799089493
## P17,10,17,1.50893658532037
## P17,10,18,1.50956971717603
## P17,10,19,1.51084780693054
## P17,10,20,1.5109369393551
## P17,10,21,1.51094292296844
## P17,10,22,1.50951348320913
## P17,10,23,1.50854787372407
## P17,10,24,1.51059177004058
## P17,10,25,1.50947071004797
## P17,10,26,1.5110799244472
## P17,10,27,1.50904849767685
## P17,10,28,1.51044692311968
## P17,10,29,1.50976551055908
## P17,10,30,1.50999294916789
## P17,10,31,1.51227254703127
## P17,10,32,1.51002686599205
## P17,10,33,1.5119569683075
## P17,10,34,1.50968355992261
## P17,10,35,1.50989446640015
## P17,10,36,1.50947538744502
## P17,10,37,1.51048367856497
## P17,10,38,1.51098210215569
## P17,10,39,1.51192876696587
## P17,10,40,1.51119964599609
## P17,10,41,1.51370124816895
## P17,10,42,1.50746854146322
## P17,10,43,1.50863219896952
## P17,10,44,1.5115491549174
## P17,10,45,1.51049835070045
## P17,10,46,1.51150956264762
## P17,10,47,1.51115663846334
## P17,10,48,1.51129885280834
## P17,10,49,1.51089422269301
## P17,10,50,1.5113676743848
## P18,1,1,1.50910894572735
## P18,1,2,1.50902437210083
## P18,1,3,1.51384217922504
## P18,1,4,1.50708949565887
## P18,1,5,1.5086322148641
## P18,1,6,1.50985317695432
## P18,1,7,1.51196232901679
## P18,1,8,1.50601039930832
## P18,1,9,1.50342556924531
## P18,1,10,1.52168067296346
## P18,1,11,1.50651714719575
## P18,1,12,1.51167103395624
## P18,1,13,1.50305333344833
## P18,1,14,1.52443095615932
## P18,1,15,1.51149229208628
## P18,1,16,1.5111438736083
## P18,1,17,1.51201115714179
## P18,1,18,1.5145372876934
## P18,1,19,1.50914031951154
## P18,1,20,1.51407236867137
## P18,1,21,1.5099976690192
## P18,1,22,1.50910121355301
## P18,1,23,1.49989979796939
## P18,1,24,1.5126720780418
## P18,1,25,1.51214828858009
## P18,1,26,1.50546329498291
## P18,1,27,1.50585882880471
## P18,1,28,1.51053008768294
## P18,1,29,1.50703881405018
## P18,1,30,1.50967030477996
## P18,1,31,1.51468010902405
## P18,1,32,1.50768987853806
## P18,1,33,1.50932828694174
## P18,1,34,1.51007398845643
## P18,1,35,1.51537294983864
## P18,1,36,1.50961943878525
## P18,1,37,1.50803815102091
## P18,1,38,1.51211881321787
## P18,1,39,1.50735664367676
## P18,1,40,1.51263867484199
## P18,1,41,1.51299179924859
## P18,1,42,1.5109203338623
## P18,1,43,1.50944109817049
## P18,1,44,1.51008243787856
## P18,1,45,1.51058412384201
## P18,1,46,1.51039468410403
## P18,1,47,1.50893363246211
## P18,1,48,1.50377138455709
## P18,1,49,1.51141083240509
## P18,1,50,1.50962634744315
## P18,2,1,1.51266292212666
## P18,2,2,1.51050445630953
## P18,2,3,1.51048143931798
## P18,2,4,1.51233711347475
## P18,2,5,1.5095575614409
## P18,2,6,1.51120743880401
## P18,2,7,1.50924436799411
## P18,2,8,1.51092472220912
## P18,2,9,1.50953827406231
## P18,2,10,1.51351994276047
## P18,2,11,1.51038259618423
## P18,2,12,1.51449681605612
## P18,2,13,1.50637796345879
## P18,2,14,1.50713848617842
## P18,2,15,1.51049167390854
## P18,2,16,1.51041269946743
## P18,2,17,1.51543601699497
## P18,2,18,1.50875645875931
## P18,2,19,1.51052583650101
## P18,2,20,1.50905063277797
## P18,2,21,1.51099551518758
## P18,2,22,1.50926335652669
## P18,2,23,1.51029072975626
## P18,2,24,1.5111566498166
## P18,2,25,1.51310150854049
## P18,2,26,1.50854118319525
## P18,2,27,1.51066562107631
## P18,2,28,1.50873969151424
## P18,2,29,1.49584906895955
## P18,2,30,1.52006371815999
## P18,2,31,1.50604454108647
## P18,2,32,1.51167040285857
## P18,2,33,1.50532208403496
## P18,2,34,1.51389663283889
## P18,2,35,1.5080274498981
## P18,2,36,1.51050649609482
## P18,2,37,1.50203155963979
## P18,2,38,1.51486347762632
## P18,2,39,1.50659123710964
## P18,2,40,1.53268438000833
## P18,2,41,1.50223120521097
## P18,2,42,1.51638394310361
## P18,2,43,1.50121175249418
## P18,2,44,1.52173770268758
## P18,2,45,1.5077251151756
## P18,2,46,1.51014052210627
## P18,2,47,1.50843028400255
## P18,2,48,1.50799462615803
## P18,2,49,1.51122381005968
## P18,2,50,1.51069044113159
## P18,3,1,1.5044159412384
## P18,3,2,1.50892632694568
## P18,3,3,1.51041812163133
## P18,3,4,1.5108534443763
## P18,3,5,1.50902452372541
## P18,3,6,1.50881224709588
## P18,3,7,1.51088470748708
## P18,3,8,1.50989724849832
## P18,3,9,1.5076410409176
## P18,3,10,1.51303656895955
## P18,3,11,1.51053322213037
## P18,3,12,1.51159482253225
## P18,3,13,1.51299624443054
## P18,3,14,1.5104430015773
## P18,3,15,1.51116291681925
## P18,3,16,1.51014251458017
## P18,3,17,1.51223092079163
## P18,3,18,1.50962720847711
## P18,3,19,1.51293646178631
## P18,3,20,1.51094465088426
## P18,3,21,1.50907537937164
## P18,3,22,1.5096412386213
## P18,3,23,1.50812937996604
## P18,3,24,1.51070148661985
## P18,3,25,1.50967526692216
## P18,3,26,1.50777735975054
## P18,3,27,1.50961244106293
## P18,3,28,1.51026617853265
## P18,3,29,1.51021671295166
## P18,3,30,1.50898405075073
## P18,3,31,1.50703880521986
## P18,3,32,1.51182794570923
## P18,3,33,1.51097324417859
## P18,3,34,1.50807863015395
## P18,3,35,1.50876157137812
## P18,3,36,1.50822624038248
## P18,3,37,1.5110559463501
## P18,3,38,1.50763388241039
## P18,3,39,1.51018570019649
## P18,3,40,1.50796086788177
## P18,3,41,1.50771923065186
## P18,3,42,1.51139922808575
## P18,3,43,1.51084336307314
## P18,3,44,1.50897661844889
## P18,3,45,1.51244570414225
## P18,3,46,1.51294172511381
## P18,3,47,1.51035099029541
## P18,3,48,1.51239204406738
## P18,3,49,1.51207594382457
## P18,3,50,1.51068490260356
## P18,4,1,1.5118838090163
## P18,4,2,1.51411078770955
## P18,4,3,1.50942366570234
## P18,4,4,1.50877802712577
## P18,4,5,1.51095129461849
## P18,4,6,1.50946230454878
## P18,4,7,1.51154029028756
## P18,4,8,1.5080624455991
## P18,4,9,1.50999425062493
## P18,4,10,1.51026008312519
## P18,4,11,1.50968995461097
## P18,4,12,1.511390919381
## P18,4,13,1.50837518487658
## P18,4,14,1.51065460149793
## P18,4,15,1.51140283875995
## P18,4,16,1.50694759075458
## P18,4,17,1.51225609332323
## P18,4,18,1.50948429107666
## P18,4,19,1.51092645100185
## P18,4,20,1.51085650219637
## P18,4,21,1.51125566582931
## P18,4,22,1.51128710338048
## P18,4,23,1.51286689858688
## P18,4,24,1.50956216454506
## P18,4,25,1.51072283280201
## P18,4,26,1.50728413581848
## P18,4,27,1.51053144782782
## P18,4,28,1.51009173228823
## P18,4,29,1.50838163163927
## P18,4,30,1.5115964114666
## P18,4,31,1.50747745831807
## P18,4,32,1.512809301034
## P18,4,33,1.50925483508986
## P18,4,34,1.50959852426359
## P18,4,35,1.51252382451838
## P18,4,36,1.50870603322983
## P18,4,37,1.51223087310791
## P18,4,38,1.50831760678973
## P18,4,39,1.5073527505953
## P18,4,40,1.50812796310142
## P18,4,41,1.51296546879937
## P18,4,42,1.51148277237302
## P18,4,43,1.51266059875488
## P18,4,44,1.51041071503251
## P18,4,45,1.50733492924617
## P18,4,46,1.51202947752816
## P18,4,47,1.51128768920898
## P18,4,48,1.50949586065192
## P18,4,49,1.51200319891391
## P18,4,50,1.49614752663506
## P18,5,1,1.51132452984651
## P18,5,2,1.51066584422671
## P18,5,3,1.51173961453321
## P18,5,4,1.50980088787694
## P18,5,5,1.51142519917981
## P18,5,6,1.50960317024818
## P18,5,7,1.51653849283854
## P18,5,8,1.51380243419129
## P18,5,9,1.51160866199153
## P18,5,10,1.51145808550776
## P18,5,11,1.51060407895308
## P18,5,12,1.49768599192301
## P18,5,13,1.50660737991333
## P18,5,14,1.51095880332746
## P18,5,15,1.51119023561478
## P18,5,16,1.50994816804544
## P18,5,17,1.51204288800557
## P18,5,18,1.5103856671241
## P18,5,19,1.51027164675973
## P18,5,20,1.51177769899368
## P18,5,21,1.51013241257778
## P18,5,22,1.50502464506361
## P18,5,23,1.5105807235442
## P18,5,24,1.50960904460842
## P18,5,25,1.50891961574554
## P18,5,26,1.52923039197922
## P18,5,27,1.50654089450836
## P18,5,28,1.51079861323039
## P18,5,29,1.50981389559232
## P18,5,30,1.50909775274771
## P18,5,31,1.50953605257232
## P18,5,32,1.50552981997293
## P18,5,33,1.51019921510116
## P18,5,34,1.51097204685211
## P18,5,35,1.51118526052921
## P18,5,36,1.51070586272648
## P18,5,37,1.51436479671581
## P18,5,38,1.50378754933675
## P18,5,39,1.51313909183849
## P18,5,40,1.50864439625894
## P18,5,41,1.51872593090858
## P18,5,42,1.5056466398568
## P18,5,43,1.51081715889697
## P18,5,44,1.51400335146033
## P18,5,45,1.50694038073222
## P18,5,46,1.50955258189021
## P18,5,47,1.50993781823378
## P18,5,48,1.5107755045737
## P18,5,49,1.50970644156138
## P18,5,50,1.5091089443727
## P18,6,1,1.51142501831055
## P18,6,2,1.52065931833707
## P18,6,3,1.51706490797155
## P18,6,4,1.51512261799404
## P18,6,5,1.51853514909744
## P18,6,6,1.51396221810199
## P18,6,7,1.51673531532288
## P18,6,8,1.51385164821849
## P18,6,9,1.51446410229332
## P18,6,10,1.51332515745021
## P18,6,11,1.51342501810619
## P18,6,12,1.51122391223907
## P18,6,13,1.51203713235976
## P18,6,14,1.51411917805672
## P18,6,15,1.51037438019462
## P18,6,16,1.51094913482666
## P18,6,17,1.51368729884808
## P18,6,18,1.51224347949028
## P18,6,19,1.51354442472043
## P18,6,20,1.51190421387956
## P18,6,21,1.51258896015309
## P18,6,22,1.52283171603554
## P18,6,23,1.50386097696092
## P18,6,24,1.50677029291789
## P18,6,25,1.50514473698356
## P18,6,26,1.51251368319735
## P18,6,27,1.511338864054
## P18,6,28,1.51142529078892
## P18,6,29,1.50981387495995
## P18,6,30,1.51184724626087
## P18,6,31,1.51458068688711
## P18,6,32,1.51085586547852
## P18,6,33,1.51292143549238
## P18,6,34,1.51181771205022
## P18,6,35,1.50911109498207
## P18,6,36,1.51113518714905
## P18,6,37,1.51061954981164
## P18,6,38,1.50989651068663
## P18,6,39,1.5118568284171
## P18,6,40,1.51200069699969
## P18,6,41,1.51152919953869
## P18,6,42,1.51194817559761
## P18,6,43,1.50981391559948
## P18,6,44,1.50959418036721
## P18,6,45,1.51103173854739
## P18,6,46,1.51108282804489
## P18,6,47,1.50927678743998
## P18,6,48,1.51448682149251
## P18,6,49,1.51317546285432
## P18,6,50,1.50924594285058
## P18,7,1,1.51084755951504
## P18,7,2,1.5134218464727
## P18,7,3,1.51282902197404
## P18,7,4,1.51157723732714
## P18,7,5,1.51188176472982
## P18,7,6,1.51384220452144
## P18,7,7,1.51060345649719
## P18,7,8,1.51110295057297
## P18,7,9,1.51158634185791
## P18,7,10,1.50857556307757
## P18,7,11,1.50684835555706
## P18,7,12,1.50890425712832
## P18,7,13,1.51270083586375
## P18,7,14,1.51194838734416
## P18,7,15,1.50737091802782
## P18,7,16,1.50991895924444
## P18,7,17,1.51044862920588
## P18,7,18,1.50885126807473
## P18,7,19,1.50961246273734
## P18,7,20,1.50897970874753
## P18,7,21,1.50708693724412
## P18,7,22,1.51267501635429
## P18,7,23,1.51037435427956
## P18,7,24,1.51313244728815
## P18,7,25,1.51022379021896
## P18,7,26,1.50902836322784
## P18,7,27,1.50911501229527
## P18,7,28,1.51099019050598
## P18,7,29,1.51362250067971
## P18,7,30,1.50873357599432
## P18,7,31,1.50771915435791
## P18,7,32,1.50883860337107
## P18,7,33,1.50972909676401
## P18,7,34,1.50933041572571
## P18,7,35,1.51310981403698
## P18,7,36,1.51026452597925
## P18,7,37,1.5120612571114
## P18,7,38,1.51104357368068
## P18,7,39,1.50987354914347
## P18,7,40,1.51092167198658
## P18,7,41,1.50963966266529
## P18,7,42,1.51093754015471
## P18,7,43,1.50858022272587
## P18,7,44,1.51094526940204
## P18,7,45,1.51190864018032
## P18,7,46,1.51130435466766
## P18,7,47,1.51087130606174
## P18,7,48,1.50818384525388
## P18,7,49,1.50912758744793
## P18,7,50,1.50858247958548
## P18,8,1,1.51093528077409
## P18,8,2,1.51124617788527
## P18,8,3,1.51044868700432
## P18,8,4,1.51054517305814
## P18,8,5,1.51003950119019
## P18,8,6,1.50782249558647
## P18,8,7,1.50966548919678
## P18,8,8,1.51056973958753
## P18,8,9,1.51060276230176
## P18,8,10,1.5056208263744
## P18,8,11,1.51085796648142
## P18,8,12,1.50866162499716
## P18,8,13,1.51243223462786
## P18,8,14,1.5107419158839
## P18,8,15,1.51051652708719
## P18,8,16,1.51041812896729
## P18,8,17,1.50986424088478
## P18,8,18,1.51110293865204
## P18,8,19,1.50908881823222
## P18,8,20,1.51035095850627
## P18,8,21,1.50993598591198
## P18,8,22,1.51188564300537
## P18,8,23,1.5080319741193
## P18,8,24,1.51112806601603
## P18,8,25,1.5115380191803
## P18,8,26,1.51042423344622
## P18,8,27,1.51120830193544
## P18,8,28,1.51093084703792
## P18,8,29,1.51080463383649
## P18,8,30,1.50612343511274
## P18,8,31,1.5087316641167
## P18,8,32,1.50850296020508
## P18,8,33,1.50866538920301
## P18,8,34,1.50632271501753
## P18,8,35,1.51134849729992
## P18,8,36,1.51153509183363
## P18,8,37,1.51176930963993
## P18,8,38,1.50927237213635
## P18,8,39,1.51113750253405
## P18,8,40,1.51107273499171
## P18,8,41,1.51106808849217
## P18,8,42,1.50703646007337
## P18,8,43,1.51162414197569
## P18,8,44,1.51126771224172
## P18,8,45,1.5109313841789
## P18,8,46,1.50762352347374
## P18,8,47,1.50920965936449
## P18,8,48,1.51002540588379
## P18,8,49,1.50908881823222
## P18,8,50,1.50743526017585
## P18,9,1,1.51142523023817
## P18,9,2,1.50966998508998
## P18,9,3,1.5084808956493
## P18,9,4,1.51118994181135
## P18,9,5,1.51258897781372
## P18,9,6,1.51014559409198
## P18,9,7,1.51362733840942
## P18,9,8,1.51029727118356
## P18,9,9,1.50866736357029
## P18,9,10,1.50804459814932
## P18,9,11,1.50454202942226
## P18,9,12,1.51143782585859
## P18,9,13,1.51377112725202
## P18,9,14,1.51106346869955
## P18,9,15,1.51375269889832
## P18,9,16,1.50912869088004
## P18,9,17,1.5114984367833
## P18,9,18,1.50835363864899
## P18,9,19,1.50899814367294
## P18,9,20,1.5105280009183
## P18,9,21,1.51099866979262
## P18,9,22,1.50439800156487
## P18,9,23,1.50672275192884
## P18,9,24,1.50937692997819
## P18,9,25,1.5118930262904
## P18,9,26,1.50989871276052
## P18,9,27,1.50930122353814
## P18,9,28,1.51449194262105
## P18,9,29,1.51042362161585
## P18,9,30,1.50328526003607
## P18,9,31,1.50547430732033
## P18,9,32,1.5124242401123
## P18,9,33,1.50820254219903
## P18,9,34,1.51105739759362
## P18,9,35,1.50984487166772
## P18,9,36,1.51177766919136
## P18,9,37,1.50845112699143
## P18,9,38,1.51148490552549
## P18,9,39,1.51210880279541
## P18,9,40,1.50728869082323
## P18,9,41,1.51001240550608
## P18,9,42,1.5121906042099
## P18,9,43,1.50600528717041
## P18,9,44,1.50835680454335
## P18,9,45,1.50923382759094
## P18,9,46,1.50966589791434
## P18,9,47,1.50688599377144
## P18,9,48,1.50778169774297
## P18,9,49,1.51011072961908
## P18,9,50,1.5112713213717
## P18,10,1,1.50987746841029
## P18,10,2,1.50575874646505
## P18,10,3,1.50653570273827
## P18,10,4,1.51180261749405
## P18,10,5,1.51187043440969
## P18,10,6,1.50785344441732
## P18,10,7,1.51079859285273
## P18,10,8,1.51182805574857
## P18,10,9,1.50985417366028
## P18,10,10,1.50134226770112
## P18,10,11,1.50665567398071
## P18,10,12,1.51085275725314
## P18,10,13,1.50721786640309
## P18,10,14,1.51150580644608
## P18,10,15,1.51202606750747
## P18,10,16,1.50769531285321
## P18,10,17,1.51028903325399
## P18,10,18,1.51290225982666
## P18,10,19,1.50864206660878
## P18,10,20,1.5086363187203
## P18,10,21,1.50812760064768
## P18,10,22,1.51128199895223
## P18,10,23,1.51207243028234
## P18,10,24,1.5084194953625
## P18,10,25,1.51249947812822
## P18,10,26,1.50961974155472
## P18,10,27,1.50800526871973
## P18,10,28,1.51238581308952
## P18,10,29,1.50801174264205
## P18,10,30,1.51443308194478
## P18,10,31,1.50837443669637
## P18,10,32,1.5079508125782
## P18,10,33,1.50934813171625
## P18,10,34,1.51158116709801
## P18,10,35,1.51081485459299
## P18,10,36,1.50869411533162
## P18,10,37,1.50924775407121
## P18,10,38,1.5119947565013
## P18,10,39,1.50922416903309
## P18,10,40,1.51079466031945
## P18,10,41,1.51495003700256
## P18,10,42,1.50867481889396
## P18,10,43,1.50884707768758
## P18,10,44,1.51725342933168
## P18,10,45,1.50995709101359
## P18,10,46,1.51210367052179
## P18,10,47,1.51046366845408
## P18,10,48,1.5122159410406
## P18,10,49,1.51086313779964
## P18,10,50,1.51021266224408
## P19,1,1,1.51102813993182
## P19,1,2,1.51156550497558
## P19,1,3,1.51226444542408
## P19,1,4,1.51474031854848
## P19,1,5,1.51100222766399
## P19,1,6,1.50838002420607
## P19,1,7,1.5121507619688
## P19,1,8,1.51380559314381
## P19,1,9,1.51044141347684
## P19,1,10,1.51697775802097
## P19,1,11,1.49982729598657
## P19,1,12,1.50770646396436
## P19,1,13,1.51297278369931
## P19,1,14,1.50768495005602
## P19,1,15,1.50960485870774
## P19,1,16,1.50838773739264
## P19,1,17,1.50826321878741
## P19,1,18,1.51416177057021
## P19,1,19,1.51077794621133
## P19,1,20,1.51335182189941
## P19,1,21,1.52056229045625
## P19,1,22,1.51185706710815
## P19,1,23,1.50736865662692
## P19,1,24,1.51067834700981
## P19,1,25,1.50932837479951
## P19,1,26,1.51067239339234
## P19,1,27,1.50348473024798
## P19,1,28,1.50791318987457
## P19,1,29,1.51241398476935
## P19,1,30,1.51217562539237
## P19,1,31,1.52243417815158
## P19,1,32,1.51828369727502
## P19,1,33,1.50719902529354
## P19,1,34,1.51252213624807
## P19,1,35,1.5119393499274
## P19,1,36,1.51157387097677
## P19,1,37,1.51036852684574
## P19,1,38,1.51194781226081
## P19,1,39,1.51061956291525
## P19,1,40,1.51106545610248
## P19,1,41,1.51126018202448
## P19,1,42,1.50946225909238
## P19,1,43,1.50495912490353
## P19,1,44,1.51295981520698
## P19,1,45,1.50557873055742
## P19,1,46,1.50643008688222
## P19,1,47,1.50858789423238
## P19,1,48,1.51348696731207
## P19,1,49,1.50940086569967
## P19,1,50,1.51074123079333
## P19,2,1,1.51234532757239
## P19,2,2,1.5067848013593
## P19,2,3,1.51615604830951
## P19,2,4,1.51190862249821
## P19,2,5,1.51175479214601
## P19,2,6,1.51017585699109
## P19,2,7,1.51246479139899
## P19,2,8,1.50937946637472
## P19,2,9,1.51276276643994
## P19,2,10,1.50927522293357
## P19,2,11,1.5124035017831
## P19,2,12,1.50972171557152
## P19,2,13,1.50895103477162
## P19,2,14,1.51042090376763
## P19,2,15,1.50977269898761
## P19,2,16,1.51056134700775
## P19,2,17,1.51078608049361
## P19,2,18,1.50827701552575
## P19,2,19,1.50779660173165
## P19,2,20,1.50831143662736
## P19,2,21,1.51184705968173
## P19,2,22,1.51157702570376
## P19,2,23,1.51096648120424
## P19,2,24,1.50913788258344
## P19,2,25,1.5099460631609
## P19,2,26,1.51161665963654
## P19,2,27,1.51057858116883
## P19,2,28,1.51201763573815
## P19,2,29,1.51126408784286
## P19,2,30,1.51027200424593
## P19,2,31,1.50960500446367
## P19,2,32,1.51153194667488
## P19,2,33,1.51249288543453
## P19,2,34,1.51137864658598
## P19,2,35,1.51071484883626
## P19,2,36,1.51102238325846
## P19,2,37,1.51152334457789
## P19,2,38,1.51105426541335
## P19,2,39,1.51046946936963
## P19,2,40,1.51186573564125
## P19,2,41,1.51147472125858
## P19,2,42,1.50820256214516
## P19,2,43,1.51233158260584
## P19,2,44,1.51112474493078
## P19,2,45,1.51122289708912
## P19,2,46,1.50986522553014
## P19,2,47,1.51092727647887
## P19,2,48,1.51216567130316
## P19,2,49,1.50960090790672
## P19,2,50,1.51068065175918
## P19,3,1,1.51035453143873
## P19,3,2,1.5122308757718
## P19,3,3,1.51068794952249
## P19,3,4,1.51165061337607
## P19,3,5,1.510850695313
## P19,3,6,1.5102234792443
## P19,3,7,1.51307821821892
## P19,3,8,1.51105042540509
## P19,3,9,1.51205420075801
## P19,3,10,1.51060654527398
## P19,3,11,1.51160127753454
## P19,3,12,1.51123656063545
## P19,3,13,1.51124544380125
## P19,3,14,1.51153971521478
## P19,3,15,1.50944638949389
## P19,3,16,1.50885451153705
## P19,3,17,1.51191375610676
## P19,3,18,1.51146569563516
## P19,3,19,1.51034676559328
## P19,3,20,1.51413555978571
## P19,3,21,1.51401289438797
## P19,3,22,1.51018293134628
## P19,3,23,1.51290890013818
## P19,3,24,1.5096540766314
## P19,3,25,1.50809442916973
## P19,3,26,1.50889934075845
## P19,3,27,1.50768525223983
## P19,3,28,1.51039891030378
## P19,3,29,1.51186468239987
## P19,3,30,1.51268626641536
## P19,3,31,1.50965979581322
## P19,3,32,1.51089098109281
## P19,3,33,1.51274613446968
## P19,3,34,1.5103737647924
## P19,3,35,1.51128470343213
## P19,3,36,1.5100312410399
## P19,3,37,1.51337008871091
## P19,3,38,1.51425064272351
## P19,3,39,1.51026340498441
## P19,3,40,1.51294763057263
## P19,3,41,1.51986382449115
## P19,3,42,1.51251408837058
## P19,3,43,1.51014263876553
## P19,3,44,1.50908835645746
## P19,3,45,1.51267939007159
## P19,3,46,1.50933258874076
## P19,3,47,1.5120626099502
## P19,3,48,1.50985367504167
## P19,3,49,1.51413779851248
## P19,3,50,1.51111358707909
## P19,4,1,1.51019920819048
## P19,4,2,1.51241824053979
## P19,4,3,1.51077870086387
## P19,4,4,1.51210844039917
## P19,4,5,1.51216374503242
## P19,4,6,1.5125399655516
## P19,4,7,1.51215535402298
## P19,4,8,1.51070588656834
## P19,4,9,1.51186571532874
## P19,4,10,1.51122691447918
## P19,4,11,1.51195679005888
## P19,4,12,1.51141507670564
## P19,4,13,1.50918822085604
## P19,4,14,1.51408039175946
## P19,4,15,1.5087198344144
## P19,4,16,1.50993448817087
## P19,4,17,1.50911277305079
## P19,4,18,1.51278445509826
## P19,4,19,1.51221848634573
## P19,4,20,1.51086646895255
## P19,4,21,1.50976086917676
## P19,4,22,1.50843103608089
## P19,4,23,1.5109427731908
## P19,4,24,1.51196057231803
## P19,4,25,1.51199718286063
## P19,4,26,1.51026033292151
## P19,4,27,1.51105867629933
## P19,4,28,1.51218170515248
## P19,4,29,1.51093634818364
## P19,4,30,1.51105279517624
## P19,4,31,1.51140457544571
## P19,4,32,1.51157063274849
## P19,4,33,1.51083707094192
## P19,4,34,1.51140476120305
## P19,4,35,1.51113156069105
## P19,4,36,1.51097623258829
## P19,4,37,1.51026490088285
## P19,4,38,1.51039463130351
## P19,4,39,1.51226749083008
## P19,4,40,1.51140807030049
## P19,4,41,1.51226751154119
## P19,4,42,1.50668733273077
## P19,4,43,1.51105547872718
## P19,4,44,1.51038504766187
## P19,4,45,1.51121649470354
## P19,4,46,1.51087894207094
## P19,4,47,1.51099868147981
## P19,4,48,1.51007466846042
## P19,4,49,1.51068638127025
## P19,4,50,1.51043091278622
## P19,5,1,1.51112436644639
## P19,5,2,1.51153772769694
## P19,5,3,1.51043000221252
## P19,5,4,1.51053149322343
## P19,5,5,1.51081384210026
## P19,5,6,1.51238306893243
## P19,5,7,1.51040283002351
## P19,5,8,1.51088950521659
## P19,5,9,1.51081753049578
## P19,5,10,1.51076044280672
## P19,5,11,1.51047168200529
## P19,5,12,1.50792328198751
## P19,5,13,1.51229553458131
## P19,5,14,1.51123468618135
## P19,5,15,1.5103490795408
## P19,5,16,1.50968297719955
## P19,5,17,1.51161732306847
## P19,5,18,1.5116796385973
## P19,5,19,1.5088626131954
## P19,5,20,1.51170747297524
## P19,5,21,1.51132259551127
## P19,5,22,1.51004531789333
## P19,5,23,1.50993857497261
## P19,5,24,1.51065483928597
## P19,5,25,1.51167240738869
## P19,5,26,1.50950131650831
## P19,5,27,1.51225016645329
## P19,5,28,1.51238581461784
## P19,5,29,1.51009183883667
## P19,5,30,1.51169725207539
## P19,5,31,1.51148240796981
## P19,5,32,1.51039904544228
## P19,5,33,1.51053734701507
## P19,5,34,1.50992898146311
## P19,5,35,1.51149388064038
## P19,5,36,1.51120355394151
## P19,5,37,1.51084900533916
## P19,5,38,1.51307660308332
## P19,5,39,1.51145620398469
## P19,5,40,1.51146712330724
## P19,5,41,1.5103998260702
## P19,5,42,1.51025174752526
## P19,5,43,1.50883170727933
## P19,5,44,1.51167922184385
## P19,5,45,1.51135740893902
## P19,5,46,1.51035098875723
## P19,5,47,1.51093179757515
## P19,5,48,1.51223089058362
## P19,5,49,1.51092166792263
## P19,5,50,1.51118138490525
## P19,6,1,1.51446158624109
## P19,6,2,1.51441522078081
## P19,6,3,1.51260208958731
## P19,6,4,1.51322971310532
## P19,6,5,1.51285287876821
## P19,6,6,1.51296291496548
## P19,6,7,1.51282879691454
## P19,6,8,1.5127868429262
## P19,6,9,1.51322499492712
## P19,6,10,1.51193755575754
## P19,6,11,1.51242935830268
## P19,6,12,1.51206741471221
## P19,6,13,1.51167431944295
## P19,6,14,1.51165258372488
## P19,6,15,1.51131290377993
## P19,6,16,1.51178096176742
## P19,6,17,1.51044812439181
## P19,6,18,1.51191221778073
## P19,6,19,1.51136528361927
## P19,6,20,1.51174871488051
## P19,6,21,1.51097143107447
## P19,6,22,1.51312134558694
## P19,6,23,1.51130865804804
## P19,6,24,1.5109030229074
## P19,6,25,1.51120782024646
## P19,6,26,1.51304988966462
## P19,6,27,1.51114022001928
## P19,6,28,1.51124666766687
## P19,6,29,1.51076808322075
## P19,6,30,1.5111029400545
## P19,6,31,1.51120168487461
## P19,6,32,1.50995891253153
## P19,6,33,1.51117184477032
## P19,6,34,1.51091201991251
## P19,6,35,1.51159190583503
## P19,6,36,1.51144154329558
## P19,6,37,1.51029385911657
## P19,6,38,1.5118034961747
## P19,6,39,1.51119502488669
## P19,6,40,1.51141962077883
## P19,6,41,1.51084239432152
## P19,6,42,1.51044390613871
## P19,6,43,1.51161754977319
## P19,6,44,1.51014102300008
## P19,6,45,1.51143522144104
## P19,6,46,1.51115847278286
## P19,6,47,1.51086450267482
## P19,6,48,1.51096744699912
## P19,6,49,1.51123208215792
## P19,6,50,1.51126063408025
## P19,7,1,1.51135198735009
## P19,7,2,1.51157509633737
## P19,7,3,1.50986423757341
## P19,7,4,1.51158515846028
## P19,7,5,1.51001805801914
## P19,7,6,1.51051520615173
## P19,7,7,1.51105548584298
## P19,7,8,1.50985507199364
## P19,7,9,1.51085275934454
## P19,7,10,1.51195200773386
## P19,7,11,1.51240537424756
## P19,7,12,1.50962158633817
## P19,7,13,1.51057070313078
## P19,7,14,1.51024665015084
## P19,7,15,1.51242974136449
## P19,7,16,1.51018918967395
## P19,7,17,1.51078950986266
## P19,7,18,1.51246328231616
## P19,7,19,1.51138073096246
## P19,7,20,1.51175878002385
## P19,7,21,1.51148369619923
## P19,7,22,1.51083992281531
## P19,7,23,1.51188095169838
## P19,7,24,1.51045110008933
## P19,7,25,1.50969490679828
## P19,7,26,1.51057668442422
## P19,7,27,1.51087471246719
## P19,7,28,1.51213652808387
## P19,7,29,1.51106796624526
## P19,7,30,1.51056780946364
## P19,7,31,1.51044654526166
## P19,7,32,1.51119696299235
## P19,7,33,1.50923691103535
## P19,7,34,1.51100850927419
## P19,7,35,1.51124236262436
## P19,7,36,1.51144260982815
## P19,7,37,1.51031136672769
## P19,7,38,1.51095373793082
## P19,7,39,1.51228802254859
## P19,7,40,1.50910537124526
## P19,7,41,1.50940336543284
## P19,7,42,1.51141652287664
## P19,7,43,1.51100681104713
## P19,7,44,1.51111081751381
## P19,7,45,1.51100188594753
## P19,7,46,1.51057860002679
## P19,7,47,1.5104119529022
## P19,7,48,1.5110569027492
## P19,7,49,1.51182129396407
## P19,7,50,1.50968015917882
## P19,8,1,1.50960731506348
## P19,8,2,1.50963730354832
## P19,8,3,1.51057295759847
## P19,8,4,1.51067098996318
## P19,8,5,1.51002256132716
## P19,8,6,1.50849446006443
## P19,8,7,1.51165631390357
## P19,8,8,1.5130760859858
## P19,8,9,1.5106995847841
## P19,8,10,1.51176880738314
## P19,8,11,1.51331731406125
## P19,8,12,1.51093286938137
## P19,8,13,1.50970905121059
## P19,8,14,1.51077260017395
## P19,8,15,1.51093834595715
## P19,8,16,1.51125466562536
## P19,8,17,1.51083837615119
## P19,8,18,1.51121656843227
## P19,8,19,1.51104436065211
## P19,8,20,1.51184820731481
## P19,8,21,1.51125218884257
## P19,8,22,1.51118301321392
## P19,8,23,1.5092662424823
## P19,8,24,1.51235113926788
## P19,8,25,1.51217988472951
## P19,8,26,1.51146608504696
## P19,8,27,1.51029728527727
## P19,8,28,1.51096937844628
## P19,8,29,1.51231321627206
## P19,8,30,1.51038316338362
## P19,8,31,1.51045560414812
## P19,8,32,1.51045720256976
## P19,8,33,1.51100920072568
## P19,8,34,1.51106384922476
## P19,8,35,1.51013416088886
## P19,8,36,1.51147814562721
## P19,8,37,1.51096575334668
## P19,8,38,1.51179830499943
## P19,8,39,1.51096134836024
## P19,8,40,1.51080876769442
## P19,8,41,1.5100467838347
## P19,8,42,1.5088436536386
## P19,8,43,1.51243698504544
## P19,8,44,1.50984769767815
## P19,8,45,1.51065368975623
## P19,8,46,1.5119695921202
## P19,8,47,1.50911108314568
## P19,8,48,1.51005002136888
## P19,8,49,1.51049666485544
## P19,8,50,1.50983363039353
## P19,9,1,1.51110579417302
## P19,9,2,1.50879668656674
## P19,9,3,1.51127415895462
## P19,9,4,1.51113101069847
## P19,9,5,1.51208301133747
## P19,9,6,1.51165845017684
## P19,9,7,1.5118948431576
## P19,9,8,1.51047389251364
## P19,9,9,1.51020724352668
## P19,9,10,1.51083408446002
## P19,9,11,1.51211153136359
## P19,9,12,1.51038182368044
## P19,9,13,1.51133796971315
## P19,9,14,1.51063612715839
## P19,9,15,1.51201070465657
## P19,9,16,1.5110745233648
## P19,9,17,1.51129379340097
## P19,9,18,1.50935891656315
## P19,9,19,1.51180436470929
## P19,9,20,1.51106655059322
## P19,9,21,1.51133364619631
## P19,9,22,1.50974736957375
## P19,9,23,1.50869381912356
## P19,9,24,1.51090933779161
## P19,9,25,1.50924036462428
## P19,9,26,1.51107132546256
## P19,9,27,1.51058482301646
## P19,9,28,1.50945845071007
## P19,9,29,1.51261291010626
## P19,9,30,1.51039396762848
## P19,9,31,1.51240196903195
## P19,9,32,1.51069466542389
## P19,9,33,1.51096957237994
## P19,9,34,1.51127378205608
## P19,9,35,1.50998753514783
## P19,9,36,1.51114529674336
## P19,9,37,1.5101212078763
## P19,9,38,1.50960806338456
## P19,9,39,1.51220076552061
## P19,9,40,1.5112107915263
## P19,9,41,1.51283986549678
## P19,9,42,1.51123744563053
## P19,9,43,1.51124616463979
## P19,9,44,1.51051290245617
## P19,9,45,1.51000270247459
## P19,9,46,1.51123783569927
## P19,9,47,1.51125382362528
## P19,9,48,1.5112156092636
## P19,9,49,1.51185902571067
## P19,9,50,1.51094064677971
## P19,10,1,1.51046904626783
## P19,10,2,1.5106987429492
## P19,10,3,1.51113442133164
## P19,10,4,1.51145018718039
## P19,10,5,1.50897118414956
## P19,10,6,1.51096149932506
## P19,10,7,1.51019434134165
## P19,10,8,1.5118578893167
## P19,10,9,1.51114708469028
## P19,10,10,1.51060655552854
## P19,10,11,1.5092897156635
## P19,10,12,1.51061955543414
## P19,10,13,1.51052223115959
## P19,10,14,1.51204189547786
## P19,10,15,1.51011726296978
## P19,10,16,1.51121221465626
## P19,10,17,1.51078805736467
## P19,10,18,1.5112280445499
## P19,10,19,1.51095102582659
## P19,10,20,1.50981860411795
## P19,10,21,1.51125658390134
## P19,10,22,1.50986716372908
## P19,10,23,1.51187488644622
## P19,10,24,1.51067510966597
## P19,10,25,1.51068424656443
## P19,10,26,1.51068466841572
## P19,10,27,1.51040214583987
## P19,10,28,1.51051420065073
## P19,10,29,1.51077423477173
## P19,10,30,1.51127874752707
## P19,10,31,1.51260016759237
## P19,10,32,1.50958454173847
## P19,10,33,1.51241366602793
## P19,10,34,1.50965894552378
## P19,10,35,1.51095838635881
## P19,10,36,1.51116142863721
## P19,10,37,1.51088409281489
## P19,10,38,1.50963635363821
## P19,10,39,1.51073748115602
## P19,10,40,1.51123743128956
## P19,10,41,1.51114406201663
## P19,10,42,1.50855545564131
## P19,10,43,1.5108006684355
## P19,10,44,1.51100222269694
## P19,10,45,1.51029035609256
## P19,10,46,1.51001831310899
## P19,10,47,1.51194113597535
## P19,10,48,1.51037658207
## P19,10,49,1.51149992595445
## P19,10,50,1.509794497408
## P20,1,1,1.50771754615161
## P20,1,2,1.51351219200226
## P20,1,3,1.52199131543519
## P20,1,4,1.5247074564298
## P20,1,5,1.51003769768609
## P20,1,6,1.51357368000767
## P20,1,7,1.51677481651306
## P20,1,8,1.51331907742983
## P20,1,9,1.50961386581947
## P20,1,10,1.51368627240581
## P20,1,11,1.51971427293924
## P20,1,12,1.51282524671711
## P20,1,13,1.49956588745117
## P20,1,14,1.51774659523597
## P20,1,15,1.50946682416476
## P20,1,16,1.50556177563137
## P20,1,17,1.5182158265795
## P20,1,18,1.50861222865218
## P20,1,19,1.51102921922328
## P20,1,20,1.5133946524726
## P20,1,21,1.50777423834499
## P20,1,22,1.50439396771518
## P20,1,23,1.5115863936288
## P20,1,24,1.5064395792344
## P20,1,25,1.51295021602086
## P20,1,26,1.5113422870636
## P20,1,27,1.51588832007514
## P20,1,28,1.51373619782297
## P20,1,29,1.50318060715993
## P20,1,30,1.51930177912993
## P20,1,31,1.49549196628814
## P20,1,32,1.5325739118788
## P20,1,33,1.44813324423397
## P20,1,34,1.48891144328647
## P20,1,35,1.58773847513421
## P20,1,36,1.46548274086743
## P20,1,37,1.47236037835842
## P20,1,38,1.42986726027269
## P20,1,39,1.53772507590809
## P20,1,40,1.58353860037667
## P20,1,41,1.55803030537021
## P20,1,42,1.50077018222293
## P20,1,43,1.52237203764537
## P20,1,44,1.49868875171827
## P20,1,45,1.50643011274792
## P20,1,46,1.49664914608002
## P20,1,47,1.51609672418162
## P20,1,48,1.51558903044304
## P20,1,49,1.48853783704797
## P20,1,50,1.50563834118215
## P20,2,1,1.52521395292438
## P20,2,2,1.50996158917745
## P20,2,3,1.51566683544832
## P20,2,4,1.52131476402283
## P20,2,5,1.50766548403987
## P20,2,6,1.50504850833974
## P20,2,7,1.5083560338096
## P20,2,8,1.4965098908073
## P20,2,9,1.52268532344273
## P20,2,10,1.51034722529667
## P20,2,11,1.51137490570545
## P20,2,12,1.49715098090794
## P20,2,13,1.50626900746272
## P20,2,14,1.51233829657237
## P20,2,15,1.49995551542802
## P20,2,16,1.51661916489297
## P20,2,17,1.49463664784151
## P20,2,18,1.5171645252975
## P20,2,19,1.50093517498094
## P20,2,20,1.49314114782545
## P20,2,21,1.51487482097787
## P20,2,22,1.50987143175943
## P20,2,23,1.50762108097906
## P20,2,24,1.51068022943312
## P20,2,25,1.51640284338663
## P20,2,26,1.51474938054723
## P20,2,27,1.50689067249804
## P20,2,28,1.51250482082367
## P20,2,29,1.51236842899788
## P20,2,30,1.50946861902873
## P20,2,31,1.52542364597321
## P20,2,32,1.51838323203
## P20,2,33,1.50257787881074
## P20,2,34,1.51289436396431
## P20,2,35,1.50987967666315
## P20,2,36,1.50316716730595
## P20,2,37,1.50251064672099
## P20,2,38,1.50447442484837
## P20,2,39,1.51481959858879
## P20,2,40,1.5062459926216
## P20,2,41,1.54422417439912
## P20,2,42,1.58924293518066
## P20,2,43,1.44420989354451
## P20,2,44,1.4949213663737
## P20,2,45,1.49649768505456
## P20,2,46,1.54445745177188
## P20,2,47,1.51170792495995
## P20,2,48,1.49111225249919
## P20,2,49,1.50977887278018
## P20,2,50,1.50782924209322
## P20,3,1,1.52172507180108
## P20,3,2,1.50322889592606
## P20,3,3,1.51330317010125
## P20,3,4,1.50855079343763
## P20,3,5,1.51267378232632
## P20,3,6,1.51196232548466
## P20,3,7,1.50878364100601
## P20,3,8,1.50962764473372
## P20,3,9,1.50901652119823
## P20,3,10,1.51040062437887
## P20,3,11,1.50950832202517
## P20,3,12,1.50927679580555
## P20,3,13,1.50793950898307
## P20,3,14,1.50374920912615
## P20,3,15,1.52326283538551
## P20,3,16,1.50836737589403
## P20,3,17,1.50656681349783
## P20,3,18,1.51023911546778
## P20,3,19,1.51250515085586
## P20,3,20,1.50883307664291
## P20,3,21,1.50525657814669
## P20,3,22,1.50817707822293
## P20,3,23,1.51110119923301
## P20,3,24,1.51074096601303
## P20,3,25,1.51052382912966
## P20,3,26,1.50967250479029
## P20,3,27,1.50954100778026
## P20,3,28,1.511494461447
## P20,3,29,1.50838342329272
## P20,3,30,1.50838622626136
## P20,3,31,1.50776312234518
## P20,3,32,1.47100083852552
## P20,3,33,1.51022258703259
## P20,3,34,1.50232796536552
## P20,3,35,1.51612417125169
## P20,3,36,1.5081646750955
## P20,3,37,1.52482856403698
## P20,3,38,1.51059008516916
## P20,3,39,1.50925271593291
## P20,3,40,1.5117787971771
## P20,3,41,1.50297610576336
## P20,3,42,1.51190553720181
## P20,3,43,1.51062644241203
## P20,3,44,1.51475847001169
## P20,3,45,1.53329532796686
## P20,3,46,1.51078544878492
## P20,3,47,1.50759832461675
## P20,3,48,1.51699557355655
## P20,3,49,1.51200635706792
## P20,3,50,1.51050623996071
## P20,4,1,1.50700945526589
## P20,4,2,1.51165538515363
## P20,4,3,1.50855057338286
## P20,4,4,1.50743469968438
## P20,4,5,1.49753467411014
## P20,4,6,1.51551870388143
## P20,4,7,1.50957917791652
## P20,4,8,1.50844429823068
## P20,4,9,1.50975530219801
## P20,4,10,1.50936457438347
## P20,4,11,1.51202393453056
## P20,4,12,1.51335045888826
## P20,4,13,1.51601402448571
## P20,4,14,1.50960249934636
## P20,4,15,1.52109903874605
## P20,4,16,1.50691047704445
## P20,4,17,1.51140362450055
## P20,4,18,1.53915174383866
## P20,4,19,1.50476791267108
## P20,4,20,1.52840511738753
## P20,4,21,1.50150521108709
## P20,4,22,1.5195780583282
## P20,4,23,1.5058736059846
## P20,4,24,1.51296845959945
## P20,4,25,1.51017803795594
## P20,4,26,1.51006989612758
## P20,4,27,1.51607959893099
## P20,4,28,1.5097193203062
## P20,4,29,1.50890869533314
## P20,4,30,1.51079155621904
## P20,4,31,1.51249405225118
## P20,4,32,1.50741414462819
## P20,4,33,1.50812460914735
## P20,4,34,1.51133699486726
## P20,4,35,1.51224464840359
## P20,4,36,1.50372915668087
## P20,4,37,1.52407958453759
## P20,4,38,1.51077485946288
## P20,4,39,1.51341870197883
## P20,4,40,1.51238708106839
## P20,4,41,1.50941734761
## P20,4,42,1.51118352678087
## P20,4,43,1.51050277032714
## P20,4,44,1.50931403584724
## P20,4,45,1.50956005266268
## P20,4,46,1.50748465320852
## P20,4,47,1.50992502015212
## P20,4,48,1.51332843130913
## P20,4,49,1.51136915787407
## P20,4,50,1.50947529159353
## P20,5,1,1.51464091909343
## P20,5,2,1.51124784049638
## P20,5,3,1.51160034096759
## P20,5,4,1.5115674025093
## P20,5,5,1.51362246915329
## P20,5,6,1.50997683171476
## P20,5,7,1.50661905222926
## P20,5,8,1.51078561608118
## P20,5,9,1.50855169693629
## P20,5,10,1.50844715748514
## P20,5,11,1.51007233025893
## P20,5,12,1.50938076614052
## P20,5,13,1.50997951988862
## P20,5,14,1.50874243569128
## P20,5,15,1.51093858360444
## P20,5,16,1.51171866157986
## P20,5,17,1.50908880233765
## P20,5,18,1.51008245421619
## P20,5,19,1.50962748812206
## P20,5,20,1.51117147986344
## P20,5,21,1.51154175644401
## P20,5,22,1.51302646398544
## P20,5,23,1.51027955046488
## P20,5,24,1.51071251355685
## P20,5,25,1.51014907455444
## P20,5,26,1.51177149906493
## P20,5,27,1.50990610812084
## P20,5,28,1.51226925363346
## P20,5,29,1.51213817116168
## P20,5,30,1.51172946383069
## P20,5,31,1.5179307483067
## P20,5,32,1.50912736838972
## P20,5,33,1.50927676576557
## P20,5,34,1.51138521762604
## P20,5,35,1.51104608002831
## P20,5,36,1.50876842226301
## P20,5,37,1.51095466698165
## P20,5,38,1.51097820035873
## P20,5,39,1.5106531282266
## P20,5,40,1.51234990358353
## P20,5,41,1.51078529085432
## P20,5,42,1.51163427135612
## P20,5,43,1.50846152889485
## P20,5,44,1.51013311799967
## P20,5,45,1.51054630857525
## P20,5,46,1.51179201234647
## P20,5,47,1.51302954632303
## P20,5,48,1.5095498541824
## P20,5,49,1.50990957021713
## P20,5,50,1.50981390602597
## P20,6,1,1.51097669798074
## P20,6,2,1.51012809753418
## P20,6,3,1.5102957832479
## P20,6,4,1.5120216406785
## P20,6,5,1.51060109466087
## P20,6,6,1.50913325260425
## P20,6,7,1.51078647321409
## P20,6,8,1.5101320883807
## P20,6,9,1.51105336653881
## P20,6,10,1.51044440615004
## P20,6,11,1.5104486653299
## P20,6,12,1.51078483793471
## P20,6,13,1.51219659832352
## P20,6,14,1.5117376353465
## P20,6,15,1.50911485447603
## P20,6,16,1.5105877487283
## P20,6,17,1.50943601236934
## P20,6,18,1.50946033944329
## P20,6,19,1.51023928833008
## P20,6,20,1.50941409562763
## P20,6,21,1.51150763576681
## P20,6,22,1.51015738184138
## P20,6,23,1.51212346156438
## P20,6,24,1.51151799866647
## P20,6,25,1.50885172027478
## P20,6,26,1.51219219207764
## P20,6,27,1.50805944518039
## P20,6,28,1.51162137985229
## P20,6,29,1.510553633083
## P20,6,30,1.51163199095599
## P20,6,31,1.51069118181864
## P20,6,32,1.5082675333946
## P20,6,33,1.5123211517334
## P20,6,34,1.51211270650228
## P20,6,35,1.50660488969189
## P20,6,36,1.50996790563359
## P20,6,37,1.50931381905216
## P20,6,38,1.51253912552543
## P20,6,39,1.50941851403978
## P20,6,40,1.50937840100881
## P20,6,41,1.50986836085448
## P20,6,42,1.50889208510115
## P20,6,43,1.51013109982014
## P20,6,44,1.50869296599126
## P20,6,45,1.51088138222694
## P20,6,46,1.51119149761435
## P20,6,47,1.50922882840747
## P20,6,48,1.50981389612391
## P20,6,49,1.51039317816742
## P20,6,50,1.51060233825093
## P20,7,1,1.51224199821209
## P20,7,2,1.50953607888057
## P20,7,3,1.50802815329168
## P20,7,4,1.50892171603721
## P20,7,5,1.51041432596603
## P20,7,6,1.5133987260521
## P20,7,7,1.50856561719635
## P20,7,8,1.51195762589661
## P20,7,9,1.51140099719055
## P20,7,10,1.50906405118432
## P20,7,11,1.51022954199724
## P20,7,12,1.50994959379497
## P20,7,13,1.5077756839012
## P20,7,14,1.51027581214905
## P20,7,15,1.51417829786028
## P20,7,16,1.50540556997623
## P20,7,17,1.51283751656027
## P20,7,18,1.51069004833698
## P20,7,19,1.50985915473338
## P20,7,20,1.51123666086941
## P20,7,21,1.50527217341404
## P20,7,22,1.52185717533375
## P20,7,23,1.50823448200037
## P20,7,24,1.51249945504325
## P20,7,25,1.51006709961664
## P20,7,26,1.51897691337156
## P20,7,27,1.49976868478079
## P20,7,28,1.51607546053435
## P20,7,29,1.51158636166499
## P20,7,30,1.51012427689599
## P20,7,31,1.51325995982194
## P20,7,32,1.50861036630324
## P20,7,33,1.51048800896625
## P20,7,34,1.50969130059947
## P20,7,35,1.50851294251739
## P20,7,36,1.51010346412659
## P20,7,37,1.51011500214085
## P20,7,38,1.50734467418106
## P20,7,39,1.510326586479
## P20,7,40,1.51241065647976
## P20,7,41,1.51016159057617
## P20,7,42,1.51172734932466
## P20,7,43,1.51008245809291
## P20,7,44,1.51161738929399
## P20,7,45,1.50615858590161
## P20,7,46,1.51176958314834
## P20,7,47,1.51426972175131
## P20,7,48,1.50951758198354
## P20,7,49,1.5117284149252
## P20,7,50,1.51143411566143
## P20,8,1,1.51245859394903
## P20,8,2,1.51177451994036
## P20,8,3,1.51136765820639
## P20,8,4,1.5121379160619
## P20,8,5,1.51335603204267
## P20,8,6,1.51043898757847
## P20,8,7,1.51023825798326
## P20,8,8,1.50913602237044
## P20,8,9,1.51096957305382
## P20,8,10,1.5107632508149
## P20,8,11,1.51042292437215
## P20,8,12,1.51073683968073
## P20,8,13,1.512286970887
## P20,8,14,1.50935852157403
## P20,8,15,1.51145174942519
## P20,8,16,1.51118036812427
## P20,8,17,1.51599063628759
## P20,8,18,1.50646234989166
## P20,8,19,1.51445421805749
## P20,8,20,1.5095845919389
## P20,8,21,1.50774979000249
## P20,8,22,1.50997213380677
## P20,8,23,1.50956126390877
## P20,8,24,1.51050186692999
## P20,8,25,1.50716923112455
## P20,8,26,1.51636105022211
## P20,8,27,1.50999090527043
## P20,8,28,1.51169749292834
## P20,8,29,1.5093380973095
## P20,8,30,1.50938004713792
## P20,8,31,1.51076246846107
## P20,8,32,1.5115943249361
## P20,8,33,1.5060399707995
## P20,8,34,1.51098097150571
## P20,8,35,1.51301755905151
## P20,8,36,1.51139901711689
## P20,8,37,1.51117344413485
## P20,8,38,1.50680757893456
## P20,8,39,1.51001984373967
## P20,8,40,1.51007472182349
## P20,8,41,1.51182509860853
## P20,8,42,1.50898419565229
## P20,8,43,1.51039875525015
## P20,8,44,1.51194268125829
## P20,8,45,1.51018492171639
## P20,8,46,1.50991544402948
## P20,8,47,1.50967962741852
## P20,8,48,1.51115668614705
## P20,8,49,1.50953555251613
## P20,8,50,1.51089561447617
## P20,9,1,1.51105234051539
## P20,9,2,1.51164185900648
## P20,9,3,1.50929548429406
## P20,9,4,1.5106937508834
## P20,9,5,1.50726517791268
## P20,9,6,1.51153445917334
## P20,9,7,1.51259421367271
## P20,9,8,1.50924640738446
## P20,9,9,1.50941106058517
## P20,9,10,1.51129689258812
## P20,9,11,1.51120864704091
## P20,9,12,1.51285655447777
## P20,9,13,1.50956597694984
## P20,9,14,1.50973334312439
## P20,9,15,1.52467525605675
## P20,9,16,1.51759387989237
## P20,9,17,1.49897408726239
## P20,9,18,1.50803339481354
## P20,9,19,1.51053900718689
## P20,9,20,1.50884236307705
## P20,9,21,1.51040353291277
## P20,9,22,1.51099937643324
## P20,9,23,1.51141411682655
## P20,9,24,1.51052080585111
## P20,9,25,1.51985881087977
## P20,9,26,1.50651215229716
## P20,9,27,1.51069392791161
## P20,9,28,1.51218682527542
## P20,9,29,1.51048720904759
## P20,9,30,1.51068466359919
## P20,9,31,1.51117017800859
## P20,9,32,1.50977924818634
## P20,9,33,1.51012516021729
## P20,9,34,1.50589064929796
## P20,9,35,1.51032001544268
## P20,9,36,1.50894220148931
## P20,9,37,1.50808827420498
## P20,9,38,1.51023893656693
## P20,9,39,1.50984030864278
## P20,9,40,1.50820254731452
## P20,9,41,1.51097851932639
## P20,9,42,1.51195647751076
## P20,9,43,1.51051092683599
## P20,9,44,1.51110959298832
## P20,9,45,1.50916636101553
## P20,9,46,1.51128632446815
## P20,9,47,1.51077394882838
## P20,9,48,1.5112080325251
## P20,9,49,1.51208728846937
## P20,9,50,1.50991187546704
## P20,10,1,1.5090989932208
## P20,10,2,1.50916417183415
## P20,10,3,1.51106209150502
## P20,10,4,1.51186188122698
## P20,10,5,1.51082492030524
## P20,10,6,1.50992972554724
## P20,10,7,1.50931490621259
## P20,10,8,1.50885504400226
## P20,10,9,1.50914449200911
## P20,10,10,1.50804142422146
## P20,10,11,1.51087796913003
## P20,10,12,1.51004409790039
## P20,10,13,1.51129758476031
## P20,10,14,1.50982345853533
## P20,10,15,1.50598192214966
## P20,10,16,1.50982337278478
## P20,10,17,1.50877671406187
## P20,10,18,1.51060313594585
## P20,10,19,1.51287543433053
## P20,10,20,1.50913788806433
## P20,10,21,1.51362444259025
## P20,10,22,1.51187513400982
## P20,10,23,1.51126407895769
## P20,10,24,1.51157628496488
## P20,10,25,1.51194606164489
## P20,10,26,1.5112762811805
## P20,10,27,1.5092836526724
## P20,10,28,1.50889692808452
## P20,10,29,1.50704900243066
## P20,10,30,1.51226018558849
## P20,10,31,1.5105771416112
## P20,10,32,1.50911199324059
## P20,10,33,1.51172640167664
## P20,10,34,1.51174746240888
## P20,10,35,1.5090438538948
## P20,10,36,1.51130373894222
## P20,10,37,1.51038536360097
## P20,10,38,1.51035332472428
## P20,10,39,1.51224133875463
## P20,10,40,1.51066122794973
## P20,10,41,1.51052632607704
## P20,10,42,1.50312140313062
## P20,10,43,1.51347775118692
## P20,10,44,1.51071808149489
## P20,10,45,1.49917008171619
## P20,10,46,1.51341526732486
## P20,10,47,1.50650027874977
## P20,10,48,1.51252215825594
## P20,10,49,1.51357146951019
## P20,10,50,1.50979381700687
## P21,1,1,1.5136437277863
## P21,1,2,1.50292605413517
## P21,1,3,1.52186789879432
## P21,1,4,1.52895192932664
## P21,1,5,1.53243852052532
## P21,1,6,1.5148431965799
## P21,1,7,1.51406861139723
## P21,1,8,1.51102240646587
## P21,1,9,1.51404365112907
## P21,1,10,1.49367186852864
## P21,1,11,1.51368108136313
## P21,1,12,1.50453637691026
## P21,1,13,1.51864886687974
## P21,1,14,1.51638685358633
## P21,1,15,1.50958773546052
## P21,1,16,1.51682567596436
## P21,1,17,1.51256733150273
## P21,1,18,1.50020793768076
## P21,1,19,1.50630886038554
## P21,1,20,1.51585636315522
## P21,1,21,1.50656686045907
## P21,1,22,1.51851506829262
## P21,1,23,1.50627997788516
## P21,1,24,1.51388771687785
## P21,1,25,1.51934530775426
## P21,1,26,1.50974607969585
## P21,1,27,1.5180869636251
## P21,1,28,1.50484010207752
## P21,1,29,1.5140874074853
## P21,1,30,1.51677953865793
## P21,1,31,1.51448455372372
## P21,1,32,1.50538273833015
## P21,1,33,1.5155987895903
## P21,1,34,1.5265878200531
## P21,1,35,1.51394862948724
## P21,1,36,1.51528092793056
## P21,1,37,1.5153844833374
## P21,1,38,1.49941625235216
## P21,1,39,1.51041383946196
## P21,1,40,1.51433549608503
## P21,1,41,1.50812302106692
## P21,1,42,1.51815336308581
## P21,1,43,1.5068014220915
## P21,1,44,1.50551094250246
## P21,1,45,1.51482230117641
## P21,1,46,1.51515961337734
## P21,1,47,1.52042023153866
## P21,1,48,1.51225810759776
## P21,1,49,1.51606527081242
## P21,1,50,1.51061266711634
## P21,2,1,1.51485528096114
## P21,2,2,1.5078410918896
## P21,2,3,1.52315666237656
## P21,2,4,1.4981457036117
## P21,2,5,1.50051090859959
## P21,2,6,1.51174117069618
## P21,2,7,1.5123920137232
## P21,2,8,1.51471417463278
## P21,2,9,1.51050151216573
## P21,2,10,1.50726164518482
## P21,2,11,1.52118057227996
## P21,2,12,1.50982065761791
## P21,2,13,1.5255159586668
## P21,2,14,1.50794560744845
## P21,2,15,1.51187879421093
## P21,2,16,1.51137150355748
## P21,2,17,1.5190993703977
## P21,2,18,1.50830137504722
## P21,2,19,1.51270422935486
## P21,2,20,1.52781583442063
## P21,2,21,1.51149565039329
## P21,2,22,1.5121158020837
## P21,2,23,1.51017773535944
## P21,2,24,1.51236937940121
## P21,2,25,1.50584144875555
## P21,2,26,1.51416932371326
## P21,2,27,1.5157449549817
## P21,2,28,1.50533130321097
## P21,2,29,1.51841531935192
## P21,2,30,1.51443426898032
## P21,2,31,1.52521976610509
## P21,2,32,1.52291339120747
## P21,2,33,1.51262973086669
## P21,2,34,1.4981055415195
## P21,2,35,1.49540241397157
## P21,2,36,1.5044159591198
## P21,2,37,1.5069574731769
## P21,2,38,1.53004498614205
## P21,2,39,1.52765002617469
## P21,2,40,1.51256573664678
## P21,2,41,1.51307568040866
## P21,2,42,1.52104801552318
## P21,2,43,1.5103568719781
## P21,2,44,1.51784176485879
## P21,2,45,1.50990651119715
## P21,2,46,1.51149483080263
## P21,2,47,1.50349977404572
## P21,2,48,1.50468900468614
## P21,2,49,1.50672430510915
## P21,2,50,1.51540802292905
## P21,3,1,1.51241822575414
## P21,3,2,1.50698254449027
## P21,3,3,1.51629611372038
## P21,3,4,1.50712835126453
## P21,3,5,1.50952297449112
## P21,3,6,1.51770941416423
## P21,3,7,1.50854572543391
## P21,3,8,1.5122084915638
## P21,3,9,1.52191418239049
## P21,3,10,1.51600599743071
## P21,3,11,1.50486316542695
## P21,3,12,1.5227461806659
## P21,3,13,1.51125048442059
## P21,3,14,1.50975398386806
## P21,3,15,1.52941351370378
## P21,3,16,1.522028792289
## P21,3,17,1.49972816749855
## P21,3,18,1.51684003652528
## P21,3,19,1.51322066443307
## P21,3,20,1.51543656901309
## P21,3,21,1.5122028724007
## P21,3,22,1.50611869188455
## P21,3,23,1.51950487409319
## P21,3,24,1.51016000290992
## P21,3,25,1.51680303215981
## P21,3,26,1.51130126806406
## P21,3,27,1.52010162060077
## P21,3,28,1.51321636778968
## P21,3,29,1.51102813993182
## P21,3,30,1.51318526634803
## P21,3,31,1.50824283957481
## P21,3,32,1.50727872848511
## P21,3,33,1.51603884574695
## P21,3,34,1.50929913697419
## P21,3,35,1.52320500576135
## P21,3,36,1.51296101510525
## P21,3,37,1.51843229783784
## P21,3,38,1.51264228212073
## P21,3,39,1.51078857741989
## P21,3,40,1.5113913792522
## P21,3,41,1.50639210390241
## P21,3,42,1.51962835951285
## P21,3,43,1.51356797184505
## P21,3,44,1.52030793926384
## P21,3,45,1.51339364051819
## P21,3,46,1.51699646463934
## P21,3,47,1.51398439166927
## P21,3,48,1.51269640392727
## P21,3,49,1.50790575930947
## P21,3,50,1.51369719028473
## P21,4,1,1.51119986780874
## P21,4,2,1.51150196166266
## P21,4,3,1.51043558871652
## P21,4,4,1.51237790601967
## P21,4,5,1.50963277964629
## P21,4,6,1.51196231264057
## P21,4,7,1.51100905841549
## P21,4,8,1.51078068188259
## P21,4,9,1.51109379234043
## P21,4,10,1.50989201285622
## P21,4,11,1.51073359093576
## P21,4,12,1.51183052882095
## P21,4,13,1.50970904467857
## P21,4,14,1.51316650452152
## P21,4,15,1.51332762318273
## P21,4,16,1.50936139119815
## P21,4,17,1.5148694306612
## P21,4,18,1.5110712850714
## P21,4,19,1.50888824124708
## P21,4,20,1.51012607216835
## P21,4,21,1.5105360172413
## P21,4,22,1.51002180576324
## P21,4,23,1.51089016353811
## P21,4,24,1.51330262805344
## P21,4,25,1.50847506172517
## P21,4,26,1.51152163285476
## P21,4,27,1.5109356366671
## P21,4,28,1.51039199610703
## P21,4,29,1.51182211497251
## P21,4,30,1.51054308884335
## P21,4,31,1.50921981021611
## P21,4,32,1.51016975243886
## P21,4,33,1.5067138671875
## P21,4,34,1.51132079407021
## P21,4,35,1.51088813068421
## P21,4,36,1.51159365393899
## P21,4,37,1.5113244836147
## P21,4,38,1.5099673861549
## P21,4,39,1.50893192793194
## P21,4,40,1.511067143193
## P21,4,41,1.50805676778158
## P21,4,42,1.51047703302824
## P21,4,43,1.50798990249634
## P21,4,44,1.51021673872664
## P21,4,45,1.51221169744219
## P21,4,46,1.50971942441217
## P21,4,47,1.50959272945628
## P21,4,48,1.51035618323546
## P21,4,49,1.50968424479167
## P21,4,50,1.50654240521518
## P21,5,1,1.51095217958503
## P21,5,2,1.51428425206547
## P21,5,3,1.50543643633525
## P21,5,4,1.51308062300086
## P21,5,5,1.51318951498104
## P21,5,6,1.51102238186335
## P21,5,7,1.51548641555163
## P21,5,8,1.51121355719486
## P21,5,9,1.50888321728542
## P21,5,10,1.50948401323454
## P21,5,11,1.51294703332205
## P21,5,12,1.51064732979084
## P21,5,13,1.50981388002072
## P21,5,14,1.51178329079239
## P21,5,15,1.51015251961307
## P21,5,16,1.50964911959388
## P21,5,17,1.5105593137652
## P21,5,18,1.51027427000158
## P21,5,19,1.50968887614108
## P21,5,20,1.51168667559592
## P21,5,21,1.5111466345386
## P21,5,22,1.51083038454858
## P21,5,23,1.50997021660876
## P21,5,24,1.51551655479099
## P21,5,25,1.51254075205224
## P21,5,26,1.51022446614045
## P21,5,27,1.51041814787634
## P21,5,28,1.51027514188344
## P21,5,29,1.51162463839691
## P21,5,30,1.51199038348981
## P21,5,31,1.51104758679867
## P21,5,32,1.51226473255318
## P21,5,33,1.50798448046347
## P21,5,34,1.51050262297353
## P21,5,35,1.51339770185536
## P21,5,36,1.51272323396471
## P21,5,37,1.50938869405676
## P21,5,38,1.51286095227951
## P21,5,39,1.51093315278124
## P21,5,40,1.51130316474221
## P21,5,41,1.51021146774292
## P21,5,42,1.51115666013775
## P21,5,43,1.50869557039062
## P21,5,44,1.51238781445986
## P21,5,45,1.51237668082828
## P21,5,46,1.50938336903812
## P21,5,47,1.50894376118978
## P21,5,48,1.5092596206665
## P21,5,49,1.51118544169835
## P21,5,50,1.51338539418486
## P21,6,1,1.51111487282647
## P21,6,2,1.51180318549827
## P21,6,3,1.50963626320907
## P21,6,4,1.50911669547741
## P21,6,5,1.50907382299734
## P21,6,6,1.51039781920407
## P21,6,7,1.51258403960973
## P21,6,8,1.506014231089
## P21,6,9,1.5076280265558
## P21,6,10,1.51118445670468
## P21,6,11,1.51159342566689
## P21,6,12,1.50923973390426
## P21,6,13,1.51017721026551
## P21,6,14,1.51094852288564
## P21,6,15,1.510780705346
## P21,6,16,1.50926656213425
## P21,6,17,1.51689053649333
## P21,6,18,1.51149589973584
## P21,6,19,1.51432385651962
## P21,6,20,1.51237100103627
## P21,6,21,1.51250482559204
## P21,6,22,1.50879048012398
## P21,6,23,1.51187945934052
## P21,6,24,1.5066432645244
## P21,6,25,1.51157629489899
## P21,6,26,1.51174049101014
## P21,6,27,1.5110485522778
## P21,6,28,1.50789851962395
## P21,6,29,1.51254662951908
## P21,6,30,1.51091495090061
## P21,6,31,1.50910354942404
## P21,6,32,1.51289084617128
## P21,6,33,1.50839276446237
## P21,6,34,1.51194696880522
## P21,6,35,1.51032054547182
## P21,6,36,1.51444647461176
## P21,6,37,1.50975093990564
## P21,6,38,1.50979538073485
## P21,6,39,1.51061955094337
## P21,6,40,1.51047036382887
## P21,6,41,1.51045652230581
## P21,6,42,1.50763013488368
## P21,6,43,1.51358085065275
## P21,6,44,1.51345767216249
## P21,6,45,1.50915285257193
## P21,6,46,1.5138194728905
## P21,6,47,1.51111607218898
## P21,6,48,1.5107679931741
## P21,6,49,1.50994061887934
## P21,6,50,1.50967129985843
## P21,7,1,1.51059620622276
## P21,7,2,1.51544219675198
## P21,7,3,1.50820255279541
## P21,7,4,1.51655011706882
## P21,7,5,1.52442329194811
## P21,7,6,1.51134105226887
## P21,7,7,1.51784794352879
## P21,7,8,1.50894996344325
## P21,7,9,1.5100853546806
## P21,7,10,1.51027964800596
## P21,7,11,1.51502630204865
## P21,7,12,1.51099722087383
## P21,7,13,1.50837576500723
## P21,7,14,1.51304913312197
## P21,7,15,1.50643778982617
## P21,7,16,1.50592315487745
## P21,7,17,1.50850947130294
## P21,7,18,1.50931036013823
## P21,7,19,1.51289360753952
## P21,7,20,1.51205363273621
## P21,7,21,1.50981388092041
## P21,7,22,1.50919863093983
## P21,7,23,1.510367795825
## P21,7,24,1.50889439686485
## P21,7,25,1.50655906677246
## P21,7,26,1.51001152902279
## P21,7,27,1.5107472698863
## P21,7,28,1.51509543259939
## P21,7,29,1.51066430409749
## P21,7,30,1.51161109484159
## P21,7,31,1.51015918416188
## P21,7,32,1.51292912960052
## P21,7,33,1.5119186937809
## P21,7,34,1.51108599545663
## P21,7,35,1.5101361656189
## P21,7,36,1.51121123880148
## P21,7,37,1.5064143901918
## P21,7,38,1.5056725217585
## P21,7,39,1.51124257405599
## P21,7,40,1.50673066652738
## P21,7,41,1.51351584060283
## P21,7,42,1.5127796712129
## P21,7,43,1.50999517043432
## P21,7,44,1.51105829276661
## P21,7,45,1.51163570730536
## P21,7,46,1.51192873054081
## P21,7,47,1.51338004696277
## P21,7,48,1.51127356921925
## P21,7,49,1.51083223724365
## P21,7,50,1.51196587085724
## P21,8,1,1.50939750671387
## P21,8,2,1.51224784851074
## P21,8,3,1.51231335467241
## P21,8,4,1.51022513707479
## P21,8,5,1.50297037760417
## P21,8,6,1.5103699254318
## P21,8,7,1.51391401385317
## P21,8,8,1.51094862440942
## P21,8,9,1.51231144666672
## P21,8,10,1.50895786657929
## P21,8,11,1.51141321125315
## P21,8,12,1.50924323995908
## P21,8,13,1.51316718797426
## P21,8,14,1.50710916519165
## P21,8,15,1.50794582052545
## P21,8,16,1.50902403102202
## P21,8,17,1.49797832398188
## P21,8,18,1.51097953065913
## P21,8,19,1.50812782700529
## P21,8,20,1.51194533215293
## P21,8,21,1.51010307898888
## P21,8,22,1.51038402410654
## P21,8,23,1.51302012618707
## P21,8,24,1.50969247948633
## P21,8,25,1.51054794523451
## P21,8,26,1.5123651266098
## P21,8,27,1.50732374191284
## P21,8,28,1.50614891800226
## P21,8,29,1.50757045012254
## P21,8,30,1.51010035408868
## P21,8,31,1.51442452232436
## P21,8,32,1.51895606392308
## P21,8,33,1.50593665242195
## P21,8,34,1.50933364721445
## P21,8,35,1.50429089445817
## P21,8,36,1.51533266305923
## P21,8,37,1.50968109382378
## P21,8,38,1.50663935248532
## P21,8,39,1.50755590514133
## P21,8,40,1.51336515577216
## P21,8,41,1.50573000825685
## P21,8,42,1.50935906748618
## P21,8,43,1.50883961278339
## P21,8,44,1.51163313978462
## P21,8,45,1.51117283464914
## P21,8,46,1.51073198540266
## P21,8,47,1.50864413609872
## P21,8,48,1.51130506866857
## P21,8,49,1.50889734828144
## P21,8,50,1.50944906210749
## P21,9,1,1.50274197260539
## P21,9,2,1.51191646296804
## P21,9,3,1.51089422269301
## P21,9,4,1.51007518252811
## P21,9,5,1.51254491482751
## P21,9,6,1.50893609203509
## P21,9,7,1.51034705779132
## P21,9,8,1.50953652428799
## P21,9,9,1.51432321320719
## P21,9,10,1.50608027853617
## P21,9,11,1.51324406537143
## P21,9,12,1.50808747609456
## P21,9,13,1.50868814938689
## P21,9,14,1.51069789462619
## P21,9,15,1.5109750102548
## P21,9,16,1.51123109495783
## Warning: There are no valid values for INTERVALS=17 in LISTP21[[9]]
## P21,9,18,1.51232385024046
## P21,9,19,1.51020233971732
## P21,9,20,1.50700899406716
## P21,9,21,1.50995160371829
## P21,9,22,1.50871677601591
## P21,9,23,1.50871383226835
## P21,9,24,1.51140082484544
## P21,9,25,1.51033586179706
## P21,9,26,1.51204008177707
## P21,9,27,1.51133569964656
## P21,9,28,1.51109027862549
## P21,9,29,1.5086542115067
## P21,9,30,1.51177772283554
## P21,9,31,1.51115055517717
## P21,9,32,1.51106208478901
## P21,9,33,1.51084044671828
## P21,9,34,1.50655719595896
## P21,9,35,1.5112685892317
## P21,9,36,1.50638289287173
## P21,9,37,1.51188803733663
## P21,9,38,1.50792474856322
## P21,9,39,1.50985802036442
## P21,9,40,1.51419471700986
## P21,9,41,1.50787432105453
## P21,9,42,1.51059359119784
## P21,9,43,1.50941106251308
## P21,9,44,1.50981390476227
## P21,9,45,1.51286390849522
## P21,9,46,1.50791481563023
## P21,9,47,1.50828088654412
## P21,9,48,1.53586387634277
## P21,9,49,1.51223088800907
## P21,9,50,1.51114152854597
## P21,10,1,1.51099291080382
## P21,10,2,1.51310793961151
## P21,10,3,1.51128228249088
## P21,10,4,1.50944686995612
## P21,10,5,1.51816146903568
## P21,10,6,1.50408669140028
## P21,10,7,1.51188563543653
## P21,10,8,1.51085713582161
## P21,10,9,1.5087969029536
## P21,10,10,1.50870898110526
## P21,10,11,1.51078695445866
## P21,10,12,1.51031595036603
## P21,10,13,1.51470541954041
## P21,10,14,1.51033610767788
## P21,10,15,1.5119530990206
## P21,10,16,1.51419525467948
## P21,10,17,1.51290933709396
## P21,10,18,1.51134036716662
## P21,10,19,1.51131012780326
## P21,10,20,1.51411691578952
## P21,10,21,1.50941982476608
## P21,10,22,1.51038181586344
## P21,10,23,1.50930571189293
## P21,10,24,1.509970539146
## P21,10,25,1.51049980601749
## P21,10,26,1.50847436721066
## P21,10,27,1.515347556064
## P21,10,28,1.51044867255471
## P21,10,29,1.50611166726975
## P21,10,30,1.51031100496333
## P21,10,31,1.50886604832668
## P21,10,32,1.51142519595576
## P21,10,33,1.51047381948917
## P21,10,34,1.50753115614255
## P21,10,35,1.50675766364388
## P21,10,36,1.50632267839768
## P21,10,37,1.51252627372742
## P21,10,38,1.51041027168175
## P21,10,39,1.51165245740842
## P21,10,40,1.50892767906189
## P21,10,41,1.51053004794651
## P21,10,42,1.51002592789499
## P21,10,43,1.51274652481079
## P21,10,44,1.50931306143065
## P21,10,45,1.51083216402266
## P21,10,46,1.51224024351253
## P21,10,47,1.51004940913274
## P21,10,48,1.5201015655811
## P21,10,49,1.51077254210846
## P21,10,50,1.50939807071481
## P22,1,1,1.51179803307377
## P22,1,2,1.49305712801855
## P22,1,3,1.51610656537508
## P22,1,4,1.51353718007653
## P22,1,5,1.52577777887812
## P22,1,6,1.51567513942719
## P22,1,7,1.51551871790605
## P22,1,8,1.50222075626414
## P22,1,9,1.53076632817586
## P22,1,10,1.51810835068484
## P22,1,11,1.51400534506956
## P22,1,12,1.50889386365443
## P22,1,13,1.50601578159493
## P22,1,14,1.505865696578
## P22,1,15,1.50896348776641
## P22,1,16,1.51358586658131
## P22,1,17,1.51015242809007
## P22,1,18,1.50978210725282
## P22,1,19,1.50776661585455
## P22,1,20,1.50946077888395
## P22,1,21,1.50566977768942
## P22,1,22,1.52194044359269
## P22,1,23,1.50418104844935
## P22,1,24,1.5240371272249
## P22,1,25,1.50415057575001
## P22,1,26,1.50385968344552
## P22,1,27,1.51632207167064
## P22,1,28,1.50181101163228
## P22,1,29,1.50748347842004
## P22,1,30,1.52023908787204
## P22,1,31,1.49866988885142
## P22,1,32,1.51744304708883
## P22,1,33,1.53055246192289
## P22,1,34,1.51143374771037
## P22,1,35,1.51321468640811
## P22,1,36,1.5061672016194
## P22,1,37,1.51216060203194
## P22,1,38,1.52312225412439
## P22,1,39,1.50346030646223
## P22,1,40,1.4900751684023
## P22,1,41,1.53355977768289
## P22,1,42,1.50332715715681
## P22,1,43,1.5134720576776
## P22,1,44,1.51099513706408
## P22,1,45,1.5011664835612
## P22,1,46,1.51418750827052
## P22,1,47,1.49451740199122
## P22,1,48,1.52456568766244
## P22,1,49,1.50919333019772
## P22,1,50,1.51006613121376
## P22,2,1,1.50960716448332
## P22,2,2,1.51421298493039
## P22,2,3,1.50941372865083
## P22,2,4,1.50505200436241
## P22,2,5,1.50943969768253
## P22,2,6,1.50957222399504
## P22,2,7,1.51102238968958
## P22,2,8,1.51387521397998
## P22,2,9,1.50644824913973
## P22,2,10,1.50625923041141
## P22,2,11,1.52202342957565
## P22,2,12,1.51140651869219
## P22,2,13,1.51498525440693
## P22,2,14,1.50838590382102
## P22,2,15,1.5055079589019
## P22,2,16,1.51841570231729
## P22,2,17,1.51373812589753
## P22,2,18,1.50413072109222
## P22,2,19,1.51383641812441
## P22,2,20,1.51224461197853
## P22,2,21,1.50478745350796
## P22,2,22,1.5063376367828
## P22,2,23,1.51377733921845
## P22,2,24,1.51255540715324
## P22,2,25,1.51762263329474
## P22,2,26,1.51064164671179
## P22,2,27,1.50699703884821
## P22,2,28,1.51457950707638
## P22,2,29,1.50642856267782
## P22,2,30,1.51071467995644
## P22,2,31,1.51374888710859
## P22,2,32,1.50578558909429
## P22,2,33,1.50677716732025
## P22,2,34,1.50826457830576
## P22,2,35,1.50872389475505
## P22,2,36,1.50019368772153
## P22,2,37,1.5079530140628
## P22,2,38,1.51172025102965
## P22,2,39,1.49444663524628
## P22,2,40,1.5215469159578
## P22,2,41,1.50893797430881
## P22,2,42,1.49812209175294
## P22,2,43,1.52238799844469
## P22,2,44,1.52271874371697
## P22,2,45,1.49881810317805
## P22,2,46,1.52627721654958
## P22,2,47,1.50721160888672
## P22,2,48,1.51635786951805
## P22,2,49,1.51074506024845
## P22,2,50,1.51149015327467
## P22,3,1,1.51111894741393
## P22,3,2,1.50858824050173
## P22,3,3,1.51473592539303
## P22,3,4,1.51229217778081
## P22,3,5,1.50797925306403
## P22,3,6,1.513126083152
## P22,3,7,1.51063248435444
## P22,3,8,1.50938419765896
## P22,3,9,1.51992058753967
## P22,3,10,1.50653785682586
## P22,3,11,1.49835221722441
## P22,3,12,1.51178329159515
## P22,3,13,1.51294125792801
## P22,3,14,1.51225867764703
## P22,3,15,1.5101781928021
## P22,3,16,1.51349834116494
## P22,3,17,1.51554740979834
## P22,3,18,1.51037055362355
## P22,3,19,1.50667284712007
## P22,3,20,1.51623478802768
## P22,3,21,1.50780458909919
## P22,3,22,1.51546266404065
## P22,3,23,1.50761572519938
## P22,3,24,1.50710299208358
## P22,3,25,1.50242139842059
## P22,3,26,1.51488254139724
## P22,3,27,1.519557056427
## P22,3,28,1.51282597129995
## P22,3,29,1.51094646730285
## P22,3,30,1.51257106463114
## P22,3,31,1.5171739757061
## P22,3,32,1.51246343691324
## P22,3,33,1.50966742363843
## P22,3,34,1.50777098110744
## P22,3,35,1.50825160897296
## P22,3,36,1.51111190186607
## P22,3,37,1.50968800981839
## P22,3,38,1.5167480372311
## P22,3,39,1.50813812255859
## P22,3,40,1.50825452804565
## P22,3,41,1.51720065213321
## P22,3,42,1.51169038724296
## P22,3,43,1.5015558719635
## P22,3,44,1.50509355618404
## P22,3,45,1.5115964114666
## P22,3,46,1.50926317142535
## P22,3,47,1.50608513905452
## P22,3,48,1.5139868137164
## P22,3,49,1.5050470999309
## P22,3,50,1.5111471922896
## P22,4,1,1.50946474870046
## P22,4,2,1.50725949827091
## P22,4,3,1.51204289754232
## P22,4,4,1.50825586739708
## P22,4,5,1.51326590906965
## P22,4,6,1.50911044362766
## P22,4,7,1.5099579997179
## P22,4,8,1.51293674823457
## P22,4,9,1.50510186270664
## P22,4,10,1.50831766773884
## P22,4,11,1.51006805612927
## P22,4,12,1.51165608355874
## P22,4,13,1.50822405497233
## P22,4,14,1.50952546979174
## P22,4,15,1.5097328670864
## P22,4,16,1.51316819159813
## P22,4,17,1.5126953237197
## P22,4,18,1.51192876696587
## P22,4,19,1.51106300280076
## P22,4,20,1.51517689946186
## P22,4,21,1.50951293419147
## P22,4,22,1.51039326324891
## P22,4,23,1.50624149529509
## P22,4,24,1.51070589678628
## P22,4,25,1.51090391383452
## P22,4,26,1.50974383265335
## P22,4,27,1.5084823933904
## P22,4,28,1.51254308223724
## P22,4,29,1.50741745711892
## P22,4,30,1.51188984385297
## P22,4,31,1.51137891309015
## P22,4,32,1.50448659564672
## P22,4,33,1.50647945348927
## P22,4,34,1.51051821198853
## P22,4,35,1.51074257272805
## P22,4,36,1.50585452248068
## P22,4,37,1.50909673271841
## P22,4,38,1.50412503348456
## P22,4,39,1.50963909221145
## P22,4,40,1.51165807591697
## P22,4,41,1.50740997984603
## P22,4,42,1.50585303987776
## P22,4,43,1.50955697394706
## P22,4,44,1.50164816031853
## P22,4,45,1.52051831489831
## P22,4,46,1.50987468125685
## P22,4,47,1.51423320817012
## P22,4,48,1.5071529170445
## P22,4,49,1.51172782618825
## P22,4,50,1.50962336231564
## P22,5,1,1.50789699554443
## P22,5,2,1.51028888972838
## P22,5,3,1.51216030816962
## P22,5,4,1.50972019979196
## P22,5,5,1.50782379107689
## P22,5,6,1.51379338177768
## P22,5,7,1.50665518972609
## P22,5,8,1.51098092864541
## P22,5,9,1.50554934838661
## P22,5,10,1.51072387901141
## P22,5,11,1.51124298856372
## P22,5,12,1.51201485255577
## P22,5,13,1.51058687712695
## P22,5,14,1.51501192163538
## P22,5,15,1.50805337088449
## P22,5,16,1.51348533566366
## P22,5,17,1.50832090844641
## P22,5,18,1.5150269985199
## P22,5,19,1.50257552042603
## P22,5,20,1.51435867639688
## P22,5,21,1.50927039933583
## P22,5,22,1.50651454547095
## P22,5,23,1.51569326652968
## P22,5,24,1.50837968258148
## P22,5,25,1.51714842054579
## P22,5,26,1.50620532636883
## P22,5,27,1.51538905779521
## P22,5,28,1.50879209409884
## P22,5,29,1.50937587312124
## P22,5,30,1.51164382372716
## P22,5,31,1.51162862305594
## P22,5,32,1.51020691162202
## P22,5,33,1.50930976031119
## P22,5,34,1.50498455146263
## P22,5,35,1.51227891050427
## P22,5,36,1.50991291440399
## P22,5,37,1.50448867363658
## P22,5,38,1.50659654642406
## P22,5,39,1.51027562046609
## P22,5,40,1.51761638834363
## P22,5,41,1.50687700094179
## P22,5,42,1.51696933913477
## P22,5,43,1.51183536991929
## P22,5,44,1.50948549353558
## P22,5,45,1.50878851522099
## P22,5,46,1.50847558445401
## P22,5,47,1.51065124554581
## P22,5,48,1.51253965800394
## P22,5,49,1.514131304797
## P22,5,50,1.5079814492716
## P22,6,1,1.50999764113398
## P22,6,2,1.51203575730324
## P22,6,3,1.51034908294678
## P22,6,4,1.51290470759074
## P22,6,5,1.51103187729331
## P22,6,6,1.50970121196934
## P22,6,7,1.51166102072088
## P22,6,8,1.50705525241321
## P22,6,9,1.51083876810917
## P22,6,10,1.51110734420569
## P22,6,11,1.51277509588279
## P22,6,12,1.51194808656806
## P22,6,13,1.50914086655873
## P22,6,14,1.51119364949757
## P22,6,15,1.50862013421408
## P22,6,16,1.51010600865236
## P22,6,17,1.51293054379915
## P22,6,18,1.51182807816399
## P22,6,19,1.51166825587523
## P22,6,20,1.50992688900087
## P22,6,21,1.52586689773871
## P22,6,22,1.504558172802
## P22,6,23,1.51050039748071
## P22,6,24,1.51164902581109
## P22,6,25,1.50746065592594
## P22,6,26,1.5112800805465
## P22,6,27,1.51048526366552
## P22,6,28,1.51337525495298
## P22,6,29,1.50696837648432
## P22,6,30,1.51352757673997
## P22,6,31,1.50479441567471
## P22,6,32,1.51283892445594
## P22,6,33,1.51431553959846
## P22,6,34,1.50891587081229
## P22,6,35,1.50996525793365
## P22,6,36,1.50737123428636
## P22,6,37,1.51241644368027
## P22,6,38,1.50915012719496
## P22,6,39,1.52038006846969
## P22,6,40,1.50198904128924
## P22,6,41,1.49849315601237
## P22,6,42,1.52976189103237
## P22,6,43,1.49792707552675
## P22,6,44,1.50570684447324
## P22,6,45,1.52699778704035
## P22,6,46,1.49905124329429
## P22,6,47,1.50945911932429
## P22,6,48,1.50821402055997
## P22,6,49,1.50675566828981
## P22,6,50,1.51600715168362
## P22,7,1,1.51102012698933
## P22,7,2,1.5082592010498
## P22,7,3,1.51467347523523
## P22,7,4,1.51091934636582
## P22,7,5,1.51618972866015
## P22,7,6,1.50719811389973
## P22,7,7,1.5148627281189
## P22,7,8,1.52139300246571
## P22,7,9,1.50320093617963
## P22,7,10,1.50661466288012
## P22,7,11,1.510851103684
## P22,7,12,1.50816527119389
## P22,7,13,1.50932397069158
## P22,7,14,1.51068090874216
## P22,7,15,1.5136708097255
## P22,7,16,1.50424604132624
## P22,7,17,1.52000444429415
## P22,7,18,1.5148110631146
## P22,7,19,1.5172980898305
## P22,7,20,1.51095592165456
## P22,7,21,1.51392063208386
## P22,7,22,1.50991899656213
## P22,7,23,1.51148546521909
## P22,7,24,1.50351218893976
## P22,7,25,1.51237929494757
## P22,7,26,1.50855677703331
## P22,7,27,1.5085936796318
## P22,7,28,1.51183566507303
## P22,7,29,1.50580626675206
## P22,7,30,1.51523774436542
## P22,7,31,1.50447542867928
## P22,7,32,1.51290696817678
## P22,7,33,1.50749530865036
## P22,7,34,1.51109503136307
## P22,7,35,1.5152263193049
## P22,7,36,1.50764696844693
## P22,7,37,1.50870612106825
## P22,7,38,1.50512520993342
## P22,7,39,1.50735792806072
## P22,7,40,1.51282484165943
## P22,7,41,1.50705054541615
## P22,7,42,1.51129421373693
## P22,7,43,1.50415102335123
## P22,7,44,1.51592903059037
## P22,7,45,1.50133894498532
## P22,7,46,1.51546182337495
## P22,7,47,1.50956163021049
## P22,7,48,1.50942798822868
## P22,7,49,1.50532655383265
## P22,7,50,1.50612696954759
## P22,8,1,1.50516948699951
## P22,8,2,1.50547188362189
## P22,8,3,1.50885601494256
## P22,8,4,1.51085651154612
## P22,8,5,1.50818721680414
## P22,8,6,1.51413573405539
## P22,8,7,1.51161240568065
## P22,8,8,1.51007770437055
## P22,8,9,1.51333494539614
## P22,8,10,1.50759246511367
## P22,8,11,1.51071480404247
## P22,8,12,1.50661024709386
## P22,8,13,1.50754054757052
## P22,8,14,1.50878163427114
## P22,8,15,1.50970060378313
## P22,8,16,1.51270697333596
## P22,8,17,1.51092944878798
## P22,8,18,1.50737678607305
## P22,8,19,1.50791166446827
## P22,8,20,1.51248350789991
## P22,8,21,1.51129894470101
## P22,8,22,1.50909130843644
## P22,8,23,1.50921593606472
## P22,8,24,1.50383467713663
## P22,8,25,1.51272428497788
## P22,8,26,1.50924272679571
## P22,8,27,1.51310036914183
## P22,8,28,1.50624692440033
## P22,8,29,1.50472629511798
## P22,8,30,1.51076539631548
## P22,8,31,1.51272355566779
## P22,8,32,1.50788269674077
## P22,8,33,1.51031589141259
## P22,8,34,1.51462396772781
## P22,8,35,1.50792259189254
## P22,8,36,1.51025280311926
## P22,8,37,1.50935798467592
## P22,8,38,1.51332247129051
## P22,8,39,1.509870570153
## P22,8,40,1.51112874603271
## P22,8,41,1.50948939058516
## P22,8,42,1.5103737701804
## P22,8,43,1.50918997857804
## P22,8,44,1.51062527446882
## P22,8,45,1.50967962064861
## P22,8,46,1.50941746953934
## P22,8,47,1.50749988842728
## P22,8,48,1.51109700026336
## P22,8,49,1.51153005965768
## P22,8,50,1.51194812242801
## P22,9,1,1.51032656756314
## P22,9,2,1.51047495491484
## P22,9,3,1.50530487749757
## P22,9,4,1.51162507182868
## P22,9,5,1.50763923365895
## P22,9,6,1.51224430799484
## P22,9,7,1.51071296221968
## P22,9,8,1.50991371036631
## P22,9,9,1.51089798702913
## P22,9,10,1.50873564239731
## P22,9,11,1.51166810358272
## P22,9,12,1.50942545277732
## P22,9,13,1.51121288861415
## P22,9,14,1.50787780081579
## P22,9,15,1.50897441877352
## P22,9,16,1.50801075072516
## P22,9,17,1.50546961672166
## P22,9,18,1.51516542055749
## P22,9,19,1.50620898017048
## P22,9,20,1.50931515985606
## P22,9,21,1.51075624142374
## P22,9,22,1.51200491335334
## P22,9,23,1.50862129738456
## P22,9,24,1.50797238804045
## P22,9,25,1.51090689305659
## P22,9,26,1.51214480582084
## P22,9,27,1.50976321080348
## P22,9,28,1.50973968443118
## P22,9,29,1.50732367885999
## P22,9,30,1.51074825392829
## P22,9,31,1.51111164492761
## P22,9,32,1.50956914092921
## P22,9,33,1.50945683771914
## P22,9,34,1.51076328947737
## P22,9,35,1.51101588433789
## P22,9,36,1.50771292533664
## P22,9,37,1.51301534050389
## P22,9,38,1.50785868923839
## P22,9,39,1.51070589110965
## P22,9,40,1.51182805619589
## P22,9,41,1.51084513092041
## P22,9,42,1.51251230501149
## P22,9,43,1.51279717597409
## P22,9,44,1.50575292110443
## P22,9,45,1.51098991594007
## P22,9,46,1.51266378787026
## P22,9,47,1.51021102784385
## P22,9,48,1.51028342594374
## P22,9,49,1.50897065162659
## P22,9,50,1.50921165116943
## P22,10,1,1.50779522135017
## P22,10,2,1.51083156937047
## P22,10,3,1.50647111942894
## P22,10,4,1.50971666697798
## P22,10,5,1.50776829570532
## P22,10,6,1.51263374090195
## P22,10,7,1.50954091253359
## P22,10,8,1.51156881540128
## P22,10,9,1.50958372297741
## P22,10,10,1.51266289102858
## P22,10,11,1.51081084175933
## P22,10,12,1.50647373994191
## P22,10,13,1.51104386329651
## P22,10,14,1.50767687871947
## P22,10,15,1.5127978236587
## P22,10,16,1.50878503838101
## P22,10,17,1.51068609570145
## P22,10,18,1.51456956068675
## P22,10,19,1.5093096551441
## P22,10,20,1.51442333518482
## P22,10,21,1.51025151617733
## P22,10,22,1.5012908433613
## P22,10,23,1.50803043495896
## P22,10,24,1.50802270429475
## P22,10,25,1.50856811911971
## P22,10,26,1.50696120456773
## P22,10,27,1.50900824235217
## P22,10,28,1.51047383470738
## P22,10,29,1.51498049989753
## P22,10,30,1.50845737946339
## P22,10,31,1.50606476906503
## P22,10,32,1.51054427334081
## P22,10,33,1.50773433946137
## P22,10,34,1.50717938899994
## P22,10,35,1.51041165218558
## P22,10,36,1.51008040354802
## P22,10,37,1.51023423153421
## P22,10,38,1.50848279206649
## P22,10,39,1.50902890343951
## P22,10,40,1.51421818960281
## P22,10,41,1.50943478816698
## P22,10,42,1.51157173834556
## P22,10,43,1.51241553492016
## P22,10,44,1.50914134564607
## P22,10,45,1.51609411005114
## P22,10,46,1.50635075569153
## P22,10,47,1.50898773791426
## P22,10,48,1.51262708960987
## P22,10,49,1.50694932256426
## P22,10,50,1.50920484747205
## P23,1,1,1.51535685857137
## P23,1,2,1.51036874303278
## P23,1,3,1.50324515373476
## P23,1,4,1.49787253200418
## P23,1,5,1.52541951610617
## P23,1,6,1.47837949400189
## P23,1,7,1.51659589738988
## P23,1,8,1.50061593055725
## P23,1,9,1.51359944147606
## P23,1,10,1.48513348739926
## P23,1,11,1.50245181445418
## P23,1,12,1.48765815706814
## P23,1,13,1.50505961428632
## P23,1,14,1.50288348556847
## P23,1,15,1.64939518408342
## P23,1,16,1.52706561917844
## P23,1,17,1.53022780888517
## P23,1,18,1.50440926022
## P23,1,19,1.51908429257281
## P23,1,20,1.50059765035456
## P23,1,21,1.58624647344862
## P23,1,22,1.55031685395674
## P23,1,23,1.52115516479199
## P23,1,24,1.53617399178662
## P23,1,25,1.42639550685883
## P23,1,26,1.35013819248118
## P23,1,27,1.64668467839559
## P23,1,28,1.53689427375793
## P23,1,29,1.47560161939809
## P23,1,30,1.51264505742866
## P23,1,31,1.55768839655251
## P23,1,32,1.49543131722344
## P23,1,33,1.489047247788
## P23,1,34,1.48584988382128
## P23,1,35,1.55880199629685
## P23,1,36,1.57318114543307
## P23,1,37,1.53691424108019
## P23,1,38,1.51314130783081
## P23,1,39,1.51154570267579
## P23,1,40,1.47404466916437
## P23,1,41,1.48498999651741
## P23,1,42,1.53208716710409
## P23,1,43,1.49651017555824
## P23,1,44,1.50897502407585
## P23,1,45,1.50090191099379
## P23,1,46,1.48679739299573
## P23,1,47,1.56223724312978
## P23,1,48,1.44694615179493
## P23,1,49,1.54167173676572
## P23,1,50,1.50602123872289
## P23,2,1,1.51244702765612
## P23,2,2,1.50371388026646
## P23,2,3,1.51794026448176
## P23,2,4,1.50749264141121
## P23,2,5,1.49614675935492
## P23,2,6,1.53037028737588
## P23,2,7,1.50476376021781
## P23,2,8,1.50481173756358
## P23,2,9,1.51340718269348
## P23,2,10,1.51751736418842
## P23,2,11,1.51526167279198
## P23,2,12,1.51023936539554
## P23,2,13,1.51073217904696
## P23,2,14,1.51122606470344
## P23,2,15,1.51276800367567
## P23,2,16,1.50500169101062
## P23,2,17,1.51067815260454
## P23,2,18,1.50622361377605
## P23,2,19,1.51058376630147
## P23,2,20,1.48258002960321
## P23,2,21,1.51603699963668
## P23,2,22,1.49542005469159
## P23,2,23,1.50776813544479
## P23,2,24,1.51119023561478
## P23,2,25,1.50263107739962
## P23,2,26,1.49786024800053
## P23,2,27,1.48455767685108
## P23,2,28,1.52634804640243
## P23,2,29,1.4801204366199
## P23,2,30,1.51242501477161
## P23,2,31,1.53720646291166
## P23,2,32,1.49053037845022
## P23,2,33,1.50868598689204
## P23,2,34,1.51045609211576
## P23,2,35,1.50953733387278
## P23,2,36,1.50855775546002
## P23,2,37,1.50329277375165
## P23,2,38,1.51611910177314
## P23,2,39,1.50503436294762
## P23,2,40,1.50471136616726
## P23,2,41,1.51492076535379
## P23,2,42,1.51076417702895
## P23,2,43,1.51882917669755
## P23,2,44,1.51005770030775
## P23,2,45,1.50996428807576
## P23,2,46,1.51310152392234
## P23,2,47,1.51396199819204
## P23,2,48,1.50697573748502
## P23,2,49,1.50974211834445
## P23,2,50,1.51146452601363
## P23,3,1,1.51284940315015
## P23,3,2,1.50820256851532
## P23,3,3,1.51181196212769
## P23,3,4,1.5088315428349
## P23,3,5,1.51028966528224
## P23,3,6,1.51203257120573
## P23,3,7,1.51350585696767
## P23,3,8,1.51168832973558
## P23,3,9,1.49887429031671
## P23,3,10,1.51706484744423
## P23,3,11,1.51354414463043
## P23,3,12,1.50377849946942
## P23,3,13,1.51290501380453
## P23,3,14,1.51034025828044
## P23,3,15,1.51172321136684
## P23,3,16,1.51453130496176
## P23,3,17,1.50100593352586
## P23,3,18,1.51330156702744
## P23,3,19,1.48849978191512
## P23,3,20,1.52116950687609
## P23,3,21,1.51646063327789
## P23,3,22,1.50188861722532
## P23,3,23,1.51752790911444
## P23,3,24,1.50609769047918
## P23,3,25,1.51293287654914
## P23,3,26,1.51164753683682
## P23,3,27,1.51596541124232
## P23,3,28,1.50636107581002
## P23,3,29,1.50970727555892
## P23,3,30,1.50006538232168
## P23,3,31,1.49306084829218
## P23,3,32,1.51288335088273
## P23,3,33,1.51991652187548
## P23,3,34,1.50107616739175
## P23,3,35,1.50967340691145
## P23,3,36,1.51275264195033
## P23,3,37,1.52248805316526
## P23,3,38,1.50840917000404
## P23,3,39,1.52629184220967
## P23,3,40,1.50272219680076
## P23,3,41,1.52602947325934
## P23,3,42,1.50357574735369
## P23,3,43,1.51035101572673
## P23,3,44,1.50092444259129
## P23,3,45,1.52310735529119
## P23,3,46,1.51349361584737
## P23,3,47,1.51724862215812
## P23,3,48,1.49783256394523
## P23,3,49,1.5033685915938
## P23,3,50,1.49861840820313
## P23,4,1,1.51578775688454
## P23,4,2,1.51191199819247
## P23,4,3,1.50960130823983
## P23,4,4,1.50934305438748
## P23,4,5,1.5118721903187
## P23,4,6,1.50633946723408
## P23,4,7,1.51262040714641
## P23,4,8,1.50466362635295
## P23,4,9,1.51195352976439
## P23,4,10,1.51088809613828
## P23,4,11,1.50301570734702
## P23,4,12,1.51407918369069
## P23,4,13,1.51216326226721
## P23,4,14,1.50790310327986
## P23,4,15,1.51630954742432
## P23,4,16,1.51666559371273
## P23,4,17,1.50817159505991
## P23,4,18,1.51126760330753
## P23,4,19,1.5089196062088
## P23,4,20,1.51136510407747
## P23,4,21,1.50339843167199
## P23,4,22,1.50864436934071
## P23,4,23,1.50873397766276
## P23,4,24,1.50995399986488
## P23,4,25,1.50948911119801
## P23,4,26,1.50610164862413
## P23,4,27,1.52725303830124
## P23,4,28,1.47933297279554
## P23,4,29,1.49974835073793
## P23,4,30,1.51667293342384
## P23,4,31,1.51082380053023
## P23,4,32,1.51068833397656
## P23,4,33,1.50748541590932
## P23,4,34,1.51017194765585
## P23,4,35,1.50904953174102
## P23,4,36,1.5138047462286
## P23,4,37,1.5402826721018
## P23,4,38,1.50365760015405
## P23,4,39,1.51308286053011
## P23,4,40,1.49925175865928
## P23,4,41,1.51531927725848
## P23,4,42,1.51748862089934
## P23,4,43,1.50564956665039
## P23,4,44,1.50821290872036
## P23,4,45,1.50845322079129
## P23,4,46,1.51004547416093
## P23,4,47,1.51134933941606
## P23,4,48,1.50510197938091
## P23,4,49,1.51400810129502
## P23,4,50,1.50571981984742
## P23,5,1,1.51109560619701
## P23,5,2,1.5116008245028
## P23,5,3,1.51158466438452
## P23,5,4,1.51038342919843
## P23,5,5,1.50915606524966
## P23,5,6,1.50995455847846
## P23,5,7,1.51233743241996
## P23,5,8,1.51199700755458
## P23,5,9,1.51074248653347
## P23,5,10,1.50691097123282
## P23,5,11,1.51679634629634
## P23,5,12,1.49146677689119
## P23,5,13,1.51009738445282
## P23,5,14,1.51101343896654
## P23,5,15,1.51011333634368
## P23,5,16,1.51045702214827
## P23,5,17,1.51105480084474
## P23,5,18,1.50968668586329
## P23,5,19,1.51114453961772
## P23,5,20,1.51279400753719
## P23,5,21,1.49844673763622
## P23,5,22,1.52264324996782
## P23,5,23,1.50316476821899
## P23,5,24,1.50256836014306
## P23,5,25,1.5146832885323
## P23,5,26,1.51486135547997
## P23,5,27,1.50874928406307
## P23,5,28,1.51440750014397
## P23,5,29,1.50576278848468
## P23,5,30,1.50838157865736
## P23,5,31,1.50245011329651
## P23,5,32,1.51039295643568
## P23,5,33,1.51201689988375
## P23,5,34,1.51209393024445
## P23,5,35,1.51100960988847
## P23,5,36,1.51199870594477
## P23,5,37,1.51168197589916
## P23,5,38,1.5108922298138
## P23,5,39,1.5076496741351
## P23,5,40,1.50655590023911
## P23,5,41,1.50470270649079
## P23,5,42,1.50666354864072
## P23,5,43,1.50929438065146
## P23,5,44,1.51419739569387
## P23,5,45,1.51144914815922
## P23,5,46,1.51126408576965
## P23,5,47,1.50920964842257
## P23,5,48,1.50439529081361
## P23,5,49,1.4959270569586
## P23,5,50,1.51061530603897
## P23,6,1,1.51353058275187
## P23,6,2,1.5139456278569
## P23,6,3,1.51420095190406
## P23,6,4,1.5083848010926
## P23,6,5,1.51807196935018
## P23,6,6,1.5071667262486
## P23,6,7,1.51458165416979
## P23,6,8,1.51540263828478
## P23,6,9,1.51244034767151
## P23,6,10,1.51494712148394
## P23,6,11,1.5071678535611
## P23,6,12,1.50973140160868
## P23,6,13,1.51256350421031
## P23,6,14,1.51291259352144
## P23,6,15,1.51121093871746
## P23,6,16,1.51601450531571
## P23,6,17,1.50756956606495
## P23,6,18,1.51304998000463
## P23,6,19,1.51274218009068
## P23,6,20,1.51068879663944
## P23,6,21,1.51340779603696
## P23,6,22,1.51295699013604
## P23,6,23,1.5080431252718
## P23,6,24,1.50892557241978
## P23,6,25,1.51014725367228
## P23,6,26,1.50897981419283
## P23,6,27,1.51017198562622
## P23,6,28,1.50818338280632
## P23,6,29,1.51822170844445
## P23,6,30,1.51676275730133
## P23,6,31,1.51463271087071
## P23,6,32,1.50575131051084
## P23,6,33,1.51060668563843
## P23,6,34,1.51035925791814
## P23,6,35,1.509098596662
## P23,6,36,1.50976225046011
## P23,6,37,1.49114004456171
## P23,6,38,1.51790671402149
## P23,6,39,1.51217889273038
## P23,6,40,1.5144724768977
## P23,6,41,1.51162284275271
## P23,6,42,1.50706560366622
## P23,6,43,1.50390571135062
## P23,6,44,1.52034263121776
## P23,6,45,1.51050607251449
## P23,6,46,1.51080265045166
## P23,6,47,1.50940799349137
## P23,6,48,1.51412570918048
## P23,6,49,1.50714249861868
## P23,6,50,1.5102621234547
## P23,7,1,1.50964525134064
## P23,7,2,1.50953797771506
## P23,7,3,1.51016094134404
## P23,7,4,1.5106463988622
## P23,7,5,1.51211049090857
## P23,7,6,1.50789822472466
## P23,7,7,1.51548759030624
## P23,7,8,1.50913545206973
## P23,7,9,1.51238476828243
## P23,7,10,1.5091089506944
## P23,7,11,1.51619586515962
## P23,7,12,1.50823317298406
## P23,7,13,1.51098575592041
## P23,7,14,1.5137173692945
## P23,7,15,1.51171818646518
## P23,7,16,1.50831064945314
## P23,7,17,1.51236516899533
## P23,7,18,1.51244705479319
## P23,7,19,1.50433711295432
## P23,7,20,1.51233829498291
## P23,7,21,1.500738814192
## P23,7,22,1.50747955151093
## P23,7,23,1.50849797460768
## P23,7,24,1.5192008129386
## P23,7,25,1.49607338748135
## P23,7,26,1.51376786598792
## P23,7,27,1.51174084673223
## P23,7,28,1.50884197628687
## P23,7,29,1.50785064149177
## P23,7,30,1.50835976949552
## P23,7,31,1.50605415830425
## P23,7,32,1.51196231959779
## P23,7,33,1.50899600260185
## P23,7,34,1.50991833651507
## P23,7,35,1.51337377969609
## P23,7,36,1.52058434486389
## P23,7,37,1.50707029651951
## P23,7,38,1.50609544607309
## P23,7,39,1.51102983951569
## P23,7,40,1.5106711998964
## P23,7,41,1.50998480392225
## P23,7,42,1.50544029474258
## P23,7,43,1.50743528207143
## P23,7,44,1.51096107130465
## P23,7,45,1.51022656370954
## P23,7,46,1.51018913478067
## P23,7,47,1.50702314770099
## P23,7,48,1.51340277164013
## P23,7,49,1.51664767095021
## P23,7,50,1.50844487570282
## P23,8,1,1.50825373331706
## P23,8,2,1.51208989620209
## P23,8,3,1.5103797628766
## P23,8,4,1.51527448495229
## P23,8,5,1.50693530837695
## P23,8,6,1.51428008079529
## P23,8,7,1.50992547548734
## P23,8,8,1.51102239834635
## P23,8,9,1.51000260018014
## P23,8,10,1.50547370603008
## P23,8,11,1.51167586644491
## P23,8,12,1.5090389297122
## P23,8,13,1.50300916525034
## P23,8,14,1.50680610020955
## P23,8,15,1.51313724120458
## P23,8,16,1.5091346058191
## P23,8,17,1.50711156924566
## P23,8,18,1.51674426331812
## P23,8,19,1.50533169088229
## P23,8,20,1.50473397405524
## P23,8,21,1.51885061657306
## P23,8,22,1.5036819208236
## P23,8,23,1.51233666352551
## P23,8,24,1.51025867462158
## P23,8,25,1.51796799705875
## P23,8,26,1.50316954220043
## P23,8,27,1.51157082132546
## P23,8,28,1.51135122532747
## P23,8,29,1.51178416167155
## P23,8,30,1.51000955445426
## P23,8,31,1.50990342034234
## P23,8,32,1.50921842326289
## P23,8,33,1.5067174233586
## P23,8,34,1.51043543134417
## P23,8,35,1.50418435335159
## P23,8,36,1.50900820323399
## P23,8,37,1.51204580874056
## P23,8,38,1.51354348257686
## P23,8,39,1.51211232297561
## P23,8,40,1.50698923777385
## P23,8,41,1.51225869408969
## P23,8,42,1.50458310967061
## P23,8,43,1.51129263262205
## P23,8,44,1.50967733738786
## P23,8,45,1.50929776579142
## P23,8,46,1.50846858744351
## P23,8,47,1.51293932980505
## P23,8,48,1.51019716262817
## P23,8,49,1.50918726273525
## P23,8,50,1.51068521782204
## P23,9,1,1.51136901212293
## P23,9,2,1.51213533595457
## P23,9,3,1.51050141016642
## P23,9,4,1.51097971972297
## P23,9,5,1.50967321698628
## P23,9,6,1.51086617975819
## P23,9,7,1.50860540794604
## P23,9,8,1.50778705697311
## P23,9,9,1.51428458269905
## P23,9,10,1.51152852865366
## P23,9,11,1.51150467698003
## P23,9,12,1.51163342293729
## P23,9,13,1.51188714981079
## P23,9,14,1.51133445283057
## P23,9,15,1.51596829626295
## P23,9,16,1.51386865240629
## P23,9,17,1.52391787034919
## P23,9,18,1.51030689922731
## P23,9,19,1.50880684302403
## P23,9,20,1.50935847862907
## P23,9,21,1.50934610059184
## P23,9,22,1.51125882501188
## P23,9,23,1.51261758804321
## P23,9,24,1.50780834035671
## P23,9,25,1.50893982401434
## P23,9,26,1.51189116397536
## P23,9,27,1.50925488374671
## P23,9,28,1.51042360228461
## P23,9,29,1.50960556392012
## P23,9,30,1.51198085423174
## P23,9,31,1.50379447255816
## P23,9,32,1.51108505460951
## P23,9,33,1.50972794214884
## P23,9,34,1.51306339899699
## P23,9,35,1.50968796014786
## P23,9,36,1.50842691976813
## P23,9,37,1.50675235324436
## P23,9,38,1.50461951055025
## P23,9,39,1.51068587022669
## P23,9,40,1.50502024491628
## P23,9,41,1.50861761786721
## P23,9,42,1.51223087899479
## P23,9,43,1.51051884392897
## P23,9,44,1.51213142606947
## P23,9,45,1.50938007648175
## P23,9,46,1.51089423353022
## P23,9,47,1.5137079026964
## P23,9,48,1.5152415539089
## P23,9,49,1.50430491163924
## P23,9,50,1.52122436013333
## P23,10,1,1.5102849153372
## P23,10,2,1.5123493531171
## P23,10,3,1.50679266452789
## P23,10,4,1.51790985246984
## P23,10,5,1.52074792044503
## P23,10,6,1.50964722140082
## P23,10,7,1.50717915715398
## P23,10,8,1.51223088446118
## P23,10,9,1.50248434485459
## P23,10,10,1.51570145289103
## P23,10,11,1.51298354801379
## P23,10,12,1.50812358482211
## P23,10,13,1.51343938708305
## P23,10,14,1.50755322869144
## P23,10,15,1.51187753677368
## P23,10,16,1.51547770023346
## P23,10,17,1.51498068933902
## P23,10,18,1.5077404905768
## P23,10,19,1.51130283935161
## P23,10,20,1.51083571736406
## P23,10,21,1.51155451786371
## P23,10,22,1.51341421157122
## P23,10,23,1.50897370747157
## P23,10,24,1.50904374964097
## P23,10,25,1.50697576999664
## P23,10,26,1.50801884500604
## P23,10,27,1.50961976453482
## P23,10,28,1.51143355222092
## P23,10,29,1.50808856172382
## P23,10,30,1.51207383204315
## P23,10,31,1.51238582073114
## P23,10,32,1.50674993341619
## P23,10,33,1.5121491473654
## P23,10,34,1.51403821481241
## P23,10,35,1.50567372639974
## P23,10,36,1.50437568128109
## P23,10,37,1.51159412630143
## P23,10,38,1.51131331920624
## P23,10,39,1.50906900189958
## P23,10,40,1.51060344696045
## P23,10,41,1.51158318800085
## P23,10,42,1.51185724009638
## P23,10,43,1.51114535582693
## P23,10,44,1.50674949373518
## P23,10,45,1.51566453207107
## P23,10,46,1.51435747257499
## P23,10,47,1.51532957370465
## P23,10,48,1.50856511592865
## P23,10,49,1.50945581860012
## P23,10,50,1.50961967876979
## P24,1,1,1.50889865112305
## P24,1,2,1.50836210439701
## P24,1,3,1.51127377130035
## P24,1,4,1.50785066341532
## P24,1,5,1.51036345248191
## P24,1,6,1.51154642189499
## P24,1,7,1.51187732751421
## P24,1,8,1.51115185873849
## P24,1,9,1.51124124451885
## P24,1,10,1.51116168387582
## P24,1,11,1.51104452059819
## P24,1,12,1.50963612453479
## P24,1,13,1.51033709241056
## P24,1,14,1.51222223876625
## P24,1,15,1.51085547452474
## P24,1,16,1.5088280408006
## P24,1,17,1.51264297003034
## P24,1,18,1.51141787875782
## P24,1,19,1.51080782517143
## P24,1,20,1.50963315596947
## P24,1,21,1.51226591027301
## P24,1,22,1.51099702861759
## P24,1,23,1.51111612979721
## P24,1,24,1.51032334916732
## P24,1,25,1.50990978498307
## P24,1,26,1.5101150530521
## P24,1,27,1.51081234106988
## P24,1,28,1.51123784678851
## P24,1,29,1.51130555407836
## P24,1,30,1.51156496515079
## P24,1,31,1.51114806747437
## P24,1,32,1.51074018592606
## P24,1,33,1.51167697565896
## P24,1,34,1.5107414301704
## P24,1,35,1.51136478583018
## P24,1,36,1.51260492631367
## P24,1,37,1.50917124180567
## P24,1,38,1.51037165751824
## P24,1,39,1.51174750328064
## P24,1,40,1.51173376191592
## P24,1,41,1.50985493933319
## P24,1,42,1.51107516453184
## P24,1,43,1.50988971205319
## P24,1,44,1.51126307061633
## P24,1,45,1.50936325929933
## P24,1,46,1.51016776361198
## P24,1,47,1.5080937007526
## P24,1,48,1.50896254329817
## P24,1,49,1.51104924519857
## P24,1,50,1.51077243046697
## P24,2,1,1.51232168708049
## P24,2,2,1.51082566449809
## P24,2,3,1.51112431215953
## P24,2,4,1.51028901695186
## P24,2,5,1.5093238427467
## P24,2,6,1.51191973850645
## P24,2,7,1.50954754884578
## P24,2,8,1.51107491272083
## P24,2,9,1.50940639671238
## P24,2,10,1.51067710263388
## P24,2,11,1.51012644685548
## P24,2,12,1.50970339366368
## P24,2,13,1.50943534345512
## P24,2,14,1.51198012623566
## P24,2,15,1.51131387260871
## P24,2,16,1.51097937000608
## P24,2,17,1.50999774548831
## P24,2,18,1.51073127941494
## P24,2,19,1.5089211141741
## P24,2,20,1.5098884091901
## P24,2,21,1.50991154680348
## P24,2,22,1.51113933901633
## P24,2,23,1.50914686469622
## P24,2,24,1.5123135187687
## P24,2,25,1.51178709531234
## P24,2,26,1.51063232951694
## P24,2,27,1.51063160042265
## P24,2,28,1.50949162528628
## P24,2,29,1.50634060435825
## P24,2,30,1.51196232863835
## P24,2,31,1.51081551732244
## P24,2,32,1.51129265676571
## P24,2,33,1.51183841167352
## P24,2,34,1.50990414047241
## P24,2,35,1.51446963200527
## P24,2,36,1.51300451771313
## P24,2,37,1.51053063293983
## P24,2,38,1.50992985927697
## P24,2,39,1.51064151850614
## P24,2,40,1.51068013413508
## P24,2,41,1.51041259678132
## P24,2,42,1.51135907600175
## P24,2,43,1.5109758117572
## P24,2,44,1.51031264350528
## P24,2,45,1.51066657226451
## P24,2,46,1.50803632206387
## P24,2,47,1.5100529062879
## P24,2,48,1.51164493849783
## P24,2,49,1.51138459934908
## P24,2,50,1.51072015358493
## P24,3,1,1.51399440765381
## P24,3,2,1.51259815692902
## P24,3,3,1.51179004165362
## P24,3,4,1.51084973130907
## P24,3,5,1.51126244573882
## P24,3,6,1.51100745024504
## P24,3,7,1.51090601461905
## P24,3,8,1.51103011461405
## P24,3,9,1.51212805890022
## P24,3,10,1.50820257352746
## P24,3,11,1.50742329925787
## P24,3,12,1.51183188302176
## P24,3,13,1.50896655280015
## P24,3,14,1.51031170046426
## P24,3,15,1.51162663698196
## P24,3,16,1.51125556544254
## P24,3,17,1.50236847482879
## P24,3,18,1.51938669700322
## P24,3,19,1.51045252055657
## P24,3,20,1.51158115940709
## P24,3,21,1.51020059108734
## P24,3,22,1.51017721026551
## P24,3,23,1.51073671687733
## P24,3,24,1.51051354408264
## P24,3,25,1.50953459421794
## P24,3,26,1.51262070286659
## P24,3,27,1.51019754863921
## P24,3,28,1.51018008318814
## P24,3,29,1.51257792252761
## P24,3,30,1.51190859794617
## P24,3,31,1.51011600345373
## P24,3,32,1.51399571555001
## P24,3,33,1.51137639537002
## P24,3,34,1.5097887267669
## P24,3,35,1.51269474896518
## P24,3,36,1.50957221984863
## P24,3,37,1.50989866256714
## P24,3,38,1.50998173554738
## P24,3,39,1.50894780158997
## P24,3,40,1.51006642384316
## P24,3,41,1.51527042822404
## P24,3,42,1.50640810619701
## P24,3,43,1.51321027793136
## P24,3,44,1.50860542058945
## P24,3,45,1.51060204920561
## P24,3,46,1.50914089539472
## P24,3,47,1.51286694878026
## P24,3,48,1.51051968582406
## P24,3,49,1.50968496322632
## P24,3,50,1.51057506631488
## P24,4,1,1.51488958994548
## P24,4,2,1.51348538398743
## P24,4,3,1.51076175184811
## P24,4,4,1.51093716804798
## P24,4,5,1.50845578057425
## P24,4,6,1.51407022296258
## P24,4,7,1.51219908814681
## P24,4,8,1.50945191452469
## P24,4,9,1.51009170351357
## P24,4,10,1.50992128054301
## P24,4,11,1.51115667819977
## P24,4,12,1.5086053830606
## P24,4,13,1.51114901133946
## P24,4,14,1.51177434126536
## P24,4,15,1.51035093125843
## P24,4,16,1.5092544025845
## P24,4,17,1.50322018171612
## P24,4,18,1.50997154609017
## P24,4,19,1.51166391372681
## P24,4,20,1.50979747577589
## P24,4,21,1.51154411816206
## P24,4,22,1.51169379552205
## P24,4,23,1.50946661521649
## P24,4,24,1.50441589355469
## P24,4,25,1.51158115940709
## P24,4,26,1.51148116588593
## P24,4,27,1.51058574156328
## P24,4,28,1.50838040686273
## P24,4,29,1.5100656747818
## P24,4,30,1.51003163140099
## P24,4,31,1.51019207312136
## P24,4,32,1.5110723203864
## P24,4,33,1.50790635978474
## P24,4,34,1.50979839838468
## P24,4,35,1.51135712610164
## P24,4,36,1.51070434670699
## P24,4,37,1.51088813940684
## P24,4,38,1.51197101223853
## P24,4,39,1.51110906238797
## P24,4,40,1.51304466074163
## P24,4,41,1.51039863401844
## P24,4,42,1.50957516387657
## P24,4,43,1.51017035847217
## P24,4,44,1.51138640024576
## P24,4,45,1.51117345094681
## P24,4,46,1.5100764769095
## P24,4,47,1.51056338465491
## P24,4,48,1.50998346429122
## P24,4,49,1.50895938006314
## P24,4,50,1.50880323218171
## P24,5,1,1.51071822886564
## P24,5,2,1.50854495763779
## P24,5,3,1.50675651354667
## P24,5,4,1.50842124394008
## P24,5,5,1.51139163970947
## P24,5,6,1.51272672873277
## P24,5,7,1.5084461389586
## P24,5,8,1.5120042860508
## P24,5,9,1.51076340675354
## P24,5,10,1.51254938924035
## P24,5,11,1.51484926541646
## P24,5,12,1.51098070473507
## P24,5,13,1.50969680557903
## P24,5,14,1.51155948638916
## P24,5,15,1.5120489751139
## P24,5,16,1.50644905426923
## P24,5,17,1.51265071815168
## P24,5,18,1.51019922892253
## P24,5,19,1.51025565978019
## P24,5,20,1.51150143468702
## P24,5,21,1.50939806046024
## P24,5,22,1.50822492440542
## P24,5,23,1.50749760866165
## P24,5,24,1.51159306367238
## P24,5,25,1.50256290435791
## P24,5,26,1.50825814543099
## P24,5,27,1.51075379053752
## P24,5,28,1.50880682468414
## P24,5,29,1.51024355358548
## P24,5,30,1.51027430806841
## P24,5,31,1.5100855660993
## P24,5,32,1.50843266078404
## P24,5,33,1.50845831916446
## P24,5,34,1.50979146692488
## P24,5,35,1.51038712721605
## P24,5,36,1.50918726391262
## P24,5,37,1.50770677053011
## P24,5,38,1.51453798467463
## P24,5,39,1.51399329304695
## P24,5,40,1.50848767207219
## P24,5,41,1.50965609501318
## P24,5,42,1.51075736472481
## P24,5,43,1.51073463757833
## P24,5,44,1.50879408437994
## P24,5,45,1.51177045277187
## P24,5,46,1.51007165908813
## P24,5,47,1.51256927490234
## P24,5,48,1.51024770736694
## P24,5,49,1.51275451183319
## P24,5,50,1.51007035364329
## P24,6,1,1.51065987348557
## P24,6,2,1.51263370968047
## P24,6,3,1.51121147311464
## P24,6,4,1.51110460320298
## P24,6,5,1.51163407608315
## P24,6,6,1.51169379552205
## P24,6,7,1.51172735293706
## P24,6,8,1.50941103980655
## P24,6,9,1.51158437022456
## P24,6,10,1.51235556602478
## P24,6,11,1.51124215126038
## P24,6,12,1.51124297437214
## P24,6,13,1.51219867706299
## P24,6,14,1.5107748422278
## P24,6,15,1.51069750324372
## P24,6,16,1.51070247678196
## P24,6,17,1.51110634207726
## P24,6,18,1.50998250273771
## P24,6,19,1.51000343117059
## P24,6,20,1.51076020891704
## P24,6,21,1.51107677253517
## P24,6,22,1.51096473421369
## P24,6,23,1.51170712709427
## P24,6,24,1.51061955094337
## P24,6,25,1.5115762911737
## P24,6,26,1.51064225317727
## P24,6,27,1.51183865572277
## P24,6,28,1.51133891514369
## P24,6,29,1.50990340444777
## P24,6,30,1.51080914104686
## P24,6,31,1.51029728253682
## P24,6,32,1.51176358222961
## P24,6,33,1.50578560147967
## P24,6,34,1.51174045645672
## P24,6,35,1.50952296786838
## P24,6,36,1.51179929290499
## P24,6,37,1.50979577825311
## P24,6,38,1.51069552943392
## P24,6,39,1.51079856024848
## P24,6,40,1.51026413019966
## P24,6,41,1.51065560241244
## P24,6,42,1.51556854588645
## P24,6,43,1.51112306118011
## P24,6,44,1.51389975774856
## P24,6,45,1.52783960766262
## P24,6,46,1.50967961152395
## P24,6,47,1.50860544045766
## P24,6,48,1.51273676406505
## P24,6,49,1.51183373491529
## P24,6,50,1.51118813938276
## P24,7,1,1.51410348995312
## P24,7,2,1.51079411506653
## P24,7,3,1.50947399437428
## P24,7,4,1.50887108863668
## P24,7,5,1.5111182871319
## P24,7,6,1.51116106158397
## P24,7,7,1.50936517836172
## P24,7,8,1.50984265123095
## P24,7,9,1.51161118654104
## P24,7,10,1.51022608335628
## P24,7,11,1.5111773289167
## P24,7,12,1.50894930304551
## P24,7,13,1.51145543456078
## P24,7,14,1.51269666105509
## P24,7,15,1.51057397194628
## P24,7,16,1.51637855282536
## P24,7,17,1.50907020079784
## P24,7,18,1.51233825683594
## P24,7,19,1.5086689999229
## P24,7,20,1.51519458634513
## P24,7,21,1.51121632258097
## P24,7,22,1.49862413936191
## P24,7,23,1.51012192052953
## P24,7,24,1.51289641338846
## P24,7,25,1.51294175316306
## P24,7,26,1.5089134608998
## P24,7,27,1.51067628323192
## P24,7,28,1.5104110212887
## P24,7,29,1.51108735607516
## P24,7,30,1.51442809538408
## P24,7,31,1.510709144451
## P24,7,32,1.51014956831932
## P24,7,33,1.51213689645131
## P24,7,34,1.51118354797363
## P24,7,35,1.51185615672622
## P24,7,36,1.51029727935791
## P24,7,37,1.50986757278442
## P24,7,38,1.51268018209017
## P24,7,39,1.50900821482882
## P24,7,40,1.50761845111847
## P24,7,41,1.50922937019199
## P24,7,42,1.51292915344238
## P24,7,43,1.52562510967255
## P24,7,44,1.51035096910265
## P24,7,45,1.51491626103719
## P24,7,46,1.50894780158997
## P24,7,47,1.50956976052487
## P24,7,48,1.51058453062306
## P24,7,49,1.51350657145182
## P24,7,50,1.50942810818984
## P24,8,1,1.51016093767606
## P24,8,2,1.51029995059179
## P24,8,3,1.51158015544598
## P24,8,4,1.51270406965225
## P24,8,5,1.51112746501314
## P24,8,6,1.50872147285332
## P24,8,7,1.51005496002558
## P24,8,8,1.51126156747341
## P24,8,9,1.50915844157591
## P24,8,10,1.51021208708314
## P24,8,11,1.50999981806828
## P24,8,12,1.51089888254801
## P24,8,13,1.51133650595989
## P24,8,14,1.5111659039026
## P24,8,15,1.50753445741607
## P24,8,16,1.50936383872197
## P24,8,17,1.51079098721768
## P24,8,18,1.5112274646759
## P24,8,19,1.51065701477287
## P24,8,20,1.50964977123119
## P24,8,21,1.50687558230232
## P24,8,22,1.51134466528893
## P24,8,23,1.50466003137476
## P24,8,24,1.50366154584018
## P24,8,25,1.5076542629136
## P24,8,26,1.50997975293328
## P24,8,27,1.5078484252259
## P24,8,28,1.51015919446945
## P24,8,29,1.50986361797945
## P24,8,30,1.50966590764571
## P24,8,31,1.50875275309493
## P24,8,32,1.51180684775637
## P24,8,33,1.51113306821048
## P24,8,34,1.50989444255829
## P24,8,35,1.51021978873333
## P24,8,36,1.51384225644563
## P24,8,37,1.50976174512355
## P24,8,38,1.50903809512103
## P24,8,39,1.51086534079859
## P24,8,40,1.51126887193367
## P24,8,41,1.51161109484159
## P24,8,42,1.50894964391535
## P24,8,43,1.51050447736468
## P24,8,44,1.51045841375987
## P24,8,45,1.51057398094321
## P24,8,46,1.50895394100232
## P24,8,47,1.51144589521946
## P24,8,48,1.51089906692505
## P24,8,49,1.51087629926074
## P24,8,50,1.51009349822998
## P24,9,1,1.50936566608053
## P24,9,2,1.50853824946615
## P24,9,3,1.51017270769392
## P24,9,4,1.50943792978923
## P24,9,5,1.51178457411073
## P24,9,6,1.51184625010337
## P24,9,7,1.5113245010376
## P24,9,8,1.51080754200617
## P24,9,9,1.51157628297806
## P24,9,10,1.51061166034025
## P24,9,11,1.50974541187286
## P24,9,12,1.51058948217933
## P24,9,13,1.5118601385471
## P24,9,14,1.50931349452238
## P24,9,15,1.51138470307836
## P24,9,16,1.51182540257772
## P24,9,17,1.510807781576
## P24,9,18,1.51054746979161
## P24,9,19,1.51008456200361
## P24,9,20,1.51217192750636
## P24,9,21,1.51076415868906
## P24,9,22,1.51100512913295
## P24,9,23,1.51097647751434
## P24,9,24,1.5095667997996
## P24,9,25,1.51069432189784
## P24,9,26,1.51131207487556
## P24,9,27,1.51108828457919
## P24,9,28,1.51046933562069
## P24,9,29,1.51163686736155
## P24,9,30,1.5111677971112
## P24,9,31,1.51117080136349
## P24,9,32,1.51096402043882
## P24,9,33,1.51184124633914
## P24,9,34,1.51047534440693
## P24,9,35,1.5102220916748
## P24,9,36,1.51097245255778
## P24,9,37,1.51135359870063
## P24,9,38,1.51013345025771
## P24,9,39,1.50990002710114
## P24,9,40,1.51098085432937
## P24,9,41,1.50984816855573
## P24,9,42,1.51020671513455
## P24,9,43,1.50899639550377
## P24,9,44,1.50850695504083
## P24,9,45,1.51045501400048
## P24,9,46,1.51043395097343
## P24,9,47,1.51037106558541
## P24,9,48,1.51043311426462
## P24,9,49,1.51144198907746
## P24,9,50,1.51076222707828
## P24,10,1,1.51005560329982
## P24,10,2,1.51007597704968
## P24,10,3,1.51086890129816
## P24,10,4,1.50935355254582
## P24,10,5,1.51104359877737
## P24,10,6,1.51378600541935
## P24,10,7,1.51318300854076
## P24,10,8,1.50984987616539
## P24,10,9,1.51207132622747
## P24,10,10,1.50873200552804
## P24,10,11,1.51084569462559
## P24,10,12,1.51142524083455
## P24,10,13,1.50810778141022
## P24,10,14,1.50956066676549
## P24,10,15,1.51150380111322
## P24,10,16,1.51077386673461
## P24,10,17,1.51066399607165
## P24,10,18,1.51241793802806
## P24,10,19,1.51286195119222
## P24,10,20,1.51153031639431
## P24,10,21,1.51058148962306
## P24,10,22,1.51011694899393
## P24,10,23,1.51557855770506
## P24,10,24,1.50906076638595
## P24,10,25,1.51159484762894
## P24,10,26,1.50957932653306
## P24,10,27,1.51083929755471
## P24,10,28,1.50955203771591
## P24,10,29,1.51778994202614
## P24,10,30,1.50984165586274
## P24,10,31,1.51192743127996
## P24,10,32,1.51177925774545
## P24,10,33,1.51006270156187
## P24,10,34,1.51244721147749
## P24,10,35,1.50624597640265
## P24,10,36,1.50665951583345
## P24,10,37,1.50950148640847
## P24,10,38,1.51181159700666
## P24,10,39,1.51234599522182
## P24,10,40,1.5072626431783
## P24,10,41,1.51467087609427
## P24,10,42,1.50722373088944
## P24,10,43,1.51095822814164
## P24,10,44,1.51364692052205
## P24,10,45,1.51124837340378
## P24,10,46,1.50986290392668
## P24,10,47,1.51172736287117
## P24,10,48,1.50822495089637
## P24,10,49,1.51202476117038
## P24,10,50,1.51031183235476
## P25,1,1,1.51223537775391
## P25,1,2,1.51001814721336
## P25,1,3,1.51315617325282
## P25,1,4,1.51169050612101
## P25,1,5,1.51210692648352
## P25,1,6,1.51145997836435
## P25,1,7,1.511438432287
## P25,1,8,1.5120808096493
## P25,1,9,1.51102525291713
## P25,1,10,1.50954053799311
## P25,1,11,1.50860994317558
## P25,1,12,1.5130566795667
## P25,1,13,1.51086278231639
## P25,1,14,1.51013451693009
## P25,1,15,1.51046486663818
## P25,1,16,1.50937079702105
## P25,1,17,1.50738486247276
## P25,1,18,1.51033930502076
## P25,1,19,1.51130169550578
## P25,1,20,1.51301298643413
## P25,1,21,1.51146689776717
## P25,1,22,1.50949936043726
## P25,1,23,1.51217717329661
## P25,1,24,1.51184557140737
## P25,1,25,1.51174879855797
## P25,1,26,1.51175909214192
## P25,1,27,1.51313922451992
## P25,1,28,1.50940817894695
## P25,1,29,1.51215321759144
## P25,1,30,1.51051134849662
## P25,1,31,1.51202392578125
## P25,1,32,1.5102128241826
## P25,1,33,1.51036217477587
## P25,1,34,1.51245271295741
## P25,1,35,1.51026450577429
## P25,1,36,1.51327127546776
## P25,1,37,1.51090731318035
## P25,1,38,1.51080012321472
## P25,1,39,1.511289622524
## P25,1,40,1.51240994231869
## P25,1,41,1.51259229339172
## P25,1,42,1.51161391885431
## P25,1,43,1.51353918385302
## P25,1,44,1.51195198205801
## P25,1,45,1.50809068812264
## P25,1,46,1.51198567255684
## P25,1,47,1.51076603802768
## P25,1,48,1.51428645570702
## P25,1,49,1.51119582520591
## P25,1,50,1.51159508257027
## P25,2,1,1.51127570928987
## P25,2,2,1.51095128526875
## P25,2,3,1.51254213940014
## P25,2,4,1.51176681518555
## P25,2,5,1.51184625010337
## P25,2,6,1.51187967235207
## P25,2,7,1.49747771088795
## P25,2,8,1.50992485434709
## P25,2,9,1.50400674461138
## P25,2,10,1.51460855375461
## P25,2,11,1.51177053792136
## P25,2,12,1.5107806968689
## P25,2,13,1.50943980898176
## P25,2,14,1.51273969181797
## P25,2,15,1.50324699113954
## P25,2,16,1.51000720977783
## P25,2,17,1.50835099973177
## P25,2,18,1.51102806816638
## P25,2,19,1.51218255996704
## P25,2,20,1.5099817464749
## P25,2,21,1.51428450790106
## P25,2,22,1.51476534207662
## P25,2,23,1.51639347606235
## P25,2,24,1.51194594546062
## P25,2,25,1.51136628592887
## P25,2,26,1.51036956392486
## P25,2,27,1.50606185368129
## P25,2,28,1.51218414997709
## P25,2,29,1.5111950527538
## P25,2,30,1.50873200552804
## P25,2,31,1.51212164507074
## P25,2,32,1.50883306627688
## P25,2,33,1.51228845119476
## P25,2,34,1.5091894865036
## P25,2,35,1.51041237967355
## P25,2,36,1.51177777349949
## P25,2,37,1.51271730099084
## P25,2,38,1.50882406234741
## P25,2,39,1.5112094112805
## P25,2,40,1.5161280299342
## P25,2,41,1.51084181358074
## P25,2,42,1.51114087946275
## P25,2,43,1.51166326349432
## P25,2,44,1.51084974833897
## P25,2,45,1.5084442615509
## P25,2,46,1.5103737701804
## P25,2,47,1.51223085191515
## P25,2,48,1.51237737048756
## P25,2,49,1.50981378555298
## P25,2,50,1.51163843989598
## P25,3,1,1.51187837719917
## P25,3,2,1.51124816412454
## P25,3,3,1.51093346112734
## P25,3,4,1.51089487196524
## P25,3,5,1.5117745526069
## P25,3,6,1.50794566887012
## P25,3,7,1.51279882524834
## P25,3,8,1.51099935940334
## P25,3,9,1.51116564129823
## P25,3,10,1.51045231549245
## P25,3,11,1.51179856788821
## P25,3,12,1.50957643609298
## P25,3,13,1.51186208993616
## P25,3,14,1.51022355435258
## P25,3,15,1.51382573770017
## P25,3,16,1.51253527535333
## P25,3,17,1.51146184314381
## P25,3,18,1.51154033115932
## P25,3,19,1.51164296511057
## P25,3,20,1.51281326362886
## P25,3,21,1.51193161691938
## P25,3,22,1.51078520088552
## P25,3,23,1.51135451751843
## P25,3,24,1.51267538399532
## P25,3,25,1.51216185433524
## P25,3,26,1.51046788271736
## P25,3,27,1.51227724141088
## P25,3,28,1.51030578613281
## P25,3,29,1.5115818977356
## P25,3,30,1.51272029965837
## P25,3,31,1.51113479081974
## P25,3,32,1.51443765474402
## P25,3,33,1.51114899090358
## P25,3,34,1.50850469619036
## P25,3,35,1.51097528655808
## P25,3,36,1.51191215724735
## P25,3,37,1.51105901328
## P25,3,38,1.5104753795423
## P25,3,39,1.51426970228857
## P25,3,40,1.51152079388247
## P25,3,41,1.51131213338752
## P25,3,42,1.50840716891819
## P25,3,43,1.51167631768561
## P25,3,44,1.51171875
## P25,3,45,1.5111029624939
## P25,3,46,1.51095375838103
## P25,3,47,1.51295463917619
## P25,3,48,1.51169375884227
## P25,3,49,1.51226355578448
## P25,3,50,1.51164418234162
## P25,4,1,1.51225008283343
## P25,4,2,1.50977411387879
## P25,4,3,1.5098906168862
## P25,4,4,1.51011229150089
## P25,4,5,1.50981388241053
## P25,4,6,1.51134562786715
## P25,4,7,1.51065313319365
## P25,4,8,1.51191352352952
## P25,4,9,1.5103256122486
## P25,4,10,1.51004966875402
## P25,4,11,1.510506454267
## P25,4,12,1.50968667080528
## P25,4,13,1.510533618927
## P25,4,14,1.50992235770592
## P25,4,15,1.51300431251526
## P25,4,16,1.51038394334181
## P25,4,17,1.50964978006151
## P25,4,18,1.51215453900789
## P25,4,19,1.509346385061
## P25,4,20,1.51235128271169
## P25,4,21,1.51194053942019
## P25,4,22,1.5095363828871
## P25,4,23,1.51259889720399
## P25,4,24,1.5110106699675
## P25,4,25,1.51205822399684
## P25,4,26,1.51176092359755
## P25,4,27,1.51116889173334
## P25,4,28,1.50857595118081
## P25,4,29,1.51409225354249
## P25,4,30,1.51191286036843
## P25,4,31,1.50896261323173
## P25,4,32,1.51072263717651
## P25,4,33,1.51066515580663
## P25,4,34,1.51243802933466
## P25,4,35,1.50925777232752
## P25,4,36,1.5110398914503
## P25,4,37,1.50553675960092
## P25,4,38,1.51001775695617
## P25,4,39,1.51240048492164
## P25,4,40,1.50914250479804
## P25,4,41,1.51160490255562
## P25,4,42,1.51083235470754
## P25,4,43,1.51314128875732
## P25,4,44,1.50992444917267
## P25,4,45,1.51027532057329
## P25,4,46,1.51166692256927
## P25,4,47,1.50846244442847
## P25,4,48,1.50991833209991
## P25,4,49,1.5104433397452
## P25,4,50,1.5108908831909
## P25,5,1,1.51211338241895
## P25,5,2,1.51237220931471
## P25,5,3,1.51105740795965
## P25,5,4,1.51027094400846
## P25,5,5,1.51008245272514
## P25,5,6,1.5099540223246
## P25,5,7,1.51032798403785
## P25,5,8,1.51139813511312
## P25,5,9,1.51145363414989
## P25,5,10,1.5121881054566
## P25,5,11,1.51127243864125
## P25,5,12,1.51089224081773
## P25,5,13,1.50989756026825
## P25,5,14,1.50922938889148
## P25,5,15,1.51086744436851
## P25,5,16,1.51117871768439
## P25,5,17,1.51131225300726
## P25,5,18,1.51123338653928
## P25,5,19,1.50999752563589
## P25,5,20,1.50984647057273
## P25,5,21,1.51172923591902
## P25,5,22,1.51129093435076
## P25,5,23,1.51271428002252
## P25,5,24,1.51290934784968
## P25,5,25,1.51189204242742
## P25,5,26,1.51097472508748
## P25,5,27,1.50966741821983
## P25,5,28,1.51030171683075
## P25,5,29,1.50945245439761
## P25,5,30,1.50997502228309
## P25,5,31,1.51257369873372
## P25,5,32,1.51047062272785
## P25,5,33,1.50984746217728
## P25,5,34,1.51073464325496
## P25,5,35,1.5092154003325
## P25,5,36,1.51082566727039
## P25,5,37,1.5122520798131
## P25,5,38,1.51083439985911
## P25,5,39,1.50904178619385
## P25,5,40,1.51038714555594
## P25,5,41,1.51092719164762
## P25,5,42,1.50942378797029
## P25,5,43,1.51085557359638
## P25,5,44,1.51120486218705
## P25,5,45,1.50979054492453
## P25,5,46,1.51229620839024
## P25,5,47,1.51083024465121
## P25,5,48,1.50950345205604
## P25,5,49,1.51206818452248
## P25,5,50,1.51154168255358
## P25,6,1,1.51217043995857
## P25,6,2,1.51146633284433
## P25,6,3,1.51115159718495
## P25,6,4,1.51177704183361
## P25,6,5,1.51058400378508
## P25,6,6,1.51127294855794
## P25,6,7,1.51047912212687
## P25,6,8,1.51221122974303
## P25,6,9,1.51174358014138
## P25,6,10,1.51179705609332
## P25,6,11,1.51013072153156
## P25,6,12,1.51217087278975
## P25,6,13,1.51188413402702
## P25,6,14,1.510709078625
## P25,6,15,1.50967112070397
## P25,6,16,1.51159662896014
## P25,6,17,1.51028098230777
## P25,6,18,1.5104481514464
## P25,6,19,1.51126405398051
## P25,6,20,1.51185848128121
## P25,6,21,1.50943593625669
## P25,6,22,1.51121321298126
## P25,6,23,1.5137209328272
## P25,6,24,1.51106349789366
## P25,6,25,1.50962099558871
## P25,6,26,1.51165911971882
## P25,6,27,1.51157273708935
## P25,6,28,1.51200804304569
## P25,6,29,1.5109913794549
## P25,6,30,1.51091350735845
## P25,6,31,1.51133569838509
## P25,6,32,1.51139055785312
## P25,6,33,1.51235844691594
## P25,6,34,1.51023085912069
## P25,6,35,1.50985417366028
## P25,6,36,1.51209935363458
## P25,6,37,1.50977440441356
## P25,6,38,1.51162501907349
## P25,6,39,1.51216279285055
## P25,6,40,1.51236517088754
## P25,6,41,1.51008952291388
## P25,6,42,1.51259166091236
## P25,6,43,1.51103730849278
## P25,6,44,1.51115916809946
## P25,6,45,1.51243498484294
## P25,6,46,1.51242980250606
## P25,6,47,1.51167551522116
## P25,6,48,1.51050714559333
## P25,6,49,1.51066809389965
## P25,6,50,1.51064752207862
## P25,7,1,1.51091565841284
## P25,7,2,1.51077816430039
## P25,7,3,1.51132901390987
## P25,7,4,1.51112631828554
## P25,7,5,1.51112385378539
## P25,7,6,1.51211832551395
## P25,7,7,1.51076133728027
## P25,7,8,1.50999141951739
## P25,7,9,1.51115095192659
## P25,7,10,1.51065646965085
## P25,7,11,1.51169604614001
## P25,7,12,1.51076129189244
## P25,7,13,1.51151125176439
## P25,7,14,1.5107479095459
## P25,7,15,1.51012214163075
## P25,7,16,1.51118353843689
## P25,7,17,1.51162661824908
## P25,7,18,1.51123566186729
## P25,7,19,1.51174893975258
## P25,7,20,1.51199747246002
## P25,7,21,1.51011499250778
## P25,7,22,1.51157319302462
## P25,7,23,1.51211122475048
## P25,7,24,1.51118265685215
## P25,7,25,1.50762598187316
## P25,7,26,1.51156355636288
## P25,7,27,1.51157407138659
## P25,7,28,1.51074041366577
## P25,7,29,1.51051884889603
## P25,7,30,1.51196526957082
## P25,7,31,1.5114592532037
## P25,7,32,1.50912333670117
## P25,7,33,1.51099288754347
## P25,7,34,1.51093454647781
## P25,7,35,1.50952155611156
## P25,7,36,1.51180685731701
## P25,7,37,1.51091368993123
## P25,7,38,1.51051086471194
## P25,7,39,1.51217714150747
## P25,7,40,1.50977083016898
## P25,7,41,1.51171819513494
## P25,7,42,1.5129723928671
## P25,7,43,1.51004048685233
## P25,7,44,1.51171294523745
## P25,7,45,1.51114085608838
## P25,7,46,1.50902914072012
## P25,7,47,1.5121128148046
## P25,7,48,1.50893860098756
## P25,7,49,1.5103825821596
## P25,7,50,1.51103404215995
## P25,8,1,1.51093067036997
## P25,8,2,1.5121678352356
## P25,8,3,1.50873967854664
## P25,8,4,1.51226962071199
## P25,8,5,1.5106396873792
## P25,8,6,1.50899982452393
## P25,8,7,1.50898194313049
## P25,8,8,1.51117632641056
## P25,8,9,1.511328815395
## P25,8,10,1.51181113219061
## P25,8,11,1.510149594148
## P25,8,12,1.51208702155522
## P25,8,13,1.51163092065365
## P25,8,14,1.51148651475492
## P25,8,15,1.50951374278349
## P25,8,16,1.51189129805762
## P25,8,17,1.51196537234566
## P25,8,18,1.51039853560186
## P25,8,19,1.51077263832092
## P25,8,20,1.50973185344979
## P25,8,21,1.51167800847222
## P25,8,22,1.51215143606696
## P25,8,23,1.51061050543624
## P25,8,24,1.51209253253359
## P25,8,25,1.51023423671722
## P25,8,26,1.51009511047939
## P25,8,27,1.5117014385405
## P25,8,28,1.51095031939055
## P25,8,29,1.51062751996635
## P25,8,30,1.51139094474468
## P25,8,31,1.51183839333363
## P25,8,32,1.51134391662178
## P25,8,33,1.50871047766312
## P25,8,34,1.51183249924209
## P25,8,35,1.50833971449669
## P25,8,36,1.51238581767449
## P25,8,37,1.51229287765838
## P25,8,38,1.51087850758008
## P25,8,39,1.51196599986455
## P25,8,40,1.51051607919396
## P25,8,41,1.51037616531054
## P25,8,42,1.51103808663108
## P25,8,43,1.51098757614324
## P25,8,44,1.51295175677852
## P25,8,45,1.51178411570462
## P25,8,46,1.51000124909157
## P25,8,47,1.50875701186478
## P25,8,48,1.51105262637138
## P25,8,49,1.51001253519973
## P25,8,50,1.51068874955909
## P25,9,1,1.51157100768316
## P25,9,2,1.51006419450334
## P25,9,3,1.50960149331526
## P25,9,4,1.51110023610732
## P25,9,5,1.50931646512902
## P25,9,6,1.51254547664097
## P25,9,7,1.51072865724564
## P25,9,8,1.51165178418159
## P25,9,9,1.51226954650879
## P25,9,10,1.5111002561425
## P25,9,11,1.50962171642058
## P25,9,12,1.50860212682708
## P25,9,13,1.51169626735081
## P25,9,14,1.50900024942832
## P25,9,15,1.51119294467273
## P25,9,16,1.51067758178711
## P25,9,17,1.50952823378823
## P25,9,18,1.50977358818054
## P25,9,19,1.51185322925448
## P25,9,20,1.51140539372554
## P25,9,21,1.51021672230141
## P25,9,22,1.51113296022602
## P25,9,23,1.51075266133184
## P25,9,24,1.51319084776209
## P25,9,25,1.50789341261221
## P25,9,26,1.51009342135215
## P25,9,27,1.50952615624382
## P25,9,28,1.5087885278644
## P25,9,29,1.51108520402821
## P25,9,30,1.50814887682597
## P25,9,31,1.51102681212373
## P25,9,32,1.51133097993567
## P25,9,33,1.51028300538848
## P25,9,34,1.51032987337434
## P25,9,35,1.51053732755233
## P25,9,36,1.51112413406372
## P25,9,37,1.51132851918538
## P25,9,38,1.50983908275763
## P25,9,39,1.51142519335204
## P25,9,40,1.51081914201789
## P25,9,41,1.51079857349396
## P25,9,42,1.50825625374204
## P25,9,43,1.51191198825836
## P25,9,44,1.50772953470913
## P25,9,45,1.51080965727903
## P25,9,46,1.51026752616177
## P25,9,47,1.50927922075445
## P25,9,48,1.51083757737104
## P25,9,49,1.51171737188821
## P25,9,50,1.51076265385276
## P25,10,1,1.50856878231098
## P25,10,2,1.5148223110081
## P25,10,3,1.51053897857666
## P25,10,4,1.50983429558669
## P25,10,5,1.50948051748605
## P25,10,6,1.51010391235352
## P25,10,7,1.50780433347855
## P25,10,8,1.51264375448227
## P25,10,9,1.51111130900197
## P25,10,10,1.51110101327664
## P25,10,11,1.511600345114
## P25,10,12,1.51054353983897
## P25,10,13,1.51068314753081
## P25,10,14,1.50986089706421
## P25,10,15,1.51010748491449
## P25,10,16,1.5108855940261
## P25,10,17,1.51077303205218
## P25,10,18,1.50972148238635
## P25,10,19,1.50855628067885
## P25,10,20,1.51286075331948
## P25,10,21,1.51149032573507
## P25,10,22,1.5087179106635
## P25,10,23,1.51127132672942
## P25,10,24,1.51173571745555
## P25,10,25,1.50867606045907
## P25,10,26,1.51105086008708
## P25,10,27,1.51198241866638
## P25,10,28,1.50950403003902
## P25,10,29,1.50791781113066
## P25,10,30,1.51145591281709
## P25,10,31,1.50876954161091
## P25,10,32,1.51009882950201
## P25,10,33,1.51073930070207
## P25,10,34,1.51185422129445
## P25,10,35,1.51042261653476
## P25,10,36,1.51000918764057
## P25,10,37,1.51021228517805
## P25,10,38,1.51479078877357
## P25,10,39,1.50792767580818
## P25,10,40,1.51118648199388
## P25,10,41,1.50475689343044
## P25,10,42,1.50835538732594
## P25,10,43,1.50526898143856
## P25,10,44,1.51873153584604
## P25,10,45,1.50902999843563
## P25,10,46,1.51051956719726
## P25,10,47,1.50745060046514
## P25,10,48,1.51080001449585
## P25,10,49,1.51217850243173
## P25,10,50,1.51053898731867
## P26,1,1,1.51711163982268
## P26,1,2,1.50994818078147
## P26,1,3,1.51141394101656
## P26,1,4,1.5119896734546
## P26,1,5,1.50710394279809
## P26,1,6,1.51490970849991
## P26,1,7,1.50261926651001
## P26,1,8,1.51776931034261
## P26,1,9,1.51107610066732
## P26,1,10,1.51300516685882
## P26,1,11,1.51399738523695
## P26,1,12,1.51459934912532
## P26,1,13,1.50431703615792
## P26,1,14,1.51140259892753
## P26,1,15,1.50925043609245
## P26,1,16,1.51634717261654
## P26,1,17,1.50833214913215
## P26,1,18,1.51004333133939
## P26,1,19,1.5059825208452
## P26,1,20,1.50966109078506
## P26,1,21,1.50754385774241
## P26,1,22,1.5130311089593
## P26,1,23,1.50831980271773
## P26,1,24,1.50302730997403
## P26,1,25,1.51366928844917
## P26,1,26,1.50564981846327
## P26,1,27,1.51705993675604
## P26,1,28,1.50889907344695
## P26,1,29,1.51282709121704
## P26,1,30,1.51044344250622
## P26,1,31,1.51261949539185
## P26,1,32,1.50989519247488
## P26,1,33,1.51009035110474
## P26,1,34,1.51207595146619
## P26,1,35,1.51036379576991
## P26,1,36,1.51074760954901
## P26,1,37,1.5119880122297
## P26,1,38,1.51157711763851
## P26,1,39,1.50721218327808
## P26,1,40,1.51182803842756
## P26,1,41,1.50694738609203
## P26,1,42,1.51104416718354
## P26,1,43,1.5105381999353
## P26,1,44,1.5111720039731
## P26,1,45,1.51044535959089
## P26,1,46,1.51153819735457
## P26,1,47,1.51009516179914
## P26,1,48,1.5013610469839
## P26,1,49,1.51386086237913
## P26,1,50,1.5101629879849
## P26,2,1,1.51077407353545
## P26,2,2,1.51294325778359
## P26,2,3,1.51086005524023
## P26,2,4,1.51003222599208
## P26,2,5,1.51638093440653
## P26,2,6,1.50988174237703
## P26,2,7,1.51346161614166
## P26,2,8,1.51186161239942
## P26,2,9,1.50634296885077
## P26,2,10,1.51063149416888
## P26,2,11,1.51962605024639
## P26,2,12,1.51026991628251
## P26,2,13,1.50905427251543
## P26,2,14,1.50976810672066
## P26,2,15,1.51049274868435
## P26,2,16,1.51477461718441
## P26,2,17,1.51032179853191
## P26,2,18,1.50867571149554
## P26,2,19,1.51673934917257
## P26,2,20,1.50735266130049
## P26,2,21,1.51548502594233
## P26,2,22,1.50972111730865
## P26,2,23,1.5102167231696
## P26,2,24,1.51316627405458
## P26,2,25,1.50390766999301
## P26,2,26,1.50767095397119
## P26,2,27,1.51187665709134
## P26,2,28,1.50883284069243
## P26,2,29,1.50504862984946
## P26,2,30,1.50993474006653
## P26,2,31,1.50751540520612
## P26,2,32,1.51236605804239
## P26,2,33,1.50831708811261
## P26,2,34,1.52610926758753
## P26,2,35,1.51449358716924
## P26,2,36,1.51109023345144
## P26,2,37,1.50595544093364
## P26,2,38,1.50806892087674
## P26,2,39,1.50993844967533
## P26,2,40,1.50990954935551
## P26,2,41,1.50965722843453
## P26,2,42,1.51431218783061
## P26,2,43,1.51336963818623
## P26,2,44,1.50796414394768
## P26,2,45,1.51424253653295
## P26,2,46,1.50715568965067
## P26,2,47,1.51121729804624
## P26,2,48,1.51262087730845
## P26,2,49,1.50882832517902
## P26,2,50,1.51201009850123
## P26,3,1,1.50972552760955
## P26,3,2,1.51152406587191
## P26,3,3,1.51071018874645
## P26,3,4,1.51353416372748
## P26,3,5,1.5134238921679
## P26,3,6,1.50971506226738
## P26,3,7,1.51256393986707
## P26,3,8,1.51221708025251
## P26,3,9,1.51254164491381
## P26,3,10,1.50875356120448
## P26,3,11,1.50822990627612
## P26,3,12,1.50037833819023
## P26,3,13,1.51283179067116
## P26,3,14,1.50618403113407
## P26,3,15,1.51656500266416
## P26,3,16,1.50644563479596
## P26,3,17,1.51201249317951
## P26,3,18,1.50243216985232
## P26,3,19,1.51258896387111
## P26,3,20,1.51386372884115
## P26,3,21,1.506438427958
## P26,3,22,1.51310873031616
## P26,3,23,1.51012376638559
## P26,3,24,1.49552346467972
## P26,3,25,1.51310186557942
## P26,3,26,1.50941570873918
## P26,3,27,1.51196782929557
## P26,3,28,1.49367916107178
## P26,3,29,1.5158980413415
## P26,3,30,1.50852039757125
## P26,3,31,1.50992499137747
## P26,3,32,1.50362404381357
## P26,3,33,1.51709585464918
## P26,3,34,1.5159781441208
## P26,3,35,1.50872677646271
## P26,3,36,1.51524205803871
## P26,3,37,1.50850710155457
## P26,3,38,1.5163958796433
## P26,3,39,1.52123966602364
## P26,3,40,1.51137309108707
## P26,3,41,1.49036554957545
## P26,3,42,1.53354021672452
## P26,3,43,1.5120697623805
## P26,3,44,1.48876844964376
## P26,3,45,1.52442571249875
## P26,3,46,1.51290659750662
## P26,3,47,1.51483470806177
## P26,3,48,1.51453413121841
## P26,3,49,1.50884710039411
## P26,3,50,1.49440119577491
## P26,4,1,1.50934467210874
## P26,4,2,1.50902632916911
## P26,4,3,1.50921169916789
## P26,4,4,1.51528168996175
## P26,4,5,1.50712835997866
## P26,4,6,1.51079937815666
## P26,4,7,1.50688200068653
## P26,4,8,1.50801255118172
## P26,4,9,1.51319616245774
## P26,4,10,1.50773476016137
## P26,4,11,1.51076904768796
## P26,4,12,1.50596264954452
## P26,4,13,1.51284557271887
## P26,4,14,1.50778956773902
## P26,4,15,1.50392321918322
## P26,4,16,1.51773074695042
## P26,4,17,1.5088843076657
## P26,4,18,1.50994110107422
## P26,4,19,1.51515861068453
## P26,4,20,1.50399300654729
## P26,4,21,1.51327684051112
## P26,4,22,1.51011600564508
## P26,4,23,1.50980671388762
## P26,4,24,1.5072563748027
## P26,4,25,1.50097642311683
## P26,4,26,1.51877901909199
## P26,4,27,1.50873746246588
## P26,4,28,1.51393271564098
## P26,4,29,1.50852808326182
## P26,4,30,1.50845221734383
## P26,4,31,1.51630086323311
## P26,4,32,1.50731635093689
## P26,4,33,1.50611518187956
## P26,4,34,1.51624698711164
## P26,4,35,1.51063436980641
## P26,4,36,1.51269030768024
## P26,4,37,1.51014701219705
## P26,4,38,1.51594837068573
## P26,4,39,1.50529687912738
## P26,4,40,1.51227149242113
## P26,4,41,1.51349326759387
## P26,4,42,1.51157027880351
## P26,4,43,1.50961994683301
## P26,4,44,1.50923405632828
## P26,4,45,1.50709289274875
## P26,4,46,1.51547952621214
## P26,4,47,1.50795858383179
## P26,4,48,1.51014527192353
## P26,4,49,1.51126646125404
## P26,4,50,1.51071238027188
## P26,5,1,1.52020979764169
## P26,5,2,1.49879753715114
## P26,5,3,1.50784951113583
## P26,5,4,1.51343377100097
## P26,5,5,1.50907871425152
## P26,5,6,1.51644048094749
## P26,5,7,1.5083653421113
## P26,5,8,1.51099804743824
## P26,5,9,1.51158030912838
## P26,5,10,1.50983193027439
## P26,5,11,1.5126216397314
## P26,5,12,1.51283118304084
## P26,5,13,1.50736543163657
## P26,5,14,1.5136395670885
## P26,5,15,1.50071464666799
## P26,5,16,1.51464064915975
## P26,5,17,1.50599855116044
## P26,5,18,1.51461983556333
## P26,5,19,1.51436764606531
## P26,5,20,1.50637324277092
## P26,5,21,1.51076605344059
## P26,5,22,1.51287656134747
## P26,5,23,1.51357612697356
## P26,5,24,1.49970898924574
## P26,5,25,1.50517423854155
## P26,5,26,1.51980053133039
## P26,5,27,1.50464601265757
## P26,5,28,1.50812855302071
## P26,5,29,1.51006414673545
## P26,5,30,1.51104993405549
## P26,5,31,1.50942858060201
## P26,5,32,1.50389401216685
## P26,5,33,1.50819632434106
## P26,5,34,1.51316892760141
## P26,5,35,1.5130431339389
## P26,5,36,1.50974186305893
## P26,5,37,1.50447638138481
## P26,5,38,1.50884354575563
## P26,5,39,1.51094063814136
## P26,5,40,1.50591987655276
## P26,5,41,1.50922833521342
## P26,5,42,1.51239427819952
## P26,5,43,1.51283789660833
## P26,5,44,1.50632270658859
## P26,5,45,1.5085707247652
## P26,5,46,1.5080579570216
## P26,5,47,1.51483618748652
## P26,5,48,1.51108596557961
## P26,5,49,1.51482178324418
## P26,5,50,1.50885863750302
## P26,6,1,1.51340870857239
## P26,6,2,1.51055090523621
## P26,6,3,1.51087181590428
## P26,6,4,1.5112764319858
## P26,6,5,1.51169996217649
## P26,6,6,1.51258429491295
## P26,6,7,1.51052039219783
## P26,6,8,1.51070499179339
## P26,6,9,1.51133385638601
## P26,6,10,1.51136859172099
## P26,6,11,1.51090566688609
## P26,6,12,1.5122394057178
## P26,6,13,1.51124828106889
## P26,6,14,1.51159356719819
## P26,6,15,1.51059706117854
## P26,6,16,1.51077340475878
## P26,6,17,1.51474709816167
## P26,6,18,1.51034977425277
## P26,6,19,1.51239002879264
## P26,6,20,1.51111604071952
## P26,6,21,1.51077752331503
## P26,6,22,1.51367381198258
## P26,6,23,1.50889044477229
## P26,6,24,1.51416750131927
## P26,6,25,1.51529027901444
## P26,6,26,1.51009413124858
## P26,6,27,1.51076916626522
## P26,6,28,1.51353354577894
## P26,6,29,1.50346487573108
## P26,6,30,1.52371295293172
## P26,6,31,1.50494353386664
## P26,6,32,1.51647846306427
## P26,6,33,1.51164076130861
## P26,6,34,1.50558140833084
## P26,6,35,1.51199028227064
## P26,6,36,1.51167766888936
## P26,6,37,1.51019599642072
## P26,6,38,1.51483713575156
## P26,6,39,1.51329044862227
## P26,6,40,1.50636191959799
## P26,6,41,1.50927227084376
## P26,6,42,1.50973334312439
## P26,6,43,1.51193299013026
## P26,6,44,1.51028275489807
## P26,6,45,1.51053473322015
## P26,6,46,1.50580475443885
## P26,6,47,1.51009711995721
## P26,6,48,1.50969365817397
## P26,6,49,1.51234047317505
## P26,6,50,1.5108994905558
## P26,7,1,1.5111465920183
## P26,7,2,1.51038934162685
## P26,7,3,1.50995979909822
## P26,7,4,1.51386521657308
## P26,7,5,1.51190057277679
## P26,7,6,1.50967171963523
## P26,7,7,1.51066429274423
## P26,7,8,1.51090989241729
## P26,7,9,1.50822590745014
## P26,7,10,1.51587759821038
## P26,7,11,1.50837265915341
## P26,7,12,1.50890112198846
## P26,7,13,1.51031802829943
## P26,7,14,1.51038796887426
## P26,7,15,1.51324807864994
## P26,7,16,1.51300194512116
## P26,7,17,1.50813120603561
## P26,7,18,1.51603568358228
## P26,7,19,1.50316588186449
## P26,7,20,1.51382790232551
## P26,7,21,1.52003379881851
## P26,7,22,1.50831243847356
## P26,7,23,1.50811303986443
## P26,7,24,1.51123051643372
## P26,7,25,1.51057868418486
## P26,7,26,1.51111021615509
## P26,7,27,1.50882649959478
## P26,7,28,1.51207982376218
## P26,7,29,1.50672096317097
## P26,7,30,1.51813324983569
## P26,7,31,1.50952919264485
## P26,7,32,1.52298556187356
## P26,7,33,1.50229027087872
## P26,7,34,1.51013241257778
## P26,7,35,1.50915307677194
## P26,7,36,1.50948073810205
## P26,7,37,1.51681991577148
## P26,7,38,1.50810273769682
## P26,7,39,1.5136158367819
## P26,7,40,1.50932904471338
## P26,7,41,1.51023099777546
## P26,7,42,1.50953228496811
## P26,7,43,1.51047408911917
## P26,7,44,1.50875719042792
## P26,7,45,1.51221921478493
## P26,7,46,1.50967135062585
## P26,7,47,1.51041967924251
## P26,7,48,1.51050800543565
## P26,7,49,1.51143716529564
## P26,7,50,1.51359043717384
## P26,8,1,1.51106585358544
## P26,8,2,1.50994639333926
## P26,8,3,1.5116647288606
## P26,8,4,1.51031641912932
## P26,8,5,1.51071231142222
## P26,8,6,1.51293984985352
## P26,8,7,1.51029604438722
## P26,8,8,1.51062962710857
## P26,8,9,1.50952913843352
## P26,8,10,1.50964459474536
## P26,8,11,1.51049154495524
## P26,8,12,1.51143155886432
## P26,8,13,1.51140920373778
## P26,8,14,1.51229638588138
## P26,8,15,1.51051559755879
## P26,8,16,1.51298537708464
## P26,8,17,1.51000384974286
## P26,8,18,1.51388739202624
## P26,8,19,1.50160662333171
## P26,8,20,1.51018754295681
## P26,8,21,1.50921111141177
## P26,8,22,1.50930211229144
## P26,8,23,1.51170844164762
## P26,8,24,1.51188793375685
## P26,8,25,1.50953951780347
## P26,8,26,1.51225544475928
## P26,8,27,1.50986355951388
## P26,8,28,1.51616835773439
## P26,8,29,1.51006063818932
## P26,8,30,1.50873590187288
## P26,8,31,1.50783870297094
## P26,8,32,1.51010751724243
## P26,8,33,1.5107261818998
## P26,8,34,1.50932265103348
## P26,8,35,1.50773851776123
## P26,8,36,1.50233793258667
## P26,8,37,1.51050628721714
## P26,8,38,1.51140690933574
## P26,8,39,1.51712732536848
## P26,8,40,1.50374265398298
## P26,8,41,1.51308920804192
## P26,8,42,1.50054877645829
## P26,8,43,1.5124368452488
## P26,8,44,1.51538599608187
## P26,8,45,1.51122856140137
## P26,8,46,1.51839597121529
## P26,8,47,1.51992405267586
## P26,8,48,1.50896550669815
## P26,8,49,1.50181972148807
## P26,8,50,1.5103047113309
## P26,9,1,1.50891526295589
## P26,9,2,1.50986128694871
## P26,9,3,1.51166749500728
## P26,9,4,1.51299486489132
## P26,9,5,1.50605257167373
## P26,9,6,1.50807280508464
## P26,9,7,1.51097470208218
## P26,9,8,1.51046247602259
## P26,9,9,1.51233500526065
## P26,9,10,1.50900386727375
## P26,9,11,1.51328503528488
## P26,9,12,1.51087217815852
## P26,9,13,1.51061181380199
## P26,9,14,1.5100556237357
## P26,9,15,1.51016415720401
## P26,9,16,1.51163790130615
## P26,9,17,1.51064686451928
## P26,9,18,1.50916542270319
## P26,9,19,1.51396307468414
## P26,9,20,1.51050268784734
## P26,9,21,1.51111701350884
## P26,9,22,1.51014405782105
## P26,9,23,1.509910572052
## P26,9,24,1.51115317158885
## P26,9,25,1.51026018060369
## P26,9,26,1.51125708455625
## P26,9,27,1.51094180919506
## P26,9,28,1.51120141810841
## P26,9,29,1.51194226208018
## P26,9,30,1.50917867055306
## P26,9,31,1.51240465220283
## P26,9,32,1.50855063247681
## P26,9,33,1.51000123800233
## P26,9,34,1.5096469483934
## P26,9,35,1.51118971384489
## P26,9,36,1.51164493127303
## P26,9,37,1.51107795074068
## P26,9,38,1.51147517862246
## P26,9,39,1.51119199970312
## P26,9,40,1.51142521393605
## P26,9,41,1.51089153168308
## P26,9,42,1.51066591413759
## P26,9,43,1.51106934459663
## P26,9,44,1.50946063995361
## P26,9,45,1.5120697593689
## P26,9,46,1.5098848282916
## P26,9,47,1.50926777820459
## P26,9,48,1.51053761897114
## P26,9,49,1.5058806737264
## P26,9,50,1.51450245787458
## P26,10,1,1.50992757703629
## P26,10,2,1.51097484553082
## P26,10,3,1.51083873299991
## P26,10,4,1.51077426190408
## P26,10,5,1.51006709166936
## P26,10,6,1.51176444749187
## P26,10,7,1.50984463436913
## P26,10,8,1.5133993736166
## P26,10,9,1.50949063418824
## P26,10,10,1.51037944389495
## P26,10,11,1.51014321041803
## P26,10,12,1.51386237740517
## P26,10,13,1.50604955759426
## P26,10,14,1.51280404417307
## P26,10,15,1.51172513335291
## P26,10,16,1.51035247981878
## P26,10,17,1.51093347351272
## P26,10,18,1.51088138222694
## P26,10,19,1.51063725712535
## P26,10,20,1.51049443357479
## P26,10,21,1.51034841170678
## P26,10,22,1.51171649786142
## P26,10,23,1.51106361704549
## P26,10,24,1.51320361737852
## P26,10,25,1.50770475418587
## P26,10,26,1.51069415057147
## P26,10,27,1.51134081795102
## P26,10,28,1.51032048283201
## P26,10,29,1.51071433810627
## P26,10,30,1.51116795499786
## P26,10,31,1.51049344435982
## P26,10,32,1.51122792886228
## P26,10,33,1.50967263556146
## P26,10,34,1.51009148910266
## P26,10,35,1.51075573706291
## P26,10,36,1.51256657971276
## P26,10,37,1.51340883189234
## P26,10,38,1.50899130147654
## P26,10,39,1.50994910727014
## P26,10,40,1.50937624330874
## P26,10,41,1.51040543376149
## P26,10,42,1.51130409801708
## P26,10,43,1.51103969878214
## P26,10,44,1.51044173405088
## P26,10,45,1.51110397109502
## P26,10,46,1.51089151953436
## P26,10,47,1.51099218726158
## P26,10,48,1.51091164315653
## P26,10,49,1.51098355040493
## P26,10,50,1.51116721683674
## P27,1,1,1.51118121419634
## P27,1,2,1.51131207689326
## P27,1,3,1.5116595386034
## P27,1,4,1.51087577098671
## P27,1,5,1.51129838862318
## P27,1,6,1.51158945560455
## P27,1,7,1.51145522786964
## P27,1,8,1.51017275647826
## P27,1,9,1.50863570736763
## P27,1,10,1.508028187277
## P27,1,11,1.51229800449477
## P27,1,12,1.50743622314639
## P27,1,13,1.50627151746599
## P27,1,14,1.51184772863621
## P27,1,15,1.50902465898163
## P27,1,16,1.51029036121984
## P27,1,17,1.51118463940091
## P27,1,18,1.5137700749867
## P27,1,19,1.50617327725977
## P27,1,20,1.51445190648775
## P27,1,21,1.51110762357712
## P27,1,22,1.51234262355053
## P27,1,23,1.51015611665439
## P27,1,24,1.5122079031808
## P27,1,25,1.50927325926329
## P27,1,26,1.5086557790637
## P27,1,27,1.51622772961855
## P27,1,28,1.50987836837769
## P27,1,29,1.50851336206709
## P27,1,30,1.5110254906516
## P27,1,31,1.51025602875686
## P27,1,32,1.51083934668339
## P27,1,33,1.51341390609741
## P27,1,34,1.5130192284943
## P27,1,35,1.51411077345925
## P27,1,36,1.50943120718002
## P27,1,37,1.50975112791185
## P27,1,38,1.51124396920204
## P27,1,39,1.51207347847949
## P27,1,40,1.51405573465738
## P27,1,41,1.51006567052432
## P27,1,42,1.5150816990779
## P27,1,43,1.50916486978531
## P27,1,44,1.50611516562375
## P27,1,45,1.51985782782237
## P27,1,46,1.50718926891838
## P27,1,47,1.51907599599738
## P27,1,48,1.51233395864797
## P27,1,49,1.51230642944574
## P27,1,50,1.51166980266571
## P27,2,1,1.51266088661241
## P27,2,2,1.50774218485906
## P27,2,3,1.48872447013855
## P27,2,4,1.51378180027008
## P27,2,5,1.5153316529859
## P27,2,6,1.51132757013494
## P27,2,7,1.51840763313826
## P27,2,8,1.50470481849298
## P27,2,9,1.51222343356521
## P27,2,10,1.50967533269506
## P27,2,11,1.50977006899256
## P27,2,12,1.51448284861553
## P27,2,13,1.51573243966469
## P27,2,14,1.51168736578926
## P27,2,15,1.51544677109278
## P27,2,16,1.5036192505448
## P27,2,17,1.51354992155935
## P27,2,18,1.50932200582404
## P27,2,19,1.51554408769929
## P27,2,20,1.50089521884918
## P27,2,21,1.51627208328247
## P27,2,22,1.49281732145562
## P27,2,23,1.51034788752711
## P27,2,24,1.51339026970592
## P27,2,25,1.51669867833455
## P27,2,26,1.51718132179904
## P27,2,27,1.50601405528054
## P27,2,28,1.51422554446805
## P27,2,29,1.50938007857773
## P27,2,30,1.51515899678712
## P27,2,31,1.51159211908068
## P27,2,32,1.51184676414312
## P27,2,33,1.51134071816931
## P27,2,34,1.51538029584018
## P27,2,35,1.51216838688686
## P27,2,36,1.51358555481497
## P27,2,37,1.51802624373877
## P27,2,38,1.5081569653637
## P27,2,39,1.51217769226938
## P27,2,40,1.51536958913008
## P27,2,41,1.50460557263307
## P27,2,42,1.51251861027309
## P27,2,43,1.50997503214869
## P27,2,44,1.51762488993203
## P27,2,45,1.50602930133082
## P27,2,46,1.50793738304814
## P27,2,47,1.50943384980256
## P27,2,48,1.51630482583676
## P27,2,49,1.51404555329999
## P27,2,50,1.50362544731806
## P27,3,1,1.51493272396049
## P27,3,2,1.51737775154484
## P27,3,3,1.50679092733269
## P27,3,4,1.51655435562134
## P27,3,5,1.50626217479437
## P27,3,6,1.50984702371571
## P27,3,7,1.50575461020836
## P27,3,8,1.51020476369575
## P27,3,9,1.51526088299959
## P27,3,10,1.5075781583786
## P27,3,11,1.52495926658579
## P27,3,12,1.4961559840611
## P27,3,13,1.5153908835517
## P27,3,14,1.50803815102091
## P27,3,15,1.52054160925058
## P27,3,16,1.51642449696859
## P27,3,17,1.5088990098339
## P27,3,18,1.51260819917993
## P27,3,19,1.50957587090406
## P27,3,20,1.5141739915399
## P27,3,21,1.50374236549299
## P27,3,22,1.51747390306913
## P27,3,23,1.51142523505471
## P27,3,24,1.51496316557345
## P27,3,25,1.51005781681166
## P27,3,26,1.5042132331479
## P27,3,27,1.51140203750391
## P27,3,28,1.51170923040925
## P27,3,29,1.51266513648608
## P27,3,30,1.51131781260173
## P27,3,31,1.50949826682966
## P27,3,32,1.50329751594394
## P27,3,33,1.49494153055651
## P27,3,34,1.51499102292237
## P27,3,35,1.50435243661587
## P27,3,36,1.51426158539236
## P27,3,37,1.50980760902166
## P27,3,38,1.51303654406444
## P27,3,39,1.50736863153023
## P27,3,40,1.50795579600979
## P27,3,41,1.50425132668537
## P27,3,42,1.5237934929984
## P27,3,43,1.5086689999229
## P27,3,44,1.51444907002635
## P27,3,45,1.50732686554176
## P27,3,46,1.50964247419479
## P27,3,47,1.50979183144765
## P27,3,48,1.51192358351245
## P27,3,49,1.51092576026917
## P27,3,50,1.5090181739242
## P27,4,1,1.51134710600882
## P27,4,2,1.51312840194033
## P27,4,3,1.50510745843252
## P27,4,4,1.51073662847535
## P27,4,5,1.50684106442355
## P27,4,6,1.51114013745235
## P27,4,7,1.51021395387321
## P27,4,8,1.51038397404186
## P27,4,9,1.51034393645169
## P27,4,10,1.51038021281146
## P27,4,11,1.50790380627921
## P27,4,12,1.50940037617641
## P27,4,13,1.51034885025024
## P27,4,14,1.51044647075512
## P27,4,15,1.50972786690425
## P27,4,16,1.50029661209603
## P27,4,17,1.50992030917474
## P27,4,18,1.50745102184922
## P27,4,19,1.51193960629977
## P27,4,20,1.50863546044079
## P27,4,21,1.50864059485278
## P27,4,22,1.51137827901007
## P27,4,23,1.50732600784302
## P27,4,24,1.51239739735921
## P27,4,25,1.51566883613323
## P27,4,26,1.51424503326416
## P27,4,27,1.5068693898973
## P27,4,28,1.51137389954488
## P27,4,29,1.505133073192
## P27,4,30,1.51050358107596
## P27,4,31,1.51288265056824
## P27,4,32,1.50171640299369
## P27,4,33,1.51480419600188
## P27,4,34,1.50688836929646
## P27,4,35,1.50949258463723
## P27,4,36,1.502741987055
## P27,4,37,1.5122261355905
## P27,4,38,1.51091050660169
## P27,4,39,1.50850632542469
## P27,4,40,1.50943190064924
## P27,4,41,1.51649417479833
## P27,4,42,1.51746427095853
## P27,4,43,1.50727350647385
## P27,4,44,1.51020776960585
## P27,4,45,1.50985476936119
## P27,4,46,1.51123209195594
## P27,4,47,1.51022506911179
## P27,4,48,1.51049511219428
## P27,4,49,1.50974871481166
## P27,4,50,1.50902764481234
## P27,5,1,1.51177549362183
## P27,5,2,1.50917429232415
## P27,5,3,1.51256731054285
## P27,5,4,1.50396224908661
## P27,5,5,1.5116669178009
## P27,5,6,1.51282129578918
## P27,5,7,1.50999366744491
## P27,5,8,1.51100408308434
## P27,5,9,1.50909566509631
## P27,5,10,1.51118178676358
## P27,5,11,1.5098892218775
## P27,5,12,1.51224058507437
## P27,5,13,1.49848722710329
## P27,5,14,1.51978226031287
## P27,5,15,1.51406012597631
## P27,5,16,1.51728130810296
## P27,5,17,1.50804448429542
## P27,5,18,1.51024189218879
## P27,5,19,1.50892171923746
## P27,5,20,1.50984527847984
## P27,5,21,1.5081018447876
## P27,5,22,1.50982091323189
## P27,5,23,1.50619710606637
## P27,5,24,1.50530560811361
## P27,5,25,1.51067463149372
## P27,5,26,1.51029469505433
## P27,5,27,1.5114115618043
## P27,5,28,1.50928430290489
## P27,5,29,1.51117343828082
## P27,5,30,1.51117300779923
## P27,5,31,1.50358908301906
## P27,5,32,1.51250298607428
## P27,5,33,1.50633229102407
## P27,5,34,1.51439403507807
## P27,5,35,1.50871682674327
## P27,5,36,1.50774040887522
## P27,5,37,1.51086543752001
## P27,5,38,1.51035940647125
## P27,5,39,1.51014653790382
## P27,5,40,1.51533841235297
## P27,5,41,1.50788164946993
## P27,5,42,1.51208344627829
## P27,5,43,1.51511113345623
## P27,5,44,1.50970610430543
## P27,5,45,1.51026369165058
## P27,5,46,1.51031680927155
## P27,5,47,1.51179470985558
## P27,5,48,1.50834517774329
## P27,5,49,1.51268368741892
## P27,5,50,1.51080287716346
## P27,6,1,1.51856333550776
## P27,6,2,1.51748382568359
## P27,6,3,1.51527521261585
## P27,6,4,1.5149081670321
## P27,6,5,1.51423204329706
## P27,6,6,1.51407844233887
## P27,6,7,1.51383091106749
## P27,6,8,1.51347126720621
## P27,6,9,1.51518103889391
## P27,6,10,1.51241022919955
## P27,6,11,1.50999931683616
## P27,6,12,1.51519121402918
## P27,6,13,1.50941106139636
## P27,6,14,1.51411867141724
## P27,6,15,1.51103329658508
## P27,6,16,1.5133588180542
## P27,6,17,1.51295022737412
## P27,6,18,1.51315971240876
## P27,6,19,1.51232229395116
## P27,6,20,1.51205918437145
## P27,6,21,1.51357366600815
## P27,6,22,1.51261521260673
## P27,6,23,1.51336526489258
## P27,6,24,1.5122417759251
## P27,6,25,1.51241955274268
## P27,6,26,1.51188560516115
## P27,6,27,1.51741012636122
## P27,6,28,1.5109259309903
## P27,6,29,1.51300175756002
## P27,6,30,1.51276993580002
## P27,6,31,1.51210692688659
## P27,6,32,1.50880213670952
## P27,6,33,1.51264864250466
## P27,6,34,1.5125171960878
## P27,6,35,1.51295294851627
## P27,6,36,1.51330508356509
## P27,6,37,1.51009251246943
## P27,6,38,1.51194229054807
## P27,6,39,1.50955700528794
## P27,6,40,1.51288273551247
## P27,6,41,1.51123984514085
## P27,6,42,1.51379780881987
## P27,6,43,1.51328140146592
## P27,6,44,1.51036779369627
## P27,6,45,1.50839875262717
## P27,6,46,1.51144873486818
## P27,6,47,1.51403952131466
## P27,6,48,1.51017334277813
## P27,6,49,1.51269213479894
## P27,6,50,1.51098143044165
## P27,7,1,1.51266248226166
## P27,7,2,1.51086904156593
## P27,7,3,1.51191207830854
## P27,7,4,1.51169857240859
## P27,7,5,1.51198775387375
## P27,7,6,1.51175435577951
## P27,7,7,1.51424775347614
## P27,7,8,1.511087032012
## P27,7,9,1.51060769137214
## P27,7,10,1.51336693592209
## P27,7,11,1.50782696620838
## P27,7,12,1.51357517787388
## P27,7,13,1.51136982738972
## P27,7,14,1.51313556999457
## P27,7,15,1.51277445023318
## P27,7,16,1.51051211675008
## P27,7,17,1.51357854062861
## P27,7,18,1.51130567366077
## P27,7,19,1.51162032410502
## P27,7,20,1.51182511949191
## P27,7,21,1.51253863666834
## P27,7,22,1.51127415895462
## P27,7,23,1.51126135405848
## P27,7,24,1.51082256647546
## P27,7,25,1.51201060041785
## P27,7,26,1.51173559954909
## P27,7,27,1.51196997960409
## P27,7,28,1.51028153279445
## P27,7,29,1.50913579066594
## P27,7,30,1.51037927259479
## P27,7,31,1.50921135189153
## P27,7,32,1.51311774216881
## P27,7,33,1.51320920185167
## P27,7,34,1.5094135378036
## P27,7,35,1.51053445439943
## P27,7,36,1.51069279391356
## P27,7,37,1.51199894962889
## P27,7,38,1.50970129300189
## P27,7,39,1.50898786134358
## P27,7,40,1.509585542003
## P27,7,41,1.51021674504647
## P27,7,42,1.51230060595732
## P27,7,43,1.51248984677451
## P27,7,44,1.50951550183473
## P27,7,45,1.51176952704405
## P27,7,46,1.50862059053385
## P27,7,47,1.50680454338298
## P27,7,48,1.51338620005913
## P27,7,49,1.51141788742759
## P27,7,50,1.51032542425489
## P27,8,1,1.51215161651861
## P27,8,2,1.50493257185992
## P27,8,3,1.51173584145236
## P27,8,4,1.51066240858524
## P27,8,5,1.51155614256859
## P27,8,6,1.50904789127287
## P27,8,7,1.51193714141846
## P27,8,8,1.5101086279241
## P27,8,9,1.50967039474069
## P27,8,10,1.51043425559998
## P27,8,11,1.50770768438067
## P27,8,12,1.5118738304485
## P27,8,13,1.51578239518769
## P27,8,14,1.50941108254825
## P27,8,15,1.51303654909134
## P27,8,16,1.50835951891812
## P27,8,17,1.51601202921434
## P27,8,18,1.5092857254876
## P27,8,19,1.51044147893002
## P27,8,20,1.50576769510905
## P27,8,21,1.51107846634297
## P27,8,22,1.50988712310791
## P27,8,23,1.50869558818305
## P27,8,24,1.51243973661352
## P27,8,25,1.51525541211738
## P27,8,26,1.51812788512972
## P27,8,27,1.50795610091266
## P27,8,28,1.5109609506898
## P27,8,29,1.51196232438087
## P27,8,30,1.5084383662154
## P27,8,31,1.51606321334839
## P27,8,32,1.51671241720517
## P27,8,33,1.51198506759385
## P27,8,34,1.51331118020144
## P27,8,35,1.50909393391711
## P27,8,36,1.51016637682915
## P27,8,37,1.50969130059947
## P27,8,38,1.50773976711517
## P27,8,39,1.51584293842316
## P27,8,40,1.51131329933802
## P27,8,41,1.51198023690118
## P27,8,42,1.51233689408553
## P27,8,43,1.51776407349784
## P27,8,44,1.51076876675641
## P27,8,45,1.51034447041953
## P27,8,46,1.5103119503368
## P27,8,47,1.51301098626757
## P27,8,48,1.51142525091404
## P27,8,49,1.51106863334531
## P27,8,50,1.51215466794309
## P27,9,1,1.51210663920251
## P27,9,2,1.51209661695692
## P27,9,3,1.51066919751642
## P27,9,4,1.51159664113471
## P27,9,5,1.51154944829852
## P27,9,6,1.51031318404865
## P27,9,7,1.51232369814051
## P27,9,8,1.50893195564225
## P27,9,9,1.51145013583075
## P27,9,10,1.51102431767295
## P27,9,11,1.51006664949305
## P27,9,12,1.51156302502281
## P27,9,13,1.5116908131065
## P27,9,14,1.50949068983158
## P27,9,15,1.51067787408829
## P27,9,16,1.51095339474757
## P27,9,17,1.50963227872904
## P27,9,18,1.510792925388
## P27,9,19,1.50916595307608
## P27,9,20,1.51077183281503
## P27,9,21,1.509684748322
## P27,9,22,1.51340276544744
## P27,9,23,1.50941584791456
## P27,9,24,1.51092452518011
## P27,9,25,1.51018314134507
## P27,9,26,1.51186162517184
## P27,9,27,1.50970907080663
## P27,9,28,1.5153377441589
## P27,9,29,1.50673136207628
## P27,9,30,1.50926356584253
## P27,9,31,1.51088811102368
## P27,9,32,1.5089090860807
## P27,9,33,1.51130407017873
## P27,9,34,1.50996495996203
## P27,9,35,1.50596869642084
## P27,9,36,1.51279238137332
## P27,9,37,1.50886857668559
## P27,9,38,1.51513129870097
## P27,9,39,1.50982647761703
## P27,9,40,1.51029109954834
## P27,9,41,1.5092279549801
## P27,9,42,1.51041698183332
## P27,9,43,1.5098303483457
## P27,9,44,1.50971083585606
## P27,9,45,1.51026028555793
## P27,9,46,1.50813364982605
## P27,9,47,1.51173801141627
## P27,9,48,1.50785009698434
## P27,9,49,1.51435231316019
## P27,9,50,1.50878725142706
## P27,10,1,1.51134299258797
## P27,10,2,1.51058645117773
## P27,10,3,1.51078888298809
## P27,10,4,1.51139602108278
## P27,10,5,1.5073175647042
## P27,10,6,1.50908764315323
## P27,10,7,1.52185754286937
## P27,10,8,1.5083590582978
## P27,10,9,1.51137456354105
## P27,10,10,1.51186655433315
## P27,10,11,1.51072598403355
## P27,10,12,1.51253944254936
## P27,10,13,1.51197543182993
## P27,10,14,1.50711978530884
## P27,10,15,1.51042647401163
## P27,10,16,1.51835729181767
## P27,10,17,1.50631292083047
## P27,10,18,1.50951868887166
## P27,10,19,1.5080892816186
## P27,10,20,1.50451579301254
## P27,10,21,1.51282794986452
## P27,10,22,1.51045446317704
## P27,10,23,1.50816124728602
## P27,10,24,1.51093250069736
## P27,10,25,1.50870958278919
## P27,10,26,1.51390583473339
## P27,10,27,1.5095601382218
## P27,10,28,1.51146861223074
## P27,10,29,1.51106936136882
## P27,10,30,1.50785728262252
## P27,10,31,1.50967290004094
## P27,10,32,1.5121888046834
## P27,10,33,1.50867914817703
## P27,10,34,1.51281541001563
## P27,10,35,1.51045501064247
## P27,10,36,1.50298727559679
## P27,10,37,1.51775289800045
## P27,10,38,1.50958449973
## P27,10,39,1.50579178149884
## P27,10,40,1.51090206418719
## P27,10,41,1.512682056427
## P27,10,42,1.51034243011475
## P27,10,43,1.51478500061847
## P27,10,44,1.50933450509694
## P27,10,45,1.50796518155507
## P27,10,46,1.50763933215521
## P27,10,47,1.51179261398315
## P27,10,48,1.51056302639476
## P27,10,49,1.50916102014739
## P27,10,50,1.51222338343776
## P28,1,1,1.51084803823215
## P28,1,2,1.50830328038761
## P28,1,3,1.50937317579221
## P28,1,4,1.51117038726807
## P28,1,5,1.49237705128533
## P28,1,6,1.50785081487306
## P28,1,7,1.5154966711998
## P28,1,8,1.51793583663734
## P28,1,9,1.51671878049071
## P28,1,10,1.50171312567306
## P28,1,11,1.50788336879802
## P28,1,12,1.52854557598338
## P28,1,13,1.52229633331299
## P28,1,14,1.50900001915134
## P28,1,15,1.5163034921164
## P28,1,16,1.51149764221706
## P28,1,17,1.51466396331787
## P28,1,18,1.50471137364705
## P28,1,19,1.50447639397212
## P28,1,20,1.5279605161576
## P28,1,21,1.49531201312416
## P28,1,22,1.5142917030736
## P28,1,23,1.49950989505701
## P28,1,24,1.51113163818747
## P28,1,25,1.51073843533876
## P28,1,26,1.51269416213036
## P28,1,27,1.50302937156276
## P28,1,28,1.51898948351542
## P28,1,29,1.50480221299564
## P28,1,30,1.49993523817796
## P28,1,31,1.50877501671774
## P28,1,32,1.50850818349027
## P28,1,33,1.51037220787584
## P28,1,34,1.51322612762451
## P28,1,35,1.50521864714446
## P28,1,36,1.51222181855963
## P28,1,37,1.50662927357656
## P28,1,38,1.50742187426072
## P28,1,39,1.50783493449387
## P28,1,40,1.50982057161568
## P28,1,41,1.50810393995168
## P28,1,42,1.5161076536273
## P28,1,43,1.50114567262413
## P28,1,44,1.51076172179535
## P28,1,45,1.51569767190952
## P28,1,46,1.52175820441473
## P28,1,47,1.50623319124935
## P28,1,48,1.51415551654876
## P28,1,49,1.5129598273712
## P28,1,50,1.50309860126392
## P28,2,1,1.51146549224854
## P28,2,2,1.50916293334961
## P28,2,3,1.50982177958769
## P28,2,4,1.51966378765721
## P28,2,5,1.50129341356682
## P28,2,6,1.51497708084763
## P28,2,7,1.51471438101672
## P28,2,8,1.50380109987761
## P28,2,9,1.50678461456299
## P28,2,10,1.51079682826996
## P28,2,11,1.50703391400012
## P28,2,12,1.5024337363693
## P28,2,13,1.51466336617103
## P28,2,14,1.50654843001239
## P28,2,15,1.51641442360134
## P28,2,16,1.50604602543995
## P28,2,17,1.51180683437147
## P28,2,18,1.50706326841104
## P28,2,19,1.50764480003944
## P28,2,20,1.51098319703499
## P28,2,21,1.52251857977647
## P28,2,22,1.50241305107294
## P28,2,23,1.51279871350243
## P28,2,24,1.5088356271082
## P28,2,25,1.49749876203991
## P28,2,26,1.51118002352507
## P28,2,27,1.5124552280088
## P28,2,28,1.51032888766417
## P28,2,29,1.50728997087057
## P28,2,30,1.51789612997146
## P28,2,31,1.50964876862823
## P28,2,32,1.5113923598309
## P28,2,33,1.51451054486361
## P28,2,34,1.51106828375708
## P28,2,35,1.50690008004506
## P28,2,36,1.5149819676469
## P28,2,37,1.50267598503514
## P28,2,38,1.51611329251387
## P28,2,39,1.51520563088931
## P28,2,40,1.51401139259338
## P28,2,41,1.50403312000915
## P28,2,42,1.51131167187787
## P28,2,43,1.5093279452551
## P28,2,44,1.5126068353653
## P28,2,45,1.50821947217821
## P28,2,46,1.51024230699691
## P28,2,47,1.50105384570449
## P28,2,48,1.50767644895177
## P28,2,49,1.51687344938222
## P28,2,50,1.50524438246516
## P28,3,1,1.51170191620335
## P28,3,2,1.5127521795385
## P28,3,3,1.5056129693985
## P28,3,4,1.49767200392906
## P28,3,5,1.50472550643118
## P28,3,6,1.51287541669958
## P28,3,7,1.50087102254232
## P28,3,8,1.51024191826582
## P28,3,9,1.51191755703517
## P28,3,10,1.51852277725462
## P28,3,11,1.49641780292287
## P28,3,12,1.50313667817549
## P28,3,13,1.51949258168538
## P28,3,14,1.51102241763362
## P28,3,15,1.5041521608013
## P28,3,16,1.50679964032666
## P28,3,17,1.50052195866903
## P28,3,18,1.51059490807202
## P28,3,19,1.51384219607791
## P28,3,20,1.50572698333047
## P28,3,21,1.51514224030755
## P28,3,22,1.49377897712919
## P28,3,23,1.50190084759552
## P28,3,24,1.50690719660591
## P28,3,25,1.51045700123436
## P28,3,26,1.50280053187639
## P28,3,27,1.51085758209229
## P28,3,28,1.5011179809985
## P28,3,29,1.51378323973679
## P28,3,30,1.51074005733027
## P28,3,31,1.51111735754866
## P28,3,32,1.50829622357391
## P28,3,33,1.51323983379614
## P28,3,34,1.5084052916496
## P28,3,35,1.51286299778865
## P28,3,36,1.50936966298897
## P28,3,37,1.50877216970845
## P28,3,38,1.51068153442481
## P28,3,39,1.51512865097292
## P28,3,40,1.5094905288852
## P28,3,41,1.51334705452124
## P28,3,42,1.50929789060957
## P28,3,43,1.50706732923334
## P28,3,44,1.51095598870581
## P28,3,45,1.50529518334762
## P28,3,46,1.50428102677127
## P28,3,47,1.51539417066072
## P28,3,48,1.50803692987032
## P28,3,49,1.51252090835571
## P28,3,50,1.51664318993827
## P28,4,1,1.51521855592728
## P28,4,2,1.50913142596974
## P28,4,3,1.51532259583473
## P28,4,4,1.50839852427577
## P28,4,5,1.50345735630747
## P28,4,6,1.51109080494575
## P28,4,7,1.51072968338891
## P28,4,8,1.50619549082037
## P28,4,9,1.51232878070011
## P28,4,10,1.50549551486969
## P28,4,11,1.50397649678317
## P28,4,12,1.51071661638926
## P28,4,13,1.51195854872045
## P28,4,14,1.50367347184602
## P28,4,15,1.51366707553034
## P28,4,16,1.51078465336659
## P28,4,17,1.50209949290858
## P28,4,18,1.51343626569408
## P28,4,19,1.50896049782082
## P28,4,20,1.52338187462461
## P28,4,21,1.50304515866468
## P28,4,22,1.5137287327941
## P28,4,23,1.51165290500807
## P28,4,24,1.51071040791676
## P28,4,25,1.50778445111045
## P28,4,26,1.5141478160332
## P28,4,27,1.50832578434664
## P28,4,28,1.50833289763507
## P28,4,29,1.49995554143732
## P28,4,30,1.5090472275211
## P28,4,31,1.51090599695841
## P28,4,32,1.51820268965604
## P28,4,33,1.50619209359545
## P28,4,34,1.51286648114522
## P28,4,35,1.51506053722971
## P28,4,36,1.50437832514445
## P28,4,37,1.51067056535166
## P28,4,38,1.51128019332886
## P28,4,39,1.51196492296978
## P28,4,40,1.51392276837276
## P28,4,41,1.50194804919393
## P28,4,42,1.50719824882403
## P28,4,43,1.50965722401937
## P28,4,44,1.51079046364987
## P28,4,45,1.51095525423686
## P28,4,46,1.50733832446012
## P28,4,47,1.51274544050714
## P28,4,48,1.50906352903329
## P28,4,49,1.51304348994946
## P28,4,50,1.50756653448693
## P28,5,1,1.51031863545797
## P28,5,2,1.50926607767741
## P28,5,3,1.51239404799063
## P28,5,4,1.51170893790017
## P28,5,5,1.50956599528973
## P28,5,6,1.51197910805543
## P28,5,7,1.50942227575514
## P28,5,8,1.51261409899084
## P28,5,9,1.50212613645806
## P28,5,10,1.51723074913025
## P28,5,11,1.50699407879899
## P28,5,12,1.51376163042509
## P28,5,13,1.5088393188292
## P28,5,14,1.51076460838318
## P28,5,15,1.5138946238572
## P28,5,16,1.50869401454926
## P28,5,17,1.51058042396619
## P28,5,18,1.5106123643262
## P28,5,19,1.50892293032478
## P28,5,20,1.50950805346171
## P28,5,21,1.50995746933588
## P28,5,22,1.5034404320292
## P28,5,23,1.50277375283642
## P28,5,24,1.51367222059757
## P28,5,25,1.51007950436938
## P28,5,26,1.51027164134112
## P28,5,27,1.51377629366788
## P28,5,28,1.5097131729126
## P28,5,29,1.50955701219863
## P28,5,30,1.51505462405751
## P28,5,31,1.51168912854688
## P28,5,32,1.512300900791
## P28,5,33,1.51269127073742
## P28,5,34,1.5059297360872
## P28,5,35,1.5110763667785
## P28,5,36,1.50507513826544
## P28,5,37,1.5129413171248
## P28,5,38,1.51123751482917
## P28,5,39,1.51165435948503
## P28,5,40,1.50657058373476
## P28,5,41,1.51223087310791
## P28,5,42,1.50673924173628
## P28,5,43,1.51116692200872
## P28,5,44,1.50832587845471
## P28,5,45,1.50948695168979
## P28,5,46,1.51108951038784
## P28,5,47,1.50876088309706
## P28,5,48,1.50630559487776
## P28,5,49,1.51340138687278
## P28,5,50,1.51235937340859
## P28,6,1,1.51158156323789
## P28,6,2,1.506660538335
## P28,6,3,1.51277982795631
## P28,6,4,1.50227224212332
## P28,6,5,1.51253130476354
## P28,6,6,1.51212830977006
## P28,6,7,1.50929171509213
## P28,6,8,1.51211003065109
## P28,6,9,1.50429360071818
## P28,6,10,1.50907079455922
## P28,6,11,1.51201732474637
## P28,6,12,1.49277188380559
## P28,6,13,1.52127475469885
## P28,6,14,1.50252460298084
## P28,6,15,1.50825346896523
## P28,6,16,1.51138142399166
## P28,6,17,1.51180944442749
## P28,6,18,1.50836667308101
## P28,6,19,1.50911976007315
## P28,6,20,1.50692696924563
## P28,6,21,1.51269667595625
## P28,6,22,1.51101855777559
## P28,6,23,1.50921317150718
## P28,6,24,1.5051371120825
## P28,6,25,1.5102086687088
## P28,6,26,1.5070079551346
## P28,6,27,1.51002636584607
## P28,6,28,1.50850887140952
## P28,6,29,1.51086919408449
## P28,6,30,1.50961040195666
## P28,6,31,1.51205995829418
## P28,6,32,1.48676030607109
## P28,6,33,1.53017520422887
## P28,6,34,1.50691852470239
## P28,6,35,1.49649782395095
## P28,6,36,1.53156679868698
## P28,6,37,1.50781542294985
## P28,6,38,1.50908314904501
## P28,6,39,1.51035871051607
## P28,6,40,1.50735622463804
## P28,6,41,1.51005083439397
## P28,6,42,1.50352746667996
## P28,6,43,1.51213193358037
## P28,6,44,1.50976225657341
## P28,6,45,1.5100095476423
## P28,6,46,1.50579197823055
## P28,6,47,1.5147075711945
## P28,6,48,1.51116660789207
## P28,6,49,1.50237591777529
## P28,6,50,1.51035102526347
## P28,7,1,1.50851013010198
## P28,7,2,1.51167759263372
## P28,7,3,1.49947460492452
## P28,7,4,1.51942903487409
## P28,7,5,1.5080794956949
## P28,7,6,1.50535649320354
## P28,7,7,1.49955807505427
## P28,7,8,1.51942105563182
## P28,7,9,1.50675237880034
## P28,7,10,1.50763384033652
## P28,7,11,1.50456252730036
## P28,7,12,1.49522904788747
## P28,7,13,1.5207709312439
## P28,7,14,1.51123337518601
## P28,7,15,1.50983430765852
## P28,7,16,1.5035476287206
## P28,7,17,1.51431453090975
## P28,7,18,1.51381414435631
## P28,7,19,1.50522314827397
## P28,7,20,1.50700216770172
## P28,7,21,1.51004812329314
## P28,7,22,1.51553281408842
## P28,7,23,1.50684188206991
## P28,7,24,1.51946312882179
## P28,7,25,1.50862198006617
## P28,7,26,1.49078414916992
## P28,7,27,1.50026722877256
## P28,7,28,1.52552435709083
## P28,7,29,1.50728329634055
## P28,7,30,1.51440374778979
## P28,7,31,1.50103455431321
## P28,7,32,1.51254075307112
## P28,7,33,1.51376671344042
## P28,7,34,1.52077094078064
## P28,7,35,1.51342595815659
## P28,7,36,1.50165438144765
## P28,7,37,1.50787686287089
## P28,7,38,1.51519957314367
## P28,7,39,1.5073594104412
## P28,7,40,1.51079535050826
## P28,7,41,1.5081938774355
## P28,7,42,1.51345770467411
## P28,7,43,1.51206973620823
## P28,7,44,1.50823709624154
## P28,7,45,1.50832345485687
## P28,7,46,1.51073952938648
## P28,7,47,1.49575648636654
## P28,7,48,1.52820281815111
## P28,7,49,1.49972073237101
## P28,7,50,1.50810107283705
## P28,8,1,1.50454294883599
## P28,8,2,1.51342519311344
## P28,8,3,1.51374373965793
## P28,8,4,1.49942188021503
## P28,8,5,1.52542095690702
## P28,8,6,1.49995894942965
## P28,8,7,1.51428900198503
## P28,8,8,1.5048381752438
## P28,8,9,1.51116482416789
## P28,8,10,1.51612489564078
## P28,8,11,1.5078720496251
## P28,8,12,1.5088772892952
## P28,8,13,1.51134850486876
## P28,8,14,1.50995306101712
## P28,8,15,1.50954531659984
## P28,8,16,1.51036515361384
## P28,8,17,1.50679585290334
## P28,8,18,1.50392087813347
## P28,8,19,1.51234229067539
## P28,8,20,1.50777793574978
## P28,8,21,1.51218112898462
## P28,8,22,1.51060986231609
## P28,8,23,1.51097935148813
## P28,8,24,1.50862557093302
## P28,8,25,1.50856793758481
## P28,8,26,1.5193246399484
## P28,8,27,1.50833990898999
## P28,8,28,1.50558795569078
## P28,8,29,1.51852795410156
## P28,8,30,1.510392986238
## P28,8,31,1.50725909910704
## P28,8,32,1.50477850437164
## P28,8,33,1.52302187861818
## P28,8,34,1.50326991567806
## P28,8,35,1.52012906309034
## P28,8,36,1.50728891805275
## P28,8,37,1.51505966186523
## P28,8,38,1.5104236001367
## P28,8,39,1.50727805153268
## P28,8,40,1.51517084188629
## P28,8,41,1.51172641504591
## P28,8,42,1.52077580220772
## P28,8,43,1.50012552889088
## P28,8,44,1.50392905525539
## P28,8,45,1.52244179663451
## P28,8,46,1.51344796444507
## P28,8,47,1.50291105552956
## P28,8,48,1.52180831887749
## P28,8,49,1.50096529621189
## P28,8,50,1.51036511910589
## P28,9,1,1.51235479941735
## P28,9,2,1.51204499831566
## P28,9,3,1.50990453958511
## P28,9,4,1.50391192214434
## P28,9,5,1.51113598163311
## P28,9,6,1.50774353049522
## P28,9,7,1.51034704376669
## P28,9,8,1.5078621515086
## P28,9,9,1.50910715471234
## P28,9,10,1.50868129730225
## P28,9,11,1.50796559277703
## P28,9,12,1.51308885178009
## P28,9,13,1.5092552947998
## P28,9,14,1.51005953695716
## P28,9,15,1.50771661031814
## P28,9,16,1.52023380067613
## P28,9,17,1.51231843492259
## P28,9,18,1.51876036800555
## P28,9,19,1.51105790979722
## P28,9,20,1.50838960068566
## P28,9,21,1.51092760703143
## P28,9,22,1.51129933446646
## P28,9,23,1.51155614852905
## P28,9,24,1.51082564509192
## P28,9,25,1.50659121916844
## P28,9,26,1.52289865103113
## P28,9,27,1.50711042616102
## P28,9,28,1.51145915985107
## P28,9,29,1.50943985439482
## P28,9,30,1.50915104226221
## P28,9,31,1.51066431072023
## P28,9,32,1.5106195490411
## P28,9,33,1.50937269415174
## P28,9,34,1.51125561563592
## P28,9,35,1.51342607854487
## P28,9,36,1.51202553861281
## P28,9,37,1.50864760080973
## P28,9,38,1.51166879299075
## P28,9,39,1.50607037785077
## P28,9,40,1.52044867347268
## P28,9,41,1.50798539286074
## P28,9,42,1.51079082864476
## P28,9,43,1.50786446673529
## P28,9,44,1.51137150355748
## P28,9,45,1.51061257486758
## P28,9,46,1.51024501365528
## P28,9,47,1.50866069045721
## P28,9,48,1.50593872700841
## P28,9,49,1.52092274335714
## P28,9,50,1.50920844783444
## P28,10,1,1.52493013739586
## P28,10,2,1.50643594580961
## P28,10,3,1.5121934136679
## P28,10,4,1.50905118942261
## P28,10,5,1.50719547934002
## P28,10,6,1.51149078857067
## P28,10,7,1.50717806521757
## P28,10,8,1.5103105584236
## P28,10,9,1.51184786343184
## P28,10,10,1.50896084729363
## P28,10,11,1.50799187880296
## P28,10,12,1.51061957223075
## P28,10,13,1.51138859806639
## P28,10,14,1.50834686364701
## P28,10,15,1.51771184169885
## P28,10,16,1.50982494876809
## P28,10,17,1.48763517652239
## P28,10,18,1.52395655657794
## P28,10,19,1.51047308414013
## P28,10,20,1.50336856842041
## P28,10,21,1.51461068666898
## P28,10,22,1.51089736510967
## P28,10,23,1.50729760078535
## P28,10,24,1.51544152444868
## P28,10,25,1.5052596728007
## P28,10,26,1.50930659564925
## P28,10,27,1.51133567094803
## P28,10,28,1.51109659671783
## P28,10,29,1.50766908155905
## P28,10,30,1.5110533787654
## P28,10,31,1.50837651166049
## P28,10,32,1.51325829532168
## P28,10,33,1.50832129026714
## P28,10,34,1.50976872221332
## P28,10,35,1.50824783089456
## P28,10,36,1.51053900718689
## P28,10,37,1.51075967498448
## P28,10,38,1.51225457939447
## P28,10,39,1.50864927839525
## P28,10,40,1.50929963335078
## P28,10,41,1.50699799269148
## P28,10,42,1.50838161044651
## P28,10,43,1.50609335202849
## P28,10,44,1.50989446640015
## P28,10,45,1.50999289383123
## P28,10,46,1.50861246544018
## P28,10,47,1.51391466547934
## P28,10,48,1.50807807228782
## P28,10,49,1.50944431112447
## P28,10,50,1.50875644220246
## P29,1,1,1.50963675722163
## P29,1,2,1.50826191651194
## P29,1,3,1.51383101609018
## P29,1,4,1.51548690626607
## P29,1,5,1.51331543311095
## P29,1,6,1.51689794042089
## P29,1,7,1.50994194738123
## P29,1,8,1.5095520456632
## P29,1,9,1.51530479651231
## P29,1,10,1.51205364227295
## P29,1,11,1.51406374871731
## P29,1,12,1.513471291797
## P29,1,13,1.50782095758538
## P29,1,14,1.51446945667267
## P29,1,15,1.50877618789673
## P29,1,16,1.51493433051639
## P29,1,17,1.51257104167232
## P29,1,18,1.51276108526414
## P29,1,19,1.51174117069618
## P29,1,20,1.50929140611128
## P29,1,21,1.51154430638189
## P29,1,22,1.50932414391462
## P29,1,23,1.50996285526692
## P29,1,24,1.50919366261316
## P29,1,25,1.50963731987836
## P29,1,26,1.51167362531026
## P29,1,27,1.51432561372456
## P29,1,28,1.5053214819535
## P29,1,29,1.51301813398089
## P29,1,30,1.51326581908435
## P29,1,31,1.51421456777749
## P29,1,32,1.50848058915474
## P29,1,33,1.50939073466291
## P29,1,34,1.51567493686239
## P29,1,35,1.51101169332994
## P29,1,36,1.51426833523206
## P29,1,37,1.51360418941035
## P29,1,38,1.50383661073797
## P29,1,39,1.51192874800075
## P29,1,40,1.51044120497376
## P29,1,41,1.51455838591964
## P29,1,42,1.51696796055082
## P29,1,43,1.50339956925466
## P29,1,44,1.51653943891111
## P29,1,45,1.51134554894416
## P29,1,46,1.51426920890808
## P29,1,47,1.52107928128078
## P29,1,48,1.50539822150499
## P29,1,49,1.51099611883578
## P29,1,50,1.51272642363065
## P29,2,1,1.51095064372233
## P29,2,2,1.51394219294082
## P29,2,3,1.50812396382898
## P29,2,4,1.51156056976318
## P29,2,5,1.51237231902494
## P29,2,6,1.51331606041006
## P29,2,7,1.51295336446454
## P29,2,8,1.51085124296301
## P29,2,9,1.51131738827923
## P29,2,10,1.51745356593216
## P29,2,11,1.51145225563305
## P29,2,12,1.51472997665405
## P29,2,13,1.513126059184
## P29,2,14,1.51141783075595
## P29,2,15,1.51300558218589
## P29,2,16,1.51275221039267
## P29,2,17,1.50982655127217
## P29,2,18,1.51684238305732
## P29,2,19,1.51264580965042
## P29,2,20,1.51223726499648
## P29,2,21,1.51277589797974
## P29,2,22,1.50737191725147
## P29,2,23,1.51021020258627
## P29,2,24,1.51366094648838
## P29,2,25,1.50712014336622
## P29,2,26,1.5117828392401
## P29,2,27,1.51310230761158
## P29,2,28,1.5085576105926
## P29,2,29,1.51178892408098
## P29,2,30,1.51177911223652
## P29,2,31,1.51031151472353
## P29,2,32,1.50646917747729
## P29,2,33,1.51235936755783
## P29,2,34,1.51202506392542
## P29,2,35,1.51088514956799
## P29,2,36,1.51296977311867
## P29,2,37,1.51175405541245
## P29,2,38,1.50978992666517
## P29,2,39,1.51693899929523
## P29,2,40,1.51341815057554
## P29,2,41,1.50943792131212
## P29,2,42,1.51383764364503
## P29,2,43,1.51377059618632
## P29,2,44,1.51594858858959
## P29,2,45,1.51722946987357
## P29,2,46,1.5053606784507
## P29,2,47,1.5174524029599
## P29,2,48,1.51127992692541
## P29,2,49,1.51336830854416
## P29,2,50,1.51044277354649
## P29,3,1,1.5124021702864
## P29,3,2,1.51320007768008
## P29,3,3,1.51151999616935
## P29,3,4,1.51211883848077
## P29,3,5,1.50927677860966
## P29,3,6,1.51756945911207
## P29,3,7,1.50502591814314
## P29,3,8,1.51757565978306
## P29,3,9,1.51106038543413
## P29,3,10,1.51238353377894
## P29,3,11,1.51107019489094
## P29,3,12,1.51468717761156
## P29,3,13,1.51177921800902
## P29,3,14,1.51384799600505
## P29,3,15,1.51040429559373
## P29,3,16,1.51216708551539
## P29,3,17,1.51569800870172
## P29,3,18,1.51119963645935
## P29,3,19,1.51199698704545
## P29,3,20,1.51294409381887
## P29,3,21,1.51089561235655
## P29,3,22,1.51424837112427
## P29,3,23,1.5109742231991
## P29,3,24,1.51254040507947
## P29,3,25,1.5144224933811
## P29,3,26,1.50698586872646
## P29,3,27,1.51176023483276
## P29,3,28,1.51200577791999
## P29,3,29,1.50987302272692
## P29,3,30,1.51372094308176
## P29,3,31,1.50906916225658
## P29,3,32,1.51222420533498
## P29,3,33,1.51396615281064
## P29,3,34,1.51010792098776
## P29,3,35,1.51026903808891
## P29,3,36,1.50997736143029
## P29,3,37,1.50651164702427
## P29,3,38,1.51325010104352
## P29,3,39,1.51188730024824
## P29,3,40,1.5141644821167
## P29,3,41,1.50996326328663
## P29,3,42,1.50967709973173
## P29,3,43,1.51181785366203
## P29,3,44,1.51237453416336
## P29,3,45,1.51092747366352
## P29,3,46,1.51034475666608
## P29,3,47,1.5138523910619
## P29,3,48,1.51559109804107
## P29,3,49,1.51016278905193
## P29,3,50,1.51110259188426
## P29,4,1,1.50128280321757
## P29,4,2,1.51111081751381
## P29,4,3,1.51031263831521
## P29,4,4,1.51099232061585
## P29,4,5,1.51060806001936
## P29,4,6,1.51116845633957
## P29,4,7,1.51038722172837
## P29,4,8,1.51281171251637
## P29,4,9,1.51153850803773
## P29,4,10,1.51035951059076
## P29,4,11,1.5114708954526
## P29,4,12,1.5117226991898
## P29,4,13,1.50962114626645
## P29,4,14,1.51126890277388
## P29,4,15,1.51506935004835
## P29,4,16,1.50822720673407
## P29,4,17,1.51756518289923
## P29,4,18,1.51095565550166
## P29,4,19,1.5117699162877
## P29,4,20,1.50958507582986
## P29,4,21,1.50771812675825
## P29,4,22,1.50895728462044
## P29,4,23,1.51196037417781
## P29,4,24,1.51127930888979
## P29,4,25,1.5113772948583
## P29,4,26,1.51492179234823
## P29,4,27,1.51148949278162
## P29,4,28,1.51263371590645
## P29,4,29,1.51040015901838
## P29,4,30,1.51078947547342
## P29,4,31,1.51404937676021
## P29,4,32,1.50966067158658
## P29,4,33,1.51126226682342
## P29,4,34,1.51074701783347
## P29,4,35,1.51169208052811
## P29,4,36,1.51276225570246
## P29,4,37,1.51392730860643
## P29,4,38,1.5105099191471
## P29,4,39,1.50904919737476
## P29,4,40,1.51185954734683
## P29,4,41,1.50881450684344
## P29,4,42,1.51066407050876
## P29,4,43,1.50938040018082
## P29,4,44,1.51128615651812
## P29,4,45,1.50789050317146
## P29,4,46,1.51160117127429
## P29,4,47,1.51144575586124
## P29,4,48,1.51188498735428
## P29,4,49,1.51064074666877
## P29,4,50,1.51156639671165
## P29,5,1,1.50927368891722
## P29,5,2,1.51271158106187
## P29,5,3,1.51478402715334
## P29,5,4,1.51108566352299
## P29,5,5,1.51125996744531
## P29,5,6,1.51150924296467
## P29,5,7,1.50976105596198
## P29,5,8,1.51190969367432
## P29,5,9,1.50917829937405
## P29,5,10,1.51081618240901
## P29,5,11,1.51122565225724
## P29,5,12,1.51366318008046
## P29,5,13,1.51285342375437
## P29,5,14,1.50937718097295
## P29,5,15,1.51193905252171
## P29,5,16,1.51068069194925
## P29,5,17,1.51077484797282
## P29,5,18,1.51183381080627
## P29,5,19,1.51141910841971
## P29,5,20,1.51060384898991
## P29,5,21,1.50954361884825
## P29,5,22,1.51125489987009
## P29,5,23,1.51146551200322
## P29,5,24,1.51185817783382
## P29,5,25,1.5104421206883
## P29,5,26,1.51049675301808
## P29,5,27,1.51768688945209
## P29,5,28,1.51249319176341
## P29,5,29,1.50993670486822
## P29,5,30,1.50999055410686
## P29,5,31,1.51030428513237
## P29,5,32,1.51205854109902
## P29,5,33,1.51038103354605
## P29,5,34,1.51157484395163
## P29,5,35,1.51215200824337
## P29,5,36,1.51085076539413
## P29,5,37,1.5116497415011
## P29,5,38,1.520524953541
## P29,5,39,1.51115012168884
## P29,5,40,1.51040724805883
## P29,5,41,1.51134589793151
## P29,5,42,1.51192663432835
## P29,5,43,1.51039201066694
## P29,5,44,1.510386090387
## P29,5,45,1.51043098869053
## P29,5,46,1.51090657711029
## P29,5,47,1.50863937584751
## P29,5,48,1.51525622322446
## P29,5,49,1.51098981048122
## P29,5,50,1.51197061434848
## P29,6,1,1.51282570518066
## P29,6,2,1.51296876746917
## P29,6,3,1.51385059456031
## P29,6,4,1.51250458375002
## P29,6,5,1.51300194219578
## P29,6,6,1.51333017985026
## P29,6,7,1.51172091352179
## P29,6,8,1.51187639508929
## P29,6,9,1.51316076648393
## P29,6,10,1.51228994099882
## P29,6,11,1.5117815671823
## P29,6,12,1.5098296661003
## P29,6,13,1.51001801808675
## P29,6,14,1.51184080305143
## P29,6,15,1.51237772016102
## P29,6,16,1.51289763669858
## P29,6,17,1.51241874908653
## P29,6,18,1.51653197055727
## P29,6,19,1.51102697036483
## P29,6,20,1.51158338090393
## P29,6,21,1.5118095677927
## P29,6,22,1.51085112623112
## P29,6,23,1.51201639237342
## P29,6,24,1.51055271834272
## P29,6,25,1.51068731557543
## P29,6,26,1.510611613983
## P29,6,27,1.51076603658272
## P29,6,28,1.5116967967387
## P29,6,29,1.51029394080602
## P29,6,30,1.5106628658951
## P29,6,31,1.51431873368054
## P29,6,32,1.51092266328264
## P29,6,33,1.51079360580444
## P29,6,34,1.51095104762486
## P29,6,35,1.51177716506155
## P29,6,36,1.5113385774756
## P29,6,37,1.5111322464881
## P29,6,38,1.51182806308453
## P29,6,39,1.51268710573036
## P29,6,40,1.50984827774327
## P29,6,41,1.5095772894602
## P29,6,42,1.51117182547046
## P29,6,43,1.51109926209195
## P29,6,44,1.5127830238609
## P29,6,45,1.51008074146927
## P29,6,46,1.51002105985369
## P29,6,47,1.51519958350969
## P29,6,48,1.51036303316183
## P29,6,49,1.51042509407833
## P29,6,50,1.51201792997472
## P29,7,1,1.51097229108289
## P29,7,2,1.51054303472934
## P29,7,3,1.5116130527437
## P29,7,4,1.51185997169797
## P29,7,5,1.51256426214585
## P29,7,6,1.51167005465176
## P29,7,7,1.50713073781558
## P29,7,8,1.51052608279233
## P29,7,9,1.51215474522529
## P29,7,10,1.51003439802872
## P29,7,11,1.51298137124815
## P29,7,12,1.50991879651944
## P29,7,13,1.51230725744889
## P29,7,14,1.51122472253263
## P29,7,15,1.51113693854388
## P29,7,16,1.50502753041007
## P29,7,17,1.51523820376067
## P29,7,18,1.5098498009219
## P29,7,19,1.5107525969864
## P29,7,20,1.51047761099679
## P29,7,21,1.51227946497088
## P29,7,22,1.51162946727914
## P29,7,23,1.51047925569525
## P29,7,24,1.51122380495071
## P29,7,25,1.51096309865187
## P29,7,26,1.51177051116009
## P29,7,27,1.51319844871046
## P29,7,28,1.51067089566997
## P29,7,29,1.51196100676588
## P29,7,30,1.50977689149428
## P29,7,31,1.51095454818324
## P29,7,32,1.50858831116647
## P29,7,33,1.51279436591213
## P29,7,34,1.5123785028907
## P29,7,35,1.50903074168626
## P29,7,36,1.51080247002679
## P29,7,37,1.51146084168998
## P29,7,38,1.51230721975628
## P29,7,39,1.5124681747123
## P29,7,40,1.50934239138256
## P29,7,41,1.51059732108281
## P29,7,42,1.51161502918024
## P29,7,43,1.51220229109363
## P29,7,44,1.5103860930963
## P29,7,45,1.51034797443433
## P29,7,46,1.51068799635943
## P29,7,47,1.51100142704958
## P29,7,48,1.50924493498721
## P29,7,49,1.51057690452127
## P29,7,50,1.51175516551206
## P29,8,1,1.51157292524974
## P29,8,2,1.51205477949049
## P29,8,3,1.51121755481995
## P29,8,4,1.51005308081706
## P29,8,5,1.51268927256266
## P29,8,6,1.51497104612447
## P29,8,7,1.50930260007198
## P29,8,8,1.51083179443113
## P29,8,9,1.51138538580674
## P29,8,10,1.51131069115576
## P29,8,11,1.51162661955907
## P29,8,12,1.50885041472838
## P29,8,13,1.51185239082159
## P29,8,14,1.51061571212042
## P29,8,15,1.51100013244092
## P29,8,16,1.51063591090556
## P29,8,17,1.50807987978011
## P29,8,18,1.51343512033161
## P29,8,19,1.50903380358661
## P29,8,20,1.51040834593541
## P29,8,21,1.50865439466528
## P29,8,22,1.50989202152599
## P29,8,23,1.50840060271364
## P29,8,24,1.51114215077581
## P29,8,25,1.51040919356876
## P29,8,26,1.50982989696477
## P29,8,27,1.50891919387014
## P29,8,28,1.50912640253703
## P29,8,29,1.51319874053033
## P29,8,30,1.51116672046682
## P29,8,31,1.51358675084463
## P29,8,32,1.50994455749924
## P29,8,33,1.51268742349413
## P29,8,34,1.50990968910423
## P29,8,35,1.51013812786195
## P29,8,36,1.51213580777186
## P29,8,37,1.50473687901843
## P29,8,38,1.51805852784051
## P29,8,39,1.51030796535766
## P29,8,40,1.5099730403335
## P29,8,41,1.51107491963152
## P29,8,42,1.50944114443082
## P29,8,43,1.51451709053733
## P29,8,44,1.50879412097531
## P29,8,45,1.51235676407814
## P29,8,46,1.51065690627951
## P29,8,47,1.51135644970871
## P29,8,48,1.50893450094983
## P29,8,49,1.51154251038274
## P29,8,50,1.5110930954446
## P29,9,1,1.51045844256878
## P29,9,2,1.51082209368658
## P29,9,3,1.51217514014094
## P29,9,4,1.51067543581042
## P29,9,5,1.51293145055356
## P29,9,6,1.50854136149089
## P29,9,7,1.51037417609116
## P29,9,8,1.50934241034768
## P29,9,9,1.51175435868705
## P29,9,10,1.51037203399829
## P29,9,11,1.51270891189575
## P29,9,12,1.51105675464723
## P29,9,13,1.5099321189134
## P29,9,14,1.50916486846076
## P29,9,15,1.50959148289967
## P29,9,16,1.51759079760975
## P29,9,17,1.50942099830251
## P29,9,18,1.51236288156887
## P29,9,19,1.51070146776189
## P29,9,20,1.51143819285977
## P29,9,21,1.51075170910548
## P29,9,22,1.51146068812916
## P29,9,23,1.51076201113259
## P29,9,24,1.51117919019596
## P29,9,25,1.50889726652615
## P29,9,26,1.51151531307321
## P29,9,27,1.50932325766637
## P29,9,28,1.51064191593064
## P29,9,29,1.51107184092204
## P29,9,30,1.51135235898038
## P29,9,31,1.51094887726498
## P29,9,32,1.50969130405481
## P29,9,33,1.51078069051107
## P29,9,34,1.51116457055597
## P29,9,35,1.51195525809338
## P29,9,36,1.50976740091275
## P29,9,37,1.51175069493174
## P29,9,38,1.50891644743424
## P29,9,39,1.50904066930681
## P29,9,40,1.51356794479045
## P29,9,41,1.51028056744018
## P29,9,42,1.51024041456335
## P29,9,43,1.50863497944201
## P29,9,44,1.51141573962043
## P29,9,45,1.50452388307583
## P29,9,46,1.51229435891816
## P29,9,47,1.50955073198481
## P29,9,48,1.51099668918772
## P29,9,49,1.51095849398909
## P29,9,50,1.5112781027089
## P29,10,1,1.51236098745595
## P29,10,2,1.50796405892623
## P29,10,3,1.51039143642747
## P29,10,4,1.51315738814218
## P29,10,5,1.50698595879062
## P29,10,6,1.51468496573599
## P29,10,7,1.50865186177767
## P29,10,8,1.51185340147752
## P29,10,9,1.5101906618626
## P29,10,10,1.51074529658852
## P29,10,11,1.51091933804889
## P29,10,12,1.51202278579308
## P29,10,13,1.51286198695501
## P29,10,14,1.5116353933362
## P29,10,15,1.50903583552739
## P29,10,16,1.5109885831033
## P29,10,17,1.51670506394025
## P29,10,18,1.50802589717664
## P29,10,19,1.5114016811343
## P29,10,20,1.51190986856818
## P29,10,21,1.50821933150291
## P29,10,22,1.51149393421735
## P29,10,23,1.51207619476318
## P29,10,24,1.50971146761361
## P29,10,25,1.51135957505968
## P29,10,26,1.51049390407877
## P29,10,27,1.51038937835219
## P29,10,28,1.51310491272897
## P29,10,29,1.51200505097707
## P29,10,30,1.51093711644194
## P29,10,31,1.50985773566629
## P29,10,32,1.51182005421215
## P29,10,33,1.51148592609249
## P29,10,34,1.50906965692165
## P29,10,35,1.51339398975104
## P29,10,36,1.50747172491891
## P29,10,37,1.51573958949766
## P29,10,38,1.51246846639193
## P29,10,39,1.51012046358227
## P29,10,40,1.51144394024398
## P29,10,41,1.50917233802654
## P29,10,42,1.50823954878182
## P29,10,43,1.51281539599101
## P29,10,44,1.50918242738054
## P29,10,45,1.51022803226364
## P29,10,46,1.50742132735975
## P29,10,47,1.51079084741788
## P29,10,48,1.51119706904994
## P29,10,49,1.51055931822162
## P29,10,50,1.51016055065322
## P30,1,1,1.51105051262434
## P30,1,2,1.5109960342122
## P30,1,3,1.50670858957235
## P30,1,4,1.51367159450755
## P30,1,5,1.51336443146994
## P30,1,6,1.51375565647094
## P30,1,7,1.50202857231607
## P30,1,8,1.50198008151765
## P30,1,9,1.48981593386962
## P30,1,10,1.51070905454231
## P30,1,11,1.51020953484944
## P30,1,12,1.51206842930086
## P30,1,13,1.51147777101268
## P30,1,14,1.51020713079543
## P30,1,15,1.50695678922865
## P30,1,16,1.51056203671864
## P30,1,17,1.51334538459778
## P30,1,18,1.50983869112455
## P30,1,19,1.50790890132155
## P30,1,20,1.5118855876582
## P30,1,21,1.51113813772969
## P30,1,22,1.50874636769295
## P30,1,23,1.50876203510496
## P30,1,24,1.50981390114987
## P30,1,25,1.51252181662454
## P30,1,26,1.51228173908434
## P30,1,27,1.51175597843371
## P30,1,28,1.51339908123016
## P30,1,29,1.50822128251541
## P30,1,30,1.5123476429262
## P30,1,31,1.51011920226248
## P30,1,32,1.51119503804616
## P30,1,33,1.50969185010351
## P30,1,34,1.51425292445164
## P30,1,35,1.51161825656891
## P30,1,36,1.51016413647196
## P30,1,37,1.50975192876963
## P30,1,38,1.50991460680962
## P30,1,39,1.51275177248593
## P30,1,40,1.51590113412766
## P30,1,41,1.50779472751382
## P30,1,42,1.51188560407989
## P30,1,43,1.50882561365763
## P30,1,44,1.50920716038457
## P30,1,45,1.50957222779592
## P30,1,46,1.51306834973787
## P30,1,47,1.51212048857179
## P30,1,48,1.50692607210828
## P30,1,49,1.51041814528014
## P30,1,50,1.51175728359738
## P30,2,1,1.51103026259179
## P30,2,2,1.51068429010255
## P30,2,3,1.51352843736347
## P30,2,4,1.51132015559984
## P30,2,5,1.5131286076137
## P30,2,6,1.51147169333238
## P30,2,7,1.51242485752812
## P30,2,8,1.5091760456562
## P30,2,9,1.51205691424283
## P30,2,10,1.5098138733914
## P30,2,11,1.51263372633192
## P30,2,12,1.51592553745617
## P30,2,13,1.51274613446968
## P30,2,14,1.51156906286875
## P30,2,15,1.50762380680568
## P30,2,16,1.51083694185529
## P30,2,17,1.514061027103
## P30,2,18,1.50760809889117
## P30,2,19,1.5110721641712
## P30,2,20,1.51301822879098
## P30,2,21,1.51278864420377
## P30,2,22,1.50959972188443
## P30,2,23,1.51024040755104
## P30,2,24,1.51258634819704
## P30,2,25,1.5050117028387
## P30,2,26,1.51010802435496
## P30,2,27,1.51777229657987
## P30,2,28,1.51342679560184
## P30,2,29,1.50252048592818
## P30,2,30,1.50978347490419
## P30,2,31,1.50486932081335
## P30,2,32,1.51237657222342
## P30,2,33,1.50921805699666
## P30,2,34,1.51444402947483
## P30,2,35,1.51128766594864
## P30,2,36,1.51133470856742
## P30,2,37,1.50948050378383
## P30,2,38,1.51034122813832
## P30,2,39,1.51623649328527
## P30,2,40,1.51015032778729
## P30,2,41,1.51127491068484
## P30,2,42,1.50497135202935
## P30,2,43,1.51105073472144
## P30,2,44,1.51071886820336
## P30,2,45,1.51207979520162
## P30,2,46,1.51137105957801
## P30,2,47,1.51207594993787
## P30,2,48,1.50905202782672
## P30,2,49,1.50920420723992
## P30,2,50,1.49828783671061
## P30,3,1,1.51238752073712
## P30,3,2,1.5121482580136
## P30,3,3,1.51221445628575
## P30,3,4,1.51387796401978
## P30,3,5,1.50986504176306
## P30,3,6,1.51146760739778
## P30,3,7,1.5164537265383
## P30,3,8,1.50796821767634
## P30,3,9,1.50986129162358
## P30,3,10,1.51098071569684
## P30,3,11,1.5109233387181
## P30,3,12,1.50955676017924
## P30,3,13,1.50837771788887
## P30,3,14,1.50948052570738
## P30,3,15,1.51432320609022
## P30,3,16,1.50580574274063
## P30,3,17,1.51189418337238
## P30,3,18,1.51020851913764
## P30,3,19,1.51114498014035
## P30,3,20,1.51161918816743
## P30,3,21,1.50945272116825
## P30,3,22,1.51287937164307
## P30,3,23,1.50796089172363
## P30,3,24,1.50945583979289
## P30,3,25,1.51295601526896
## P30,3,26,1.51610639999653
## P30,3,27,1.51886475339849
## P30,3,28,1.50816417875744
## P30,3,29,1.51173853874207
## P30,3,30,1.51319770812988
## P30,3,31,1.51089574268886
## P30,3,32,1.51213496071952
## P30,3,33,1.51291807960061
## P30,3,34,1.56202861240932
## P30,3,35,1.46971932877886
## P30,3,36,1.49790520966053
## P30,3,37,1.51330512364705
## P30,3,38,1.50769525104099
## P30,3,39,1.50992897578648
## P30,3,40,1.51121148284601
## P30,3,41,1.50885476384844
## P30,3,42,1.51142501831055
## P30,3,43,1.50770180934184
## P30,3,44,1.50722902019819
## P30,3,45,1.51361844274733
## P30,3,46,1.50530600547791
## P30,3,47,1.51267399787903
## P30,3,48,1.50963331090993
## P30,3,49,1.51331439511529
## P30,3,50,1.50867925268231
## P30,4,1,1.51188560894557
## P30,4,2,1.51027691501311
## P30,4,3,1.50687709931404
## P30,4,4,1.50415676573048
## P30,4,5,1.51050447055272
## P30,4,6,1.50732977390289
## P30,4,7,1.50945216782239
## P30,4,8,1.5143659055233
## P30,4,9,1.50097721342057
## P30,4,10,1.51168587628533
## P30,4,11,1.5084477853084
## P30,4,12,1.5060392220815
## P30,4,13,1.50812062570604
## P30,4,14,1.51003716365401
## P30,4,15,1.51858672036065
## P30,4,16,1.50983481592946
## P30,4,17,1.50486484750525
## P30,4,18,1.51236800944552
## P30,4,19,1.52705795723095
## P30,4,20,1.50760542364681
## P30,4,21,1.5012353171765
## P30,4,22,1.51191233479699
## P30,4,23,1.49590282440186
## P30,4,24,1.50525502460759
## P30,4,25,1.51436275335459
## P30,4,26,1.5093191464742
## P30,4,27,1.5089537581882
## P30,4,28,1.51365778245122
## P30,4,29,1.51059223837772
## P30,4,30,1.50983736353013
## P30,4,31,1.50982731978099
## P30,4,32,1.50571120335506
## P30,4,33,1.50903060038884
## P30,4,34,1.50838993316473
## P30,4,35,1.51927393482577
## P30,4,36,1.5097430407346
## P30,4,37,1.50878440892255
## P30,4,38,1.51171614064111
## P30,4,39,1.50600647926331
## P30,4,40,1.50984428513725
## P30,4,41,1.5095165740876
## P30,4,42,1.50908145037564
## P30,4,43,1.50897839334276
## P30,4,44,1.51290228631761
## P30,4,45,1.50915042091818
## P30,4,46,1.51117958092108
## P30,4,47,1.50987870117714
## P30,4,48,1.51099140827472
## P30,4,49,1.51157408175261
## P30,4,50,1.50844557323153
## P30,5,1,1.50883556093488
## P30,5,2,1.5104149788145
## P30,5,3,1.51048337909537
## P30,5,4,1.51245952941276
## P30,5,5,1.50896286628616
## P30,5,6,1.51247386326866
## P30,5,7,1.51058730443319
## P30,5,8,1.50778941619091
## P30,5,9,1.51390753565608
## P30,5,10,1.51233284986472
## P30,5,11,1.51199894240408
## P30,5,12,1.50967003617968
## P30,5,13,1.50798857212067
## P30,5,14,1.50241190195084
## P30,5,15,1.51300434748332
## P30,5,16,1.50981387178949
## P30,5,17,1.50313998557426
## P30,5,18,1.50882408278329
## P30,5,19,1.51176191443828
## P30,5,20,1.5112123849257
## P30,5,21,1.51283514499664
## P30,5,22,1.50874485419347
## P30,5,23,1.51032580931981
## P30,5,24,1.51233032603323
## P30,5,25,1.51528796757737
## P30,5,26,1.51111635367076
## P30,5,27,1.51020058314006
## P30,5,28,1.50979348677623
## P30,5,29,1.51078739762306
## P30,5,30,1.51150383018866
## P30,5,31,1.51204497080583
## P30,5,32,1.50999981073233
## P30,5,33,1.50882408278329
## P30,5,34,1.50997504321012
## P30,5,35,1.51309027671814
## P30,5,36,1.50972296345618
## P30,5,37,1.50939559019529
## P30,5,38,1.5069940884908
## P30,5,39,1.51032358286332
## P30,5,40,1.50969711939494
## P30,5,41,1.51083154845656
## P30,5,42,1.51088811953863
## P30,5,43,1.51072401470608
## P30,5,44,1.50954050677163
## P30,5,45,1.50869171108518
## P30,5,46,1.51664747100279
## P30,5,47,1.51291418075562
## P30,5,48,1.50857725808787
## P30,5,49,1.51692269830143
## P30,5,50,1.50904733694873
## P30,6,1,1.50761170387268
## P30,6,2,1.50736707228201
## P30,6,3,1.50804458879957
## P30,6,4,1.50891950574972
## P30,6,5,1.54789386476789
## P30,6,6,1.50826113440774
## P30,6,7,1.5094110864274
## P30,6,8,1.50961247612448
## P30,6,9,1.51528970265793
## P30,6,10,1.51006968059237
## P30,6,11,1.50839441163199
## P30,6,12,1.50428703308105
## P30,6,13,1.51229281608875
## P30,6,14,1.50904704289264
## P30,6,15,1.51172158361851
## P30,6,16,1.51099869784187
## P30,6,17,1.50865117528222
## P30,6,18,1.50637922788921
## P30,6,19,1.5104181425912
## P30,6,20,1.51233908667493
## P30,6,21,1.50538914544242
## P30,6,22,1.50850776470069
## P30,6,23,1.5147705078125
## P30,6,24,1.51148882665132
## P30,6,25,1.50744615282331
## P30,6,26,1.51417791843414
## P30,6,27,1.51339054107666
## P30,6,28,1.50917412252987
## P30,6,29,1.51083572899423
## P30,6,30,1.5066153042352
## P30,6,31,1.51071723302205
## P30,6,32,1.50955755060369
## P30,6,33,1.51308257239205
## P30,6,34,1.50952615056719
## P30,6,35,1.5015203111312
## P30,6,36,1.50838159985012
## P30,6,37,1.50486205263836
## P30,6,38,1.5135809150902
## P30,6,39,1.50981385057623
## P30,6,40,1.50850469536251
## P30,6,41,1.50793399810791
## P30,6,42,1.50968501091003
## P30,6,43,1.50911216582021
## P30,6,44,1.50854983823053
## P30,6,45,1.5111603148996
## P30,6,46,1.51052130722418
## P30,6,47,1.50868897168141
## P30,6,48,1.51095646077936
## P30,6,49,1.51285414425832
## P30,6,50,1.50929866280667
## P30,7,1,1.51066252390544
## P30,7,2,1.51591832821186
## P30,7,3,1.51219583594281
## P30,7,4,1.50773442113722
## P30,7,5,1.50753293099341
## P30,7,6,1.50941107102803
## P30,7,7,1.51425538918911
## P30,7,8,1.52020273710552
## P30,7,9,1.51181871946468
## P30,7,10,1.51216465153106
## P30,7,11,1.50963880704797
## P30,7,12,1.50835748819204
## P30,7,13,1.50957391617146
## P30,7,14,1.51160647273064
## P30,7,15,1.51141594744277
## P30,7,16,1.50968502044678
## P30,7,17,1.51121117919683
## P30,7,18,1.51564613632534
## P30,7,19,1.50739691074078
## P30,7,20,1.50839497438118
## P30,7,21,1.51473543954932
## P30,7,22,1.51037338044908
## P30,7,23,1.50746050633882
## P30,7,24,1.51319761276245
## P30,7,25,1.5091850699448
## P30,7,26,1.51079349084334
## P30,7,27,1.50836737589403
## P30,7,28,1.51031396306794
## P30,7,29,1.5083156803198
## P30,7,30,1.51143553929451
## P30,7,31,1.50969499838157
## P30,7,32,1.51271119484535
## P30,7,33,1.50853925676488
## P30,7,34,1.51249034525984
## P30,7,35,1.51428669896619
## P30,7,36,1.50989446640015
## P30,7,37,1.51162283375578
## P30,7,38,1.50718977791922
## P30,7,39,1.51112680081968
## P30,7,40,1.50889310836792
## P30,7,41,1.51299300064912
## P30,7,42,1.508814868927
## P30,7,43,1.52222550881876
## P30,7,44,1.52698722638582
## P30,7,45,1.51599933255103
## P30,7,46,1.51297815295233
## P30,7,47,1.50744573997729
## P30,7,48,1.51364956731382
## P30,7,49,1.50777507314877
## P30,7,50,1.50465973218282
## P30,8,1,1.51431765321825
## P30,8,2,1.50929597445897
## P30,8,3,1.51256874299818
## P30,8,4,1.51466538595117
## P30,8,5,1.51298557957516
## P30,8,6,1.5147426923116
## P30,8,7,1.506644932429
## P30,8,8,1.52118269602458
## P30,8,9,1.51239200391267
## P30,8,10,1.50328378928335
## P30,8,11,1.51692474406698
## P30,8,12,1.50512381962367
## P30,8,13,1.51518500645955
## P30,8,14,1.5176809535307
## Warning: There are no valid values for INTERVALS=15 in LISTP30[[8]]
## P30,8,16,1.50736464500427
## P30,8,17,1.51207639093268
## P30,8,18,1.5135921938666
## P30,8,19,1.513491962267
## P30,8,20,1.51250482559204
## P30,8,21,1.50810188055038
## P30,8,22,1.51736027399699
## P30,8,23,1.50428615676032
## P30,8,24,1.51117735642653
## P30,8,25,1.4948228257043
## P30,8,26,1.51240052674946
## P30,8,27,1.51054631580006
## P30,8,28,1.52808113487399
## P30,8,29,1.5233552639301
## P30,8,30,1.50818336577643
## P30,8,31,1.50976413561974
## P30,8,32,1.50628317103666
## P30,8,33,1.50935850972715
## P30,8,34,1.5136812210083
## P30,8,35,1.5085330987588
## P30,8,36,1.50893147786458
## P30,8,37,1.50774652553055
## P30,8,38,1.51123932080391
## P30,8,39,1.51525906858773
## P30,8,40,1.50426902957991
## P30,8,41,1.51618756188287
## P30,8,42,1.50543224602415
## P30,8,43,1.5121106176234
## P30,8,44,1.51351490616798
## P30,8,45,1.51102236697548
## P30,8,46,1.50737511145102
## P30,8,47,1.51330021077936
## P30,8,48,1.51049025264787
## P30,8,49,1.50897556382257
## P30,8,50,1.50772486323804
## P30,9,1,1.50979425848984
## P30,9,2,1.50891457047573
## P30,9,3,1.50902943862112
## P30,9,4,1.51295729934192
## P30,9,5,1.50368009567261
## P30,9,6,1.49785397792685
## P30,9,7,1.51391461725985
## P30,9,8,1.50659132003784
## P30,9,9,1.51553831602398
## P30,9,10,1.50476577010336
## P30,9,11,1.50999979606042
## P30,9,12,1.51642036437988
## P30,9,13,1.51060881932576
## P30,9,14,1.51290225982666
## P30,9,15,1.50768828899302
## P30,9,16,1.51189750638501
## P30,9,17,1.51105899160559
## P30,9,18,1.50933053276756
## P30,9,19,1.51112546477207
## P30,9,20,1.50830325484276
## P30,9,21,1.50767581279461
## P30,9,22,1.51980917155743
## P30,9,23,1.50820258947519
## P30,9,24,1.50914066785002
## P30,9,25,1.50848364275555
## P30,9,26,1.50884951244701
## P30,9,27,1.51293423819163
## P30,9,28,1.51303654670715
## P30,9,29,1.50641609274823
## P30,9,30,1.50668920697393
## P30,9,31,1.51011793568449
## P30,9,32,1.51693260847633
## P30,9,33,1.50988196655059
## P30,9,34,1.50977727499875
## P30,9,35,1.50692296028137
## P30,9,36,1.51100979745388
## P30,9,37,1.51296196160493
## P30,9,38,1.51236899239676
## P30,9,39,1.51384218415218
## P30,9,40,1.51013614109584
## P30,9,41,1.50921511005711
## P30,9,42,1.51437476529913
## P30,9,43,1.50794309680745
## P30,9,44,1.51196235522889
## P30,9,45,1.51071543920608
## P30,9,46,1.51223090978769
## P30,9,47,1.51004891263114
## P30,9,48,1.51180682684246
## P30,9,49,1.50998653684344
## P30,9,50,1.5065501271462
## P30,10,1,1.51138207742146
## P30,10,2,1.51353737470266
## P30,10,3,1.51198919614156
## P30,10,4,1.51064400239424
## P30,10,5,1.51840766270955
## P30,10,6,1.50631231528062
## P30,10,7,1.51372981625934
## P30,10,8,1.51403264132413
## P30,10,9,1.50921246703242
## P30,10,10,1.51020583590946
## P30,10,11,1.50958906218063
## P30,10,12,1.50491596403576
## P30,10,13,1.51451360384623
## P30,10,14,1.51131782531738
## P30,10,15,1.50913540940536
## P30,10,16,1.50873966778026
## P30,10,17,1.51140005886555
## P30,10,18,1.51410615033117
## P30,10,19,1.50900824069977
## P30,10,20,1.51404366890589
## P30,10,21,1.51034644498663
## P30,10,22,1.5114367212568
## P30,10,23,1.51384222892023
## P30,10,24,1.51313419053049
## P30,10,25,1.50595821653094
## P30,10,26,1.51155674214266
## P30,10,27,1.51169833490404
## P30,10,28,1.5117054503897
## P30,10,29,1.50649648554185
## P30,10,30,1.50904431271909
## P30,10,31,1.51230195690604
## P30,10,32,1.51384219607791
## P30,10,33,1.51473883659609
## P30,10,34,1.51527841194816
## P30,10,35,1.50143991817128
## P30,10,36,1.50838159190284
## P30,10,37,1.50506383180618
## P30,10,38,1.50435667217902
## P30,10,39,1.51051883399487
## P30,10,40,1.46255859961877
## P30,10,41,1.55286527291322
## P30,10,42,1.5280219078064
## P30,10,43,1.51698814119611
## P30,10,44,1.52365890649649
## P30,10,45,1.51583442687988
## P30,10,46,1.51839602511862
## P30,10,47,1.51648722954516
## P30,10,48,1.50310005823771
## P30,10,49,1.52037848195722
## P30,10,50,1.50994710847149
## P31,1,1,1.52233346512443
## P31,1,2,1.51757254665845
## P31,1,3,1.52032412182201
## P31,1,4,1.52026684467609
## P31,1,5,1.51600288622307
## P31,1,6,1.51856810872148
## P31,1,7,1.51528765173519
## P31,1,8,1.51407917106853
## P31,1,9,1.51837135650016
## P31,1,10,1.52488153538805
## P31,1,11,1.50825719510095
## P31,1,12,1.51813080861018
## P31,1,13,1.50646592246162
## P31,1,14,1.52528263727824
## P31,1,15,1.51373578917305
## P31,1,16,1.51786032205896
## P31,1,17,1.50697360604496
## P31,1,18,1.51381885141566
## P31,1,19,1.5271046931927
## P31,1,20,1.50936001119479
## P31,1,21,1.5180585331387
## P31,1,22,1.5183237016201
## P31,1,23,1.50924889453046
## P31,1,24,1.51559064743367
## P31,1,25,1.51571869548363
## P31,1,26,1.52018418678871
## P31,1,27,1.51772773114941
## P31,1,28,1.51663254528511
## P31,1,29,1.51810552676519
## P31,1,30,1.5143706516553
## P31,1,31,1.52631249635116
## P31,1,32,1.50786418914795
## P31,1,33,1.50499671697617
## P31,1,34,1.51124279454069
## P31,1,35,1.50095176696777
## P31,1,36,1.51051700765436
## P31,1,37,1.51594789461656
## P31,1,38,1.51266063054403
## P31,1,39,1.52608831193712
## P31,1,40,1.51865502407676
## P31,1,41,1.51183406630559
## P31,1,42,1.52038551665641
## P31,1,43,1.49901790618896
## P31,1,44,1.53018567675636
## P31,1,45,1.51281682650248
## P31,1,46,1.50894619868352
## P31,1,47,1.51557291878594
## P31,1,48,1.50795191658868
## P31,1,49,1.51147260385401
## P31,1,50,1.51604359586474
## P31,2,1,1.51252257412878
## P31,2,2,1.51266671790451
## P31,2,3,1.5130914774808
## P31,2,4,1.50610785484314
## P31,2,5,1.51169375578562
## P31,2,6,1.51072993343824
## P31,2,7,1.50978346590726
## P31,2,8,1.50912905931473
## P31,2,9,1.50959569215775
## P31,2,10,1.50711738819979
## P31,2,11,1.51161481352413
## P31,2,12,1.51254494715545
## P31,2,13,1.50690650939941
## P31,2,14,1.51088809967041
## P31,2,15,1.51114323139191
## P31,2,16,1.51388962128583
## P31,2,17,1.51423745785119
## P31,2,18,1.50723576545715
## P31,2,19,1.51216081950976
## P31,2,20,1.50985522147937
## P31,2,21,1.50729614496231
## P31,2,22,1.51341252326965
## P31,2,23,1.50782658259074
## P31,2,24,1.50957433597462
## P31,2,25,1.51548453477713
## P31,2,26,1.51072356008714
## P31,2,27,1.50965270996094
## P31,2,28,1.51011945461405
## P31,2,29,1.51021675630049
## P31,2,30,1.50767993927002
## P31,2,31,1.50892112061784
## P31,2,32,1.51129990683662
## P31,2,33,1.513117146492
## P31,2,34,1.50624884366989
## P31,2,35,1.51506292458737
## P31,2,36,1.51160829717463
## P31,2,37,1.51205668578277
## P31,2,38,1.51321559482151
## P31,2,39,1.50894625370319
## P31,2,40,1.51004888614019
## P31,2,41,1.51086477611376
## P31,2,42,1.51669866388494
## P31,2,43,1.50949736152376
## P31,2,44,1.52088289675505
## P31,2,45,1.50481552007247
## P31,2,46,1.50661490945255
## P31,2,47,1.51552180920617
## P31,2,48,1.51158279957979
## P31,2,49,1.50948563328496
## P31,2,50,1.51055067421025
## P31,3,1,1.51315676276364
## P31,3,2,1.51396384329166
## P31,3,3,1.51245746016502
## P31,3,4,1.51760196685791
## P31,3,5,1.50801302404965
## P31,3,6,1.51470339709315
## P31,3,7,1.51365626775301
## P31,3,8,1.50784450107151
## P31,3,9,1.50790758535896
## P31,3,10,1.50389403882234
## P31,3,11,1.51106713310121
## P31,3,12,1.51234125111201
## P31,3,13,1.51373234662143
## P31,3,14,1.51415103276571
## P31,3,15,1.5181390841802
## P31,3,16,1.5121973156929
## P31,3,17,1.5082442349401
## P31,3,18,1.51393371278589
## P31,3,19,1.50711581873339
## P31,3,20,1.51560004552205
## P31,3,21,1.5111633181572
## P31,3,22,1.51154034478324
## P31,3,23,1.51006389486379
## P31,3,24,1.50779182770673
## P31,3,25,1.51158409387293
## P31,3,26,1.51225427268208
## P31,3,27,1.5130778948466
## P31,3,28,1.51343936269934
## P31,3,29,1.51081717689082
## P31,3,30,1.50465763092041
## P31,3,31,1.50878976563276
## P31,3,32,1.50544989109039
## P31,3,33,1.50972632739855
## P31,3,34,1.50925823737835
## P31,3,35,1.51044050852458
## P31,3,36,1.51375960081052
## P31,3,37,1.51030218239987
## P31,3,38,1.51600478824816
## P31,3,39,1.51361203193665
## Warning: There are no valid values for INTERVALS=40 in LISTP31[[3]]
## P31,3,41,1.51030428513237
## P31,3,42,1.51379482185139
## P31,3,43,1.51327095031738
## Warning: There are no valid values for INTERVALS=44 in LISTP31[[3]]
## P31,3,45,1.51215928395589
## P31,3,46,1.50990338678713
## P31,3,47,1.51160428259108
## P31,3,48,1.50943887644801
## P31,3,49,1.5152233668736
## P31,3,50,1.51606554251451
## P31,4,1,1.51525828332612
## P31,4,2,1.50464818991867
## P31,4,3,1.51400665361054
## P31,4,4,1.49606270139868
## Warning: There are no valid values for INTERVALS=5 in LISTP31[[4]]
## P31,4,6,1.52199607882006
## P31,4,7,1.49391274703176
## P31,4,8,1.49400128179522
## P31,4,9,1.53339137750513
## P31,4,10,1.51029732567923
## P31,4,11,1.50100716229143
## P31,4,12,1.52036423910232
## P31,4,13,1.4783470426287
## P31,4,14,1.51580600937208
## P31,4,15,1.45382034778595
## P31,4,16,1.52494887794767
## P31,4,17,1.51660007696885
## Warning: There are no valid values for INTERVALS=18 in LISTP31[[4]]
## P31,4,19,1.54004118177626
## P31,4,20,1.51992943551805
## P31,4,21,1.50129689489092
## P31,4,22,1.52219722889088
## P31,4,23,1.52728219465776
## P31,4,24,1.51689962240366
## P31,4,25,1.48725536757824
## P31,4,26,1.53298121558295
## P31,4,27,1.489057116075
## P31,4,28,1.4974872748057
## P31,4,29,1.52455902999302
## P31,4,30,1.51348276871901
## P31,4,31,1.49462142671858
## P31,4,32,1.52972527912685
## P31,4,33,1.51965766386552
## P31,4,34,1.5105076763365
## P31,4,35,1.50903059376611
## P31,4,36,1.53393012682597
## P31,4,37,1.4923090392893
## P31,4,38,1.52686003634804
## P31,4,39,1.51010599136353
## P31,4,40,1.50701325280326
## P31,4,41,1.52307181498584
## P31,4,42,1.48867257244616
## P31,4,43,1.4843012491862
## P31,4,44,1.52355492115021
## P31,4,45,1.50567716818589
## P31,4,46,1.57280485718339
## P31,4,47,1.49661342914288
## P31,4,48,1.51877874027599
## P31,4,49,1.49721873601278
## P31,4,50,1.52474503205201
## P31,5,1,1.55170834064484
## P31,5,2,1.49305617014567
## P31,5,3,1.50826964775721
## P31,5,4,1.50826971729596
## P31,5,5,1.50554389953613
## P31,5,6,1.50778221047443
## P31,5,7,1.53673864180042
## P31,5,8,1.50058143203323
## P31,5,9,1.50256290038427
## P31,5,10,1.52725747574207
## P31,5,11,1.48502691755904
## P31,5,12,1.51341572929831
## P31,5,13,1.50456032156944
## P31,5,14,1.50254651478359
## P31,5,15,1.51209075554557
## P31,5,16,1.51013616720835
## P31,5,17,1.51422038370249
## P31,5,18,1.52145570913951
## P31,5,19,1.50787239387387
## P31,5,20,1.50023545159234
## P31,5,21,1.50406314586771
## P31,5,22,1.51246110598246
## P31,5,23,1.51360270783708
## P31,5,24,1.50805793664394
## P31,5,25,1.51182806491852
## P31,5,26,1.50975186091203
## P31,5,27,1.51746767997742
## P31,5,28,1.50605415162586
## P31,5,29,1.51189000178606
## P31,5,30,1.51174508824068
## P31,5,31,1.50998351448461
## P31,5,32,1.51005435345778
## P31,5,33,1.50920963287354
## P31,5,34,1.51539033066993
## P31,5,35,1.50765471458435
## P31,5,36,1.50858260100743
## P31,5,37,1.51198567514834
## P31,5,38,1.51389256119728
## P31,5,39,1.50456213068079
## P31,5,40,1.51180946643536
## P31,5,41,1.51100223064423
## P31,5,42,1.51073198540266
## P31,5,43,1.51025569054388
## P31,5,44,1.51207599273095
## P31,5,45,1.51515338935104
## P31,5,46,1.5096796353658
## P31,5,47,1.50299173785794
## P31,5,48,1.51136157387181
## P31,5,49,1.50990982282729
## P31,5,50,1.51084028204826
## P31,6,1,1.51111757972024
## P31,6,2,1.51037168502808
## P31,6,3,1.51031739371163
## P31,6,4,1.50900821685791
## P31,6,5,1.5119316646031
## P31,6,6,1.5097011089325
## P31,6,7,1.50881375937626
## P31,6,8,1.51005560557048
## P31,6,9,1.5090530095277
## P31,6,10,1.51289556026459
## P31,6,11,1.51131580494068
## P31,6,12,1.51043194940645
## P31,6,13,1.51215978229747
## P31,6,14,1.51224025460177
## P31,6,15,1.5103444413441
## P31,6,16,1.5097099427254
## P31,6,17,1.51122159748287
## P31,6,18,1.51303654776679
## P31,6,19,1.51192096563486
## P31,6,20,1.51163723594264
## P31,6,21,1.51389054298401
## P31,6,22,1.50730097861517
## P31,6,23,1.51545353939659
## P31,6,24,1.50732361186634
## P31,6,25,1.51617863178253
## P31,6,26,1.50906790627374
## P31,6,27,1.51231145858765
## P31,6,28,1.51339349263831
## P31,6,29,1.50594151404596
## P31,6,30,1.51380053059808
## P31,6,31,1.50527767513109
## P31,6,32,1.51094838551113
## P31,6,33,1.50900816917419
## P31,6,34,1.51417915170843
## P31,6,35,1.51377511024475
## P31,6,36,1.51144272348155
## P31,6,37,1.51200286397394
## P31,6,38,1.50849937974361
## P31,6,39,1.51507847884606
## P31,6,40,1.51044497489929
## P31,6,41,1.51061954498291
## P31,6,42,1.50682149614607
## P31,6,43,1.50616789672334
## P31,6,44,1.50877800441924
## P31,6,45,1.51084974833897
## P31,6,46,1.51205365180969
## P31,6,47,1.51085951987733
## P31,6,48,1.50642642107877
## P31,6,49,1.51165004109227
## P31,6,50,1.51016115525673
## P31,7,1,1.51001531879107
## P31,7,2,1.51349491908632
## P31,7,3,1.50474967275347
## Warning: There are no valid values for INTERVALS=4 in LISTP31[[7]]
## P31,7,5,1.51420703024234
## P31,7,6,1.51042223949822
## P31,7,7,1.50913356145223
## P31,7,8,1.50900823929731
## P31,7,9,1.51202952861786
## P31,7,10,1.50957388573505
## P31,7,11,1.51872654259205
## P31,7,12,1.50768988782709
## P31,7,13,1.5106439445958
## P31,7,14,1.51410001754761
## P31,7,15,1.51199693064536
## P31,7,16,1.5103286239836
## P31,7,17,1.51507756974962
## P31,7,18,1.50961249215262
## P31,7,19,1.51516436307858
## P31,7,20,1.50702766577403
## P31,7,21,1.50536153191014
## P31,7,22,1.51454716920853
## P31,7,23,1.51020285178875
## P31,7,24,1.50677029291789
## P31,7,25,1.51105434175522
## P31,7,26,1.50885719060898
## P31,7,27,1.5169036951932
## P31,7,28,1.51211370121349
## P31,7,29,1.51064995099913
## P31,7,30,1.51350886246254
## P31,7,31,1.51162049264619
## P31,7,32,1.51135026576907
## P31,7,33,1.51127598903797
## P31,7,34,1.51054631580006
## P31,7,35,1.50853430523592
## P31,7,36,1.51330516451881
## P31,7,37,1.51342954868224
## P31,7,38,1.51033094036045
## P31,7,39,1.50843279702323
## Warning: There are no valid values for INTERVALS=40 in LISTP31[[7]]
## P31,7,41,1.50741302490234
## P31,7,42,1.51175184507628
## P31,7,43,1.51231847638669
## P31,7,44,1.50922794053049
## P31,7,45,1.51140152706819
## P31,7,46,1.51445027117459
## P31,7,47,1.51214608393217
## P31,7,48,1.51004408087049
## P31,7,49,1.50704317558102
## P31,7,50,1.5139971439655
## P31,8,1,1.50843276296343
## P31,8,2,1.51227717015935
## P31,8,3,1.51159262347531
## P31,8,4,1.51131012326195
## P31,8,5,1.50922794775529
## P31,8,6,1.5125238740599
## P31,8,7,1.51037073135376
## P31,8,8,1.51463107268016
## P31,8,9,1.50674048176518
## P31,8,10,1.51183892585136
## P31,8,11,1.50443061915311
## P31,8,12,1.50902885045761
## P31,8,13,1.5186762046814
## P31,8,14,1.50953440763512
## P31,8,15,1.51128766594864
## P31,8,16,1.51960904974686
## P31,8,17,1.51311454465312
## P31,8,18,1.50785732269287
## P31,8,19,1.50122011069096
## P31,8,20,1.51006321679978
## P31,8,21,1.51196232964011
## P31,8,22,1.51055595749303
## P31,8,23,1.51034333365304
## P31,8,24,1.51270084248649
## P31,8,25,1.5122652053833
## P31,8,26,1.5125953356425
## P31,8,27,1.5124663573045
## P31,8,28,1.50540193678841
## P31,8,29,1.50888823448343
## P31,8,30,1.51482978174763
## P31,8,31,1.51538855029691
## P31,8,32,1.51695599427094
## P31,8,33,1.51130125155816
## P31,8,34,1.51077587924786
## P31,8,35,1.50992132027944
## P31,8,36,1.51069558341548
## P31,8,37,1.50973329544067
## P31,8,38,1.51011790869371
## P31,8,39,1.50256286348615
## P31,8,40,1.51225328445435
## P31,8,41,1.51124962170919
## P31,8,42,1.51199040484073
## P31,8,43,1.50956278342705
## P31,8,44,1.51084972279412
## P31,8,45,1.51188556807382
## P31,8,46,1.50896465456164
## P31,8,47,1.51389975207193
## P31,8,48,1.50956070763724
## P31,8,49,1.50949589829696
## P31,8,50,1.51188468188047
## P31,9,1,1.51180433759502
## P31,9,2,1.5108209665005
## P31,9,3,1.51112681848032
## P31,9,4,1.50834470636704
## P31,9,5,1.51372012225064
## P31,9,6,1.51288229353884
## P31,9,7,1.51040695773231
## P31,9,8,1.5125678062439
## P31,9,9,1.50253925603979
## P31,9,10,1.51309148831801
## P31,9,11,1.51012377372155
## P31,9,12,1.51001532375813
## P31,9,13,1.51098025734745
## P31,9,14,1.51356435644216
## P31,9,15,1.51045842604204
## P31,9,16,1.50971797534398
## P31,9,17,1.51103731437966
## P31,9,18,1.51159192775858
## P31,9,19,1.51533097806184
## P31,9,20,1.50766547520955
## P31,9,21,1.51099866979262
## P31,9,22,1.51164370068049
## P31,9,23,1.51040938626165
## P31,9,24,1.51109219868978
## P31,9,25,1.51327825546265
## P31,9,26,1.50984268529075
## P31,9,27,1.51082098484039
## P31,9,28,1.51087020238241
## P31,9,29,1.51058601339658
## P31,9,30,1.51422061342182
## P31,9,31,1.50898043862705
## P31,9,32,1.51343205191872
## P31,9,33,1.51086574792862
## P31,9,34,1.50738300126174
## P31,9,35,1.5135512749354
## P31,9,36,1.5113953837642
## P31,9,37,1.50831316031662
## P31,9,38,1.51223088022488
## P31,9,39,1.51034734700177
## P31,9,40,1.51563663193674
## P31,9,41,1.50489201979204
## P31,9,42,1.51050445011684
## P31,9,43,1.51323796235598
## P31,9,44,1.5122916923379
## P31,9,45,1.5115978547505
## P31,9,46,1.51255313158035
## P31,9,47,1.50839853286743
## P31,9,48,1.50746188625213
## P31,9,49,1.5103561603106
## P31,9,50,1.50668219212563
## P31,10,1,1.504668020433
## P31,10,2,1.51353232677166
## P31,10,3,1.51307160958
## P31,10,4,1.50814058230473
## P31,10,5,1.51365264256795
## P31,10,6,1.51404364903768
## P31,10,7,1.5133484255883
## P31,10,8,1.50875885146005
## P31,10,9,1.50905658721924
## P31,10,10,1.51554600918879
## P31,10,11,1.49213174769753
## P31,10,12,1.50839055379232
## P31,10,13,1.50893493854638
## P31,10,14,1.51296216524564
## P31,10,15,1.50835365056992
## P31,10,16,1.51703500747681
## P31,10,17,1.50578558963278
## P31,10,18,1.51156816174907
## P31,10,19,1.51670678456624
## P31,10,20,1.50228271622589
## P31,10,21,1.51460394425826
## P31,10,22,1.51202607558945
## P31,10,23,1.50954075991097
## P31,10,24,1.51288414001465
## P31,10,25,1.50910894359861
## P31,10,26,1.51337696800769
## P31,10,27,1.50805728943622
## P31,10,28,1.50819120272784
## P31,10,29,1.51475673752862
## P31,10,30,1.50923590038134
## P31,10,31,1.51124395132065
## P31,10,32,1.50552778244019
## P31,10,33,1.50818677042045
## P31,10,34,1.51017354215894
## P31,10,35,1.515979669532
## P31,10,36,1.52048894337245
## P31,10,37,1.51015474246098
## P31,10,38,1.51021671295166
## P31,10,39,1.51026619526378
## P31,10,40,1.50672550201416
## P31,10,41,1.51672557780617
## P31,10,42,1.50561179366766
## P31,10,43,1.51326972559879
## P31,10,44,1.50642709378843
## P31,10,45,1.51098703919796
## P31,10,46,1.5090887705485
## P31,10,47,1.51107364134355
## P31,10,48,1.51005802732525
## P31,10,49,1.51349101922451
## P31,10,50,1.51118940492956
## P32,1,1,1.51249603681926
## P32,1,2,1.51557356245974
## P32,1,3,1.51569935426874
## P32,1,4,1.51455307006836
## P32,1,5,1.50802354680167
## P32,1,6,1.50833289763507
## P32,1,7,1.51172256469727
## P32,1,8,1.51508731191809
## P32,1,9,1.51407758305582
## P32,1,10,1.51462936401367
## P32,1,11,1.5142527956229
## P32,1,12,1.51450779645339
## P32,1,13,1.51416606996574
## P32,1,14,1.51229929924011
## P32,1,15,1.51397917747498
## P32,1,16,1.51474962234497
## P32,1,17,1.51599788665771
## P32,1,18,1.51614170273145
## P32,1,19,1.52003524761007
## P32,1,20,1.52330405213112
## P32,1,21,1.51222070259384
## P32,1,22,1.51492277594174
## P32,1,23,1.51342580023776
## P32,1,24,1.51218395788693
## P32,1,25,1.51028656005859
## P32,1,26,1.51879880220994
## P32,1,27,1.51278774878558
## P32,1,28,1.51681421597799
## P32,1,29,1.53478948636488
## P32,1,30,1.5156922781909
## P32,1,31,1.51455611216871
## P32,1,32,1.5066168648856
## P32,1,33,1.50812817353469
## P32,1,34,1.50811014019075
## P32,1,35,1.50180825100669
## P32,1,36,1.51152490340557
## P32,1,37,1.51404726722024
## P32,1,38,1.51230412024956
## P32,1,39,1.5114796354964
## P32,1,40,1.5124725818634
## P32,1,41,1.51058233701266
## P32,1,42,1.5090188415427
## P32,1,43,1.51172321136684
## P32,1,44,1.50990730092145
## P32,1,45,1.51092516690835
## P32,1,46,1.51359190524203
## P32,1,47,1.51383215785027
## P32,1,48,1.51949676760921
## P32,1,49,1.50632018240813
## P32,1,50,1.50877917981615
## P32,2,1,1.50161629915237
## P32,2,2,1.50589906665641
## P32,2,3,1.51230882060143
## P32,2,4,1.51134330135281
## P32,2,5,1.50795002837679
## P32,2,6,1.5163497228301
## P32,2,7,1.51075381702847
## P32,2,8,1.51102903241017
## P32,2,9,1.51292259042913
## P32,2,10,1.51002935476081
## P32,2,11,1.51294518991844
## P32,2,12,1.51061952728586
## P32,2,13,1.51231875853105
## P32,2,14,1.51092459391622
## P32,2,15,1.51005041052442
## P32,2,16,1.5113012668414
## P32,2,17,1.51176401833508
## P32,2,18,1.51212864491477
## P32,2,19,1.51420606720832
## P32,2,20,1.51056584782071
## P32,2,21,1.51082527891118
## P32,2,22,1.51346364653254
## P32,2,23,1.51151962578297
## P32,2,24,1.50761347945018
## P32,2,25,1.51116153543646
## P32,2,26,1.51191810720107
## P32,2,27,1.51161831469575
## P32,2,28,1.50883155538325
## P32,2,29,1.51385036622635
## P32,2,30,1.51313287797181
## P32,2,31,1.51399439175924
## P32,2,32,1.50984534993768
## P32,2,33,1.51197213848142
## P32,2,34,1.51150052346916
## P32,2,35,1.51014767033713
## P32,2,36,1.51267269734413
## P32,2,37,1.51324902000008
## P32,2,38,1.50919577582129
## P32,2,39,1.52535446006131
## P32,2,40,1.50610788265864
## P32,2,41,1.51192975285077
## P32,2,42,1.50813250956328
## P32,2,43,1.50793400677768
## P32,2,44,1.51322118441264
## P32,2,45,1.51191026337293
## P32,2,46,1.52409762640794
## P32,2,47,1.50599716167257
## P32,2,48,1.51559404439704
## P32,2,49,1.51106111819928
## P32,2,50,1.51145419800024
## P32,3,1,1.51072778274764
## P32,3,2,1.50846809148788
## P32,3,3,1.51659260124996
## P32,3,4,1.51568651199341
## P32,3,5,1.51278063269222
## P32,3,6,1.51029271899529
## P32,3,7,1.51211042493303
## P32,3,8,1.50834902850064
## P32,3,9,1.51383227477839
## P32,3,10,1.51209355484356
## P32,3,11,1.51002142284856
## P32,3,12,1.51009145704638
## P32,3,13,1.51719449580401
## P32,3,14,1.5097276085899
## P32,3,15,1.51360722382863
## P32,3,16,1.50861315085338
## P32,3,17,1.50766895343731
## P32,3,18,1.51318421363831
## P32,3,19,1.51175030490808
## P32,3,20,1.51314596482265
## P32,3,21,1.50667273060659
## P32,3,22,1.51044769922892
## P32,3,23,1.51109026791005
## P32,3,24,1.5074666417562
## P32,3,25,1.51131444573402
## P32,3,26,1.515544307064
## P32,3,27,1.50951427664639
## P32,3,28,1.50701924413443
## P32,3,29,1.51364981950219
## P32,3,30,1.51155952171043
## P32,3,31,1.5104328713766
## P32,3,32,1.51342356906218
## P32,3,33,1.51019553970872
## P32,3,34,1.51301657463893
## P32,3,35,1.51902151107788
## P32,3,36,1.51846961486034
## P32,3,37,1.50986915943669
## P32,3,38,1.511791435155
## P32,3,39,1.51426161805244
## P32,3,40,1.51568375052987
## P32,3,41,1.50489820259205
## P32,3,42,1.510262958339
## P32,3,43,1.50883702039719
## P32,3,44,1.51309850124212
## P32,3,45,1.50666646321615
## P32,3,46,1.5266967389121
## P32,3,47,1.5124050668768
## P32,3,48,1.5118402471446
## P32,3,49,1.5100598184686
## P32,3,50,1.51187512162444
## P32,4,1,1.5101907483993
## P32,4,2,1.51529378726565
## P32,4,3,1.51885303636877
## P32,4,4,1.51232567020491
## P32,4,5,1.51490731158499
## P32,4,6,1.50734653323889
## P32,4,7,1.51212346553802
## P32,4,8,1.50860135723846
## P32,4,9,1.51288633023278
## P32,4,10,1.50924800123487
## P32,4,11,1.51157361582706
## P32,4,12,1.51736276289996
## P32,4,13,1.5030721282959
## P32,4,14,1.51448389914184
## P32,4,15,1.50590428804096
## P32,4,16,1.50997291740618
## P32,4,17,1.50969800557176
## P32,4,18,1.51178064416437
## P32,4,19,1.51075669045144
## P32,4,20,1.51389828814736
## P32,4,21,1.50497993670012
## P32,4,22,1.51127319965722
## P32,4,23,1.51130182678635
## P32,4,24,1.5101754237444
## P32,4,25,1.51803609769638
## P32,4,26,1.51125260336058
## P32,4,27,1.5135763502121
## P32,4,28,1.50972856633803
## P32,4,29,1.51299862581141
## P32,4,30,1.51303653502732
## P32,4,31,1.50805078727612
## P32,4,32,1.50929356614749
## P32,4,33,1.51123419004617
## P32,4,34,1.50777487107265
## P32,4,35,1.51227666573091
## P32,4,36,1.50878119035201
## P32,4,37,1.51403367165292
## P32,4,38,1.50738878442784
## P32,4,39,1.50889033806033
## P32,4,40,1.51476424535116
## P32,4,41,1.51295173377321
## P32,4,42,1.50996036421169
## P32,4,43,1.5117095708847
## P32,4,44,1.50746738910675
## P32,4,45,1.50937573115031
## P32,4,46,1.51410636745515
## P32,4,47,1.50805797332372
## P32,4,48,1.51357366802456
## P32,4,49,1.51124450647942
## P32,4,50,1.50870046186983
## P32,5,1,1.50941105755893
## P32,5,2,1.51241361480398
## P32,5,3,1.51269121170044
## P32,5,4,1.51186372660383
## P32,5,5,1.51001329705267
## P32,5,6,1.51420743942261
## P32,5,7,1.51062926901392
## P32,5,8,1.51006179385715
## P32,5,9,1.50872883104509
## P32,5,10,1.50975069345212
## P32,5,11,1.51054737461147
## P32,5,12,1.51145093491737
## P32,5,13,1.51209140740908
## P32,5,14,1.51113086021864
## P32,5,15,1.51378468104771
## P32,5,16,1.50229438734643
## P32,5,17,1.51142524605367
## P32,5,18,1.50895838393379
## P32,5,19,1.50852949031885
## P32,5,20,1.51367693680983
## P32,5,21,1.51150228666223
## P32,5,22,1.50772818895144
## P32,5,23,1.51118626028804
## P32,5,24,1.51524722285387
## P32,5,25,1.5110525727272
## P32,5,26,1.50885644857434
## P32,5,27,1.51247444448545
## P32,5,28,1.51140646601832
## P32,5,29,1.5134919208029
## P32,5,30,1.51044834256172
## P32,5,31,1.51217755149393
## P32,5,32,1.50877433823001
## P32,5,33,1.51066430939568
## P32,5,34,1.51045207694025
## P32,5,35,1.51027955046488
## P32,5,36,1.5098651712591
## P32,5,37,1.5096930367606
## P32,5,38,1.51308690508207
## P32,5,39,1.5108623635279
## P32,5,40,1.50949163108036
## P32,5,41,1.5118225404661
## P32,5,42,1.50996630900615
## P32,5,43,1.51240131488213
## P32,5,44,1.50889312328935
## P32,5,45,1.51360350008364
## P32,5,46,1.51031395484661
## P32,5,47,1.50860016376941
## P32,5,48,1.51300476099315
## P32,5,49,1.51035100068801
## P32,5,50,1.51061114917199
## P32,6,1,1.50903950848626
## P32,6,2,1.51122382412786
## P32,6,3,1.51076215136368
## P32,6,4,1.51010560578313
## P32,6,5,1.51219677521011
## P32,6,6,1.50730737050374
## P32,6,7,1.51150500420297
## P32,6,8,1.50823660971413
## P32,6,9,1.50902302768252
## P32,6,10,1.51052384329314
## P32,6,11,1.51402502701062
## P32,6,12,1.5084759252412
## P32,6,13,1.51030550568791
## P32,6,14,1.51042012885065
## P32,6,15,1.51519722830166
## P32,6,16,1.50763104512141
## P32,6,17,1.51170789986326
## P32,6,18,1.50947505291377
## P32,6,19,1.50896389987491
## P32,6,20,1.5105055683064
## P32,6,21,1.50986716766988
## P32,6,22,1.51024105084822
## P32,6,23,1.51122736094291
## P32,6,24,1.51088021082037
## P32,6,25,1.51215142935095
## P32,6,26,1.50824031233788
## P32,6,27,1.51005688924638
## P32,6,28,1.50892406079307
## P32,6,29,1.5132333449735
## P32,6,30,1.50941106875738
## P32,6,31,1.51094060553644
## P32,6,32,1.5088720623876
## P32,6,33,1.5110307035775
## P32,6,34,1.51029314254892
## P32,6,35,1.51361560449004
## P32,6,36,1.50878551917347
## P32,6,37,1.51277589096743
## P32,6,38,1.51270991832286
## P32,6,39,1.50889544963837
## P32,6,40,1.51033822316972
## P32,6,41,1.50965530665841
## P32,6,42,1.50892561725062
## P32,6,43,1.51127490356787
## P32,6,44,1.51100380237286
## P32,6,45,1.51337508193585
## P32,6,46,1.50850908134295
## P32,6,47,1.51056624861325
## P32,6,48,1.51188848018646
## P32,6,49,1.50907649428157
## P32,6,50,1.51169190571226
## P32,7,1,1.50989302992821
## P32,7,2,1.51094031333923
## P32,7,3,1.51256602859497
## P32,7,4,1.51128091385115
## P32,7,5,1.5118116944786
## P32,7,6,1.51246640865619
## P32,7,7,1.50909184509853
## P32,7,8,1.51041631870442
## P32,7,9,1.50851755572441
## P32,7,10,1.51126278215839
## P32,7,11,1.51339180263009
## P32,7,12,1.50876486798127
## P32,7,13,1.5117014385405
## P32,7,14,1.5101203918457
## P32,7,15,1.51283360255584
## P32,7,16,1.51188088245079
## P32,7,17,1.50883155120047
## P32,7,18,1.50924060436396
## P32,7,19,1.5107562158789
## P32,7,20,1.51103798178739
## P32,7,21,1.50910008999339
## P32,7,22,1.50975418532336
## P32,7,23,1.51108633525788
## P32,7,24,1.51270618713159
## P32,7,25,1.51157835101293
## P32,7,26,1.51014348232385
## P32,7,27,1.51238774831316
## P32,7,28,1.51257195785968
## P32,7,29,1.50823819320814
## P32,7,30,1.51173728956303
## P32,7,31,1.51330791774549
## P32,7,32,1.5095477935371
## P32,7,33,1.51248868560791
## P32,7,34,1.51210695657975
## P32,7,35,1.50809617312449
## P32,7,36,1.50963810573925
## P32,7,37,1.51015717464945
## P32,7,38,1.51402992878145
## P32,7,39,1.50791223629101
## P32,7,40,1.50739687681198
## P32,7,41,1.51190091995966
## P32,7,42,1.51118879214577
## P32,7,43,1.5164645653145
## P32,7,44,1.50609670299115
## P32,7,45,1.51170803638215
## P32,7,46,1.5068227833715
## P32,7,47,1.50935564128631
## P32,7,48,1.51179332157661
## P32,7,49,1.50810185670853
## P32,7,50,1.50865061185798
## P32,8,1,1.50826009682247
## P32,8,2,1.50932715336482
## P32,8,3,1.51027311325073
## P32,8,4,1.50816792313771
## P32,8,5,1.51082693704284
## P32,8,6,1.51154421676289
## P32,8,7,1.51015115338703
## P32,8,8,1.50807537530598
## P32,8,9,1.51211977553094
## P32,8,10,1.51103539620676
## P32,8,11,1.51072597503662
## P32,8,12,1.51200458440888
## P32,8,13,1.50827419492933
## P32,8,14,1.50888101678146
## P32,8,15,1.52830248454521
## P32,8,16,1.50123224901349
## P32,8,17,1.5063322697367
## P32,8,18,1.51313841479948
## P32,8,19,1.50950585159601
## P32,8,20,1.51235204352472
## P32,8,21,1.51311421681599
## P32,8,22,1.51048526234097
## P32,8,23,1.50917979081472
## P32,8,24,1.5112845102946
## P32,8,25,1.51091329753399
## P32,8,26,1.50823542049953
## P32,8,27,1.5099052596338
## P32,8,28,1.51103243231773
## P32,8,29,1.51442655626234
## P32,8,30,1.51070436051017
## P32,8,31,1.5108748284897
## P32,8,32,1.51106828375708
## P32,8,33,1.51065177440643
## P32,8,34,1.51407082660778
## P32,8,35,1.51107530401211
## P32,8,36,1.51072027285894
## P32,8,37,1.51244290502448
## P32,8,38,1.50956824930703
## P32,8,39,1.51101478540672
## P32,8,40,1.50973804137286
## P32,8,41,1.50716498403838
## P32,8,42,1.51234279297016
## P32,8,43,1.50950110940372
## P32,8,44,1.51219898167223
## P32,8,45,1.51061955965482
## P32,8,46,1.51073352795727
## P32,8,47,1.51031609943935
## P32,8,48,1.51193995387466
## P32,8,49,1.51152690405985
## P32,8,50,1.51140854934166
## P32,9,1,1.5099552346949
## P32,9,2,1.51137193963547
## P32,9,3,1.51045976591504
## P32,9,4,1.50157742415156
## P32,9,5,1.52606760689972
## P32,9,6,1.50944274195125
## P32,9,7,1.51125145893471
## P32,9,8,1.51449121810772
## P32,9,9,1.50691085216428
## P32,9,10,1.51117390448894
## P32,9,11,1.51143958738872
## P32,9,12,1.51179446776708
## P32,9,13,1.50832874803658
## P32,9,14,1.50982225437959
## P32,9,15,1.51281819388131
## P32,9,16,1.51111985406568
## P32,9,17,1.509338555336
## P32,9,18,1.51299227201022
## P32,9,19,1.51037227045191
## P32,9,20,1.51399662494659
## P32,9,21,1.50845542267291
## P32,9,22,1.51203422471294
## P32,9,23,1.5105847694891
## P32,9,24,1.51182490070974
## P32,9,25,1.51053961542726
## P32,9,26,1.51181334474661
## P32,9,27,1.51039537761522
## P32,9,28,1.51256177255086
## P32,9,29,1.51008656208332
## P32,9,30,1.51203232080164
## P32,9,31,1.51115454101563
## P32,9,32,1.50833684937996
## P32,9,33,1.51059566073947
## P32,9,34,1.51109310324865
## P32,9,35,1.51353124150059
## P32,9,36,1.50973455472426
## P32,9,37,1.51238837277979
## P32,9,38,1.51261454990932
## P32,9,39,1.51085324687812
## P32,9,40,1.51150651371807
## P32,9,41,1.51128117769759
## P32,9,42,1.51160688961253
## P32,9,43,1.51193364615579
## P32,9,44,1.51262750258813
## P32,9,45,1.51239086719269
## P32,9,46,1.51106645539403
## P32,9,47,1.51023530960083
## P32,9,48,1.50930853756991
## P32,9,49,1.51068402099609
## P32,9,50,1.51096764583032
## P32,10,1,1.51038937341599
## P32,10,2,1.51253559956184
## P32,10,3,1.51322197914124
## P32,10,4,1.51124881710527
## P32,10,5,1.51297981302503
## P32,10,6,1.51249474531029
## P32,10,7,1.51083247661591
## P32,10,8,1.51114998693052
## P32,10,9,1.51222587076033
## P32,10,10,1.51132707718091
## P32,10,11,1.50976912180583
## P32,10,12,1.51225208399589
## P32,10,13,1.51012618412343
## P32,10,14,1.51240601746932
## P32,10,15,1.51298203862699
## P32,10,16,1.51249944246732
## P32,10,17,1.50752191708006
## P32,10,18,1.5114618250818
## P32,10,19,1.51235484743452
## P32,10,20,1.50901505098505
## P32,10,21,1.51608499750361
## P32,10,22,1.50835112646116
## P32,10,23,1.51216317024552
## P32,10,24,1.51083074958579
## P32,10,25,1.51257128111074
## P32,10,26,1.50926108951986
## P32,10,27,1.51116305684286
## P32,10,28,1.51022418340047
## P32,10,29,1.51103108220821
## P32,10,30,1.51352503919226
## P32,10,31,1.51140664174007
## P32,10,32,1.51036149635911
## P32,10,33,1.51125477827512
## P32,10,34,1.50988881162895
## P32,10,35,1.5132193485228
## P32,10,36,1.51085160446167
## P32,10,37,1.51137230170034
## P32,10,38,1.51051885262132
## P32,10,39,1.51285681724548
## P32,10,40,1.51110295896177
## P32,10,41,1.50985286697265
## P32,10,42,1.51067238948384
## P32,10,43,1.51285927295685
## P32,10,44,1.51087681986705
## P32,10,45,1.51053824118518
## P32,10,46,1.51023793041258
## P32,10,47,1.50926397717188
## P32,10,48,1.5139136814302
## P32,10,49,1.50873967894801
## P32,10,50,1.50962409973145
## P33,1,1,1.51322510901918
## P33,1,2,1.51334608476714
## P33,1,3,1.51416855220553
## P33,1,4,1.51336406692257
## P33,1,5,1.51208701304027
## P33,1,6,1.51169859085764
## P33,1,7,1.51246280742414
## P33,1,8,1.51343116468313
## P33,1,9,1.51425071501396
## P33,1,10,1.51016382737593
## P33,1,11,1.51293680554345
## P33,1,12,1.51079467414082
## P33,1,13,1.51116034102766
## P33,1,14,1.51432709340696
## P33,1,15,1.5134822307749
## P33,1,16,1.51371547077479
## P33,1,17,1.51412131427939
## P33,1,18,1.51366909673391
## P33,1,19,1.51466382376038
## P33,1,20,1.51675078020257
## P33,1,21,1.50981389183596
## P33,1,22,1.5108977102098
## P33,1,23,1.51294793605804
## P33,1,24,1.51587703594795
## P33,1,25,1.51566679804933
## P33,1,26,1.51003061820721
## P33,1,27,1.51454430307661
## P33,1,28,1.51037303013588
## P33,1,29,1.51335200918726
## P33,1,30,1.51088472559482
## P33,1,31,1.50935495352443
## P33,1,32,1.51190505658879
## P33,1,33,1.51334862306084
## P33,1,34,1.51312390867486
## P33,1,35,1.51272514553889
## P33,1,36,1.51298976405974
## P33,1,37,1.51233355671752
## P33,1,38,1.51331148828779
## P33,1,39,1.51077359213549
## P33,1,40,1.51225869408969
## P33,1,41,1.51273974619414
## P33,1,42,1.50754750331986
## P33,1,43,1.51298993087012
## P33,1,44,1.5112421344025
## P33,1,45,1.51065645873092
## P33,1,46,1.51422873259969
## P33,1,47,1.51263372671036
## P33,1,48,1.51220718832577
## P33,1,49,1.51168531132495
## P33,1,50,1.51189423118319
## P33,2,1,1.50942039489746
## P33,2,2,1.51003359447826
## P33,2,3,1.51342717565671
## P33,2,4,1.51294631576538
## P33,2,5,1.51349015997238
## P33,2,6,1.51060644785563
## P33,2,7,1.50897770578211
## P33,2,8,1.51400211567187
## P33,2,9,1.51162666396091
## P33,2,10,1.51074071901034
## P33,2,11,1.50842414697011
## P33,2,12,1.51491062019182
## P33,2,13,1.51285547620795
## P33,2,14,1.50907536347707
## P33,2,15,1.50676265675971
## P33,2,16,1.51439301335082
## P33,2,17,1.51056438602813
## P33,2,18,1.51118766344511
## P33,2,19,1.51269126724411
## P33,2,20,1.51447823800539
## P33,2,21,1.51358857419756
## P33,2,22,1.51539427392623
## P33,2,23,1.50999982540424
## P33,2,24,1.51425123214722
## P33,2,25,1.5127680077512
## P33,2,26,1.51112159784289
## P33,2,27,1.51203275117718
## P33,2,28,1.51356159167343
## P33,2,29,1.51248326933528
## P33,2,30,1.51012131414915
## P33,2,31,1.50848637927662
## P33,2,32,1.51425844033559
## P33,2,33,1.509138886993
## P33,2,34,1.51281372537004
## P33,2,35,1.51151125176439
## P33,2,36,1.51042376723245
## P33,2,37,1.51014959812164
## P33,2,38,1.51124822732174
## P33,2,39,1.51297573773366
## P33,2,40,1.51410477602923
## P33,2,41,1.51428771860459
## P33,2,42,1.5123496055603
## P33,2,43,1.51268886265002
## P33,2,44,1.50999229976109
## P33,2,45,1.51155708486384
## P33,2,46,1.51297542308939
## P33,2,47,1.51273276375943
## P33,2,48,1.51268625259399
## P33,2,49,1.51118271096239
## P33,2,50,1.51069200172853
## P33,3,1,1.51183593974394
## P33,3,2,1.51696568268996
## P33,3,3,1.51208441365849
## P33,3,4,1.50966669962956
## P33,3,5,1.51096747138283
## P33,3,6,1.51431448706265
## P33,3,7,1.51154032382336
## P33,3,8,1.51373935253062
## P33,3,9,1.51324622271812
## P33,3,10,1.50549861829575
## P33,3,11,1.51961612701416
## P33,3,12,1.51241304563439
## P33,3,13,1.51201179989597
## P33,3,14,1.50999073478265
## P33,3,15,1.51359953363258
## P33,3,16,1.51189375600071
## P33,3,17,1.51202691959429
## P33,3,18,1.51385201477423
## P33,3,19,1.51094322123079
## P33,3,20,1.51094779703352
## P33,3,21,1.51041299257523
## P33,3,22,1.51211714464075
## P33,3,23,1.51401390403998
## P33,3,24,1.51372416677146
## P33,3,25,1.51059461377331
## P33,3,26,1.51616520881653
## P33,3,27,1.51453619192142
## P33,3,28,1.51314318180084
## P33,3,29,1.51223963239919
## P33,3,30,1.51173506516677
## P33,3,31,1.51023869080977
## P33,3,32,1.50912246775271
## P33,3,33,1.51638638973236
## P33,3,34,1.51095626603312
## P33,3,35,1.51583356677361
## P33,3,36,1.51271665797514
## P33,3,37,1.51247966990751
## P33,3,38,1.51144740340907
## P33,3,39,1.50950829736118
## P33,3,40,1.51162894018765
## P33,3,41,1.51318040064403
## P33,3,42,1.51697189991291
## P33,3,43,1.50750200644783
## P33,3,44,1.51301720809937
## P33,3,45,1.51405107827834
## P33,3,46,1.51325008668095
## P33,3,47,1.5129301323081
## P33,3,48,1.50997622689204
## P33,3,49,1.51146501964993
## P33,3,50,1.51378117908131
## P33,4,1,1.51484535254684
## P33,4,2,1.51478799529698
## P33,4,3,1.50648383640108
## P33,4,4,1.50699408615337
## P33,4,5,1.52307072552768
## P33,4,6,1.5098270979084
## P33,4,7,1.50808487045631
## P33,4,8,1.5106583848057
## P33,4,9,1.50790741420028
## P33,4,10,1.51337917919817
## P33,4,11,1.51032955169678
## P33,4,12,1.50827365763047
## P33,4,13,1.51122849486595
## P33,4,14,1.51164301021679
## P33,4,15,1.51117136707045
## P33,4,16,1.51025868455569
## P33,4,17,1.5130540288013
## P33,4,18,1.51007066978203
## P33,4,19,1.51378920831178
## P33,4,20,1.51184724626087
## P33,4,21,1.51169831065808
## P33,4,22,1.51086203102927
## P33,4,23,1.51388248920441
## P33,4,24,1.51502122723959
## P33,4,25,1.50746651637701
## P33,4,26,1.50882581494889
## P33,4,27,1.51384220771419
## P33,4,28,1.51355374300921
## P33,4,29,1.5136767583234
## P33,4,30,1.51192396027701
## P33,4,31,1.51878776550293
## P33,4,32,1.5096299178957
## P33,4,33,1.51200067807758
## P33,4,34,1.51341030769741
## P33,4,35,1.51391330419802
## P33,4,36,1.51247574301327
## P33,4,37,1.51210927363462
## P33,4,38,1.51063566207886
## P33,4,39,1.51215084025402
## P33,4,40,1.51056585709254
## P33,4,41,1.51404584633125
## P33,4,42,1.50979004809137
## P33,4,43,1.51358552527639
## P33,4,44,1.51362574278419
## P33,4,45,1.50898666041238
## P33,4,46,1.51128104862414
## P33,4,47,1.5078720496251
## P33,4,48,1.51250611543655
## P33,4,49,1.50935548749463
## P33,4,50,1.51424942327582
## P33,5,1,1.51391543402816
## P33,5,2,1.51218611096579
## P33,5,3,1.51221393785979
## P33,5,4,1.51321340188747
## P33,5,5,1.51226685728346
## P33,5,6,1.51140733824836
## P33,5,7,1.51227075274628
## P33,5,8,1.50867915489304
## P33,5,9,1.51153726451444
## P33,5,10,1.5123608035426
## P33,5,11,1.51176475456783
## P33,5,12,1.511957790892
## P33,5,13,1.5113388981138
## P33,5,14,1.51174629541268
## P33,5,15,1.50791303440928
## P33,5,16,1.51059313289455
## P33,5,17,1.51166049991034
## P33,5,18,1.5105918029259
## P33,5,19,1.51219425263343
## P33,5,20,1.51121373176575
## P33,5,21,1.51340433825617
## P33,5,22,1.51046174826081
## P33,5,23,1.5092731044717
## P33,5,24,1.51124897102515
## P33,5,25,1.50940552802935
## P33,5,26,1.51073601734207
## P33,5,27,1.51125964073286
## P33,5,28,1.51199354018484
## P33,5,29,1.51428569128754
## P33,5,30,1.50887594650041
## P33,5,31,1.5161063917752
## P33,5,32,1.51491410628609
## P33,5,33,1.5128015379111
## P33,5,34,1.51935898247412
## P33,5,35,1.51003139972687
## P33,5,36,1.50897130178749
## P33,5,37,1.51286141250445
## P33,5,38,1.51214670423251
## P33,5,39,1.50977525645739
## P33,5,40,1.51271648276342
## P33,5,41,1.51145924312968
## P33,5,42,1.51402529803189
## P33,5,43,1.50855662716422
## P33,5,44,1.51081941663757
## P33,5,45,1.50869836155166
## P33,5,46,1.51259161465204
## P33,5,47,1.51203905211555
## P33,5,48,1.51214203063179
## P33,5,49,1.51174749091819
## P33,5,50,1.51103281358193
## P33,6,1,1.51256511566487
## P33,6,2,1.5115427027146
## P33,6,3,1.50956947883863
## P33,6,4,1.51270802970071
## P33,6,5,1.51017463741018
## P33,6,6,1.51197360944347
## P33,6,7,1.51233293533325
## P33,6,8,1.5122474837549
## P33,6,9,1.51109412598283
## P33,6,10,1.50992413571006
## P33,6,11,1.51563945794717
## P33,6,12,1.51368912696838
## P33,6,13,1.5116522658955
## P33,6,14,1.51104502731495
## P33,6,15,1.51246527758512
## P33,6,16,1.51257041863033
## P33,6,17,1.5100283348303
## P33,6,18,1.51252769886103
## P33,6,19,1.51241361971983
## P33,6,20,1.51269340073621
## P33,6,21,1.51143062834772
## P33,6,22,1.51146790839189
## P33,6,23,1.5119525605982
## P33,6,24,1.51248155170017
## P33,6,25,1.51146798851216
## P33,6,26,1.51142522563105
## P33,6,27,1.51224581842069
## P33,6,28,1.51208225268762
## P33,6,29,1.51256978701031
## P33,6,30,1.51204326381422
## P33,6,31,1.50744676098381
## P33,6,32,1.51254163469587
## P33,6,33,1.509836477654
## P33,6,34,1.5117806652013
## P33,6,35,1.51155950976353
## P33,6,36,1.51171297929725
## P33,6,37,1.512068146407
## P33,6,38,1.51252198820355
## P33,6,39,1.51239570162513
## P33,6,40,1.51050085770456
## P33,6,41,1.5106419523557
## P33,6,42,1.51137305335175
## P33,6,43,1.51065152032035
## P33,6,44,1.51160230741396
## P33,6,45,1.5124620179661
## P33,6,46,1.51419701707472
## P33,6,47,1.51285507872298
## P33,6,48,1.51169835106801
## P33,6,49,1.51225607097149
## P33,6,50,1.51068751496005
## P33,7,1,1.51196782929557
## P33,7,2,1.5101755022064
## P33,7,3,1.51171491387185
## P33,7,4,1.51302165455288
## P33,7,5,1.51468179602372
## P33,7,6,1.51060727170406
## P33,7,7,1.51033184479694
## P33,7,8,1.51173354372566
## P33,7,9,1.51289008422331
## P33,7,10,1.51105901869861
## P33,7,11,1.5134027461813
## P33,7,12,1.50833682737489
## P33,7,13,1.51526887714863
## P33,7,14,1.51328444742894
## P33,7,15,1.51471318854942
## P33,7,16,1.51273132815506
## P33,7,17,1.51299662165122
## P33,7,18,1.51099924657537
## P33,7,19,1.51148415774834
## P33,7,20,1.51279269394122
## P33,7,21,1.51280842631696
## P33,7,22,1.51233361391413
## P33,7,23,1.51245138268722
## P33,7,24,1.51186375074749
## P33,7,25,1.51141290810272
## P33,7,26,1.5127929920374
## P33,7,27,1.51188124800628
## P33,7,28,1.51104646666437
## P33,7,29,1.50988714333737
## P33,7,30,1.51249943123207
## P33,7,31,1.5118059916039
## P33,7,32,1.51169375578562
## P33,7,33,1.51032239100972
## P33,7,34,1.51285509161047
## P33,7,35,1.51177312027324
## P33,7,36,1.51103108906917
## P33,7,37,1.51156675171208
## P33,7,38,1.51054020722707
## P33,7,39,1.51219097930606
## P33,7,40,1.51114134107317
## P33,7,41,1.51215711781676
## P33,7,42,1.51325937027627
## P33,7,43,1.5102913291366
## P33,7,44,1.5122436644539
## P33,7,45,1.51145948247707
## P33,7,46,1.51022393362863
## P33,7,47,1.51027794647217
## P33,7,48,1.51227614584934
## P33,7,49,1.51193248607494
## P33,7,50,1.51185583451699
## P33,8,1,1.5107116154262
## P33,8,2,1.51193793795326
## P33,8,3,1.51057754184889
## P33,8,4,1.51152592897415
## P33,8,5,1.51090799143285
## P33,8,6,1.51072651517075
## P33,8,7,1.51248365290025
## P33,8,8,1.51294393649046
## P33,8,9,1.51152689943036
## P33,8,10,1.5101333815476
## P33,8,11,1.50859491236798
## P33,8,12,1.51250758797231
## P33,8,13,1.51192285500321
## P33,8,14,1.51226833994074
## P33,8,15,1.51112889695442
## P33,8,16,1.50894887321874
## P33,8,17,1.51280894791339
## P33,8,18,1.51156737624096
## P33,8,19,1.51228329805824
## P33,8,20,1.510748462677
## P33,8,21,1.51142003459315
## P33,8,22,1.51287434725153
## P33,8,23,1.51233553267145
## P33,8,24,1.50999236106873
## P33,8,25,1.50973333212046
## P33,8,26,1.51290791375296
## P33,8,27,1.51206723228097
## P33,8,28,1.51214855778826
## P33,8,29,1.51116944116259
## P33,8,30,1.5108739551745
## P33,8,31,1.51191926452349
## P33,8,32,1.50981390557322
## P33,8,33,1.51197793594626
## P33,8,34,1.51185740540359
## P33,8,35,1.51034750566854
## P33,8,36,1.51189101859927
## P33,8,37,1.51116689132607
## P33,8,38,1.51148276669639
## P33,8,39,1.51129253331353
## P33,8,40,1.51206973393758
## P33,8,41,1.51583570700425
## P33,8,42,1.51213688055674
## P33,8,43,1.51098757614324
## P33,8,44,1.51088482868381
## P33,8,45,1.51230655849309
## P33,8,46,1.51186100042091
## P33,8,47,1.51277260670717
## P33,8,48,1.51305192898793
## P33,8,49,1.51150104017819
## P33,8,50,1.51057023418193
## P33,9,1,1.51027504822304
## P33,9,2,1.512985117892
## P33,9,3,1.50995279180593
## P33,9,4,1.51003767573644
## P33,9,5,1.50980121131957
## P33,9,6,1.50988045999826
## P33,9,7,1.51347388767061
## P33,9,8,1.51087566085209
## P33,9,9,1.51191617920995
## P33,9,10,1.51111130900197
## P33,9,11,1.51082097330401
## P33,9,12,1.51160957045474
## P33,9,13,1.511283047059
## P33,9,14,1.51031170821771
## P33,9,15,1.51059051462122
## P33,9,16,1.51092826540225
## P33,9,17,1.5110789803434
## P33,9,18,1.51186767171641
## P33,9,19,1.51227296288334
## P33,9,20,1.51108435484079
## P33,9,21,1.51197038736558
## P33,9,22,1.50968951026865
## P33,9,23,1.5119028704507
## P33,9,24,1.51139990788586
## P33,9,25,1.51084044671828
## P33,9,26,1.51090463858384
## P33,9,27,1.51197280362248
## P33,9,28,1.51040040969849
## P33,9,29,1.51204540746675
## P33,9,30,1.51181522903928
## P33,9,31,1.51215569496155
## P33,9,32,1.51037784020106
## P33,9,33,1.51156063640819
## P33,9,34,1.51126907407775
## P33,9,35,1.51129526015251
## P33,9,36,1.50961108641191
## P33,9,37,1.51135028794754
## P33,9,38,1.50891614641462
## P33,9,39,1.51291260810999
## P33,9,40,1.51156412321946
## P33,9,41,1.50939474556897
## P33,9,42,1.51018905275651
## P33,9,43,1.51266019013676
## P33,9,44,1.51121000394429
## P33,9,45,1.5133551910742
## P33,9,46,1.51057251352463
## P33,9,47,1.51278992412853
## P33,9,48,1.51129988917598
## P33,9,49,1.51294826808041
## P33,9,50,1.51124835130645
## P33,10,1,1.51044137202776
## P33,10,2,1.51039430659304
## P33,10,3,1.51206607890852
## P33,10,4,1.51117010911306
## P33,10,5,1.51235023781105
## P33,10,6,1.51058454928191
## P33,10,7,1.51197422500205
## P33,10,8,1.51355819221881
## P33,10,9,1.51100902999474
## P33,10,10,1.51094800508939
## P33,10,11,1.51095129461849
## P33,10,12,1.51145810172671
## P33,10,13,1.51153851673007
## P33,10,14,1.51061294117912
## P33,10,15,1.51166954978568
## P33,10,16,1.51116237572744
## P33,10,17,1.51190241666941
## P33,10,18,1.51231958231795
## P33,10,19,1.51016105093607
## P33,10,20,1.51026851109096
## P33,10,21,1.51156026641758
## P33,10,22,1.51143505515122
## P33,10,23,1.51231981252695
## P33,10,24,1.51200148463249
## P33,10,25,1.51208486258984
## P33,10,26,1.51205448286068
## P33,10,27,1.51135347640678
## P33,10,28,1.51086325409972
## P33,10,29,1.51210764997146
## P33,10,30,1.51102521869686
## P33,10,31,1.51031530153501
## P33,10,32,1.51179905319214
## P33,10,33,1.51167662938436
## P33,10,34,1.51072026000303
## P33,10,35,1.51010997886332
## P33,10,36,1.51073550455498
## P33,10,37,1.51215032063998
## P33,10,38,1.51078952103853
## P33,10,39,1.51181982325859
## P33,10,40,1.51274193222843
## P33,10,41,1.51124124076423
## P33,10,42,1.51146876811981
## P33,10,43,1.5110789842842
## P33,10,44,1.51113225211782
## P33,10,45,1.5121115260654
## P33,10,46,1.51133642797395
## P33,10,47,1.51121605359591
## P33,10,48,1.51310313043516
## P33,10,49,1.51193840209752
## P33,10,50,1.51141419149425
## P34,1,1,1.50933055877686
## P34,1,2,1.54583858762469
## P34,1,3,1.50974067052205
## P34,1,4,1.51535960038503
## P34,1,5,1.50348746972006
## P34,1,6,1.51625920986307
## P34,1,7,1.51428985595703
## P34,1,8,1.5072943947532
## P34,1,9,1.49936547875404
## P34,1,10,1.50966742544463
## P34,1,11,1.5021025793893
## P34,1,12,1.51749651772635
## P34,1,13,1.51084183824473
## P34,1,14,1.51104162988209
## P34,1,15,1.51315684816731
## P34,1,16,1.50373691831316
## P34,1,17,1.51011141263522
## P34,1,18,1.53697097484882
## P34,1,19,1.51598360663966
## P34,1,20,1.50715523560842
## P34,1,21,1.52091635727301
## P34,1,22,1.50965281895229
## P34,1,23,1.50186716426503
## P34,1,24,1.51104612911449
## P34,1,25,1.46906289746684
## P34,1,26,1.52022394381071
## P34,1,27,1.49432439188803
## P34,1,28,1.52207511663437
## P34,1,29,1.51010929743449
## P34,1,30,1.49704722257761
## P34,1,31,1.5283442045513
## P34,1,32,1.51787055548975
## P34,1,33,1.51451796870078
## P34,1,34,1.47882463250841
## P34,1,35,1.51302243952166
## P34,1,36,1.49953214327494
## P34,1,37,1.50684402503219
## P34,1,38,1.50021130329854
## P34,1,39,1.51923009753227
## P34,1,40,1.52256645475115
## P34,1,41,1.50919287403425
## P34,1,42,1.51863380482322
## P34,1,43,1.52739839968474
## P34,1,44,1.53016947954893
## P34,1,45,1.5139041802822
## P34,1,46,1.50952510113986
## P34,1,47,1.5132645930884
## P34,1,48,1.50804765407856
## P34,1,49,1.4936180359278
## P34,1,50,1.50938613435863
## P34,2,1,1.50480732463655
## P34,2,2,1.52844081878662
## P34,2,3,1.50411868917531
## P34,2,4,1.50514776508013
## P34,2,5,1.53377936491326
## P34,2,6,1.50695957456316
## P34,2,7,1.52775820818814
## P34,2,8,1.51070251885582
## P34,2,9,1.51312469691038
## P34,2,10,1.50727297709538
## P34,2,11,1.48711593334491
## P34,2,12,1.53702057324923
## P34,2,13,1.51168157837608
## P34,2,14,1.52170553207397
## P34,2,15,1.51783627652107
## P34,2,16,1.50709481750216
## P34,2,17,1.50766147784333
## P34,2,18,1.49963869871917
## P34,2,19,1.49170665740967
## P34,2,20,1.50441843090635
## P34,2,21,1.52731880274686
## P34,2,22,1.50854183498182
## P34,2,23,1.52883740833827
## P34,2,24,1.55335640907288
## P34,2,25,1.5509027838707
## P34,2,26,1.5343291589192
## P34,2,27,1.52206978653416
## P34,2,28,1.5021601319313
## P34,2,29,1.52248969078064
## P34,2,30,1.50106404548468
## Warning: There are no valid values for INTERVALS=31 in LISTP34[[2]]
## P34,2,32,1.5198159450438
## P34,2,33,1.49463026340191
## P34,2,34,1.519446849823
## P34,2,35,1.50175724029541
## P34,2,36,1.53930425643921
## P34,2,37,1.64073431491852
## P34,2,38,1.50332254682268
## P34,2,39,1.52481349776773
## P34,2,40,1.46869002217832
## P34,2,41,1.51873592094139
## P34,2,42,1.51760920962772
## P34,2,43,1.52111441210697
## P34,2,44,1.4924473894967
## P34,2,45,1.52880455198742
## P34,2,46,1.52497932022693
## P34,2,47,1.49294331550598
## P34,2,48,1.5067344877455
## P34,2,49,1.51994226660047
## P34,2,50,1.51154324021002
## P34,3,1,1.51175487402714
## P34,3,2,1.51074848810832
## P34,3,3,1.5048488129017
## P34,3,4,1.50704374705275
## P34,3,5,1.48228450991073
## P34,3,6,1.52102928312998
## P34,3,7,1.51399425290666
## P34,3,8,1.52003371878846
## P34,3,9,1.50321522213164
## P34,3,10,1.51047633488973
## P34,3,11,1.50126141768235
## P34,3,12,1.51008252302806
## P34,3,13,1.50877612324084
## P34,3,14,1.5186762043408
## P34,3,15,1.5045144504971
## P34,3,16,1.51676564216614
## P34,3,17,1.49934027989705
## P34,3,18,1.4955997126443
## P34,3,19,1.54499452764338
## P34,3,20,1.51003577052683
## P34,3,21,1.50523167848587
## P34,3,22,1.50963083180514
## P34,3,23,1.51336993842289
## P34,3,24,1.50396771308703
## P34,3,25,1.49313000837962
## Warning: There are no valid values for INTERVALS=26 in LISTP34[[3]]
## P34,3,27,1.52097532225818
## P34,3,28,1.50853437535903
## P34,3,29,1.48691007069179
## P34,3,30,1.50864206660878
## P34,3,31,1.49050102233887
## P34,3,32,1.50564175844193
## P34,3,33,1.518819448683
## P34,3,34,1.51724575003799
## P34,3,35,1.51238081067107
## P34,3,36,1.50695383548737
## P34,3,37,1.5370825620798
## P34,3,38,1.47916578759952
## P34,3,39,1.5428909195794
## P34,3,40,1.5047785282135
## P34,3,41,1.5393012046814
## P34,3,42,1.50375395235808
## P34,3,43,1.51491641998291
## P34,3,44,1.51773372686134
## P34,3,45,1.52995545523507
## P34,3,46,1.50338571629626
## P34,3,47,1.51049796590265
## P34,3,48,1.50666449286721
## P34,3,49,1.51832370460033
## P34,3,50,1.50613610465805
## P34,4,1,1.50844206681123
## P34,4,2,1.51506907289678
## P34,4,3,1.50830329954624
## P34,4,4,1.50305880033053
## P34,4,5,1.50796985626221
## P34,4,6,1.51233656679998
## P34,4,7,1.51151069727811
## P34,4,8,1.50621213164984
## P34,4,9,1.51225692226041
## P34,4,10,1.50944886356592
## P34,4,11,1.51809025894512
## P34,4,12,1.50944465398788
## P34,4,13,1.50610785484314
## P34,4,14,1.51758054733276
## P34,4,15,1.51408254054555
## P34,4,16,1.51013615608215
## P34,4,17,1.50638644169953
## P34,4,18,1.50869171960013
## P34,4,19,1.50050404336717
## P34,4,20,1.50057756900787
## P34,4,21,1.51272131049115
## P34,4,22,1.50219275500323
## P34,4,23,1.51003085649931
## P34,4,24,1.53178507089615
## P34,4,25,1.53821353478865
## P34,4,26,1.50582916672165
## P34,4,27,1.51097402572632
## P34,4,28,1.52916477344654
## P34,4,29,1.48607370588515
## P34,4,30,1.51499703725179
## P34,4,31,1.49560079034769
## P34,4,32,1.49136759837468
## P34,4,33,1.51887768507004
## P34,4,34,1.50767087936401
## P34,4,35,1.51211296639791
## P34,4,36,1.50038290958779
## P34,4,37,1.50451745810332
## P34,4,38,1.51767460075585
## P34,4,39,1.50725474077113
## P34,4,40,1.4909859429235
## P34,4,41,1.48700529131396
## P34,4,42,1.52756949571463
## P34,4,43,1.49145628157116
## P34,4,44,1.50952469996917
## P34,4,45,1.49742686748505
## P34,4,46,1.5392541885376
## P34,4,47,1.49641974767049
## P34,4,48,1.5393549601237
## P34,4,49,1.5066828510978
## P34,4,50,1.52315104151347
## P34,5,1,1.51611273505471
## P34,5,2,1.51203441619873
## P34,5,3,1.52038824558258
## P34,5,4,1.51932843526204
## P34,5,5,1.50877550972833
## P34,5,6,1.51478735300211
## P34,5,7,1.51484930515289
## P34,5,8,1.50727298932198
## P34,5,9,1.51345800986657
## P34,5,10,1.49870979267618
## P34,5,11,1.50506259233524
## P34,5,12,1.52033317314004
## P34,5,13,1.50468694802487
## P34,5,14,1.51413904993158
## P34,5,15,1.51125801734205
## P34,5,16,1.51997423171997
## P34,5,17,1.51590118143294
## P34,5,18,1.50283153129346
## P34,5,19,1.51181198120117
## P34,5,20,1.50559606271632
## P34,5,21,1.5012773148557
## P34,5,22,1.52533436721226
## P34,5,23,1.50584758245028
## P34,5,24,1.51194785092328
## P34,5,25,1.50344184311953
## P34,5,26,1.51950105031331
## P34,5,27,1.51072024106979
## P34,5,28,1.51215417044503
## P34,5,29,1.50760579992224
## P34,5,30,1.50722311057296
## P34,5,31,1.50805235717256
## P34,5,32,1.51960781216621
## P34,5,33,1.50230853181136
## P34,5,34,1.51415462883151
## P34,5,35,1.49708442687988
## P34,5,36,1.51967375619071
## P34,5,37,1.52422634760539
## P34,5,38,1.51199769973755
## P34,5,39,1.50441382382367
## P34,5,40,1.50628140339485
## P34,5,41,1.51063451060542
## P34,5,42,1.51519013368166
## P34,5,43,1.51177863070839
## P34,5,44,1.51118067332676
## P34,5,45,1.51876099067822
## P34,5,46,1.50578560594653
## P34,5,47,1.50671336145112
## P34,5,48,1.51434947826244
## P34,5,49,1.49753448880952
## P34,5,50,1.51020111112452
## P34,6,1,1.50932718316714
## P34,6,2,1.52357620489402
## P34,6,3,1.51783897362503
## P34,6,4,1.50900830162896
## P34,6,5,1.51213936372237
## P34,6,6,1.52023197042531
## P34,6,7,1.52419497966766
## P34,6,8,1.50985867005807
## P34,6,9,1.50726874308153
## P34,6,10,1.52143846239362
## P34,6,11,1.5004451751709
## P34,6,12,1.5273146894243
## P34,6,13,1.50285771997964
## P34,6,14,1.50522350710492
## P34,6,15,1.49767344573448
## P34,6,16,1.50659132003784
## P34,6,17,1.5061884206884
## P34,6,18,1.52208745225947
## P34,6,19,1.51697916680194
## P34,6,20,1.50743590631793
## P34,6,21,1.51220821326887
## P34,6,22,1.51246283271096
## P34,6,23,1.51858670623214
## P34,6,24,1.50677617651517
## P34,6,25,1.51605783190046
## P34,6,26,1.51884711149967
## P34,6,27,1.51970156756314
## P34,6,28,1.51025072350559
## P34,6,29,1.51054002620556
## P34,6,30,1.51325548731762
## P34,6,31,1.51587766095212
## P34,6,32,1.51943153142929
## P34,6,33,1.47587272448417
## P34,6,34,1.50515256609235
## P34,6,35,1.52239465713501
## P34,6,36,1.50377143513073
## P34,6,37,1.51586857709018
## P34,6,38,1.53242625395457
## P34,6,39,1.51193792169744
## P34,6,40,1.50650174529464
## P34,6,41,1.52364082594176
## P34,6,42,1.50279317583357
## P34,6,43,1.50415749351184
## P34,6,44,1.51253069278806
## P34,6,45,1.50417423248291
## P34,6,46,1.52076496901336
## P34,6,47,1.51264524459839
## P34,6,48,1.48585414886475
## P34,6,49,1.49987201690674
## P34,6,50,1.50092062889001
## P34,7,1,1.50952957190719
## P34,7,2,1.52807560834018
## P34,7,3,1.51290228253319
## P34,7,4,1.50620456695557
## P34,7,5,1.51086126565933
## P34,7,6,1.48618515213924
## P34,7,7,1.50763323465983
## P34,7,8,1.51728107871079
## P34,7,9,1.51174751281738
## P34,7,10,1.50726263611405
## P34,7,11,1.5090849626632
## P34,7,12,1.51420300754149
## P34,7,13,1.50379513291752
## P34,7,14,1.50963639404814
## P34,7,15,1.50986764695909
## P34,7,16,1.51199170202017
## P34,7,17,1.51895181756271
## P34,7,18,1.50578555464745
## P34,7,19,1.50148870547613
## P34,7,20,1.5098770646488
## P34,7,21,1.50793402989705
## P34,7,22,1.50657688719886
## P34,7,23,1.52951733271281
## P34,7,24,1.5139520890785
## P34,7,25,1.55815374489987
## P34,7,26,1.51275222441729
## P34,7,27,1.52265711391673
## P34,7,28,1.48720800175386
## P34,7,29,1.52085319478461
## P34,7,30,1.5456483675086
## P34,7,31,1.50388991131502
## P34,7,32,1.50499315730861
## P34,7,33,1.4963813088157
## P34,7,34,1.51030625237359
## P34,7,35,1.4956049341144
## P34,7,36,1.5015440197552
## P34,7,37,1.5250607436558
## P34,7,38,1.50630691939709
## P34,7,39,1.50010695765095
## P34,7,40,1.51676891287979
## P34,7,41,1.47964777711962
## P34,7,42,1.52455458817659
## P34,7,43,1.50875385184037
## P34,7,44,1.4236552995794
## P34,7,45,1.55504957367392
## P34,7,46,1.51936440666517
## P34,7,47,1.5166422421815
## P34,7,48,1.51322355440685
## P34,7,49,1.51406196030703
## P34,7,50,1.5251902461976
## P34,8,1,1.51291807960061
## P34,8,2,1.52650513856307
## P34,8,3,1.50556177563137
## P34,8,4,1.50248428670371
## P34,8,5,1.51426204493348
## P34,8,6,1.49834760597774
## P34,8,7,1.51468146840731
## P34,8,8,1.50873972387875
## P34,8,9,1.51706488927205
## P34,8,10,1.51834048827489
## P34,8,11,1.50627657026052
## P34,8,12,1.52074235485446
## P34,8,13,1.52414321899414
## P34,8,14,1.49173332924067
## P34,8,15,1.5149612294303
## P34,8,16,1.51228845119476
## P34,8,17,1.5041743006025
## P34,8,18,1.50834150149904
## P34,8,19,1.51392278671265
## P34,8,20,1.49969061561253
## P34,8,21,1.51106271743774
## P34,8,22,1.494304895401
## P34,8,23,1.50711495876312
## P34,8,24,1.51235816353246
## P34,8,25,1.52146300331491
## P34,8,26,1.50809754496035
## P34,8,27,1.51036682315901
## P34,8,28,1.51530252893766
## P34,8,29,1.51183469178247
## P34,8,30,1.51237302667954
## P34,8,31,1.50888893339369
## P34,8,32,1.50271536852862
## P34,8,33,1.49370070298513
## P34,8,34,1.51835049974157
## P34,8,35,1.49851024512089
## P34,8,36,1.51220532826015
## P34,8,37,1.5092210679684
## P34,8,38,1.51545352737109
## P34,8,39,1.50783875680739
## P34,8,40,1.51130589732417
## P34,8,41,1.50755810056414
## P34,8,42,1.52093210220337
## P34,8,43,1.5112356859095
## P34,8,44,1.50809864844045
## P34,8,45,1.50877328713735
## P34,8,46,1.53358101844788
## P34,8,47,1.51254527161761
## P34,8,48,1.48699899153276
## P34,8,49,1.51718694513494
## P34,8,50,1.50806703017308
## P34,9,1,1.50764866669973
## P34,9,2,1.50896531422933
## P34,9,3,1.51247261365255
## P34,9,4,1.5136925969805
## P34,9,5,1.51051163427609
## P34,9,6,1.5027051673216
## P34,9,7,1.51750668402641
## P34,9,8,1.51153712802463
## P34,9,9,1.51005560329982
## P34,9,10,1.51149570941925
## P34,9,11,1.50297516445781
## P34,9,12,1.50504353171901
## P34,9,13,1.50671914267162
## P34,9,14,1.50625947877473
## P34,9,15,1.50303681691488
## P34,9,16,1.51193114214165
## P34,9,17,1.50281572341919
## P34,9,18,1.50458860397339
## P34,9,19,1.50539255142212
## P34,9,20,1.51131011758532
## P34,9,21,1.50920357848659
## P34,9,22,1.5132704857857
## P34,9,23,1.50111274719238
## P34,9,24,1.52352985521642
## P34,9,25,1.51881434576852
## P34,9,26,1.50813353402274
## P34,9,27,1.51394619480256
## P34,9,28,1.53211615302346
## P34,9,29,1.50361649195353
## P34,9,30,1.52413497652326
## P34,9,31,1.50472555662456
## P34,9,32,1.51307322762229
## P34,9,33,1.52411853050699
## P34,9,34,1.50042161188628
## P34,9,35,1.5143256187439
## P34,9,36,1.50212177776155
## P34,9,37,1.50950060950385
## P34,9,38,1.51403401011512
## P34,9,39,1.49493791375841
## P34,9,40,1.49083609051175
## P34,9,41,1.50623968297785
## P34,9,42,1.51781300136021
## P34,9,43,1.5105747823362
## P34,9,44,1.50653926787838
## P34,9,45,1.51563257641262
## P34,9,46,1.51216147685873
## P34,9,47,1.50515261150542
## P34,9,48,1.51911168485074
## P34,9,49,1.49631162926003
## P34,9,50,1.51606631950593
## P34,10,1,1.50363718253979
## P34,10,2,1.50633493336764
## P34,10,3,1.50444283485413
## P34,10,4,1.50499913806007
## P34,10,5,1.51160937717983
## P34,10,6,1.50175722440084
## P34,10,7,1.49188791513443
## P34,10,8,1.5360267332622
## P34,10,9,1.51210833632428
## P34,10,10,1.50531832695007
## P34,10,11,1.50216007232666
## P34,10,12,1.50335280100505
## P34,10,13,1.51751968937535
## P34,10,14,1.50791254043579
## P34,10,15,1.51484280247842
## P34,10,16,1.5150848889755
## P34,10,17,1.51520180702209
## P34,10,18,1.48161574204763
## P34,10,19,1.51508972721715
## P34,10,20,1.51264867076167
## P34,10,21,1.49356385896791
## P34,10,22,1.52659854094187
## P34,10,23,1.51858064683817
## P34,10,24,1.51163591971764
## P34,10,25,1.5213575437665
## P34,10,26,1.51690938179953
## P34,10,27,1.50650365456291
## P34,10,28,1.4895889841277
## P34,10,29,1.52672162983153
## P34,10,30,1.51412592471485
## P34,10,31,1.49393503882668
## P34,10,32,1.53452094395955
## P34,10,33,1.5074618785612
## P34,10,34,1.50894108613332
## P34,10,35,1.48516060511271
## P34,10,36,1.55152802680855
## P34,10,37,1.49912543296814
## P34,10,38,1.48468636566738
## P34,10,39,1.51199474827997
## P34,10,40,1.51848174785746
## P34,10,41,1.51996524810791
## P34,10,42,1.50214458428896
## P34,10,43,1.53801202774048
## P34,10,44,1.49531197547913
## P34,10,45,1.52137759152581
## P34,10,46,1.51745378560033
## P34,10,47,1.48738964398702
## P34,10,48,1.51417313303266
## P34,10,49,1.49914299711889
## P34,10,50,1.51673603057861
# Close the file
sink()
close(output_file)
# Open a file for writing
output_file <- file("output0.txt", open="w")

# Redirect the output to the file
sink(output_file)

# The code that generates the output
for (p in 5:34) {
  for (b in 1:10) {
    for (i in 1:50) {
      subset_list <- subset(get(paste0("LISTP", p))[[b]], ID == 0 & INTERVALS == i)
      subset_list$VALUE <- as.numeric(subset_list$VALUE)
      
      # Exclude missing values
      #subset_list <- subset_list[!is.na(subset_list$VALUE),]
      
      if(nrow(subset_list) == 0){
        cat(paste0("Warning: There are no valid values for INTERVALS=", i, " in LISTP", p, "[[", b, "]]\n"))
      } else if(all(is.na(subset_list$VALUE)) || all(!is.numeric(subset_list$VALUE))) {
        cat(paste0("Warning: All values are missing or non-numeric for INTERVALS=", i, " in LISTP", p, "[[", b, "]]\n"))
      } else {
        subset_list$VALUE[!is.numeric(subset_list$VALUE)] <- NA
        
        num_zeros <- sum(subset_list$VALUE == 0, na.rm = TRUE)
        
        if (is.nan(num_zeros)) {
          cat(paste0("Warning: There are missing or non-numeric values in the VALUE variable for INTERVALS=", i, " in LISTP", p, "[[", b, "]]\n"))
          non_numeric_values <- subset_list[!is.numeric(subset_list$VALUE), "VALUE"]
          cat("Non-numeric values in VALUE variable:", non_numeric_values, "\n")
        } else {
          cat(paste0("P", p, ",", b, ",", i, ",", "ID=0, num_zeros=", num_zeros, "\n"))
        }
      }
    }
  }
}
## P5,1,1,ID=0, num_zeros=5
## P5,1,2,ID=0, num_zeros=7
## P5,1,3,ID=0, num_zeros=11
## P5,1,4,ID=0, num_zeros=12
## P5,1,5,ID=0, num_zeros=4
## P5,1,6,ID=0, num_zeros=6
## P5,1,7,ID=0, num_zeros=2
## P5,1,8,ID=0, num_zeros=5
## P5,1,9,ID=0, num_zeros=5
## P5,1,10,ID=0, num_zeros=10
## P5,1,11,ID=0, num_zeros=8
## P5,1,12,ID=0, num_zeros=8
## P5,1,13,ID=0, num_zeros=8
## P5,1,14,ID=0, num_zeros=5
## P5,1,15,ID=0, num_zeros=8
## P5,1,16,ID=0, num_zeros=14
## P5,1,17,ID=0, num_zeros=2
## P5,1,18,ID=0, num_zeros=5
## P5,1,19,ID=0, num_zeros=6
## P5,1,20,ID=0, num_zeros=6
## P5,1,21,ID=0, num_zeros=8
## P5,1,22,ID=0, num_zeros=6
## P5,1,23,ID=0, num_zeros=8
## P5,1,24,ID=0, num_zeros=7
## P5,1,25,ID=0, num_zeros=5
## P5,1,26,ID=0, num_zeros=10
## P5,1,27,ID=0, num_zeros=4
## P5,1,28,ID=0, num_zeros=2
## P5,1,29,ID=0, num_zeros=3
## P5,1,30,ID=0, num_zeros=6
## P5,1,31,ID=0, num_zeros=4
## P5,1,32,ID=0, num_zeros=4
## P5,1,33,ID=0, num_zeros=9
## P5,1,34,ID=0, num_zeros=8
## P5,1,35,ID=0, num_zeros=10
## P5,1,36,ID=0, num_zeros=6
## P5,1,37,ID=0, num_zeros=10
## P5,1,38,ID=0, num_zeros=7
## P5,1,39,ID=0, num_zeros=5
## P5,1,40,ID=0, num_zeros=5
## P5,1,41,ID=0, num_zeros=2
## P5,1,42,ID=0, num_zeros=3
## P5,1,43,ID=0, num_zeros=3
## P5,1,44,ID=0, num_zeros=3
## P5,1,45,ID=0, num_zeros=5
## P5,1,46,ID=0, num_zeros=6
## P5,1,47,ID=0, num_zeros=4
## P5,1,48,ID=0, num_zeros=1
## P5,1,49,ID=0, num_zeros=4
## P5,1,50,ID=0, num_zeros=33
## P5,2,1,ID=0, num_zeros=0
## P5,2,2,ID=0, num_zeros=3
## P5,2,3,ID=0, num_zeros=8
## P5,2,4,ID=0, num_zeros=5
## P5,2,5,ID=0, num_zeros=4
## P5,2,6,ID=0, num_zeros=2
## P5,2,7,ID=0, num_zeros=1
## P5,2,8,ID=0, num_zeros=5
## P5,2,9,ID=0, num_zeros=2
## P5,2,10,ID=0, num_zeros=5
## P5,2,11,ID=0, num_zeros=9
## P5,2,12,ID=0, num_zeros=8
## P5,2,13,ID=0, num_zeros=4
## P5,2,14,ID=0, num_zeros=1
## P5,2,15,ID=0, num_zeros=4
## P5,2,16,ID=0, num_zeros=2
## P5,2,17,ID=0, num_zeros=5
## P5,2,18,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=19 in LISTP5[[2]]
## P5,2,20,ID=0, num_zeros=2
## P5,2,21,ID=0, num_zeros=1
## P5,2,22,ID=0, num_zeros=11
## P5,2,23,ID=0, num_zeros=1
## P5,2,24,ID=0, num_zeros=4
## P5,2,25,ID=0, num_zeros=2
## P5,2,26,ID=0, num_zeros=4
## P5,2,27,ID=0, num_zeros=1
## P5,2,28,ID=0, num_zeros=5
## P5,2,29,ID=0, num_zeros=4
## P5,2,30,ID=0, num_zeros=13
## P5,2,31,ID=0, num_zeros=3
## P5,2,32,ID=0, num_zeros=3
## P5,2,33,ID=0, num_zeros=4
## P5,2,34,ID=0, num_zeros=1
## P5,2,35,ID=0, num_zeros=7
## P5,2,36,ID=0, num_zeros=6
## P5,2,37,ID=0, num_zeros=2
## P5,2,38,ID=0, num_zeros=2
## P5,2,39,ID=0, num_zeros=1
## P5,2,40,ID=0, num_zeros=3
## P5,2,41,ID=0, num_zeros=0
## P5,2,42,ID=0, num_zeros=7
## P5,2,43,ID=0, num_zeros=4
## P5,2,44,ID=0, num_zeros=5
## P5,2,45,ID=0, num_zeros=11
## P5,2,46,ID=0, num_zeros=4
## P5,2,47,ID=0, num_zeros=3
## P5,2,48,ID=0, num_zeros=4
## P5,2,49,ID=0, num_zeros=5
## P5,2,50,ID=0, num_zeros=43
## P5,3,1,ID=0, num_zeros=7
## P5,3,2,ID=0, num_zeros=0
## P5,3,3,ID=0, num_zeros=2
## P5,3,4,ID=0, num_zeros=6
## P5,3,5,ID=0, num_zeros=2
## P5,3,6,ID=0, num_zeros=5
## P5,3,7,ID=0, num_zeros=3
## P5,3,8,ID=0, num_zeros=4
## P5,3,9,ID=0, num_zeros=0
## P5,3,10,ID=0, num_zeros=1
## P5,3,11,ID=0, num_zeros=2
## P5,3,12,ID=0, num_zeros=3
## P5,3,13,ID=0, num_zeros=6
## P5,3,14,ID=0, num_zeros=0
## P5,3,15,ID=0, num_zeros=1
## P5,3,16,ID=0, num_zeros=7
## P5,3,17,ID=0, num_zeros=4
## P5,3,18,ID=0, num_zeros=3
## P5,3,19,ID=0, num_zeros=1
## P5,3,20,ID=0, num_zeros=1
## P5,3,21,ID=0, num_zeros=1
## P5,3,22,ID=0, num_zeros=1
## P5,3,23,ID=0, num_zeros=3
## P5,3,24,ID=0, num_zeros=2
## P5,3,25,ID=0, num_zeros=3
## P5,3,26,ID=0, num_zeros=5
## P5,3,27,ID=0, num_zeros=4
## P5,3,28,ID=0, num_zeros=7
## P5,3,29,ID=0, num_zeros=3
## P5,3,30,ID=0, num_zeros=1
## P5,3,31,ID=0, num_zeros=3
## P5,3,32,ID=0, num_zeros=4
## P5,3,33,ID=0, num_zeros=6
## P5,3,34,ID=0, num_zeros=4
## P5,3,35,ID=0, num_zeros=3
## P5,3,36,ID=0, num_zeros=4
## P5,3,37,ID=0, num_zeros=5
## P5,3,38,ID=0, num_zeros=1
## P5,3,39,ID=0, num_zeros=3
## P5,3,40,ID=0, num_zeros=3
## P5,3,41,ID=0, num_zeros=4
## P5,3,42,ID=0, num_zeros=1
## P5,3,43,ID=0, num_zeros=4
## P5,3,44,ID=0, num_zeros=5
## P5,3,45,ID=0, num_zeros=2
## P5,3,46,ID=0, num_zeros=10
## P5,3,47,ID=0, num_zeros=7
## P5,3,48,ID=0, num_zeros=5
## P5,3,49,ID=0, num_zeros=6
## P5,3,50,ID=0, num_zeros=27
## P5,4,1,ID=0, num_zeros=3
## P5,4,2,ID=0, num_zeros=2
## P5,4,3,ID=0, num_zeros=1
## P5,4,4,ID=0, num_zeros=1
## P5,4,5,ID=0, num_zeros=2
## P5,4,6,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=7 in LISTP5[[4]]
## Warning: There are no valid values for INTERVALS=8 in LISTP5[[4]]
## P5,4,9,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=10 in LISTP5[[4]]
## Warning: There are no valid values for INTERVALS=11 in LISTP5[[4]]
## P5,4,12,ID=0, num_zeros=6
## P5,4,13,ID=0, num_zeros=3
## P5,4,14,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=15 in LISTP5[[4]]
## P5,4,16,ID=0, num_zeros=5
## P5,4,17,ID=0, num_zeros=1
## P5,4,18,ID=0, num_zeros=5
## P5,4,19,ID=0, num_zeros=1
## P5,4,20,ID=0, num_zeros=0
## P5,4,21,ID=0, num_zeros=6
## P5,4,22,ID=0, num_zeros=5
## P5,4,23,ID=0, num_zeros=2
## P5,4,24,ID=0, num_zeros=2
## P5,4,25,ID=0, num_zeros=1
## P5,4,26,ID=0, num_zeros=9
## P5,4,27,ID=0, num_zeros=3
## P5,4,28,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=29 in LISTP5[[4]]
## P5,4,30,ID=0, num_zeros=1
## P5,4,31,ID=0, num_zeros=1
## P5,4,32,ID=0, num_zeros=1
## P5,4,33,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=34 in LISTP5[[4]]
## P5,4,35,ID=0, num_zeros=1
## P5,4,36,ID=0, num_zeros=5
## P5,4,37,ID=0, num_zeros=3
## P5,4,38,ID=0, num_zeros=7
## P5,4,39,ID=0, num_zeros=3
## P5,4,40,ID=0, num_zeros=2
## P5,4,41,ID=0, num_zeros=3
## P5,4,42,ID=0, num_zeros=7
## P5,4,43,ID=0, num_zeros=10
## P5,4,44,ID=0, num_zeros=3
## P5,4,45,ID=0, num_zeros=4
## P5,4,46,ID=0, num_zeros=4
## P5,4,47,ID=0, num_zeros=3
## P5,4,48,ID=0, num_zeros=4
## P5,4,49,ID=0, num_zeros=0
## P5,4,50,ID=0, num_zeros=28
## P5,5,1,ID=0, num_zeros=1
## P5,5,2,ID=0, num_zeros=2
## P5,5,3,ID=0, num_zeros=6
## P5,5,4,ID=0, num_zeros=3
## P5,5,5,ID=0, num_zeros=3
## P5,5,6,ID=0, num_zeros=2
## P5,5,7,ID=0, num_zeros=1
## P5,5,8,ID=0, num_zeros=4
## P5,5,9,ID=0, num_zeros=4
## P5,5,10,ID=0, num_zeros=2
## P5,5,11,ID=0, num_zeros=6
## P5,5,12,ID=0, num_zeros=1
## P5,5,13,ID=0, num_zeros=2
## P5,5,14,ID=0, num_zeros=5
## P5,5,15,ID=0, num_zeros=9
## P5,5,16,ID=0, num_zeros=3
## P5,5,17,ID=0, num_zeros=2
## P5,5,18,ID=0, num_zeros=2
## P5,5,19,ID=0, num_zeros=1
## P5,5,20,ID=0, num_zeros=6
## P5,5,21,ID=0, num_zeros=2
## P5,5,22,ID=0, num_zeros=1
## P5,5,23,ID=0, num_zeros=1
## P5,5,24,ID=0, num_zeros=3
## P5,5,25,ID=0, num_zeros=7
## P5,5,26,ID=0, num_zeros=7
## P5,5,27,ID=0, num_zeros=5
## P5,5,28,ID=0, num_zeros=1
## P5,5,29,ID=0, num_zeros=0
## P5,5,30,ID=0, num_zeros=6
## P5,5,31,ID=0, num_zeros=1
## P5,5,32,ID=0, num_zeros=3
## P5,5,33,ID=0, num_zeros=1
## P5,5,34,ID=0, num_zeros=3
## P5,5,35,ID=0, num_zeros=1
## P5,5,36,ID=0, num_zeros=4
## P5,5,37,ID=0, num_zeros=1
## P5,5,38,ID=0, num_zeros=2
## P5,5,39,ID=0, num_zeros=0
## P5,5,40,ID=0, num_zeros=2
## P5,5,41,ID=0, num_zeros=2
## P5,5,42,ID=0, num_zeros=3
## P5,5,43,ID=0, num_zeros=3
## P5,5,44,ID=0, num_zeros=3
## P5,5,45,ID=0, num_zeros=2
## P5,5,46,ID=0, num_zeros=0
## P5,5,47,ID=0, num_zeros=2
## P5,5,48,ID=0, num_zeros=5
## P5,5,49,ID=0, num_zeros=6
## P5,5,50,ID=0, num_zeros=20
## P5,6,1,ID=0, num_zeros=3
## P5,6,2,ID=0, num_zeros=2
## P5,6,3,ID=0, num_zeros=6
## P5,6,4,ID=0, num_zeros=2
## P5,6,5,ID=0, num_zeros=1
## P5,6,6,ID=0, num_zeros=3
## P5,6,7,ID=0, num_zeros=3
## P5,6,8,ID=0, num_zeros=4
## P5,6,9,ID=0, num_zeros=3
## P5,6,10,ID=0, num_zeros=1
## P5,6,11,ID=0, num_zeros=2
## P5,6,12,ID=0, num_zeros=3
## P5,6,13,ID=0, num_zeros=2
## P5,6,14,ID=0, num_zeros=7
## P5,6,15,ID=0, num_zeros=1
## P5,6,16,ID=0, num_zeros=0
## P5,6,17,ID=0, num_zeros=3
## P5,6,18,ID=0, num_zeros=4
## P5,6,19,ID=0, num_zeros=0
## P5,6,20,ID=0, num_zeros=0
## P5,6,21,ID=0, num_zeros=7
## P5,6,22,ID=0, num_zeros=4
## P5,6,23,ID=0, num_zeros=5
## P5,6,24,ID=0, num_zeros=5
## P5,6,25,ID=0, num_zeros=6
## P5,6,26,ID=0, num_zeros=3
## P5,6,27,ID=0, num_zeros=5
## P5,6,28,ID=0, num_zeros=1
## P5,6,29,ID=0, num_zeros=4
## P5,6,30,ID=0, num_zeros=3
## P5,6,31,ID=0, num_zeros=7
## P5,6,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP5[[6]]
## P5,6,34,ID=0, num_zeros=1
## P5,6,35,ID=0, num_zeros=3
## P5,6,36,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=37 in LISTP5[[6]]
## P5,6,38,ID=0, num_zeros=0
## P5,6,39,ID=0, num_zeros=2
## P5,6,40,ID=0, num_zeros=1
## P5,6,41,ID=0, num_zeros=0
## P5,6,42,ID=0, num_zeros=3
## P5,6,43,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=44 in LISTP5[[6]]
## P5,6,45,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=46 in LISTP5[[6]]
## P5,6,47,ID=0, num_zeros=2
## P5,6,48,ID=0, num_zeros=4
## P5,6,49,ID=0, num_zeros=2
## P5,6,50,ID=0, num_zeros=30
## P5,7,1,ID=0, num_zeros=6
## P5,7,2,ID=0, num_zeros=1
## P5,7,3,ID=0, num_zeros=0
## P5,7,4,ID=0, num_zeros=3
## P5,7,5,ID=0, num_zeros=4
## P5,7,6,ID=0, num_zeros=3
## P5,7,7,ID=0, num_zeros=2
## P5,7,8,ID=0, num_zeros=1
## P5,7,9,ID=0, num_zeros=2
## P5,7,10,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=11 in LISTP5[[7]]
## P5,7,12,ID=0, num_zeros=10
## P5,7,13,ID=0, num_zeros=4
## P5,7,14,ID=0, num_zeros=1
## P5,7,15,ID=0, num_zeros=4
## P5,7,16,ID=0, num_zeros=3
## P5,7,17,ID=0, num_zeros=2
## P5,7,18,ID=0, num_zeros=4
## P5,7,19,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=20 in LISTP5[[7]]
## P5,7,21,ID=0, num_zeros=2
## P5,7,22,ID=0, num_zeros=2
## P5,7,23,ID=0, num_zeros=5
## P5,7,24,ID=0, num_zeros=1
## P5,7,25,ID=0, num_zeros=4
## P5,7,26,ID=0, num_zeros=4
## P5,7,27,ID=0, num_zeros=1
## P5,7,28,ID=0, num_zeros=3
## P5,7,29,ID=0, num_zeros=2
## P5,7,30,ID=0, num_zeros=2
## P5,7,31,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=32 in LISTP5[[7]]
## P5,7,33,ID=0, num_zeros=0
## P5,7,34,ID=0, num_zeros=3
## P5,7,35,ID=0, num_zeros=2
## P5,7,36,ID=0, num_zeros=4
## P5,7,37,ID=0, num_zeros=3
## P5,7,38,ID=0, num_zeros=4
## P5,7,39,ID=0, num_zeros=2
## P5,7,40,ID=0, num_zeros=3
## P5,7,41,ID=0, num_zeros=2
## P5,7,42,ID=0, num_zeros=3
## P5,7,43,ID=0, num_zeros=2
## P5,7,44,ID=0, num_zeros=2
## P5,7,45,ID=0, num_zeros=2
## P5,7,46,ID=0, num_zeros=0
## P5,7,47,ID=0, num_zeros=3
## P5,7,48,ID=0, num_zeros=4
## P5,7,49,ID=0, num_zeros=1
## P5,7,50,ID=0, num_zeros=15
## P5,8,1,ID=0, num_zeros=3
## P5,8,2,ID=0, num_zeros=5
## P5,8,3,ID=0, num_zeros=3
## P5,8,4,ID=0, num_zeros=5
## P5,8,5,ID=0, num_zeros=3
## P5,8,6,ID=0, num_zeros=3
## P5,8,7,ID=0, num_zeros=3
## P5,8,8,ID=0, num_zeros=3
## P5,8,9,ID=0, num_zeros=1
## P5,8,10,ID=0, num_zeros=2
## P5,8,11,ID=0, num_zeros=1
## P5,8,12,ID=0, num_zeros=3
## P5,8,13,ID=0, num_zeros=4
## P5,8,14,ID=0, num_zeros=2
## P5,8,15,ID=0, num_zeros=2
## P5,8,16,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=17 in LISTP5[[8]]
## P5,8,18,ID=0, num_zeros=2
## P5,8,19,ID=0, num_zeros=5
## P5,8,20,ID=0, num_zeros=9
## P5,8,21,ID=0, num_zeros=3
## P5,8,22,ID=0, num_zeros=4
## P5,8,23,ID=0, num_zeros=4
## P5,8,24,ID=0, num_zeros=1
## P5,8,25,ID=0, num_zeros=1
## P5,8,26,ID=0, num_zeros=8
## P5,8,27,ID=0, num_zeros=7
## P5,8,28,ID=0, num_zeros=1
## P5,8,29,ID=0, num_zeros=6
## P5,8,30,ID=0, num_zeros=4
## P5,8,31,ID=0, num_zeros=1
## P5,8,32,ID=0, num_zeros=3
## P5,8,33,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=34 in LISTP5[[8]]
## P5,8,35,ID=0, num_zeros=1
## P5,8,36,ID=0, num_zeros=0
## P5,8,37,ID=0, num_zeros=1
## P5,8,38,ID=0, num_zeros=3
## P5,8,39,ID=0, num_zeros=1
## P5,8,40,ID=0, num_zeros=0
## P5,8,41,ID=0, num_zeros=1
## P5,8,42,ID=0, num_zeros=1
## P5,8,43,ID=0, num_zeros=1
## P5,8,44,ID=0, num_zeros=4
## P5,8,45,ID=0, num_zeros=1
## P5,8,46,ID=0, num_zeros=1
## P5,8,47,ID=0, num_zeros=5
## P5,8,48,ID=0, num_zeros=5
## P5,8,49,ID=0, num_zeros=2
## P5,8,50,ID=0, num_zeros=25
## P5,9,1,ID=0, num_zeros=3
## P5,9,2,ID=0, num_zeros=4
## P5,9,3,ID=0, num_zeros=2
## P5,9,4,ID=0, num_zeros=1
## P5,9,5,ID=0, num_zeros=3
## P5,9,6,ID=0, num_zeros=2
## P5,9,7,ID=0, num_zeros=6
## P5,9,8,ID=0, num_zeros=2
## P5,9,9,ID=0, num_zeros=3
## P5,9,10,ID=0, num_zeros=1
## P5,9,11,ID=0, num_zeros=2
## P5,9,12,ID=0, num_zeros=1
## P5,9,13,ID=0, num_zeros=1
## P5,9,14,ID=0, num_zeros=2
## P5,9,15,ID=0, num_zeros=2
## P5,9,16,ID=0, num_zeros=3
## P5,9,17,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=18 in LISTP5[[9]]
## P5,9,19,ID=0, num_zeros=4
## P5,9,20,ID=0, num_zeros=3
## P5,9,21,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=22 in LISTP5[[9]]
## P5,9,23,ID=0, num_zeros=0
## P5,9,24,ID=0, num_zeros=2
## P5,9,25,ID=0, num_zeros=1
## P5,9,26,ID=0, num_zeros=2
## P5,9,27,ID=0, num_zeros=2
## P5,9,28,ID=0, num_zeros=0
## P5,9,29,ID=0, num_zeros=0
## P5,9,30,ID=0, num_zeros=3
## P5,9,31,ID=0, num_zeros=5
## P5,9,32,ID=0, num_zeros=4
## P5,9,33,ID=0, num_zeros=1
## P5,9,34,ID=0, num_zeros=3
## P5,9,35,ID=0, num_zeros=2
## P5,9,36,ID=0, num_zeros=3
## P5,9,37,ID=0, num_zeros=2
## P5,9,38,ID=0, num_zeros=4
## P5,9,39,ID=0, num_zeros=1
## P5,9,40,ID=0, num_zeros=5
## P5,9,41,ID=0, num_zeros=3
## P5,9,42,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=43 in LISTP5[[9]]
## P5,9,44,ID=0, num_zeros=3
## P5,9,45,ID=0, num_zeros=2
## P5,9,46,ID=0, num_zeros=4
## P5,9,47,ID=0, num_zeros=4
## P5,9,48,ID=0, num_zeros=4
## P5,9,49,ID=0, num_zeros=4
## P5,9,50,ID=0, num_zeros=14
## P5,10,1,ID=0, num_zeros=3
## P5,10,2,ID=0, num_zeros=3
## P5,10,3,ID=0, num_zeros=1
## P5,10,4,ID=0, num_zeros=7
## P5,10,5,ID=0, num_zeros=2
## P5,10,6,ID=0, num_zeros=0
## P5,10,7,ID=0, num_zeros=2
## P5,10,8,ID=0, num_zeros=5
## P5,10,9,ID=0, num_zeros=3
## P5,10,10,ID=0, num_zeros=1
## P5,10,11,ID=0, num_zeros=2
## P5,10,12,ID=0, num_zeros=2
## P5,10,13,ID=0, num_zeros=2
## P5,10,14,ID=0, num_zeros=2
## P5,10,15,ID=0, num_zeros=4
## P5,10,16,ID=0, num_zeros=2
## P5,10,17,ID=0, num_zeros=1
## P5,10,18,ID=0, num_zeros=1
## P5,10,19,ID=0, num_zeros=2
## P5,10,20,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=21 in LISTP5[[10]]
## P5,10,22,ID=0, num_zeros=2
## P5,10,23,ID=0, num_zeros=2
## P5,10,24,ID=0, num_zeros=2
## P5,10,25,ID=0, num_zeros=2
## P5,10,26,ID=0, num_zeros=2
## P5,10,27,ID=0, num_zeros=2
## P5,10,28,ID=0, num_zeros=2
## P5,10,29,ID=0, num_zeros=2
## P5,10,30,ID=0, num_zeros=1
## P5,10,31,ID=0, num_zeros=1
## P5,10,32,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=33 in LISTP5[[10]]
## P5,10,34,ID=0, num_zeros=3
## P5,10,35,ID=0, num_zeros=5
## P5,10,36,ID=0, num_zeros=5
## P5,10,37,ID=0, num_zeros=3
## P5,10,38,ID=0, num_zeros=3
## P5,10,39,ID=0, num_zeros=1
## P5,10,40,ID=0, num_zeros=1
## P5,10,41,ID=0, num_zeros=2
## P5,10,42,ID=0, num_zeros=10
## P5,10,43,ID=0, num_zeros=3
## P5,10,44,ID=0, num_zeros=1
## P5,10,45,ID=0, num_zeros=3
## P5,10,46,ID=0, num_zeros=3
## P5,10,47,ID=0, num_zeros=7
## P5,10,48,ID=0, num_zeros=3
## P5,10,49,ID=0, num_zeros=2
## P5,10,50,ID=0, num_zeros=19
## P6,1,1,ID=0, num_zeros=4
## P6,1,2,ID=0, num_zeros=4
## P6,1,3,ID=0, num_zeros=4
## P6,1,4,ID=0, num_zeros=10
## P6,1,5,ID=0, num_zeros=10
## P6,1,6,ID=0, num_zeros=9
## P6,1,7,ID=0, num_zeros=7
## P6,1,8,ID=0, num_zeros=11
## P6,1,9,ID=0, num_zeros=8
## P6,1,10,ID=0, num_zeros=6
## P6,1,11,ID=0, num_zeros=6
## P6,1,12,ID=0, num_zeros=3
## P6,1,13,ID=0, num_zeros=3
## P6,1,14,ID=0, num_zeros=2
## P6,1,15,ID=0, num_zeros=7
## P6,1,16,ID=0, num_zeros=5
## P6,1,17,ID=0, num_zeros=5
## P6,1,18,ID=0, num_zeros=6
## P6,1,19,ID=0, num_zeros=12
## P6,1,20,ID=0, num_zeros=6
## P6,1,21,ID=0, num_zeros=8
## P6,1,22,ID=0, num_zeros=8
## P6,1,23,ID=0, num_zeros=6
## P6,1,24,ID=0, num_zeros=4
## P6,1,25,ID=0, num_zeros=8
## P6,1,26,ID=0, num_zeros=16
## P6,1,27,ID=0, num_zeros=7
## P6,1,28,ID=0, num_zeros=9
## P6,1,29,ID=0, num_zeros=5
## P6,1,30,ID=0, num_zeros=9
## P6,1,31,ID=0, num_zeros=3
## P6,1,32,ID=0, num_zeros=4
## P6,1,33,ID=0, num_zeros=9
## P6,1,34,ID=0, num_zeros=3
## P6,1,35,ID=0, num_zeros=6
## P6,1,36,ID=0, num_zeros=7
## P6,1,37,ID=0, num_zeros=4
## P6,1,38,ID=0, num_zeros=5
## P6,1,39,ID=0, num_zeros=2
## P6,1,40,ID=0, num_zeros=5
## P6,1,41,ID=0, num_zeros=6
## P6,1,42,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=43 in LISTP6[[1]]
## P6,1,44,ID=0, num_zeros=11
## P6,1,45,ID=0, num_zeros=10
## P6,1,46,ID=0, num_zeros=7
## P6,1,47,ID=0, num_zeros=9
## P6,1,48,ID=0, num_zeros=12
## P6,1,49,ID=0, num_zeros=4
## P6,1,50,ID=0, num_zeros=38
## P6,2,1,ID=0, num_zeros=1
## P6,2,2,ID=0, num_zeros=4
## P6,2,3,ID=0, num_zeros=6
## P6,2,4,ID=0, num_zeros=3
## P6,2,5,ID=0, num_zeros=6
## P6,2,6,ID=0, num_zeros=5
## P6,2,7,ID=0, num_zeros=3
## P6,2,8,ID=0, num_zeros=4
## P6,2,9,ID=0, num_zeros=2
## P6,2,10,ID=0, num_zeros=3
## P6,2,11,ID=0, num_zeros=2
## P6,2,12,ID=0, num_zeros=5
## P6,2,13,ID=0, num_zeros=2
## P6,2,14,ID=0, num_zeros=5
## P6,2,15,ID=0, num_zeros=2
## P6,2,16,ID=0, num_zeros=3
## P6,2,17,ID=0, num_zeros=4
## P6,2,18,ID=0, num_zeros=3
## P6,2,19,ID=0, num_zeros=4
## P6,2,20,ID=0, num_zeros=1
## P6,2,21,ID=0, num_zeros=3
## P6,2,22,ID=0, num_zeros=7
## P6,2,23,ID=0, num_zeros=3
## P6,2,24,ID=0, num_zeros=1
## P6,2,25,ID=0, num_zeros=5
## P6,2,26,ID=0, num_zeros=3
## P6,2,27,ID=0, num_zeros=2
## P6,2,28,ID=0, num_zeros=2
## P6,2,29,ID=0, num_zeros=3
## P6,2,30,ID=0, num_zeros=8
## P6,2,31,ID=0, num_zeros=4
## P6,2,32,ID=0, num_zeros=8
## P6,2,33,ID=0, num_zeros=3
## P6,2,34,ID=0, num_zeros=1
## P6,2,35,ID=0, num_zeros=2
## P6,2,36,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=37 in LISTP6[[2]]
## P6,2,38,ID=0, num_zeros=7
## P6,2,39,ID=0, num_zeros=3
## P6,2,40,ID=0, num_zeros=8
## P6,2,41,ID=0, num_zeros=1
## P6,2,42,ID=0, num_zeros=4
## P6,2,43,ID=0, num_zeros=5
## P6,2,44,ID=0, num_zeros=5
## P6,2,45,ID=0, num_zeros=0
## P6,2,46,ID=0, num_zeros=3
## P6,2,47,ID=0, num_zeros=3
## P6,2,48,ID=0, num_zeros=7
## P6,2,49,ID=0, num_zeros=4
## P6,2,50,ID=0, num_zeros=21
## P6,3,1,ID=0, num_zeros=3
## P6,3,2,ID=0, num_zeros=1
## P6,3,3,ID=0, num_zeros=2
## P6,3,4,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=5 in LISTP6[[3]]
## Warning: There are no valid values for INTERVALS=6 in LISTP6[[3]]
## P6,3,7,ID=0, num_zeros=8
## P6,3,8,ID=0, num_zeros=5
## P6,3,9,ID=0, num_zeros=5
## P6,3,10,ID=0, num_zeros=4
## P6,3,11,ID=0, num_zeros=2
## P6,3,12,ID=0, num_zeros=5
## P6,3,13,ID=0, num_zeros=1
## P6,3,14,ID=0, num_zeros=5
## P6,3,15,ID=0, num_zeros=3
## P6,3,16,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=17 in LISTP6[[3]]
## P6,3,18,ID=0, num_zeros=3
## P6,3,19,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=20 in LISTP6[[3]]
## P6,3,21,ID=0, num_zeros=2
## P6,3,22,ID=0, num_zeros=3
## P6,3,23,ID=0, num_zeros=5
## P6,3,24,ID=0, num_zeros=3
## P6,3,25,ID=0, num_zeros=1
## P6,3,26,ID=0, num_zeros=3
## P6,3,27,ID=0, num_zeros=6
## P6,3,28,ID=0, num_zeros=2
## P6,3,29,ID=0, num_zeros=3
## P6,3,30,ID=0, num_zeros=6
## P6,3,31,ID=0, num_zeros=4
## P6,3,32,ID=0, num_zeros=3
## P6,3,33,ID=0, num_zeros=2
## P6,3,34,ID=0, num_zeros=1
## P6,3,35,ID=0, num_zeros=3
## P6,3,36,ID=0, num_zeros=0
## P6,3,37,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=38 in LISTP6[[3]]
## P6,3,39,ID=0, num_zeros=4
## P6,3,40,ID=0, num_zeros=3
## P6,3,41,ID=0, num_zeros=5
## P6,3,42,ID=0, num_zeros=5
## P6,3,43,ID=0, num_zeros=4
## P6,3,44,ID=0, num_zeros=5
## P6,3,45,ID=0, num_zeros=1
## P6,3,46,ID=0, num_zeros=2
## P6,3,47,ID=0, num_zeros=6
## P6,3,48,ID=0, num_zeros=2
## P6,3,49,ID=0, num_zeros=5
## P6,3,50,ID=0, num_zeros=13
## P6,4,1,ID=0, num_zeros=4
## P6,4,2,ID=0, num_zeros=3
## P6,4,3,ID=0, num_zeros=7
## P6,4,4,ID=0, num_zeros=2
## P6,4,5,ID=0, num_zeros=2
## P6,4,6,ID=0, num_zeros=2
## P6,4,7,ID=0, num_zeros=2
## P6,4,8,ID=0, num_zeros=2
## P6,4,9,ID=0, num_zeros=3
## P6,4,10,ID=0, num_zeros=6
## P6,4,11,ID=0, num_zeros=2
## P6,4,12,ID=0, num_zeros=1
## P6,4,13,ID=0, num_zeros=2
## P6,4,14,ID=0, num_zeros=1
## P6,4,15,ID=0, num_zeros=4
## P6,4,16,ID=0, num_zeros=2
## P6,4,17,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=18 in LISTP6[[4]]
## P6,4,19,ID=0, num_zeros=2
## P6,4,20,ID=0, num_zeros=2
## P6,4,21,ID=0, num_zeros=7
## P6,4,22,ID=0, num_zeros=4
## P6,4,23,ID=0, num_zeros=4
## P6,4,24,ID=0, num_zeros=6
## P6,4,25,ID=0, num_zeros=6
## P6,4,26,ID=0, num_zeros=1
## P6,4,27,ID=0, num_zeros=1
## P6,4,28,ID=0, num_zeros=0
## P6,4,29,ID=0, num_zeros=2
## P6,4,30,ID=0, num_zeros=5
## P6,4,31,ID=0, num_zeros=1
## P6,4,32,ID=0, num_zeros=7
## P6,4,33,ID=0, num_zeros=1
## P6,4,34,ID=0, num_zeros=0
## P6,4,35,ID=0, num_zeros=3
## P6,4,36,ID=0, num_zeros=5
## P6,4,37,ID=0, num_zeros=4
## P6,4,38,ID=0, num_zeros=1
## P6,4,39,ID=0, num_zeros=5
## P6,4,40,ID=0, num_zeros=1
## P6,4,41,ID=0, num_zeros=4
## P6,4,42,ID=0, num_zeros=3
## P6,4,43,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=44 in LISTP6[[4]]
## P6,4,45,ID=0, num_zeros=5
## P6,4,46,ID=0, num_zeros=1
## P6,4,47,ID=0, num_zeros=3
## P6,4,48,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=49 in LISTP6[[4]]
## P6,4,50,ID=0, num_zeros=13
## P6,5,1,ID=0, num_zeros=2
## P6,5,2,ID=0, num_zeros=5
## P6,5,3,ID=0, num_zeros=3
## P6,5,4,ID=0, num_zeros=1
## P6,5,5,ID=0, num_zeros=1
## P6,5,6,ID=0, num_zeros=4
## P6,5,7,ID=0, num_zeros=2
## P6,5,8,ID=0, num_zeros=3
## P6,5,9,ID=0, num_zeros=2
## P6,5,10,ID=0, num_zeros=2
## P6,5,11,ID=0, num_zeros=3
## P6,5,12,ID=0, num_zeros=2
## P6,5,13,ID=0, num_zeros=3
## P6,5,14,ID=0, num_zeros=2
## P6,5,15,ID=0, num_zeros=1
## P6,5,16,ID=0, num_zeros=2
## P6,5,17,ID=0, num_zeros=5
## P6,5,18,ID=0, num_zeros=3
## P6,5,19,ID=0, num_zeros=1
## P6,5,20,ID=0, num_zeros=2
## P6,5,21,ID=0, num_zeros=2
## P6,5,22,ID=0, num_zeros=1
## P6,5,23,ID=0, num_zeros=2
## P6,5,24,ID=0, num_zeros=2
## P6,5,25,ID=0, num_zeros=3
## P6,5,26,ID=0, num_zeros=3
## P6,5,27,ID=0, num_zeros=3
## P6,5,28,ID=0, num_zeros=6
## P6,5,29,ID=0, num_zeros=4
## P6,5,30,ID=0, num_zeros=4
## P6,5,31,ID=0, num_zeros=0
## P6,5,32,ID=0, num_zeros=1
## P6,5,33,ID=0, num_zeros=4
## P6,5,34,ID=0, num_zeros=5
## P6,5,35,ID=0, num_zeros=3
## P6,5,36,ID=0, num_zeros=3
## P6,5,37,ID=0, num_zeros=4
## P6,5,38,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=39 in LISTP6[[5]]
## P6,5,40,ID=0, num_zeros=4
## P6,5,41,ID=0, num_zeros=1
## P6,5,42,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=43 in LISTP6[[5]]
## P6,5,44,ID=0, num_zeros=3
## P6,5,45,ID=0, num_zeros=2
## P6,5,46,ID=0, num_zeros=0
## P6,5,47,ID=0, num_zeros=0
## P6,5,48,ID=0, num_zeros=1
## P6,5,49,ID=0, num_zeros=3
## P6,5,50,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=1 in LISTP6[[6]]
## P6,6,2,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=3 in LISTP6[[6]]
## P6,6,4,ID=0, num_zeros=3
## P6,6,5,ID=0, num_zeros=4
## P6,6,6,ID=0, num_zeros=1
## P6,6,7,ID=0, num_zeros=1
## P6,6,8,ID=0, num_zeros=4
## P6,6,9,ID=0, num_zeros=2
## P6,6,10,ID=0, num_zeros=5
## P6,6,11,ID=0, num_zeros=1
## P6,6,12,ID=0, num_zeros=2
## P6,6,13,ID=0, num_zeros=2
## P6,6,14,ID=0, num_zeros=2
## P6,6,15,ID=0, num_zeros=1
## P6,6,16,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=17 in LISTP6[[6]]
## P6,6,18,ID=0, num_zeros=1
## P6,6,19,ID=0, num_zeros=1
## P6,6,20,ID=0, num_zeros=1
## P6,6,21,ID=0, num_zeros=4
## P6,6,22,ID=0, num_zeros=2
## P6,6,23,ID=0, num_zeros=0
## P6,6,24,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=25 in LISTP6[[6]]
## P6,6,26,ID=0, num_zeros=0
## P6,6,27,ID=0, num_zeros=1
## P6,6,28,ID=0, num_zeros=1
## P6,6,29,ID=0, num_zeros=1
## P6,6,30,ID=0, num_zeros=1
## P6,6,31,ID=0, num_zeros=1
## P6,6,32,ID=0, num_zeros=0
## P6,6,33,ID=0, num_zeros=1
## P6,6,34,ID=0, num_zeros=1
## P6,6,35,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=36 in LISTP6[[6]]
## P6,6,37,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=38 in LISTP6[[6]]
## P6,6,39,ID=0, num_zeros=1
## P6,6,40,ID=0, num_zeros=3
## P6,6,41,ID=0, num_zeros=3
## P6,6,42,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=43 in LISTP6[[6]]
## P6,6,44,ID=0, num_zeros=1
## P6,6,45,ID=0, num_zeros=1
## P6,6,46,ID=0, num_zeros=2
## P6,6,47,ID=0, num_zeros=1
## P6,6,48,ID=0, num_zeros=2
## P6,6,49,ID=0, num_zeros=4
## P6,6,50,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=1 in LISTP6[[7]]
## P6,7,2,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=3 in LISTP6[[7]]
## P6,7,4,ID=0, num_zeros=4
## P6,7,5,ID=0, num_zeros=4
## P6,7,6,ID=0, num_zeros=0
## P6,7,7,ID=0, num_zeros=1
## P6,7,8,ID=0, num_zeros=6
## P6,7,9,ID=0, num_zeros=4
## P6,7,10,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=11 in LISTP6[[7]]
## Warning: There are no valid values for INTERVALS=12 in LISTP6[[7]]
## P6,7,13,ID=0, num_zeros=1
## P6,7,14,ID=0, num_zeros=2
## P6,7,15,ID=0, num_zeros=1
## P6,7,16,ID=0, num_zeros=5
## P6,7,17,ID=0, num_zeros=1
## P6,7,18,ID=0, num_zeros=1
## P6,7,19,ID=0, num_zeros=1
## P6,7,20,ID=0, num_zeros=3
## P6,7,21,ID=0, num_zeros=1
## P6,7,22,ID=0, num_zeros=2
## P6,7,23,ID=0, num_zeros=1
## P6,7,24,ID=0, num_zeros=5
## P6,7,25,ID=0, num_zeros=2
## P6,7,26,ID=0, num_zeros=7
## P6,7,27,ID=0, num_zeros=3
## P6,7,28,ID=0, num_zeros=3
## P6,7,29,ID=0, num_zeros=2
## P6,7,30,ID=0, num_zeros=3
## P6,7,31,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=32 in LISTP6[[7]]
## P6,7,33,ID=0, num_zeros=3
## P6,7,34,ID=0, num_zeros=1
## P6,7,35,ID=0, num_zeros=4
## P6,7,36,ID=0, num_zeros=1
## P6,7,37,ID=0, num_zeros=2
## P6,7,38,ID=0, num_zeros=2
## P6,7,39,ID=0, num_zeros=7
## P6,7,40,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=41 in LISTP6[[7]]
## P6,7,42,ID=0, num_zeros=2
## P6,7,43,ID=0, num_zeros=0
## P6,7,44,ID=0, num_zeros=1
## P6,7,45,ID=0, num_zeros=3
## P6,7,46,ID=0, num_zeros=3
## P6,7,47,ID=0, num_zeros=3
## P6,7,48,ID=0, num_zeros=1
## P6,7,49,ID=0, num_zeros=1
## P6,7,50,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=1 in LISTP6[[8]]
## Warning: There are no valid values for INTERVALS=2 in LISTP6[[8]]
## P6,8,3,ID=0, num_zeros=2
## P6,8,4,ID=0, num_zeros=2
## P6,8,5,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=6 in LISTP6[[8]]
## P6,8,7,ID=0, num_zeros=4
## P6,8,8,ID=0, num_zeros=2
## P6,8,9,ID=0, num_zeros=1
## P6,8,10,ID=0, num_zeros=1
## P6,8,11,ID=0, num_zeros=1
## P6,8,12,ID=0, num_zeros=0
## P6,8,13,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=14 in LISTP6[[8]]
## Warning: There are no valid values for INTERVALS=15 in LISTP6[[8]]
## Warning: There are no valid values for INTERVALS=16 in LISTP6[[8]]
## Warning: There are no valid values for INTERVALS=17 in LISTP6[[8]]
## P6,8,18,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=19 in LISTP6[[8]]
## Warning: There are no valid values for INTERVALS=20 in LISTP6[[8]]
## P6,8,21,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=22 in LISTP6[[8]]
## P6,8,23,ID=0, num_zeros=1
## P6,8,24,ID=0, num_zeros=2
## P6,8,25,ID=0, num_zeros=2
## P6,8,26,ID=0, num_zeros=1
## P6,8,27,ID=0, num_zeros=1
## P6,8,28,ID=0, num_zeros=1
## P6,8,29,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=30 in LISTP6[[8]]
## P6,8,31,ID=0, num_zeros=1
## P6,8,32,ID=0, num_zeros=1
## P6,8,33,ID=0, num_zeros=2
## P6,8,34,ID=0, num_zeros=5
## P6,8,35,ID=0, num_zeros=0
## P6,8,36,ID=0, num_zeros=2
## P6,8,37,ID=0, num_zeros=4
## P6,8,38,ID=0, num_zeros=1
## P6,8,39,ID=0, num_zeros=2
## P6,8,40,ID=0, num_zeros=1
## P6,8,41,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=42 in LISTP6[[8]]
## P6,8,43,ID=0, num_zeros=2
## P6,8,44,ID=0, num_zeros=3
## P6,8,45,ID=0, num_zeros=1
## P6,8,46,ID=0, num_zeros=4
## P6,8,47,ID=0, num_zeros=1
## P6,8,48,ID=0, num_zeros=5
## P6,8,49,ID=0, num_zeros=1
## P6,8,50,ID=0, num_zeros=24
## Warning: There are no valid values for INTERVALS=1 in LISTP6[[9]]
## Warning: There are no valid values for INTERVALS=2 in LISTP6[[9]]
## P6,9,3,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=4 in LISTP6[[9]]
## P6,9,5,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=6 in LISTP6[[9]]
## Warning: There are no valid values for INTERVALS=7 in LISTP6[[9]]
## P6,9,8,ID=0, num_zeros=1
## P6,9,9,ID=0, num_zeros=1
## P6,9,10,ID=0, num_zeros=2
## P6,9,11,ID=0, num_zeros=1
## P6,9,12,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=13 in LISTP6[[9]]
## Warning: There are no valid values for INTERVALS=14 in LISTP6[[9]]
## P6,9,15,ID=0, num_zeros=3
## P6,9,16,ID=0, num_zeros=4
## P6,9,17,ID=0, num_zeros=5
## P6,9,18,ID=0, num_zeros=3
## P6,9,19,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=20 in LISTP6[[9]]
## P6,9,21,ID=0, num_zeros=1
## P6,9,22,ID=0, num_zeros=1
## P6,9,23,ID=0, num_zeros=5
## P6,9,24,ID=0, num_zeros=3
## P6,9,25,ID=0, num_zeros=2
## P6,9,26,ID=0, num_zeros=2
## P6,9,27,ID=0, num_zeros=1
## P6,9,28,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=29 in LISTP6[[9]]
## P6,9,30,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=31 in LISTP6[[9]]
## P6,9,32,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=33 in LISTP6[[9]]
## Warning: There are no valid values for INTERVALS=34 in LISTP6[[9]]
## P6,9,35,ID=0, num_zeros=1
## P6,9,36,ID=0, num_zeros=0
## P6,9,37,ID=0, num_zeros=1
## P6,9,38,ID=0, num_zeros=1
## P6,9,39,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=40 in LISTP6[[9]]
## P6,9,41,ID=0, num_zeros=1
## P6,9,42,ID=0, num_zeros=1
## P6,9,43,ID=0, num_zeros=2
## P6,9,44,ID=0, num_zeros=2
## P6,9,45,ID=0, num_zeros=1
## P6,9,46,ID=0, num_zeros=3
## P6,9,47,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=48 in LISTP6[[9]]
## P6,9,49,ID=0, num_zeros=4
## P6,9,50,ID=0, num_zeros=18
## P6,10,1,ID=0, num_zeros=1
## P6,10,2,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=3 in LISTP6[[10]]
## P6,10,4,ID=0, num_zeros=1
## P6,10,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP6[[10]]
## P6,10,7,ID=0, num_zeros=1
## P6,10,8,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=9 in LISTP6[[10]]
## Warning: There are no valid values for INTERVALS=10 in LISTP6[[10]]
## P6,10,11,ID=0, num_zeros=2
## P6,10,12,ID=0, num_zeros=1
## P6,10,13,ID=0, num_zeros=2
## P6,10,14,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=15 in LISTP6[[10]]
## P6,10,16,ID=0, num_zeros=1
## P6,10,17,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=18 in LISTP6[[10]]
## Warning: There are no valid values for INTERVALS=19 in LISTP6[[10]]
## P6,10,20,ID=0, num_zeros=1
## P6,10,21,ID=0, num_zeros=0
## P6,10,22,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=23 in LISTP6[[10]]
## P6,10,24,ID=0, num_zeros=1
## P6,10,25,ID=0, num_zeros=1
## P6,10,26,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=27 in LISTP6[[10]]
## Warning: There are no valid values for INTERVALS=28 in LISTP6[[10]]
## Warning: There are no valid values for INTERVALS=29 in LISTP6[[10]]
## Warning: There are no valid values for INTERVALS=30 in LISTP6[[10]]
## Warning: There are no valid values for INTERVALS=31 in LISTP6[[10]]
## P6,10,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP6[[10]]
## Warning: There are no valid values for INTERVALS=34 in LISTP6[[10]]
## P6,10,35,ID=0, num_zeros=4
## P6,10,36,ID=0, num_zeros=1
## P6,10,37,ID=0, num_zeros=2
## P6,10,38,ID=0, num_zeros=3
## P6,10,39,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=40 in LISTP6[[10]]
## Warning: There are no valid values for INTERVALS=41 in LISTP6[[10]]
## Warning: There are no valid values for INTERVALS=42 in LISTP6[[10]]
## P6,10,43,ID=0, num_zeros=1
## P6,10,44,ID=0, num_zeros=1
## P6,10,45,ID=0, num_zeros=4
## P6,10,46,ID=0, num_zeros=1
## P6,10,47,ID=0, num_zeros=1
## P6,10,48,ID=0, num_zeros=3
## P6,10,49,ID=0, num_zeros=1
## P6,10,50,ID=0, num_zeros=33
## P7,1,1,ID=0, num_zeros=4
## P7,1,2,ID=0, num_zeros=1
## P7,1,3,ID=0, num_zeros=3
## P7,1,4,ID=0, num_zeros=3
## P7,1,5,ID=0, num_zeros=1
## P7,1,6,ID=0, num_zeros=2
## P7,1,7,ID=0, num_zeros=4
## P7,1,8,ID=0, num_zeros=9
## P7,1,9,ID=0, num_zeros=5
## P7,1,10,ID=0, num_zeros=6
## P7,1,11,ID=0, num_zeros=1
## P7,1,12,ID=0, num_zeros=3
## P7,1,13,ID=0, num_zeros=4
## P7,1,14,ID=0, num_zeros=1
## P7,1,15,ID=0, num_zeros=1
## P7,1,16,ID=0, num_zeros=2
## P7,1,17,ID=0, num_zeros=5
## P7,1,18,ID=0, num_zeros=0
## P7,1,19,ID=0, num_zeros=3
## P7,1,20,ID=0, num_zeros=2
## P7,1,21,ID=0, num_zeros=5
## P7,1,22,ID=0, num_zeros=5
## P7,1,23,ID=0, num_zeros=4
## P7,1,24,ID=0, num_zeros=3
## P7,1,25,ID=0, num_zeros=2
## P7,1,26,ID=0, num_zeros=2
## P7,1,27,ID=0, num_zeros=4
## P7,1,28,ID=0, num_zeros=3
## P7,1,29,ID=0, num_zeros=1
## P7,1,30,ID=0, num_zeros=2
## P7,1,31,ID=0, num_zeros=0
## P7,1,32,ID=0, num_zeros=5
## P7,1,33,ID=0, num_zeros=4
## P7,1,34,ID=0, num_zeros=3
## P7,1,35,ID=0, num_zeros=1
## P7,1,36,ID=0, num_zeros=5
## P7,1,37,ID=0, num_zeros=5
## P7,1,38,ID=0, num_zeros=3
## P7,1,39,ID=0, num_zeros=4
## P7,1,40,ID=0, num_zeros=0
## P7,1,41,ID=0, num_zeros=2
## P7,1,42,ID=0, num_zeros=1
## P7,1,43,ID=0, num_zeros=1
## P7,1,44,ID=0, num_zeros=2
## P7,1,45,ID=0, num_zeros=7
## P7,1,46,ID=0, num_zeros=2
## P7,1,47,ID=0, num_zeros=2
## P7,1,48,ID=0, num_zeros=1
## P7,1,49,ID=0, num_zeros=2
## P7,1,50,ID=0, num_zeros=2
## P7,2,1,ID=0, num_zeros=2
## P7,2,2,ID=0, num_zeros=0
## P7,2,3,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=4 in LISTP7[[2]]
## P7,2,5,ID=0, num_zeros=1
## P7,2,6,ID=0, num_zeros=3
## P7,2,7,ID=0, num_zeros=1
## P7,2,8,ID=0, num_zeros=1
## P7,2,9,ID=0, num_zeros=2
## P7,2,10,ID=0, num_zeros=1
## P7,2,11,ID=0, num_zeros=4
## P7,2,12,ID=0, num_zeros=3
## P7,2,13,ID=0, num_zeros=2
## P7,2,14,ID=0, num_zeros=2
## P7,2,15,ID=0, num_zeros=2
## P7,2,16,ID=0, num_zeros=3
## P7,2,17,ID=0, num_zeros=2
## P7,2,18,ID=0, num_zeros=0
## P7,2,19,ID=0, num_zeros=1
## P7,2,20,ID=0, num_zeros=3
## P7,2,21,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=22 in LISTP7[[2]]
## P7,2,23,ID=0, num_zeros=2
## P7,2,24,ID=0, num_zeros=0
## P7,2,25,ID=0, num_zeros=1
## P7,2,26,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=27 in LISTP7[[2]]
## P7,2,28,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=29 in LISTP7[[2]]
## P7,2,30,ID=0, num_zeros=1
## P7,2,31,ID=0, num_zeros=4
## P7,2,32,ID=0, num_zeros=2
## P7,2,33,ID=0, num_zeros=1
## P7,2,34,ID=0, num_zeros=4
## P7,2,35,ID=0, num_zeros=1
## P7,2,36,ID=0, num_zeros=1
## P7,2,37,ID=0, num_zeros=1
## P7,2,38,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=39 in LISTP7[[2]]
## P7,2,40,ID=0, num_zeros=2
## P7,2,41,ID=0, num_zeros=3
## P7,2,42,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=43 in LISTP7[[2]]
## P7,2,44,ID=0, num_zeros=0
## P7,2,45,ID=0, num_zeros=3
## P7,2,46,ID=0, num_zeros=0
## P7,2,47,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=48 in LISTP7[[2]]
## P7,2,49,ID=0, num_zeros=1
## P7,2,50,ID=0, num_zeros=2
## P7,3,1,ID=0, num_zeros=3
## P7,3,2,ID=0, num_zeros=1
## P7,3,3,ID=0, num_zeros=1
## P7,3,4,ID=0, num_zeros=1
## P7,3,5,ID=0, num_zeros=1
## P7,3,6,ID=0, num_zeros=5
## P7,3,7,ID=0, num_zeros=2
## P7,3,8,ID=0, num_zeros=2
## P7,3,9,ID=0, num_zeros=1
## P7,3,10,ID=0, num_zeros=1
## P7,3,11,ID=0, num_zeros=3
## P7,3,12,ID=0, num_zeros=0
## P7,3,13,ID=0, num_zeros=4
## P7,3,14,ID=0, num_zeros=3
## P7,3,15,ID=0, num_zeros=1
## P7,3,16,ID=0, num_zeros=0
## P7,3,17,ID=0, num_zeros=2
## P7,3,18,ID=0, num_zeros=1
## P7,3,19,ID=0, num_zeros=3
## P7,3,20,ID=0, num_zeros=2
## P7,3,21,ID=0, num_zeros=3
## P7,3,22,ID=0, num_zeros=1
## P7,3,23,ID=0, num_zeros=1
## P7,3,24,ID=0, num_zeros=2
## P7,3,25,ID=0, num_zeros=1
## P7,3,26,ID=0, num_zeros=2
## P7,3,27,ID=0, num_zeros=4
## P7,3,28,ID=0, num_zeros=0
## P7,3,29,ID=0, num_zeros=4
## P7,3,30,ID=0, num_zeros=3
## P7,3,31,ID=0, num_zeros=4
## P7,3,32,ID=0, num_zeros=5
## P7,3,33,ID=0, num_zeros=1
## P7,3,34,ID=0, num_zeros=1
## P7,3,35,ID=0, num_zeros=2
## P7,3,36,ID=0, num_zeros=4
## P7,3,37,ID=0, num_zeros=2
## P7,3,38,ID=0, num_zeros=4
## P7,3,39,ID=0, num_zeros=5
## P7,3,40,ID=0, num_zeros=5
## P7,3,41,ID=0, num_zeros=5
## P7,3,42,ID=0, num_zeros=1
## P7,3,43,ID=0, num_zeros=3
## P7,3,44,ID=0, num_zeros=2
## P7,3,45,ID=0, num_zeros=2
## P7,3,46,ID=0, num_zeros=1
## P7,3,47,ID=0, num_zeros=0
## P7,3,48,ID=0, num_zeros=1
## P7,3,49,ID=0, num_zeros=3
## P7,3,50,ID=0, num_zeros=5
## P7,4,1,ID=0, num_zeros=4
## P7,4,2,ID=0, num_zeros=2
## P7,4,3,ID=0, num_zeros=2
## P7,4,4,ID=0, num_zeros=2
## P7,4,5,ID=0, num_zeros=8
## P7,4,6,ID=0, num_zeros=2
## P7,4,7,ID=0, num_zeros=3
## P7,4,8,ID=0, num_zeros=6
## P7,4,9,ID=0, num_zeros=2
## P7,4,10,ID=0, num_zeros=3
## P7,4,11,ID=0, num_zeros=5
## P7,4,12,ID=0, num_zeros=2
## P7,4,13,ID=0, num_zeros=1
## P7,4,14,ID=0, num_zeros=2
## P7,4,15,ID=0, num_zeros=0
## P7,4,16,ID=0, num_zeros=4
## P7,4,17,ID=0, num_zeros=0
## P7,4,18,ID=0, num_zeros=3
## P7,4,19,ID=0, num_zeros=2
## P7,4,20,ID=0, num_zeros=2
## P7,4,21,ID=0, num_zeros=3
## P7,4,22,ID=0, num_zeros=1
## P7,4,23,ID=0, num_zeros=1
## P7,4,24,ID=0, num_zeros=1
## P7,4,25,ID=0, num_zeros=3
## P7,4,26,ID=0, num_zeros=5
## P7,4,27,ID=0, num_zeros=1
## P7,4,28,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=29 in LISTP7[[4]]
## P7,4,30,ID=0, num_zeros=2
## P7,4,31,ID=0, num_zeros=1
## P7,4,32,ID=0, num_zeros=1
## P7,4,33,ID=0, num_zeros=0
## P7,4,34,ID=0, num_zeros=5
## P7,4,35,ID=0, num_zeros=1
## P7,4,36,ID=0, num_zeros=4
## P7,4,37,ID=0, num_zeros=2
## P7,4,38,ID=0, num_zeros=1
## P7,4,39,ID=0, num_zeros=1
## P7,4,40,ID=0, num_zeros=3
## P7,4,41,ID=0, num_zeros=4
## P7,4,42,ID=0, num_zeros=3
## P7,4,43,ID=0, num_zeros=2
## P7,4,44,ID=0, num_zeros=2
## P7,4,45,ID=0, num_zeros=3
## P7,4,46,ID=0, num_zeros=4
## P7,4,47,ID=0, num_zeros=3
## P7,4,48,ID=0, num_zeros=1
## P7,4,49,ID=0, num_zeros=4
## P7,4,50,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=1 in LISTP7[[5]]
## P7,5,2,ID=0, num_zeros=4
## P7,5,3,ID=0, num_zeros=3
## P7,5,4,ID=0, num_zeros=1
## P7,5,5,ID=0, num_zeros=4
## P7,5,6,ID=0, num_zeros=2
## P7,5,7,ID=0, num_zeros=2
## P7,5,8,ID=0, num_zeros=6
## P7,5,9,ID=0, num_zeros=2
## P7,5,10,ID=0, num_zeros=2
## P7,5,11,ID=0, num_zeros=7
## P7,5,12,ID=0, num_zeros=3
## P7,5,13,ID=0, num_zeros=0
## P7,5,14,ID=0, num_zeros=1
## P7,5,15,ID=0, num_zeros=5
## P7,5,16,ID=0, num_zeros=2
## P7,5,17,ID=0, num_zeros=0
## P7,5,18,ID=0, num_zeros=1
## P7,5,19,ID=0, num_zeros=2
## P7,5,20,ID=0, num_zeros=3
## P7,5,21,ID=0, num_zeros=1
## P7,5,22,ID=0, num_zeros=1
## P7,5,23,ID=0, num_zeros=3
## P7,5,24,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=25 in LISTP7[[5]]
## P7,5,26,ID=0, num_zeros=0
## P7,5,27,ID=0, num_zeros=1
## P7,5,28,ID=0, num_zeros=3
## P7,5,29,ID=0, num_zeros=4
## P7,5,30,ID=0, num_zeros=1
## P7,5,31,ID=0, num_zeros=2
## P7,5,32,ID=0, num_zeros=3
## P7,5,33,ID=0, num_zeros=2
## P7,5,34,ID=0, num_zeros=6
## P7,5,35,ID=0, num_zeros=2
## P7,5,36,ID=0, num_zeros=1
## P7,5,37,ID=0, num_zeros=0
## P7,5,38,ID=0, num_zeros=3
## P7,5,39,ID=0, num_zeros=3
## P7,5,40,ID=0, num_zeros=6
## P7,5,41,ID=0, num_zeros=5
## P7,5,42,ID=0, num_zeros=0
## P7,5,43,ID=0, num_zeros=3
## P7,5,44,ID=0, num_zeros=5
## P7,5,45,ID=0, num_zeros=3
## P7,5,46,ID=0, num_zeros=5
## P7,5,47,ID=0, num_zeros=3
## P7,5,48,ID=0, num_zeros=2
## P7,5,49,ID=0, num_zeros=8
## P7,5,50,ID=0, num_zeros=6
## P7,6,1,ID=0, num_zeros=3
## P7,6,2,ID=0, num_zeros=4
## P7,6,3,ID=0, num_zeros=0
## P7,6,4,ID=0, num_zeros=3
## P7,6,5,ID=0, num_zeros=2
## P7,6,6,ID=0, num_zeros=1
## P7,6,7,ID=0, num_zeros=2
## P7,6,8,ID=0, num_zeros=1
## P7,6,9,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=10 in LISTP7[[6]]
## P7,6,11,ID=0, num_zeros=2
## P7,6,12,ID=0, num_zeros=4
## P7,6,13,ID=0, num_zeros=2
## P7,6,14,ID=0, num_zeros=3
## P7,6,15,ID=0, num_zeros=5
## P7,6,16,ID=0, num_zeros=2
## P7,6,17,ID=0, num_zeros=6
## P7,6,18,ID=0, num_zeros=1
## P7,6,19,ID=0, num_zeros=2
## P7,6,20,ID=0, num_zeros=5
## P7,6,21,ID=0, num_zeros=1
## P7,6,22,ID=0, num_zeros=6
## P7,6,23,ID=0, num_zeros=5
## P7,6,24,ID=0, num_zeros=2
## P7,6,25,ID=0, num_zeros=2
## P7,6,26,ID=0, num_zeros=2
## P7,6,27,ID=0, num_zeros=2
## P7,6,28,ID=0, num_zeros=1
## P7,6,29,ID=0, num_zeros=1
## P7,6,30,ID=0, num_zeros=2
## P7,6,31,ID=0, num_zeros=3
## P7,6,32,ID=0, num_zeros=3
## P7,6,33,ID=0, num_zeros=3
## P7,6,34,ID=0, num_zeros=4
## P7,6,35,ID=0, num_zeros=5
## P7,6,36,ID=0, num_zeros=4
## P7,6,37,ID=0, num_zeros=3
## P7,6,38,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=39 in LISTP7[[6]]
## P7,6,40,ID=0, num_zeros=3
## P7,6,41,ID=0, num_zeros=3
## P7,6,42,ID=0, num_zeros=3
## P7,6,43,ID=0, num_zeros=0
## P7,6,44,ID=0, num_zeros=2
## P7,6,45,ID=0, num_zeros=3
## P7,6,46,ID=0, num_zeros=2
## P7,6,47,ID=0, num_zeros=2
## P7,6,48,ID=0, num_zeros=2
## P7,6,49,ID=0, num_zeros=6
## P7,6,50,ID=0, num_zeros=5
## P7,7,1,ID=0, num_zeros=2
## P7,7,2,ID=0, num_zeros=0
## P7,7,3,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=4 in LISTP7[[7]]
## P7,7,5,ID=0, num_zeros=1
## P7,7,6,ID=0, num_zeros=1
## P7,7,7,ID=0, num_zeros=2
## P7,7,8,ID=0, num_zeros=1
## P7,7,9,ID=0, num_zeros=4
## P7,7,10,ID=0, num_zeros=2
## P7,7,11,ID=0, num_zeros=5
## P7,7,12,ID=0, num_zeros=4
## P7,7,13,ID=0, num_zeros=2
## P7,7,14,ID=0, num_zeros=2
## P7,7,15,ID=0, num_zeros=3
## P7,7,16,ID=0, num_zeros=1
## P7,7,17,ID=0, num_zeros=1
## P7,7,18,ID=0, num_zeros=2
## P7,7,19,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=20 in LISTP7[[7]]
## P7,7,21,ID=0, num_zeros=2
## P7,7,22,ID=0, num_zeros=6
## P7,7,23,ID=0, num_zeros=0
## P7,7,24,ID=0, num_zeros=2
## P7,7,25,ID=0, num_zeros=8
## P7,7,26,ID=0, num_zeros=2
## P7,7,27,ID=0, num_zeros=1
## P7,7,28,ID=0, num_zeros=4
## P7,7,29,ID=0, num_zeros=2
## P7,7,30,ID=0, num_zeros=2
## P7,7,31,ID=0, num_zeros=3
## P7,7,32,ID=0, num_zeros=6
## P7,7,33,ID=0, num_zeros=1
## P7,7,34,ID=0, num_zeros=1
## P7,7,35,ID=0, num_zeros=2
## P7,7,36,ID=0, num_zeros=1
## P7,7,37,ID=0, num_zeros=4
## P7,7,38,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=39 in LISTP7[[7]]
## P7,7,40,ID=0, num_zeros=4
## P7,7,41,ID=0, num_zeros=4
## P7,7,42,ID=0, num_zeros=2
## P7,7,43,ID=0, num_zeros=3
## P7,7,44,ID=0, num_zeros=2
## P7,7,45,ID=0, num_zeros=3
## P7,7,46,ID=0, num_zeros=1
## P7,7,47,ID=0, num_zeros=3
## P7,7,48,ID=0, num_zeros=1
## P7,7,49,ID=0, num_zeros=1
## P7,7,50,ID=0, num_zeros=4
## P7,8,1,ID=0, num_zeros=2
## P7,8,2,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=3 in LISTP7[[8]]
## P7,8,4,ID=0, num_zeros=1
## P7,8,5,ID=0, num_zeros=6
## P7,8,6,ID=0, num_zeros=1
## P7,8,7,ID=0, num_zeros=1
## P7,8,8,ID=0, num_zeros=2
## P7,8,9,ID=0, num_zeros=1
## P7,8,10,ID=0, num_zeros=1
## P7,8,11,ID=0, num_zeros=1
## P7,8,12,ID=0, num_zeros=3
## P7,8,13,ID=0, num_zeros=1
## P7,8,14,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=15 in LISTP7[[8]]
## P7,8,16,ID=0, num_zeros=1
## P7,8,17,ID=0, num_zeros=2
## P7,8,18,ID=0, num_zeros=4
## P7,8,19,ID=0, num_zeros=0
## P7,8,20,ID=0, num_zeros=0
## P7,8,21,ID=0, num_zeros=2
## P7,8,22,ID=0, num_zeros=2
## P7,8,23,ID=0, num_zeros=2
## P7,8,24,ID=0, num_zeros=2
## P7,8,25,ID=0, num_zeros=2
## P7,8,26,ID=0, num_zeros=1
## P7,8,27,ID=0, num_zeros=0
## P7,8,28,ID=0, num_zeros=2
## P7,8,29,ID=0, num_zeros=4
## P7,8,30,ID=0, num_zeros=1
## P7,8,31,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=32 in LISTP7[[8]]
## Warning: There are no valid values for INTERVALS=33 in LISTP7[[8]]
## P7,8,34,ID=0, num_zeros=2
## P7,8,35,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=36 in LISTP7[[8]]
## Warning: There are no valid values for INTERVALS=37 in LISTP7[[8]]
## P7,8,38,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=39 in LISTP7[[8]]
## P7,8,40,ID=0, num_zeros=2
## P7,8,41,ID=0, num_zeros=1
## P7,8,42,ID=0, num_zeros=2
## P7,8,43,ID=0, num_zeros=5
## P7,8,44,ID=0, num_zeros=1
## P7,8,45,ID=0, num_zeros=3
## P7,8,46,ID=0, num_zeros=1
## P7,8,47,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=48 in LISTP7[[8]]
## P7,8,49,ID=0, num_zeros=1
## P7,8,50,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=1 in LISTP7[[9]]
## Warning: There are no valid values for INTERVALS=2 in LISTP7[[9]]
## P7,9,3,ID=0, num_zeros=0
## P7,9,4,ID=0, num_zeros=1
## P7,9,5,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=6 in LISTP7[[9]]
## P7,9,7,ID=0, num_zeros=2
## P7,9,8,ID=0, num_zeros=3
## P7,9,9,ID=0, num_zeros=3
## P7,9,10,ID=0, num_zeros=3
## P7,9,11,ID=0, num_zeros=0
## P7,9,12,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=13 in LISTP7[[9]]
## P7,9,14,ID=0, num_zeros=1
## P7,9,15,ID=0, num_zeros=2
## P7,9,16,ID=0, num_zeros=2
## P7,9,17,ID=0, num_zeros=1
## P7,9,18,ID=0, num_zeros=2
## P7,9,19,ID=0, num_zeros=3
## P7,9,20,ID=0, num_zeros=3
## P7,9,21,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=22 in LISTP7[[9]]
## P7,9,23,ID=0, num_zeros=5
## P7,9,24,ID=0, num_zeros=3
## P7,9,25,ID=0, num_zeros=2
## P7,9,26,ID=0, num_zeros=0
## P7,9,27,ID=0, num_zeros=2
## P7,9,28,ID=0, num_zeros=3
## P7,9,29,ID=0, num_zeros=2
## P7,9,30,ID=0, num_zeros=1
## P7,9,31,ID=0, num_zeros=2
## P7,9,32,ID=0, num_zeros=1
## P7,9,33,ID=0, num_zeros=3
## P7,9,34,ID=0, num_zeros=2
## P7,9,35,ID=0, num_zeros=5
## P7,9,36,ID=0, num_zeros=1
## P7,9,37,ID=0, num_zeros=1
## P7,9,38,ID=0, num_zeros=2
## P7,9,39,ID=0, num_zeros=1
## P7,9,40,ID=0, num_zeros=3
## P7,9,41,ID=0, num_zeros=2
## P7,9,42,ID=0, num_zeros=1
## P7,9,43,ID=0, num_zeros=1
## P7,9,44,ID=0, num_zeros=2
## P7,9,45,ID=0, num_zeros=1
## P7,9,46,ID=0, num_zeros=2
## P7,9,47,ID=0, num_zeros=0
## P7,9,48,ID=0, num_zeros=5
## P7,9,49,ID=0, num_zeros=4
## P7,9,50,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=1 in LISTP7[[10]]
## P7,10,2,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=3 in LISTP7[[10]]
## P7,10,4,ID=0, num_zeros=1
## P7,10,5,ID=0, num_zeros=4
## P7,10,6,ID=0, num_zeros=1
## P7,10,7,ID=0, num_zeros=2
## P7,10,8,ID=0, num_zeros=2
## P7,10,9,ID=0, num_zeros=9
## P7,10,10,ID=0, num_zeros=2
## P7,10,11,ID=0, num_zeros=5
## P7,10,12,ID=0, num_zeros=1
## P7,10,13,ID=0, num_zeros=3
## P7,10,14,ID=0, num_zeros=2
## P7,10,15,ID=0, num_zeros=4
## P7,10,16,ID=0, num_zeros=5
## P7,10,17,ID=0, num_zeros=2
## P7,10,18,ID=0, num_zeros=4
## P7,10,19,ID=0, num_zeros=3
## P7,10,20,ID=0, num_zeros=1
## P7,10,21,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=22 in LISTP7[[10]]
## P7,10,23,ID=0, num_zeros=3
## P7,10,24,ID=0, num_zeros=3
## P7,10,25,ID=0, num_zeros=1
## P7,10,26,ID=0, num_zeros=4
## P7,10,27,ID=0, num_zeros=2
## P7,10,28,ID=0, num_zeros=2
## P7,10,29,ID=0, num_zeros=5
## P7,10,30,ID=0, num_zeros=2
## P7,10,31,ID=0, num_zeros=3
## P7,10,32,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=33 in LISTP7[[10]]
## P7,10,34,ID=0, num_zeros=2
## P7,10,35,ID=0, num_zeros=5
## P7,10,36,ID=0, num_zeros=3
## P7,10,37,ID=0, num_zeros=1
## P7,10,38,ID=0, num_zeros=1
## P7,10,39,ID=0, num_zeros=4
## P7,10,40,ID=0, num_zeros=3
## P7,10,41,ID=0, num_zeros=2
## P7,10,42,ID=0, num_zeros=1
## P7,10,43,ID=0, num_zeros=2
## P7,10,44,ID=0, num_zeros=2
## P7,10,45,ID=0, num_zeros=3
## P7,10,46,ID=0, num_zeros=0
## P7,10,47,ID=0, num_zeros=3
## P7,10,48,ID=0, num_zeros=3
## P7,10,49,ID=0, num_zeros=3
## P7,10,50,ID=0, num_zeros=5
## P8,1,1,ID=0, num_zeros=3
## P8,1,2,ID=0, num_zeros=3
## P8,1,3,ID=0, num_zeros=4
## P8,1,4,ID=0, num_zeros=4
## P8,1,5,ID=0, num_zeros=1
## P8,1,6,ID=0, num_zeros=2
## P8,1,7,ID=0, num_zeros=5
## P8,1,8,ID=0, num_zeros=5
## P8,1,9,ID=0, num_zeros=2
## P8,1,10,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=11 in LISTP8[[1]]
## P8,1,12,ID=0, num_zeros=1
## P8,1,13,ID=0, num_zeros=2
## P8,1,14,ID=0, num_zeros=1
## P8,1,15,ID=0, num_zeros=1
## P8,1,16,ID=0, num_zeros=0
## P8,1,17,ID=0, num_zeros=3
## P8,1,18,ID=0, num_zeros=1
## P8,1,19,ID=0, num_zeros=2
## P8,1,20,ID=0, num_zeros=4
## P8,1,21,ID=0, num_zeros=5
## P8,1,22,ID=0, num_zeros=6
## P8,1,23,ID=0, num_zeros=4
## P8,1,24,ID=0, num_zeros=4
## P8,1,25,ID=0, num_zeros=2
## P8,1,26,ID=0, num_zeros=2
## P8,1,27,ID=0, num_zeros=3
## P8,1,28,ID=0, num_zeros=2
## P8,1,29,ID=0, num_zeros=9
## P8,1,30,ID=0, num_zeros=4
## P8,1,31,ID=0, num_zeros=1
## P8,1,32,ID=0, num_zeros=9
## P8,1,33,ID=0, num_zeros=4
## P8,1,34,ID=0, num_zeros=1
## P8,1,35,ID=0, num_zeros=1
## P8,1,36,ID=0, num_zeros=5
## P8,1,37,ID=0, num_zeros=2
## P8,1,38,ID=0, num_zeros=6
## P8,1,39,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=40 in LISTP8[[1]]
## P8,1,41,ID=0, num_zeros=5
## P8,1,42,ID=0, num_zeros=4
## P8,1,43,ID=0, num_zeros=1
## P8,1,44,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=45 in LISTP8[[1]]
## P8,1,46,ID=0, num_zeros=5
## P8,1,47,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=48 in LISTP8[[1]]
## Warning: There are no valid values for INTERVALS=49 in LISTP8[[1]]
## P8,1,50,ID=0, num_zeros=28
## P8,2,1,ID=0, num_zeros=1
## P8,2,2,ID=0, num_zeros=4
## P8,2,3,ID=0, num_zeros=3
## P8,2,4,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=5 in LISTP8[[2]]
## Warning: There are no valid values for INTERVALS=6 in LISTP8[[2]]
## P8,2,7,ID=0, num_zeros=5
## P8,2,8,ID=0, num_zeros=4
## P8,2,9,ID=0, num_zeros=2
## P8,2,10,ID=0, num_zeros=1
## P8,2,11,ID=0, num_zeros=3
## P8,2,12,ID=0, num_zeros=2
## P8,2,13,ID=0, num_zeros=1
## P8,2,14,ID=0, num_zeros=2
## P8,2,15,ID=0, num_zeros=2
## P8,2,16,ID=0, num_zeros=2
## P8,2,17,ID=0, num_zeros=2
## P8,2,18,ID=0, num_zeros=1
## P8,2,19,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=20 in LISTP8[[2]]
## P8,2,21,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=22 in LISTP8[[2]]
## P8,2,23,ID=0, num_zeros=5
## P8,2,24,ID=0, num_zeros=2
## P8,2,25,ID=0, num_zeros=2
## P8,2,26,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=27 in LISTP8[[2]]
## P8,2,28,ID=0, num_zeros=2
## P8,2,29,ID=0, num_zeros=2
## P8,2,30,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=31 in LISTP8[[2]]
## P8,2,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP8[[2]]
## P8,2,34,ID=0, num_zeros=3
## P8,2,35,ID=0, num_zeros=1
## P8,2,36,ID=0, num_zeros=5
## P8,2,37,ID=0, num_zeros=6
## P8,2,38,ID=0, num_zeros=1
## P8,2,39,ID=0, num_zeros=2
## P8,2,40,ID=0, num_zeros=7
## P8,2,41,ID=0, num_zeros=2
## P8,2,42,ID=0, num_zeros=1
## P8,2,43,ID=0, num_zeros=2
## P8,2,44,ID=0, num_zeros=6
## P8,2,45,ID=0, num_zeros=1
## P8,2,46,ID=0, num_zeros=1
## P8,2,47,ID=0, num_zeros=3
## P8,2,48,ID=0, num_zeros=4
## P8,2,49,ID=0, num_zeros=4
## P8,2,50,ID=0, num_zeros=10
## P8,3,1,ID=0, num_zeros=2
## P8,3,2,ID=0, num_zeros=1
## P8,3,3,ID=0, num_zeros=0
## P8,3,4,ID=0, num_zeros=2
## P8,3,5,ID=0, num_zeros=3
## P8,3,6,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=7 in LISTP8[[3]]
## P8,3,8,ID=0, num_zeros=5
## P8,3,9,ID=0, num_zeros=2
## P8,3,10,ID=0, num_zeros=3
## P8,3,11,ID=0, num_zeros=2
## P8,3,12,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=13 in LISTP8[[3]]
## P8,3,14,ID=0, num_zeros=1
## P8,3,15,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=16 in LISTP8[[3]]
## P8,3,17,ID=0, num_zeros=1
## P8,3,18,ID=0, num_zeros=1
## P8,3,19,ID=0, num_zeros=3
## P8,3,20,ID=0, num_zeros=2
## P8,3,21,ID=0, num_zeros=1
## P8,3,22,ID=0, num_zeros=3
## P8,3,23,ID=0, num_zeros=4
## P8,3,24,ID=0, num_zeros=1
## P8,3,25,ID=0, num_zeros=1
## P8,3,26,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=27 in LISTP8[[3]]
## Warning: There are no valid values for INTERVALS=28 in LISTP8[[3]]
## P8,3,29,ID=0, num_zeros=1
## P8,3,30,ID=0, num_zeros=1
## P8,3,31,ID=0, num_zeros=1
## P8,3,32,ID=0, num_zeros=4
## P8,3,33,ID=0, num_zeros=1
## P8,3,34,ID=0, num_zeros=2
## P8,3,35,ID=0, num_zeros=1
## P8,3,36,ID=0, num_zeros=3
## P8,3,37,ID=0, num_zeros=1
## P8,3,38,ID=0, num_zeros=2
## P8,3,39,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=40 in LISTP8[[3]]
## P8,3,41,ID=0, num_zeros=2
## P8,3,42,ID=0, num_zeros=3
## P8,3,43,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=44 in LISTP8[[3]]
## P8,3,45,ID=0, num_zeros=2
## P8,3,46,ID=0, num_zeros=3
## P8,3,47,ID=0, num_zeros=0
## P8,3,48,ID=0, num_zeros=1
## P8,3,49,ID=0, num_zeros=3
## P8,3,50,ID=0, num_zeros=8
## P8,4,1,ID=0, num_zeros=3
## P8,4,2,ID=0, num_zeros=3
## P8,4,3,ID=0, num_zeros=1
## P8,4,4,ID=0, num_zeros=1
## P8,4,5,ID=0, num_zeros=3
## P8,4,6,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=7 in LISTP8[[4]]
## P8,4,8,ID=0, num_zeros=1
## P8,4,9,ID=0, num_zeros=4
## P8,4,10,ID=0, num_zeros=2
## P8,4,11,ID=0, num_zeros=2
## P8,4,12,ID=0, num_zeros=2
## P8,4,13,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=14 in LISTP8[[4]]
## P8,4,15,ID=0, num_zeros=4
## P8,4,16,ID=0, num_zeros=1
## P8,4,17,ID=0, num_zeros=8
## P8,4,18,ID=0, num_zeros=4
## P8,4,19,ID=0, num_zeros=1
## P8,4,20,ID=0, num_zeros=0
## P8,4,21,ID=0, num_zeros=2
## P8,4,22,ID=0, num_zeros=3
## P8,4,23,ID=0, num_zeros=5
## P8,4,24,ID=0, num_zeros=4
## P8,4,25,ID=0, num_zeros=0
## P8,4,26,ID=0, num_zeros=5
## P8,4,27,ID=0, num_zeros=1
## P8,4,28,ID=0, num_zeros=3
## P8,4,29,ID=0, num_zeros=3
## P8,4,30,ID=0, num_zeros=1
## P8,4,31,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=32 in LISTP8[[4]]
## P8,4,33,ID=0, num_zeros=2
## P8,4,34,ID=0, num_zeros=1
## P8,4,35,ID=0, num_zeros=1
## P8,4,36,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=37 in LISTP8[[4]]
## P8,4,38,ID=0, num_zeros=2
## P8,4,39,ID=0, num_zeros=1
## P8,4,40,ID=0, num_zeros=2
## P8,4,41,ID=0, num_zeros=1
## P8,4,42,ID=0, num_zeros=3
## P8,4,43,ID=0, num_zeros=2
## P8,4,44,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=45 in LISTP8[[4]]
## P8,4,46,ID=0, num_zeros=2
## P8,4,47,ID=0, num_zeros=2
## P8,4,48,ID=0, num_zeros=1
## P8,4,49,ID=0, num_zeros=3
## P8,4,50,ID=0, num_zeros=29
## P8,5,1,ID=0, num_zeros=3
## P8,5,2,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=3 in LISTP8[[5]]
## P8,5,4,ID=0, num_zeros=6
## P8,5,5,ID=0, num_zeros=3
## P8,5,6,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=7 in LISTP8[[5]]
## P8,5,8,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=9 in LISTP8[[5]]
## P8,5,10,ID=0, num_zeros=2
## P8,5,11,ID=0, num_zeros=1
## P8,5,12,ID=0, num_zeros=2
## P8,5,13,ID=0, num_zeros=1
## P8,5,14,ID=0, num_zeros=1
## P8,5,15,ID=0, num_zeros=3
## P8,5,16,ID=0, num_zeros=1
## P8,5,17,ID=0, num_zeros=3
## P8,5,18,ID=0, num_zeros=3
## P8,5,19,ID=0, num_zeros=4
## P8,5,20,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=21 in LISTP8[[5]]
## P8,5,22,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=23 in LISTP8[[5]]
## P8,5,24,ID=0, num_zeros=3
## P8,5,25,ID=0, num_zeros=1
## P8,5,26,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=27 in LISTP8[[5]]
## P8,5,28,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=29 in LISTP8[[5]]
## P8,5,30,ID=0, num_zeros=2
## P8,5,31,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=32 in LISTP8[[5]]
## P8,5,33,ID=0, num_zeros=2
## P8,5,34,ID=0, num_zeros=3
## P8,5,35,ID=0, num_zeros=1
## P8,5,36,ID=0, num_zeros=1
## P8,5,37,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=38 in LISTP8[[5]]
## P8,5,39,ID=0, num_zeros=3
## P8,5,40,ID=0, num_zeros=1
## P8,5,41,ID=0, num_zeros=1
## P8,5,42,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=43 in LISTP8[[5]]
## P8,5,44,ID=0, num_zeros=3
## P8,5,45,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=46 in LISTP8[[5]]
## P8,5,47,ID=0, num_zeros=1
## P8,5,48,ID=0, num_zeros=1
## P8,5,49,ID=0, num_zeros=1
## P8,5,50,ID=0, num_zeros=26
## P8,6,1,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=2 in LISTP8[[6]]
## P8,6,3,ID=0, num_zeros=3
## P8,6,4,ID=0, num_zeros=1
## P8,6,5,ID=0, num_zeros=1
## P8,6,6,ID=0, num_zeros=1
## P8,6,7,ID=0, num_zeros=3
## P8,6,8,ID=0, num_zeros=0
## P8,6,9,ID=0, num_zeros=0
## P8,6,10,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=11 in LISTP8[[6]]
## Warning: There are no valid values for INTERVALS=12 in LISTP8[[6]]
## Warning: There are no valid values for INTERVALS=13 in LISTP8[[6]]
## P8,6,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP8[[6]]
## Warning: There are no valid values for INTERVALS=16 in LISTP8[[6]]
## Warning: There are no valid values for INTERVALS=17 in LISTP8[[6]]
## P8,6,18,ID=0, num_zeros=2
## P8,6,19,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=20 in LISTP8[[6]]
## P8,6,21,ID=0, num_zeros=2
## P8,6,22,ID=0, num_zeros=2
## P8,6,23,ID=0, num_zeros=0
## P8,6,24,ID=0, num_zeros=0
## P8,6,25,ID=0, num_zeros=1
## P8,6,26,ID=0, num_zeros=1
## P8,6,27,ID=0, num_zeros=1
## P8,6,28,ID=0, num_zeros=1
## P8,6,29,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=30 in LISTP8[[6]]
## P8,6,31,ID=0, num_zeros=0
## P8,6,32,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=33 in LISTP8[[6]]
## P8,6,34,ID=0, num_zeros=2
## P8,6,35,ID=0, num_zeros=1
## P8,6,36,ID=0, num_zeros=2
## P8,6,37,ID=0, num_zeros=2
## P8,6,38,ID=0, num_zeros=4
## P8,6,39,ID=0, num_zeros=2
## P8,6,40,ID=0, num_zeros=5
## P8,6,41,ID=0, num_zeros=3
## P8,6,42,ID=0, num_zeros=2
## P8,6,43,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=44 in LISTP8[[6]]
## P8,6,45,ID=0, num_zeros=1
## P8,6,46,ID=0, num_zeros=2
## P8,6,47,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=48 in LISTP8[[6]]
## P8,6,49,ID=0, num_zeros=2
## P8,6,50,ID=0, num_zeros=9
## P8,7,1,ID=0, num_zeros=1
## P8,7,2,ID=0, num_zeros=1
## P8,7,3,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=4 in LISTP8[[7]]
## P8,7,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP8[[7]]
## Warning: There are no valid values for INTERVALS=7 in LISTP8[[7]]
## P8,7,8,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=9 in LISTP8[[7]]
## P8,7,10,ID=0, num_zeros=1
## P8,7,11,ID=0, num_zeros=1
## P8,7,12,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=13 in LISTP8[[7]]
## P8,7,14,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=15 in LISTP8[[7]]
## Warning: There are no valid values for INTERVALS=16 in LISTP8[[7]]
## Warning: There are no valid values for INTERVALS=17 in LISTP8[[7]]
## Warning: There are no valid values for INTERVALS=18 in LISTP8[[7]]
## P8,7,19,ID=0, num_zeros=1
## P8,7,20,ID=0, num_zeros=0
## P8,7,21,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=22 in LISTP8[[7]]
## P8,7,23,ID=0, num_zeros=4
## P8,7,24,ID=0, num_zeros=4
## P8,7,25,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=26 in LISTP8[[7]]
## P8,7,27,ID=0, num_zeros=1
## P8,7,28,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=29 in LISTP8[[7]]
## P8,7,30,ID=0, num_zeros=0
## P8,7,31,ID=0, num_zeros=1
## P8,7,32,ID=0, num_zeros=2
## P8,7,33,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=34 in LISTP8[[7]]
## P8,7,35,ID=0, num_zeros=1
## P8,7,36,ID=0, num_zeros=2
## P8,7,37,ID=0, num_zeros=0
## P8,7,38,ID=0, num_zeros=0
## P8,7,39,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=40 in LISTP8[[7]]
## Warning: There are no valid values for INTERVALS=41 in LISTP8[[7]]
## P8,7,42,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=43 in LISTP8[[7]]
## Warning: There are no valid values for INTERVALS=44 in LISTP8[[7]]
## P8,7,45,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=46 in LISTP8[[7]]
## P8,7,47,ID=0, num_zeros=1
## P8,7,48,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=49 in LISTP8[[7]]
## P8,7,50,ID=0, num_zeros=5
## P8,8,1,ID=0, num_zeros=1
## P8,8,2,ID=0, num_zeros=3
## P8,8,3,ID=0, num_zeros=2
## P8,8,4,ID=0, num_zeros=2
## P8,8,5,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=6 in LISTP8[[8]]
## P8,8,7,ID=0, num_zeros=2
## P8,8,8,ID=0, num_zeros=0
## P8,8,9,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=10 in LISTP8[[8]]
## Warning: There are no valid values for INTERVALS=11 in LISTP8[[8]]
## P8,8,12,ID=0, num_zeros=3
## P8,8,13,ID=0, num_zeros=1
## P8,8,14,ID=0, num_zeros=1
## P8,8,15,ID=0, num_zeros=1
## P8,8,16,ID=0, num_zeros=2
## P8,8,17,ID=0, num_zeros=2
## P8,8,18,ID=0, num_zeros=4
## P8,8,19,ID=0, num_zeros=0
## P8,8,20,ID=0, num_zeros=1
## P8,8,21,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=22 in LISTP8[[8]]
## P8,8,23,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=24 in LISTP8[[8]]
## Warning: There are no valid values for INTERVALS=25 in LISTP8[[8]]
## P8,8,26,ID=0, num_zeros=1
## P8,8,27,ID=0, num_zeros=2
## P8,8,28,ID=0, num_zeros=3
## P8,8,29,ID=0, num_zeros=2
## P8,8,30,ID=0, num_zeros=1
## P8,8,31,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=32 in LISTP8[[8]]
## P8,8,33,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=34 in LISTP8[[8]]
## P8,8,35,ID=0, num_zeros=1
## P8,8,36,ID=0, num_zeros=2
## P8,8,37,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=38 in LISTP8[[8]]
## Warning: There are no valid values for INTERVALS=39 in LISTP8[[8]]
## P8,8,40,ID=0, num_zeros=2
## P8,8,41,ID=0, num_zeros=0
## P8,8,42,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=43 in LISTP8[[8]]
## P8,8,44,ID=0, num_zeros=1
## P8,8,45,ID=0, num_zeros=9
## P8,8,46,ID=0, num_zeros=2
## P8,8,47,ID=0, num_zeros=1
## P8,8,48,ID=0, num_zeros=2
## P8,8,49,ID=0, num_zeros=4
## P8,8,50,ID=0, num_zeros=5
## P8,9,1,ID=0, num_zeros=2
## P8,9,2,ID=0, num_zeros=1
## P8,9,3,ID=0, num_zeros=0
## P8,9,4,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=5 in LISTP8[[9]]
## P8,9,6,ID=0, num_zeros=0
## P8,9,7,ID=0, num_zeros=1
## P8,9,8,ID=0, num_zeros=1
## P8,9,9,ID=0, num_zeros=1
## P8,9,10,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=11 in LISTP8[[9]]
## P8,9,12,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=13 in LISTP8[[9]]
## P8,9,14,ID=0, num_zeros=4
## P8,9,15,ID=0, num_zeros=1
## P8,9,16,ID=0, num_zeros=3
## P8,9,17,ID=0, num_zeros=1
## P8,9,18,ID=0, num_zeros=3
## P8,9,19,ID=0, num_zeros=3
## P8,9,20,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=21 in LISTP8[[9]]
## P8,9,22,ID=0, num_zeros=2
## P8,9,23,ID=0, num_zeros=1
## P8,9,24,ID=0, num_zeros=1
## P8,9,25,ID=0, num_zeros=0
## P8,9,26,ID=0, num_zeros=1
## P8,9,27,ID=0, num_zeros=1
## P8,9,28,ID=0, num_zeros=1
## P8,9,29,ID=0, num_zeros=1
## P8,9,30,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=31 in LISTP8[[9]]
## P8,9,32,ID=0, num_zeros=1
## P8,9,33,ID=0, num_zeros=1
## P8,9,34,ID=0, num_zeros=1
## P8,9,35,ID=0, num_zeros=0
## P8,9,36,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=37 in LISTP8[[9]]
## P8,9,38,ID=0, num_zeros=0
## P8,9,39,ID=0, num_zeros=1
## P8,9,40,ID=0, num_zeros=1
## P8,9,41,ID=0, num_zeros=1
## P8,9,42,ID=0, num_zeros=1
## P8,9,43,ID=0, num_zeros=1
## P8,9,44,ID=0, num_zeros=2
## P8,9,45,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=46 in LISTP8[[9]]
## P8,9,47,ID=0, num_zeros=1
## P8,9,48,ID=0, num_zeros=0
## P8,9,49,ID=0, num_zeros=1
## P8,9,50,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=1 in LISTP8[[10]]
## P8,10,2,ID=0, num_zeros=1
## P8,10,3,ID=0, num_zeros=2
## P8,10,4,ID=0, num_zeros=3
## P8,10,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP8[[10]]
## P8,10,7,ID=0, num_zeros=2
## P8,10,8,ID=0, num_zeros=3
## P8,10,9,ID=0, num_zeros=1
## P8,10,10,ID=0, num_zeros=1
## P8,10,11,ID=0, num_zeros=3
## P8,10,12,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=13 in LISTP8[[10]]
## P8,10,14,ID=0, num_zeros=2
## P8,10,15,ID=0, num_zeros=3
## P8,10,16,ID=0, num_zeros=1
## P8,10,17,ID=0, num_zeros=1
## P8,10,18,ID=0, num_zeros=1
## P8,10,19,ID=0, num_zeros=3
## P8,10,20,ID=0, num_zeros=2
## P8,10,21,ID=0, num_zeros=3
## P8,10,22,ID=0, num_zeros=0
## P8,10,23,ID=0, num_zeros=2
## P8,10,24,ID=0, num_zeros=3
## P8,10,25,ID=0, num_zeros=3
## P8,10,26,ID=0, num_zeros=3
## P8,10,27,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=28 in LISTP8[[10]]
## P8,10,29,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=30 in LISTP8[[10]]
## P8,10,31,ID=0, num_zeros=1
## P8,10,32,ID=0, num_zeros=4
## P8,10,33,ID=0, num_zeros=0
## P8,10,34,ID=0, num_zeros=2
## P8,10,35,ID=0, num_zeros=1
## P8,10,36,ID=0, num_zeros=1
## P8,10,37,ID=0, num_zeros=5
## P8,10,38,ID=0, num_zeros=3
## P8,10,39,ID=0, num_zeros=1
## P8,10,40,ID=0, num_zeros=1
## P8,10,41,ID=0, num_zeros=0
## P8,10,42,ID=0, num_zeros=0
## P8,10,43,ID=0, num_zeros=4
## P8,10,44,ID=0, num_zeros=2
## P8,10,45,ID=0, num_zeros=1
## P8,10,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP8[[10]]
## P8,10,48,ID=0, num_zeros=4
## P8,10,49,ID=0, num_zeros=1
## P8,10,50,ID=0, num_zeros=4
## P9,1,1,ID=0, num_zeros=1
## P9,1,2,ID=0, num_zeros=3
## P9,1,3,ID=0, num_zeros=5
## P9,1,4,ID=0, num_zeros=4
## P9,1,5,ID=0, num_zeros=4
## P9,1,6,ID=0, num_zeros=1
## P9,1,7,ID=0, num_zeros=5
## P9,1,8,ID=0, num_zeros=3
## P9,1,9,ID=0, num_zeros=6
## P9,1,10,ID=0, num_zeros=1
## P9,1,11,ID=0, num_zeros=3
## P9,1,12,ID=0, num_zeros=5
## P9,1,13,ID=0, num_zeros=6
## P9,1,14,ID=0, num_zeros=4
## P9,1,15,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=16 in LISTP9[[1]]
## P9,1,17,ID=0, num_zeros=5
## P9,1,18,ID=0, num_zeros=7
## P9,1,19,ID=0, num_zeros=5
## P9,1,20,ID=0, num_zeros=6
## P9,1,21,ID=0, num_zeros=1
## P9,1,22,ID=0, num_zeros=7
## P9,1,23,ID=0, num_zeros=3
## P9,1,24,ID=0, num_zeros=5
## P9,1,25,ID=0, num_zeros=5
## P9,1,26,ID=0, num_zeros=4
## P9,1,27,ID=0, num_zeros=7
## P9,1,28,ID=0, num_zeros=4
## P9,1,29,ID=0, num_zeros=2
## P9,1,30,ID=0, num_zeros=5
## P9,1,31,ID=0, num_zeros=2
## P9,1,32,ID=0, num_zeros=4
## P9,1,33,ID=0, num_zeros=6
## P9,1,34,ID=0, num_zeros=6
## P9,1,35,ID=0, num_zeros=8
## P9,1,36,ID=0, num_zeros=5
## P9,1,37,ID=0, num_zeros=4
## P9,1,38,ID=0, num_zeros=7
## P9,1,39,ID=0, num_zeros=2
## P9,1,40,ID=0, num_zeros=1
## P9,1,41,ID=0, num_zeros=4
## P9,1,42,ID=0, num_zeros=4
## P9,1,43,ID=0, num_zeros=2
## P9,1,44,ID=0, num_zeros=3
## P9,1,45,ID=0, num_zeros=6
## P9,1,46,ID=0, num_zeros=7
## P9,1,47,ID=0, num_zeros=6
## P9,1,48,ID=0, num_zeros=10
## P9,1,49,ID=0, num_zeros=4
## P9,1,50,ID=0, num_zeros=35
## P9,2,1,ID=0, num_zeros=1
## P9,2,2,ID=0, num_zeros=3
## P9,2,3,ID=0, num_zeros=2
## P9,2,4,ID=0, num_zeros=9
## P9,2,5,ID=0, num_zeros=7
## P9,2,6,ID=0, num_zeros=1
## P9,2,7,ID=0, num_zeros=6
## P9,2,8,ID=0, num_zeros=7
## P9,2,9,ID=0, num_zeros=2
## P9,2,10,ID=0, num_zeros=11
## P9,2,11,ID=0, num_zeros=8
## P9,2,12,ID=0, num_zeros=5
## P9,2,13,ID=0, num_zeros=2
## P9,2,14,ID=0, num_zeros=5
## P9,2,15,ID=0, num_zeros=6
## P9,2,16,ID=0, num_zeros=2
## P9,2,17,ID=0, num_zeros=2
## P9,2,18,ID=0, num_zeros=1
## P9,2,19,ID=0, num_zeros=0
## P9,2,20,ID=0, num_zeros=0
## P9,2,21,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=22 in LISTP9[[2]]
## P9,2,23,ID=0, num_zeros=3
## P9,2,24,ID=0, num_zeros=4
## P9,2,25,ID=0, num_zeros=5
## P9,2,26,ID=0, num_zeros=3
## P9,2,27,ID=0, num_zeros=10
## P9,2,28,ID=0, num_zeros=4
## P9,2,29,ID=0, num_zeros=4
## P9,2,30,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=31 in LISTP9[[2]]
## Warning: There are no valid values for INTERVALS=32 in LISTP9[[2]]
## Warning: There are no valid values for INTERVALS=33 in LISTP9[[2]]
## Warning: There are no valid values for INTERVALS=34 in LISTP9[[2]]
## Warning: There are no valid values for INTERVALS=35 in LISTP9[[2]]
## P9,2,36,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=37 in LISTP9[[2]]
## Warning: There are no valid values for INTERVALS=38 in LISTP9[[2]]
## Warning: There are no valid values for INTERVALS=39 in LISTP9[[2]]
## P9,2,40,ID=0, num_zeros=1
## P9,2,41,ID=0, num_zeros=4
## P9,2,42,ID=0, num_zeros=2
## P9,2,43,ID=0, num_zeros=5
## P9,2,44,ID=0, num_zeros=4
## P9,2,45,ID=0, num_zeros=4
## P9,2,46,ID=0, num_zeros=1
## P9,2,47,ID=0, num_zeros=1
## P9,2,48,ID=0, num_zeros=4
## P9,2,49,ID=0, num_zeros=4
## P9,2,50,ID=0, num_zeros=38
## P9,3,1,ID=0, num_zeros=1
## P9,3,2,ID=0, num_zeros=4
## P9,3,3,ID=0, num_zeros=4
## P9,3,4,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=5 in LISTP9[[3]]
## P9,3,6,ID=0, num_zeros=3
## P9,3,7,ID=0, num_zeros=1
## P9,3,8,ID=0, num_zeros=6
## P9,3,9,ID=0, num_zeros=3
## P9,3,10,ID=0, num_zeros=7
## P9,3,11,ID=0, num_zeros=4
## P9,3,12,ID=0, num_zeros=2
## P9,3,13,ID=0, num_zeros=1
## P9,3,14,ID=0, num_zeros=1
## P9,3,15,ID=0, num_zeros=5
## P9,3,16,ID=0, num_zeros=3
## P9,3,17,ID=0, num_zeros=0
## P9,3,18,ID=0, num_zeros=2
## P9,3,19,ID=0, num_zeros=0
## P9,3,20,ID=0, num_zeros=3
## P9,3,21,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=22 in LISTP9[[3]]
## P9,3,23,ID=0, num_zeros=5
## P9,3,24,ID=0, num_zeros=5
## P9,3,25,ID=0, num_zeros=5
## P9,3,26,ID=0, num_zeros=3
## P9,3,27,ID=0, num_zeros=3
## P9,3,28,ID=0, num_zeros=3
## P9,3,29,ID=0, num_zeros=1
## P9,3,30,ID=0, num_zeros=2
## P9,3,31,ID=0, num_zeros=4
## P9,3,32,ID=0, num_zeros=0
## P9,3,33,ID=0, num_zeros=7
## P9,3,34,ID=0, num_zeros=1
## P9,3,35,ID=0, num_zeros=1
## P9,3,36,ID=0, num_zeros=5
## P9,3,37,ID=0, num_zeros=3
## P9,3,38,ID=0, num_zeros=2
## P9,3,39,ID=0, num_zeros=1
## P9,3,40,ID=0, num_zeros=2
## P9,3,41,ID=0, num_zeros=10
## P9,3,42,ID=0, num_zeros=4
## P9,3,43,ID=0, num_zeros=4
## P9,3,44,ID=0, num_zeros=1
## P9,3,45,ID=0, num_zeros=4
## P9,3,46,ID=0, num_zeros=6
## P9,3,47,ID=0, num_zeros=8
## P9,3,48,ID=0, num_zeros=2
## P9,3,49,ID=0, num_zeros=8
## P9,3,50,ID=0, num_zeros=16
## P9,4,1,ID=0, num_zeros=2
## P9,4,2,ID=0, num_zeros=1
## P9,4,3,ID=0, num_zeros=3
## P9,4,4,ID=0, num_zeros=9
## P9,4,5,ID=0, num_zeros=8
## P9,4,6,ID=0, num_zeros=7
## P9,4,7,ID=0, num_zeros=1
## P9,4,8,ID=0, num_zeros=4
## P9,4,9,ID=0, num_zeros=2
## P9,4,10,ID=0, num_zeros=8
## P9,4,11,ID=0, num_zeros=2
## P9,4,12,ID=0, num_zeros=5
## P9,4,13,ID=0, num_zeros=7
## P9,4,14,ID=0, num_zeros=1
## P9,4,15,ID=0, num_zeros=5
## P9,4,16,ID=0, num_zeros=3
## P9,4,17,ID=0, num_zeros=2
## P9,4,18,ID=0, num_zeros=4
## P9,4,19,ID=0, num_zeros=3
## P9,4,20,ID=0, num_zeros=6
## P9,4,21,ID=0, num_zeros=4
## P9,4,22,ID=0, num_zeros=0
## P9,4,23,ID=0, num_zeros=1
## P9,4,24,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=25 in LISTP9[[4]]
## P9,4,26,ID=0, num_zeros=2
## P9,4,27,ID=0, num_zeros=5
## P9,4,28,ID=0, num_zeros=3
## P9,4,29,ID=0, num_zeros=4
## P9,4,30,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=31 in LISTP9[[4]]
## P9,4,32,ID=0, num_zeros=3
## P9,4,33,ID=0, num_zeros=2
## P9,4,34,ID=0, num_zeros=6
## P9,4,35,ID=0, num_zeros=2
## P9,4,36,ID=0, num_zeros=3
## P9,4,37,ID=0, num_zeros=1
## P9,4,38,ID=0, num_zeros=5
## P9,4,39,ID=0, num_zeros=4
## P9,4,40,ID=0, num_zeros=4
## P9,4,41,ID=0, num_zeros=4
## P9,4,42,ID=0, num_zeros=0
## P9,4,43,ID=0, num_zeros=1
## P9,4,44,ID=0, num_zeros=1
## P9,4,45,ID=0, num_zeros=3
## P9,4,46,ID=0, num_zeros=1
## P9,4,47,ID=0, num_zeros=1
## P9,4,48,ID=0, num_zeros=7
## P9,4,49,ID=0, num_zeros=2
## P9,4,50,ID=0, num_zeros=18
## P9,5,1,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=2 in LISTP9[[5]]
## P9,5,3,ID=0, num_zeros=3
## P9,5,4,ID=0, num_zeros=2
## P9,5,5,ID=0, num_zeros=3
## P9,5,6,ID=0, num_zeros=6
## P9,5,7,ID=0, num_zeros=1
## P9,5,8,ID=0, num_zeros=2
## P9,5,9,ID=0, num_zeros=2
## P9,5,10,ID=0, num_zeros=1
## P9,5,11,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=12 in LISTP9[[5]]
## P9,5,13,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=14 in LISTP9[[5]]
## P9,5,15,ID=0, num_zeros=4
## P9,5,16,ID=0, num_zeros=3
## P9,5,17,ID=0, num_zeros=1
## P9,5,18,ID=0, num_zeros=2
## P9,5,19,ID=0, num_zeros=0
## P9,5,20,ID=0, num_zeros=1
## P9,5,21,ID=0, num_zeros=6
## P9,5,22,ID=0, num_zeros=6
## P9,5,23,ID=0, num_zeros=1
## P9,5,24,ID=0, num_zeros=4
## P9,5,25,ID=0, num_zeros=4
## P9,5,26,ID=0, num_zeros=2
## P9,5,27,ID=0, num_zeros=2
## P9,5,28,ID=0, num_zeros=3
## P9,5,29,ID=0, num_zeros=2
## P9,5,30,ID=0, num_zeros=2
## P9,5,31,ID=0, num_zeros=3
## P9,5,32,ID=0, num_zeros=3
## P9,5,33,ID=0, num_zeros=3
## P9,5,34,ID=0, num_zeros=3
## P9,5,35,ID=0, num_zeros=0
## P9,5,36,ID=0, num_zeros=3
## P9,5,37,ID=0, num_zeros=3
## P9,5,38,ID=0, num_zeros=1
## P9,5,39,ID=0, num_zeros=1
## P9,5,40,ID=0, num_zeros=2
## P9,5,41,ID=0, num_zeros=1
## P9,5,42,ID=0, num_zeros=3
## P9,5,43,ID=0, num_zeros=0
## P9,5,44,ID=0, num_zeros=2
## P9,5,45,ID=0, num_zeros=1
## P9,5,46,ID=0, num_zeros=2
## P9,5,47,ID=0, num_zeros=2
## P9,5,48,ID=0, num_zeros=3
## P9,5,49,ID=0, num_zeros=3
## P9,5,50,ID=0, num_zeros=11
## P9,6,1,ID=0, num_zeros=3
## P9,6,2,ID=0, num_zeros=2
## P9,6,3,ID=0, num_zeros=3
## P9,6,4,ID=0, num_zeros=2
## P9,6,5,ID=0, num_zeros=3
## P9,6,6,ID=0, num_zeros=4
## P9,6,7,ID=0, num_zeros=6
## P9,6,8,ID=0, num_zeros=9
## P9,6,9,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=10 in LISTP9[[6]]
## P9,6,11,ID=0, num_zeros=2
## P9,6,12,ID=0, num_zeros=3
## P9,6,13,ID=0, num_zeros=2
## P9,6,14,ID=0, num_zeros=8
## P9,6,15,ID=0, num_zeros=5
## P9,6,16,ID=0, num_zeros=3
## P9,6,17,ID=0, num_zeros=1
## P9,6,18,ID=0, num_zeros=1
## P9,6,19,ID=0, num_zeros=1
## P9,6,20,ID=0, num_zeros=5
## P9,6,21,ID=0, num_zeros=5
## P9,6,22,ID=0, num_zeros=2
## P9,6,23,ID=0, num_zeros=1
## P9,6,24,ID=0, num_zeros=0
## P9,6,25,ID=0, num_zeros=1
## P9,6,26,ID=0, num_zeros=2
## P9,6,27,ID=0, num_zeros=8
## P9,6,28,ID=0, num_zeros=1
## P9,6,29,ID=0, num_zeros=2
## P9,6,30,ID=0, num_zeros=5
## P9,6,31,ID=0, num_zeros=0
## P9,6,32,ID=0, num_zeros=0
## P9,6,33,ID=0, num_zeros=0
## P9,6,34,ID=0, num_zeros=4
## P9,6,35,ID=0, num_zeros=6
## P9,6,36,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=37 in LISTP9[[6]]
## Warning: There are no valid values for INTERVALS=38 in LISTP9[[6]]
## P9,6,39,ID=0, num_zeros=2
## P9,6,40,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=41 in LISTP9[[6]]
## P9,6,42,ID=0, num_zeros=0
## P9,6,43,ID=0, num_zeros=1
## P9,6,44,ID=0, num_zeros=4
## P9,6,45,ID=0, num_zeros=1
## P9,6,46,ID=0, num_zeros=4
## P9,6,47,ID=0, num_zeros=0
## P9,6,48,ID=0, num_zeros=1
## P9,6,49,ID=0, num_zeros=1
## P9,6,50,ID=0, num_zeros=14
## P9,7,1,ID=0, num_zeros=1
## P9,7,2,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=3 in LISTP9[[7]]
## P9,7,4,ID=0, num_zeros=1
## P9,7,5,ID=0, num_zeros=1
## P9,7,6,ID=0, num_zeros=1
## P9,7,7,ID=0, num_zeros=4
## P9,7,8,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=9 in LISTP9[[7]]
## P9,7,10,ID=0, num_zeros=4
## P9,7,11,ID=0, num_zeros=3
## P9,7,12,ID=0, num_zeros=0
## P9,7,13,ID=0, num_zeros=2
## P9,7,14,ID=0, num_zeros=2
## P9,7,15,ID=0, num_zeros=1
## P9,7,16,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=17 in LISTP9[[7]]
## P9,7,18,ID=0, num_zeros=3
## P9,7,19,ID=0, num_zeros=3
## P9,7,20,ID=0, num_zeros=1
## P9,7,21,ID=0, num_zeros=1
## P9,7,22,ID=0, num_zeros=1
## P9,7,23,ID=0, num_zeros=5
## P9,7,24,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=25 in LISTP9[[7]]
## P9,7,26,ID=0, num_zeros=6
## P9,7,27,ID=0, num_zeros=2
## P9,7,28,ID=0, num_zeros=1
## P9,7,29,ID=0, num_zeros=1
## P9,7,30,ID=0, num_zeros=2
## P9,7,31,ID=0, num_zeros=0
## P9,7,32,ID=0, num_zeros=1
## P9,7,33,ID=0, num_zeros=5
## P9,7,34,ID=0, num_zeros=2
## P9,7,35,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=36 in LISTP9[[7]]
## P9,7,37,ID=0, num_zeros=7
## P9,7,38,ID=0, num_zeros=0
## P9,7,39,ID=0, num_zeros=5
## P9,7,40,ID=0, num_zeros=3
## P9,7,41,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=42 in LISTP9[[7]]
## P9,7,43,ID=0, num_zeros=5
## P9,7,44,ID=0, num_zeros=3
## P9,7,45,ID=0, num_zeros=0
## P9,7,46,ID=0, num_zeros=8
## P9,7,47,ID=0, num_zeros=8
## P9,7,48,ID=0, num_zeros=3
## P9,7,49,ID=0, num_zeros=0
## P9,7,50,ID=0, num_zeros=14
## P9,8,1,ID=0, num_zeros=2
## P9,8,2,ID=0, num_zeros=6
## P9,8,3,ID=0, num_zeros=4
## P9,8,4,ID=0, num_zeros=0
## P9,8,5,ID=0, num_zeros=9
## P9,8,6,ID=0, num_zeros=4
## P9,8,7,ID=0, num_zeros=2
## P9,8,8,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=9 in LISTP9[[8]]
## P9,8,10,ID=0, num_zeros=3
## P9,8,11,ID=0, num_zeros=3
## P9,8,12,ID=0, num_zeros=6
## P9,8,13,ID=0, num_zeros=1
## P9,8,14,ID=0, num_zeros=5
## P9,8,15,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=16 in LISTP9[[8]]
## P9,8,17,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=18 in LISTP9[[8]]
## P9,8,19,ID=0, num_zeros=4
## P9,8,20,ID=0, num_zeros=1
## P9,8,21,ID=0, num_zeros=5
## P9,8,22,ID=0, num_zeros=3
## P9,8,23,ID=0, num_zeros=2
## P9,8,24,ID=0, num_zeros=2
## P9,8,25,ID=0, num_zeros=5
## P9,8,26,ID=0, num_zeros=1
## P9,8,27,ID=0, num_zeros=1
## P9,8,28,ID=0, num_zeros=3
## P9,8,29,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=30 in LISTP9[[8]]
## P9,8,31,ID=0, num_zeros=3
## P9,8,32,ID=0, num_zeros=1
## P9,8,33,ID=0, num_zeros=4
## P9,8,34,ID=0, num_zeros=1
## P9,8,35,ID=0, num_zeros=5
## P9,8,36,ID=0, num_zeros=4
## P9,8,37,ID=0, num_zeros=2
## P9,8,38,ID=0, num_zeros=2
## P9,8,39,ID=0, num_zeros=1
## P9,8,40,ID=0, num_zeros=3
## P9,8,41,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=42 in LISTP9[[8]]
## P9,8,43,ID=0, num_zeros=7
## P9,8,44,ID=0, num_zeros=2
## P9,8,45,ID=0, num_zeros=4
## P9,8,46,ID=0, num_zeros=6
## P9,8,47,ID=0, num_zeros=3
## P9,8,48,ID=0, num_zeros=5
## P9,8,49,ID=0, num_zeros=2
## P9,8,50,ID=0, num_zeros=14
## P9,9,1,ID=0, num_zeros=1
## P9,9,2,ID=0, num_zeros=2
## P9,9,3,ID=0, num_zeros=2
## P9,9,4,ID=0, num_zeros=5
## P9,9,5,ID=0, num_zeros=2
## P9,9,6,ID=0, num_zeros=3
## P9,9,7,ID=0, num_zeros=5
## P9,9,8,ID=0, num_zeros=1
## P9,9,9,ID=0, num_zeros=1
## P9,9,10,ID=0, num_zeros=5
## P9,9,11,ID=0, num_zeros=1
## P9,9,12,ID=0, num_zeros=4
## P9,9,13,ID=0, num_zeros=5
## P9,9,14,ID=0, num_zeros=5
## P9,9,15,ID=0, num_zeros=0
## P9,9,16,ID=0, num_zeros=2
## P9,9,17,ID=0, num_zeros=2
## P9,9,18,ID=0, num_zeros=6
## P9,9,19,ID=0, num_zeros=4
## P9,9,20,ID=0, num_zeros=4
## P9,9,21,ID=0, num_zeros=2
## P9,9,22,ID=0, num_zeros=3
## P9,9,23,ID=0, num_zeros=2
## P9,9,24,ID=0, num_zeros=1
## P9,9,25,ID=0, num_zeros=2
## P9,9,26,ID=0, num_zeros=1
## P9,9,27,ID=0, num_zeros=2
## P9,9,28,ID=0, num_zeros=3
## P9,9,29,ID=0, num_zeros=2
## P9,9,30,ID=0, num_zeros=8
## P9,9,31,ID=0, num_zeros=2
## P9,9,32,ID=0, num_zeros=5
## P9,9,33,ID=0, num_zeros=5
## P9,9,34,ID=0, num_zeros=3
## P9,9,35,ID=0, num_zeros=3
## P9,9,36,ID=0, num_zeros=2
## P9,9,37,ID=0, num_zeros=3
## P9,9,38,ID=0, num_zeros=3
## P9,9,39,ID=0, num_zeros=2
## P9,9,40,ID=0, num_zeros=3
## P9,9,41,ID=0, num_zeros=3
## P9,9,42,ID=0, num_zeros=5
## P9,9,43,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=44 in LISTP9[[9]]
## P9,9,45,ID=0, num_zeros=5
## P9,9,46,ID=0, num_zeros=0
## P9,9,47,ID=0, num_zeros=4
## P9,9,48,ID=0, num_zeros=1
## P9,9,49,ID=0, num_zeros=6
## P9,9,50,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=1 in LISTP9[[10]]
## P9,10,2,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=3 in LISTP9[[10]]
## P9,10,4,ID=0, num_zeros=3
## P9,10,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP9[[10]]
## P9,10,7,ID=0, num_zeros=4
## P9,10,8,ID=0, num_zeros=0
## P9,10,9,ID=0, num_zeros=3
## P9,10,10,ID=0, num_zeros=2
## P9,10,11,ID=0, num_zeros=1
## P9,10,12,ID=0, num_zeros=2
## P9,10,13,ID=0, num_zeros=1
## P9,10,14,ID=0, num_zeros=6
## P9,10,15,ID=0, num_zeros=3
## P9,10,16,ID=0, num_zeros=6
## P9,10,17,ID=0, num_zeros=3
## P9,10,18,ID=0, num_zeros=2
## P9,10,19,ID=0, num_zeros=1
## P9,10,20,ID=0, num_zeros=5
## P9,10,21,ID=0, num_zeros=2
## P9,10,22,ID=0, num_zeros=3
## P9,10,23,ID=0, num_zeros=1
## P9,10,24,ID=0, num_zeros=4
## P9,10,25,ID=0, num_zeros=2
## P9,10,26,ID=0, num_zeros=8
## P9,10,27,ID=0, num_zeros=2
## P9,10,28,ID=0, num_zeros=3
## P9,10,29,ID=0, num_zeros=1
## P9,10,30,ID=0, num_zeros=2
## P9,10,31,ID=0, num_zeros=1
## P9,10,32,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=33 in LISTP9[[10]]
## P9,10,34,ID=0, num_zeros=4
## P9,10,35,ID=0, num_zeros=1
## P9,10,36,ID=0, num_zeros=2
## P9,10,37,ID=0, num_zeros=3
## P9,10,38,ID=0, num_zeros=0
## P9,10,39,ID=0, num_zeros=2
## P9,10,40,ID=0, num_zeros=7
## P9,10,41,ID=0, num_zeros=2
## P9,10,42,ID=0, num_zeros=4
## P9,10,43,ID=0, num_zeros=2
## P9,10,44,ID=0, num_zeros=2
## P9,10,45,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=46 in LISTP9[[10]]
## P9,10,47,ID=0, num_zeros=3
## P9,10,48,ID=0, num_zeros=0
## P9,10,49,ID=0, num_zeros=4
## P9,10,50,ID=0, num_zeros=4
## P10,1,1,ID=0, num_zeros=3
## P10,1,2,ID=0, num_zeros=1
## P10,1,3,ID=0, num_zeros=4
## P10,1,4,ID=0, num_zeros=1
## P10,1,5,ID=0, num_zeros=1
## P10,1,6,ID=0, num_zeros=3
## P10,1,7,ID=0, num_zeros=6
## P10,1,8,ID=0, num_zeros=13
## P10,1,9,ID=0, num_zeros=7
## P10,1,10,ID=0, num_zeros=4
## P10,1,11,ID=0, num_zeros=3
## P10,1,12,ID=0, num_zeros=8
## P10,1,13,ID=0, num_zeros=4
## P10,1,14,ID=0, num_zeros=6
## P10,1,15,ID=0, num_zeros=1
## P10,1,16,ID=0, num_zeros=3
## P10,1,17,ID=0, num_zeros=3
## P10,1,18,ID=0, num_zeros=1
## P10,1,19,ID=0, num_zeros=6
## P10,1,20,ID=0, num_zeros=3
## P10,1,21,ID=0, num_zeros=6
## P10,1,22,ID=0, num_zeros=4
## P10,1,23,ID=0, num_zeros=10
## P10,1,24,ID=0, num_zeros=8
## P10,1,25,ID=0, num_zeros=6
## P10,1,26,ID=0, num_zeros=6
## P10,1,27,ID=0, num_zeros=6
## P10,1,28,ID=0, num_zeros=3
## P10,1,29,ID=0, num_zeros=6
## P10,1,30,ID=0, num_zeros=4
## P10,1,31,ID=0, num_zeros=3
## P10,1,32,ID=0, num_zeros=4
## P10,1,33,ID=0, num_zeros=5
## P10,1,34,ID=0, num_zeros=3
## P10,1,35,ID=0, num_zeros=1
## P10,1,36,ID=0, num_zeros=1
## P10,1,37,ID=0, num_zeros=3
## P10,1,38,ID=0, num_zeros=2
## P10,1,39,ID=0, num_zeros=2
## P10,1,40,ID=0, num_zeros=2
## P10,1,41,ID=0, num_zeros=5
## P10,1,42,ID=0, num_zeros=8
## P10,1,43,ID=0, num_zeros=4
## P10,1,44,ID=0, num_zeros=2
## P10,1,45,ID=0, num_zeros=1
## P10,1,46,ID=0, num_zeros=5
## P10,1,47,ID=0, num_zeros=7
## P10,1,48,ID=0, num_zeros=4
## P10,1,49,ID=0, num_zeros=5
## P10,1,50,ID=0, num_zeros=18
## P10,2,1,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=2 in LISTP10[[2]]
## P10,2,3,ID=0, num_zeros=3
## P10,2,4,ID=0, num_zeros=3
## P10,2,5,ID=0, num_zeros=2
## P10,2,6,ID=0, num_zeros=3
## P10,2,7,ID=0, num_zeros=2
## P10,2,8,ID=0, num_zeros=4
## P10,2,9,ID=0, num_zeros=5
## P10,2,10,ID=0, num_zeros=6
## P10,2,11,ID=0, num_zeros=2
## P10,2,12,ID=0, num_zeros=6
## P10,2,13,ID=0, num_zeros=4
## P10,2,14,ID=0, num_zeros=2
## P10,2,15,ID=0, num_zeros=3
## P10,2,16,ID=0, num_zeros=1
## P10,2,17,ID=0, num_zeros=3
## P10,2,18,ID=0, num_zeros=4
## P10,2,19,ID=0, num_zeros=5
## P10,2,20,ID=0, num_zeros=2
## P10,2,21,ID=0, num_zeros=5
## P10,2,22,ID=0, num_zeros=3
## P10,2,23,ID=0, num_zeros=1
## P10,2,24,ID=0, num_zeros=2
## P10,2,25,ID=0, num_zeros=3
## P10,2,26,ID=0, num_zeros=5
## P10,2,27,ID=0, num_zeros=3
## P10,2,28,ID=0, num_zeros=2
## P10,2,29,ID=0, num_zeros=4
## P10,2,30,ID=0, num_zeros=3
## P10,2,31,ID=0, num_zeros=5
## P10,2,32,ID=0, num_zeros=3
## P10,2,33,ID=0, num_zeros=3
## P10,2,34,ID=0, num_zeros=5
## P10,2,35,ID=0, num_zeros=2
## P10,2,36,ID=0, num_zeros=4
## P10,2,37,ID=0, num_zeros=5
## P10,2,38,ID=0, num_zeros=0
## P10,2,39,ID=0, num_zeros=3
## P10,2,40,ID=0, num_zeros=2
## P10,2,41,ID=0, num_zeros=5
## P10,2,42,ID=0, num_zeros=13
## P10,2,43,ID=0, num_zeros=5
## P10,2,44,ID=0, num_zeros=2
## P10,2,45,ID=0, num_zeros=3
## P10,2,46,ID=0, num_zeros=7
## P10,2,47,ID=0, num_zeros=1
## P10,2,48,ID=0, num_zeros=8
## P10,2,49,ID=0, num_zeros=2
## P10,2,50,ID=0, num_zeros=5
## P10,3,1,ID=0, num_zeros=1
## P10,3,2,ID=0, num_zeros=2
## P10,3,3,ID=0, num_zeros=1
## P10,3,4,ID=0, num_zeros=4
## P10,3,5,ID=0, num_zeros=1
## P10,3,6,ID=0, num_zeros=8
## P10,3,7,ID=0, num_zeros=6
## P10,3,8,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=9 in LISTP10[[3]]
## P10,3,10,ID=0, num_zeros=2
## P10,3,11,ID=0, num_zeros=2
## P10,3,12,ID=0, num_zeros=5
## P10,3,13,ID=0, num_zeros=2
## P10,3,14,ID=0, num_zeros=0
## P10,3,15,ID=0, num_zeros=6
## P10,3,16,ID=0, num_zeros=4
## P10,3,17,ID=0, num_zeros=2
## P10,3,18,ID=0, num_zeros=4
## P10,3,19,ID=0, num_zeros=2
## P10,3,20,ID=0, num_zeros=10
## P10,3,21,ID=0, num_zeros=4
## P10,3,22,ID=0, num_zeros=2
## P10,3,23,ID=0, num_zeros=3
## P10,3,24,ID=0, num_zeros=7
## P10,3,25,ID=0, num_zeros=3
## P10,3,26,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=27 in LISTP10[[3]]
## P10,3,28,ID=0, num_zeros=3
## P10,3,29,ID=0, num_zeros=6
## P10,3,30,ID=0, num_zeros=1
## P10,3,31,ID=0, num_zeros=5
## P10,3,32,ID=0, num_zeros=2
## P10,3,33,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=34 in LISTP10[[3]]
## P10,3,35,ID=0, num_zeros=2
## P10,3,36,ID=0, num_zeros=7
## P10,3,37,ID=0, num_zeros=8
## P10,3,38,ID=0, num_zeros=2
## P10,3,39,ID=0, num_zeros=3
## P10,3,40,ID=0, num_zeros=6
## P10,3,41,ID=0, num_zeros=3
## P10,3,42,ID=0, num_zeros=5
## P10,3,43,ID=0, num_zeros=5
## P10,3,44,ID=0, num_zeros=2
## P10,3,45,ID=0, num_zeros=1
## P10,3,46,ID=0, num_zeros=12
## P10,3,47,ID=0, num_zeros=6
## P10,3,48,ID=0, num_zeros=2
## P10,3,49,ID=0, num_zeros=5
## P10,3,50,ID=0, num_zeros=9
## P10,4,1,ID=0, num_zeros=3
## P10,4,2,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=3 in LISTP10[[4]]
## P10,4,4,ID=0, num_zeros=5
## P10,4,5,ID=0, num_zeros=2
## P10,4,6,ID=0, num_zeros=9
## P10,4,7,ID=0, num_zeros=3
## P10,4,8,ID=0, num_zeros=2
## P10,4,9,ID=0, num_zeros=3
## P10,4,10,ID=0, num_zeros=5
## P10,4,11,ID=0, num_zeros=2
## P10,4,12,ID=0, num_zeros=2
## P10,4,13,ID=0, num_zeros=1
## P10,4,14,ID=0, num_zeros=2
## P10,4,15,ID=0, num_zeros=1
## P10,4,16,ID=0, num_zeros=2
## P10,4,17,ID=0, num_zeros=3
## P10,4,18,ID=0, num_zeros=2
## P10,4,19,ID=0, num_zeros=1
## P10,4,20,ID=0, num_zeros=3
## P10,4,21,ID=0, num_zeros=4
## P10,4,22,ID=0, num_zeros=7
## P10,4,23,ID=0, num_zeros=3
## P10,4,24,ID=0, num_zeros=2
## P10,4,25,ID=0, num_zeros=4
## P10,4,26,ID=0, num_zeros=3
## P10,4,27,ID=0, num_zeros=0
## P10,4,28,ID=0, num_zeros=4
## P10,4,29,ID=0, num_zeros=2
## P10,4,30,ID=0, num_zeros=8
## P10,4,31,ID=0, num_zeros=6
## P10,4,32,ID=0, num_zeros=10
## Warning: There are no valid values for INTERVALS=33 in LISTP10[[4]]
## P10,4,34,ID=0, num_zeros=5
## P10,4,35,ID=0, num_zeros=5
## P10,4,36,ID=0, num_zeros=3
## P10,4,37,ID=0, num_zeros=11
## P10,4,38,ID=0, num_zeros=2
## P10,4,39,ID=0, num_zeros=7
## P10,4,40,ID=0, num_zeros=3
## P10,4,41,ID=0, num_zeros=5
## P10,4,42,ID=0, num_zeros=0
## P10,4,43,ID=0, num_zeros=2
## P10,4,44,ID=0, num_zeros=3
## P10,4,45,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=46 in LISTP10[[4]]
## P10,4,47,ID=0, num_zeros=3
## P10,4,48,ID=0, num_zeros=2
## P10,4,49,ID=0, num_zeros=6
## P10,4,50,ID=0, num_zeros=9
## P10,5,1,ID=0, num_zeros=2
## P10,5,2,ID=0, num_zeros=1
## P10,5,3,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=4 in LISTP10[[5]]
## P10,5,5,ID=0, num_zeros=1
## P10,5,6,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=7 in LISTP10[[5]]
## P10,5,8,ID=0, num_zeros=2
## P10,5,9,ID=0, num_zeros=2
## P10,5,10,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=11 in LISTP10[[5]]
## P10,5,12,ID=0, num_zeros=2
## P10,5,13,ID=0, num_zeros=1
## P10,5,14,ID=0, num_zeros=2
## P10,5,15,ID=0, num_zeros=3
## P10,5,16,ID=0, num_zeros=2
## P10,5,17,ID=0, num_zeros=3
## P10,5,18,ID=0, num_zeros=1
## P10,5,19,ID=0, num_zeros=1
## P10,5,20,ID=0, num_zeros=3
## P10,5,21,ID=0, num_zeros=2
## P10,5,22,ID=0, num_zeros=2
## P10,5,23,ID=0, num_zeros=0
## P10,5,24,ID=0, num_zeros=3
## P10,5,25,ID=0, num_zeros=3
## P10,5,26,ID=0, num_zeros=3
## P10,5,27,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=28 in LISTP10[[5]]
## P10,5,29,ID=0, num_zeros=2
## P10,5,30,ID=0, num_zeros=3
## P10,5,31,ID=0, num_zeros=4
## P10,5,32,ID=0, num_zeros=3
## P10,5,33,ID=0, num_zeros=4
## P10,5,34,ID=0, num_zeros=1
## P10,5,35,ID=0, num_zeros=3
## P10,5,36,ID=0, num_zeros=2
## P10,5,37,ID=0, num_zeros=1
## P10,5,38,ID=0, num_zeros=0
## P10,5,39,ID=0, num_zeros=1
## P10,5,40,ID=0, num_zeros=2
## P10,5,41,ID=0, num_zeros=2
## P10,5,42,ID=0, num_zeros=7
## P10,5,43,ID=0, num_zeros=2
## P10,5,44,ID=0, num_zeros=4
## P10,5,45,ID=0, num_zeros=2
## P10,5,46,ID=0, num_zeros=4
## P10,5,47,ID=0, num_zeros=4
## P10,5,48,ID=0, num_zeros=1
## P10,5,49,ID=0, num_zeros=1
## P10,5,50,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=1 in LISTP10[[6]]
## P10,6,2,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=3 in LISTP10[[6]]
## Warning: There are no valid values for INTERVALS=4 in LISTP10[[6]]
## P10,6,5,ID=0, num_zeros=0
## P10,6,6,ID=0, num_zeros=1
## P10,6,7,ID=0, num_zeros=1
## P10,6,8,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=9 in LISTP10[[6]]
## P10,6,10,ID=0, num_zeros=0
## P10,6,11,ID=0, num_zeros=4
## P10,6,12,ID=0, num_zeros=3
## P10,6,13,ID=0, num_zeros=3
## P10,6,14,ID=0, num_zeros=2
## P10,6,15,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=16 in LISTP10[[6]]
## P10,6,17,ID=0, num_zeros=3
## P10,6,18,ID=0, num_zeros=0
## P10,6,19,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=20 in LISTP10[[6]]
## P10,6,21,ID=0, num_zeros=1
## P10,6,22,ID=0, num_zeros=3
## P10,6,23,ID=0, num_zeros=6
## P10,6,24,ID=0, num_zeros=1
## P10,6,25,ID=0, num_zeros=4
## P10,6,26,ID=0, num_zeros=0
## P10,6,27,ID=0, num_zeros=2
## P10,6,28,ID=0, num_zeros=2
## P10,6,29,ID=0, num_zeros=2
## P10,6,30,ID=0, num_zeros=1
## P10,6,31,ID=0, num_zeros=4
## P10,6,32,ID=0, num_zeros=1
## P10,6,33,ID=0, num_zeros=1
## P10,6,34,ID=0, num_zeros=3
## P10,6,35,ID=0, num_zeros=4
## P10,6,36,ID=0, num_zeros=4
## P10,6,37,ID=0, num_zeros=2
## P10,6,38,ID=0, num_zeros=1
## P10,6,39,ID=0, num_zeros=0
## P10,6,40,ID=0, num_zeros=1
## P10,6,41,ID=0, num_zeros=4
## P10,6,42,ID=0, num_zeros=0
## P10,6,43,ID=0, num_zeros=1
## P10,6,44,ID=0, num_zeros=4
## P10,6,45,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=46 in LISTP10[[6]]
## P10,6,47,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=48 in LISTP10[[6]]
## P10,6,49,ID=0, num_zeros=2
## P10,6,50,ID=0, num_zeros=14
## P10,7,1,ID=0, num_zeros=1
## P10,7,2,ID=0, num_zeros=4
## P10,7,3,ID=0, num_zeros=2
## P10,7,4,ID=0, num_zeros=3
## P10,7,5,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=6 in LISTP10[[7]]
## P10,7,7,ID=0, num_zeros=0
## P10,7,8,ID=0, num_zeros=4
## P10,7,9,ID=0, num_zeros=3
## P10,7,10,ID=0, num_zeros=1
## P10,7,11,ID=0, num_zeros=3
## P10,7,12,ID=0, num_zeros=3
## P10,7,13,ID=0, num_zeros=2
## P10,7,14,ID=0, num_zeros=4
## P10,7,15,ID=0, num_zeros=2
## P10,7,16,ID=0, num_zeros=4
## P10,7,17,ID=0, num_zeros=2
## P10,7,18,ID=0, num_zeros=0
## P10,7,19,ID=0, num_zeros=2
## P10,7,20,ID=0, num_zeros=3
## P10,7,21,ID=0, num_zeros=3
## P10,7,22,ID=0, num_zeros=1
## P10,7,23,ID=0, num_zeros=3
## P10,7,24,ID=0, num_zeros=2
## P10,7,25,ID=0, num_zeros=2
## P10,7,26,ID=0, num_zeros=4
## P10,7,27,ID=0, num_zeros=1
## P10,7,28,ID=0, num_zeros=4
## P10,7,29,ID=0, num_zeros=3
## P10,7,30,ID=0, num_zeros=2
## P10,7,31,ID=0, num_zeros=0
## P10,7,32,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=33 in LISTP10[[7]]
## P10,7,34,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=35 in LISTP10[[7]]
## P10,7,36,ID=0, num_zeros=1
## P10,7,37,ID=0, num_zeros=2
## P10,7,38,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=39 in LISTP10[[7]]
## P10,7,40,ID=0, num_zeros=4
## P10,7,41,ID=0, num_zeros=2
## P10,7,42,ID=0, num_zeros=3
## P10,7,43,ID=0, num_zeros=3
## P10,7,44,ID=0, num_zeros=3
## P10,7,45,ID=0, num_zeros=0
## P10,7,46,ID=0, num_zeros=4
## P10,7,47,ID=0, num_zeros=8
## P10,7,48,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=49 in LISTP10[[7]]
## P10,7,50,ID=0, num_zeros=3
## P10,8,1,ID=0, num_zeros=3
## P10,8,2,ID=0, num_zeros=4
## P10,8,3,ID=0, num_zeros=2
## P10,8,4,ID=0, num_zeros=1
## P10,8,5,ID=0, num_zeros=5
## P10,8,6,ID=0, num_zeros=5
## P10,8,7,ID=0, num_zeros=4
## P10,8,8,ID=0, num_zeros=1
## P10,8,9,ID=0, num_zeros=1
## P10,8,10,ID=0, num_zeros=1
## P10,8,11,ID=0, num_zeros=2
## P10,8,12,ID=0, num_zeros=0
## P10,8,13,ID=0, num_zeros=1
## P10,8,14,ID=0, num_zeros=2
## P10,8,15,ID=0, num_zeros=2
## P10,8,16,ID=0, num_zeros=5
## P10,8,17,ID=0, num_zeros=4
## P10,8,18,ID=0, num_zeros=1
## P10,8,19,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=20 in LISTP10[[8]]
## P10,8,21,ID=0, num_zeros=1
## P10,8,22,ID=0, num_zeros=2
## P10,8,23,ID=0, num_zeros=2
## P10,8,24,ID=0, num_zeros=1
## P10,8,25,ID=0, num_zeros=1
## P10,8,26,ID=0, num_zeros=3
## P10,8,27,ID=0, num_zeros=1
## P10,8,28,ID=0, num_zeros=2
## P10,8,29,ID=0, num_zeros=0
## P10,8,30,ID=0, num_zeros=1
## P10,8,31,ID=0, num_zeros=3
## P10,8,32,ID=0, num_zeros=3
## P10,8,33,ID=0, num_zeros=4
## P10,8,34,ID=0, num_zeros=5
## P10,8,35,ID=0, num_zeros=2
## P10,8,36,ID=0, num_zeros=4
## P10,8,37,ID=0, num_zeros=2
## P10,8,38,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=39 in LISTP10[[8]]
## P10,8,40,ID=0, num_zeros=3
## P10,8,41,ID=0, num_zeros=1
## P10,8,42,ID=0, num_zeros=1
## P10,8,43,ID=0, num_zeros=2
## P10,8,44,ID=0, num_zeros=3
## P10,8,45,ID=0, num_zeros=5
## P10,8,46,ID=0, num_zeros=5
## P10,8,47,ID=0, num_zeros=3
## P10,8,48,ID=0, num_zeros=1
## P10,8,49,ID=0, num_zeros=1
## P10,8,50,ID=0, num_zeros=4
## P10,9,1,ID=0, num_zeros=0
## P10,9,2,ID=0, num_zeros=4
## P10,9,3,ID=0, num_zeros=4
## P10,9,4,ID=0, num_zeros=5
## P10,9,5,ID=0, num_zeros=4
## P10,9,6,ID=0, num_zeros=2
## P10,9,7,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=8 in LISTP10[[9]]
## P10,9,9,ID=0, num_zeros=3
## P10,9,10,ID=0, num_zeros=2
## P10,9,11,ID=0, num_zeros=4
## P10,9,12,ID=0, num_zeros=3
## P10,9,13,ID=0, num_zeros=2
## P10,9,14,ID=0, num_zeros=5
## P10,9,15,ID=0, num_zeros=5
## P10,9,16,ID=0, num_zeros=1
## P10,9,17,ID=0, num_zeros=3
## P10,9,18,ID=0, num_zeros=1
## P10,9,19,ID=0, num_zeros=0
## P10,9,20,ID=0, num_zeros=1
## P10,9,21,ID=0, num_zeros=4
## P10,9,22,ID=0, num_zeros=2
## P10,9,23,ID=0, num_zeros=1
## P10,9,24,ID=0, num_zeros=2
## P10,9,25,ID=0, num_zeros=2
## P10,9,26,ID=0, num_zeros=4
## P10,9,27,ID=0, num_zeros=4
## P10,9,28,ID=0, num_zeros=1
## P10,9,29,ID=0, num_zeros=1
## P10,9,30,ID=0, num_zeros=5
## P10,9,31,ID=0, num_zeros=5
## P10,9,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP10[[9]]
## P10,9,34,ID=0, num_zeros=2
## P10,9,35,ID=0, num_zeros=3
## P10,9,36,ID=0, num_zeros=3
## P10,9,37,ID=0, num_zeros=2
## P10,9,38,ID=0, num_zeros=1
## P10,9,39,ID=0, num_zeros=4
## P10,9,40,ID=0, num_zeros=3
## P10,9,41,ID=0, num_zeros=0
## P10,9,42,ID=0, num_zeros=2
## P10,9,43,ID=0, num_zeros=2
## P10,9,44,ID=0, num_zeros=1
## P10,9,45,ID=0, num_zeros=2
## P10,9,46,ID=0, num_zeros=5
## P10,9,47,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=48 in LISTP10[[9]]
## P10,9,49,ID=0, num_zeros=3
## P10,9,50,ID=0, num_zeros=4
## P10,10,1,ID=0, num_zeros=0
## P10,10,2,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=3 in LISTP10[[10]]
## P10,10,4,ID=0, num_zeros=4
## P10,10,5,ID=0, num_zeros=2
## P10,10,6,ID=0, num_zeros=2
## P10,10,7,ID=0, num_zeros=3
## P10,10,8,ID=0, num_zeros=2
## P10,10,9,ID=0, num_zeros=3
## P10,10,10,ID=0, num_zeros=3
## P10,10,11,ID=0, num_zeros=4
## P10,10,12,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=13 in LISTP10[[10]]
## P10,10,14,ID=0, num_zeros=1
## P10,10,15,ID=0, num_zeros=3
## P10,10,16,ID=0, num_zeros=5
## P10,10,17,ID=0, num_zeros=1
## P10,10,18,ID=0, num_zeros=2
## P10,10,19,ID=0, num_zeros=2
## P10,10,20,ID=0, num_zeros=2
## P10,10,21,ID=0, num_zeros=7
## P10,10,22,ID=0, num_zeros=0
## P10,10,23,ID=0, num_zeros=1
## P10,10,24,ID=0, num_zeros=1
## P10,10,25,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=26 in LISTP10[[10]]
## P10,10,27,ID=0, num_zeros=4
## P10,10,28,ID=0, num_zeros=0
## P10,10,29,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=30 in LISTP10[[10]]
## P10,10,31,ID=0, num_zeros=4
## P10,10,32,ID=0, num_zeros=3
## P10,10,33,ID=0, num_zeros=2
## P10,10,34,ID=0, num_zeros=4
## P10,10,35,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=36 in LISTP10[[10]]
## P10,10,37,ID=0, num_zeros=1
## P10,10,38,ID=0, num_zeros=3
## P10,10,39,ID=0, num_zeros=2
## P10,10,40,ID=0, num_zeros=4
## P10,10,41,ID=0, num_zeros=7
## P10,10,42,ID=0, num_zeros=5
## P10,10,43,ID=0, num_zeros=1
## P10,10,44,ID=0, num_zeros=3
## P10,10,45,ID=0, num_zeros=1
## P10,10,46,ID=0, num_zeros=0
## P10,10,47,ID=0, num_zeros=6
## P10,10,48,ID=0, num_zeros=1
## P10,10,49,ID=0, num_zeros=2
## P10,10,50,ID=0, num_zeros=2
## P11,1,1,ID=0, num_zeros=6
## P11,1,2,ID=0, num_zeros=7
## P11,1,3,ID=0, num_zeros=4
## P11,1,4,ID=0, num_zeros=8
## P11,1,5,ID=0, num_zeros=4
## P11,1,6,ID=0, num_zeros=5
## P11,1,7,ID=0, num_zeros=3
## P11,1,8,ID=0, num_zeros=5
## P11,1,9,ID=0, num_zeros=6
## P11,1,10,ID=0, num_zeros=2
## P11,1,11,ID=0, num_zeros=2
## P11,1,12,ID=0, num_zeros=4
## P11,1,13,ID=0, num_zeros=3
## P11,1,14,ID=0, num_zeros=3
## P11,1,15,ID=0, num_zeros=4
## P11,1,16,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=17 in LISTP11[[1]]
## P11,1,18,ID=0, num_zeros=7
## P11,1,19,ID=0, num_zeros=4
## P11,1,20,ID=0, num_zeros=6
## P11,1,21,ID=0, num_zeros=7
## P11,1,22,ID=0, num_zeros=5
## P11,1,23,ID=0, num_zeros=5
## P11,1,24,ID=0, num_zeros=0
## P11,1,25,ID=0, num_zeros=5
## P11,1,26,ID=0, num_zeros=7
## P11,1,27,ID=0, num_zeros=9
## P11,1,28,ID=0, num_zeros=2
## P11,1,29,ID=0, num_zeros=1
## P11,1,30,ID=0, num_zeros=0
## P11,1,31,ID=0, num_zeros=9
## P11,1,32,ID=0, num_zeros=1
## P11,1,33,ID=0, num_zeros=4
## P11,1,34,ID=0, num_zeros=2
## P11,1,35,ID=0, num_zeros=3
## P11,1,36,ID=0, num_zeros=9
## P11,1,37,ID=0, num_zeros=6
## P11,1,38,ID=0, num_zeros=4
## P11,1,39,ID=0, num_zeros=4
## P11,1,40,ID=0, num_zeros=6
## P11,1,41,ID=0, num_zeros=12
## P11,1,42,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=43 in LISTP11[[1]]
## P11,1,44,ID=0, num_zeros=2
## P11,1,45,ID=0, num_zeros=2
## P11,1,46,ID=0, num_zeros=6
## P11,1,47,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=48 in LISTP11[[1]]
## Warning: There are no valid values for INTERVALS=49 in LISTP11[[1]]
## Warning: There are no valid values for INTERVALS=50 in LISTP11[[1]]
## P11,2,1,ID=0, num_zeros=7
## P11,2,2,ID=0, num_zeros=3
## P11,2,3,ID=0, num_zeros=4
## P11,2,4,ID=0, num_zeros=11
## P11,2,5,ID=0, num_zeros=2
## P11,2,6,ID=0, num_zeros=2
## P11,2,7,ID=0, num_zeros=3
## P11,2,8,ID=0, num_zeros=2
## P11,2,9,ID=0, num_zeros=1
## P11,2,10,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=11 in LISTP11[[2]]
## P11,2,12,ID=0, num_zeros=2
## P11,2,13,ID=0, num_zeros=3
## P11,2,14,ID=0, num_zeros=8
## P11,2,15,ID=0, num_zeros=3
## P11,2,16,ID=0, num_zeros=2
## P11,2,17,ID=0, num_zeros=7
## P11,2,18,ID=0, num_zeros=5
## P11,2,19,ID=0, num_zeros=4
## P11,2,20,ID=0, num_zeros=3
## P11,2,21,ID=0, num_zeros=1
## P11,2,22,ID=0, num_zeros=3
## P11,2,23,ID=0, num_zeros=4
## P11,2,24,ID=0, num_zeros=6
## P11,2,25,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=26 in LISTP11[[2]]
## P11,2,27,ID=0, num_zeros=2
## P11,2,28,ID=0, num_zeros=5
## P11,2,29,ID=0, num_zeros=9
## P11,2,30,ID=0, num_zeros=3
## P11,2,31,ID=0, num_zeros=5
## P11,2,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP11[[2]]
## P11,2,34,ID=0, num_zeros=2
## P11,2,35,ID=0, num_zeros=5
## P11,2,36,ID=0, num_zeros=3
## P11,2,37,ID=0, num_zeros=1
## P11,2,38,ID=0, num_zeros=4
## P11,2,39,ID=0, num_zeros=1
## P11,2,40,ID=0, num_zeros=2
## P11,2,41,ID=0, num_zeros=1
## P11,2,42,ID=0, num_zeros=2
## P11,2,43,ID=0, num_zeros=2
## P11,2,44,ID=0, num_zeros=3
## P11,2,45,ID=0, num_zeros=2
## P11,2,46,ID=0, num_zeros=1
## P11,2,47,ID=0, num_zeros=5
## P11,2,48,ID=0, num_zeros=2
## P11,2,49,ID=0, num_zeros=4
## P11,2,50,ID=0, num_zeros=18
## Warning: There are no valid values for INTERVALS=1 in LISTP11[[3]]
## P11,3,2,ID=0, num_zeros=1
## P11,3,3,ID=0, num_zeros=2
## P11,3,4,ID=0, num_zeros=1
## P11,3,5,ID=0, num_zeros=4
## P11,3,6,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=7 in LISTP11[[3]]
## P11,3,8,ID=0, num_zeros=2
## P11,3,9,ID=0, num_zeros=12
## P11,3,10,ID=0, num_zeros=8
## P11,3,11,ID=0, num_zeros=1
## P11,3,12,ID=0, num_zeros=3
## P11,3,13,ID=0, num_zeros=3
## P11,3,14,ID=0, num_zeros=3
## P11,3,15,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=16 in LISTP11[[3]]
## P11,3,17,ID=0, num_zeros=2
## P11,3,18,ID=0, num_zeros=10
## P11,3,19,ID=0, num_zeros=2
## P11,3,20,ID=0, num_zeros=4
## P11,3,21,ID=0, num_zeros=5
## P11,3,22,ID=0, num_zeros=0
## P11,3,23,ID=0, num_zeros=2
## P11,3,24,ID=0, num_zeros=5
## P11,3,25,ID=0, num_zeros=5
## P11,3,26,ID=0, num_zeros=4
## P11,3,27,ID=0, num_zeros=1
## P11,3,28,ID=0, num_zeros=2
## P11,3,29,ID=0, num_zeros=3
## P11,3,30,ID=0, num_zeros=1
## P11,3,31,ID=0, num_zeros=6
## P11,3,32,ID=0, num_zeros=4
## P11,3,33,ID=0, num_zeros=5
## P11,3,34,ID=0, num_zeros=4
## P11,3,35,ID=0, num_zeros=6
## P11,3,36,ID=0, num_zeros=2
## P11,3,37,ID=0, num_zeros=0
## P11,3,38,ID=0, num_zeros=2
## P11,3,39,ID=0, num_zeros=4
## P11,3,40,ID=0, num_zeros=2
## P11,3,41,ID=0, num_zeros=4
## P11,3,42,ID=0, num_zeros=3
## P11,3,43,ID=0, num_zeros=5
## P11,3,44,ID=0, num_zeros=8
## P11,3,45,ID=0, num_zeros=3
## P11,3,46,ID=0, num_zeros=5
## P11,3,47,ID=0, num_zeros=11
## P11,3,48,ID=0, num_zeros=2
## P11,3,49,ID=0, num_zeros=5
## P11,3,50,ID=0, num_zeros=21
## Warning: There are no valid values for INTERVALS=1 in LISTP11[[4]]
## P11,4,2,ID=0, num_zeros=2
## P11,4,3,ID=0, num_zeros=2
## P11,4,4,ID=0, num_zeros=6
## P11,4,5,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=6 in LISTP11[[4]]
## P11,4,7,ID=0, num_zeros=5
## P11,4,8,ID=0, num_zeros=3
## P11,4,9,ID=0, num_zeros=2
## P11,4,10,ID=0, num_zeros=1
## P11,4,11,ID=0, num_zeros=3
## P11,4,12,ID=0, num_zeros=1
## P11,4,13,ID=0, num_zeros=1
## P11,4,14,ID=0, num_zeros=1
## P11,4,15,ID=0, num_zeros=5
## P11,4,16,ID=0, num_zeros=10
## P11,4,17,ID=0, num_zeros=1
## P11,4,18,ID=0, num_zeros=1
## P11,4,19,ID=0, num_zeros=3
## P11,4,20,ID=0, num_zeros=3
## P11,4,21,ID=0, num_zeros=8
## P11,4,22,ID=0, num_zeros=3
## P11,4,23,ID=0, num_zeros=4
## P11,4,24,ID=0, num_zeros=1
## P11,4,25,ID=0, num_zeros=2
## P11,4,26,ID=0, num_zeros=1
## P11,4,27,ID=0, num_zeros=5
## P11,4,28,ID=0, num_zeros=2
## P11,4,29,ID=0, num_zeros=1
## P11,4,30,ID=0, num_zeros=7
## P11,4,31,ID=0, num_zeros=2
## P11,4,32,ID=0, num_zeros=3
## P11,4,33,ID=0, num_zeros=5
## P11,4,34,ID=0, num_zeros=5
## P11,4,35,ID=0, num_zeros=0
## P11,4,36,ID=0, num_zeros=1
## P11,4,37,ID=0, num_zeros=5
## P11,4,38,ID=0, num_zeros=3
## P11,4,39,ID=0, num_zeros=1
## P11,4,40,ID=0, num_zeros=5
## P11,4,41,ID=0, num_zeros=3
## P11,4,42,ID=0, num_zeros=5
## P11,4,43,ID=0, num_zeros=3
## P11,4,44,ID=0, num_zeros=1
## P11,4,45,ID=0, num_zeros=3
## P11,4,46,ID=0, num_zeros=5
## P11,4,47,ID=0, num_zeros=3
## P11,4,48,ID=0, num_zeros=0
## P11,4,49,ID=0, num_zeros=6
## P11,4,50,ID=0, num_zeros=11
## P11,5,1,ID=0, num_zeros=2
## P11,5,2,ID=0, num_zeros=4
## P11,5,3,ID=0, num_zeros=0
## P11,5,4,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=5 in LISTP11[[5]]
## P11,5,6,ID=0, num_zeros=5
## P11,5,7,ID=0, num_zeros=2
## P11,5,8,ID=0, num_zeros=3
## P11,5,9,ID=0, num_zeros=12
## P11,5,10,ID=0, num_zeros=3
## P11,5,11,ID=0, num_zeros=10
## P11,5,12,ID=0, num_zeros=8
## P11,5,13,ID=0, num_zeros=2
## P11,5,14,ID=0, num_zeros=3
## P11,5,15,ID=0, num_zeros=4
## P11,5,16,ID=0, num_zeros=6
## P11,5,17,ID=0, num_zeros=4
## P11,5,18,ID=0, num_zeros=3
## P11,5,19,ID=0, num_zeros=5
## P11,5,20,ID=0, num_zeros=4
## P11,5,21,ID=0, num_zeros=2
## P11,5,22,ID=0, num_zeros=8
## P11,5,23,ID=0, num_zeros=4
## P11,5,24,ID=0, num_zeros=4
## P11,5,25,ID=0, num_zeros=4
## P11,5,26,ID=0, num_zeros=4
## P11,5,27,ID=0, num_zeros=5
## P11,5,28,ID=0, num_zeros=3
## P11,5,29,ID=0, num_zeros=2
## P11,5,30,ID=0, num_zeros=2
## P11,5,31,ID=0, num_zeros=4
## P11,5,32,ID=0, num_zeros=5
## P11,5,33,ID=0, num_zeros=7
## P11,5,34,ID=0, num_zeros=4
## P11,5,35,ID=0, num_zeros=4
## P11,5,36,ID=0, num_zeros=1
## P11,5,37,ID=0, num_zeros=1
## P11,5,38,ID=0, num_zeros=3
## P11,5,39,ID=0, num_zeros=7
## P11,5,40,ID=0, num_zeros=2
## P11,5,41,ID=0, num_zeros=4
## P11,5,42,ID=0, num_zeros=6
## P11,5,43,ID=0, num_zeros=5
## P11,5,44,ID=0, num_zeros=2
## P11,5,45,ID=0, num_zeros=1
## P11,5,46,ID=0, num_zeros=11
## P11,5,47,ID=0, num_zeros=10
## P11,5,48,ID=0, num_zeros=1
## P11,5,49,ID=0, num_zeros=4
## P11,5,50,ID=0, num_zeros=8
## P11,6,1,ID=0, num_zeros=1
## P11,6,2,ID=0, num_zeros=4
## P11,6,3,ID=0, num_zeros=3
## P11,6,4,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=5 in LISTP11[[6]]
## P11,6,6,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=7 in LISTP11[[6]]
## Warning: There are no valid values for INTERVALS=8 in LISTP11[[6]]
## P11,6,9,ID=0, num_zeros=0
## P11,6,10,ID=0, num_zeros=1
## P11,6,11,ID=0, num_zeros=0
## P11,6,12,ID=0, num_zeros=1
## P11,6,13,ID=0, num_zeros=3
## P11,6,14,ID=0, num_zeros=3
## P11,6,15,ID=0, num_zeros=2
## P11,6,16,ID=0, num_zeros=2
## P11,6,17,ID=0, num_zeros=2
## P11,6,18,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=19 in LISTP11[[6]]
## P11,6,20,ID=0, num_zeros=1
## P11,6,21,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=22 in LISTP11[[6]]
## P11,6,23,ID=0, num_zeros=3
## P11,6,24,ID=0, num_zeros=2
## P11,6,25,ID=0, num_zeros=3
## P11,6,26,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=27 in LISTP11[[6]]
## P11,6,28,ID=0, num_zeros=1
## P11,6,29,ID=0, num_zeros=4
## P11,6,30,ID=0, num_zeros=4
## P11,6,31,ID=0, num_zeros=7
## P11,6,32,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=33 in LISTP11[[6]]
## P11,6,34,ID=0, num_zeros=3
## P11,6,35,ID=0, num_zeros=4
## P11,6,36,ID=0, num_zeros=3
## P11,6,37,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=38 in LISTP11[[6]]
## P11,6,39,ID=0, num_zeros=1
## P11,6,40,ID=0, num_zeros=5
## P11,6,41,ID=0, num_zeros=1
## P11,6,42,ID=0, num_zeros=4
## P11,6,43,ID=0, num_zeros=4
## P11,6,44,ID=0, num_zeros=2
## P11,6,45,ID=0, num_zeros=1
## P11,6,46,ID=0, num_zeros=4
## P11,6,47,ID=0, num_zeros=5
## P11,6,48,ID=0, num_zeros=2
## P11,6,49,ID=0, num_zeros=1
## P11,6,50,ID=0, num_zeros=15
## Warning: There are no valid values for INTERVALS=1 in LISTP11[[7]]
## P11,7,2,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=3 in LISTP11[[7]]
## P11,7,4,ID=0, num_zeros=1
## P11,7,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP11[[7]]
## Warning: There are no valid values for INTERVALS=7 in LISTP11[[7]]
## P11,7,8,ID=0, num_zeros=1
## P11,7,9,ID=0, num_zeros=2
## P11,7,10,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=11 in LISTP11[[7]]
## P11,7,12,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=13 in LISTP11[[7]]
## P11,7,14,ID=0, num_zeros=1
## P11,7,15,ID=0, num_zeros=0
## P11,7,16,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=17 in LISTP11[[7]]
## P11,7,18,ID=0, num_zeros=1
## P11,7,19,ID=0, num_zeros=1
## P11,7,20,ID=0, num_zeros=2
## P11,7,21,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=22 in LISTP11[[7]]
## P11,7,23,ID=0, num_zeros=3
## P11,7,24,ID=0, num_zeros=3
## P11,7,25,ID=0, num_zeros=1
## P11,7,26,ID=0, num_zeros=1
## P11,7,27,ID=0, num_zeros=8
## P11,7,28,ID=0, num_zeros=3
## P11,7,29,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=30 in LISTP11[[7]]
## P11,7,31,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=32 in LISTP11[[7]]
## P11,7,33,ID=0, num_zeros=1
## P11,7,34,ID=0, num_zeros=1
## P11,7,35,ID=0, num_zeros=1
## P11,7,36,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=37 in LISTP11[[7]]
## P11,7,38,ID=0, num_zeros=3
## P11,7,39,ID=0, num_zeros=4
## P11,7,40,ID=0, num_zeros=4
## P11,7,41,ID=0, num_zeros=6
## P11,7,42,ID=0, num_zeros=4
## P11,7,43,ID=0, num_zeros=4
## P11,7,44,ID=0, num_zeros=0
## P11,7,45,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=46 in LISTP11[[7]]
## P11,7,47,ID=0, num_zeros=1
## P11,7,48,ID=0, num_zeros=4
## P11,7,49,ID=0, num_zeros=0
## P11,7,50,ID=0, num_zeros=4
## P11,8,1,ID=0, num_zeros=3
## P11,8,2,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=3 in LISTP11[[8]]
## P11,8,4,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=5 in LISTP11[[8]]
## Warning: There are no valid values for INTERVALS=6 in LISTP11[[8]]
## P11,8,7,ID=0, num_zeros=2
## P11,8,8,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=9 in LISTP11[[8]]
## Warning: There are no valid values for INTERVALS=10 in LISTP11[[8]]
## Warning: There are no valid values for INTERVALS=11 in LISTP11[[8]]
## P11,8,12,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=13 in LISTP11[[8]]
## P11,8,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP11[[8]]
## P11,8,16,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=17 in LISTP11[[8]]
## P11,8,18,ID=0, num_zeros=2
## P11,8,19,ID=0, num_zeros=3
## P11,8,20,ID=0, num_zeros=2
## P11,8,21,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=22 in LISTP11[[8]]
## Warning: There are no valid values for INTERVALS=23 in LISTP11[[8]]
## Warning: There are no valid values for INTERVALS=24 in LISTP11[[8]]
## P11,8,25,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=26 in LISTP11[[8]]
## Warning: There are no valid values for INTERVALS=27 in LISTP11[[8]]
## P11,8,28,ID=0, num_zeros=1
## P11,8,29,ID=0, num_zeros=1
## P11,8,30,ID=0, num_zeros=2
## P11,8,31,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=32 in LISTP11[[8]]
## P11,8,33,ID=0, num_zeros=1
## P11,8,34,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=35 in LISTP11[[8]]
## P11,8,36,ID=0, num_zeros=1
## P11,8,37,ID=0, num_zeros=1
## P11,8,38,ID=0, num_zeros=3
## P11,8,39,ID=0, num_zeros=0
## P11,8,40,ID=0, num_zeros=2
## P11,8,41,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=42 in LISTP11[[8]]
## P11,8,43,ID=0, num_zeros=2
## P11,8,44,ID=0, num_zeros=1
## P11,8,45,ID=0, num_zeros=3
## P11,8,46,ID=0, num_zeros=2
## P11,8,47,ID=0, num_zeros=0
## P11,8,48,ID=0, num_zeros=1
## P11,8,49,ID=0, num_zeros=2
## P11,8,50,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=1 in LISTP11[[9]]
## P11,9,2,ID=0, num_zeros=2
## P11,9,3,ID=0, num_zeros=1
## P11,9,4,ID=0, num_zeros=0
## P11,9,5,ID=0, num_zeros=1
## P11,9,6,ID=0, num_zeros=1
## P11,9,7,ID=0, num_zeros=1
## P11,9,8,ID=0, num_zeros=1
## P11,9,9,ID=0, num_zeros=1
## P11,9,10,ID=0, num_zeros=2
## P11,9,11,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=12 in LISTP11[[9]]
## Warning: There are no valid values for INTERVALS=13 in LISTP11[[9]]
## P11,9,14,ID=0, num_zeros=1
## P11,9,15,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=16 in LISTP11[[9]]
## P11,9,17,ID=0, num_zeros=1
## P11,9,18,ID=0, num_zeros=4
## P11,9,19,ID=0, num_zeros=1
## P11,9,20,ID=0, num_zeros=2
## P11,9,21,ID=0, num_zeros=1
## P11,9,22,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=23 in LISTP11[[9]]
## P11,9,24,ID=0, num_zeros=3
## P11,9,25,ID=0, num_zeros=1
## P11,9,26,ID=0, num_zeros=2
## P11,9,27,ID=0, num_zeros=1
## P11,9,28,ID=0, num_zeros=3
## P11,9,29,ID=0, num_zeros=2
## P11,9,30,ID=0, num_zeros=3
## P11,9,31,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=32 in LISTP11[[9]]
## P11,9,33,ID=0, num_zeros=3
## P11,9,34,ID=0, num_zeros=3
## P11,9,35,ID=0, num_zeros=3
## P11,9,36,ID=0, num_zeros=3
## P11,9,37,ID=0, num_zeros=2
## P11,9,38,ID=0, num_zeros=2
## P11,9,39,ID=0, num_zeros=4
## P11,9,40,ID=0, num_zeros=3
## P11,9,41,ID=0, num_zeros=1
## P11,9,42,ID=0, num_zeros=9
## P11,9,43,ID=0, num_zeros=1
## P11,9,44,ID=0, num_zeros=1
## P11,9,45,ID=0, num_zeros=1
## P11,9,46,ID=0, num_zeros=2
## P11,9,47,ID=0, num_zeros=6
## P11,9,48,ID=0, num_zeros=2
## P11,9,49,ID=0, num_zeros=2
## P11,9,50,ID=0, num_zeros=8
## P11,10,1,ID=0, num_zeros=1
## P11,10,2,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=3 in LISTP11[[10]]
## P11,10,4,ID=0, num_zeros=2
## P11,10,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP11[[10]]
## P11,10,7,ID=0, num_zeros=1
## P11,10,8,ID=0, num_zeros=4
## P11,10,9,ID=0, num_zeros=2
## P11,10,10,ID=0, num_zeros=5
## P11,10,11,ID=0, num_zeros=2
## P11,10,12,ID=0, num_zeros=1
## P11,10,13,ID=0, num_zeros=0
## P11,10,14,ID=0, num_zeros=3
## P11,10,15,ID=0, num_zeros=6
## P11,10,16,ID=0, num_zeros=1
## P11,10,17,ID=0, num_zeros=2
## P11,10,18,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=19 in LISTP11[[10]]
## P11,10,20,ID=0, num_zeros=1
## P11,10,21,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=22 in LISTP11[[10]]
## P11,10,23,ID=0, num_zeros=1
## P11,10,24,ID=0, num_zeros=1
## P11,10,25,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=26 in LISTP11[[10]]
## P11,10,27,ID=0, num_zeros=2
## P11,10,28,ID=0, num_zeros=1
## P11,10,29,ID=0, num_zeros=2
## P11,10,30,ID=0, num_zeros=1
## P11,10,31,ID=0, num_zeros=5
## P11,10,32,ID=0, num_zeros=2
## P11,10,33,ID=0, num_zeros=0
## P11,10,34,ID=0, num_zeros=1
## P11,10,35,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=36 in LISTP11[[10]]
## P11,10,37,ID=0, num_zeros=1
## P11,10,38,ID=0, num_zeros=2
## P11,10,39,ID=0, num_zeros=2
## P11,10,40,ID=0, num_zeros=1
## P11,10,41,ID=0, num_zeros=3
## P11,10,42,ID=0, num_zeros=2
## P11,10,43,ID=0, num_zeros=2
## P11,10,44,ID=0, num_zeros=0
## P11,10,45,ID=0, num_zeros=2
## P11,10,46,ID=0, num_zeros=3
## P11,10,47,ID=0, num_zeros=3
## P11,10,48,ID=0, num_zeros=2
## P11,10,49,ID=0, num_zeros=3
## P11,10,50,ID=0, num_zeros=3
## P12,1,1,ID=0, num_zeros=7
## P12,1,2,ID=0, num_zeros=1
## P12,1,3,ID=0, num_zeros=2
## P12,1,4,ID=0, num_zeros=4
## P12,1,5,ID=0, num_zeros=5
## P12,1,6,ID=0, num_zeros=0
## P12,1,7,ID=0, num_zeros=2
## P12,1,8,ID=0, num_zeros=2
## P12,1,9,ID=0, num_zeros=4
## P12,1,10,ID=0, num_zeros=6
## P12,1,11,ID=0, num_zeros=6
## P12,1,12,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=13 in LISTP12[[1]]
## P12,1,14,ID=0, num_zeros=5
## P12,1,15,ID=0, num_zeros=3
## P12,1,16,ID=0, num_zeros=1
## P12,1,17,ID=0, num_zeros=1
## P12,1,18,ID=0, num_zeros=1
## P12,1,19,ID=0, num_zeros=5
## P12,1,20,ID=0, num_zeros=5
## P12,1,21,ID=0, num_zeros=7
## P12,1,22,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=23 in LISTP12[[1]]
## P12,1,24,ID=0, num_zeros=2
## P12,1,25,ID=0, num_zeros=4
## P12,1,26,ID=0, num_zeros=1
## P12,1,27,ID=0, num_zeros=3
## P12,1,28,ID=0, num_zeros=3
## P12,1,29,ID=0, num_zeros=6
## P12,1,30,ID=0, num_zeros=1
## P12,1,31,ID=0, num_zeros=5
## P12,1,32,ID=0, num_zeros=0
## P12,1,33,ID=0, num_zeros=1
## P12,1,34,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=35 in LISTP12[[1]]
## P12,1,36,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=37 in LISTP12[[1]]
## P12,1,38,ID=0, num_zeros=2
## P12,1,39,ID=0, num_zeros=4
## P12,1,40,ID=0, num_zeros=6
## P12,1,41,ID=0, num_zeros=2
## P12,1,42,ID=0, num_zeros=1
## P12,1,43,ID=0, num_zeros=4
## P12,1,44,ID=0, num_zeros=4
## P12,1,45,ID=0, num_zeros=3
## P12,1,46,ID=0, num_zeros=3
## P12,1,47,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=48 in LISTP12[[1]]
## P12,1,49,ID=0, num_zeros=1
## P12,1,50,ID=0, num_zeros=7
## P12,2,1,ID=0, num_zeros=2
## P12,2,2,ID=0, num_zeros=1
## P12,2,3,ID=0, num_zeros=0
## P12,2,4,ID=0, num_zeros=5
## P12,2,5,ID=0, num_zeros=2
## P12,2,6,ID=0, num_zeros=6
## P12,2,7,ID=0, num_zeros=0
## P12,2,8,ID=0, num_zeros=3
## P12,2,9,ID=0, num_zeros=1
## P12,2,10,ID=0, num_zeros=2
## P12,2,11,ID=0, num_zeros=8
## P12,2,12,ID=0, num_zeros=4
## P12,2,13,ID=0, num_zeros=0
## P12,2,14,ID=0, num_zeros=7
## P12,2,15,ID=0, num_zeros=4
## P12,2,16,ID=0, num_zeros=7
## P12,2,17,ID=0, num_zeros=4
## P12,2,18,ID=0, num_zeros=6
## P12,2,19,ID=0, num_zeros=0
## P12,2,20,ID=0, num_zeros=3
## P12,2,21,ID=0, num_zeros=4
## P12,2,22,ID=0, num_zeros=1
## P12,2,23,ID=0, num_zeros=3
## P12,2,24,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=25 in LISTP12[[2]]
## P12,2,26,ID=0, num_zeros=2
## P12,2,27,ID=0, num_zeros=4
## P12,2,28,ID=0, num_zeros=0
## P12,2,29,ID=0, num_zeros=6
## P12,2,30,ID=0, num_zeros=1
## P12,2,31,ID=0, num_zeros=3
## P12,2,32,ID=0, num_zeros=0
## P12,2,33,ID=0, num_zeros=1
## P12,2,34,ID=0, num_zeros=3
## P12,2,35,ID=0, num_zeros=1
## P12,2,36,ID=0, num_zeros=3
## P12,2,37,ID=0, num_zeros=3
## P12,2,38,ID=0, num_zeros=5
## P12,2,39,ID=0, num_zeros=1
## P12,2,40,ID=0, num_zeros=0
## P12,2,41,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=42 in LISTP12[[2]]
## P12,2,43,ID=0, num_zeros=0
## P12,2,44,ID=0, num_zeros=6
## P12,2,45,ID=0, num_zeros=4
## P12,2,46,ID=0, num_zeros=2
## P12,2,47,ID=0, num_zeros=1
## P12,2,48,ID=0, num_zeros=4
## P12,2,49,ID=0, num_zeros=2
## P12,2,50,ID=0, num_zeros=5
## P12,3,1,ID=0, num_zeros=3
## P12,3,2,ID=0, num_zeros=4
## P12,3,3,ID=0, num_zeros=4
## P12,3,4,ID=0, num_zeros=4
## P12,3,5,ID=0, num_zeros=4
## P12,3,6,ID=0, num_zeros=5
## P12,3,7,ID=0, num_zeros=2
## P12,3,8,ID=0, num_zeros=3
## P12,3,9,ID=0, num_zeros=5
## P12,3,10,ID=0, num_zeros=3
## P12,3,11,ID=0, num_zeros=0
## P12,3,12,ID=0, num_zeros=1
## P12,3,13,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=14 in LISTP12[[3]]
## P12,3,15,ID=0, num_zeros=1
## P12,3,16,ID=0, num_zeros=3
## P12,3,17,ID=0, num_zeros=4
## P12,3,18,ID=0, num_zeros=1
## P12,3,19,ID=0, num_zeros=4
## P12,3,20,ID=0, num_zeros=2
## P12,3,21,ID=0, num_zeros=5
## P12,3,22,ID=0, num_zeros=3
## P12,3,23,ID=0, num_zeros=4
## P12,3,24,ID=0, num_zeros=5
## P12,3,25,ID=0, num_zeros=1
## P12,3,26,ID=0, num_zeros=2
## P12,3,27,ID=0, num_zeros=7
## P12,3,28,ID=0, num_zeros=4
## P12,3,29,ID=0, num_zeros=4
## P12,3,30,ID=0, num_zeros=0
## P12,3,31,ID=0, num_zeros=2
## P12,3,32,ID=0, num_zeros=4
## P12,3,33,ID=0, num_zeros=4
## P12,3,34,ID=0, num_zeros=2
## P12,3,35,ID=0, num_zeros=2
## P12,3,36,ID=0, num_zeros=2
## P12,3,37,ID=0, num_zeros=0
## P12,3,38,ID=0, num_zeros=1
## P12,3,39,ID=0, num_zeros=2
## P12,3,40,ID=0, num_zeros=2
## P12,3,41,ID=0, num_zeros=2
## P12,3,42,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=43 in LISTP12[[3]]
## P12,3,44,ID=0, num_zeros=1
## P12,3,45,ID=0, num_zeros=6
## P12,3,46,ID=0, num_zeros=3
## P12,3,47,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=48 in LISTP12[[3]]
## P12,3,49,ID=0, num_zeros=2
## P12,3,50,ID=0, num_zeros=4
## P12,4,1,ID=0, num_zeros=3
## P12,4,2,ID=0, num_zeros=3
## P12,4,3,ID=0, num_zeros=1
## P12,4,4,ID=0, num_zeros=3
## P12,4,5,ID=0, num_zeros=2
## P12,4,6,ID=0, num_zeros=3
## P12,4,7,ID=0, num_zeros=2
## P12,4,8,ID=0, num_zeros=2
## P12,4,9,ID=0, num_zeros=3
## P12,4,10,ID=0, num_zeros=3
## P12,4,11,ID=0, num_zeros=4
## P12,4,12,ID=0, num_zeros=4
## P12,4,13,ID=0, num_zeros=3
## P12,4,14,ID=0, num_zeros=2
## P12,4,15,ID=0, num_zeros=2
## P12,4,16,ID=0, num_zeros=0
## P12,4,17,ID=0, num_zeros=2
## P12,4,18,ID=0, num_zeros=2
## P12,4,19,ID=0, num_zeros=1
## P12,4,20,ID=0, num_zeros=3
## P12,4,21,ID=0, num_zeros=3
## P12,4,22,ID=0, num_zeros=6
## P12,4,23,ID=0, num_zeros=3
## P12,4,24,ID=0, num_zeros=2
## P12,4,25,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=26 in LISTP12[[4]]
## P12,4,27,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=28 in LISTP12[[4]]
## P12,4,29,ID=0, num_zeros=1
## P12,4,30,ID=0, num_zeros=2
## P12,4,31,ID=0, num_zeros=4
## P12,4,32,ID=0, num_zeros=1
## P12,4,33,ID=0, num_zeros=1
## P12,4,34,ID=0, num_zeros=2
## P12,4,35,ID=0, num_zeros=2
## P12,4,36,ID=0, num_zeros=9
## P12,4,37,ID=0, num_zeros=3
## P12,4,38,ID=0, num_zeros=2
## P12,4,39,ID=0, num_zeros=4
## P12,4,40,ID=0, num_zeros=2
## P12,4,41,ID=0, num_zeros=2
## P12,4,42,ID=0, num_zeros=2
## P12,4,43,ID=0, num_zeros=1
## P12,4,44,ID=0, num_zeros=2
## P12,4,45,ID=0, num_zeros=2
## P12,4,46,ID=0, num_zeros=1
## P12,4,47,ID=0, num_zeros=2
## P12,4,48,ID=0, num_zeros=1
## P12,4,49,ID=0, num_zeros=1
## P12,4,50,ID=0, num_zeros=1
## P12,5,1,ID=0, num_zeros=2
## P12,5,2,ID=0, num_zeros=3
## P12,5,3,ID=0, num_zeros=2
## P12,5,4,ID=0, num_zeros=2
## P12,5,5,ID=0, num_zeros=3
## P12,5,6,ID=0, num_zeros=1
## P12,5,7,ID=0, num_zeros=2
## P12,5,8,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=9 in LISTP12[[5]]
## Warning: There are no valid values for INTERVALS=10 in LISTP12[[5]]
## P12,5,11,ID=0, num_zeros=2
## P12,5,12,ID=0, num_zeros=7
## P12,5,13,ID=0, num_zeros=2
## P12,5,14,ID=0, num_zeros=3
## P12,5,15,ID=0, num_zeros=3
## P12,5,16,ID=0, num_zeros=6
## P12,5,17,ID=0, num_zeros=2
## P12,5,18,ID=0, num_zeros=1
## P12,5,19,ID=0, num_zeros=5
## P12,5,20,ID=0, num_zeros=2
## P12,5,21,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=22 in LISTP12[[5]]
## P12,5,23,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=24 in LISTP12[[5]]
## P12,5,25,ID=0, num_zeros=3
## P12,5,26,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=27 in LISTP12[[5]]
## Warning: There are no valid values for INTERVALS=28 in LISTP12[[5]]
## P12,5,29,ID=0, num_zeros=3
## P12,5,30,ID=0, num_zeros=3
## P12,5,31,ID=0, num_zeros=2
## P12,5,32,ID=0, num_zeros=3
## P12,5,33,ID=0, num_zeros=1
## P12,5,34,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=35 in LISTP12[[5]]
## P12,5,36,ID=0, num_zeros=3
## P12,5,37,ID=0, num_zeros=2
## P12,5,38,ID=0, num_zeros=2
## P12,5,39,ID=0, num_zeros=4
## P12,5,40,ID=0, num_zeros=1
## P12,5,41,ID=0, num_zeros=9
## P12,5,42,ID=0, num_zeros=2
## P12,5,43,ID=0, num_zeros=3
## P12,5,44,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=45 in LISTP12[[5]]
## P12,5,46,ID=0, num_zeros=4
## P12,5,47,ID=0, num_zeros=2
## P12,5,48,ID=0, num_zeros=5
## P12,5,49,ID=0, num_zeros=3
## P12,5,50,ID=0, num_zeros=5
## P12,6,1,ID=0, num_zeros=1
## P12,6,2,ID=0, num_zeros=2
## P12,6,3,ID=0, num_zeros=1
## P12,6,4,ID=0, num_zeros=2
## P12,6,5,ID=0, num_zeros=2
## P12,6,6,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=7 in LISTP12[[6]]
## P12,6,8,ID=0, num_zeros=3
## P12,6,9,ID=0, num_zeros=2
## P12,6,10,ID=0, num_zeros=2
## P12,6,11,ID=0, num_zeros=1
## P12,6,12,ID=0, num_zeros=1
## P12,6,13,ID=0, num_zeros=1
## P12,6,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP12[[6]]
## P12,6,16,ID=0, num_zeros=0
## P12,6,17,ID=0, num_zeros=1
## P12,6,18,ID=0, num_zeros=2
## P12,6,19,ID=0, num_zeros=4
## P12,6,20,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=21 in LISTP12[[6]]
## P12,6,22,ID=0, num_zeros=1
## P12,6,23,ID=0, num_zeros=1
## P12,6,24,ID=0, num_zeros=2
## P12,6,25,ID=0, num_zeros=2
## P12,6,26,ID=0, num_zeros=2
## P12,6,27,ID=0, num_zeros=2
## P12,6,28,ID=0, num_zeros=1
## P12,6,29,ID=0, num_zeros=2
## P12,6,30,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=31 in LISTP12[[6]]
## P12,6,32,ID=0, num_zeros=2
## P12,6,33,ID=0, num_zeros=6
## P12,6,34,ID=0, num_zeros=1
## P12,6,35,ID=0, num_zeros=2
## P12,6,36,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=37 in LISTP12[[6]]
## P12,6,38,ID=0, num_zeros=4
## P12,6,39,ID=0, num_zeros=1
## P12,6,40,ID=0, num_zeros=2
## P12,6,41,ID=0, num_zeros=0
## P12,6,42,ID=0, num_zeros=1
## P12,6,43,ID=0, num_zeros=2
## P12,6,44,ID=0, num_zeros=1
## P12,6,45,ID=0, num_zeros=3
## P12,6,46,ID=0, num_zeros=2
## P12,6,47,ID=0, num_zeros=1
## P12,6,48,ID=0, num_zeros=4
## P12,6,49,ID=0, num_zeros=2
## P12,6,50,ID=0, num_zeros=5
## P12,7,1,ID=0, num_zeros=2
## P12,7,2,ID=0, num_zeros=2
## P12,7,3,ID=0, num_zeros=1
## P12,7,4,ID=0, num_zeros=4
## P12,7,5,ID=0, num_zeros=5
## P12,7,6,ID=0, num_zeros=2
## P12,7,7,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=8 in LISTP12[[7]]
## Warning: There are no valid values for INTERVALS=9 in LISTP12[[7]]
## P12,7,10,ID=0, num_zeros=0
## P12,7,11,ID=0, num_zeros=2
## P12,7,12,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=13 in LISTP12[[7]]
## P12,7,14,ID=0, num_zeros=2
## P12,7,15,ID=0, num_zeros=1
## P12,7,16,ID=0, num_zeros=1
## P12,7,17,ID=0, num_zeros=2
## P12,7,18,ID=0, num_zeros=5
## P12,7,19,ID=0, num_zeros=0
## P12,7,20,ID=0, num_zeros=4
## P12,7,21,ID=0, num_zeros=2
## P12,7,22,ID=0, num_zeros=3
## P12,7,23,ID=0, num_zeros=0
## P12,7,24,ID=0, num_zeros=1
## P12,7,25,ID=0, num_zeros=1
## P12,7,26,ID=0, num_zeros=2
## P12,7,27,ID=0, num_zeros=2
## P12,7,28,ID=0, num_zeros=0
## P12,7,29,ID=0, num_zeros=2
## P12,7,30,ID=0, num_zeros=4
## P12,7,31,ID=0, num_zeros=4
## P12,7,32,ID=0, num_zeros=7
## P12,7,33,ID=0, num_zeros=0
## P12,7,34,ID=0, num_zeros=6
## P12,7,35,ID=0, num_zeros=0
## P12,7,36,ID=0, num_zeros=7
## P12,7,37,ID=0, num_zeros=1
## P12,7,38,ID=0, num_zeros=1
## P12,7,39,ID=0, num_zeros=4
## P12,7,40,ID=0, num_zeros=1
## P12,7,41,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=42 in LISTP12[[7]]
## P12,7,43,ID=0, num_zeros=2
## P12,7,44,ID=0, num_zeros=1
## P12,7,45,ID=0, num_zeros=2
## P12,7,46,ID=0, num_zeros=5
## P12,7,47,ID=0, num_zeros=3
## P12,7,48,ID=0, num_zeros=1
## P12,7,49,ID=0, num_zeros=3
## P12,7,50,ID=0, num_zeros=1
## P12,8,1,ID=0, num_zeros=1
## P12,8,2,ID=0, num_zeros=2
## P12,8,3,ID=0, num_zeros=7
## P12,8,4,ID=0, num_zeros=2
## P12,8,5,ID=0, num_zeros=6
## P12,8,6,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=7 in LISTP12[[8]]
## P12,8,8,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=9 in LISTP12[[8]]
## P12,8,10,ID=0, num_zeros=3
## P12,8,11,ID=0, num_zeros=1
## P12,8,12,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=13 in LISTP12[[8]]
## P12,8,14,ID=0, num_zeros=1
## P12,8,15,ID=0, num_zeros=3
## P12,8,16,ID=0, num_zeros=4
## P12,8,17,ID=0, num_zeros=0
## P12,8,18,ID=0, num_zeros=3
## P12,8,19,ID=0, num_zeros=2
## P12,8,20,ID=0, num_zeros=1
## P12,8,21,ID=0, num_zeros=2
## P12,8,22,ID=0, num_zeros=3
## P12,8,23,ID=0, num_zeros=7
## P12,8,24,ID=0, num_zeros=4
## P12,8,25,ID=0, num_zeros=1
## P12,8,26,ID=0, num_zeros=7
## P12,8,27,ID=0, num_zeros=7
## P12,8,28,ID=0, num_zeros=1
## P12,8,29,ID=0, num_zeros=2
## P12,8,30,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=31 in LISTP12[[8]]
## P12,8,32,ID=0, num_zeros=1
## P12,8,33,ID=0, num_zeros=0
## P12,8,34,ID=0, num_zeros=4
## P12,8,35,ID=0, num_zeros=5
## P12,8,36,ID=0, num_zeros=1
## P12,8,37,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=38 in LISTP12[[8]]
## P12,8,39,ID=0, num_zeros=5
## P12,8,40,ID=0, num_zeros=5
## P12,8,41,ID=0, num_zeros=3
## P12,8,42,ID=0, num_zeros=0
## P12,8,43,ID=0, num_zeros=3
## P12,8,44,ID=0, num_zeros=2
## P12,8,45,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=46 in LISTP12[[8]]
## P12,8,47,ID=0, num_zeros=2
## P12,8,48,ID=0, num_zeros=5
## P12,8,49,ID=0, num_zeros=4
## P12,8,50,ID=0, num_zeros=3
## P12,9,1,ID=0, num_zeros=6
## P12,9,2,ID=0, num_zeros=5
## P12,9,3,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=4 in LISTP12[[9]]
## P12,9,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP12[[9]]
## P12,9,7,ID=0, num_zeros=2
## P12,9,8,ID=0, num_zeros=3
## P12,9,9,ID=0, num_zeros=1
## P12,9,10,ID=0, num_zeros=6
## P12,9,11,ID=0, num_zeros=0
## P12,9,12,ID=0, num_zeros=0
## P12,9,13,ID=0, num_zeros=1
## P12,9,14,ID=0, num_zeros=5
## P12,9,15,ID=0, num_zeros=2
## P12,9,16,ID=0, num_zeros=0
## P12,9,17,ID=0, num_zeros=5
## P12,9,18,ID=0, num_zeros=1
## P12,9,19,ID=0, num_zeros=2
## P12,9,20,ID=0, num_zeros=4
## P12,9,21,ID=0, num_zeros=2
## P12,9,22,ID=0, num_zeros=3
## P12,9,23,ID=0, num_zeros=2
## P12,9,24,ID=0, num_zeros=1
## P12,9,25,ID=0, num_zeros=4
## P12,9,26,ID=0, num_zeros=1
## P12,9,27,ID=0, num_zeros=1
## P12,9,28,ID=0, num_zeros=5
## P12,9,29,ID=0, num_zeros=3
## P12,9,30,ID=0, num_zeros=3
## P12,9,31,ID=0, num_zeros=3
## P12,9,32,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=33 in LISTP12[[9]]
## P12,9,34,ID=0, num_zeros=5
## P12,9,35,ID=0, num_zeros=4
## P12,9,36,ID=0, num_zeros=2
## P12,9,37,ID=0, num_zeros=2
## P12,9,38,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=39 in LISTP12[[9]]
## Warning: There are no valid values for INTERVALS=40 in LISTP12[[9]]
## P12,9,41,ID=0, num_zeros=2
## P12,9,42,ID=0, num_zeros=1
## P12,9,43,ID=0, num_zeros=1
## P12,9,44,ID=0, num_zeros=0
## P12,9,45,ID=0, num_zeros=1
## P12,9,46,ID=0, num_zeros=1
## P12,9,47,ID=0, num_zeros=3
## P12,9,48,ID=0, num_zeros=7
## P12,9,49,ID=0, num_zeros=4
## P12,9,50,ID=0, num_zeros=6
## P12,10,1,ID=0, num_zeros=2
## P12,10,2,ID=0, num_zeros=3
## P12,10,3,ID=0, num_zeros=0
## P12,10,4,ID=0, num_zeros=3
## P12,10,5,ID=0, num_zeros=2
## P12,10,6,ID=0, num_zeros=4
## P12,10,7,ID=0, num_zeros=2
## P12,10,8,ID=0, num_zeros=4
## P12,10,9,ID=0, num_zeros=2
## P12,10,10,ID=0, num_zeros=3
## P12,10,11,ID=0, num_zeros=0
## P12,10,12,ID=0, num_zeros=1
## P12,10,13,ID=0, num_zeros=0
## P12,10,14,ID=0, num_zeros=0
## P12,10,15,ID=0, num_zeros=1
## P12,10,16,ID=0, num_zeros=7
## P12,10,17,ID=0, num_zeros=2
## P12,10,18,ID=0, num_zeros=1
## P12,10,19,ID=0, num_zeros=2
## P12,10,20,ID=0, num_zeros=2
## P12,10,21,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=22 in LISTP12[[10]]
## P12,10,23,ID=0, num_zeros=2
## P12,10,24,ID=0, num_zeros=1
## P12,10,25,ID=0, num_zeros=3
## P12,10,26,ID=0, num_zeros=1
## P12,10,27,ID=0, num_zeros=0
## P12,10,28,ID=0, num_zeros=2
## P12,10,29,ID=0, num_zeros=3
## P12,10,30,ID=0, num_zeros=1
## P12,10,31,ID=0, num_zeros=1
## P12,10,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP12[[10]]
## P12,10,34,ID=0, num_zeros=2
## P12,10,35,ID=0, num_zeros=1
## P12,10,36,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=37 in LISTP12[[10]]
## P12,10,38,ID=0, num_zeros=2
## P12,10,39,ID=0, num_zeros=5
## P12,10,40,ID=0, num_zeros=3
## P12,10,41,ID=0, num_zeros=3
## P12,10,42,ID=0, num_zeros=1
## P12,10,43,ID=0, num_zeros=2
## P12,10,44,ID=0, num_zeros=2
## P12,10,45,ID=0, num_zeros=2
## P12,10,46,ID=0, num_zeros=1
## P12,10,47,ID=0, num_zeros=2
## P12,10,48,ID=0, num_zeros=1
## P12,10,49,ID=0, num_zeros=6
## P12,10,50,ID=0, num_zeros=6
## P13,1,1,ID=0, num_zeros=11
## P13,1,2,ID=0, num_zeros=12
## P13,1,3,ID=0, num_zeros=14
## P13,1,4,ID=0, num_zeros=9
## P13,1,5,ID=0, num_zeros=10
## P13,1,6,ID=0, num_zeros=7
## P13,1,7,ID=0, num_zeros=8
## P13,1,8,ID=0, num_zeros=13
## P13,1,9,ID=0, num_zeros=17
## P13,1,10,ID=0, num_zeros=16
## P13,1,11,ID=0, num_zeros=21
## P13,1,12,ID=0, num_zeros=11
## P13,1,13,ID=0, num_zeros=10
## P13,1,14,ID=0, num_zeros=20
## P13,1,15,ID=0, num_zeros=9
## P13,1,16,ID=0, num_zeros=8
## P13,1,17,ID=0, num_zeros=12
## P13,1,18,ID=0, num_zeros=14
## P13,1,19,ID=0, num_zeros=10
## P13,1,20,ID=0, num_zeros=2
## P13,1,21,ID=0, num_zeros=6
## P13,1,22,ID=0, num_zeros=6
## P13,1,23,ID=0, num_zeros=25
## P13,1,24,ID=0, num_zeros=4
## P13,1,25,ID=0, num_zeros=3
## P13,1,26,ID=0, num_zeros=2
## P13,1,27,ID=0, num_zeros=7
## P13,1,28,ID=0, num_zeros=3
## P13,1,29,ID=0, num_zeros=4
## P13,1,30,ID=0, num_zeros=6
## P13,1,31,ID=0, num_zeros=4
## P13,1,32,ID=0, num_zeros=1
## P13,1,33,ID=0, num_zeros=7
## P13,1,34,ID=0, num_zeros=4
## P13,1,35,ID=0, num_zeros=6
## P13,1,36,ID=0, num_zeros=2
## P13,1,37,ID=0, num_zeros=8
## P13,1,38,ID=0, num_zeros=3
## P13,1,39,ID=0, num_zeros=6
## P13,1,40,ID=0, num_zeros=4
## P13,1,41,ID=0, num_zeros=7
## P13,1,42,ID=0, num_zeros=14
## P13,1,43,ID=0, num_zeros=2
## P13,1,44,ID=0, num_zeros=7
## P13,1,45,ID=0, num_zeros=2
## P13,1,46,ID=0, num_zeros=5
## P13,1,47,ID=0, num_zeros=5
## P13,1,48,ID=0, num_zeros=1
## P13,1,49,ID=0, num_zeros=5
## P13,1,50,ID=0, num_zeros=58
## P13,2,1,ID=0, num_zeros=8
## P13,2,2,ID=0, num_zeros=3
## P13,2,3,ID=0, num_zeros=7
## P13,2,4,ID=0, num_zeros=10
## P13,2,5,ID=0, num_zeros=4
## P13,2,6,ID=0, num_zeros=5
## P13,2,7,ID=0, num_zeros=8
## P13,2,8,ID=0, num_zeros=5
## P13,2,9,ID=0, num_zeros=9
## P13,2,10,ID=0, num_zeros=5
## P13,2,11,ID=0, num_zeros=5
## P13,2,12,ID=0, num_zeros=5
## P13,2,13,ID=0, num_zeros=9
## P13,2,14,ID=0, num_zeros=9
## P13,2,15,ID=0, num_zeros=7
## P13,2,16,ID=0, num_zeros=3
## P13,2,17,ID=0, num_zeros=17
## P13,2,18,ID=0, num_zeros=10
## P13,2,19,ID=0, num_zeros=9
## P13,2,20,ID=0, num_zeros=6
## P13,2,21,ID=0, num_zeros=4
## P13,2,22,ID=0, num_zeros=3
## P13,2,23,ID=0, num_zeros=9
## P13,2,24,ID=0, num_zeros=6
## P13,2,25,ID=0, num_zeros=7
## P13,2,26,ID=0, num_zeros=15
## P13,2,27,ID=0, num_zeros=10
## P13,2,28,ID=0, num_zeros=6
## P13,2,29,ID=0, num_zeros=5
## P13,2,30,ID=0, num_zeros=3
## P13,2,31,ID=0, num_zeros=7
## P13,2,32,ID=0, num_zeros=6
## P13,2,33,ID=0, num_zeros=5
## P13,2,34,ID=0, num_zeros=3
## P13,2,35,ID=0, num_zeros=6
## P13,2,36,ID=0, num_zeros=9
## P13,2,37,ID=0, num_zeros=8
## P13,2,38,ID=0, num_zeros=6
## P13,2,39,ID=0, num_zeros=5
## P13,2,40,ID=0, num_zeros=6
## P13,2,41,ID=0, num_zeros=8
## P13,2,42,ID=0, num_zeros=10
## P13,2,43,ID=0, num_zeros=11
## Warning: There are no valid values for INTERVALS=44 in LISTP13[[2]]
## P13,2,45,ID=0, num_zeros=4
## P13,2,46,ID=0, num_zeros=3
## P13,2,47,ID=0, num_zeros=9
## P13,2,48,ID=0, num_zeros=7
## P13,2,49,ID=0, num_zeros=4
## P13,2,50,ID=0, num_zeros=24
## P13,3,1,ID=0, num_zeros=6
## P13,3,2,ID=0, num_zeros=6
## P13,3,3,ID=0, num_zeros=7
## P13,3,4,ID=0, num_zeros=5
## P13,3,5,ID=0, num_zeros=9
## P13,3,6,ID=0, num_zeros=3
## P13,3,7,ID=0, num_zeros=9
## P13,3,8,ID=0, num_zeros=3
## P13,3,9,ID=0, num_zeros=7
## P13,3,10,ID=0, num_zeros=7
## P13,3,11,ID=0, num_zeros=9
## P13,3,12,ID=0, num_zeros=13
## P13,3,13,ID=0, num_zeros=7
## P13,3,14,ID=0, num_zeros=8
## P13,3,15,ID=0, num_zeros=6
## P13,3,16,ID=0, num_zeros=4
## P13,3,17,ID=0, num_zeros=2
## P13,3,18,ID=0, num_zeros=6
## P13,3,19,ID=0, num_zeros=3
## P13,3,20,ID=0, num_zeros=3
## P13,3,21,ID=0, num_zeros=5
## P13,3,22,ID=0, num_zeros=3
## P13,3,23,ID=0, num_zeros=7
## P13,3,24,ID=0, num_zeros=5
## P13,3,25,ID=0, num_zeros=5
## P13,3,26,ID=0, num_zeros=4
## P13,3,27,ID=0, num_zeros=3
## P13,3,28,ID=0, num_zeros=3
## P13,3,29,ID=0, num_zeros=7
## P13,3,30,ID=0, num_zeros=3
## P13,3,31,ID=0, num_zeros=4
## P13,3,32,ID=0, num_zeros=6
## P13,3,33,ID=0, num_zeros=7
## P13,3,34,ID=0, num_zeros=4
## P13,3,35,ID=0, num_zeros=6
## P13,3,36,ID=0, num_zeros=7
## P13,3,37,ID=0, num_zeros=2
## P13,3,38,ID=0, num_zeros=1
## P13,3,39,ID=0, num_zeros=7
## P13,3,40,ID=0, num_zeros=4
## P13,3,41,ID=0, num_zeros=4
## P13,3,42,ID=0, num_zeros=3
## P13,3,43,ID=0, num_zeros=2
## P13,3,44,ID=0, num_zeros=16
## P13,3,45,ID=0, num_zeros=5
## P13,3,46,ID=0, num_zeros=6
## P13,3,47,ID=0, num_zeros=4
## P13,3,48,ID=0, num_zeros=2
## P13,3,49,ID=0, num_zeros=2
## P13,3,50,ID=0, num_zeros=22
## P13,4,1,ID=0, num_zeros=4
## P13,4,2,ID=0, num_zeros=4
## P13,4,3,ID=0, num_zeros=3
## P13,4,4,ID=0, num_zeros=9
## P13,4,5,ID=0, num_zeros=3
## P13,4,6,ID=0, num_zeros=10
## P13,4,7,ID=0, num_zeros=8
## P13,4,8,ID=0, num_zeros=5
## P13,4,9,ID=0, num_zeros=5
## P13,4,10,ID=0, num_zeros=7
## P13,4,11,ID=0, num_zeros=2
## P13,4,12,ID=0, num_zeros=5
## P13,4,13,ID=0, num_zeros=9
## P13,4,14,ID=0, num_zeros=9
## P13,4,15,ID=0, num_zeros=6
## P13,4,16,ID=0, num_zeros=12
## P13,4,17,ID=0, num_zeros=5
## P13,4,18,ID=0, num_zeros=4
## P13,4,19,ID=0, num_zeros=2
## P13,4,20,ID=0, num_zeros=6
## P13,4,21,ID=0, num_zeros=5
## P13,4,22,ID=0, num_zeros=3
## P13,4,23,ID=0, num_zeros=2
## P13,4,24,ID=0, num_zeros=2
## P13,4,25,ID=0, num_zeros=7
## P13,4,26,ID=0, num_zeros=11
## P13,4,27,ID=0, num_zeros=5
## P13,4,28,ID=0, num_zeros=3
## P13,4,29,ID=0, num_zeros=7
## P13,4,30,ID=0, num_zeros=2
## P13,4,31,ID=0, num_zeros=3
## P13,4,32,ID=0, num_zeros=8
## P13,4,33,ID=0, num_zeros=2
## P13,4,34,ID=0, num_zeros=5
## P13,4,35,ID=0, num_zeros=2
## P13,4,36,ID=0, num_zeros=8
## P13,4,37,ID=0, num_zeros=6
## P13,4,38,ID=0, num_zeros=4
## P13,4,39,ID=0, num_zeros=10
## P13,4,40,ID=0, num_zeros=5
## P13,4,41,ID=0, num_zeros=3
## P13,4,42,ID=0, num_zeros=2
## P13,4,43,ID=0, num_zeros=3
## P13,4,44,ID=0, num_zeros=3
## P13,4,45,ID=0, num_zeros=3
## P13,4,46,ID=0, num_zeros=1
## P13,4,47,ID=0, num_zeros=4
## P13,4,48,ID=0, num_zeros=2
## P13,4,49,ID=0, num_zeros=5
## P13,4,50,ID=0, num_zeros=12
## P13,5,1,ID=0, num_zeros=2
## P13,5,2,ID=0, num_zeros=9
## P13,5,3,ID=0, num_zeros=6
## P13,5,4,ID=0, num_zeros=8
## P13,5,5,ID=0, num_zeros=4
## P13,5,6,ID=0, num_zeros=6
## P13,5,7,ID=0, num_zeros=8
## P13,5,8,ID=0, num_zeros=6
## P13,5,9,ID=0, num_zeros=5
## P13,5,10,ID=0, num_zeros=9
## P13,5,11,ID=0, num_zeros=7
## P13,5,12,ID=0, num_zeros=4
## P13,5,13,ID=0, num_zeros=5
## P13,5,14,ID=0, num_zeros=9
## P13,5,15,ID=0, num_zeros=4
## P13,5,16,ID=0, num_zeros=4
## P13,5,17,ID=0, num_zeros=5
## P13,5,18,ID=0, num_zeros=7
## P13,5,19,ID=0, num_zeros=5
## P13,5,20,ID=0, num_zeros=5
## P13,5,21,ID=0, num_zeros=2
## P13,5,22,ID=0, num_zeros=1
## P13,5,23,ID=0, num_zeros=2
## P13,5,24,ID=0, num_zeros=6
## P13,5,25,ID=0, num_zeros=9
## P13,5,26,ID=0, num_zeros=3
## P13,5,27,ID=0, num_zeros=2
## P13,5,28,ID=0, num_zeros=5
## P13,5,29,ID=0, num_zeros=1
## P13,5,30,ID=0, num_zeros=10
## P13,5,31,ID=0, num_zeros=9
## P13,5,32,ID=0, num_zeros=7
## P13,5,33,ID=0, num_zeros=2
## P13,5,34,ID=0, num_zeros=3
## P13,5,35,ID=0, num_zeros=4
## P13,5,36,ID=0, num_zeros=1
## P13,5,37,ID=0, num_zeros=0
## P13,5,38,ID=0, num_zeros=7
## P13,5,39,ID=0, num_zeros=6
## P13,5,40,ID=0, num_zeros=3
## P13,5,41,ID=0, num_zeros=6
## P13,5,42,ID=0, num_zeros=3
## P13,5,43,ID=0, num_zeros=4
## P13,5,44,ID=0, num_zeros=6
## P13,5,45,ID=0, num_zeros=7
## P13,5,46,ID=0, num_zeros=6
## P13,5,47,ID=0, num_zeros=7
## P13,5,48,ID=0, num_zeros=2
## P13,5,49,ID=0, num_zeros=3
## P13,5,50,ID=0, num_zeros=12
## P13,6,1,ID=0, num_zeros=1
## P13,6,2,ID=0, num_zeros=4
## P13,6,3,ID=0, num_zeros=3
## P13,6,4,ID=0, num_zeros=15
## P13,6,5,ID=0, num_zeros=3
## P13,6,6,ID=0, num_zeros=4
## P13,6,7,ID=0, num_zeros=5
## P13,6,8,ID=0, num_zeros=2
## P13,6,9,ID=0, num_zeros=1
## P13,6,10,ID=0, num_zeros=6
## P13,6,11,ID=0, num_zeros=4
## P13,6,12,ID=0, num_zeros=3
## P13,6,13,ID=0, num_zeros=6
## P13,6,14,ID=0, num_zeros=1
## P13,6,15,ID=0, num_zeros=5
## P13,6,16,ID=0, num_zeros=3
## P13,6,17,ID=0, num_zeros=7
## P13,6,18,ID=0, num_zeros=3
## P13,6,19,ID=0, num_zeros=5
## P13,6,20,ID=0, num_zeros=6
## P13,6,21,ID=0, num_zeros=6
## P13,6,22,ID=0, num_zeros=5
## P13,6,23,ID=0, num_zeros=4
## P13,6,24,ID=0, num_zeros=5
## P13,6,25,ID=0, num_zeros=6
## P13,6,26,ID=0, num_zeros=8
## P13,6,27,ID=0, num_zeros=5
## P13,6,28,ID=0, num_zeros=3
## P13,6,29,ID=0, num_zeros=1
## P13,6,30,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=31 in LISTP13[[6]]
## P13,6,32,ID=0, num_zeros=2
## P13,6,33,ID=0, num_zeros=5
## P13,6,34,ID=0, num_zeros=4
## P13,6,35,ID=0, num_zeros=2
## P13,6,36,ID=0, num_zeros=2
## P13,6,37,ID=0, num_zeros=0
## P13,6,38,ID=0, num_zeros=1
## P13,6,39,ID=0, num_zeros=2
## P13,6,40,ID=0, num_zeros=2
## P13,6,41,ID=0, num_zeros=4
## P13,6,42,ID=0, num_zeros=5
## P13,6,43,ID=0, num_zeros=3
## P13,6,44,ID=0, num_zeros=2
## P13,6,45,ID=0, num_zeros=0
## P13,6,46,ID=0, num_zeros=3
## P13,6,47,ID=0, num_zeros=5
## P13,6,48,ID=0, num_zeros=0
## P13,6,49,ID=0, num_zeros=3
## P13,6,50,ID=0, num_zeros=5
## P13,7,1,ID=0, num_zeros=1
## P13,7,2,ID=0, num_zeros=6
## P13,7,3,ID=0, num_zeros=7
## P13,7,4,ID=0, num_zeros=2
## P13,7,5,ID=0, num_zeros=3
## P13,7,6,ID=0, num_zeros=1
## P13,7,7,ID=0, num_zeros=3
## P13,7,8,ID=0, num_zeros=4
## P13,7,9,ID=0, num_zeros=3
## P13,7,10,ID=0, num_zeros=3
## P13,7,11,ID=0, num_zeros=6
## P13,7,12,ID=0, num_zeros=2
## P13,7,13,ID=0, num_zeros=5
## P13,7,14,ID=0, num_zeros=0
## P13,7,15,ID=0, num_zeros=6
## P13,7,16,ID=0, num_zeros=7
## P13,7,17,ID=0, num_zeros=3
## P13,7,18,ID=0, num_zeros=2
## P13,7,19,ID=0, num_zeros=2
## P13,7,20,ID=0, num_zeros=3
## P13,7,21,ID=0, num_zeros=5
## P13,7,22,ID=0, num_zeros=2
## P13,7,23,ID=0, num_zeros=4
## P13,7,24,ID=0, num_zeros=2
## P13,7,25,ID=0, num_zeros=3
## P13,7,26,ID=0, num_zeros=5
## P13,7,27,ID=0, num_zeros=2
## P13,7,28,ID=0, num_zeros=5
## P13,7,29,ID=0, num_zeros=1
## P13,7,30,ID=0, num_zeros=5
## P13,7,31,ID=0, num_zeros=3
## P13,7,32,ID=0, num_zeros=5
## P13,7,33,ID=0, num_zeros=2
## P13,7,34,ID=0, num_zeros=3
## P13,7,35,ID=0, num_zeros=5
## P13,7,36,ID=0, num_zeros=3
## P13,7,37,ID=0, num_zeros=1
## P13,7,38,ID=0, num_zeros=2
## P13,7,39,ID=0, num_zeros=4
## P13,7,40,ID=0, num_zeros=7
## P13,7,41,ID=0, num_zeros=2
## P13,7,42,ID=0, num_zeros=11
## P13,7,43,ID=0, num_zeros=2
## P13,7,44,ID=0, num_zeros=6
## P13,7,45,ID=0, num_zeros=1
## P13,7,46,ID=0, num_zeros=2
## P13,7,47,ID=0, num_zeros=11
## P13,7,48,ID=0, num_zeros=5
## P13,7,49,ID=0, num_zeros=5
## P13,7,50,ID=0, num_zeros=10
## P13,8,1,ID=0, num_zeros=6
## P13,8,2,ID=0, num_zeros=1
## P13,8,3,ID=0, num_zeros=5
## P13,8,4,ID=0, num_zeros=7
## P13,8,5,ID=0, num_zeros=3
## P13,8,6,ID=0, num_zeros=8
## P13,8,7,ID=0, num_zeros=3
## P13,8,8,ID=0, num_zeros=2
## P13,8,9,ID=0, num_zeros=4
## P13,8,10,ID=0, num_zeros=6
## P13,8,11,ID=0, num_zeros=7
## P13,8,12,ID=0, num_zeros=2
## P13,8,13,ID=0, num_zeros=2
## P13,8,14,ID=0, num_zeros=3
## P13,8,15,ID=0, num_zeros=10
## P13,8,16,ID=0, num_zeros=1
## P13,8,17,ID=0, num_zeros=4
## P13,8,18,ID=0, num_zeros=3
## P13,8,19,ID=0, num_zeros=4
## P13,8,20,ID=0, num_zeros=6
## P13,8,21,ID=0, num_zeros=5
## P13,8,22,ID=0, num_zeros=4
## P13,8,23,ID=0, num_zeros=7
## P13,8,24,ID=0, num_zeros=3
## P13,8,25,ID=0, num_zeros=2
## P13,8,26,ID=0, num_zeros=6
## P13,8,27,ID=0, num_zeros=4
## P13,8,28,ID=0, num_zeros=5
## P13,8,29,ID=0, num_zeros=3
## P13,8,30,ID=0, num_zeros=2
## P13,8,31,ID=0, num_zeros=0
## P13,8,32,ID=0, num_zeros=4
## P13,8,33,ID=0, num_zeros=3
## P13,8,34,ID=0, num_zeros=3
## P13,8,35,ID=0, num_zeros=4
## P13,8,36,ID=0, num_zeros=3
## P13,8,37,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=38 in LISTP13[[8]]
## P13,8,39,ID=0, num_zeros=9
## P13,8,40,ID=0, num_zeros=3
## P13,8,41,ID=0, num_zeros=4
## P13,8,42,ID=0, num_zeros=9
## P13,8,43,ID=0, num_zeros=7
## P13,8,44,ID=0, num_zeros=6
## P13,8,45,ID=0, num_zeros=6
## P13,8,46,ID=0, num_zeros=2
## P13,8,47,ID=0, num_zeros=0
## P13,8,48,ID=0, num_zeros=2
## P13,8,49,ID=0, num_zeros=3
## P13,8,50,ID=0, num_zeros=5
## P13,9,1,ID=0, num_zeros=4
## P13,9,2,ID=0, num_zeros=9
## P13,9,3,ID=0, num_zeros=6
## P13,9,4,ID=0, num_zeros=3
## P13,9,5,ID=0, num_zeros=4
## P13,9,6,ID=0, num_zeros=3
## P13,9,7,ID=0, num_zeros=8
## P13,9,8,ID=0, num_zeros=7
## P13,9,9,ID=0, num_zeros=4
## P13,9,10,ID=0, num_zeros=8
## P13,9,11,ID=0, num_zeros=5
## P13,9,12,ID=0, num_zeros=3
## P13,9,13,ID=0, num_zeros=4
## P13,9,14,ID=0, num_zeros=6
## P13,9,15,ID=0, num_zeros=5
## P13,9,16,ID=0, num_zeros=3
## P13,9,17,ID=0, num_zeros=1
## P13,9,18,ID=0, num_zeros=1
## P13,9,19,ID=0, num_zeros=5
## P13,9,20,ID=0, num_zeros=3
## P13,9,21,ID=0, num_zeros=4
## P13,9,22,ID=0, num_zeros=7
## P13,9,23,ID=0, num_zeros=1
## P13,9,24,ID=0, num_zeros=2
## P13,9,25,ID=0, num_zeros=1
## P13,9,26,ID=0, num_zeros=1
## P13,9,27,ID=0, num_zeros=0
## P13,9,28,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=29 in LISTP13[[9]]
## P13,9,30,ID=0, num_zeros=1
## P13,9,31,ID=0, num_zeros=4
## P13,9,32,ID=0, num_zeros=5
## P13,9,33,ID=0, num_zeros=4
## P13,9,34,ID=0, num_zeros=7
## P13,9,35,ID=0, num_zeros=3
## P13,9,36,ID=0, num_zeros=9
## P13,9,37,ID=0, num_zeros=3
## P13,9,38,ID=0, num_zeros=4
## P13,9,39,ID=0, num_zeros=6
## P13,9,40,ID=0, num_zeros=3
## P13,9,41,ID=0, num_zeros=6
## P13,9,42,ID=0, num_zeros=5
## P13,9,43,ID=0, num_zeros=2
## P13,9,44,ID=0, num_zeros=2
## P13,9,45,ID=0, num_zeros=3
## P13,9,46,ID=0, num_zeros=1
## P13,9,47,ID=0, num_zeros=4
## P13,9,48,ID=0, num_zeros=4
## P13,9,49,ID=0, num_zeros=2
## P13,9,50,ID=0, num_zeros=5
## P13,10,1,ID=0, num_zeros=4
## P13,10,2,ID=0, num_zeros=5
## P13,10,3,ID=0, num_zeros=5
## P13,10,4,ID=0, num_zeros=1
## P13,10,5,ID=0, num_zeros=3
## P13,10,6,ID=0, num_zeros=1
## P13,10,7,ID=0, num_zeros=6
## P13,10,8,ID=0, num_zeros=3
## P13,10,9,ID=0, num_zeros=1
## P13,10,10,ID=0, num_zeros=5
## P13,10,11,ID=0, num_zeros=3
## P13,10,12,ID=0, num_zeros=4
## P13,10,13,ID=0, num_zeros=4
## P13,10,14,ID=0, num_zeros=0
## P13,10,15,ID=0, num_zeros=4
## P13,10,16,ID=0, num_zeros=9
## P13,10,17,ID=0, num_zeros=8
## P13,10,18,ID=0, num_zeros=0
## P13,10,19,ID=0, num_zeros=5
## P13,10,20,ID=0, num_zeros=6
## P13,10,21,ID=0, num_zeros=0
## P13,10,22,ID=0, num_zeros=2
## P13,10,23,ID=0, num_zeros=3
## P13,10,24,ID=0, num_zeros=3
## P13,10,25,ID=0, num_zeros=3
## P13,10,26,ID=0, num_zeros=3
## P13,10,27,ID=0, num_zeros=8
## P13,10,28,ID=0, num_zeros=6
## P13,10,29,ID=0, num_zeros=1
## P13,10,30,ID=0, num_zeros=5
## P13,10,31,ID=0, num_zeros=2
## P13,10,32,ID=0, num_zeros=4
## P13,10,33,ID=0, num_zeros=1
## P13,10,34,ID=0, num_zeros=3
## P13,10,35,ID=0, num_zeros=2
## P13,10,36,ID=0, num_zeros=3
## P13,10,37,ID=0, num_zeros=3
## P13,10,38,ID=0, num_zeros=5
## P13,10,39,ID=0, num_zeros=4
## P13,10,40,ID=0, num_zeros=3
## P13,10,41,ID=0, num_zeros=2
## P13,10,42,ID=0, num_zeros=6
## P13,10,43,ID=0, num_zeros=1
## P13,10,44,ID=0, num_zeros=2
## P13,10,45,ID=0, num_zeros=7
## P13,10,46,ID=0, num_zeros=3
## P13,10,47,ID=0, num_zeros=3
## P13,10,48,ID=0, num_zeros=6
## P13,10,49,ID=0, num_zeros=6
## P13,10,50,ID=0, num_zeros=3
## P14,1,1,ID=0, num_zeros=3
## P14,1,2,ID=0, num_zeros=2
## P14,1,3,ID=0, num_zeros=2
## P14,1,4,ID=0, num_zeros=6
## P14,1,5,ID=0, num_zeros=8
## P14,1,6,ID=0, num_zeros=8
## P14,1,7,ID=0, num_zeros=6
## P14,1,8,ID=0, num_zeros=1
## P14,1,9,ID=0, num_zeros=1
## P14,1,10,ID=0, num_zeros=7
## P14,1,11,ID=0, num_zeros=2
## P14,1,12,ID=0, num_zeros=3
## P14,1,13,ID=0, num_zeros=2
## P14,1,14,ID=0, num_zeros=2
## P14,1,15,ID=0, num_zeros=8
## P14,1,16,ID=0, num_zeros=9
## P14,1,17,ID=0, num_zeros=4
## P14,1,18,ID=0, num_zeros=7
## P14,1,19,ID=0, num_zeros=4
## P14,1,20,ID=0, num_zeros=8
## P14,1,21,ID=0, num_zeros=2
## P14,1,22,ID=0, num_zeros=0
## P14,1,23,ID=0, num_zeros=6
## P14,1,24,ID=0, num_zeros=1
## P14,1,25,ID=0, num_zeros=9
## P14,1,26,ID=0, num_zeros=1
## P14,1,27,ID=0, num_zeros=8
## P14,1,28,ID=0, num_zeros=2
## P14,1,29,ID=0, num_zeros=4
## P14,1,30,ID=0, num_zeros=3
## P14,1,31,ID=0, num_zeros=3
## P14,1,32,ID=0, num_zeros=4
## P14,1,33,ID=0, num_zeros=1
## P14,1,34,ID=0, num_zeros=0
## P14,1,35,ID=0, num_zeros=3
## P14,1,36,ID=0, num_zeros=4
## P14,1,37,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=38 in LISTP14[[1]]
## P14,1,39,ID=0, num_zeros=4
## P14,1,40,ID=0, num_zeros=3
## P14,1,41,ID=0, num_zeros=6
## P14,1,42,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=43 in LISTP14[[1]]
## P14,1,44,ID=0, num_zeros=4
## P14,1,45,ID=0, num_zeros=4
## P14,1,46,ID=0, num_zeros=1
## P14,1,47,ID=0, num_zeros=0
## P14,1,48,ID=0, num_zeros=3
## P14,1,49,ID=0, num_zeros=4
## P14,1,50,ID=0, num_zeros=7
## P14,2,1,ID=0, num_zeros=1
## P14,2,2,ID=0, num_zeros=1
## P14,2,3,ID=0, num_zeros=2
## P14,2,4,ID=0, num_zeros=3
## P14,2,5,ID=0, num_zeros=5
## P14,2,6,ID=0, num_zeros=3
## P14,2,7,ID=0, num_zeros=2
## P14,2,8,ID=0, num_zeros=3
## P14,2,9,ID=0, num_zeros=7
## P14,2,10,ID=0, num_zeros=1
## P14,2,11,ID=0, num_zeros=3
## P14,2,12,ID=0, num_zeros=2
## P14,2,13,ID=0, num_zeros=3
## P14,2,14,ID=0, num_zeros=5
## P14,2,15,ID=0, num_zeros=10
## P14,2,16,ID=0, num_zeros=6
## P14,2,17,ID=0, num_zeros=3
## P14,2,18,ID=0, num_zeros=1
## P14,2,19,ID=0, num_zeros=4
## P14,2,20,ID=0, num_zeros=1
## P14,2,21,ID=0, num_zeros=5
## P14,2,22,ID=0, num_zeros=5
## P14,2,23,ID=0, num_zeros=5
## P14,2,24,ID=0, num_zeros=10
## P14,2,25,ID=0, num_zeros=8
## P14,2,26,ID=0, num_zeros=5
## P14,2,27,ID=0, num_zeros=2
## P14,2,28,ID=0, num_zeros=0
## P14,2,29,ID=0, num_zeros=1
## P14,2,30,ID=0, num_zeros=3
## P14,2,31,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=32 in LISTP14[[2]]
## P14,2,33,ID=0, num_zeros=1
## P14,2,34,ID=0, num_zeros=5
## P14,2,35,ID=0, num_zeros=4
## P14,2,36,ID=0, num_zeros=3
## P14,2,37,ID=0, num_zeros=1
## P14,2,38,ID=0, num_zeros=3
## P14,2,39,ID=0, num_zeros=7
## P14,2,40,ID=0, num_zeros=4
## P14,2,41,ID=0, num_zeros=3
## P14,2,42,ID=0, num_zeros=9
## P14,2,43,ID=0, num_zeros=4
## P14,2,44,ID=0, num_zeros=10
## P14,2,45,ID=0, num_zeros=4
## P14,2,46,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=47 in LISTP14[[2]]
## P14,2,48,ID=0, num_zeros=0
## P14,2,49,ID=0, num_zeros=2
## P14,2,50,ID=0, num_zeros=9
## P14,3,1,ID=0, num_zeros=10
## P14,3,2,ID=0, num_zeros=3
## P14,3,3,ID=0, num_zeros=4
## P14,3,4,ID=0, num_zeros=2
## P14,3,5,ID=0, num_zeros=5
## P14,3,6,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=7 in LISTP14[[3]]
## P14,3,8,ID=0, num_zeros=4
## P14,3,9,ID=0, num_zeros=6
## P14,3,10,ID=0, num_zeros=5
## P14,3,11,ID=0, num_zeros=4
## P14,3,12,ID=0, num_zeros=6
## P14,3,13,ID=0, num_zeros=5
## P14,3,14,ID=0, num_zeros=7
## P14,3,15,ID=0, num_zeros=6
## P14,3,16,ID=0, num_zeros=4
## P14,3,17,ID=0, num_zeros=7
## P14,3,18,ID=0, num_zeros=3
## P14,3,19,ID=0, num_zeros=1
## P14,3,20,ID=0, num_zeros=5
## P14,3,21,ID=0, num_zeros=6
## P14,3,22,ID=0, num_zeros=4
## P14,3,23,ID=0, num_zeros=2
## P14,3,24,ID=0, num_zeros=4
## P14,3,25,ID=0, num_zeros=6
## P14,3,26,ID=0, num_zeros=5
## P14,3,27,ID=0, num_zeros=3
## P14,3,28,ID=0, num_zeros=2
## P14,3,29,ID=0, num_zeros=5
## P14,3,30,ID=0, num_zeros=4
## P14,3,31,ID=0, num_zeros=5
## P14,3,32,ID=0, num_zeros=13
## P14,3,33,ID=0, num_zeros=6
## P14,3,34,ID=0, num_zeros=3
## P14,3,35,ID=0, num_zeros=4
## P14,3,36,ID=0, num_zeros=5
## P14,3,37,ID=0, num_zeros=5
## P14,3,38,ID=0, num_zeros=8
## P14,3,39,ID=0, num_zeros=1
## P14,3,40,ID=0, num_zeros=6
## P14,3,41,ID=0, num_zeros=1
## P14,3,42,ID=0, num_zeros=7
## P14,3,43,ID=0, num_zeros=3
## P14,3,44,ID=0, num_zeros=1
## P14,3,45,ID=0, num_zeros=4
## P14,3,46,ID=0, num_zeros=7
## P14,3,47,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=48 in LISTP14[[3]]
## P14,3,49,ID=0, num_zeros=2
## P14,3,50,ID=0, num_zeros=8
## P14,4,1,ID=0, num_zeros=1
## P14,4,2,ID=0, num_zeros=3
## P14,4,3,ID=0, num_zeros=3
## P14,4,4,ID=0, num_zeros=1
## P14,4,5,ID=0, num_zeros=9
## P14,4,6,ID=0, num_zeros=7
## P14,4,7,ID=0, num_zeros=2
## P14,4,8,ID=0, num_zeros=7
## P14,4,9,ID=0, num_zeros=4
## P14,4,10,ID=0, num_zeros=4
## P14,4,11,ID=0, num_zeros=3
## P14,4,12,ID=0, num_zeros=2
## P14,4,13,ID=0, num_zeros=2
## P14,4,14,ID=0, num_zeros=7
## P14,4,15,ID=0, num_zeros=7
## P14,4,16,ID=0, num_zeros=7
## P14,4,17,ID=0, num_zeros=6
## P14,4,18,ID=0, num_zeros=4
## P14,4,19,ID=0, num_zeros=5
## P14,4,20,ID=0, num_zeros=8
## P14,4,21,ID=0, num_zeros=4
## P14,4,22,ID=0, num_zeros=8
## P14,4,23,ID=0, num_zeros=1
## P14,4,24,ID=0, num_zeros=12
## P14,4,25,ID=0, num_zeros=4
## P14,4,26,ID=0, num_zeros=3
## P14,4,27,ID=0, num_zeros=7
## P14,4,28,ID=0, num_zeros=3
## P14,4,29,ID=0, num_zeros=8
## P14,4,30,ID=0, num_zeros=2
## P14,4,31,ID=0, num_zeros=2
## P14,4,32,ID=0, num_zeros=6
## P14,4,33,ID=0, num_zeros=5
## P14,4,34,ID=0, num_zeros=7
## P14,4,35,ID=0, num_zeros=2
## P14,4,36,ID=0, num_zeros=4
## P14,4,37,ID=0, num_zeros=5
## P14,4,38,ID=0, num_zeros=6
## P14,4,39,ID=0, num_zeros=4
## P14,4,40,ID=0, num_zeros=1
## P14,4,41,ID=0, num_zeros=7
## P14,4,42,ID=0, num_zeros=1
## P14,4,43,ID=0, num_zeros=4
## P14,4,44,ID=0, num_zeros=7
## P14,4,45,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=46 in LISTP14[[4]]
## P14,4,47,ID=0, num_zeros=2
## P14,4,48,ID=0, num_zeros=3
## P14,4,49,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=50 in LISTP14[[4]]
## P14,5,1,ID=0, num_zeros=7
## P14,5,2,ID=0, num_zeros=5
## P14,5,3,ID=0, num_zeros=5
## P14,5,4,ID=0, num_zeros=3
## P14,5,5,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=6 in LISTP14[[5]]
## P14,5,7,ID=0, num_zeros=5
## P14,5,8,ID=0, num_zeros=4
## P14,5,9,ID=0, num_zeros=2
## P14,5,10,ID=0, num_zeros=7
## P14,5,11,ID=0, num_zeros=4
## P14,5,12,ID=0, num_zeros=6
## P14,5,13,ID=0, num_zeros=2
## P14,5,14,ID=0, num_zeros=7
## P14,5,15,ID=0, num_zeros=5
## P14,5,16,ID=0, num_zeros=2
## P14,5,17,ID=0, num_zeros=2
## P14,5,18,ID=0, num_zeros=6
## P14,5,19,ID=0, num_zeros=4
## P14,5,20,ID=0, num_zeros=6
## P14,5,21,ID=0, num_zeros=4
## P14,5,22,ID=0, num_zeros=1
## P14,5,23,ID=0, num_zeros=3
## P14,5,24,ID=0, num_zeros=1
## P14,5,25,ID=0, num_zeros=4
## P14,5,26,ID=0, num_zeros=4
## P14,5,27,ID=0, num_zeros=3
## P14,5,28,ID=0, num_zeros=2
## P14,5,29,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=30 in LISTP14[[5]]
## P14,5,31,ID=0, num_zeros=2
## P14,5,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP14[[5]]
## P14,5,34,ID=0, num_zeros=1
## P14,5,35,ID=0, num_zeros=1
## P14,5,36,ID=0, num_zeros=3
## P14,5,37,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=38 in LISTP14[[5]]
## P14,5,39,ID=0, num_zeros=2
## P14,5,40,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=41 in LISTP14[[5]]
## P14,5,42,ID=0, num_zeros=0
## P14,5,43,ID=0, num_zeros=2
## P14,5,44,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=45 in LISTP14[[5]]
## P14,5,46,ID=0, num_zeros=2
## P14,5,47,ID=0, num_zeros=3
## P14,5,48,ID=0, num_zeros=0
## P14,5,49,ID=0, num_zeros=1
## P14,5,50,ID=0, num_zeros=8
## P14,6,1,ID=0, num_zeros=4
## P14,6,2,ID=0, num_zeros=2
## P14,6,3,ID=0, num_zeros=2
## P14,6,4,ID=0, num_zeros=3
## P14,6,5,ID=0, num_zeros=3
## P14,6,6,ID=0, num_zeros=5
## P14,6,7,ID=0, num_zeros=3
## P14,6,8,ID=0, num_zeros=3
## P14,6,9,ID=0, num_zeros=5
## P14,6,10,ID=0, num_zeros=6
## P14,6,11,ID=0, num_zeros=3
## P14,6,12,ID=0, num_zeros=8
## P14,6,13,ID=0, num_zeros=1
## P14,6,14,ID=0, num_zeros=2
## P14,6,15,ID=0, num_zeros=4
## P14,6,16,ID=0, num_zeros=3
## P14,6,17,ID=0, num_zeros=3
## P14,6,18,ID=0, num_zeros=5
## P14,6,19,ID=0, num_zeros=3
## P14,6,20,ID=0, num_zeros=5
## P14,6,21,ID=0, num_zeros=1
## P14,6,22,ID=0, num_zeros=7
## P14,6,23,ID=0, num_zeros=3
## P14,6,24,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=25 in LISTP14[[6]]
## Warning: There are no valid values for INTERVALS=26 in LISTP14[[6]]
## P14,6,27,ID=0, num_zeros=4
## P14,6,28,ID=0, num_zeros=2
## P14,6,29,ID=0, num_zeros=2
## P14,6,30,ID=0, num_zeros=1
## P14,6,31,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=32 in LISTP14[[6]]
## P14,6,33,ID=0, num_zeros=10
## P14,6,34,ID=0, num_zeros=5
## P14,6,35,ID=0, num_zeros=4
## P14,6,36,ID=0, num_zeros=4
## P14,6,37,ID=0, num_zeros=7
## P14,6,38,ID=0, num_zeros=4
## P14,6,39,ID=0, num_zeros=3
## P14,6,40,ID=0, num_zeros=2
## P14,6,41,ID=0, num_zeros=6
## P14,6,42,ID=0, num_zeros=3
## P14,6,43,ID=0, num_zeros=7
## P14,6,44,ID=0, num_zeros=1
## P14,6,45,ID=0, num_zeros=3
## P14,6,46,ID=0, num_zeros=8
## P14,6,47,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=48 in LISTP14[[6]]
## P14,6,49,ID=0, num_zeros=2
## P14,6,50,ID=0, num_zeros=2
## P14,7,1,ID=0, num_zeros=0
## P14,7,2,ID=0, num_zeros=2
## P14,7,3,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=4 in LISTP14[[7]]
## P14,7,5,ID=0, num_zeros=4
## P14,7,6,ID=0, num_zeros=1
## P14,7,7,ID=0, num_zeros=1
## P14,7,8,ID=0, num_zeros=4
## P14,7,9,ID=0, num_zeros=1
## P14,7,10,ID=0, num_zeros=3
## P14,7,11,ID=0, num_zeros=5
## P14,7,12,ID=0, num_zeros=4
## P14,7,13,ID=0, num_zeros=0
## P14,7,14,ID=0, num_zeros=2
## P14,7,15,ID=0, num_zeros=4
## P14,7,16,ID=0, num_zeros=2
## P14,7,17,ID=0, num_zeros=4
## P14,7,18,ID=0, num_zeros=2
## P14,7,19,ID=0, num_zeros=4
## P14,7,20,ID=0, num_zeros=2
## P14,7,21,ID=0, num_zeros=3
## P14,7,22,ID=0, num_zeros=3
## P14,7,23,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=24 in LISTP14[[7]]
## P14,7,25,ID=0, num_zeros=2
## P14,7,26,ID=0, num_zeros=4
## P14,7,27,ID=0, num_zeros=2
## P14,7,28,ID=0, num_zeros=1
## P14,7,29,ID=0, num_zeros=0
## P14,7,30,ID=0, num_zeros=1
## P14,7,31,ID=0, num_zeros=2
## P14,7,32,ID=0, num_zeros=6
## P14,7,33,ID=0, num_zeros=1
## P14,7,34,ID=0, num_zeros=1
## P14,7,35,ID=0, num_zeros=5
## P14,7,36,ID=0, num_zeros=3
## P14,7,37,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=38 in LISTP14[[7]]
## P14,7,39,ID=0, num_zeros=0
## P14,7,40,ID=0, num_zeros=4
## P14,7,41,ID=0, num_zeros=4
## P14,7,42,ID=0, num_zeros=2
## P14,7,43,ID=0, num_zeros=1
## P14,7,44,ID=0, num_zeros=3
## P14,7,45,ID=0, num_zeros=3
## P14,7,46,ID=0, num_zeros=3
## P14,7,47,ID=0, num_zeros=6
## P14,7,48,ID=0, num_zeros=0
## P14,7,49,ID=0, num_zeros=3
## P14,7,50,ID=0, num_zeros=7
## P14,8,1,ID=0, num_zeros=5
## P14,8,2,ID=0, num_zeros=2
## P14,8,3,ID=0, num_zeros=2
## P14,8,4,ID=0, num_zeros=7
## P14,8,5,ID=0, num_zeros=1
## P14,8,6,ID=0, num_zeros=4
## P14,8,7,ID=0, num_zeros=5
## P14,8,8,ID=0, num_zeros=3
## P14,8,9,ID=0, num_zeros=9
## P14,8,10,ID=0, num_zeros=3
## P14,8,11,ID=0, num_zeros=3
## P14,8,12,ID=0, num_zeros=2
## P14,8,13,ID=0, num_zeros=1
## P14,8,14,ID=0, num_zeros=3
## P14,8,15,ID=0, num_zeros=2
## P14,8,16,ID=0, num_zeros=1
## P14,8,17,ID=0, num_zeros=4
## P14,8,18,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=19 in LISTP14[[8]]
## P14,8,20,ID=0, num_zeros=3
## P14,8,21,ID=0, num_zeros=10
## P14,8,22,ID=0, num_zeros=4
## P14,8,23,ID=0, num_zeros=0
## P14,8,24,ID=0, num_zeros=2
## P14,8,25,ID=0, num_zeros=1
## P14,8,26,ID=0, num_zeros=7
## P14,8,27,ID=0, num_zeros=1
## P14,8,28,ID=0, num_zeros=1
## P14,8,29,ID=0, num_zeros=6
## P14,8,30,ID=0, num_zeros=1
## P14,8,31,ID=0, num_zeros=0
## P14,8,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP14[[8]]
## P14,8,34,ID=0, num_zeros=2
## P14,8,35,ID=0, num_zeros=1
## P14,8,36,ID=0, num_zeros=1
## P14,8,37,ID=0, num_zeros=6
## P14,8,38,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=39 in LISTP14[[8]]
## P14,8,40,ID=0, num_zeros=0
## P14,8,41,ID=0, num_zeros=10
## P14,8,42,ID=0, num_zeros=4
## P14,8,43,ID=0, num_zeros=6
## P14,8,44,ID=0, num_zeros=2
## P14,8,45,ID=0, num_zeros=1
## P14,8,46,ID=0, num_zeros=6
## P14,8,47,ID=0, num_zeros=5
## P14,8,48,ID=0, num_zeros=1
## P14,8,49,ID=0, num_zeros=3
## P14,8,50,ID=0, num_zeros=4
## P14,9,1,ID=0, num_zeros=2
## P14,9,2,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=3 in LISTP14[[9]]
## P14,9,4,ID=0, num_zeros=1
## P14,9,5,ID=0, num_zeros=8
## P14,9,6,ID=0, num_zeros=2
## P14,9,7,ID=0, num_zeros=2
## P14,9,8,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=9 in LISTP14[[9]]
## P14,9,10,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=11 in LISTP14[[9]]
## P14,9,12,ID=0, num_zeros=1
## P14,9,13,ID=0, num_zeros=1
## P14,9,14,ID=0, num_zeros=2
## P14,9,15,ID=0, num_zeros=6
## P14,9,16,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=17 in LISTP14[[9]]
## P14,9,18,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=19 in LISTP14[[9]]
## P14,9,20,ID=0, num_zeros=5
## P14,9,21,ID=0, num_zeros=4
## P14,9,22,ID=0, num_zeros=4
## P14,9,23,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=24 in LISTP14[[9]]
## Warning: There are no valid values for INTERVALS=25 in LISTP14[[9]]
## P14,9,26,ID=0, num_zeros=4
## P14,9,27,ID=0, num_zeros=3
## P14,9,28,ID=0, num_zeros=0
## P14,9,29,ID=0, num_zeros=3
## P14,9,30,ID=0, num_zeros=6
## P14,9,31,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=32 in LISTP14[[9]]
## P14,9,33,ID=0, num_zeros=1
## P14,9,34,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=35 in LISTP14[[9]]
## P14,9,36,ID=0, num_zeros=2
## P14,9,37,ID=0, num_zeros=1
## P14,9,38,ID=0, num_zeros=4
## P14,9,39,ID=0, num_zeros=1
## P14,9,40,ID=0, num_zeros=5
## P14,9,41,ID=0, num_zeros=6
## P14,9,42,ID=0, num_zeros=3
## P14,9,43,ID=0, num_zeros=2
## P14,9,44,ID=0, num_zeros=1
## P14,9,45,ID=0, num_zeros=1
## P14,9,46,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=47 in LISTP14[[9]]
## P14,9,48,ID=0, num_zeros=3
## P14,9,49,ID=0, num_zeros=1
## P14,9,50,ID=0, num_zeros=4
## P14,10,1,ID=0, num_zeros=3
## P14,10,2,ID=0, num_zeros=1
## P14,10,3,ID=0, num_zeros=1
## P14,10,4,ID=0, num_zeros=4
## P14,10,5,ID=0, num_zeros=6
## P14,10,6,ID=0, num_zeros=4
## P14,10,7,ID=0, num_zeros=2
## P14,10,8,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=9 in LISTP14[[10]]
## P14,10,10,ID=0, num_zeros=2
## P14,10,11,ID=0, num_zeros=3
## P14,10,12,ID=0, num_zeros=0
## P14,10,13,ID=0, num_zeros=2
## P14,10,14,ID=0, num_zeros=4
## P14,10,15,ID=0, num_zeros=5
## P14,10,16,ID=0, num_zeros=3
## P14,10,17,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=18 in LISTP14[[10]]
## P14,10,19,ID=0, num_zeros=1
## P14,10,20,ID=0, num_zeros=2
## P14,10,21,ID=0, num_zeros=5
## P14,10,22,ID=0, num_zeros=4
## P14,10,23,ID=0, num_zeros=1
## P14,10,24,ID=0, num_zeros=2
## P14,10,25,ID=0, num_zeros=4
## P14,10,26,ID=0, num_zeros=2
## P14,10,27,ID=0, num_zeros=3
## P14,10,28,ID=0, num_zeros=2
## P14,10,29,ID=0, num_zeros=3
## P14,10,30,ID=0, num_zeros=4
## P14,10,31,ID=0, num_zeros=7
## P14,10,32,ID=0, num_zeros=1
## P14,10,33,ID=0, num_zeros=1
## P14,10,34,ID=0, num_zeros=2
## P14,10,35,ID=0, num_zeros=6
## P14,10,36,ID=0, num_zeros=1
## P14,10,37,ID=0, num_zeros=5
## P14,10,38,ID=0, num_zeros=3
## P14,10,39,ID=0, num_zeros=0
## P14,10,40,ID=0, num_zeros=2
## P14,10,41,ID=0, num_zeros=11
## P14,10,42,ID=0, num_zeros=2
## P14,10,43,ID=0, num_zeros=3
## P14,10,44,ID=0, num_zeros=8
## P14,10,45,ID=0, num_zeros=3
## P14,10,46,ID=0, num_zeros=1
## P14,10,47,ID=0, num_zeros=0
## P14,10,48,ID=0, num_zeros=5
## P14,10,49,ID=0, num_zeros=4
## P14,10,50,ID=0, num_zeros=2
## P15,1,1,ID=0, num_zeros=10
## P15,1,2,ID=0, num_zeros=23
## P15,1,3,ID=0, num_zeros=3
## P15,1,4,ID=0, num_zeros=7
## P15,1,5,ID=0, num_zeros=7
## P15,1,6,ID=0, num_zeros=3
## P15,1,7,ID=0, num_zeros=7
## P15,1,8,ID=0, num_zeros=3
## P15,1,9,ID=0, num_zeros=5
## P15,1,10,ID=0, num_zeros=4
## P15,1,11,ID=0, num_zeros=3
## P15,1,12,ID=0, num_zeros=7
## P15,1,13,ID=0, num_zeros=6
## P15,1,14,ID=0, num_zeros=12
## P15,1,15,ID=0, num_zeros=1
## P15,1,16,ID=0, num_zeros=7
## P15,1,17,ID=0, num_zeros=9
## P15,1,18,ID=0, num_zeros=18
## P15,1,19,ID=0, num_zeros=1
## P15,1,20,ID=0, num_zeros=14
## P15,1,21,ID=0, num_zeros=1
## P15,1,22,ID=0, num_zeros=1
## P15,1,23,ID=0, num_zeros=13
## P15,1,24,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=25 in LISTP15[[1]]
## P15,1,26,ID=0, num_zeros=5
## P15,1,27,ID=0, num_zeros=10
## P15,1,28,ID=0, num_zeros=9
## P15,1,29,ID=0, num_zeros=8
## P15,1,30,ID=0, num_zeros=11
## P15,1,31,ID=0, num_zeros=5
## P15,1,32,ID=0, num_zeros=9
## P15,1,33,ID=0, num_zeros=2
## P15,1,34,ID=0, num_zeros=11
## P15,1,35,ID=0, num_zeros=1
## P15,1,36,ID=0, num_zeros=6
## P15,1,37,ID=0, num_zeros=1
## P15,1,38,ID=0, num_zeros=2
## P15,1,39,ID=0, num_zeros=1
## P15,1,40,ID=0, num_zeros=3
## P15,1,41,ID=0, num_zeros=7
## P15,1,42,ID=0, num_zeros=6
## P15,1,43,ID=0, num_zeros=13
## P15,1,44,ID=0, num_zeros=7
## P15,1,45,ID=0, num_zeros=13
## P15,1,46,ID=0, num_zeros=2
## P15,1,47,ID=0, num_zeros=2
## P15,1,48,ID=0, num_zeros=7
## P15,1,49,ID=0, num_zeros=14
## P15,1,50,ID=0, num_zeros=69
## P15,2,1,ID=0, num_zeros=3
## P15,2,2,ID=0, num_zeros=1
## P15,2,3,ID=0, num_zeros=4
## P15,2,4,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=5 in LISTP15[[2]]
## P15,2,6,ID=0, num_zeros=2
## P15,2,7,ID=0, num_zeros=8
## P15,2,8,ID=0, num_zeros=9
## P15,2,9,ID=0, num_zeros=11
## P15,2,10,ID=0, num_zeros=23
## P15,2,11,ID=0, num_zeros=1
## P15,2,12,ID=0, num_zeros=9
## P15,2,13,ID=0, num_zeros=3
## P15,2,14,ID=0, num_zeros=11
## P15,2,15,ID=0, num_zeros=4
## P15,2,16,ID=0, num_zeros=4
## P15,2,17,ID=0, num_zeros=5
## P15,2,18,ID=0, num_zeros=9
## P15,2,19,ID=0, num_zeros=3
## P15,2,20,ID=0, num_zeros=10
## P15,2,21,ID=0, num_zeros=4
## P15,2,22,ID=0, num_zeros=1
## P15,2,23,ID=0, num_zeros=1
## P15,2,24,ID=0, num_zeros=1
## P15,2,25,ID=0, num_zeros=1
## P15,2,26,ID=0, num_zeros=3
## P15,2,27,ID=0, num_zeros=8
## P15,2,28,ID=0, num_zeros=1
## P15,2,29,ID=0, num_zeros=2
## P15,2,30,ID=0, num_zeros=6
## P15,2,31,ID=0, num_zeros=11
## P15,2,32,ID=0, num_zeros=5
## P15,2,33,ID=0, num_zeros=1
## P15,2,34,ID=0, num_zeros=2
## P15,2,35,ID=0, num_zeros=1
## P15,2,36,ID=0, num_zeros=6
## P15,2,37,ID=0, num_zeros=3
## P15,2,38,ID=0, num_zeros=2
## P15,2,39,ID=0, num_zeros=3
## P15,2,40,ID=0, num_zeros=3
## P15,2,41,ID=0, num_zeros=9
## P15,2,42,ID=0, num_zeros=3
## P15,2,43,ID=0, num_zeros=2
## P15,2,44,ID=0, num_zeros=5
## P15,2,45,ID=0, num_zeros=13
## P15,2,46,ID=0, num_zeros=8
## P15,2,47,ID=0, num_zeros=2
## P15,2,48,ID=0, num_zeros=2
## P15,2,49,ID=0, num_zeros=5
## P15,2,50,ID=0, num_zeros=4
## P15,3,1,ID=0, num_zeros=2
## P15,3,2,ID=0, num_zeros=4
## P15,3,3,ID=0, num_zeros=8
## P15,3,4,ID=0, num_zeros=5
## P15,3,5,ID=0, num_zeros=2
## P15,3,6,ID=0, num_zeros=5
## P15,3,7,ID=0, num_zeros=2
## P15,3,8,ID=0, num_zeros=5
## P15,3,9,ID=0, num_zeros=2
## P15,3,10,ID=0, num_zeros=3
## P15,3,11,ID=0, num_zeros=2
## P15,3,12,ID=0, num_zeros=4
## P15,3,13,ID=0, num_zeros=3
## P15,3,14,ID=0, num_zeros=10
## Warning: There are no valid values for INTERVALS=15 in LISTP15[[3]]
## P15,3,16,ID=0, num_zeros=12
## P15,3,17,ID=0, num_zeros=8
## P15,3,18,ID=0, num_zeros=7
## P15,3,19,ID=0, num_zeros=2
## P15,3,20,ID=0, num_zeros=8
## P15,3,21,ID=0, num_zeros=11
## P15,3,22,ID=0, num_zeros=7
## P15,3,23,ID=0, num_zeros=6
## P15,3,24,ID=0, num_zeros=8
## P15,3,25,ID=0, num_zeros=6
## P15,3,26,ID=0, num_zeros=2
## P15,3,27,ID=0, num_zeros=4
## P15,3,28,ID=0, num_zeros=5
## P15,3,29,ID=0, num_zeros=3
## P15,3,30,ID=0, num_zeros=4
## P15,3,31,ID=0, num_zeros=9
## P15,3,32,ID=0, num_zeros=5
## P15,3,33,ID=0, num_zeros=9
## P15,3,34,ID=0, num_zeros=4
## P15,3,35,ID=0, num_zeros=6
## P15,3,36,ID=0, num_zeros=10
## P15,3,37,ID=0, num_zeros=6
## P15,3,38,ID=0, num_zeros=2
## P15,3,39,ID=0, num_zeros=7
## P15,3,40,ID=0, num_zeros=3
## P15,3,41,ID=0, num_zeros=6
## P15,3,42,ID=0, num_zeros=7
## P15,3,43,ID=0, num_zeros=2
## P15,3,44,ID=0, num_zeros=4
## P15,3,45,ID=0, num_zeros=3
## P15,3,46,ID=0, num_zeros=4
## P15,3,47,ID=0, num_zeros=6
## P15,3,48,ID=0, num_zeros=6
## P15,3,49,ID=0, num_zeros=3
## P15,3,50,ID=0, num_zeros=28
## P15,4,1,ID=0, num_zeros=2
## P15,4,2,ID=0, num_zeros=5
## P15,4,3,ID=0, num_zeros=2
## P15,4,4,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=5 in LISTP15[[4]]
## P15,4,6,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=7 in LISTP15[[4]]
## P15,4,8,ID=0, num_zeros=1
## P15,4,9,ID=0, num_zeros=2
## P15,4,10,ID=0, num_zeros=4
## P15,4,11,ID=0, num_zeros=1
## P15,4,12,ID=0, num_zeros=7
## P15,4,13,ID=0, num_zeros=12
## P15,4,14,ID=0, num_zeros=7
## P15,4,15,ID=0, num_zeros=4
## P15,4,16,ID=0, num_zeros=7
## P15,4,17,ID=0, num_zeros=7
## P15,4,18,ID=0, num_zeros=3
## P15,4,19,ID=0, num_zeros=11
## P15,4,20,ID=0, num_zeros=12
## P15,4,21,ID=0, num_zeros=4
## P15,4,22,ID=0, num_zeros=9
## P15,4,23,ID=0, num_zeros=8
## P15,4,24,ID=0, num_zeros=13
## P15,4,25,ID=0, num_zeros=7
## P15,4,26,ID=0, num_zeros=5
## P15,4,27,ID=0, num_zeros=5
## P15,4,28,ID=0, num_zeros=1
## P15,4,29,ID=0, num_zeros=4
## P15,4,30,ID=0, num_zeros=4
## P15,4,31,ID=0, num_zeros=10
## P15,4,32,ID=0, num_zeros=2
## P15,4,33,ID=0, num_zeros=2
## P15,4,34,ID=0, num_zeros=6
## P15,4,35,ID=0, num_zeros=3
## P15,4,36,ID=0, num_zeros=5
## P15,4,37,ID=0, num_zeros=11
## P15,4,38,ID=0, num_zeros=4
## P15,4,39,ID=0, num_zeros=3
## P15,4,40,ID=0, num_zeros=1
## P15,4,41,ID=0, num_zeros=1
## P15,4,42,ID=0, num_zeros=10
## P15,4,43,ID=0, num_zeros=3
## P15,4,44,ID=0, num_zeros=11
## P15,4,45,ID=0, num_zeros=2
## P15,4,46,ID=0, num_zeros=5
## P15,4,47,ID=0, num_zeros=5
## P15,4,48,ID=0, num_zeros=6
## P15,4,49,ID=0, num_zeros=2
## P15,4,50,ID=0, num_zeros=6
## P15,5,1,ID=0, num_zeros=3
## P15,5,2,ID=0, num_zeros=6
## P15,5,3,ID=0, num_zeros=7
## P15,5,4,ID=0, num_zeros=11
## P15,5,5,ID=0, num_zeros=7
## P15,5,6,ID=0, num_zeros=11
## P15,5,7,ID=0, num_zeros=6
## P15,5,8,ID=0, num_zeros=11
## P15,5,9,ID=0, num_zeros=9
## P15,5,10,ID=0, num_zeros=6
## P15,5,11,ID=0, num_zeros=10
## P15,5,12,ID=0, num_zeros=2
## P15,5,13,ID=0, num_zeros=4
## P15,5,14,ID=0, num_zeros=4
## P15,5,15,ID=0, num_zeros=1
## P15,5,16,ID=0, num_zeros=3
## P15,5,17,ID=0, num_zeros=8
## P15,5,18,ID=0, num_zeros=8
## P15,5,19,ID=0, num_zeros=7
## P15,5,20,ID=0, num_zeros=8
## P15,5,21,ID=0, num_zeros=7
## P15,5,22,ID=0, num_zeros=6
## P15,5,23,ID=0, num_zeros=2
## P15,5,24,ID=0, num_zeros=4
## P15,5,25,ID=0, num_zeros=7
## P15,5,26,ID=0, num_zeros=2
## P15,5,27,ID=0, num_zeros=6
## P15,5,28,ID=0, num_zeros=3
## P15,5,29,ID=0, num_zeros=8
## P15,5,30,ID=0, num_zeros=2
## P15,5,31,ID=0, num_zeros=6
## P15,5,32,ID=0, num_zeros=3
## P15,5,33,ID=0, num_zeros=6
## P15,5,34,ID=0, num_zeros=5
## P15,5,35,ID=0, num_zeros=6
## P15,5,36,ID=0, num_zeros=2
## P15,5,37,ID=0, num_zeros=0
## P15,5,38,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=39 in LISTP15[[5]]
## P15,5,40,ID=0, num_zeros=1
## P15,5,41,ID=0, num_zeros=4
## P15,5,42,ID=0, num_zeros=2
## P15,5,43,ID=0, num_zeros=5
## P15,5,44,ID=0, num_zeros=4
## P15,5,45,ID=0, num_zeros=7
## P15,5,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP15[[5]]
## P15,5,48,ID=0, num_zeros=1
## P15,5,49,ID=0, num_zeros=5
## P15,5,50,ID=0, num_zeros=10
## P15,6,1,ID=0, num_zeros=1
## P15,6,2,ID=0, num_zeros=2
## P15,6,3,ID=0, num_zeros=4
## P15,6,4,ID=0, num_zeros=8
## P15,6,5,ID=0, num_zeros=7
## P15,6,6,ID=0, num_zeros=5
## P15,6,7,ID=0, num_zeros=4
## P15,6,8,ID=0, num_zeros=2
## P15,6,9,ID=0, num_zeros=2
## P15,6,10,ID=0, num_zeros=8
## P15,6,11,ID=0, num_zeros=6
## P15,6,12,ID=0, num_zeros=3
## P15,6,13,ID=0, num_zeros=5
## P15,6,14,ID=0, num_zeros=3
## P15,6,15,ID=0, num_zeros=8
## P15,6,16,ID=0, num_zeros=9
## P15,6,17,ID=0, num_zeros=7
## P15,6,18,ID=0, num_zeros=4
## P15,6,19,ID=0, num_zeros=0
## P15,6,20,ID=0, num_zeros=7
## P15,6,21,ID=0, num_zeros=6
## P15,6,22,ID=0, num_zeros=2
## P15,6,23,ID=0, num_zeros=5
## P15,6,24,ID=0, num_zeros=3
## P15,6,25,ID=0, num_zeros=1
## P15,6,26,ID=0, num_zeros=1
## P15,6,27,ID=0, num_zeros=5
## P15,6,28,ID=0, num_zeros=3
## P15,6,29,ID=0, num_zeros=4
## P15,6,30,ID=0, num_zeros=2
## P15,6,31,ID=0, num_zeros=7
## P15,6,32,ID=0, num_zeros=2
## P15,6,33,ID=0, num_zeros=6
## P15,6,34,ID=0, num_zeros=2
## P15,6,35,ID=0, num_zeros=1
## P15,6,36,ID=0, num_zeros=2
## P15,6,37,ID=0, num_zeros=2
## P15,6,38,ID=0, num_zeros=4
## P15,6,39,ID=0, num_zeros=6
## P15,6,40,ID=0, num_zeros=3
## P15,6,41,ID=0, num_zeros=2
## P15,6,42,ID=0, num_zeros=3
## P15,6,43,ID=0, num_zeros=2
## P15,6,44,ID=0, num_zeros=3
## P15,6,45,ID=0, num_zeros=5
## P15,6,46,ID=0, num_zeros=2
## P15,6,47,ID=0, num_zeros=4
## P15,6,48,ID=0, num_zeros=1
## P15,6,49,ID=0, num_zeros=2
## P15,6,50,ID=0, num_zeros=3
## P15,7,1,ID=0, num_zeros=1
## P15,7,2,ID=0, num_zeros=2
## P15,7,3,ID=0, num_zeros=4
## P15,7,4,ID=0, num_zeros=7
## P15,7,5,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=6 in LISTP15[[7]]
## Warning: There are no valid values for INTERVALS=7 in LISTP15[[7]]
## P15,7,8,ID=0, num_zeros=4
## P15,7,9,ID=0, num_zeros=1
## P15,7,10,ID=0, num_zeros=3
## P15,7,11,ID=0, num_zeros=8
## P15,7,12,ID=0, num_zeros=3
## P15,7,13,ID=0, num_zeros=3
## P15,7,14,ID=0, num_zeros=3
## P15,7,15,ID=0, num_zeros=6
## P15,7,16,ID=0, num_zeros=3
## P15,7,17,ID=0, num_zeros=1
## P15,7,18,ID=0, num_zeros=1
## P15,7,19,ID=0, num_zeros=6
## P15,7,20,ID=0, num_zeros=7
## P15,7,21,ID=0, num_zeros=4
## P15,7,22,ID=0, num_zeros=6
## P15,7,23,ID=0, num_zeros=1
## P15,7,24,ID=0, num_zeros=3
## P15,7,25,ID=0, num_zeros=0
## P15,7,26,ID=0, num_zeros=1
## P15,7,27,ID=0, num_zeros=10
## P15,7,28,ID=0, num_zeros=2
## P15,7,29,ID=0, num_zeros=2
## P15,7,30,ID=0, num_zeros=2
## P15,7,31,ID=0, num_zeros=3
## P15,7,32,ID=0, num_zeros=1
## P15,7,33,ID=0, num_zeros=1
## P15,7,34,ID=0, num_zeros=2
## P15,7,35,ID=0, num_zeros=1
## P15,7,36,ID=0, num_zeros=4
## P15,7,37,ID=0, num_zeros=6
## P15,7,38,ID=0, num_zeros=7
## P15,7,39,ID=0, num_zeros=6
## P15,7,40,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=41 in LISTP15[[7]]
## P15,7,42,ID=0, num_zeros=2
## P15,7,43,ID=0, num_zeros=5
## P15,7,44,ID=0, num_zeros=4
## P15,7,45,ID=0, num_zeros=3
## P15,7,46,ID=0, num_zeros=3
## P15,7,47,ID=0, num_zeros=1
## P15,7,48,ID=0, num_zeros=6
## P15,7,49,ID=0, num_zeros=2
## P15,7,50,ID=0, num_zeros=6
## P15,8,1,ID=0, num_zeros=1
## P15,8,2,ID=0, num_zeros=5
## P15,8,3,ID=0, num_zeros=0
## P15,8,4,ID=0, num_zeros=5
## P15,8,5,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=6 in LISTP15[[8]]
## Warning: There are no valid values for INTERVALS=7 in LISTP15[[8]]
## P15,8,8,ID=0, num_zeros=1
## P15,8,9,ID=0, num_zeros=2
## P15,8,10,ID=0, num_zeros=3
## P15,8,11,ID=0, num_zeros=2
## P15,8,12,ID=0, num_zeros=3
## P15,8,13,ID=0, num_zeros=12
## P15,8,14,ID=0, num_zeros=6
## P15,8,15,ID=0, num_zeros=0
## P15,8,16,ID=0, num_zeros=6
## P15,8,17,ID=0, num_zeros=7
## P15,8,18,ID=0, num_zeros=9
## P15,8,19,ID=0, num_zeros=1
## P15,8,20,ID=0, num_zeros=3
## P15,8,21,ID=0, num_zeros=0
## P15,8,22,ID=0, num_zeros=7
## P15,8,23,ID=0, num_zeros=7
## P15,8,24,ID=0, num_zeros=1
## P15,8,25,ID=0, num_zeros=3
## P15,8,26,ID=0, num_zeros=0
## P15,8,27,ID=0, num_zeros=2
## P15,8,28,ID=0, num_zeros=3
## P15,8,29,ID=0, num_zeros=0
## P15,8,30,ID=0, num_zeros=6
## P15,8,31,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=32 in LISTP15[[8]]
## P15,8,33,ID=0, num_zeros=3
## P15,8,34,ID=0, num_zeros=1
## P15,8,35,ID=0, num_zeros=5
## P15,8,36,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=37 in LISTP15[[8]]
## P15,8,38,ID=0, num_zeros=3
## P15,8,39,ID=0, num_zeros=2
## P15,8,40,ID=0, num_zeros=3
## P15,8,41,ID=0, num_zeros=3
## P15,8,42,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=43 in LISTP15[[8]]
## P15,8,44,ID=0, num_zeros=0
## P15,8,45,ID=0, num_zeros=4
## P15,8,46,ID=0, num_zeros=6
## P15,8,47,ID=0, num_zeros=3
## P15,8,48,ID=0, num_zeros=3
## P15,8,49,ID=0, num_zeros=1
## P15,8,50,ID=0, num_zeros=3
## P15,9,1,ID=0, num_zeros=5
## P15,9,2,ID=0, num_zeros=0
## P15,9,3,ID=0, num_zeros=5
## P15,9,4,ID=0, num_zeros=2
## P15,9,5,ID=0, num_zeros=1
## P15,9,6,ID=0, num_zeros=3
## P15,9,7,ID=0, num_zeros=4
## P15,9,8,ID=0, num_zeros=2
## P15,9,9,ID=0, num_zeros=4
## P15,9,10,ID=0, num_zeros=6
## P15,9,11,ID=0, num_zeros=2
## P15,9,12,ID=0, num_zeros=1
## P15,9,13,ID=0, num_zeros=2
## P15,9,14,ID=0, num_zeros=4
## P15,9,15,ID=0, num_zeros=2
## P15,9,16,ID=0, num_zeros=4
## P15,9,17,ID=0, num_zeros=5
## P15,9,18,ID=0, num_zeros=2
## P15,9,19,ID=0, num_zeros=4
## P15,9,20,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=21 in LISTP15[[9]]
## P15,9,22,ID=0, num_zeros=0
## P15,9,23,ID=0, num_zeros=5
## P15,9,24,ID=0, num_zeros=3
## P15,9,25,ID=0, num_zeros=2
## P15,9,26,ID=0, num_zeros=9
## P15,9,27,ID=0, num_zeros=4
## P15,9,28,ID=0, num_zeros=0
## P15,9,29,ID=0, num_zeros=2
## P15,9,30,ID=0, num_zeros=7
## P15,9,31,ID=0, num_zeros=6
## P15,9,32,ID=0, num_zeros=3
## P15,9,33,ID=0, num_zeros=4
## P15,9,34,ID=0, num_zeros=5
## P15,9,35,ID=0, num_zeros=2
## P15,9,36,ID=0, num_zeros=6
## P15,9,37,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=38 in LISTP15[[9]]
## P15,9,39,ID=0, num_zeros=6
## P15,9,40,ID=0, num_zeros=4
## P15,9,41,ID=0, num_zeros=3
## P15,9,42,ID=0, num_zeros=4
## P15,9,43,ID=0, num_zeros=10
## P15,9,44,ID=0, num_zeros=4
## P15,9,45,ID=0, num_zeros=2
## P15,9,46,ID=0, num_zeros=5
## P15,9,47,ID=0, num_zeros=2
## P15,9,48,ID=0, num_zeros=1
## P15,9,49,ID=0, num_zeros=1
## P15,9,50,ID=0, num_zeros=9
## P15,10,1,ID=0, num_zeros=1
## P15,10,2,ID=0, num_zeros=8
## P15,10,3,ID=0, num_zeros=2
## P15,10,4,ID=0, num_zeros=2
## P15,10,5,ID=0, num_zeros=1
## P15,10,6,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=7 in LISTP15[[10]]
## P15,10,8,ID=0, num_zeros=2
## P15,10,9,ID=0, num_zeros=3
## P15,10,10,ID=0, num_zeros=6
## P15,10,11,ID=0, num_zeros=1
## P15,10,12,ID=0, num_zeros=3
## P15,10,13,ID=0, num_zeros=2
## P15,10,14,ID=0, num_zeros=6
## P15,10,15,ID=0, num_zeros=4
## P15,10,16,ID=0, num_zeros=1
## P15,10,17,ID=0, num_zeros=1
## P15,10,18,ID=0, num_zeros=2
## P15,10,19,ID=0, num_zeros=1
## P15,10,20,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=21 in LISTP15[[10]]
## P15,10,22,ID=0, num_zeros=2
## P15,10,23,ID=0, num_zeros=7
## P15,10,24,ID=0, num_zeros=2
## P15,10,25,ID=0, num_zeros=2
## P15,10,26,ID=0, num_zeros=3
## P15,10,27,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=28 in LISTP15[[10]]
## P15,10,29,ID=0, num_zeros=3
## P15,10,30,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=31 in LISTP15[[10]]
## P15,10,32,ID=0, num_zeros=1
## P15,10,33,ID=0, num_zeros=1
## P15,10,34,ID=0, num_zeros=1
## P15,10,35,ID=0, num_zeros=1
## P15,10,36,ID=0, num_zeros=8
## P15,10,37,ID=0, num_zeros=4
## P15,10,38,ID=0, num_zeros=9
## P15,10,39,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=40 in LISTP15[[10]]
## P15,10,41,ID=0, num_zeros=3
## P15,10,42,ID=0, num_zeros=4
## P15,10,43,ID=0, num_zeros=2
## P15,10,44,ID=0, num_zeros=2
## P15,10,45,ID=0, num_zeros=3
## P15,10,46,ID=0, num_zeros=3
## P15,10,47,ID=0, num_zeros=5
## P15,10,48,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=49 in LISTP15[[10]]
## P15,10,50,ID=0, num_zeros=2
## P16,1,1,ID=0, num_zeros=1
## P16,1,2,ID=0, num_zeros=3
## P16,1,3,ID=0, num_zeros=4
## P16,1,4,ID=0, num_zeros=11
## P16,1,5,ID=0, num_zeros=7
## P16,1,6,ID=0, num_zeros=3
## P16,1,7,ID=0, num_zeros=4
## P16,1,8,ID=0, num_zeros=5
## P16,1,9,ID=0, num_zeros=8
## P16,1,10,ID=0, num_zeros=9
## P16,1,11,ID=0, num_zeros=1
## P16,1,12,ID=0, num_zeros=3
## P16,1,13,ID=0, num_zeros=4
## P16,1,14,ID=0, num_zeros=4
## P16,1,15,ID=0, num_zeros=3
## P16,1,16,ID=0, num_zeros=3
## P16,1,17,ID=0, num_zeros=2
## P16,1,18,ID=0, num_zeros=6
## P16,1,19,ID=0, num_zeros=5
## P16,1,20,ID=0, num_zeros=2
## P16,1,21,ID=0, num_zeros=4
## P16,1,22,ID=0, num_zeros=6
## P16,1,23,ID=0, num_zeros=7
## P16,1,24,ID=0, num_zeros=7
## P16,1,25,ID=0, num_zeros=6
## P16,1,26,ID=0, num_zeros=12
## P16,1,27,ID=0, num_zeros=8
## P16,1,28,ID=0, num_zeros=7
## P16,1,29,ID=0, num_zeros=6
## P16,1,30,ID=0, num_zeros=4
## P16,1,31,ID=0, num_zeros=6
## P16,1,32,ID=0, num_zeros=13
## P16,1,33,ID=0, num_zeros=6
## P16,1,34,ID=0, num_zeros=16
## P16,1,35,ID=0, num_zeros=25
## P16,1,36,ID=0, num_zeros=3
## P16,1,37,ID=0, num_zeros=8
## P16,1,38,ID=0, num_zeros=2
## P16,1,39,ID=0, num_zeros=6
## P16,1,40,ID=0, num_zeros=9
## P16,1,41,ID=0, num_zeros=5
## P16,1,42,ID=0, num_zeros=11
## P16,1,43,ID=0, num_zeros=7
## P16,1,44,ID=0, num_zeros=12
## P16,1,45,ID=0, num_zeros=4
## P16,1,46,ID=0, num_zeros=1
## P16,1,47,ID=0, num_zeros=6
## P16,1,48,ID=0, num_zeros=8
## P16,1,49,ID=0, num_zeros=0
## P16,1,50,ID=0, num_zeros=59
## Warning: There are no valid values for INTERVALS=1 in LISTP16[[2]]
## P16,2,2,ID=0, num_zeros=1
## P16,2,3,ID=0, num_zeros=4
## P16,2,4,ID=0, num_zeros=5
## P16,2,5,ID=0, num_zeros=3
## P16,2,6,ID=0, num_zeros=10
## P16,2,7,ID=0, num_zeros=3
## P16,2,8,ID=0, num_zeros=6
## P16,2,9,ID=0, num_zeros=13
## P16,2,10,ID=0, num_zeros=1
## P16,2,11,ID=0, num_zeros=4
## P16,2,12,ID=0, num_zeros=8
## P16,2,13,ID=0, num_zeros=13
## P16,2,14,ID=0, num_zeros=0
## P16,2,15,ID=0, num_zeros=7
## P16,2,16,ID=0, num_zeros=8
## P16,2,17,ID=0, num_zeros=4
## P16,2,18,ID=0, num_zeros=3
## P16,2,19,ID=0, num_zeros=4
## P16,2,20,ID=0, num_zeros=1
## P16,2,21,ID=0, num_zeros=7
## P16,2,22,ID=0, num_zeros=1
## P16,2,23,ID=0, num_zeros=2
## P16,2,24,ID=0, num_zeros=4
## P16,2,25,ID=0, num_zeros=3
## P16,2,26,ID=0, num_zeros=2
## P16,2,27,ID=0, num_zeros=3
## P16,2,28,ID=0, num_zeros=3
## P16,2,29,ID=0, num_zeros=2
## P16,2,30,ID=0, num_zeros=1
## P16,2,31,ID=0, num_zeros=6
## P16,2,32,ID=0, num_zeros=7
## P16,2,33,ID=0, num_zeros=6
## P16,2,34,ID=0, num_zeros=4
## P16,2,35,ID=0, num_zeros=6
## P16,2,36,ID=0, num_zeros=6
## P16,2,37,ID=0, num_zeros=4
## P16,2,38,ID=0, num_zeros=15
## P16,2,39,ID=0, num_zeros=2
## P16,2,40,ID=0, num_zeros=1
## P16,2,41,ID=0, num_zeros=9
## P16,2,42,ID=0, num_zeros=3
## P16,2,43,ID=0, num_zeros=8
## P16,2,44,ID=0, num_zeros=14
## P16,2,45,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=46 in LISTP16[[2]]
## P16,2,47,ID=0, num_zeros=5
## P16,2,48,ID=0, num_zeros=3
## P16,2,49,ID=0, num_zeros=2
## P16,2,50,ID=0, num_zeros=27
## P16,3,1,ID=0, num_zeros=3
## P16,3,2,ID=0, num_zeros=5
## P16,3,3,ID=0, num_zeros=2
## P16,3,4,ID=0, num_zeros=2
## P16,3,5,ID=0, num_zeros=2
## P16,3,6,ID=0, num_zeros=4
## P16,3,7,ID=0, num_zeros=3
## P16,3,8,ID=0, num_zeros=8
## P16,3,9,ID=0, num_zeros=4
## P16,3,10,ID=0, num_zeros=8
## P16,3,11,ID=0, num_zeros=4
## P16,3,12,ID=0, num_zeros=3
## P16,3,13,ID=0, num_zeros=4
## P16,3,14,ID=0, num_zeros=3
## P16,3,15,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=16 in LISTP16[[3]]
## P16,3,17,ID=0, num_zeros=0
## P16,3,18,ID=0, num_zeros=1
## P16,3,19,ID=0, num_zeros=5
## P16,3,20,ID=0, num_zeros=2
## P16,3,21,ID=0, num_zeros=2
## P16,3,22,ID=0, num_zeros=1
## P16,3,23,ID=0, num_zeros=5
## P16,3,24,ID=0, num_zeros=3
## P16,3,25,ID=0, num_zeros=8
## P16,3,26,ID=0, num_zeros=5
## P16,3,27,ID=0, num_zeros=7
## P16,3,28,ID=0, num_zeros=13
## P16,3,29,ID=0, num_zeros=3
## P16,3,30,ID=0, num_zeros=4
## P16,3,31,ID=0, num_zeros=2
## P16,3,32,ID=0, num_zeros=7
## P16,3,33,ID=0, num_zeros=2
## P16,3,34,ID=0, num_zeros=3
## P16,3,35,ID=0, num_zeros=2
## P16,3,36,ID=0, num_zeros=6
## P16,3,37,ID=0, num_zeros=1
## P16,3,38,ID=0, num_zeros=4
## P16,3,39,ID=0, num_zeros=3
## P16,3,40,ID=0, num_zeros=2
## P16,3,41,ID=0, num_zeros=5
## P16,3,42,ID=0, num_zeros=7
## P16,3,43,ID=0, num_zeros=5
## P16,3,44,ID=0, num_zeros=1
## P16,3,45,ID=0, num_zeros=4
## P16,3,46,ID=0, num_zeros=6
## P16,3,47,ID=0, num_zeros=4
## P16,3,48,ID=0, num_zeros=8
## P16,3,49,ID=0, num_zeros=11
## P16,3,50,ID=0, num_zeros=6
## P16,4,1,ID=0, num_zeros=5
## P16,4,2,ID=0, num_zeros=3
## P16,4,3,ID=0, num_zeros=1
## P16,4,4,ID=0, num_zeros=2
## P16,4,5,ID=0, num_zeros=11
## P16,4,6,ID=0, num_zeros=6
## P16,4,7,ID=0, num_zeros=3
## P16,4,8,ID=0, num_zeros=3
## P16,4,9,ID=0, num_zeros=5
## P16,4,10,ID=0, num_zeros=8
## P16,4,11,ID=0, num_zeros=9
## P16,4,12,ID=0, num_zeros=4
## P16,4,13,ID=0, num_zeros=7
## P16,4,14,ID=0, num_zeros=2
## P16,4,15,ID=0, num_zeros=2
## P16,4,16,ID=0, num_zeros=6
## P16,4,17,ID=0, num_zeros=3
## P16,4,18,ID=0, num_zeros=2
## P16,4,19,ID=0, num_zeros=3
## P16,4,20,ID=0, num_zeros=6
## P16,4,21,ID=0, num_zeros=8
## P16,4,22,ID=0, num_zeros=10
## P16,4,23,ID=0, num_zeros=15
## P16,4,24,ID=0, num_zeros=5
## P16,4,25,ID=0, num_zeros=8
## P16,4,26,ID=0, num_zeros=7
## P16,4,27,ID=0, num_zeros=11
## P16,4,28,ID=0, num_zeros=7
## P16,4,29,ID=0, num_zeros=4
## P16,4,30,ID=0, num_zeros=10
## P16,4,31,ID=0, num_zeros=3
## P16,4,32,ID=0, num_zeros=7
## P16,4,33,ID=0, num_zeros=1
## P16,4,34,ID=0, num_zeros=4
## P16,4,35,ID=0, num_zeros=2
## P16,4,36,ID=0, num_zeros=8
## P16,4,37,ID=0, num_zeros=10
## P16,4,38,ID=0, num_zeros=2
## P16,4,39,ID=0, num_zeros=5
## P16,4,40,ID=0, num_zeros=1
## P16,4,41,ID=0, num_zeros=4
## P16,4,42,ID=0, num_zeros=2
## P16,4,43,ID=0, num_zeros=2
## P16,4,44,ID=0, num_zeros=0
## P16,4,45,ID=0, num_zeros=5
## P16,4,46,ID=0, num_zeros=6
## P16,4,47,ID=0, num_zeros=4
## P16,4,48,ID=0, num_zeros=4
## P16,4,49,ID=0, num_zeros=3
## P16,4,50,ID=0, num_zeros=13
## P16,5,1,ID=0, num_zeros=4
## P16,5,2,ID=0, num_zeros=4
## P16,5,3,ID=0, num_zeros=9
## P16,5,4,ID=0, num_zeros=6
## P16,5,5,ID=0, num_zeros=2
## P16,5,6,ID=0, num_zeros=6
## P16,5,7,ID=0, num_zeros=2
## P16,5,8,ID=0, num_zeros=4
## P16,5,9,ID=0, num_zeros=6
## P16,5,10,ID=0, num_zeros=5
## P16,5,11,ID=0, num_zeros=8
## P16,5,12,ID=0, num_zeros=3
## P16,5,13,ID=0, num_zeros=3
## P16,5,14,ID=0, num_zeros=8
## P16,5,15,ID=0, num_zeros=6
## P16,5,16,ID=0, num_zeros=2
## P16,5,17,ID=0, num_zeros=4
## P16,5,18,ID=0, num_zeros=6
## P16,5,19,ID=0, num_zeros=7
## P16,5,20,ID=0, num_zeros=3
## P16,5,21,ID=0, num_zeros=5
## P16,5,22,ID=0, num_zeros=5
## P16,5,23,ID=0, num_zeros=3
## P16,5,24,ID=0, num_zeros=7
## P16,5,25,ID=0, num_zeros=1
## P16,5,26,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=27 in LISTP16[[5]]
## P16,5,28,ID=0, num_zeros=3
## P16,5,29,ID=0, num_zeros=4
## P16,5,30,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=31 in LISTP16[[5]]
## P16,5,32,ID=0, num_zeros=7
## P16,5,33,ID=0, num_zeros=2
## P16,5,34,ID=0, num_zeros=8
## P16,5,35,ID=0, num_zeros=4
## P16,5,36,ID=0, num_zeros=9
## P16,5,37,ID=0, num_zeros=4
## P16,5,38,ID=0, num_zeros=8
## P16,5,39,ID=0, num_zeros=3
## P16,5,40,ID=0, num_zeros=3
## P16,5,41,ID=0, num_zeros=3
## P16,5,42,ID=0, num_zeros=6
## P16,5,43,ID=0, num_zeros=6
## P16,5,44,ID=0, num_zeros=8
## P16,5,45,ID=0, num_zeros=7
## P16,5,46,ID=0, num_zeros=6
## P16,5,47,ID=0, num_zeros=4
## P16,5,48,ID=0, num_zeros=4
## P16,5,49,ID=0, num_zeros=4
## P16,5,50,ID=0, num_zeros=1
## P16,6,1,ID=0, num_zeros=3
## P16,6,2,ID=0, num_zeros=5
## P16,6,3,ID=0, num_zeros=5
## P16,6,4,ID=0, num_zeros=9
## P16,6,5,ID=0, num_zeros=5
## P16,6,6,ID=0, num_zeros=2
## P16,6,7,ID=0, num_zeros=2
## P16,6,8,ID=0, num_zeros=1
## P16,6,9,ID=0, num_zeros=1
## P16,6,10,ID=0, num_zeros=5
## P16,6,11,ID=0, num_zeros=7
## P16,6,12,ID=0, num_zeros=0
## P16,6,13,ID=0, num_zeros=2
## P16,6,14,ID=0, num_zeros=6
## P16,6,15,ID=0, num_zeros=6
## P16,6,16,ID=0, num_zeros=2
## P16,6,17,ID=0, num_zeros=2
## P16,6,18,ID=0, num_zeros=4
## P16,6,19,ID=0, num_zeros=3
## P16,6,20,ID=0, num_zeros=3
## P16,6,21,ID=0, num_zeros=1
## P16,6,22,ID=0, num_zeros=6
## P16,6,23,ID=0, num_zeros=4
## P16,6,24,ID=0, num_zeros=2
## P16,6,25,ID=0, num_zeros=5
## P16,6,26,ID=0, num_zeros=9
## P16,6,27,ID=0, num_zeros=4
## P16,6,28,ID=0, num_zeros=2
## P16,6,29,ID=0, num_zeros=3
## P16,6,30,ID=0, num_zeros=0
## P16,6,31,ID=0, num_zeros=9
## P16,6,32,ID=0, num_zeros=3
## P16,6,33,ID=0, num_zeros=6
## P16,6,34,ID=0, num_zeros=1
## P16,6,35,ID=0, num_zeros=2
## P16,6,36,ID=0, num_zeros=6
## P16,6,37,ID=0, num_zeros=3
## P16,6,38,ID=0, num_zeros=2
## P16,6,39,ID=0, num_zeros=2
## P16,6,40,ID=0, num_zeros=2
## P16,6,41,ID=0, num_zeros=3
## P16,6,42,ID=0, num_zeros=2
## P16,6,43,ID=0, num_zeros=2
## P16,6,44,ID=0, num_zeros=8
## P16,6,45,ID=0, num_zeros=1
## P16,6,46,ID=0, num_zeros=4
## P16,6,47,ID=0, num_zeros=1
## P16,6,48,ID=0, num_zeros=2
## P16,6,49,ID=0, num_zeros=6
## P16,6,50,ID=0, num_zeros=16
## P16,7,1,ID=0, num_zeros=2
## P16,7,2,ID=0, num_zeros=5
## P16,7,3,ID=0, num_zeros=2
## P16,7,4,ID=0, num_zeros=4
## P16,7,5,ID=0, num_zeros=5
## P16,7,6,ID=0, num_zeros=3
## P16,7,7,ID=0, num_zeros=4
## P16,7,8,ID=0, num_zeros=5
## P16,7,9,ID=0, num_zeros=10
## P16,7,10,ID=0, num_zeros=3
## P16,7,11,ID=0, num_zeros=8
## P16,7,12,ID=0, num_zeros=10
## P16,7,13,ID=0, num_zeros=4
## P16,7,14,ID=0, num_zeros=1
## P16,7,15,ID=0, num_zeros=6
## P16,7,16,ID=0, num_zeros=3
## P16,7,17,ID=0, num_zeros=9
## P16,7,18,ID=0, num_zeros=8
## P16,7,19,ID=0, num_zeros=2
## P16,7,20,ID=0, num_zeros=5
## P16,7,21,ID=0, num_zeros=12
## P16,7,22,ID=0, num_zeros=2
## P16,7,23,ID=0, num_zeros=3
## P16,7,24,ID=0, num_zeros=4
## P16,7,25,ID=0, num_zeros=12
## P16,7,26,ID=0, num_zeros=5
## P16,7,27,ID=0, num_zeros=9
## P16,7,28,ID=0, num_zeros=3
## P16,7,29,ID=0, num_zeros=5
## P16,7,30,ID=0, num_zeros=4
## P16,7,31,ID=0, num_zeros=7
## P16,7,32,ID=0, num_zeros=2
## P16,7,33,ID=0, num_zeros=2
## P16,7,34,ID=0, num_zeros=6
## P16,7,35,ID=0, num_zeros=11
## P16,7,36,ID=0, num_zeros=5
## P16,7,37,ID=0, num_zeros=5
## P16,7,38,ID=0, num_zeros=1
## P16,7,39,ID=0, num_zeros=12
## P16,7,40,ID=0, num_zeros=4
## P16,7,41,ID=0, num_zeros=4
## P16,7,42,ID=0, num_zeros=4
## P16,7,43,ID=0, num_zeros=3
## P16,7,44,ID=0, num_zeros=3
## P16,7,45,ID=0, num_zeros=5
## P16,7,46,ID=0, num_zeros=11
## P16,7,47,ID=0, num_zeros=10
## P16,7,48,ID=0, num_zeros=2
## P16,7,49,ID=0, num_zeros=11
## P16,7,50,ID=0, num_zeros=13
## P16,8,1,ID=0, num_zeros=1
## P16,8,2,ID=0, num_zeros=1
## P16,8,3,ID=0, num_zeros=0
## P16,8,4,ID=0, num_zeros=1
## P16,8,5,ID=0, num_zeros=11
## Warning: There are no valid values for INTERVALS=6 in LISTP16[[8]]
## P16,8,7,ID=0, num_zeros=6
## P16,8,8,ID=0, num_zeros=7
## P16,8,9,ID=0, num_zeros=2
## P16,8,10,ID=0, num_zeros=7
## P16,8,11,ID=0, num_zeros=2
## P16,8,12,ID=0, num_zeros=5
## P16,8,13,ID=0, num_zeros=4
## P16,8,14,ID=0, num_zeros=1
## P16,8,15,ID=0, num_zeros=1
## P16,8,16,ID=0, num_zeros=8
## P16,8,17,ID=0, num_zeros=1
## P16,8,18,ID=0, num_zeros=4
## P16,8,19,ID=0, num_zeros=3
## P16,8,20,ID=0, num_zeros=6
## P16,8,21,ID=0, num_zeros=7
## P16,8,22,ID=0, num_zeros=2
## P16,8,23,ID=0, num_zeros=13
## P16,8,24,ID=0, num_zeros=1
## P16,8,25,ID=0, num_zeros=2
## P16,8,26,ID=0, num_zeros=6
## P16,8,27,ID=0, num_zeros=2
## P16,8,28,ID=0, num_zeros=2
## P16,8,29,ID=0, num_zeros=3
## P16,8,30,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=31 in LISTP16[[8]]
## P16,8,32,ID=0, num_zeros=5
## P16,8,33,ID=0, num_zeros=2
## P16,8,34,ID=0, num_zeros=2
## P16,8,35,ID=0, num_zeros=1
## P16,8,36,ID=0, num_zeros=2
## P16,8,37,ID=0, num_zeros=2
## P16,8,38,ID=0, num_zeros=1
## P16,8,39,ID=0, num_zeros=3
## P16,8,40,ID=0, num_zeros=2
## P16,8,41,ID=0, num_zeros=9
## P16,8,42,ID=0, num_zeros=5
## P16,8,43,ID=0, num_zeros=2
## P16,8,44,ID=0, num_zeros=4
## P16,8,45,ID=0, num_zeros=3
## P16,8,46,ID=0, num_zeros=13
## P16,8,47,ID=0, num_zeros=3
## P16,8,48,ID=0, num_zeros=5
## P16,8,49,ID=0, num_zeros=2
## P16,8,50,ID=0, num_zeros=7
## P16,9,1,ID=0, num_zeros=9
## P16,9,2,ID=0, num_zeros=3
## P16,9,3,ID=0, num_zeros=4
## P16,9,4,ID=0, num_zeros=11
## P16,9,5,ID=0, num_zeros=2
## P16,9,6,ID=0, num_zeros=6
## P16,9,7,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=8 in LISTP16[[9]]
## P16,9,9,ID=0, num_zeros=4
## P16,9,10,ID=0, num_zeros=10
## P16,9,11,ID=0, num_zeros=3
## P16,9,12,ID=0, num_zeros=2
## P16,9,13,ID=0, num_zeros=2
## P16,9,14,ID=0, num_zeros=3
## P16,9,15,ID=0, num_zeros=1
## P16,9,16,ID=0, num_zeros=2
## P16,9,17,ID=0, num_zeros=7
## P16,9,18,ID=0, num_zeros=1
## P16,9,19,ID=0, num_zeros=1
## P16,9,20,ID=0, num_zeros=4
## P16,9,21,ID=0, num_zeros=8
## P16,9,22,ID=0, num_zeros=12
## P16,9,23,ID=0, num_zeros=2
## P16,9,24,ID=0, num_zeros=4
## P16,9,25,ID=0, num_zeros=9
## P16,9,26,ID=0, num_zeros=7
## P16,9,27,ID=0, num_zeros=9
## P16,9,28,ID=0, num_zeros=2
## P16,9,29,ID=0, num_zeros=3
## P16,9,30,ID=0, num_zeros=6
## P16,9,31,ID=0, num_zeros=1
## P16,9,32,ID=0, num_zeros=7
## P16,9,33,ID=0, num_zeros=2
## P16,9,34,ID=0, num_zeros=5
## P16,9,35,ID=0, num_zeros=3
## P16,9,36,ID=0, num_zeros=1
## P16,9,37,ID=0, num_zeros=3
## P16,9,38,ID=0, num_zeros=4
## P16,9,39,ID=0, num_zeros=4
## P16,9,40,ID=0, num_zeros=3
## P16,9,41,ID=0, num_zeros=4
## P16,9,42,ID=0, num_zeros=7
## P16,9,43,ID=0, num_zeros=2
## P16,9,44,ID=0, num_zeros=7
## P16,9,45,ID=0, num_zeros=4
## P16,9,46,ID=0, num_zeros=4
## P16,9,47,ID=0, num_zeros=5
## P16,9,48,ID=0, num_zeros=2
## P16,9,49,ID=0, num_zeros=6
## P16,9,50,ID=0, num_zeros=5
## P16,10,1,ID=0, num_zeros=7
## P16,10,2,ID=0, num_zeros=3
## P16,10,3,ID=0, num_zeros=7
## P16,10,4,ID=0, num_zeros=5
## P16,10,5,ID=0, num_zeros=16
## P16,10,6,ID=0, num_zeros=4
## P16,10,7,ID=0, num_zeros=5
## P16,10,8,ID=0, num_zeros=2
## P16,10,9,ID=0, num_zeros=6
## P16,10,10,ID=0, num_zeros=6
## P16,10,11,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=12 in LISTP16[[10]]
## P16,10,13,ID=0, num_zeros=4
## P16,10,14,ID=0, num_zeros=3
## P16,10,15,ID=0, num_zeros=4
## P16,10,16,ID=0, num_zeros=3
## P16,10,17,ID=0, num_zeros=4
## P16,10,18,ID=0, num_zeros=8
## P16,10,19,ID=0, num_zeros=4
## P16,10,20,ID=0, num_zeros=4
## P16,10,21,ID=0, num_zeros=10
## P16,10,22,ID=0, num_zeros=2
## P16,10,23,ID=0, num_zeros=4
## P16,10,24,ID=0, num_zeros=4
## P16,10,25,ID=0, num_zeros=5
## P16,10,26,ID=0, num_zeros=0
## P16,10,27,ID=0, num_zeros=5
## P16,10,28,ID=0, num_zeros=7
## P16,10,29,ID=0, num_zeros=3
## P16,10,30,ID=0, num_zeros=4
## P16,10,31,ID=0, num_zeros=3
## P16,10,32,ID=0, num_zeros=8
## P16,10,33,ID=0, num_zeros=10
## P16,10,34,ID=0, num_zeros=5
## P16,10,35,ID=0, num_zeros=5
## P16,10,36,ID=0, num_zeros=4
## P16,10,37,ID=0, num_zeros=2
## P16,10,38,ID=0, num_zeros=2
## P16,10,39,ID=0, num_zeros=2
## P16,10,40,ID=0, num_zeros=1
## P16,10,41,ID=0, num_zeros=2
## P16,10,42,ID=0, num_zeros=5
## P16,10,43,ID=0, num_zeros=4
## P16,10,44,ID=0, num_zeros=2
## P16,10,45,ID=0, num_zeros=4
## P16,10,46,ID=0, num_zeros=6
## P16,10,47,ID=0, num_zeros=8
## P16,10,48,ID=0, num_zeros=3
## P16,10,49,ID=0, num_zeros=1
## P16,10,50,ID=0, num_zeros=11
## P17,1,1,ID=0, num_zeros=2
## P17,1,2,ID=0, num_zeros=2
## P17,1,3,ID=0, num_zeros=5
## P17,1,4,ID=0, num_zeros=5
## P17,1,5,ID=0, num_zeros=4
## P17,1,6,ID=0, num_zeros=4
## P17,1,7,ID=0, num_zeros=6
## P17,1,8,ID=0, num_zeros=4
## P17,1,9,ID=0, num_zeros=6
## P17,1,10,ID=0, num_zeros=9
## P17,1,11,ID=0, num_zeros=7
## P17,1,12,ID=0, num_zeros=3
## P17,1,13,ID=0, num_zeros=8
## P17,1,14,ID=0, num_zeros=3
## P17,1,15,ID=0, num_zeros=6
## P17,1,16,ID=0, num_zeros=5
## P17,1,17,ID=0, num_zeros=6
## P17,1,18,ID=0, num_zeros=8
## P17,1,19,ID=0, num_zeros=14
## P17,1,20,ID=0, num_zeros=8
## P17,1,21,ID=0, num_zeros=6
## P17,1,22,ID=0, num_zeros=7
## P17,1,23,ID=0, num_zeros=3
## P17,1,24,ID=0, num_zeros=4
## P17,1,25,ID=0, num_zeros=10
## P17,1,26,ID=0, num_zeros=5
## P17,1,27,ID=0, num_zeros=2
## P17,1,28,ID=0, num_zeros=12
## P17,1,29,ID=0, num_zeros=3
## P17,1,30,ID=0, num_zeros=6
## P17,1,31,ID=0, num_zeros=2
## P17,1,32,ID=0, num_zeros=7
## P17,1,33,ID=0, num_zeros=3
## P17,1,34,ID=0, num_zeros=5
## P17,1,35,ID=0, num_zeros=3
## P17,1,36,ID=0, num_zeros=1
## P17,1,37,ID=0, num_zeros=9
## P17,1,38,ID=0, num_zeros=7
## P17,1,39,ID=0, num_zeros=2
## P17,1,40,ID=0, num_zeros=4
## P17,1,41,ID=0, num_zeros=12
## P17,1,42,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=43 in LISTP17[[1]]
## P17,1,44,ID=0, num_zeros=3
## P17,1,45,ID=0, num_zeros=6
## P17,1,46,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=47 in LISTP17[[1]]
## P17,1,48,ID=0, num_zeros=2
## P17,1,49,ID=0, num_zeros=7
## P17,1,50,ID=0, num_zeros=2
## P17,2,1,ID=0, num_zeros=5
## P17,2,2,ID=0, num_zeros=3
## P17,2,3,ID=0, num_zeros=7
## P17,2,4,ID=0, num_zeros=5
## P17,2,5,ID=0, num_zeros=2
## P17,2,6,ID=0, num_zeros=3
## P17,2,7,ID=0, num_zeros=0
## P17,2,8,ID=0, num_zeros=3
## P17,2,9,ID=0, num_zeros=5
## P17,2,10,ID=0, num_zeros=7
## P17,2,11,ID=0, num_zeros=3
## P17,2,12,ID=0, num_zeros=3
## P17,2,13,ID=0, num_zeros=2
## P17,2,14,ID=0, num_zeros=4
## P17,2,15,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=16 in LISTP17[[2]]
## P17,2,17,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=18 in LISTP17[[2]]
## P17,2,19,ID=0, num_zeros=6
## P17,2,20,ID=0, num_zeros=8
## P17,2,21,ID=0, num_zeros=7
## P17,2,22,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=23 in LISTP17[[2]]
## P17,2,24,ID=0, num_zeros=12
## P17,2,25,ID=0, num_zeros=3
## P17,2,26,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=27 in LISTP17[[2]]
## P17,2,28,ID=0, num_zeros=4
## P17,2,29,ID=0, num_zeros=6
## P17,2,30,ID=0, num_zeros=1
## P17,2,31,ID=0, num_zeros=2
## P17,2,32,ID=0, num_zeros=6
## P17,2,33,ID=0, num_zeros=4
## P17,2,34,ID=0, num_zeros=3
## P17,2,35,ID=0, num_zeros=5
## P17,2,36,ID=0, num_zeros=4
## P17,2,37,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=38 in LISTP17[[2]]
## Warning: There are no valid values for INTERVALS=39 in LISTP17[[2]]
## P17,2,40,ID=0, num_zeros=3
## P17,2,41,ID=0, num_zeros=3
## P17,2,42,ID=0, num_zeros=6
## P17,2,43,ID=0, num_zeros=4
## P17,2,44,ID=0, num_zeros=7
## P17,2,45,ID=0, num_zeros=4
## P17,2,46,ID=0, num_zeros=3
## P17,2,47,ID=0, num_zeros=5
## P17,2,48,ID=0, num_zeros=3
## P17,2,49,ID=0, num_zeros=2
## P17,2,50,ID=0, num_zeros=14
## P17,3,1,ID=0, num_zeros=1
## P17,3,2,ID=0, num_zeros=1
## P17,3,3,ID=0, num_zeros=2
## P17,3,4,ID=0, num_zeros=1
## P17,3,5,ID=0, num_zeros=1
## P17,3,6,ID=0, num_zeros=3
## P17,3,7,ID=0, num_zeros=1
## P17,3,8,ID=0, num_zeros=11
## P17,3,9,ID=0, num_zeros=3
## P17,3,10,ID=0, num_zeros=6
## P17,3,11,ID=0, num_zeros=2
## P17,3,12,ID=0, num_zeros=4
## P17,3,13,ID=0, num_zeros=4
## P17,3,14,ID=0, num_zeros=2
## P17,3,15,ID=0, num_zeros=0
## P17,3,16,ID=0, num_zeros=3
## P17,3,17,ID=0, num_zeros=5
## P17,3,18,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=19 in LISTP17[[3]]
## P17,3,20,ID=0, num_zeros=1
## P17,3,21,ID=0, num_zeros=1
## P17,3,22,ID=0, num_zeros=2
## P17,3,23,ID=0, num_zeros=2
## P17,3,24,ID=0, num_zeros=1
## P17,3,25,ID=0, num_zeros=1
## P17,3,26,ID=0, num_zeros=4
## P17,3,27,ID=0, num_zeros=5
## P17,3,28,ID=0, num_zeros=2
## P17,3,29,ID=0, num_zeros=1
## P17,3,30,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=31 in LISTP17[[3]]
## P17,3,32,ID=0, num_zeros=1
## P17,3,33,ID=0, num_zeros=1
## P17,3,34,ID=0, num_zeros=4
## P17,3,35,ID=0, num_zeros=2
## P17,3,36,ID=0, num_zeros=3
## P17,3,37,ID=0, num_zeros=3
## P17,3,38,ID=0, num_zeros=4
## P17,3,39,ID=0, num_zeros=1
## P17,3,40,ID=0, num_zeros=0
## P17,3,41,ID=0, num_zeros=4
## P17,3,42,ID=0, num_zeros=6
## P17,3,43,ID=0, num_zeros=1
## P17,3,44,ID=0, num_zeros=3
## P17,3,45,ID=0, num_zeros=2
## P17,3,46,ID=0, num_zeros=7
## P17,3,47,ID=0, num_zeros=1
## P17,3,48,ID=0, num_zeros=1
## P17,3,49,ID=0, num_zeros=1
## P17,3,50,ID=0, num_zeros=10
## P17,4,1,ID=0, num_zeros=2
## P17,4,2,ID=0, num_zeros=7
## P17,4,3,ID=0, num_zeros=6
## P17,4,4,ID=0, num_zeros=3
## P17,4,5,ID=0, num_zeros=1
## P17,4,6,ID=0, num_zeros=5
## P17,4,7,ID=0, num_zeros=1
## P17,4,8,ID=0, num_zeros=1
## P17,4,9,ID=0, num_zeros=2
## P17,4,10,ID=0, num_zeros=2
## P17,4,11,ID=0, num_zeros=2
## P17,4,12,ID=0, num_zeros=1
## P17,4,13,ID=0, num_zeros=2
## P17,4,14,ID=0, num_zeros=2
## P17,4,15,ID=0, num_zeros=1
## P17,4,16,ID=0, num_zeros=1
## P17,4,17,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=18 in LISTP17[[4]]
## P17,4,19,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=20 in LISTP17[[4]]
## P17,4,21,ID=0, num_zeros=0
## P17,4,22,ID=0, num_zeros=3
## P17,4,23,ID=0, num_zeros=2
## P17,4,24,ID=0, num_zeros=2
## P17,4,25,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=26 in LISTP17[[4]]
## P17,4,27,ID=0, num_zeros=2
## P17,4,28,ID=0, num_zeros=1
## P17,4,29,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=30 in LISTP17[[4]]
## P17,4,31,ID=0, num_zeros=1
## P17,4,32,ID=0, num_zeros=1
## P17,4,33,ID=0, num_zeros=5
## P17,4,34,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=35 in LISTP17[[4]]
## P17,4,36,ID=0, num_zeros=1
## P17,4,37,ID=0, num_zeros=1
## P17,4,38,ID=0, num_zeros=2
## P17,4,39,ID=0, num_zeros=1
## P17,4,40,ID=0, num_zeros=1
## P17,4,41,ID=0, num_zeros=0
## P17,4,42,ID=0, num_zeros=10
## Warning: There are no valid values for INTERVALS=43 in LISTP17[[4]]
## P17,4,44,ID=0, num_zeros=2
## P17,4,45,ID=0, num_zeros=4
## P17,4,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP17[[4]]
## Warning: There are no valid values for INTERVALS=48 in LISTP17[[4]]
## Warning: There are no valid values for INTERVALS=49 in LISTP17[[4]]
## P17,4,50,ID=0, num_zeros=8
## P17,5,1,ID=0, num_zeros=2
## P17,5,2,ID=0, num_zeros=3
## P17,5,3,ID=0, num_zeros=2
## P17,5,4,ID=0, num_zeros=2
## P17,5,5,ID=0, num_zeros=4
## P17,5,6,ID=0, num_zeros=4
## P17,5,7,ID=0, num_zeros=3
## P17,5,8,ID=0, num_zeros=5
## P17,5,9,ID=0, num_zeros=5
## P17,5,10,ID=0, num_zeros=3
## P17,5,11,ID=0, num_zeros=2
## P17,5,12,ID=0, num_zeros=2
## P17,5,13,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=14 in LISTP17[[5]]
## P17,5,15,ID=0, num_zeros=1
## P17,5,16,ID=0, num_zeros=2
## P17,5,17,ID=0, num_zeros=3
## P17,5,18,ID=0, num_zeros=2
## P17,5,19,ID=0, num_zeros=1
## P17,5,20,ID=0, num_zeros=4
## P17,5,21,ID=0, num_zeros=3
## P17,5,22,ID=0, num_zeros=0
## P17,5,23,ID=0, num_zeros=1
## P17,5,24,ID=0, num_zeros=7
## P17,5,25,ID=0, num_zeros=2
## P17,5,26,ID=0, num_zeros=8
## P17,5,27,ID=0, num_zeros=5
## P17,5,28,ID=0, num_zeros=3
## P17,5,29,ID=0, num_zeros=3
## P17,5,30,ID=0, num_zeros=1
## P17,5,31,ID=0, num_zeros=7
## P17,5,32,ID=0, num_zeros=5
## P17,5,33,ID=0, num_zeros=3
## P17,5,34,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=35 in LISTP17[[5]]
## P17,5,36,ID=0, num_zeros=2
## P17,5,37,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=38 in LISTP17[[5]]
## P17,5,39,ID=0, num_zeros=1
## P17,5,40,ID=0, num_zeros=1
## P17,5,41,ID=0, num_zeros=5
## P17,5,42,ID=0, num_zeros=1
## P17,5,43,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=44 in LISTP17[[5]]
## P17,5,45,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=46 in LISTP17[[5]]
## P17,5,47,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=48 in LISTP17[[5]]
## P17,5,49,ID=0, num_zeros=5
## P17,5,50,ID=0, num_zeros=2
## P17,6,1,ID=0, num_zeros=1
## P17,6,2,ID=0, num_zeros=1
## P17,6,3,ID=0, num_zeros=1
## P17,6,4,ID=0, num_zeros=1
## P17,6,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP17[[6]]
## Warning: There are no valid values for INTERVALS=7 in LISTP17[[6]]
## Warning: There are no valid values for INTERVALS=8 in LISTP17[[6]]
## Warning: There are no valid values for INTERVALS=9 in LISTP17[[6]]
## Warning: There are no valid values for INTERVALS=10 in LISTP17[[6]]
## P17,6,11,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=12 in LISTP17[[6]]
## Warning: There are no valid values for INTERVALS=13 in LISTP17[[6]]
## P17,6,14,ID=0, num_zeros=3
## P17,6,15,ID=0, num_zeros=4
## P17,6,16,ID=0, num_zeros=1
## P17,6,17,ID=0, num_zeros=4
## P17,6,18,ID=0, num_zeros=0
## P17,6,19,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=20 in LISTP17[[6]]
## P17,6,21,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=22 in LISTP17[[6]]
## P17,6,23,ID=0, num_zeros=1
## P17,6,24,ID=0, num_zeros=2
## P17,6,25,ID=0, num_zeros=2
## P17,6,26,ID=0, num_zeros=2
## P17,6,27,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=28 in LISTP17[[6]]
## P17,6,29,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=30 in LISTP17[[6]]
## P17,6,31,ID=0, num_zeros=3
## P17,6,32,ID=0, num_zeros=3
## P17,6,33,ID=0, num_zeros=1
## P17,6,34,ID=0, num_zeros=2
## P17,6,35,ID=0, num_zeros=6
## P17,6,36,ID=0, num_zeros=2
## P17,6,37,ID=0, num_zeros=1
## P17,6,38,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=39 in LISTP17[[6]]
## P17,6,40,ID=0, num_zeros=2
## P17,6,41,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=42 in LISTP17[[6]]
## P17,6,43,ID=0, num_zeros=2
## P17,6,44,ID=0, num_zeros=1
## P17,6,45,ID=0, num_zeros=1
## P17,6,46,ID=0, num_zeros=3
## P17,6,47,ID=0, num_zeros=2
## P17,6,48,ID=0, num_zeros=2
## P17,6,49,ID=0, num_zeros=2
## P17,6,50,ID=0, num_zeros=6
## P17,7,1,ID=0, num_zeros=4
## P17,7,2,ID=0, num_zeros=1
## P17,7,3,ID=0, num_zeros=1
## P17,7,4,ID=0, num_zeros=3
## P17,7,5,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=6 in LISTP17[[7]]
## P17,7,7,ID=0, num_zeros=1
## P17,7,8,ID=0, num_zeros=3
## P17,7,9,ID=0, num_zeros=2
## P17,7,10,ID=0, num_zeros=2
## P17,7,11,ID=0, num_zeros=3
## P17,7,12,ID=0, num_zeros=3
## P17,7,13,ID=0, num_zeros=1
## P17,7,14,ID=0, num_zeros=4
## P17,7,15,ID=0, num_zeros=1
## P17,7,16,ID=0, num_zeros=1
## P17,7,17,ID=0, num_zeros=2
## P17,7,18,ID=0, num_zeros=1
## P17,7,19,ID=0, num_zeros=2
## P17,7,20,ID=0, num_zeros=3
## P17,7,21,ID=0, num_zeros=3
## P17,7,22,ID=0, num_zeros=1
## P17,7,23,ID=0, num_zeros=1
## P17,7,24,ID=0, num_zeros=1
## P17,7,25,ID=0, num_zeros=4
## P17,7,26,ID=0, num_zeros=5
## P17,7,27,ID=0, num_zeros=3
## P17,7,28,ID=0, num_zeros=0
## P17,7,29,ID=0, num_zeros=3
## P17,7,30,ID=0, num_zeros=1
## P17,7,31,ID=0, num_zeros=1
## P17,7,32,ID=0, num_zeros=0
## P17,7,33,ID=0, num_zeros=5
## P17,7,34,ID=0, num_zeros=2
## P17,7,35,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=36 in LISTP17[[7]]
## P17,7,37,ID=0, num_zeros=2
## P17,7,38,ID=0, num_zeros=4
## P17,7,39,ID=0, num_zeros=3
## P17,7,40,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=41 in LISTP17[[7]]
## Warning: There are no valid values for INTERVALS=42 in LISTP17[[7]]
## Warning: There are no valid values for INTERVALS=43 in LISTP17[[7]]
## P17,7,44,ID=0, num_zeros=2
## P17,7,45,ID=0, num_zeros=4
## P17,7,46,ID=0, num_zeros=6
## P17,7,47,ID=0, num_zeros=0
## P17,7,48,ID=0, num_zeros=4
## P17,7,49,ID=0, num_zeros=3
## P17,7,50,ID=0, num_zeros=10
## Warning: There are no valid values for INTERVALS=1 in LISTP17[[8]]
## P17,8,2,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=3 in LISTP17[[8]]
## P17,8,4,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=5 in LISTP17[[8]]
## P17,8,6,ID=0, num_zeros=7
## P17,8,7,ID=0, num_zeros=4
## P17,8,8,ID=0, num_zeros=1
## P17,8,9,ID=0, num_zeros=2
## P17,8,10,ID=0, num_zeros=5
## P17,8,11,ID=0, num_zeros=3
## P17,8,12,ID=0, num_zeros=2
## P17,8,13,ID=0, num_zeros=1
## P17,8,14,ID=0, num_zeros=4
## P17,8,15,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=16 in LISTP17[[8]]
## P17,8,17,ID=0, num_zeros=3
## P17,8,18,ID=0, num_zeros=2
## P17,8,19,ID=0, num_zeros=2
## P17,8,20,ID=0, num_zeros=3
## P17,8,21,ID=0, num_zeros=2
## P17,8,22,ID=0, num_zeros=2
## P17,8,23,ID=0, num_zeros=1
## P17,8,24,ID=0, num_zeros=1
## P17,8,25,ID=0, num_zeros=3
## P17,8,26,ID=0, num_zeros=9
## P17,8,27,ID=0, num_zeros=1
## P17,8,28,ID=0, num_zeros=0
## P17,8,29,ID=0, num_zeros=3
## P17,8,30,ID=0, num_zeros=5
## P17,8,31,ID=0, num_zeros=9
## P17,8,32,ID=0, num_zeros=5
## P17,8,33,ID=0, num_zeros=1
## P17,8,34,ID=0, num_zeros=2
## P17,8,35,ID=0, num_zeros=6
## P17,8,36,ID=0, num_zeros=2
## P17,8,37,ID=0, num_zeros=2
## P17,8,38,ID=0, num_zeros=1
## P17,8,39,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=40 in LISTP17[[8]]
## Warning: There are no valid values for INTERVALS=41 in LISTP17[[8]]
## P17,8,42,ID=0, num_zeros=4
## P17,8,43,ID=0, num_zeros=1
## P17,8,44,ID=0, num_zeros=3
## P17,8,45,ID=0, num_zeros=1
## P17,8,46,ID=0, num_zeros=2
## P17,8,47,ID=0, num_zeros=1
## P17,8,48,ID=0, num_zeros=4
## P17,8,49,ID=0, num_zeros=1
## P17,8,50,ID=0, num_zeros=2
## P17,9,1,ID=0, num_zeros=6
## P17,9,2,ID=0, num_zeros=3
## P17,9,3,ID=0, num_zeros=3
## P17,9,4,ID=0, num_zeros=2
## P17,9,5,ID=0, num_zeros=2
## P17,9,6,ID=0, num_zeros=1
## P17,9,7,ID=0, num_zeros=1
## P17,9,8,ID=0, num_zeros=3
## P17,9,9,ID=0, num_zeros=3
## P17,9,10,ID=0, num_zeros=6
## P17,9,11,ID=0, num_zeros=7
## P17,9,12,ID=0, num_zeros=2
## P17,9,13,ID=0, num_zeros=6
## P17,9,14,ID=0, num_zeros=6
## P17,9,15,ID=0, num_zeros=3
## P17,9,16,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=17 in LISTP17[[9]]
## P17,9,18,ID=0, num_zeros=2
## P17,9,19,ID=0, num_zeros=0
## P17,9,20,ID=0, num_zeros=2
## P17,9,21,ID=0, num_zeros=2
## P17,9,22,ID=0, num_zeros=1
## P17,9,23,ID=0, num_zeros=2
## P17,9,24,ID=0, num_zeros=4
## P17,9,25,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=26 in LISTP17[[9]]
## P17,9,27,ID=0, num_zeros=1
## P17,9,28,ID=0, num_zeros=2
## P17,9,29,ID=0, num_zeros=0
## P17,9,30,ID=0, num_zeros=4
## P17,9,31,ID=0, num_zeros=3
## P17,9,32,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=33 in LISTP17[[9]]
## P17,9,34,ID=0, num_zeros=1
## P17,9,35,ID=0, num_zeros=1
## P17,9,36,ID=0, num_zeros=1
## P17,9,37,ID=0, num_zeros=1
## P17,9,38,ID=0, num_zeros=4
## P17,9,39,ID=0, num_zeros=3
## P17,9,40,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=41 in LISTP17[[9]]
## P17,9,42,ID=0, num_zeros=0
## P17,9,43,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=44 in LISTP17[[9]]
## P17,9,45,ID=0, num_zeros=2
## P17,9,46,ID=0, num_zeros=1
## P17,9,47,ID=0, num_zeros=0
## P17,9,48,ID=0, num_zeros=4
## P17,9,49,ID=0, num_zeros=3
## P17,9,50,ID=0, num_zeros=4
## P17,10,1,ID=0, num_zeros=2
## P17,10,2,ID=0, num_zeros=1
## P17,10,3,ID=0, num_zeros=2
## P17,10,4,ID=0, num_zeros=3
## P17,10,5,ID=0, num_zeros=1
## P17,10,6,ID=0, num_zeros=3
## P17,10,7,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=8 in LISTP17[[10]]
## P17,10,9,ID=0, num_zeros=3
## P17,10,10,ID=0, num_zeros=2
## P17,10,11,ID=0, num_zeros=1
## P17,10,12,ID=0, num_zeros=8
## P17,10,13,ID=0, num_zeros=3
## P17,10,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP17[[10]]
## Warning: There are no valid values for INTERVALS=16 in LISTP17[[10]]
## P17,10,17,ID=0, num_zeros=1
## P17,10,18,ID=0, num_zeros=3
## P17,10,19,ID=0, num_zeros=4
## P17,10,20,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=21 in LISTP17[[10]]
## P17,10,22,ID=0, num_zeros=5
## P17,10,23,ID=0, num_zeros=1
## P17,10,24,ID=0, num_zeros=0
## P17,10,25,ID=0, num_zeros=1
## P17,10,26,ID=0, num_zeros=2
## P17,10,27,ID=0, num_zeros=2
## P17,10,28,ID=0, num_zeros=3
## P17,10,29,ID=0, num_zeros=4
## P17,10,30,ID=0, num_zeros=0
## P17,10,31,ID=0, num_zeros=0
## P17,10,32,ID=0, num_zeros=4
## P17,10,33,ID=0, num_zeros=2
## P17,10,34,ID=0, num_zeros=1
## P17,10,35,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=36 in LISTP17[[10]]
## P17,10,37,ID=0, num_zeros=2
## P17,10,38,ID=0, num_zeros=1
## P17,10,39,ID=0, num_zeros=1
## P17,10,40,ID=0, num_zeros=3
## P17,10,41,ID=0, num_zeros=3
## P17,10,42,ID=0, num_zeros=2
## P17,10,43,ID=0, num_zeros=4
## P17,10,44,ID=0, num_zeros=7
## P17,10,45,ID=0, num_zeros=1
## P17,10,46,ID=0, num_zeros=3
## P17,10,47,ID=0, num_zeros=3
## P17,10,48,ID=0, num_zeros=1
## P17,10,49,ID=0, num_zeros=6
## P17,10,50,ID=0, num_zeros=2
## P18,1,1,ID=0, num_zeros=5
## P18,1,2,ID=0, num_zeros=7
## P18,1,3,ID=0, num_zeros=1
## P18,1,4,ID=0, num_zeros=2
## P18,1,5,ID=0, num_zeros=4
## P18,1,6,ID=0, num_zeros=4
## P18,1,7,ID=0, num_zeros=6
## P18,1,8,ID=0, num_zeros=4
## P18,1,9,ID=0, num_zeros=15
## P18,1,10,ID=0, num_zeros=5
## P18,1,11,ID=0, num_zeros=2
## P18,1,12,ID=0, num_zeros=8
## P18,1,13,ID=0, num_zeros=9
## P18,1,14,ID=0, num_zeros=1
## P18,1,15,ID=0, num_zeros=4
## P18,1,16,ID=0, num_zeros=3
## P18,1,17,ID=0, num_zeros=4
## P18,1,18,ID=0, num_zeros=2
## P18,1,19,ID=0, num_zeros=5
## P18,1,20,ID=0, num_zeros=6
## P18,1,21,ID=0, num_zeros=6
## P18,1,22,ID=0, num_zeros=7
## P18,1,23,ID=0, num_zeros=8
## P18,1,24,ID=0, num_zeros=8
## P18,1,25,ID=0, num_zeros=10
## P18,1,26,ID=0, num_zeros=4
## P18,1,27,ID=0, num_zeros=7
## P18,1,28,ID=0, num_zeros=8
## P18,1,29,ID=0, num_zeros=7
## P18,1,30,ID=0, num_zeros=4
## P18,1,31,ID=0, num_zeros=4
## P18,1,32,ID=0, num_zeros=3
## P18,1,33,ID=0, num_zeros=5
## P18,1,34,ID=0, num_zeros=1
## P18,1,35,ID=0, num_zeros=2
## P18,1,36,ID=0, num_zeros=1
## P18,1,37,ID=0, num_zeros=6
## P18,1,38,ID=0, num_zeros=1
## P18,1,39,ID=0, num_zeros=2
## P18,1,40,ID=0, num_zeros=4
## P18,1,41,ID=0, num_zeros=9
## P18,1,42,ID=0, num_zeros=2
## P18,1,43,ID=0, num_zeros=2
## P18,1,44,ID=0, num_zeros=2
## P18,1,45,ID=0, num_zeros=8
## P18,1,46,ID=0, num_zeros=4
## P18,1,47,ID=0, num_zeros=8
## P18,1,48,ID=0, num_zeros=6
## P18,1,49,ID=0, num_zeros=2
## P18,1,50,ID=0, num_zeros=11
## P18,2,1,ID=0, num_zeros=5
## P18,2,2,ID=0, num_zeros=7
## P18,2,3,ID=0, num_zeros=4
## P18,2,4,ID=0, num_zeros=7
## P18,2,5,ID=0, num_zeros=3
## P18,2,6,ID=0, num_zeros=11
## P18,2,7,ID=0, num_zeros=4
## P18,2,8,ID=0, num_zeros=2
## P18,2,9,ID=0, num_zeros=6
## P18,2,10,ID=0, num_zeros=5
## P18,2,11,ID=0, num_zeros=4
## P18,2,12,ID=0, num_zeros=5
## P18,2,13,ID=0, num_zeros=10
## P18,2,14,ID=0, num_zeros=5
## P18,2,15,ID=0, num_zeros=1
## P18,2,16,ID=0, num_zeros=6
## P18,2,17,ID=0, num_zeros=4
## P18,2,18,ID=0, num_zeros=11
## P18,2,19,ID=0, num_zeros=1
## P18,2,20,ID=0, num_zeros=1
## P18,2,21,ID=0, num_zeros=11
## P18,2,22,ID=0, num_zeros=5
## P18,2,23,ID=0, num_zeros=0
## P18,2,24,ID=0, num_zeros=5
## P18,2,25,ID=0, num_zeros=11
## P18,2,26,ID=0, num_zeros=2
## P18,2,27,ID=0, num_zeros=4
## P18,2,28,ID=0, num_zeros=5
## P18,2,29,ID=0, num_zeros=2
## P18,2,30,ID=0, num_zeros=4
## P18,2,31,ID=0, num_zeros=1
## P18,2,32,ID=0, num_zeros=1
## P18,2,33,ID=0, num_zeros=3
## P18,2,34,ID=0, num_zeros=1
## P18,2,35,ID=0, num_zeros=5
## P18,2,36,ID=0, num_zeros=4
## P18,2,37,ID=0, num_zeros=0
## P18,2,38,ID=0, num_zeros=0
## P18,2,39,ID=0, num_zeros=4
## P18,2,40,ID=0, num_zeros=8
## P18,2,41,ID=0, num_zeros=2
## P18,2,42,ID=0, num_zeros=16
## P18,2,43,ID=0, num_zeros=1
## P18,2,44,ID=0, num_zeros=3
## P18,2,45,ID=0, num_zeros=3
## P18,2,46,ID=0, num_zeros=2
## P18,2,47,ID=0, num_zeros=2
## P18,2,48,ID=0, num_zeros=6
## P18,2,49,ID=0, num_zeros=7
## P18,2,50,ID=0, num_zeros=5
## P18,3,1,ID=0, num_zeros=9
## P18,3,2,ID=0, num_zeros=4
## P18,3,3,ID=0, num_zeros=9
## P18,3,4,ID=0, num_zeros=2
## P18,3,5,ID=0, num_zeros=0
## P18,3,6,ID=0, num_zeros=3
## P18,3,7,ID=0, num_zeros=0
## P18,3,8,ID=0, num_zeros=1
## P18,3,9,ID=0, num_zeros=10
## P18,3,10,ID=0, num_zeros=5
## P18,3,11,ID=0, num_zeros=6
## P18,3,12,ID=0, num_zeros=1
## P18,3,13,ID=0, num_zeros=2
## P18,3,14,ID=0, num_zeros=5
## P18,3,15,ID=0, num_zeros=2
## P18,3,16,ID=0, num_zeros=5
## P18,3,17,ID=0, num_zeros=3
## P18,3,18,ID=0, num_zeros=1
## P18,3,19,ID=0, num_zeros=7
## P18,3,20,ID=0, num_zeros=9
## P18,3,21,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=22 in LISTP18[[3]]
## P18,3,23,ID=0, num_zeros=10
## P18,3,24,ID=0, num_zeros=2
## P18,3,25,ID=0, num_zeros=7
## P18,3,26,ID=0, num_zeros=7
## P18,3,27,ID=0, num_zeros=4
## P18,3,28,ID=0, num_zeros=3
## P18,3,29,ID=0, num_zeros=6
## P18,3,30,ID=0, num_zeros=6
## P18,3,31,ID=0, num_zeros=6
## P18,3,32,ID=0, num_zeros=2
## P18,3,33,ID=0, num_zeros=1
## P18,3,34,ID=0, num_zeros=10
## P18,3,35,ID=0, num_zeros=3
## P18,3,36,ID=0, num_zeros=7
## P18,3,37,ID=0, num_zeros=0
## P18,3,38,ID=0, num_zeros=1
## P18,3,39,ID=0, num_zeros=4
## P18,3,40,ID=0, num_zeros=6
## P18,3,41,ID=0, num_zeros=10
## P18,3,42,ID=0, num_zeros=3
## P18,3,43,ID=0, num_zeros=5
## P18,3,44,ID=0, num_zeros=4
## P18,3,45,ID=0, num_zeros=3
## P18,3,46,ID=0, num_zeros=3
## P18,3,47,ID=0, num_zeros=3
## P18,3,48,ID=0, num_zeros=4
## P18,3,49,ID=0, num_zeros=2
## P18,3,50,ID=0, num_zeros=7
## P18,4,1,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=2 in LISTP18[[4]]
## P18,4,3,ID=0, num_zeros=0
## P18,4,4,ID=0, num_zeros=3
## P18,4,5,ID=0, num_zeros=2
## P18,4,6,ID=0, num_zeros=0
## P18,4,7,ID=0, num_zeros=1
## P18,4,8,ID=0, num_zeros=5
## P18,4,9,ID=0, num_zeros=8
## P18,4,10,ID=0, num_zeros=4
## P18,4,11,ID=0, num_zeros=1
## P18,4,12,ID=0, num_zeros=2
## P18,4,13,ID=0, num_zeros=3
## P18,4,14,ID=0, num_zeros=10
## P18,4,15,ID=0, num_zeros=3
## P18,4,16,ID=0, num_zeros=3
## P18,4,17,ID=0, num_zeros=0
## P18,4,18,ID=0, num_zeros=1
## P18,4,19,ID=0, num_zeros=3
## P18,4,20,ID=0, num_zeros=9
## P18,4,21,ID=0, num_zeros=8
## P18,4,22,ID=0, num_zeros=2
## P18,4,23,ID=0, num_zeros=3
## P18,4,24,ID=0, num_zeros=2
## P18,4,25,ID=0, num_zeros=2
## P18,4,26,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=27 in LISTP18[[4]]
## P18,4,28,ID=0, num_zeros=0
## P18,4,29,ID=0, num_zeros=3
## P18,4,30,ID=0, num_zeros=1
## P18,4,31,ID=0, num_zeros=6
## P18,4,32,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=33 in LISTP18[[4]]
## P18,4,34,ID=0, num_zeros=0
## P18,4,35,ID=0, num_zeros=3
## P18,4,36,ID=0, num_zeros=3
## P18,4,37,ID=0, num_zeros=2
## P18,4,38,ID=0, num_zeros=3
## P18,4,39,ID=0, num_zeros=5
## P18,4,40,ID=0, num_zeros=9
## P18,4,41,ID=0, num_zeros=3
## P18,4,42,ID=0, num_zeros=1
## P18,4,43,ID=0, num_zeros=1
## P18,4,44,ID=0, num_zeros=3
## P18,4,45,ID=0, num_zeros=0
## P18,4,46,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=47 in LISTP18[[4]]
## P18,4,48,ID=0, num_zeros=3
## P18,4,49,ID=0, num_zeros=6
## P18,4,50,ID=0, num_zeros=9
## P18,5,1,ID=0, num_zeros=7
## P18,5,2,ID=0, num_zeros=5
## P18,5,3,ID=0, num_zeros=2
## P18,5,4,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=5 in LISTP18[[5]]
## P18,5,6,ID=0, num_zeros=3
## P18,5,7,ID=0, num_zeros=2
## P18,5,8,ID=0, num_zeros=5
## P18,5,9,ID=0, num_zeros=7
## P18,5,10,ID=0, num_zeros=7
## P18,5,11,ID=0, num_zeros=7
## P18,5,12,ID=0, num_zeros=3
## P18,5,13,ID=0, num_zeros=1
## P18,5,14,ID=0, num_zeros=12
## P18,5,15,ID=0, num_zeros=6
## P18,5,16,ID=0, num_zeros=3
## P18,5,17,ID=0, num_zeros=2
## P18,5,18,ID=0, num_zeros=3
## P18,5,19,ID=0, num_zeros=2
## P18,5,20,ID=0, num_zeros=2
## P18,5,21,ID=0, num_zeros=2
## P18,5,22,ID=0, num_zeros=0
## P18,5,23,ID=0, num_zeros=5
## P18,5,24,ID=0, num_zeros=4
## P18,5,25,ID=0, num_zeros=4
## P18,5,26,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=27 in LISTP18[[5]]
## P18,5,28,ID=0, num_zeros=0
## P18,5,29,ID=0, num_zeros=4
## P18,5,30,ID=0, num_zeros=2
## P18,5,31,ID=0, num_zeros=4
## P18,5,32,ID=0, num_zeros=13
## P18,5,33,ID=0, num_zeros=3
## P18,5,34,ID=0, num_zeros=0
## P18,5,35,ID=0, num_zeros=0
## P18,5,36,ID=0, num_zeros=9
## P18,5,37,ID=0, num_zeros=8
## P18,5,38,ID=0, num_zeros=5
## P18,5,39,ID=0, num_zeros=1
## P18,5,40,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=41 in LISTP18[[5]]
## P18,5,42,ID=0, num_zeros=2
## P18,5,43,ID=0, num_zeros=6
## P18,5,44,ID=0, num_zeros=3
## P18,5,45,ID=0, num_zeros=7
## P18,5,46,ID=0, num_zeros=5
## P18,5,47,ID=0, num_zeros=2
## P18,5,48,ID=0, num_zeros=2
## P18,5,49,ID=0, num_zeros=1
## P18,5,50,ID=0, num_zeros=5
## P18,6,1,ID=0, num_zeros=1
## P18,6,2,ID=0, num_zeros=2
## P18,6,3,ID=0, num_zeros=9
## P18,6,4,ID=0, num_zeros=4
## P18,6,5,ID=0, num_zeros=4
## P18,6,6,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=7 in LISTP18[[6]]
## P18,6,8,ID=0, num_zeros=1
## P18,6,9,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=10 in LISTP18[[6]]
## P18,6,11,ID=0, num_zeros=2
## P18,6,12,ID=0, num_zeros=3
## P18,6,13,ID=0, num_zeros=1
## P18,6,14,ID=0, num_zeros=7
## P18,6,15,ID=0, num_zeros=3
## P18,6,16,ID=0, num_zeros=2
## P18,6,17,ID=0, num_zeros=1
## P18,6,18,ID=0, num_zeros=4
## P18,6,19,ID=0, num_zeros=0
## P18,6,20,ID=0, num_zeros=4
## P18,6,21,ID=0, num_zeros=2
## P18,6,22,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=23 in LISTP18[[6]]
## Warning: There are no valid values for INTERVALS=24 in LISTP18[[6]]
## P18,6,25,ID=0, num_zeros=7
## P18,6,26,ID=0, num_zeros=3
## P18,6,27,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=28 in LISTP18[[6]]
## P18,6,29,ID=0, num_zeros=1
## P18,6,30,ID=0, num_zeros=3
## P18,6,31,ID=0, num_zeros=7
## P18,6,32,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=33 in LISTP18[[6]]
## P18,6,34,ID=0, num_zeros=12
## P18,6,35,ID=0, num_zeros=5
## P18,6,36,ID=0, num_zeros=0
## P18,6,37,ID=0, num_zeros=5
## P18,6,38,ID=0, num_zeros=2
## P18,6,39,ID=0, num_zeros=1
## P18,6,40,ID=0, num_zeros=0
## P18,6,41,ID=0, num_zeros=4
## P18,6,42,ID=0, num_zeros=9
## P18,6,43,ID=0, num_zeros=1
## P18,6,44,ID=0, num_zeros=1
## P18,6,45,ID=0, num_zeros=4
## P18,6,46,ID=0, num_zeros=3
## P18,6,47,ID=0, num_zeros=2
## P18,6,48,ID=0, num_zeros=2
## P18,6,49,ID=0, num_zeros=5
## P18,6,50,ID=0, num_zeros=12
## P18,7,1,ID=0, num_zeros=1
## P18,7,2,ID=0, num_zeros=0
## P18,7,3,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=4 in LISTP18[[7]]
## P18,7,5,ID=0, num_zeros=2
## P18,7,6,ID=0, num_zeros=1
## P18,7,7,ID=0, num_zeros=1
## P18,7,8,ID=0, num_zeros=5
## P18,7,9,ID=0, num_zeros=8
## P18,7,10,ID=0, num_zeros=7
## P18,7,11,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=12 in LISTP18[[7]]
## P18,7,13,ID=0, num_zeros=2
## P18,7,14,ID=0, num_zeros=4
## P18,7,15,ID=0, num_zeros=4
## P18,7,16,ID=0, num_zeros=5
## P18,7,17,ID=0, num_zeros=3
## P18,7,18,ID=0, num_zeros=7
## P18,7,19,ID=0, num_zeros=2
## P18,7,20,ID=0, num_zeros=1
## P18,7,21,ID=0, num_zeros=3
## P18,7,22,ID=0, num_zeros=4
## P18,7,23,ID=0, num_zeros=2
## P18,7,24,ID=0, num_zeros=2
## P18,7,25,ID=0, num_zeros=4
## P18,7,26,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=27 in LISTP18[[7]]
## P18,7,28,ID=0, num_zeros=1
## P18,7,29,ID=0, num_zeros=1
## P18,7,30,ID=0, num_zeros=4
## P18,7,31,ID=0, num_zeros=10
## P18,7,32,ID=0, num_zeros=3
## P18,7,33,ID=0, num_zeros=6
## P18,7,34,ID=0, num_zeros=2
## P18,7,35,ID=0, num_zeros=4
## P18,7,36,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=37 in LISTP18[[7]]
## P18,7,38,ID=0, num_zeros=1
## P18,7,39,ID=0, num_zeros=6
## P18,7,40,ID=0, num_zeros=4
## P18,7,41,ID=0, num_zeros=4
## P18,7,42,ID=0, num_zeros=1
## P18,7,43,ID=0, num_zeros=1
## P18,7,44,ID=0, num_zeros=0
## P18,7,45,ID=0, num_zeros=1
## P18,7,46,ID=0, num_zeros=2
## P18,7,47,ID=0, num_zeros=2
## P18,7,48,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=49 in LISTP18[[7]]
## P18,7,50,ID=0, num_zeros=17
## P18,8,1,ID=0, num_zeros=3
## P18,8,2,ID=0, num_zeros=1
## P18,8,3,ID=0, num_zeros=2
## P18,8,4,ID=0, num_zeros=1
## P18,8,5,ID=0, num_zeros=3
## P18,8,6,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=7 in LISTP18[[8]]
## P18,8,8,ID=0, num_zeros=1
## P18,8,9,ID=0, num_zeros=8
## P18,8,10,ID=0, num_zeros=6
## P18,8,11,ID=0, num_zeros=2
## P18,8,12,ID=0, num_zeros=4
## P18,8,13,ID=0, num_zeros=3
## P18,8,14,ID=0, num_zeros=4
## P18,8,15,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=16 in LISTP18[[8]]
## Warning: There are no valid values for INTERVALS=17 in LISTP18[[8]]
## P18,8,18,ID=0, num_zeros=3
## P18,8,19,ID=0, num_zeros=1
## P18,8,20,ID=0, num_zeros=5
## P18,8,21,ID=0, num_zeros=4
## P18,8,22,ID=0, num_zeros=2
## P18,8,23,ID=0, num_zeros=4
## P18,8,24,ID=0, num_zeros=1
## P18,8,25,ID=0, num_zeros=8
## P18,8,26,ID=0, num_zeros=1
## P18,8,27,ID=0, num_zeros=3
## P18,8,28,ID=0, num_zeros=2
## P18,8,29,ID=0, num_zeros=2
## P18,8,30,ID=0, num_zeros=8
## P18,8,31,ID=0, num_zeros=13
## P18,8,32,ID=0, num_zeros=2
## P18,8,33,ID=0, num_zeros=4
## P18,8,34,ID=0, num_zeros=5
## P18,8,35,ID=0, num_zeros=6
## P18,8,36,ID=0, num_zeros=5
## P18,8,37,ID=0, num_zeros=3
## P18,8,38,ID=0, num_zeros=9
## P18,8,39,ID=0, num_zeros=3
## P18,8,40,ID=0, num_zeros=3
## P18,8,41,ID=0, num_zeros=3
## P18,8,42,ID=0, num_zeros=3
## P18,8,43,ID=0, num_zeros=2
## P18,8,44,ID=0, num_zeros=4
## P18,8,45,ID=0, num_zeros=5
## P18,8,46,ID=0, num_zeros=1
## P18,8,47,ID=0, num_zeros=16
## P18,8,48,ID=0, num_zeros=1
## P18,8,49,ID=0, num_zeros=2
## P18,8,50,ID=0, num_zeros=9
## P18,9,1,ID=0, num_zeros=9
## P18,9,2,ID=0, num_zeros=2
## P18,9,3,ID=0, num_zeros=6
## P18,9,4,ID=0, num_zeros=5
## P18,9,5,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=6 in LISTP18[[9]]
## P18,9,7,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=8 in LISTP18[[9]]
## P18,9,9,ID=0, num_zeros=2
## P18,9,10,ID=0, num_zeros=2
## P18,9,11,ID=0, num_zeros=4
## P18,9,12,ID=0, num_zeros=1
## P18,9,13,ID=0, num_zeros=4
## P18,9,14,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=15 in LISTP18[[9]]
## P18,9,16,ID=0, num_zeros=3
## P18,9,17,ID=0, num_zeros=0
## P18,9,18,ID=0, num_zeros=2
## P18,9,19,ID=0, num_zeros=4
## P18,9,20,ID=0, num_zeros=5
## P18,9,21,ID=0, num_zeros=1
## P18,9,22,ID=0, num_zeros=3
## P18,9,23,ID=0, num_zeros=1
## P18,9,24,ID=0, num_zeros=2
## P18,9,25,ID=0, num_zeros=2
## P18,9,26,ID=0, num_zeros=6
## P18,9,27,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=28 in LISTP18[[9]]
## P18,9,29,ID=0, num_zeros=3
## P18,9,30,ID=0, num_zeros=5
## P18,9,31,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=32 in LISTP18[[9]]
## P18,9,33,ID=0, num_zeros=2
## P18,9,34,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=35 in LISTP18[[9]]
## P18,9,36,ID=0, num_zeros=6
## P18,9,37,ID=0, num_zeros=4
## P18,9,38,ID=0, num_zeros=7
## P18,9,39,ID=0, num_zeros=3
## P18,9,40,ID=0, num_zeros=5
## P18,9,41,ID=0, num_zeros=4
## P18,9,42,ID=0, num_zeros=1
## P18,9,43,ID=0, num_zeros=5
## P18,9,44,ID=0, num_zeros=1
## P18,9,45,ID=0, num_zeros=5
## P18,9,46,ID=0, num_zeros=5
## P18,9,47,ID=0, num_zeros=2
## P18,9,48,ID=0, num_zeros=4
## P18,9,49,ID=0, num_zeros=2
## P18,9,50,ID=0, num_zeros=4
## P18,10,1,ID=0, num_zeros=2
## P18,10,2,ID=0, num_zeros=2
## P18,10,3,ID=0, num_zeros=3
## P18,10,4,ID=0, num_zeros=3
## P18,10,5,ID=0, num_zeros=1
## P18,10,6,ID=0, num_zeros=3
## P18,10,7,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=8 in LISTP18[[10]]
## P18,10,9,ID=0, num_zeros=0
## P18,10,10,ID=0, num_zeros=2
## P18,10,11,ID=0, num_zeros=6
## P18,10,12,ID=0, num_zeros=1
## P18,10,13,ID=0, num_zeros=4
## P18,10,14,ID=0, num_zeros=1
## P18,10,15,ID=0, num_zeros=3
## P18,10,16,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=17 in LISTP18[[10]]
## P18,10,18,ID=0, num_zeros=3
## P18,10,19,ID=0, num_zeros=1
## P18,10,20,ID=0, num_zeros=2
## P18,10,21,ID=0, num_zeros=1
## P18,10,22,ID=0, num_zeros=4
## P18,10,23,ID=0, num_zeros=1
## P18,10,24,ID=0, num_zeros=3
## P18,10,25,ID=0, num_zeros=0
## P18,10,26,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=27 in LISTP18[[10]]
## Warning: There are no valid values for INTERVALS=28 in LISTP18[[10]]
## P18,10,29,ID=0, num_zeros=3
## P18,10,30,ID=0, num_zeros=1
## P18,10,31,ID=0, num_zeros=9
## P18,10,32,ID=0, num_zeros=1
## P18,10,33,ID=0, num_zeros=1
## P18,10,34,ID=0, num_zeros=1
## P18,10,35,ID=0, num_zeros=3
## P18,10,36,ID=0, num_zeros=4
## P18,10,37,ID=0, num_zeros=5
## P18,10,38,ID=0, num_zeros=1
## P18,10,39,ID=0, num_zeros=3
## P18,10,40,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=41 in LISTP18[[10]]
## P18,10,42,ID=0, num_zeros=4
## P18,10,43,ID=0, num_zeros=4
## P18,10,44,ID=0, num_zeros=2
## P18,10,45,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=46 in LISTP18[[10]]
## P18,10,47,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=48 in LISTP18[[10]]
## P18,10,49,ID=0, num_zeros=1
## P18,10,50,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=1 in LISTP19[[1]]
## Warning: There are no valid values for INTERVALS=2 in LISTP19[[1]]
## P19,1,3,ID=0, num_zeros=1
## P19,1,4,ID=0, num_zeros=5
## P19,1,5,ID=0, num_zeros=7
## P19,1,6,ID=0, num_zeros=5
## P19,1,7,ID=0, num_zeros=3
## P19,1,8,ID=0, num_zeros=1
## P19,1,9,ID=0, num_zeros=6
## P19,1,10,ID=0, num_zeros=3
## P19,1,11,ID=0, num_zeros=3
## P19,1,12,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=13 in LISTP19[[1]]
## Warning: There are no valid values for INTERVALS=14 in LISTP19[[1]]
## P19,1,15,ID=0, num_zeros=2
## P19,1,16,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=17 in LISTP19[[1]]
## P19,1,18,ID=0, num_zeros=1
## P19,1,19,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=20 in LISTP19[[1]]
## Warning: There are no valid values for INTERVALS=21 in LISTP19[[1]]
## P19,1,22,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=23 in LISTP19[[1]]
## Warning: There are no valid values for INTERVALS=24 in LISTP19[[1]]
## P19,1,25,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=26 in LISTP19[[1]]
## P19,1,27,ID=0, num_zeros=0
## P19,1,28,ID=0, num_zeros=2
## P19,1,29,ID=0, num_zeros=1
## P19,1,30,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=31 in LISTP19[[1]]
## P19,1,32,ID=0, num_zeros=3
## P19,1,33,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=34 in LISTP19[[1]]
## Warning: There are no valid values for INTERVALS=35 in LISTP19[[1]]
## Warning: There are no valid values for INTERVALS=36 in LISTP19[[1]]
## P19,1,37,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=38 in LISTP19[[1]]
## Warning: There are no valid values for INTERVALS=39 in LISTP19[[1]]
## P19,1,40,ID=0, num_zeros=1
## P19,1,41,ID=0, num_zeros=1
## P19,1,42,ID=0, num_zeros=2
## P19,1,43,ID=0, num_zeros=4
## P19,1,44,ID=0, num_zeros=2
## P19,1,45,ID=0, num_zeros=1
## P19,1,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP19[[1]]
## P19,1,48,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=49 in LISTP19[[1]]
## P19,1,50,ID=0, num_zeros=1
## P19,2,1,ID=0, num_zeros=3
## P19,2,2,ID=0, num_zeros=1
## P19,2,3,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=4 in LISTP19[[2]]
## P19,2,5,ID=0, num_zeros=3
## P19,2,6,ID=0, num_zeros=5
## P19,2,7,ID=0, num_zeros=10
## P19,2,8,ID=0, num_zeros=3
## P19,2,9,ID=0, num_zeros=5
## P19,2,10,ID=0, num_zeros=1
## P19,2,11,ID=0, num_zeros=2
## P19,2,12,ID=0, num_zeros=1
## P19,2,13,ID=0, num_zeros=3
## P19,2,14,ID=0, num_zeros=2
## P19,2,15,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=16 in LISTP19[[2]]
## P19,2,17,ID=0, num_zeros=1
## P19,2,18,ID=0, num_zeros=3
## P19,2,19,ID=0, num_zeros=4
## P19,2,20,ID=0, num_zeros=2
## P19,2,21,ID=0, num_zeros=6
## P19,2,22,ID=0, num_zeros=3
## P19,2,23,ID=0, num_zeros=1
## P19,2,24,ID=0, num_zeros=4
## P19,2,25,ID=0, num_zeros=2
## P19,2,26,ID=0, num_zeros=6
## P19,2,27,ID=0, num_zeros=3
## P19,2,28,ID=0, num_zeros=4
## P19,2,29,ID=0, num_zeros=6
## P19,2,30,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=31 in LISTP19[[2]]
## P19,2,32,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=33 in LISTP19[[2]]
## P19,2,34,ID=0, num_zeros=3
## P19,2,35,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=36 in LISTP19[[2]]
## P19,2,37,ID=0, num_zeros=2
## P19,2,38,ID=0, num_zeros=4
## P19,2,39,ID=0, num_zeros=3
## P19,2,40,ID=0, num_zeros=1
## P19,2,41,ID=0, num_zeros=4
## P19,2,42,ID=0, num_zeros=7
## P19,2,43,ID=0, num_zeros=5
## P19,2,44,ID=0, num_zeros=0
## P19,2,45,ID=0, num_zeros=5
## P19,2,46,ID=0, num_zeros=1
## P19,2,47,ID=0, num_zeros=1
## P19,2,48,ID=0, num_zeros=1
## P19,2,49,ID=0, num_zeros=6
## P19,2,50,ID=0, num_zeros=16
## Warning: There are no valid values for INTERVALS=1 in LISTP19[[3]]
## P19,3,2,ID=0, num_zeros=1
## P19,3,3,ID=0, num_zeros=3
## P19,3,4,ID=0, num_zeros=3
## P19,3,5,ID=0, num_zeros=3
## P19,3,6,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=7 in LISTP19[[3]]
## P19,3,8,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=9 in LISTP19[[3]]
## P19,3,10,ID=0, num_zeros=7
## P19,3,11,ID=0, num_zeros=4
## P19,3,12,ID=0, num_zeros=3
## P19,3,13,ID=0, num_zeros=3
## P19,3,14,ID=0, num_zeros=4
## P19,3,15,ID=0, num_zeros=7
## P19,3,16,ID=0, num_zeros=8
## P19,3,17,ID=0, num_zeros=7
## P19,3,18,ID=0, num_zeros=5
## P19,3,19,ID=0, num_zeros=3
## P19,3,20,ID=0, num_zeros=5
## P19,3,21,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=22 in LISTP19[[3]]
## P19,3,23,ID=0, num_zeros=3
## P19,3,24,ID=0, num_zeros=0
## P19,3,25,ID=0, num_zeros=3
## P19,3,26,ID=0, num_zeros=3
## P19,3,27,ID=0, num_zeros=2
## P19,3,28,ID=0, num_zeros=4
## P19,3,29,ID=0, num_zeros=1
## P19,3,30,ID=0, num_zeros=1
## P19,3,31,ID=0, num_zeros=2
## P19,3,32,ID=0, num_zeros=6
## P19,3,33,ID=0, num_zeros=7
## P19,3,34,ID=0, num_zeros=3
## P19,3,35,ID=0, num_zeros=7
## P19,3,36,ID=0, num_zeros=3
## P19,3,37,ID=0, num_zeros=3
## P19,3,38,ID=0, num_zeros=3
## P19,3,39,ID=0, num_zeros=1
## P19,3,40,ID=0, num_zeros=2
## P19,3,41,ID=0, num_zeros=3
## P19,3,42,ID=0, num_zeros=2
## P19,3,43,ID=0, num_zeros=4
## P19,3,44,ID=0, num_zeros=6
## P19,3,45,ID=0, num_zeros=6
## P19,3,46,ID=0, num_zeros=1
## P19,3,47,ID=0, num_zeros=6
## P19,3,48,ID=0, num_zeros=2
## P19,3,49,ID=0, num_zeros=5
## P19,3,50,ID=0, num_zeros=20
## P19,4,1,ID=0, num_zeros=6
## P19,4,2,ID=0, num_zeros=3
## P19,4,3,ID=0, num_zeros=5
## P19,4,4,ID=0, num_zeros=3
## P19,4,5,ID=0, num_zeros=3
## P19,4,6,ID=0, num_zeros=2
## P19,4,7,ID=0, num_zeros=5
## P19,4,8,ID=0, num_zeros=3
## P19,4,9,ID=0, num_zeros=3
## P19,4,10,ID=0, num_zeros=4
## P19,4,11,ID=0, num_zeros=2
## P19,4,12,ID=0, num_zeros=4
## P19,4,13,ID=0, num_zeros=3
## P19,4,14,ID=0, num_zeros=1
## P19,4,15,ID=0, num_zeros=3
## P19,4,16,ID=0, num_zeros=2
## P19,4,17,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=18 in LISTP19[[4]]
## P19,4,19,ID=0, num_zeros=2
## P19,4,20,ID=0, num_zeros=7
## P19,4,21,ID=0, num_zeros=2
## P19,4,22,ID=0, num_zeros=5
## P19,4,23,ID=0, num_zeros=2
## P19,4,24,ID=0, num_zeros=4
## P19,4,25,ID=0, num_zeros=5
## P19,4,26,ID=0, num_zeros=6
## P19,4,27,ID=0, num_zeros=4
## P19,4,28,ID=0, num_zeros=0
## P19,4,29,ID=0, num_zeros=3
## P19,4,30,ID=0, num_zeros=2
## P19,4,31,ID=0, num_zeros=2
## P19,4,32,ID=0, num_zeros=4
## P19,4,33,ID=0, num_zeros=2
## P19,4,34,ID=0, num_zeros=2
## P19,4,35,ID=0, num_zeros=6
## P19,4,36,ID=0, num_zeros=3
## P19,4,37,ID=0, num_zeros=1
## P19,4,38,ID=0, num_zeros=2
## P19,4,39,ID=0, num_zeros=3
## P19,4,40,ID=0, num_zeros=1
## P19,4,41,ID=0, num_zeros=4
## P19,4,42,ID=0, num_zeros=1
## P19,4,43,ID=0, num_zeros=1
## P19,4,44,ID=0, num_zeros=1
## P19,4,45,ID=0, num_zeros=2
## P19,4,46,ID=0, num_zeros=5
## P19,4,47,ID=0, num_zeros=4
## P19,4,48,ID=0, num_zeros=6
## P19,4,49,ID=0, num_zeros=4
## P19,4,50,ID=0, num_zeros=9
## P19,5,1,ID=0, num_zeros=7
## P19,5,2,ID=0, num_zeros=1
## P19,5,3,ID=0, num_zeros=1
## P19,5,4,ID=0, num_zeros=1
## P19,5,5,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=6 in LISTP19[[5]]
## P19,5,7,ID=0, num_zeros=2
## P19,5,8,ID=0, num_zeros=0
## P19,5,9,ID=0, num_zeros=5
## P19,5,10,ID=0, num_zeros=4
## P19,5,11,ID=0, num_zeros=2
## P19,5,12,ID=0, num_zeros=1
## P19,5,13,ID=0, num_zeros=1
## P19,5,14,ID=0, num_zeros=5
## P19,5,15,ID=0, num_zeros=2
## P19,5,16,ID=0, num_zeros=1
## P19,5,17,ID=0, num_zeros=4
## P19,5,18,ID=0, num_zeros=2
## P19,5,19,ID=0, num_zeros=1
## P19,5,20,ID=0, num_zeros=5
## P19,5,21,ID=0, num_zeros=1
## P19,5,22,ID=0, num_zeros=0
## P19,5,23,ID=0, num_zeros=1
## P19,5,24,ID=0, num_zeros=4
## P19,5,25,ID=0, num_zeros=4
## P19,5,26,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=27 in LISTP19[[5]]
## P19,5,28,ID=0, num_zeros=3
## P19,5,29,ID=0, num_zeros=4
## P19,5,30,ID=0, num_zeros=3
## P19,5,31,ID=0, num_zeros=2
## P19,5,32,ID=0, num_zeros=4
## P19,5,33,ID=0, num_zeros=2
## P19,5,34,ID=0, num_zeros=5
## P19,5,35,ID=0, num_zeros=3
## P19,5,36,ID=0, num_zeros=4
## P19,5,37,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=38 in LISTP19[[5]]
## P19,5,39,ID=0, num_zeros=2
## P19,5,40,ID=0, num_zeros=0
## P19,5,41,ID=0, num_zeros=1
## P19,5,42,ID=0, num_zeros=0
## P19,5,43,ID=0, num_zeros=3
## P19,5,44,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=45 in LISTP19[[5]]
## Warning: There are no valid values for INTERVALS=46 in LISTP19[[5]]
## P19,5,47,ID=0, num_zeros=4
## P19,5,48,ID=0, num_zeros=2
## P19,5,49,ID=0, num_zeros=3
## P19,5,50,ID=0, num_zeros=3
## P19,6,1,ID=0, num_zeros=4
## P19,6,2,ID=0, num_zeros=2
## P19,6,3,ID=0, num_zeros=3
## P19,6,4,ID=0, num_zeros=3
## P19,6,5,ID=0, num_zeros=6
## P19,6,6,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=7 in LISTP19[[6]]
## P19,6,8,ID=0, num_zeros=1
## P19,6,9,ID=0, num_zeros=1
## P19,6,10,ID=0, num_zeros=2
## P19,6,11,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=12 in LISTP19[[6]]
## P19,6,13,ID=0, num_zeros=1
## P19,6,14,ID=0, num_zeros=3
## P19,6,15,ID=0, num_zeros=8
## P19,6,16,ID=0, num_zeros=1
## P19,6,17,ID=0, num_zeros=1
## P19,6,18,ID=0, num_zeros=0
## P19,6,19,ID=0, num_zeros=2
## P19,6,20,ID=0, num_zeros=3
## P19,6,21,ID=0, num_zeros=2
## P19,6,22,ID=0, num_zeros=7
## P19,6,23,ID=0, num_zeros=1
## P19,6,24,ID=0, num_zeros=6
## P19,6,25,ID=0, num_zeros=3
## P19,6,26,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=27 in LISTP19[[6]]
## Warning: There are no valid values for INTERVALS=28 in LISTP19[[6]]
## P19,6,29,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=30 in LISTP19[[6]]
## P19,6,31,ID=0, num_zeros=1
## P19,6,32,ID=0, num_zeros=3
## P19,6,33,ID=0, num_zeros=4
## P19,6,34,ID=0, num_zeros=11
## P19,6,35,ID=0, num_zeros=6
## P19,6,36,ID=0, num_zeros=1
## P19,6,37,ID=0, num_zeros=2
## P19,6,38,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=39 in LISTP19[[6]]
## P19,6,40,ID=0, num_zeros=2
## P19,6,41,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=42 in LISTP19[[6]]
## P19,6,43,ID=0, num_zeros=1
## P19,6,44,ID=0, num_zeros=6
## P19,6,45,ID=0, num_zeros=4
## P19,6,46,ID=0, num_zeros=2
## P19,6,47,ID=0, num_zeros=3
## P19,6,48,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=49 in LISTP19[[6]]
## P19,6,50,ID=0, num_zeros=8
## P19,7,1,ID=0, num_zeros=4
## P19,7,2,ID=0, num_zeros=6
## P19,7,3,ID=0, num_zeros=1
## P19,7,4,ID=0, num_zeros=1
## P19,7,5,ID=0, num_zeros=2
## P19,7,6,ID=0, num_zeros=5
## P19,7,7,ID=0, num_zeros=3
## P19,7,8,ID=0, num_zeros=1
## P19,7,9,ID=0, num_zeros=1
## P19,7,10,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=11 in LISTP19[[7]]
## P19,7,12,ID=0, num_zeros=1
## P19,7,13,ID=0, num_zeros=1
## P19,7,14,ID=0, num_zeros=3
## P19,7,15,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=16 in LISTP19[[7]]
## P19,7,17,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=18 in LISTP19[[7]]
## P19,7,19,ID=0, num_zeros=1
## P19,7,20,ID=0, num_zeros=6
## P19,7,21,ID=0, num_zeros=2
## P19,7,22,ID=0, num_zeros=1
## P19,7,23,ID=0, num_zeros=2
## P19,7,24,ID=0, num_zeros=5
## P19,7,25,ID=0, num_zeros=1
## P19,7,26,ID=0, num_zeros=2
## P19,7,27,ID=0, num_zeros=3
## P19,7,28,ID=0, num_zeros=1
## P19,7,29,ID=0, num_zeros=3
## P19,7,30,ID=0, num_zeros=2
## P19,7,31,ID=0, num_zeros=4
## P19,7,32,ID=0, num_zeros=5
## P19,7,33,ID=0, num_zeros=4
## P19,7,34,ID=0, num_zeros=3
## P19,7,35,ID=0, num_zeros=3
## P19,7,36,ID=0, num_zeros=4
## P19,7,37,ID=0, num_zeros=1
## P19,7,38,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=39 in LISTP19[[7]]
## P19,7,40,ID=0, num_zeros=6
## P19,7,41,ID=0, num_zeros=1
## P19,7,42,ID=0, num_zeros=7
## P19,7,43,ID=0, num_zeros=1
## P19,7,44,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=45 in LISTP19[[7]]
## P19,7,46,ID=0, num_zeros=3
## P19,7,47,ID=0, num_zeros=1
## P19,7,48,ID=0, num_zeros=0
## P19,7,49,ID=0, num_zeros=1
## P19,7,50,ID=0, num_zeros=2
## P19,8,1,ID=0, num_zeros=11
## P19,8,2,ID=0, num_zeros=11
## P19,8,3,ID=0, num_zeros=2
## P19,8,4,ID=0, num_zeros=3
## P19,8,5,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=6 in LISTP19[[8]]
## P19,8,7,ID=0, num_zeros=3
## P19,8,8,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=9 in LISTP19[[8]]
## P19,8,10,ID=0, num_zeros=0
## P19,8,11,ID=0, num_zeros=3
## P19,8,12,ID=0, num_zeros=4
## P19,8,13,ID=0, num_zeros=0
## P19,8,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP19[[8]]
## Warning: There are no valid values for INTERVALS=16 in LISTP19[[8]]
## Warning: There are no valid values for INTERVALS=17 in LISTP19[[8]]
## P19,8,18,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=19 in LISTP19[[8]]
## P19,8,20,ID=0, num_zeros=1
## P19,8,21,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=22 in LISTP19[[8]]
## P19,8,23,ID=0, num_zeros=7
## P19,8,24,ID=0, num_zeros=5
## P19,8,25,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=26 in LISTP19[[8]]
## P19,8,27,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=28 in LISTP19[[8]]
## P19,8,29,ID=0, num_zeros=2
## P19,8,30,ID=0, num_zeros=8
## P19,8,31,ID=0, num_zeros=2
## P19,8,32,ID=0, num_zeros=8
## P19,8,33,ID=0, num_zeros=1
## P19,8,34,ID=0, num_zeros=3
## P19,8,35,ID=0, num_zeros=3
## P19,8,36,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=37 in LISTP19[[8]]
## P19,8,38,ID=0, num_zeros=0
## P19,8,39,ID=0, num_zeros=0
## P19,8,40,ID=0, num_zeros=1
## P19,8,41,ID=0, num_zeros=3
## P19,8,42,ID=0, num_zeros=0
## P19,8,43,ID=0, num_zeros=2
## P19,8,44,ID=0, num_zeros=2
## P19,8,45,ID=0, num_zeros=5
## P19,8,46,ID=0, num_zeros=2
## P19,8,47,ID=0, num_zeros=3
## P19,8,48,ID=0, num_zeros=3
## P19,8,49,ID=0, num_zeros=2
## P19,8,50,ID=0, num_zeros=7
## P19,9,1,ID=0, num_zeros=2
## P19,9,2,ID=0, num_zeros=3
## P19,9,3,ID=0, num_zeros=2
## P19,9,4,ID=0, num_zeros=5
## P19,9,5,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=6 in LISTP19[[9]]
## Warning: There are no valid values for INTERVALS=7 in LISTP19[[9]]
## P19,9,8,ID=0, num_zeros=2
## P19,9,9,ID=0, num_zeros=2
## P19,9,10,ID=0, num_zeros=3
## P19,9,11,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=12 in LISTP19[[9]]
## Warning: There are no valid values for INTERVALS=13 in LISTP19[[9]]
## Warning: There are no valid values for INTERVALS=14 in LISTP19[[9]]
## Warning: There are no valid values for INTERVALS=15 in LISTP19[[9]]
## P19,9,16,ID=0, num_zeros=1
## P19,9,17,ID=0, num_zeros=3
## P19,9,18,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=19 in LISTP19[[9]]
## P19,9,20,ID=0, num_zeros=1
## P19,9,21,ID=0, num_zeros=2
## P19,9,22,ID=0, num_zeros=2
## P19,9,23,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=24 in LISTP19[[9]]
## P19,9,25,ID=0, num_zeros=4
## P19,9,26,ID=0, num_zeros=1
## P19,9,27,ID=0, num_zeros=5
## P19,9,28,ID=0, num_zeros=1
## P19,9,29,ID=0, num_zeros=1
## P19,9,30,ID=0, num_zeros=1
## P19,9,31,ID=0, num_zeros=3
## P19,9,32,ID=0, num_zeros=1
## P19,9,33,ID=0, num_zeros=1
## P19,9,34,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=35 in LISTP19[[9]]
## Warning: There are no valid values for INTERVALS=36 in LISTP19[[9]]
## P19,9,37,ID=0, num_zeros=2
## P19,9,38,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=39 in LISTP19[[9]]
## P19,9,40,ID=0, num_zeros=3
## P19,9,41,ID=0, num_zeros=3
## P19,9,42,ID=0, num_zeros=1
## P19,9,43,ID=0, num_zeros=3
## P19,9,44,ID=0, num_zeros=1
## P19,9,45,ID=0, num_zeros=1
## P19,9,46,ID=0, num_zeros=5
## P19,9,47,ID=0, num_zeros=0
## P19,9,48,ID=0, num_zeros=2
## P19,9,49,ID=0, num_zeros=2
## P19,9,50,ID=0, num_zeros=2
## P19,10,1,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=2 in LISTP19[[10]]
## P19,10,3,ID=0, num_zeros=3
## P19,10,4,ID=0, num_zeros=6
## P19,10,5,ID=0, num_zeros=4
## P19,10,6,ID=0, num_zeros=4
## P19,10,7,ID=0, num_zeros=2
## P19,10,8,ID=0, num_zeros=1
## P19,10,9,ID=0, num_zeros=2
## P19,10,10,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=11 in LISTP19[[10]]
## P19,10,12,ID=0, num_zeros=7
## P19,10,13,ID=0, num_zeros=0
## P19,10,14,ID=0, num_zeros=6
## P19,10,15,ID=0, num_zeros=2
## P19,10,16,ID=0, num_zeros=5
## P19,10,17,ID=0, num_zeros=5
## P19,10,18,ID=0, num_zeros=8
## P19,10,19,ID=0, num_zeros=5
## P19,10,20,ID=0, num_zeros=1
## P19,10,21,ID=0, num_zeros=3
## P19,10,22,ID=0, num_zeros=2
## P19,10,23,ID=0, num_zeros=1
## P19,10,24,ID=0, num_zeros=3
## P19,10,25,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=26 in LISTP19[[10]]
## Warning: There are no valid values for INTERVALS=27 in LISTP19[[10]]
## Warning: There are no valid values for INTERVALS=28 in LISTP19[[10]]
## P19,10,29,ID=0, num_zeros=2
## P19,10,30,ID=0, num_zeros=1
## P19,10,31,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=32 in LISTP19[[10]]
## P19,10,33,ID=0, num_zeros=8
## P19,10,34,ID=0, num_zeros=8
## P19,10,35,ID=0, num_zeros=1
## P19,10,36,ID=0, num_zeros=2
## P19,10,37,ID=0, num_zeros=1
## P19,10,38,ID=0, num_zeros=2
## P19,10,39,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=40 in LISTP19[[10]]
## Warning: There are no valid values for INTERVALS=41 in LISTP19[[10]]
## P19,10,42,ID=0, num_zeros=0
## P19,10,43,ID=0, num_zeros=6
## P19,10,44,ID=0, num_zeros=4
## P19,10,45,ID=0, num_zeros=3
## P19,10,46,ID=0, num_zeros=4
## P19,10,47,ID=0, num_zeros=2
## P19,10,48,ID=0, num_zeros=2
## P19,10,49,ID=0, num_zeros=0
## P19,10,50,ID=0, num_zeros=3
## P20,1,1,ID=0, num_zeros=11
## P20,1,2,ID=0, num_zeros=6
## P20,1,3,ID=0, num_zeros=3
## P20,1,4,ID=0, num_zeros=4
## P20,1,5,ID=0, num_zeros=4
## P20,1,6,ID=0, num_zeros=4
## P20,1,7,ID=0, num_zeros=1
## P20,1,8,ID=0, num_zeros=2
## P20,1,9,ID=0, num_zeros=2
## P20,1,10,ID=0, num_zeros=3
## P20,1,11,ID=0, num_zeros=1
## P20,1,12,ID=0, num_zeros=2
## P20,1,13,ID=0, num_zeros=4
## P20,1,14,ID=0, num_zeros=1
## P20,1,15,ID=0, num_zeros=4
## P20,1,16,ID=0, num_zeros=4
## P20,1,17,ID=0, num_zeros=7
## P20,1,18,ID=0, num_zeros=1
## P20,1,19,ID=0, num_zeros=3
## P20,1,20,ID=0, num_zeros=4
## P20,1,21,ID=0, num_zeros=5
## P20,1,22,ID=0, num_zeros=5
## P20,1,23,ID=0, num_zeros=4
## P20,1,24,ID=0, num_zeros=1
## P20,1,25,ID=0, num_zeros=1
## P20,1,26,ID=0, num_zeros=1
## P20,1,27,ID=0, num_zeros=3
## P20,1,28,ID=0, num_zeros=8
## P20,1,29,ID=0, num_zeros=3
## P20,1,30,ID=0, num_zeros=6
## P20,1,31,ID=0, num_zeros=4
## P20,1,32,ID=0, num_zeros=9
## P20,1,33,ID=0, num_zeros=4
## P20,1,34,ID=0, num_zeros=2
## P20,1,35,ID=0, num_zeros=13
## P20,1,36,ID=0, num_zeros=3
## P20,1,37,ID=0, num_zeros=3
## P20,1,38,ID=0, num_zeros=3
## P20,1,39,ID=0, num_zeros=11
## P20,1,40,ID=0, num_zeros=5
## P20,1,41,ID=0, num_zeros=8
## P20,1,42,ID=0, num_zeros=12
## P20,1,43,ID=0, num_zeros=6
## P20,1,44,ID=0, num_zeros=4
## P20,1,45,ID=0, num_zeros=7
## P20,1,46,ID=0, num_zeros=4
## P20,1,47,ID=0, num_zeros=5
## P20,1,48,ID=0, num_zeros=7
## P20,1,49,ID=0, num_zeros=18
## P20,1,50,ID=0, num_zeros=182
## Warning: There are no valid values for INTERVALS=1 in LISTP20[[2]]
## P20,2,2,ID=0, num_zeros=1
## P20,2,3,ID=0, num_zeros=2
## P20,2,4,ID=0, num_zeros=2
## P20,2,5,ID=0, num_zeros=1
## P20,2,6,ID=0, num_zeros=1
## P20,2,7,ID=0, num_zeros=2
## P20,2,8,ID=0, num_zeros=3
## P20,2,9,ID=0, num_zeros=1
## P20,2,10,ID=0, num_zeros=2
## P20,2,11,ID=0, num_zeros=5
## P20,2,12,ID=0, num_zeros=3
## P20,2,13,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=14 in LISTP20[[2]]
## P20,2,15,ID=0, num_zeros=5
## P20,2,16,ID=0, num_zeros=7
## P20,2,17,ID=0, num_zeros=1
## P20,2,18,ID=0, num_zeros=4
## P20,2,19,ID=0, num_zeros=2
## P20,2,20,ID=0, num_zeros=5
## P20,2,21,ID=0, num_zeros=5
## P20,2,22,ID=0, num_zeros=9
## P20,2,23,ID=0, num_zeros=0
## P20,2,24,ID=0, num_zeros=14
## P20,2,25,ID=0, num_zeros=5
## P20,2,26,ID=0, num_zeros=2
## P20,2,27,ID=0, num_zeros=3
## P20,2,28,ID=0, num_zeros=4
## P20,2,29,ID=0, num_zeros=6
## P20,2,30,ID=0, num_zeros=6
## P20,2,31,ID=0, num_zeros=7
## P20,2,32,ID=0, num_zeros=5
## P20,2,33,ID=0, num_zeros=4
## P20,2,34,ID=0, num_zeros=3
## P20,2,35,ID=0, num_zeros=1
## P20,2,36,ID=0, num_zeros=3
## P20,2,37,ID=0, num_zeros=2
## P20,2,38,ID=0, num_zeros=9
## P20,2,39,ID=0, num_zeros=1
## P20,2,40,ID=0, num_zeros=1
## P20,2,41,ID=0, num_zeros=5
## P20,2,42,ID=0, num_zeros=0
## P20,2,43,ID=0, num_zeros=2
## P20,2,44,ID=0, num_zeros=9
## P20,2,45,ID=0, num_zeros=3
## P20,2,46,ID=0, num_zeros=1
## P20,2,47,ID=0, num_zeros=3
## P20,2,48,ID=0, num_zeros=12
## P20,2,49,ID=0, num_zeros=9
## P20,2,50,ID=0, num_zeros=54
## P20,3,1,ID=0, num_zeros=1
## P20,3,2,ID=0, num_zeros=7
## P20,3,3,ID=0, num_zeros=7
## P20,3,4,ID=0, num_zeros=10
## P20,3,5,ID=0, num_zeros=8
## P20,3,6,ID=0, num_zeros=2
## P20,3,7,ID=0, num_zeros=5
## P20,3,8,ID=0, num_zeros=3
## P20,3,9,ID=0, num_zeros=2
## P20,3,10,ID=0, num_zeros=1
## P20,3,11,ID=0, num_zeros=6
## P20,3,12,ID=0, num_zeros=1
## P20,3,13,ID=0, num_zeros=2
## P20,3,14,ID=0, num_zeros=4
## P20,3,15,ID=0, num_zeros=7
## P20,3,16,ID=0, num_zeros=9
## P20,3,17,ID=0, num_zeros=9
## P20,3,18,ID=0, num_zeros=1
## P20,3,19,ID=0, num_zeros=10
## P20,3,20,ID=0, num_zeros=3
## P20,3,21,ID=0, num_zeros=8
## P20,3,22,ID=0, num_zeros=3
## P20,3,23,ID=0, num_zeros=7
## P20,3,24,ID=0, num_zeros=1
## P20,3,25,ID=0, num_zeros=2
## P20,3,26,ID=0, num_zeros=4
## P20,3,27,ID=0, num_zeros=3
## P20,3,28,ID=0, num_zeros=7
## P20,3,29,ID=0, num_zeros=3
## P20,3,30,ID=0, num_zeros=5
## P20,3,31,ID=0, num_zeros=13
## P20,3,32,ID=0, num_zeros=6
## P20,3,33,ID=0, num_zeros=1
## P20,3,34,ID=0, num_zeros=7
## P20,3,35,ID=0, num_zeros=7
## P20,3,36,ID=0, num_zeros=12
## P20,3,37,ID=0, num_zeros=4
## P20,3,38,ID=0, num_zeros=4
## P20,3,39,ID=0, num_zeros=4
## P20,3,40,ID=0, num_zeros=6
## P20,3,41,ID=0, num_zeros=3
## P20,3,42,ID=0, num_zeros=0
## P20,3,43,ID=0, num_zeros=3
## P20,3,44,ID=0, num_zeros=1
## P20,3,45,ID=0, num_zeros=1
## P20,3,46,ID=0, num_zeros=2
## P20,3,47,ID=0, num_zeros=3
## P20,3,48,ID=0, num_zeros=5
## P20,3,49,ID=0, num_zeros=3
## P20,3,50,ID=0, num_zeros=54
## P20,4,1,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=2 in LISTP20[[4]]
## P20,4,3,ID=0, num_zeros=2
## P20,4,4,ID=0, num_zeros=13
## P20,4,5,ID=0, num_zeros=4
## P20,4,6,ID=0, num_zeros=8
## P20,4,7,ID=0, num_zeros=2
## P20,4,8,ID=0, num_zeros=8
## P20,4,9,ID=0, num_zeros=0
## P20,4,10,ID=0, num_zeros=5
## P20,4,11,ID=0, num_zeros=6
## P20,4,12,ID=0, num_zeros=3
## P20,4,13,ID=0, num_zeros=6
## P20,4,14,ID=0, num_zeros=2
## P20,4,15,ID=0, num_zeros=3
## P20,4,16,ID=0, num_zeros=7
## P20,4,17,ID=0, num_zeros=6
## P20,4,18,ID=0, num_zeros=6
## P20,4,19,ID=0, num_zeros=5
## P20,4,20,ID=0, num_zeros=5
## P20,4,21,ID=0, num_zeros=12
## P20,4,22,ID=0, num_zeros=5
## P20,4,23,ID=0, num_zeros=12
## P20,4,24,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=25 in LISTP20[[4]]
## P20,4,26,ID=0, num_zeros=0
## P20,4,27,ID=0, num_zeros=13
## P20,4,28,ID=0, num_zeros=5
## P20,4,29,ID=0, num_zeros=4
## P20,4,30,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=31 in LISTP20[[4]]
## P20,4,32,ID=0, num_zeros=2
## P20,4,33,ID=0, num_zeros=0
## P20,4,34,ID=0, num_zeros=2
## P20,4,35,ID=0, num_zeros=6
## P20,4,36,ID=0, num_zeros=8
## P20,4,37,ID=0, num_zeros=0
## P20,4,38,ID=0, num_zeros=3
## P20,4,39,ID=0, num_zeros=6
## P20,4,40,ID=0, num_zeros=2
## P20,4,41,ID=0, num_zeros=2
## P20,4,42,ID=0, num_zeros=1
## P20,4,43,ID=0, num_zeros=4
## P20,4,44,ID=0, num_zeros=3
## P20,4,45,ID=0, num_zeros=11
## P20,4,46,ID=0, num_zeros=5
## P20,4,47,ID=0, num_zeros=4
## P20,4,48,ID=0, num_zeros=3
## P20,4,49,ID=0, num_zeros=5
## P20,4,50,ID=0, num_zeros=19
## P20,5,1,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=2 in LISTP20[[5]]
## Warning: There are no valid values for INTERVALS=3 in LISTP20[[5]]
## P20,5,4,ID=0, num_zeros=1
## P20,5,5,ID=0, num_zeros=2
## P20,5,6,ID=0, num_zeros=4
## P20,5,7,ID=0, num_zeros=2
## P20,5,8,ID=0, num_zeros=2
## P20,5,9,ID=0, num_zeros=4
## P20,5,10,ID=0, num_zeros=4
## P20,5,11,ID=0, num_zeros=3
## P20,5,12,ID=0, num_zeros=4
## P20,5,13,ID=0, num_zeros=1
## P20,5,14,ID=0, num_zeros=2
## P20,5,15,ID=0, num_zeros=3
## P20,5,16,ID=0, num_zeros=0
## P20,5,17,ID=0, num_zeros=2
## P20,5,18,ID=0, num_zeros=3
## P20,5,19,ID=0, num_zeros=4
## P20,5,20,ID=0, num_zeros=4
## P20,5,21,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=22 in LISTP20[[5]]
## P20,5,23,ID=0, num_zeros=2
## P20,5,24,ID=0, num_zeros=4
## P20,5,25,ID=0, num_zeros=1
## P20,5,26,ID=0, num_zeros=9
## P20,5,27,ID=0, num_zeros=1
## P20,5,28,ID=0, num_zeros=4
## P20,5,29,ID=0, num_zeros=2
## P20,5,30,ID=0, num_zeros=9
## P20,5,31,ID=0, num_zeros=3
## P20,5,32,ID=0, num_zeros=7
## P20,5,33,ID=0, num_zeros=3
## P20,5,34,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=35 in LISTP20[[5]]
## P20,5,36,ID=0, num_zeros=4
## P20,5,37,ID=0, num_zeros=2
## P20,5,38,ID=0, num_zeros=4
## P20,5,39,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=40 in LISTP20[[5]]
## P20,5,41,ID=0, num_zeros=5
## P20,5,42,ID=0, num_zeros=1
## P20,5,43,ID=0, num_zeros=5
## P20,5,44,ID=0, num_zeros=7
## P20,5,45,ID=0, num_zeros=5
## P20,5,46,ID=0, num_zeros=3
## P20,5,47,ID=0, num_zeros=1
## P20,5,48,ID=0, num_zeros=1
## P20,5,49,ID=0, num_zeros=2
## P20,5,50,ID=0, num_zeros=13
## P20,6,1,ID=0, num_zeros=2
## P20,6,2,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=3 in LISTP20[[6]]
## P20,6,4,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=5 in LISTP20[[6]]
## P20,6,6,ID=0, num_zeros=5
## P20,6,7,ID=0, num_zeros=4
## P20,6,8,ID=0, num_zeros=2
## P20,6,9,ID=0, num_zeros=4
## P20,6,10,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=11 in LISTP20[[6]]
## Warning: There are no valid values for INTERVALS=12 in LISTP20[[6]]
## Warning: There are no valid values for INTERVALS=13 in LISTP20[[6]]
## P20,6,14,ID=0, num_zeros=4
## P20,6,15,ID=0, num_zeros=3
## P20,6,16,ID=0, num_zeros=6
## P20,6,17,ID=0, num_zeros=2
## P20,6,18,ID=0, num_zeros=2
## P20,6,19,ID=0, num_zeros=4
## P20,6,20,ID=0, num_zeros=8
## P20,6,21,ID=0, num_zeros=7
## P20,6,22,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=23 in LISTP20[[6]]
## P20,6,24,ID=0, num_zeros=1
## P20,6,25,ID=0, num_zeros=4
## P20,6,26,ID=0, num_zeros=0
## P20,6,27,ID=0, num_zeros=1
## P20,6,28,ID=0, num_zeros=1
## P20,6,29,ID=0, num_zeros=2
## P20,6,30,ID=0, num_zeros=1
## P20,6,31,ID=0, num_zeros=9
## P20,6,32,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=33 in LISTP20[[6]]
## P20,6,34,ID=0, num_zeros=3
## P20,6,35,ID=0, num_zeros=1
## P20,6,36,ID=0, num_zeros=2
## P20,6,37,ID=0, num_zeros=8
## P20,6,38,ID=0, num_zeros=3
## P20,6,39,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=40 in LISTP20[[6]]
## P20,6,41,ID=0, num_zeros=1
## P20,6,42,ID=0, num_zeros=0
## P20,6,43,ID=0, num_zeros=3
## P20,6,44,ID=0, num_zeros=0
## P20,6,45,ID=0, num_zeros=5
## P20,6,46,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=47 in LISTP20[[6]]
## P20,6,48,ID=0, num_zeros=2
## P20,6,49,ID=0, num_zeros=1
## P20,6,50,ID=0, num_zeros=35
## Warning: There are no valid values for INTERVALS=1 in LISTP20[[7]]
## P20,7,2,ID=0, num_zeros=3
## P20,7,3,ID=0, num_zeros=6
## P20,7,4,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=5 in LISTP20[[7]]
## P20,7,6,ID=0, num_zeros=1
## P20,7,7,ID=0, num_zeros=2
## P20,7,8,ID=0, num_zeros=0
## P20,7,9,ID=0, num_zeros=3
## P20,7,10,ID=0, num_zeros=1
## P20,7,11,ID=0, num_zeros=5
## P20,7,12,ID=0, num_zeros=2
## P20,7,13,ID=0, num_zeros=3
## P20,7,14,ID=0, num_zeros=2
## P20,7,15,ID=0, num_zeros=2
## P20,7,16,ID=0, num_zeros=4
## P20,7,17,ID=0, num_zeros=1
## P20,7,18,ID=0, num_zeros=3
## P20,7,19,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=20 in LISTP20[[7]]
## P20,7,21,ID=0, num_zeros=2
## P20,7,22,ID=0, num_zeros=1
## P20,7,23,ID=0, num_zeros=5
## P20,7,24,ID=0, num_zeros=4
## P20,7,25,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=26 in LISTP20[[7]]
## P20,7,27,ID=0, num_zeros=1
## P20,7,28,ID=0, num_zeros=4
## P20,7,29,ID=0, num_zeros=0
## P20,7,30,ID=0, num_zeros=4
## P20,7,31,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=32 in LISTP20[[7]]
## P20,7,33,ID=0, num_zeros=1
## P20,7,34,ID=0, num_zeros=3
## P20,7,35,ID=0, num_zeros=5
## P20,7,36,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=37 in LISTP20[[7]]
## P20,7,38,ID=0, num_zeros=3
## P20,7,39,ID=0, num_zeros=3
## P20,7,40,ID=0, num_zeros=1
## P20,7,41,ID=0, num_zeros=3
## P20,7,42,ID=0, num_zeros=4
## P20,7,43,ID=0, num_zeros=3
## P20,7,44,ID=0, num_zeros=3
## P20,7,45,ID=0, num_zeros=8
## P20,7,46,ID=0, num_zeros=13
## P20,7,47,ID=0, num_zeros=7
## P20,7,48,ID=0, num_zeros=4
## P20,7,49,ID=0, num_zeros=9
## P20,7,50,ID=0, num_zeros=23
## P20,8,1,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=2 in LISTP20[[8]]
## P20,8,3,ID=0, num_zeros=3
## P20,8,4,ID=0, num_zeros=0
## P20,8,5,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=6 in LISTP20[[8]]
## P20,8,7,ID=0, num_zeros=8
## P20,8,8,ID=0, num_zeros=2
## P20,8,9,ID=0, num_zeros=9
## P20,8,10,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=11 in LISTP20[[8]]
## P20,8,12,ID=0, num_zeros=0
## P20,8,13,ID=0, num_zeros=1
## P20,8,14,ID=0, num_zeros=1
## P20,8,15,ID=0, num_zeros=1
## P20,8,16,ID=0, num_zeros=6
## P20,8,17,ID=0, num_zeros=7
## P20,8,18,ID=0, num_zeros=1
## P20,8,19,ID=0, num_zeros=2
## P20,8,20,ID=0, num_zeros=2
## P20,8,21,ID=0, num_zeros=5
## P20,8,22,ID=0, num_zeros=4
## P20,8,23,ID=0, num_zeros=2
## P20,8,24,ID=0, num_zeros=5
## P20,8,25,ID=0, num_zeros=5
## P20,8,26,ID=0, num_zeros=3
## P20,8,27,ID=0, num_zeros=3
## P20,8,28,ID=0, num_zeros=2
## P20,8,29,ID=0, num_zeros=2
## P20,8,30,ID=0, num_zeros=2
## P20,8,31,ID=0, num_zeros=6
## P20,8,32,ID=0, num_zeros=2
## P20,8,33,ID=0, num_zeros=3
## P20,8,34,ID=0, num_zeros=3
## P20,8,35,ID=0, num_zeros=4
## P20,8,36,ID=0, num_zeros=3
## P20,8,37,ID=0, num_zeros=0
## P20,8,38,ID=0, num_zeros=3
## P20,8,39,ID=0, num_zeros=3
## P20,8,40,ID=0, num_zeros=8
## P20,8,41,ID=0, num_zeros=1
## P20,8,42,ID=0, num_zeros=2
## P20,8,43,ID=0, num_zeros=1
## P20,8,44,ID=0, num_zeros=4
## P20,8,45,ID=0, num_zeros=2
## P20,8,46,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=47 in LISTP20[[8]]
## P20,8,48,ID=0, num_zeros=3
## P20,8,49,ID=0, num_zeros=4
## P20,8,50,ID=0, num_zeros=24
## P20,9,1,ID=0, num_zeros=2
## P20,9,2,ID=0, num_zeros=3
## P20,9,3,ID=0, num_zeros=3
## P20,9,4,ID=0, num_zeros=1
## P20,9,5,ID=0, num_zeros=3
## P20,9,6,ID=0, num_zeros=1
## P20,9,7,ID=0, num_zeros=1
## P20,9,8,ID=0, num_zeros=5
## P20,9,9,ID=0, num_zeros=3
## P20,9,10,ID=0, num_zeros=4
## P20,9,11,ID=0, num_zeros=3
## P20,9,12,ID=0, num_zeros=3
## P20,9,13,ID=0, num_zeros=7
## P20,9,14,ID=0, num_zeros=9
## P20,9,15,ID=0, num_zeros=6
## P20,9,16,ID=0, num_zeros=3
## P20,9,17,ID=0, num_zeros=8
## P20,9,18,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=19 in LISTP20[[9]]
## P20,9,20,ID=0, num_zeros=3
## P20,9,21,ID=0, num_zeros=8
## P20,9,22,ID=0, num_zeros=3
## P20,9,23,ID=0, num_zeros=2
## P20,9,24,ID=0, num_zeros=5
## P20,9,25,ID=0, num_zeros=9
## P20,9,26,ID=0, num_zeros=6
## P20,9,27,ID=0, num_zeros=9
## P20,9,28,ID=0, num_zeros=2
## P20,9,29,ID=0, num_zeros=5
## P20,9,30,ID=0, num_zeros=6
## P20,9,31,ID=0, num_zeros=1
## P20,9,32,ID=0, num_zeros=4
## P20,9,33,ID=0, num_zeros=3
## P20,9,34,ID=0, num_zeros=2
## P20,9,35,ID=0, num_zeros=4
## P20,9,36,ID=0, num_zeros=9
## P20,9,37,ID=0, num_zeros=5
## P20,9,38,ID=0, num_zeros=4
## P20,9,39,ID=0, num_zeros=1
## P20,9,40,ID=0, num_zeros=10
## P20,9,41,ID=0, num_zeros=2
## P20,9,42,ID=0, num_zeros=1
## P20,9,43,ID=0, num_zeros=6
## P20,9,44,ID=0, num_zeros=1
## P20,9,45,ID=0, num_zeros=10
## P20,9,46,ID=0, num_zeros=3
## P20,9,47,ID=0, num_zeros=5
## P20,9,48,ID=0, num_zeros=4
## P20,9,49,ID=0, num_zeros=5
## P20,9,50,ID=0, num_zeros=15
## P20,10,1,ID=0, num_zeros=8
## P20,10,2,ID=0, num_zeros=4
## P20,10,3,ID=0, num_zeros=1
## P20,10,4,ID=0, num_zeros=2
## P20,10,5,ID=0, num_zeros=5
## P20,10,6,ID=0, num_zeros=1
## P20,10,7,ID=0, num_zeros=9
## P20,10,8,ID=0, num_zeros=6
## P20,10,9,ID=0, num_zeros=10
## P20,10,10,ID=0, num_zeros=3
## P20,10,11,ID=0, num_zeros=2
## P20,10,12,ID=0, num_zeros=2
## P20,10,13,ID=0, num_zeros=4
## P20,10,14,ID=0, num_zeros=2
## P20,10,15,ID=0, num_zeros=2
## P20,10,16,ID=0, num_zeros=3
## P20,10,17,ID=0, num_zeros=1
## P20,10,18,ID=0, num_zeros=4
## P20,10,19,ID=0, num_zeros=1
## P20,10,20,ID=0, num_zeros=0
## P20,10,21,ID=0, num_zeros=10
## P20,10,22,ID=0, num_zeros=1
## P20,10,23,ID=0, num_zeros=3
## P20,10,24,ID=0, num_zeros=3
## P20,10,25,ID=0, num_zeros=3
## P20,10,26,ID=0, num_zeros=4
## P20,10,27,ID=0, num_zeros=4
## P20,10,28,ID=0, num_zeros=2
## P20,10,29,ID=0, num_zeros=3
## P20,10,30,ID=0, num_zeros=1
## P20,10,31,ID=0, num_zeros=1
## P20,10,32,ID=0, num_zeros=4
## P20,10,33,ID=0, num_zeros=4
## P20,10,34,ID=0, num_zeros=3
## P20,10,35,ID=0, num_zeros=2
## P20,10,36,ID=0, num_zeros=2
## P20,10,37,ID=0, num_zeros=5
## P20,10,38,ID=0, num_zeros=2
## P20,10,39,ID=0, num_zeros=1
## P20,10,40,ID=0, num_zeros=3
## P20,10,41,ID=0, num_zeros=5
## P20,10,42,ID=0, num_zeros=9
## P20,10,43,ID=0, num_zeros=3
## P20,10,44,ID=0, num_zeros=4
## P20,10,45,ID=0, num_zeros=2
## P20,10,46,ID=0, num_zeros=4
## P20,10,47,ID=0, num_zeros=1
## P20,10,48,ID=0, num_zeros=5
## P20,10,49,ID=0, num_zeros=3
## P20,10,50,ID=0, num_zeros=10
## P21,1,1,ID=0, num_zeros=4
## P21,1,2,ID=0, num_zeros=11
## P21,1,3,ID=0, num_zeros=5
## P21,1,4,ID=0, num_zeros=7
## P21,1,5,ID=0, num_zeros=7
## P21,1,6,ID=0, num_zeros=1
## P21,1,7,ID=0, num_zeros=4
## P21,1,8,ID=0, num_zeros=4
## P21,1,9,ID=0, num_zeros=2
## P21,1,10,ID=0, num_zeros=6
## P21,1,11,ID=0, num_zeros=5
## P21,1,12,ID=0, num_zeros=10
## P21,1,13,ID=0, num_zeros=7
## P21,1,14,ID=0, num_zeros=5
## P21,1,15,ID=0, num_zeros=2
## P21,1,16,ID=0, num_zeros=4
## P21,1,17,ID=0, num_zeros=8
## P21,1,18,ID=0, num_zeros=3
## P21,1,19,ID=0, num_zeros=6
## P21,1,20,ID=0, num_zeros=12
## P21,1,21,ID=0, num_zeros=13
## P21,1,22,ID=0, num_zeros=8
## P21,1,23,ID=0, num_zeros=3
## P21,1,24,ID=0, num_zeros=10
## P21,1,25,ID=0, num_zeros=17
## P21,1,26,ID=0, num_zeros=8
## P21,1,27,ID=0, num_zeros=6
## P21,1,28,ID=0, num_zeros=5
## P21,1,29,ID=0, num_zeros=4
## P21,1,30,ID=0, num_zeros=12
## P21,1,31,ID=0, num_zeros=1
## P21,1,32,ID=0, num_zeros=2
## P21,1,33,ID=0, num_zeros=2
## P21,1,34,ID=0, num_zeros=9
## P21,1,35,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=36 in LISTP21[[1]]
## P21,1,37,ID=0, num_zeros=8
## P21,1,38,ID=0, num_zeros=4
## P21,1,39,ID=0, num_zeros=3
## P21,1,40,ID=0, num_zeros=11
## P21,1,41,ID=0, num_zeros=1
## P21,1,42,ID=0, num_zeros=1
## P21,1,43,ID=0, num_zeros=7
## P21,1,44,ID=0, num_zeros=11
## P21,1,45,ID=0, num_zeros=4
## P21,1,46,ID=0, num_zeros=1
## P21,1,47,ID=0, num_zeros=4
## P21,1,48,ID=0, num_zeros=5
## P21,1,49,ID=0, num_zeros=9
## P21,1,50,ID=0, num_zeros=10
## P21,2,1,ID=0, num_zeros=6
## P21,2,2,ID=0, num_zeros=2
## P21,2,3,ID=0, num_zeros=9
## P21,2,4,ID=0, num_zeros=4
## P21,2,5,ID=0, num_zeros=1
## P21,2,6,ID=0, num_zeros=8
## P21,2,7,ID=0, num_zeros=4
## P21,2,8,ID=0, num_zeros=6
## P21,2,9,ID=0, num_zeros=6
## P21,2,10,ID=0, num_zeros=5
## P21,2,11,ID=0, num_zeros=15
## P21,2,12,ID=0, num_zeros=2
## P21,2,13,ID=0, num_zeros=5
## P21,2,14,ID=0, num_zeros=5
## P21,2,15,ID=0, num_zeros=4
## P21,2,16,ID=0, num_zeros=3
## P21,2,17,ID=0, num_zeros=12
## P21,2,18,ID=0, num_zeros=2
## P21,2,19,ID=0, num_zeros=4
## P21,2,20,ID=0, num_zeros=7
## P21,2,21,ID=0, num_zeros=1
## P21,2,22,ID=0, num_zeros=4
## P21,2,23,ID=0, num_zeros=4
## P21,2,24,ID=0, num_zeros=4
## P21,2,25,ID=0, num_zeros=4
## P21,2,26,ID=0, num_zeros=4
## P21,2,27,ID=0, num_zeros=5
## P21,2,28,ID=0, num_zeros=6
## P21,2,29,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=30 in LISTP21[[2]]
## P21,2,31,ID=0, num_zeros=6
## P21,2,32,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=33 in LISTP21[[2]]
## P21,2,34,ID=0, num_zeros=12
## P21,2,35,ID=0, num_zeros=4
## P21,2,36,ID=0, num_zeros=4
## P21,2,37,ID=0, num_zeros=5
## P21,2,38,ID=0, num_zeros=1
## P21,2,39,ID=0, num_zeros=2
## P21,2,40,ID=0, num_zeros=11
## P21,2,41,ID=0, num_zeros=4
## P21,2,42,ID=0, num_zeros=1
## P21,2,43,ID=0, num_zeros=9
## P21,2,44,ID=0, num_zeros=9
## P21,2,45,ID=0, num_zeros=3
## P21,2,46,ID=0, num_zeros=6
## P21,2,47,ID=0, num_zeros=7
## P21,2,48,ID=0, num_zeros=6
## P21,2,49,ID=0, num_zeros=7
## P21,2,50,ID=0, num_zeros=10
## P21,3,1,ID=0, num_zeros=4
## P21,3,2,ID=0, num_zeros=4
## P21,3,3,ID=0, num_zeros=1
## P21,3,4,ID=0, num_zeros=4
## P21,3,5,ID=0, num_zeros=8
## P21,3,6,ID=0, num_zeros=1
## P21,3,7,ID=0, num_zeros=3
## P21,3,8,ID=0, num_zeros=1
## P21,3,9,ID=0, num_zeros=2
## P21,3,10,ID=0, num_zeros=4
## P21,3,11,ID=0, num_zeros=1
## P21,3,12,ID=0, num_zeros=4
## P21,3,13,ID=0, num_zeros=3
## P21,3,14,ID=0, num_zeros=8
## P21,3,15,ID=0, num_zeros=2
## P21,3,16,ID=0, num_zeros=3
## P21,3,17,ID=0, num_zeros=2
## P21,3,18,ID=0, num_zeros=14
## P21,3,19,ID=0, num_zeros=8
## P21,3,20,ID=0, num_zeros=4
## P21,3,21,ID=0, num_zeros=5
## P21,3,22,ID=0, num_zeros=7
## P21,3,23,ID=0, num_zeros=11
## P21,3,24,ID=0, num_zeros=6
## P21,3,25,ID=0, num_zeros=11
## P21,3,26,ID=0, num_zeros=11
## P21,3,27,ID=0, num_zeros=6
## P21,3,28,ID=0, num_zeros=4
## P21,3,29,ID=0, num_zeros=2
## P21,3,30,ID=0, num_zeros=0
## P21,3,31,ID=0, num_zeros=8
## P21,3,32,ID=0, num_zeros=8
## P21,3,33,ID=0, num_zeros=4
## P21,3,34,ID=0, num_zeros=9
## P21,3,35,ID=0, num_zeros=5
## P21,3,36,ID=0, num_zeros=5
## P21,3,37,ID=0, num_zeros=5
## P21,3,38,ID=0, num_zeros=11
## P21,3,39,ID=0, num_zeros=1
## P21,3,40,ID=0, num_zeros=2
## P21,3,41,ID=0, num_zeros=3
## P21,3,42,ID=0, num_zeros=0
## P21,3,43,ID=0, num_zeros=15
## P21,3,44,ID=0, num_zeros=13
## P21,3,45,ID=0, num_zeros=6
## P21,3,46,ID=0, num_zeros=6
## P21,3,47,ID=0, num_zeros=8
## P21,3,48,ID=0, num_zeros=2
## P21,3,49,ID=0, num_zeros=3
## P21,3,50,ID=0, num_zeros=9
## P21,4,1,ID=0, num_zeros=1
## P21,4,2,ID=0, num_zeros=2
## P21,4,3,ID=0, num_zeros=2
## P21,4,4,ID=0, num_zeros=5
## P21,4,5,ID=0, num_zeros=8
## P21,4,6,ID=0, num_zeros=5
## P21,4,7,ID=0, num_zeros=4
## P21,4,8,ID=0, num_zeros=1
## P21,4,9,ID=0, num_zeros=1
## P21,4,10,ID=0, num_zeros=6
## P21,4,11,ID=0, num_zeros=5
## P21,4,12,ID=0, num_zeros=1
## P21,4,13,ID=0, num_zeros=1
## P21,4,14,ID=0, num_zeros=5
## P21,4,15,ID=0, num_zeros=5
## P21,4,16,ID=0, num_zeros=5
## P21,4,17,ID=0, num_zeros=2
## P21,4,18,ID=0, num_zeros=3
## P21,4,19,ID=0, num_zeros=8
## P21,4,20,ID=0, num_zeros=3
## P21,4,21,ID=0, num_zeros=4
## P21,4,22,ID=0, num_zeros=2
## P21,4,23,ID=0, num_zeros=15
## P21,4,24,ID=0, num_zeros=6
## P21,4,25,ID=0, num_zeros=5
## P21,4,26,ID=0, num_zeros=8
## P21,4,27,ID=0, num_zeros=3
## P21,4,28,ID=0, num_zeros=1
## P21,4,29,ID=0, num_zeros=2
## P21,4,30,ID=0, num_zeros=2
## P21,4,31,ID=0, num_zeros=2
## P21,4,32,ID=0, num_zeros=1
## P21,4,33,ID=0, num_zeros=1
## P21,4,34,ID=0, num_zeros=5
## P21,4,35,ID=0, num_zeros=4
## P21,4,36,ID=0, num_zeros=5
## P21,4,37,ID=0, num_zeros=4
## P21,4,38,ID=0, num_zeros=1
## P21,4,39,ID=0, num_zeros=0
## P21,4,40,ID=0, num_zeros=1
## P21,4,41,ID=0, num_zeros=1
## P21,4,42,ID=0, num_zeros=3
## P21,4,43,ID=0, num_zeros=3
## P21,4,44,ID=0, num_zeros=6
## P21,4,45,ID=0, num_zeros=2
## P21,4,46,ID=0, num_zeros=1
## P21,4,47,ID=0, num_zeros=5
## P21,4,48,ID=0, num_zeros=3
## P21,4,49,ID=0, num_zeros=6
## P21,4,50,ID=0, num_zeros=7
## P21,5,1,ID=0, num_zeros=7
## P21,5,2,ID=0, num_zeros=4
## P21,5,3,ID=0, num_zeros=3
## P21,5,4,ID=0, num_zeros=1
## P21,5,5,ID=0, num_zeros=7
## P21,5,6,ID=0, num_zeros=8
## P21,5,7,ID=0, num_zeros=2
## P21,5,8,ID=0, num_zeros=2
## P21,5,9,ID=0, num_zeros=6
## P21,5,10,ID=0, num_zeros=3
## P21,5,11,ID=0, num_zeros=2
## P21,5,12,ID=0, num_zeros=8
## P21,5,13,ID=0, num_zeros=6
## P21,5,14,ID=0, num_zeros=7
## P21,5,15,ID=0, num_zeros=3
## P21,5,16,ID=0, num_zeros=3
## P21,5,17,ID=0, num_zeros=8
## P21,5,18,ID=0, num_zeros=4
## P21,5,19,ID=0, num_zeros=2
## P21,5,20,ID=0, num_zeros=7
## P21,5,21,ID=0, num_zeros=2
## P21,5,22,ID=0, num_zeros=6
## P21,5,23,ID=0, num_zeros=2
## P21,5,24,ID=0, num_zeros=2
## P21,5,25,ID=0, num_zeros=1
## P21,5,26,ID=0, num_zeros=4
## P21,5,27,ID=0, num_zeros=0
## P21,5,28,ID=0, num_zeros=1
## P21,5,29,ID=0, num_zeros=4
## P21,5,30,ID=0, num_zeros=7
## P21,5,31,ID=0, num_zeros=8
## P21,5,32,ID=0, num_zeros=1
## P21,5,33,ID=0, num_zeros=5
## P21,5,34,ID=0, num_zeros=7
## P21,5,35,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=36 in LISTP21[[5]]
## P21,5,37,ID=0, num_zeros=4
## P21,5,38,ID=0, num_zeros=4
## P21,5,39,ID=0, num_zeros=1
## P21,5,40,ID=0, num_zeros=7
## P21,5,41,ID=0, num_zeros=7
## P21,5,42,ID=0, num_zeros=2
## P21,5,43,ID=0, num_zeros=5
## P21,5,44,ID=0, num_zeros=9
## P21,5,45,ID=0, num_zeros=6
## P21,5,46,ID=0, num_zeros=4
## P21,5,47,ID=0, num_zeros=3
## P21,5,48,ID=0, num_zeros=1
## P21,5,49,ID=0, num_zeros=4
## P21,5,50,ID=0, num_zeros=4
## P21,6,1,ID=0, num_zeros=1
## P21,6,2,ID=0, num_zeros=5
## P21,6,3,ID=0, num_zeros=2
## P21,6,4,ID=0, num_zeros=2
## P21,6,5,ID=0, num_zeros=5
## P21,6,6,ID=0, num_zeros=5
## P21,6,7,ID=0, num_zeros=3
## P21,6,8,ID=0, num_zeros=4
## P21,6,9,ID=0, num_zeros=7
## P21,6,10,ID=0, num_zeros=2
## P21,6,11,ID=0, num_zeros=3
## P21,6,12,ID=0, num_zeros=1
## P21,6,13,ID=0, num_zeros=5
## P21,6,14,ID=0, num_zeros=6
## P21,6,15,ID=0, num_zeros=7
## P21,6,16,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=17 in LISTP21[[6]]
## P21,6,18,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=19 in LISTP21[[6]]
## P21,6,20,ID=0, num_zeros=1
## P21,6,21,ID=0, num_zeros=4
## P21,6,22,ID=0, num_zeros=7
## P21,6,23,ID=0, num_zeros=4
## P21,6,24,ID=0, num_zeros=6
## P21,6,25,ID=0, num_zeros=1
## P21,6,26,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=27 in LISTP21[[6]]
## P21,6,28,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=29 in LISTP21[[6]]
## P21,6,30,ID=0, num_zeros=4
## P21,6,31,ID=0, num_zeros=3
## P21,6,32,ID=0, num_zeros=11
## P21,6,33,ID=0, num_zeros=10
## P21,6,34,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=35 in LISTP21[[6]]
## P21,6,36,ID=0, num_zeros=7
## P21,6,37,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=38 in LISTP21[[6]]
## P21,6,39,ID=0, num_zeros=2
## P21,6,40,ID=0, num_zeros=3
## P21,6,41,ID=0, num_zeros=1
## P21,6,42,ID=0, num_zeros=2
## P21,6,43,ID=0, num_zeros=6
## P21,6,44,ID=0, num_zeros=3
## P21,6,45,ID=0, num_zeros=4
## P21,6,46,ID=0, num_zeros=1
## P21,6,47,ID=0, num_zeros=2
## P21,6,48,ID=0, num_zeros=1
## P21,6,49,ID=0, num_zeros=3
## P21,6,50,ID=0, num_zeros=8
## P21,7,1,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=2 in LISTP21[[7]]
## P21,7,3,ID=0, num_zeros=3
## P21,7,4,ID=0, num_zeros=5
## P21,7,5,ID=0, num_zeros=2
## P21,7,6,ID=0, num_zeros=3
## P21,7,7,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=8 in LISTP21[[7]]
## P21,7,9,ID=0, num_zeros=6
## P21,7,10,ID=0, num_zeros=2
## P21,7,11,ID=0, num_zeros=5
## P21,7,12,ID=0, num_zeros=6
## P21,7,13,ID=0, num_zeros=7
## P21,7,14,ID=0, num_zeros=5
## P21,7,15,ID=0, num_zeros=5
## P21,7,16,ID=0, num_zeros=5
## P21,7,17,ID=0, num_zeros=2
## P21,7,18,ID=0, num_zeros=8
## P21,7,19,ID=0, num_zeros=5
## P21,7,20,ID=0, num_zeros=3
## P21,7,21,ID=0, num_zeros=3
## P21,7,22,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=23 in LISTP21[[7]]
## P21,7,24,ID=0, num_zeros=4
## P21,7,25,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=26 in LISTP21[[7]]
## P21,7,27,ID=0, num_zeros=2
## P21,7,28,ID=0, num_zeros=3
## P21,7,29,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=30 in LISTP21[[7]]
## P21,7,31,ID=0, num_zeros=3
## P21,7,32,ID=0, num_zeros=5
## P21,7,33,ID=0, num_zeros=2
## P21,7,34,ID=0, num_zeros=3
## P21,7,35,ID=0, num_zeros=3
## P21,7,36,ID=0, num_zeros=4
## P21,7,37,ID=0, num_zeros=3
## P21,7,38,ID=0, num_zeros=4
## P21,7,39,ID=0, num_zeros=3
## P21,7,40,ID=0, num_zeros=0
## P21,7,41,ID=0, num_zeros=3
## P21,7,42,ID=0, num_zeros=6
## P21,7,43,ID=0, num_zeros=9
## P21,7,44,ID=0, num_zeros=3
## P21,7,45,ID=0, num_zeros=1
## P21,7,46,ID=0, num_zeros=1
## P21,7,47,ID=0, num_zeros=4
## P21,7,48,ID=0, num_zeros=5
## P21,7,49,ID=0, num_zeros=2
## P21,7,50,ID=0, num_zeros=5
## P21,8,1,ID=0, num_zeros=3
## P21,8,2,ID=0, num_zeros=3
## P21,8,3,ID=0, num_zeros=11
## P21,8,4,ID=0, num_zeros=4
## P21,8,5,ID=0, num_zeros=6
## P21,8,6,ID=0, num_zeros=4
## P21,8,7,ID=0, num_zeros=10
## P21,8,8,ID=0, num_zeros=4
## P21,8,9,ID=0, num_zeros=5
## P21,8,10,ID=0, num_zeros=5
## P21,8,11,ID=0, num_zeros=2
## P21,8,12,ID=0, num_zeros=2
## P21,8,13,ID=0, num_zeros=3
## P21,8,14,ID=0, num_zeros=3
## P21,8,15,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=16 in LISTP21[[8]]
## P21,8,17,ID=0, num_zeros=6
## P21,8,18,ID=0, num_zeros=6
## P21,8,19,ID=0, num_zeros=5
## P21,8,20,ID=0, num_zeros=7
## P21,8,21,ID=0, num_zeros=1
## P21,8,22,ID=0, num_zeros=2
## P21,8,23,ID=0, num_zeros=8
## P21,8,24,ID=0, num_zeros=5
## P21,8,25,ID=0, num_zeros=2
## P21,8,26,ID=0, num_zeros=11
## P21,8,27,ID=0, num_zeros=2
## P21,8,28,ID=0, num_zeros=3
## P21,8,29,ID=0, num_zeros=6
## P21,8,30,ID=0, num_zeros=3
## P21,8,31,ID=0, num_zeros=1
## P21,8,32,ID=0, num_zeros=5
## P21,8,33,ID=0, num_zeros=8
## P21,8,34,ID=0, num_zeros=8
## P21,8,35,ID=0, num_zeros=3
## P21,8,36,ID=0, num_zeros=2
## P21,8,37,ID=0, num_zeros=4
## P21,8,38,ID=0, num_zeros=2
## P21,8,39,ID=0, num_zeros=1
## P21,8,40,ID=0, num_zeros=1
## P21,8,41,ID=0, num_zeros=6
## P21,8,42,ID=0, num_zeros=2
## P21,8,43,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=44 in LISTP21[[8]]
## P21,8,45,ID=0, num_zeros=4
## P21,8,46,ID=0, num_zeros=2
## P21,8,47,ID=0, num_zeros=2
## P21,8,48,ID=0, num_zeros=5
## P21,8,49,ID=0, num_zeros=4
## P21,8,50,ID=0, num_zeros=9
## P21,9,1,ID=0, num_zeros=8
## P21,9,2,ID=0, num_zeros=5
## P21,9,3,ID=0, num_zeros=13
## P21,9,4,ID=0, num_zeros=5
## P21,9,5,ID=0, num_zeros=8
## P21,9,6,ID=0, num_zeros=2
## P21,9,7,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=8 in LISTP21[[9]]
## P21,9,9,ID=0, num_zeros=1
## P21,9,10,ID=0, num_zeros=5
## P21,9,11,ID=0, num_zeros=10
## P21,9,12,ID=0, num_zeros=1
## P21,9,13,ID=0, num_zeros=5
## P21,9,14,ID=0, num_zeros=3
## P21,9,15,ID=0, num_zeros=1
## P21,9,16,ID=0, num_zeros=2
## P21,9,17,ID=0, num_zeros=6
## P21,9,18,ID=0, num_zeros=2
## P21,9,19,ID=0, num_zeros=3
## P21,9,20,ID=0, num_zeros=4
## P21,9,21,ID=0, num_zeros=3
## P21,9,22,ID=0, num_zeros=7
## P21,9,23,ID=0, num_zeros=2
## P21,9,24,ID=0, num_zeros=4
## P21,9,25,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=26 in LISTP21[[9]]
## P21,9,27,ID=0, num_zeros=2
## P21,9,28,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=29 in LISTP21[[9]]
## P21,9,30,ID=0, num_zeros=0
## P21,9,31,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=32 in LISTP21[[9]]
## P21,9,33,ID=0, num_zeros=2
## P21,9,34,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=35 in LISTP21[[9]]
## P21,9,36,ID=0, num_zeros=5
## P21,9,37,ID=0, num_zeros=3
## P21,9,38,ID=0, num_zeros=9
## P21,9,39,ID=0, num_zeros=1
## P21,9,40,ID=0, num_zeros=5
## P21,9,41,ID=0, num_zeros=0
## P21,9,42,ID=0, num_zeros=4
## P21,9,43,ID=0, num_zeros=4
## P21,9,44,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=45 in LISTP21[[9]]
## Warning: There are no valid values for INTERVALS=46 in LISTP21[[9]]
## P21,9,47,ID=0, num_zeros=6
## P21,9,48,ID=0, num_zeros=3
## P21,9,49,ID=0, num_zeros=4
## P21,9,50,ID=0, num_zeros=10
## P21,10,1,ID=0, num_zeros=3
## P21,10,2,ID=0, num_zeros=4
## P21,10,3,ID=0, num_zeros=9
## P21,10,4,ID=0, num_zeros=2
## P21,10,5,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=6 in LISTP21[[10]]
## P21,10,7,ID=0, num_zeros=7
## P21,10,8,ID=0, num_zeros=1
## P21,10,9,ID=0, num_zeros=10
## P21,10,10,ID=0, num_zeros=5
## P21,10,11,ID=0, num_zeros=9
## P21,10,12,ID=0, num_zeros=2
## P21,10,13,ID=0, num_zeros=1
## P21,10,14,ID=0, num_zeros=7
## P21,10,15,ID=0, num_zeros=2
## P21,10,16,ID=0, num_zeros=2
## P21,10,17,ID=0, num_zeros=10
## P21,10,18,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=19 in LISTP21[[10]]
## P21,10,20,ID=0, num_zeros=4
## P21,10,21,ID=0, num_zeros=4
## P21,10,22,ID=0, num_zeros=8
## P21,10,23,ID=0, num_zeros=6
## P21,10,24,ID=0, num_zeros=3
## P21,10,25,ID=0, num_zeros=2
## P21,10,26,ID=0, num_zeros=4
## P21,10,27,ID=0, num_zeros=3
## P21,10,28,ID=0, num_zeros=10
## P21,10,29,ID=0, num_zeros=2
## P21,10,30,ID=0, num_zeros=3
## P21,10,31,ID=0, num_zeros=9
## P21,10,32,ID=0, num_zeros=1
## P21,10,33,ID=0, num_zeros=2
## P21,10,34,ID=0, num_zeros=2
## P21,10,35,ID=0, num_zeros=2
## P21,10,36,ID=0, num_zeros=2
## P21,10,37,ID=0, num_zeros=3
## P21,10,38,ID=0, num_zeros=1
## P21,10,39,ID=0, num_zeros=1
## P21,10,40,ID=0, num_zeros=2
## P21,10,41,ID=0, num_zeros=8
## P21,10,42,ID=0, num_zeros=2
## P21,10,43,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=44 in LISTP21[[10]]
## Warning: There are no valid values for INTERVALS=45 in LISTP21[[10]]
## Warning: There are no valid values for INTERVALS=46 in LISTP21[[10]]
## P21,10,47,ID=0, num_zeros=1
## P21,10,48,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=49 in LISTP21[[10]]
## P21,10,50,ID=0, num_zeros=6
## P22,1,1,ID=0, num_zeros=5
## P22,1,2,ID=0, num_zeros=4
## P22,1,3,ID=0, num_zeros=4
## P22,1,4,ID=0, num_zeros=5
## P22,1,5,ID=0, num_zeros=10
## Warning: There are no valid values for INTERVALS=6 in LISTP22[[1]]
## P22,1,7,ID=0, num_zeros=2
## P22,1,8,ID=0, num_zeros=7
## P22,1,9,ID=0, num_zeros=6
## P22,1,10,ID=0, num_zeros=8
## P22,1,11,ID=0, num_zeros=12
## P22,1,12,ID=0, num_zeros=11
## P22,1,13,ID=0, num_zeros=8
## P22,1,14,ID=0, num_zeros=12
## P22,1,15,ID=0, num_zeros=6
## P22,1,16,ID=0, num_zeros=7
## P22,1,17,ID=0, num_zeros=5
## P22,1,18,ID=0, num_zeros=3
## P22,1,19,ID=0, num_zeros=2
## P22,1,20,ID=0, num_zeros=4
## P22,1,21,ID=0, num_zeros=7
## P22,1,22,ID=0, num_zeros=3
## P22,1,23,ID=0, num_zeros=9
## P22,1,24,ID=0, num_zeros=9
## P22,1,25,ID=0, num_zeros=9
## P22,1,26,ID=0, num_zeros=5
## P22,1,27,ID=0, num_zeros=3
## P22,1,28,ID=0, num_zeros=8
## P22,1,29,ID=0, num_zeros=6
## P22,1,30,ID=0, num_zeros=6
## P22,1,31,ID=0, num_zeros=5
## P22,1,32,ID=0, num_zeros=3
## P22,1,33,ID=0, num_zeros=2
## P22,1,34,ID=0, num_zeros=5
## P22,1,35,ID=0, num_zeros=8
## P22,1,36,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=37 in LISTP22[[1]]
## P22,1,38,ID=0, num_zeros=2
## P22,1,39,ID=0, num_zeros=11
## P22,1,40,ID=0, num_zeros=4
## P22,1,41,ID=0, num_zeros=5
## P22,1,42,ID=0, num_zeros=6
## P22,1,43,ID=0, num_zeros=1
## P22,1,44,ID=0, num_zeros=1
## P22,1,45,ID=0, num_zeros=7
## P22,1,46,ID=0, num_zeros=2
## P22,1,47,ID=0, num_zeros=0
## P22,1,48,ID=0, num_zeros=6
## P22,1,49,ID=0, num_zeros=7
## P22,1,50,ID=0, num_zeros=24
## P22,2,1,ID=0, num_zeros=2
## P22,2,2,ID=0, num_zeros=6
## P22,2,3,ID=0, num_zeros=6
## P22,2,4,ID=0, num_zeros=15
## P22,2,5,ID=0, num_zeros=7
## P22,2,6,ID=0, num_zeros=7
## P22,2,7,ID=0, num_zeros=6
## P22,2,8,ID=0, num_zeros=12
## P22,2,9,ID=0, num_zeros=2
## P22,2,10,ID=0, num_zeros=7
## P22,2,11,ID=0, num_zeros=18
## P22,2,12,ID=0, num_zeros=13
## P22,2,13,ID=0, num_zeros=2
## P22,2,14,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=15 in LISTP22[[2]]
## P22,2,16,ID=0, num_zeros=5
## P22,2,17,ID=0, num_zeros=1
## P22,2,18,ID=0, num_zeros=3
## P22,2,19,ID=0, num_zeros=2
## P22,2,20,ID=0, num_zeros=1
## P22,2,21,ID=0, num_zeros=2
## P22,2,22,ID=0, num_zeros=2
## P22,2,23,ID=0, num_zeros=13
## P22,2,24,ID=0, num_zeros=4
## P22,2,25,ID=0, num_zeros=3
## P22,2,26,ID=0, num_zeros=2
## P22,2,27,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=28 in LISTP22[[2]]
## P22,2,29,ID=0, num_zeros=5
## P22,2,30,ID=0, num_zeros=12
## P22,2,31,ID=0, num_zeros=4
## P22,2,32,ID=0, num_zeros=5
## P22,2,33,ID=0, num_zeros=8
## P22,2,34,ID=0, num_zeros=6
## P22,2,35,ID=0, num_zeros=6
## P22,2,36,ID=0, num_zeros=1
## P22,2,37,ID=0, num_zeros=12
## P22,2,38,ID=0, num_zeros=5
## P22,2,39,ID=0, num_zeros=1
## P22,2,40,ID=0, num_zeros=4
## P22,2,41,ID=0, num_zeros=2
## P22,2,42,ID=0, num_zeros=4
## P22,2,43,ID=0, num_zeros=4
## P22,2,44,ID=0, num_zeros=7
## P22,2,45,ID=0, num_zeros=7
## P22,2,46,ID=0, num_zeros=2
## P22,2,47,ID=0, num_zeros=4
## P22,2,48,ID=0, num_zeros=10
## P22,2,49,ID=0, num_zeros=3
## P22,2,50,ID=0, num_zeros=19
## P22,3,1,ID=0, num_zeros=1
## P22,3,2,ID=0, num_zeros=0
## P22,3,3,ID=0, num_zeros=2
## P22,3,4,ID=0, num_zeros=0
## P22,3,5,ID=0, num_zeros=1
## P22,3,6,ID=0, num_zeros=3
## P22,3,7,ID=0, num_zeros=8
## P22,3,8,ID=0, num_zeros=8
## P22,3,9,ID=0, num_zeros=2
## P22,3,10,ID=0, num_zeros=4
## P22,3,11,ID=0, num_zeros=7
## P22,3,12,ID=0, num_zeros=2
## P22,3,13,ID=0, num_zeros=1
## P22,3,14,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=15 in LISTP22[[3]]
## P22,3,16,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=17 in LISTP22[[3]]
## P22,3,18,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=19 in LISTP22[[3]]
## Warning: There are no valid values for INTERVALS=20 in LISTP22[[3]]
## P22,3,21,ID=0, num_zeros=1
## P22,3,22,ID=0, num_zeros=2
## P22,3,23,ID=0, num_zeros=2
## P22,3,24,ID=0, num_zeros=2
## P22,3,25,ID=0, num_zeros=1
## P22,3,26,ID=0, num_zeros=1
## P22,3,27,ID=0, num_zeros=2
## P22,3,28,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=29 in LISTP22[[3]]
## P22,3,30,ID=0, num_zeros=3
## P22,3,31,ID=0, num_zeros=2
## P22,3,32,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=33 in LISTP22[[3]]
## P22,3,34,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=35 in LISTP22[[3]]
## P22,3,36,ID=0, num_zeros=1
## P22,3,37,ID=0, num_zeros=2
## P22,3,38,ID=0, num_zeros=1
## P22,3,39,ID=0, num_zeros=2
## P22,3,40,ID=0, num_zeros=1
## P22,3,41,ID=0, num_zeros=4
## P22,3,42,ID=0, num_zeros=1
## P22,3,43,ID=0, num_zeros=2
## P22,3,44,ID=0, num_zeros=2
## P22,3,45,ID=0, num_zeros=2
## P22,3,46,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=47 in LISTP22[[3]]
## P22,3,48,ID=0, num_zeros=3
## P22,3,49,ID=0, num_zeros=3
## P22,3,50,ID=0, num_zeros=36
## Warning: There are no valid values for INTERVALS=1 in LISTP22[[4]]
## Warning: There are no valid values for INTERVALS=2 in LISTP22[[4]]
## P22,4,3,ID=0, num_zeros=2
## P22,4,4,ID=0, num_zeros=3
## P22,4,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP22[[4]]
## P22,4,7,ID=0, num_zeros=3
## P22,4,8,ID=0, num_zeros=7
## P22,4,9,ID=0, num_zeros=0
## P22,4,10,ID=0, num_zeros=6
## P22,4,11,ID=0, num_zeros=1
## P22,4,12,ID=0, num_zeros=3
## P22,4,13,ID=0, num_zeros=1
## P22,4,14,ID=0, num_zeros=1
## P22,4,15,ID=0, num_zeros=4
## P22,4,16,ID=0, num_zeros=3
## P22,4,17,ID=0, num_zeros=3
## P22,4,18,ID=0, num_zeros=5
## P22,4,19,ID=0, num_zeros=4
## P22,4,20,ID=0, num_zeros=4
## P22,4,21,ID=0, num_zeros=4
## P22,4,22,ID=0, num_zeros=5
## P22,4,23,ID=0, num_zeros=4
## P22,4,24,ID=0, num_zeros=4
## P22,4,25,ID=0, num_zeros=6
## P22,4,26,ID=0, num_zeros=1
## P22,4,27,ID=0, num_zeros=6
## P22,4,28,ID=0, num_zeros=3
## P22,4,29,ID=0, num_zeros=3
## P22,4,30,ID=0, num_zeros=8
## P22,4,31,ID=0, num_zeros=3
## P22,4,32,ID=0, num_zeros=4
## P22,4,33,ID=0, num_zeros=7
## P22,4,34,ID=0, num_zeros=1
## P22,4,35,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=36 in LISTP22[[4]]
## P22,4,37,ID=0, num_zeros=7
## P22,4,38,ID=0, num_zeros=5
## P22,4,39,ID=0, num_zeros=4
## P22,4,40,ID=0, num_zeros=10
## P22,4,41,ID=0, num_zeros=5
## P22,4,42,ID=0, num_zeros=1
## P22,4,43,ID=0, num_zeros=2
## P22,4,44,ID=0, num_zeros=2
## P22,4,45,ID=0, num_zeros=3
## P22,4,46,ID=0, num_zeros=6
## P22,4,47,ID=0, num_zeros=3
## P22,4,48,ID=0, num_zeros=4
## P22,4,49,ID=0, num_zeros=2
## P22,4,50,ID=0, num_zeros=5
## P22,5,1,ID=0, num_zeros=1
## P22,5,2,ID=0, num_zeros=0
## P22,5,3,ID=0, num_zeros=4
## P22,5,4,ID=0, num_zeros=3
## P22,5,5,ID=0, num_zeros=6
## P22,5,6,ID=0, num_zeros=3
## P22,5,7,ID=0, num_zeros=2
## P22,5,8,ID=0, num_zeros=1
## P22,5,9,ID=0, num_zeros=1
## P22,5,10,ID=0, num_zeros=6
## P22,5,11,ID=0, num_zeros=7
## P22,5,12,ID=0, num_zeros=1
## P22,5,13,ID=0, num_zeros=3
## P22,5,14,ID=0, num_zeros=5
## P22,5,15,ID=0, num_zeros=1
## P22,5,16,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=17 in LISTP22[[5]]
## P22,5,18,ID=0, num_zeros=1
## P22,5,19,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=20 in LISTP22[[5]]
## P22,5,21,ID=0, num_zeros=5
## P22,5,22,ID=0, num_zeros=3
## P22,5,23,ID=0, num_zeros=2
## P22,5,24,ID=0, num_zeros=1
## P22,5,25,ID=0, num_zeros=4
## P22,5,26,ID=0, num_zeros=2
## P22,5,27,ID=0, num_zeros=1
## P22,5,28,ID=0, num_zeros=2
## P22,5,29,ID=0, num_zeros=2
## P22,5,30,ID=0, num_zeros=2
## P22,5,31,ID=0, num_zeros=1
## P22,5,32,ID=0, num_zeros=5
## P22,5,33,ID=0, num_zeros=4
## P22,5,34,ID=0, num_zeros=2
## P22,5,35,ID=0, num_zeros=6
## P22,5,36,ID=0, num_zeros=1
## P22,5,37,ID=0, num_zeros=6
## P22,5,38,ID=0, num_zeros=5
## P22,5,39,ID=0, num_zeros=2
## P22,5,40,ID=0, num_zeros=6
## P22,5,41,ID=0, num_zeros=5
## P22,5,42,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=43 in LISTP22[[5]]
## P22,5,44,ID=0, num_zeros=4
## P22,5,45,ID=0, num_zeros=7
## P22,5,46,ID=0, num_zeros=2
## P22,5,47,ID=0, num_zeros=2
## P22,5,48,ID=0, num_zeros=1
## P22,5,49,ID=0, num_zeros=2
## P22,5,50,ID=0, num_zeros=5
## P22,6,1,ID=0, num_zeros=0
## P22,6,2,ID=0, num_zeros=3
## P22,6,3,ID=0, num_zeros=3
## P22,6,4,ID=0, num_zeros=2
## P22,6,5,ID=0, num_zeros=4
## P22,6,6,ID=0, num_zeros=1
## P22,6,7,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=8 in LISTP22[[6]]
## P22,6,9,ID=0, num_zeros=4
## P22,6,10,ID=0, num_zeros=4
## P22,6,11,ID=0, num_zeros=0
## P22,6,12,ID=0, num_zeros=1
## P22,6,13,ID=0, num_zeros=0
## P22,6,14,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=15 in LISTP22[[6]]
## P22,6,16,ID=0, num_zeros=3
## P22,6,17,ID=0, num_zeros=2
## P22,6,18,ID=0, num_zeros=4
## P22,6,19,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=20 in LISTP22[[6]]
## P22,6,21,ID=0, num_zeros=1
## P22,6,22,ID=0, num_zeros=1
## P22,6,23,ID=0, num_zeros=4
## P22,6,24,ID=0, num_zeros=3
## P22,6,25,ID=0, num_zeros=2
## P22,6,26,ID=0, num_zeros=1
## P22,6,27,ID=0, num_zeros=3
## P22,6,28,ID=0, num_zeros=1
## P22,6,29,ID=0, num_zeros=1
## P22,6,30,ID=0, num_zeros=2
## P22,6,31,ID=0, num_zeros=1
## P22,6,32,ID=0, num_zeros=3
## P22,6,33,ID=0, num_zeros=6
## P22,6,34,ID=0, num_zeros=6
## P22,6,35,ID=0, num_zeros=2
## P22,6,36,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=37 in LISTP22[[6]]
## P22,6,38,ID=0, num_zeros=1
## P22,6,39,ID=0, num_zeros=4
## P22,6,40,ID=0, num_zeros=8
## P22,6,41,ID=0, num_zeros=1
## P22,6,42,ID=0, num_zeros=2
## P22,6,43,ID=0, num_zeros=4
## P22,6,44,ID=0, num_zeros=8
## P22,6,45,ID=0, num_zeros=4
## P22,6,46,ID=0, num_zeros=3
## P22,6,47,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=48 in LISTP22[[6]]
## P22,6,49,ID=0, num_zeros=3
## P22,6,50,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=1 in LISTP22[[7]]
## Warning: There are no valid values for INTERVALS=2 in LISTP22[[7]]
## P22,7,3,ID=0, num_zeros=3
## P22,7,4,ID=0, num_zeros=1
## P22,7,5,ID=0, num_zeros=1
## P22,7,6,ID=0, num_zeros=1
## P22,7,7,ID=0, num_zeros=1
## P22,7,8,ID=0, num_zeros=0
## P22,7,9,ID=0, num_zeros=2
## P22,7,10,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=11 in LISTP22[[7]]
## P22,7,12,ID=0, num_zeros=3
## P22,7,13,ID=0, num_zeros=0
## P22,7,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP22[[7]]
## P22,7,16,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=17 in LISTP22[[7]]
## Warning: There are no valid values for INTERVALS=18 in LISTP22[[7]]
## P22,7,19,ID=0, num_zeros=1
## P22,7,20,ID=0, num_zeros=4
## P22,7,21,ID=0, num_zeros=1
## P22,7,22,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=23 in LISTP22[[7]]
## P22,7,24,ID=0, num_zeros=1
## P22,7,25,ID=0, num_zeros=2
## P22,7,26,ID=0, num_zeros=4
## P22,7,27,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=28 in LISTP22[[7]]
## Warning: There are no valid values for INTERVALS=29 in LISTP22[[7]]
## P22,7,30,ID=0, num_zeros=1
## P22,7,31,ID=0, num_zeros=3
## P22,7,32,ID=0, num_zeros=0
## P22,7,33,ID=0, num_zeros=0
## P22,7,34,ID=0, num_zeros=1
## P22,7,35,ID=0, num_zeros=0
## P22,7,36,ID=0, num_zeros=2
## P22,7,37,ID=0, num_zeros=4
## P22,7,38,ID=0, num_zeros=1
## P22,7,39,ID=0, num_zeros=2
## P22,7,40,ID=0, num_zeros=3
## P22,7,41,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=42 in LISTP22[[7]]
## P22,7,43,ID=0, num_zeros=2
## P22,7,44,ID=0, num_zeros=0
## P22,7,45,ID=0, num_zeros=2
## P22,7,46,ID=0, num_zeros=1
## P22,7,47,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=48 in LISTP22[[7]]
## Warning: There are no valid values for INTERVALS=49 in LISTP22[[7]]
## P22,7,50,ID=0, num_zeros=5
## P22,8,1,ID=0, num_zeros=1
## P22,8,2,ID=0, num_zeros=6
## P22,8,3,ID=0, num_zeros=1
## P22,8,4,ID=0, num_zeros=3
## P22,8,5,ID=0, num_zeros=1
## P22,8,6,ID=0, num_zeros=7
## P22,8,7,ID=0, num_zeros=3
## P22,8,8,ID=0, num_zeros=2
## P22,8,9,ID=0, num_zeros=1
## P22,8,10,ID=0, num_zeros=2
## P22,8,11,ID=0, num_zeros=2
## P22,8,12,ID=0, num_zeros=2
## P22,8,13,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=14 in LISTP22[[8]]
## P22,8,15,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=16 in LISTP22[[8]]
## P22,8,17,ID=0, num_zeros=1
## P22,8,18,ID=0, num_zeros=2
## P22,8,19,ID=0, num_zeros=0
## P22,8,20,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=21 in LISTP22[[8]]
## P22,8,22,ID=0, num_zeros=5
## P22,8,23,ID=0, num_zeros=5
## P22,8,24,ID=0, num_zeros=2
## P22,8,25,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=26 in LISTP22[[8]]
## P22,8,27,ID=0, num_zeros=3
## P22,8,28,ID=0, num_zeros=1
## P22,8,29,ID=0, num_zeros=1
## P22,8,30,ID=0, num_zeros=3
## P22,8,31,ID=0, num_zeros=4
## P22,8,32,ID=0, num_zeros=5
## P22,8,33,ID=0, num_zeros=3
## P22,8,34,ID=0, num_zeros=1
## P22,8,35,ID=0, num_zeros=3
## P22,8,36,ID=0, num_zeros=1
## P22,8,37,ID=0, num_zeros=1
## P22,8,38,ID=0, num_zeros=7
## P22,8,39,ID=0, num_zeros=1
## P22,8,40,ID=0, num_zeros=4
## P22,8,41,ID=0, num_zeros=2
## P22,8,42,ID=0, num_zeros=4
## P22,8,43,ID=0, num_zeros=3
## P22,8,44,ID=0, num_zeros=0
## P22,8,45,ID=0, num_zeros=3
## P22,8,46,ID=0, num_zeros=3
## P22,8,47,ID=0, num_zeros=3
## P22,8,48,ID=0, num_zeros=4
## P22,8,49,ID=0, num_zeros=3
## P22,8,50,ID=0, num_zeros=10
## P22,9,1,ID=0, num_zeros=3
## P22,9,2,ID=0, num_zeros=1
## P22,9,3,ID=0, num_zeros=3
## P22,9,4,ID=0, num_zeros=2
## P22,9,5,ID=0, num_zeros=2
## P22,9,6,ID=0, num_zeros=1
## P22,9,7,ID=0, num_zeros=2
## P22,9,8,ID=0, num_zeros=1
## P22,9,9,ID=0, num_zeros=0
## P22,9,10,ID=0, num_zeros=4
## P22,9,11,ID=0, num_zeros=2
## P22,9,12,ID=0, num_zeros=1
## P22,9,13,ID=0, num_zeros=1
## P22,9,14,ID=0, num_zeros=3
## P22,9,15,ID=0, num_zeros=8
## P22,9,16,ID=0, num_zeros=1
## P22,9,17,ID=0, num_zeros=6
## P22,9,18,ID=0, num_zeros=4
## P22,9,19,ID=0, num_zeros=2
## P22,9,20,ID=0, num_zeros=0
## P22,9,21,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=22 in LISTP22[[9]]
## P22,9,23,ID=0, num_zeros=3
## P22,9,24,ID=0, num_zeros=1
## P22,9,25,ID=0, num_zeros=0
## P22,9,26,ID=0, num_zeros=4
## P22,9,27,ID=0, num_zeros=2
## P22,9,28,ID=0, num_zeros=2
## P22,9,29,ID=0, num_zeros=3
## P22,9,30,ID=0, num_zeros=4
## P22,9,31,ID=0, num_zeros=3
## P22,9,32,ID=0, num_zeros=3
## P22,9,33,ID=0, num_zeros=6
## P22,9,34,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=35 in LISTP22[[9]]
## P22,9,36,ID=0, num_zeros=1
## P22,9,37,ID=0, num_zeros=2
## P22,9,38,ID=0, num_zeros=5
## P22,9,39,ID=0, num_zeros=3
## P22,9,40,ID=0, num_zeros=1
## P22,9,41,ID=0, num_zeros=0
## P22,9,42,ID=0, num_zeros=0
## P22,9,43,ID=0, num_zeros=2
## P22,9,44,ID=0, num_zeros=0
## P22,9,45,ID=0, num_zeros=5
## P22,9,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP22[[9]]
## P22,9,48,ID=0, num_zeros=3
## P22,9,49,ID=0, num_zeros=3
## P22,9,50,ID=0, num_zeros=4
## P22,10,1,ID=0, num_zeros=1
## P22,10,2,ID=0, num_zeros=1
## P22,10,3,ID=0, num_zeros=2
## P22,10,4,ID=0, num_zeros=1
## P22,10,5,ID=0, num_zeros=1
## P22,10,6,ID=0, num_zeros=1
## P22,10,7,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=8 in LISTP22[[10]]
## Warning: There are no valid values for INTERVALS=9 in LISTP22[[10]]
## Warning: There are no valid values for INTERVALS=10 in LISTP22[[10]]
## Warning: There are no valid values for INTERVALS=11 in LISTP22[[10]]
## P22,10,12,ID=0, num_zeros=1
## P22,10,13,ID=0, num_zeros=0
## P22,10,14,ID=0, num_zeros=0
## P22,10,15,ID=0, num_zeros=3
## P22,10,16,ID=0, num_zeros=2
## P22,10,17,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=18 in LISTP22[[10]]
## P22,10,19,ID=0, num_zeros=2
## P22,10,20,ID=0, num_zeros=4
## P22,10,21,ID=0, num_zeros=2
## P22,10,22,ID=0, num_zeros=3
## P22,10,23,ID=0, num_zeros=2
## P22,10,24,ID=0, num_zeros=1
## P22,10,25,ID=0, num_zeros=1
## P22,10,26,ID=0, num_zeros=0
## P22,10,27,ID=0, num_zeros=3
## P22,10,28,ID=0, num_zeros=3
## P22,10,29,ID=0, num_zeros=1
## P22,10,30,ID=0, num_zeros=0
## P22,10,31,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=32 in LISTP22[[10]]
## P22,10,33,ID=0, num_zeros=2
## P22,10,34,ID=0, num_zeros=6
## P22,10,35,ID=0, num_zeros=3
## P22,10,36,ID=0, num_zeros=2
## P22,10,37,ID=0, num_zeros=3
## P22,10,38,ID=0, num_zeros=4
## P22,10,39,ID=0, num_zeros=9
## P22,10,40,ID=0, num_zeros=2
## P22,10,41,ID=0, num_zeros=4
## P22,10,42,ID=0, num_zeros=3
## P22,10,43,ID=0, num_zeros=1
## P22,10,44,ID=0, num_zeros=3
## P22,10,45,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=46 in LISTP22[[10]]
## P22,10,47,ID=0, num_zeros=3
## P22,10,48,ID=0, num_zeros=3
## P22,10,49,ID=0, num_zeros=3
## P22,10,50,ID=0, num_zeros=4
## P23,1,1,ID=0, num_zeros=1
## P23,1,2,ID=0, num_zeros=5
## P23,1,3,ID=0, num_zeros=5
## P23,1,4,ID=0, num_zeros=7
## P23,1,5,ID=0, num_zeros=12
## P23,1,6,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=7 in LISTP23[[1]]
## P23,1,8,ID=0, num_zeros=3
## P23,1,9,ID=0, num_zeros=7
## P23,1,10,ID=0, num_zeros=3
## P23,1,11,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=12 in LISTP23[[1]]
## P23,1,13,ID=0, num_zeros=3
## P23,1,14,ID=0, num_zeros=5
## P23,1,15,ID=0, num_zeros=3
## P23,1,16,ID=0, num_zeros=4
## P23,1,17,ID=0, num_zeros=6
## P23,1,18,ID=0, num_zeros=2
## P23,1,19,ID=0, num_zeros=4
## P23,1,20,ID=0, num_zeros=8
## P23,1,21,ID=0, num_zeros=2
## P23,1,22,ID=0, num_zeros=2
## P23,1,23,ID=0, num_zeros=9
## P23,1,24,ID=0, num_zeros=4
## P23,1,25,ID=0, num_zeros=5
## P23,1,26,ID=0, num_zeros=3
## P23,1,27,ID=0, num_zeros=1
## P23,1,28,ID=0, num_zeros=5
## P23,1,29,ID=0, num_zeros=5
## P23,1,30,ID=0, num_zeros=7
## P23,1,31,ID=0, num_zeros=4
## P23,1,32,ID=0, num_zeros=1
## P23,1,33,ID=0, num_zeros=6
## P23,1,34,ID=0, num_zeros=6
## P23,1,35,ID=0, num_zeros=8
## P23,1,36,ID=0, num_zeros=13
## P23,1,37,ID=0, num_zeros=7
## P23,1,38,ID=0, num_zeros=3
## P23,1,39,ID=0, num_zeros=4
## P23,1,40,ID=0, num_zeros=12
## P23,1,41,ID=0, num_zeros=2
## P23,1,42,ID=0, num_zeros=3
## P23,1,43,ID=0, num_zeros=3
## P23,1,44,ID=0, num_zeros=8
## P23,1,45,ID=0, num_zeros=8
## P23,1,46,ID=0, num_zeros=3
## P23,1,47,ID=0, num_zeros=5
## P23,1,48,ID=0, num_zeros=2
## P23,1,49,ID=0, num_zeros=3
## P23,1,50,ID=0, num_zeros=13
## P23,2,1,ID=0, num_zeros=0
## P23,2,2,ID=0, num_zeros=1
## P23,2,3,ID=0, num_zeros=9
## P23,2,4,ID=0, num_zeros=9
## P23,2,5,ID=0, num_zeros=14
## P23,2,6,ID=0, num_zeros=7
## P23,2,7,ID=0, num_zeros=3
## P23,2,8,ID=0, num_zeros=10
## P23,2,9,ID=0, num_zeros=9
## P23,2,10,ID=0, num_zeros=3
## P23,2,11,ID=0, num_zeros=7
## P23,2,12,ID=0, num_zeros=2
## P23,2,13,ID=0, num_zeros=1
## P23,2,14,ID=0, num_zeros=4
## P23,2,15,ID=0, num_zeros=1
## P23,2,16,ID=0, num_zeros=7
## P23,2,17,ID=0, num_zeros=6
## P23,2,18,ID=0, num_zeros=5
## P23,2,19,ID=0, num_zeros=2
## P23,2,20,ID=0, num_zeros=14
## P23,2,21,ID=0, num_zeros=2
## P23,2,22,ID=0, num_zeros=5
## P23,2,23,ID=0, num_zeros=4
## P23,2,24,ID=0, num_zeros=7
## P23,2,25,ID=0, num_zeros=4
## P23,2,26,ID=0, num_zeros=16
## P23,2,27,ID=0, num_zeros=7
## P23,2,28,ID=0, num_zeros=6
## P23,2,29,ID=0, num_zeros=5
## P23,2,30,ID=0, num_zeros=6
## P23,2,31,ID=0, num_zeros=7
## P23,2,32,ID=0, num_zeros=9
## P23,2,33,ID=0, num_zeros=11
## P23,2,34,ID=0, num_zeros=3
## P23,2,35,ID=0, num_zeros=7
## P23,2,36,ID=0, num_zeros=5
## P23,2,37,ID=0, num_zeros=7
## P23,2,38,ID=0, num_zeros=4
## P23,2,39,ID=0, num_zeros=7
## P23,2,40,ID=0, num_zeros=6
## P23,2,41,ID=0, num_zeros=3
## P23,2,42,ID=0, num_zeros=7
## P23,2,43,ID=0, num_zeros=5
## P23,2,44,ID=0, num_zeros=2
## P23,2,45,ID=0, num_zeros=3
## P23,2,46,ID=0, num_zeros=5
## P23,2,47,ID=0, num_zeros=1
## P23,2,48,ID=0, num_zeros=4
## P23,2,49,ID=0, num_zeros=2
## P23,2,50,ID=0, num_zeros=9
## P23,3,1,ID=0, num_zeros=1
## P23,3,2,ID=0, num_zeros=1
## P23,3,3,ID=0, num_zeros=1
## P23,3,4,ID=0, num_zeros=6
## P23,3,5,ID=0, num_zeros=7
## P23,3,6,ID=0, num_zeros=5
## P23,3,7,ID=0, num_zeros=4
## P23,3,8,ID=0, num_zeros=5
## P23,3,9,ID=0, num_zeros=5
## P23,3,10,ID=0, num_zeros=3
## P23,3,11,ID=0, num_zeros=3
## P23,3,12,ID=0, num_zeros=6
## P23,3,13,ID=0, num_zeros=3
## P23,3,14,ID=0, num_zeros=9
## P23,3,15,ID=0, num_zeros=8
## P23,3,16,ID=0, num_zeros=1
## P23,3,17,ID=0, num_zeros=4
## P23,3,18,ID=0, num_zeros=11
## P23,3,19,ID=0, num_zeros=4
## P23,3,20,ID=0, num_zeros=13
## P23,3,21,ID=0, num_zeros=8
## P23,3,22,ID=0, num_zeros=4
## P23,3,23,ID=0, num_zeros=2
## P23,3,24,ID=0, num_zeros=3
## P23,3,25,ID=0, num_zeros=5
## P23,3,26,ID=0, num_zeros=10
## P23,3,27,ID=0, num_zeros=10
## P23,3,28,ID=0, num_zeros=3
## P23,3,29,ID=0, num_zeros=4
## P23,3,30,ID=0, num_zeros=4
## P23,3,31,ID=0, num_zeros=6
## P23,3,32,ID=0, num_zeros=1
## P23,3,33,ID=0, num_zeros=6
## P23,3,34,ID=0, num_zeros=5
## P23,3,35,ID=0, num_zeros=7
## P23,3,36,ID=0, num_zeros=7
## P23,3,37,ID=0, num_zeros=3
## P23,3,38,ID=0, num_zeros=1
## P23,3,39,ID=0, num_zeros=3
## P23,3,40,ID=0, num_zeros=5
## P23,3,41,ID=0, num_zeros=5
## P23,3,42,ID=0, num_zeros=9
## P23,3,43,ID=0, num_zeros=7
## P23,3,44,ID=0, num_zeros=3
## P23,3,45,ID=0, num_zeros=8
## P23,3,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP23[[3]]
## P23,3,48,ID=0, num_zeros=2
## P23,3,49,ID=0, num_zeros=6
## P23,3,50,ID=0, num_zeros=14
## P23,4,1,ID=0, num_zeros=1
## P23,4,2,ID=0, num_zeros=3
## P23,4,3,ID=0, num_zeros=4
## P23,4,4,ID=0, num_zeros=8
## P23,4,5,ID=0, num_zeros=3
## P23,4,6,ID=0, num_zeros=5
## P23,4,7,ID=0, num_zeros=7
## P23,4,8,ID=0, num_zeros=7
## P23,4,9,ID=0, num_zeros=6
## P23,4,10,ID=0, num_zeros=7
## P23,4,11,ID=0, num_zeros=0
## P23,4,12,ID=0, num_zeros=3
## P23,4,13,ID=0, num_zeros=6
## P23,4,14,ID=0, num_zeros=7
## P23,4,15,ID=0, num_zeros=7
## P23,4,16,ID=0, num_zeros=7
## P23,4,17,ID=0, num_zeros=1
## P23,4,18,ID=0, num_zeros=10
## P23,4,19,ID=0, num_zeros=9
## P23,4,20,ID=0, num_zeros=6
## P23,4,21,ID=0, num_zeros=8
## P23,4,22,ID=0, num_zeros=12
## P23,4,23,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=24 in LISTP23[[4]]
## P23,4,25,ID=0, num_zeros=10
## P23,4,26,ID=0, num_zeros=6
## P23,4,27,ID=0, num_zeros=7
## P23,4,28,ID=0, num_zeros=4
## P23,4,29,ID=0, num_zeros=6
## P23,4,30,ID=0, num_zeros=5
## P23,4,31,ID=0, num_zeros=3
## P23,4,32,ID=0, num_zeros=2
## P23,4,33,ID=0, num_zeros=4
## P23,4,34,ID=0, num_zeros=5
## P23,4,35,ID=0, num_zeros=5
## P23,4,36,ID=0, num_zeros=6
## P23,4,37,ID=0, num_zeros=6
## P23,4,38,ID=0, num_zeros=4
## P23,4,39,ID=0, num_zeros=10
## P23,4,40,ID=0, num_zeros=7
## P23,4,41,ID=0, num_zeros=7
## P23,4,42,ID=0, num_zeros=2
## P23,4,43,ID=0, num_zeros=5
## P23,4,44,ID=0, num_zeros=2
## P23,4,45,ID=0, num_zeros=7
## P23,4,46,ID=0, num_zeros=5
## P23,4,47,ID=0, num_zeros=7
## P23,4,48,ID=0, num_zeros=2
## P23,4,49,ID=0, num_zeros=2
## P23,4,50,ID=0, num_zeros=9
## P23,5,1,ID=0, num_zeros=0
## P23,5,2,ID=0, num_zeros=1
## P23,5,3,ID=0, num_zeros=3
## P23,5,4,ID=0, num_zeros=4
## P23,5,5,ID=0, num_zeros=3
## P23,5,6,ID=0, num_zeros=10
## P23,5,7,ID=0, num_zeros=6
## P23,5,8,ID=0, num_zeros=5
## P23,5,9,ID=0, num_zeros=9
## P23,5,10,ID=0, num_zeros=7
## P23,5,11,ID=0, num_zeros=6
## P23,5,12,ID=0, num_zeros=1
## P23,5,13,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=14 in LISTP23[[5]]
## P23,5,15,ID=0, num_zeros=6
## P23,5,16,ID=0, num_zeros=12
## P23,5,17,ID=0, num_zeros=3
## P23,5,18,ID=0, num_zeros=4
## P23,5,19,ID=0, num_zeros=3
## P23,5,20,ID=0, num_zeros=13
## P23,5,21,ID=0, num_zeros=10
## P23,5,22,ID=0, num_zeros=6
## P23,5,23,ID=0, num_zeros=3
## P23,5,24,ID=0, num_zeros=3
## P23,5,25,ID=0, num_zeros=7
## P23,5,26,ID=0, num_zeros=9
## P23,5,27,ID=0, num_zeros=3
## P23,5,28,ID=0, num_zeros=5
## P23,5,29,ID=0, num_zeros=3
## P23,5,30,ID=0, num_zeros=6
## P23,5,31,ID=0, num_zeros=6
## P23,5,32,ID=0, num_zeros=7
## P23,5,33,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=34 in LISTP23[[5]]
## P23,5,35,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=36 in LISTP23[[5]]
## P23,5,37,ID=0, num_zeros=1
## P23,5,38,ID=0, num_zeros=7
## P23,5,39,ID=0, num_zeros=11
## P23,5,40,ID=0, num_zeros=4
## P23,5,41,ID=0, num_zeros=2
## P23,5,42,ID=0, num_zeros=5
## P23,5,43,ID=0, num_zeros=4
## P23,5,44,ID=0, num_zeros=1
## P23,5,45,ID=0, num_zeros=1
## P23,5,46,ID=0, num_zeros=1
## P23,5,47,ID=0, num_zeros=1
## P23,5,48,ID=0, num_zeros=9
## P23,5,49,ID=0, num_zeros=8
## P23,5,50,ID=0, num_zeros=26
## Warning: There are no valid values for INTERVALS=1 in LISTP23[[6]]
## P23,6,2,ID=0, num_zeros=10
## P23,6,3,ID=0, num_zeros=4
## P23,6,4,ID=0, num_zeros=12
## P23,6,5,ID=0, num_zeros=6
## P23,6,6,ID=0, num_zeros=5
## P23,6,7,ID=0, num_zeros=1
## P23,6,8,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=9 in LISTP23[[6]]
## P23,6,10,ID=0, num_zeros=3
## P23,6,11,ID=0, num_zeros=2
## P23,6,12,ID=0, num_zeros=3
## P23,6,13,ID=0, num_zeros=1
## P23,6,14,ID=0, num_zeros=0
## P23,6,15,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=16 in LISTP23[[6]]
## P23,6,17,ID=0, num_zeros=2
## P23,6,18,ID=0, num_zeros=1
## P23,6,19,ID=0, num_zeros=3
## P23,6,20,ID=0, num_zeros=5
## P23,6,21,ID=0, num_zeros=1
## P23,6,22,ID=0, num_zeros=5
## P23,6,23,ID=0, num_zeros=5
## P23,6,24,ID=0, num_zeros=1
## P23,6,25,ID=0, num_zeros=0
## P23,6,26,ID=0, num_zeros=5
## P23,6,27,ID=0, num_zeros=3
## P23,6,28,ID=0, num_zeros=6
## P23,6,29,ID=0, num_zeros=0
## P23,6,30,ID=0, num_zeros=8
## P23,6,31,ID=0, num_zeros=14
## P23,6,32,ID=0, num_zeros=13
## P23,6,33,ID=0, num_zeros=3
## P23,6,34,ID=0, num_zeros=3
## P23,6,35,ID=0, num_zeros=2
## P23,6,36,ID=0, num_zeros=2
## P23,6,37,ID=0, num_zeros=12
## P23,6,38,ID=0, num_zeros=2
## P23,6,39,ID=0, num_zeros=3
## P23,6,40,ID=0, num_zeros=1
## P23,6,41,ID=0, num_zeros=2
## P23,6,42,ID=0, num_zeros=4
## P23,6,43,ID=0, num_zeros=6
## P23,6,44,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=45 in LISTP23[[6]]
## P23,6,46,ID=0, num_zeros=8
## P23,6,47,ID=0, num_zeros=5
## P23,6,48,ID=0, num_zeros=0
## P23,6,49,ID=0, num_zeros=3
## P23,6,50,ID=0, num_zeros=15
## P23,7,1,ID=0, num_zeros=5
## P23,7,2,ID=0, num_zeros=3
## P23,7,3,ID=0, num_zeros=3
## P23,7,4,ID=0, num_zeros=9
## P23,7,5,ID=0, num_zeros=6
## P23,7,6,ID=0, num_zeros=6
## P23,7,7,ID=0, num_zeros=9
## P23,7,8,ID=0, num_zeros=9
## P23,7,9,ID=0, num_zeros=6
## P23,7,10,ID=0, num_zeros=6
## P23,7,11,ID=0, num_zeros=3
## P23,7,12,ID=0, num_zeros=5
## P23,7,13,ID=0, num_zeros=1
## P23,7,14,ID=0, num_zeros=4
## P23,7,15,ID=0, num_zeros=3
## P23,7,16,ID=0, num_zeros=3
## P23,7,17,ID=0, num_zeros=4
## P23,7,18,ID=0, num_zeros=10
## P23,7,19,ID=0, num_zeros=1
## P23,7,20,ID=0, num_zeros=7
## P23,7,21,ID=0, num_zeros=14
## P23,7,22,ID=0, num_zeros=5
## P23,7,23,ID=0, num_zeros=5
## P23,7,24,ID=0, num_zeros=13
## P23,7,25,ID=0, num_zeros=5
## P23,7,26,ID=0, num_zeros=9
## P23,7,27,ID=0, num_zeros=0
## P23,7,28,ID=0, num_zeros=4
## P23,7,29,ID=0, num_zeros=7
## P23,7,30,ID=0, num_zeros=2
## P23,7,31,ID=0, num_zeros=4
## P23,7,32,ID=0, num_zeros=4
## P23,7,33,ID=0, num_zeros=7
## P23,7,34,ID=0, num_zeros=2
## P23,7,35,ID=0, num_zeros=1
## P23,7,36,ID=0, num_zeros=4
## P23,7,37,ID=0, num_zeros=13
## P23,7,38,ID=0, num_zeros=3
## P23,7,39,ID=0, num_zeros=7
## P23,7,40,ID=0, num_zeros=8
## P23,7,41,ID=0, num_zeros=0
## P23,7,42,ID=0, num_zeros=7
## P23,7,43,ID=0, num_zeros=1
## P23,7,44,ID=0, num_zeros=2
## P23,7,45,ID=0, num_zeros=6
## P23,7,46,ID=0, num_zeros=9
## P23,7,47,ID=0, num_zeros=2
## P23,7,48,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=49 in LISTP23[[7]]
## P23,7,50,ID=0, num_zeros=4
## P23,8,1,ID=0, num_zeros=0
## P23,8,2,ID=0, num_zeros=4
## P23,8,3,ID=0, num_zeros=2
## P23,8,4,ID=0, num_zeros=7
## P23,8,5,ID=0, num_zeros=1
## P23,8,6,ID=0, num_zeros=5
## P23,8,7,ID=0, num_zeros=3
## P23,8,8,ID=0, num_zeros=3
## P23,8,9,ID=0, num_zeros=6
## P23,8,10,ID=0, num_zeros=4
## P23,8,11,ID=0, num_zeros=3
## P23,8,12,ID=0, num_zeros=5
## P23,8,13,ID=0, num_zeros=0
## P23,8,14,ID=0, num_zeros=6
## P23,8,15,ID=0, num_zeros=3
## P23,8,16,ID=0, num_zeros=4
## P23,8,17,ID=0, num_zeros=2
## P23,8,18,ID=0, num_zeros=2
## P23,8,19,ID=0, num_zeros=9
## P23,8,20,ID=0, num_zeros=6
## P23,8,21,ID=0, num_zeros=7
## P23,8,22,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=23 in LISTP23[[8]]
## P23,8,24,ID=0, num_zeros=5
## P23,8,25,ID=0, num_zeros=3
## P23,8,26,ID=0, num_zeros=1
## P23,8,27,ID=0, num_zeros=7
## P23,8,28,ID=0, num_zeros=2
## P23,8,29,ID=0, num_zeros=5
## P23,8,30,ID=0, num_zeros=3
## P23,8,31,ID=0, num_zeros=4
## P23,8,32,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=33 in LISTP23[[8]]
## P23,8,34,ID=0, num_zeros=2
## P23,8,35,ID=0, num_zeros=9
## P23,8,36,ID=0, num_zeros=5
## P23,8,37,ID=0, num_zeros=4
## P23,8,38,ID=0, num_zeros=2
## P23,8,39,ID=0, num_zeros=5
## P23,8,40,ID=0, num_zeros=3
## P23,8,41,ID=0, num_zeros=5
## P23,8,42,ID=0, num_zeros=4
## P23,8,43,ID=0, num_zeros=4
## P23,8,44,ID=0, num_zeros=1
## P23,8,45,ID=0, num_zeros=6
## P23,8,46,ID=0, num_zeros=6
## P23,8,47,ID=0, num_zeros=6
## P23,8,48,ID=0, num_zeros=4
## P23,8,49,ID=0, num_zeros=11
## P23,8,50,ID=0, num_zeros=5
## P23,9,1,ID=0, num_zeros=0
## P23,9,2,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=3 in LISTP23[[9]]
## P23,9,4,ID=0, num_zeros=8
## P23,9,5,ID=0, num_zeros=7
## P23,9,6,ID=0, num_zeros=3
## P23,9,7,ID=0, num_zeros=8
## P23,9,8,ID=0, num_zeros=1
## P23,9,9,ID=0, num_zeros=1
## P23,9,10,ID=0, num_zeros=6
## P23,9,11,ID=0, num_zeros=2
## P23,9,12,ID=0, num_zeros=7
## P23,9,13,ID=0, num_zeros=3
## P23,9,14,ID=0, num_zeros=1
## P23,9,15,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=16 in LISTP23[[9]]
## P23,9,17,ID=0, num_zeros=1
## P23,9,18,ID=0, num_zeros=7
## P23,9,19,ID=0, num_zeros=5
## P23,9,20,ID=0, num_zeros=4
## P23,9,21,ID=0, num_zeros=4
## P23,9,22,ID=0, num_zeros=7
## P23,9,23,ID=0, num_zeros=1
## P23,9,24,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=25 in LISTP23[[9]]
## P23,9,26,ID=0, num_zeros=5
## P23,9,27,ID=0, num_zeros=4
## P23,9,28,ID=0, num_zeros=4
## P23,9,29,ID=0, num_zeros=5
## P23,9,30,ID=0, num_zeros=7
## P23,9,31,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=32 in LISTP23[[9]]
## P23,9,33,ID=0, num_zeros=1
## P23,9,34,ID=0, num_zeros=4
## P23,9,35,ID=0, num_zeros=4
## P23,9,36,ID=0, num_zeros=2
## P23,9,37,ID=0, num_zeros=4
## P23,9,38,ID=0, num_zeros=7
## P23,9,39,ID=0, num_zeros=1
## P23,9,40,ID=0, num_zeros=6
## P23,9,41,ID=0, num_zeros=6
## P23,9,42,ID=0, num_zeros=3
## P23,9,43,ID=0, num_zeros=6
## P23,9,44,ID=0, num_zeros=1
## P23,9,45,ID=0, num_zeros=6
## P23,9,46,ID=0, num_zeros=5
## P23,9,47,ID=0, num_zeros=3
## P23,9,48,ID=0, num_zeros=1
## P23,9,49,ID=0, num_zeros=4
## P23,9,50,ID=0, num_zeros=10
## P23,10,1,ID=0, num_zeros=1
## P23,10,2,ID=0, num_zeros=4
## P23,10,3,ID=0, num_zeros=0
## P23,10,4,ID=0, num_zeros=3
## P23,10,5,ID=0, num_zeros=7
## P23,10,6,ID=0, num_zeros=4
## P23,10,7,ID=0, num_zeros=4
## P23,10,8,ID=0, num_zeros=3
## P23,10,9,ID=0, num_zeros=3
## P23,10,10,ID=0, num_zeros=8
## P23,10,11,ID=0, num_zeros=2
## P23,10,12,ID=0, num_zeros=2
## P23,10,13,ID=0, num_zeros=3
## P23,10,14,ID=0, num_zeros=3
## P23,10,15,ID=0, num_zeros=6
## P23,10,16,ID=0, num_zeros=4
## P23,10,17,ID=0, num_zeros=2
## P23,10,18,ID=0, num_zeros=7
## P23,10,19,ID=0, num_zeros=4
## P23,10,20,ID=0, num_zeros=5
## P23,10,21,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=22 in LISTP23[[10]]
## P23,10,23,ID=0, num_zeros=4
## P23,10,24,ID=0, num_zeros=2
## P23,10,25,ID=0, num_zeros=4
## P23,10,26,ID=0, num_zeros=4
## P23,10,27,ID=0, num_zeros=7
## P23,10,28,ID=0, num_zeros=4
## P23,10,29,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=30 in LISTP23[[10]]
## P23,10,31,ID=0, num_zeros=3
## P23,10,32,ID=0, num_zeros=2
## P23,10,33,ID=0, num_zeros=1
## P23,10,34,ID=0, num_zeros=4
## P23,10,35,ID=0, num_zeros=0
## P23,10,36,ID=0, num_zeros=1
## P23,10,37,ID=0, num_zeros=0
## P23,10,38,ID=0, num_zeros=8
## P23,10,39,ID=0, num_zeros=5
## P23,10,40,ID=0, num_zeros=6
## P23,10,41,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=42 in LISTP23[[10]]
## P23,10,43,ID=0, num_zeros=1
## P23,10,44,ID=0, num_zeros=5
## P23,10,45,ID=0, num_zeros=1
## P23,10,46,ID=0, num_zeros=3
## P23,10,47,ID=0, num_zeros=1
## P23,10,48,ID=0, num_zeros=6
## P23,10,49,ID=0, num_zeros=7
## P23,10,50,ID=0, num_zeros=6
## P24,1,1,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=2 in LISTP24[[1]]
## P24,1,3,ID=0, num_zeros=1
## P24,1,4,ID=0, num_zeros=3
## P24,1,5,ID=0, num_zeros=4
## P24,1,6,ID=0, num_zeros=4
## P24,1,7,ID=0, num_zeros=5
## P24,1,8,ID=0, num_zeros=7
## P24,1,9,ID=0, num_zeros=3
## P24,1,10,ID=0, num_zeros=1
## P24,1,11,ID=0, num_zeros=7
## P24,1,12,ID=0, num_zeros=5
## P24,1,13,ID=0, num_zeros=9
## P24,1,14,ID=0, num_zeros=4
## P24,1,15,ID=0, num_zeros=1
## P24,1,16,ID=0, num_zeros=1
## P24,1,17,ID=0, num_zeros=2
## P24,1,18,ID=0, num_zeros=2
## P24,1,19,ID=0, num_zeros=6
## P24,1,20,ID=0, num_zeros=8
## P24,1,21,ID=0, num_zeros=9
## P24,1,22,ID=0, num_zeros=3
## P24,1,23,ID=0, num_zeros=3
## P24,1,24,ID=0, num_zeros=8
## P24,1,25,ID=0, num_zeros=2
## P24,1,26,ID=0, num_zeros=3
## P24,1,27,ID=0, num_zeros=7
## P24,1,28,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=29 in LISTP24[[1]]
## P24,1,30,ID=0, num_zeros=1
## P24,1,31,ID=0, num_zeros=2
## P24,1,32,ID=0, num_zeros=4
## P24,1,33,ID=0, num_zeros=5
## P24,1,34,ID=0, num_zeros=2
## P24,1,35,ID=0, num_zeros=2
## P24,1,36,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=37 in LISTP24[[1]]
## P24,1,38,ID=0, num_zeros=8
## P24,1,39,ID=0, num_zeros=7
## P24,1,40,ID=0, num_zeros=1
## P24,1,41,ID=0, num_zeros=1
## P24,1,42,ID=0, num_zeros=1
## P24,1,43,ID=0, num_zeros=7
## P24,1,44,ID=0, num_zeros=2
## P24,1,45,ID=0, num_zeros=2
## P24,1,46,ID=0, num_zeros=4
## P24,1,47,ID=0, num_zeros=2
## P24,1,48,ID=0, num_zeros=14
## P24,1,49,ID=0, num_zeros=5
## P24,1,50,ID=0, num_zeros=30
## P24,2,1,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=2 in LISTP24[[2]]
## P24,2,3,ID=0, num_zeros=1
## P24,2,4,ID=0, num_zeros=4
## P24,2,5,ID=0, num_zeros=5
## P24,2,6,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=7 in LISTP24[[2]]
## P24,2,8,ID=0, num_zeros=1
## P24,2,9,ID=0, num_zeros=4
## P24,2,10,ID=0, num_zeros=1
## P24,2,11,ID=0, num_zeros=1
## P24,2,12,ID=0, num_zeros=2
## P24,2,13,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=14 in LISTP24[[2]]
## P24,2,15,ID=0, num_zeros=1
## P24,2,16,ID=0, num_zeros=2
## P24,2,17,ID=0, num_zeros=2
## P24,2,18,ID=0, num_zeros=1
## P24,2,19,ID=0, num_zeros=3
## P24,2,20,ID=0, num_zeros=1
## P24,2,21,ID=0, num_zeros=3
## P24,2,22,ID=0, num_zeros=2
## P24,2,23,ID=0, num_zeros=2
## P24,2,24,ID=0, num_zeros=5
## P24,2,25,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=26 in LISTP24[[2]]
## P24,2,27,ID=0, num_zeros=2
## P24,2,28,ID=0, num_zeros=4
## P24,2,29,ID=0, num_zeros=4
## P24,2,30,ID=0, num_zeros=6
## P24,2,31,ID=0, num_zeros=3
## P24,2,32,ID=0, num_zeros=2
## P24,2,33,ID=0, num_zeros=3
## P24,2,34,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=35 in LISTP24[[2]]
## P24,2,36,ID=0, num_zeros=3
## P24,2,37,ID=0, num_zeros=1
## P24,2,38,ID=0, num_zeros=1
## P24,2,39,ID=0, num_zeros=3
## P24,2,40,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=41 in LISTP24[[2]]
## P24,2,42,ID=0, num_zeros=2
## P24,2,43,ID=0, num_zeros=3
## P24,2,44,ID=0, num_zeros=2
## P24,2,45,ID=0, num_zeros=3
## P24,2,46,ID=0, num_zeros=3
## P24,2,47,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=48 in LISTP24[[2]]
## P24,2,49,ID=0, num_zeros=6
## P24,2,50,ID=0, num_zeros=24
## P24,3,1,ID=0, num_zeros=6
## P24,3,2,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=3 in LISTP24[[3]]
## P24,3,4,ID=0, num_zeros=1
## P24,3,5,ID=0, num_zeros=1
## P24,3,6,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=7 in LISTP24[[3]]
## Warning: There are no valid values for INTERVALS=8 in LISTP24[[3]]
## P24,3,9,ID=0, num_zeros=3
## P24,3,10,ID=0, num_zeros=2
## P24,3,11,ID=0, num_zeros=6
## P24,3,12,ID=0, num_zeros=5
## P24,3,13,ID=0, num_zeros=3
## P24,3,14,ID=0, num_zeros=3
## P24,3,15,ID=0, num_zeros=1
## P24,3,16,ID=0, num_zeros=3
## P24,3,17,ID=0, num_zeros=1
## P24,3,18,ID=0, num_zeros=5
## P24,3,19,ID=0, num_zeros=1
## P24,3,20,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=21 in LISTP24[[3]]
## P24,3,22,ID=0, num_zeros=2
## P24,3,23,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=24 in LISTP24[[3]]
## P24,3,25,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=26 in LISTP24[[3]]
## P24,3,27,ID=0, num_zeros=2
## P24,3,28,ID=0, num_zeros=3
## P24,3,29,ID=0, num_zeros=2
## P24,3,30,ID=0, num_zeros=1
## P24,3,31,ID=0, num_zeros=1
## P24,3,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP24[[3]]
## P24,3,34,ID=0, num_zeros=0
## P24,3,35,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=36 in LISTP24[[3]]
## P24,3,37,ID=0, num_zeros=0
## P24,3,38,ID=0, num_zeros=2
## P24,3,39,ID=0, num_zeros=2
## P24,3,40,ID=0, num_zeros=2
## P24,3,41,ID=0, num_zeros=2
## P24,3,42,ID=0, num_zeros=2
## P24,3,43,ID=0, num_zeros=6
## P24,3,44,ID=0, num_zeros=1
## P24,3,45,ID=0, num_zeros=0
## P24,3,46,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=47 in LISTP24[[3]]
## P24,3,48,ID=0, num_zeros=2
## P24,3,49,ID=0, num_zeros=0
## P24,3,50,ID=0, num_zeros=8
## P24,4,1,ID=0, num_zeros=3
## P24,4,2,ID=0, num_zeros=1
## P24,4,3,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=4 in LISTP24[[4]]
## P24,4,5,ID=0, num_zeros=1
## P24,4,6,ID=0, num_zeros=1
## P24,4,7,ID=0, num_zeros=2
## P24,4,8,ID=0, num_zeros=7
## P24,4,9,ID=0, num_zeros=2
## P24,4,10,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=11 in LISTP24[[4]]
## Warning: There are no valid values for INTERVALS=12 in LISTP24[[4]]
## P24,4,13,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=14 in LISTP24[[4]]
## P24,4,15,ID=0, num_zeros=0
## P24,4,16,ID=0, num_zeros=1
## P24,4,17,ID=0, num_zeros=3
## P24,4,18,ID=0, num_zeros=1
## P24,4,19,ID=0, num_zeros=1
## P24,4,20,ID=0, num_zeros=2
## P24,4,21,ID=0, num_zeros=2
## P24,4,22,ID=0, num_zeros=1
## P24,4,23,ID=0, num_zeros=0
## P24,4,24,ID=0, num_zeros=8
## P24,4,25,ID=0, num_zeros=2
## P24,4,26,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=27 in LISTP24[[4]]
## P24,4,28,ID=0, num_zeros=3
## P24,4,29,ID=0, num_zeros=3
## P24,4,30,ID=0, num_zeros=3
## P24,4,31,ID=0, num_zeros=2
## P24,4,32,ID=0, num_zeros=7
## P24,4,33,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=34 in LISTP24[[4]]
## P24,4,35,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=36 in LISTP24[[4]]
## Warning: There are no valid values for INTERVALS=37 in LISTP24[[4]]
## P24,4,38,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=39 in LISTP24[[4]]
## P24,4,40,ID=0, num_zeros=3
## P24,4,41,ID=0, num_zeros=5
## P24,4,42,ID=0, num_zeros=2
## P24,4,43,ID=0, num_zeros=2
## P24,4,44,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=45 in LISTP24[[4]]
## P24,4,46,ID=0, num_zeros=2
## P24,4,47,ID=0, num_zeros=2
## P24,4,48,ID=0, num_zeros=6
## P24,4,49,ID=0, num_zeros=3
## P24,4,50,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=1 in LISTP24[[5]]
## P24,5,2,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=3 in LISTP24[[5]]
## P24,5,4,ID=0, num_zeros=1
## P24,5,5,ID=0, num_zeros=1
## P24,5,6,ID=0, num_zeros=2
## P24,5,7,ID=0, num_zeros=1
## P24,5,8,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=9 in LISTP24[[5]]
## P24,5,10,ID=0, num_zeros=0
## P24,5,11,ID=0, num_zeros=1
## P24,5,12,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=13 in LISTP24[[5]]
## P24,5,14,ID=0, num_zeros=3
## P24,5,15,ID=0, num_zeros=4
## P24,5,16,ID=0, num_zeros=1
## P24,5,17,ID=0, num_zeros=3
## P24,5,18,ID=0, num_zeros=5
## P24,5,19,ID=0, num_zeros=2
## P24,5,20,ID=0, num_zeros=1
## P24,5,21,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=22 in LISTP24[[5]]
## Warning: There are no valid values for INTERVALS=23 in LISTP24[[5]]
## Warning: There are no valid values for INTERVALS=24 in LISTP24[[5]]
## Warning: There are no valid values for INTERVALS=25 in LISTP24[[5]]
## P24,5,26,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=27 in LISTP24[[5]]
## P24,5,28,ID=0, num_zeros=0
## P24,5,29,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=30 in LISTP24[[5]]
## P24,5,31,ID=0, num_zeros=3
## P24,5,32,ID=0, num_zeros=4
## P24,5,33,ID=0, num_zeros=2
## P24,5,34,ID=0, num_zeros=5
## P24,5,35,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=36 in LISTP24[[5]]
## Warning: There are no valid values for INTERVALS=37 in LISTP24[[5]]
## Warning: There are no valid values for INTERVALS=38 in LISTP24[[5]]
## Warning: There are no valid values for INTERVALS=39 in LISTP24[[5]]
## Warning: There are no valid values for INTERVALS=40 in LISTP24[[5]]
## P24,5,41,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=42 in LISTP24[[5]]
## P24,5,43,ID=0, num_zeros=2
## P24,5,44,ID=0, num_zeros=2
## P24,5,45,ID=0, num_zeros=1
## P24,5,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP24[[5]]
## Warning: There are no valid values for INTERVALS=48 in LISTP24[[5]]
## P24,5,49,ID=0, num_zeros=2
## P24,5,50,ID=0, num_zeros=7
## P24,6,1,ID=0, num_zeros=2
## P24,6,2,ID=0, num_zeros=1
## P24,6,3,ID=0, num_zeros=0
## P24,6,4,ID=0, num_zeros=2
## P24,6,5,ID=0, num_zeros=1
## P24,6,6,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=7 in LISTP24[[6]]
## P24,6,8,ID=0, num_zeros=1
## P24,6,9,ID=0, num_zeros=1
## P24,6,10,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=11 in LISTP24[[6]]
## P24,6,12,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=13 in LISTP24[[6]]
## P24,6,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP24[[6]]
## P24,6,16,ID=0, num_zeros=2
## P24,6,17,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=18 in LISTP24[[6]]
## Warning: There are no valid values for INTERVALS=19 in LISTP24[[6]]
## P24,6,20,ID=0, num_zeros=4
## P24,6,21,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=22 in LISTP24[[6]]
## P24,6,23,ID=0, num_zeros=1
## P24,6,24,ID=0, num_zeros=1
## P24,6,25,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=26 in LISTP24[[6]]
## P24,6,27,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=28 in LISTP24[[6]]
## P24,6,29,ID=0, num_zeros=2
## P24,6,30,ID=0, num_zeros=2
## P24,6,31,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=32 in LISTP24[[6]]
## Warning: There are no valid values for INTERVALS=33 in LISTP24[[6]]
## Warning: There are no valid values for INTERVALS=34 in LISTP24[[6]]
## Warning: There are no valid values for INTERVALS=35 in LISTP24[[6]]
## P24,6,36,ID=0, num_zeros=1
## P24,6,37,ID=0, num_zeros=2
## P24,6,38,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=39 in LISTP24[[6]]
## Warning: There are no valid values for INTERVALS=40 in LISTP24[[6]]
## Warning: There are no valid values for INTERVALS=41 in LISTP24[[6]]
## Warning: There are no valid values for INTERVALS=42 in LISTP24[[6]]
## P24,6,43,ID=0, num_zeros=2
## P24,6,44,ID=0, num_zeros=2
## P24,6,45,ID=0, num_zeros=3
## P24,6,46,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=47 in LISTP24[[6]]
## Warning: There are no valid values for INTERVALS=48 in LISTP24[[6]]
## P24,6,49,ID=0, num_zeros=1
## P24,6,50,ID=0, num_zeros=10
## Warning: There are no valid values for INTERVALS=1 in LISTP24[[7]]
## P24,7,2,ID=0, num_zeros=1
## P24,7,3,ID=0, num_zeros=0
## P24,7,4,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=5 in LISTP24[[7]]
## Warning: There are no valid values for INTERVALS=6 in LISTP24[[7]]
## Warning: There are no valid values for INTERVALS=7 in LISTP24[[7]]
## P24,7,8,ID=0, num_zeros=1
## P24,7,9,ID=0, num_zeros=0
## P24,7,10,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=11 in LISTP24[[7]]
## Warning: There are no valid values for INTERVALS=12 in LISTP24[[7]]
## Warning: There are no valid values for INTERVALS=13 in LISTP24[[7]]
## P24,7,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP24[[7]]
## P24,7,16,ID=0, num_zeros=2
## P24,7,17,ID=0, num_zeros=1
## P24,7,18,ID=0, num_zeros=1
## P24,7,19,ID=0, num_zeros=0
## P24,7,20,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=21 in LISTP24[[7]]
## P24,7,22,ID=0, num_zeros=0
## P24,7,23,ID=0, num_zeros=2
## P24,7,24,ID=0, num_zeros=1
## P24,7,25,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=26 in LISTP24[[7]]
## P24,7,27,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=28 in LISTP24[[7]]
## Warning: There are no valid values for INTERVALS=29 in LISTP24[[7]]
## P24,7,30,ID=0, num_zeros=3
## P24,7,31,ID=0, num_zeros=1
## P24,7,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP24[[7]]
## Warning: There are no valid values for INTERVALS=34 in LISTP24[[7]]
## Warning: There are no valid values for INTERVALS=35 in LISTP24[[7]]
## P24,7,36,ID=0, num_zeros=1
## P24,7,37,ID=0, num_zeros=2
## P24,7,38,ID=0, num_zeros=1
## P24,7,39,ID=0, num_zeros=1
## P24,7,40,ID=0, num_zeros=10
## P24,7,41,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=42 in LISTP24[[7]]
## P24,7,43,ID=0, num_zeros=4
## P24,7,44,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=45 in LISTP24[[7]]
## P24,7,46,ID=0, num_zeros=1
## P24,7,47,ID=0, num_zeros=0
## P24,7,48,ID=0, num_zeros=1
## P24,7,49,ID=0, num_zeros=2
## P24,7,50,ID=0, num_zeros=5
## P24,8,1,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=2 in LISTP24[[8]]
## Warning: There are no valid values for INTERVALS=3 in LISTP24[[8]]
## P24,8,4,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=5 in LISTP24[[8]]
## P24,8,6,ID=0, num_zeros=3
## P24,8,7,ID=0, num_zeros=2
## P24,8,8,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=9 in LISTP24[[8]]
## P24,8,10,ID=0, num_zeros=1
## P24,8,11,ID=0, num_zeros=0
## P24,8,12,ID=0, num_zeros=3
## P24,8,13,ID=0, num_zeros=0
## P24,8,14,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=15 in LISTP24[[8]]
## P24,8,16,ID=0, num_zeros=5
## P24,8,17,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=18 in LISTP24[[8]]
## P24,8,19,ID=0, num_zeros=3
## P24,8,20,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=21 in LISTP24[[8]]
## P24,8,22,ID=0, num_zeros=1
## P24,8,23,ID=0, num_zeros=4
## P24,8,24,ID=0, num_zeros=4
## P24,8,25,ID=0, num_zeros=4
## P24,8,26,ID=0, num_zeros=4
## P24,8,27,ID=0, num_zeros=1
## P24,8,28,ID=0, num_zeros=4
## P24,8,29,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=30 in LISTP24[[8]]
## P24,8,31,ID=0, num_zeros=3
## P24,8,32,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=33 in LISTP24[[8]]
## P24,8,34,ID=0, num_zeros=3
## P24,8,35,ID=0, num_zeros=3
## P24,8,36,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=37 in LISTP24[[8]]
## Warning: There are no valid values for INTERVALS=38 in LISTP24[[8]]
## P24,8,39,ID=0, num_zeros=2
## P24,8,40,ID=0, num_zeros=1
## P24,8,41,ID=0, num_zeros=2
## P24,8,42,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=43 in LISTP24[[8]]
## P24,8,44,ID=0, num_zeros=2
## P24,8,45,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=46 in LISTP24[[8]]
## Warning: There are no valid values for INTERVALS=47 in LISTP24[[8]]
## Warning: There are no valid values for INTERVALS=48 in LISTP24[[8]]
## Warning: There are no valid values for INTERVALS=49 in LISTP24[[8]]
## P24,8,50,ID=0, num_zeros=8
## P24,9,1,ID=0, num_zeros=9
## P24,9,2,ID=0, num_zeros=0
## P24,9,3,ID=0, num_zeros=4
## P24,9,4,ID=0, num_zeros=4
## P24,9,5,ID=0, num_zeros=3
## P24,9,6,ID=0, num_zeros=6
## P24,9,7,ID=0, num_zeros=7
## P24,9,8,ID=0, num_zeros=3
## P24,9,9,ID=0, num_zeros=5
## P24,9,10,ID=0, num_zeros=4
## P24,9,11,ID=0, num_zeros=8
## P24,9,12,ID=0, num_zeros=5
## P24,9,13,ID=0, num_zeros=4
## P24,9,14,ID=0, num_zeros=1
## P24,9,15,ID=0, num_zeros=1
## P24,9,16,ID=0, num_zeros=2
## P24,9,17,ID=0, num_zeros=3
## P24,9,18,ID=0, num_zeros=6
## P24,9,19,ID=0, num_zeros=7
## P24,9,20,ID=0, num_zeros=9
## P24,9,21,ID=0, num_zeros=6
## P24,9,22,ID=0, num_zeros=1
## P24,9,23,ID=0, num_zeros=7
## P24,9,24,ID=0, num_zeros=4
## P24,9,25,ID=0, num_zeros=7
## P24,9,26,ID=0, num_zeros=2
## P24,9,27,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=28 in LISTP24[[9]]
## P24,9,29,ID=0, num_zeros=3
## P24,9,30,ID=0, num_zeros=4
## P24,9,31,ID=0, num_zeros=5
## P24,9,32,ID=0, num_zeros=2
## P24,9,33,ID=0, num_zeros=2
## P24,9,34,ID=0, num_zeros=3
## P24,9,35,ID=0, num_zeros=6
## P24,9,36,ID=0, num_zeros=9
## P24,9,37,ID=0, num_zeros=2
## P24,9,38,ID=0, num_zeros=1
## P24,9,39,ID=0, num_zeros=4
## P24,9,40,ID=0, num_zeros=5
## P24,9,41,ID=0, num_zeros=1
## P24,9,42,ID=0, num_zeros=5
## P24,9,43,ID=0, num_zeros=2
## P24,9,44,ID=0, num_zeros=16
## P24,9,45,ID=0, num_zeros=3
## P24,9,46,ID=0, num_zeros=0
## P24,9,47,ID=0, num_zeros=3
## P24,9,48,ID=0, num_zeros=11
## P24,9,49,ID=0, num_zeros=3
## P24,9,50,ID=0, num_zeros=5
## P24,10,1,ID=0, num_zeros=2
## P24,10,2,ID=0, num_zeros=1
## P24,10,3,ID=0, num_zeros=3
## P24,10,4,ID=0, num_zeros=1
## P24,10,5,ID=0, num_zeros=4
## P24,10,6,ID=0, num_zeros=4
## P24,10,7,ID=0, num_zeros=3
## P24,10,8,ID=0, num_zeros=4
## P24,10,9,ID=0, num_zeros=5
## P24,10,10,ID=0, num_zeros=2
## P24,10,11,ID=0, num_zeros=2
## P24,10,12,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=13 in LISTP24[[10]]
## P24,10,14,ID=0, num_zeros=0
## P24,10,15,ID=0, num_zeros=0
## P24,10,16,ID=0, num_zeros=1
## P24,10,17,ID=0, num_zeros=0
## P24,10,18,ID=0, num_zeros=2
## P24,10,19,ID=0, num_zeros=1
## P24,10,20,ID=0, num_zeros=1
## P24,10,21,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=22 in LISTP24[[10]]
## Warning: There are no valid values for INTERVALS=23 in LISTP24[[10]]
## P24,10,24,ID=0, num_zeros=2
## P24,10,25,ID=0, num_zeros=1
## P24,10,26,ID=0, num_zeros=1
## P24,10,27,ID=0, num_zeros=4
## P24,10,28,ID=0, num_zeros=1
## P24,10,29,ID=0, num_zeros=4
## P24,10,30,ID=0, num_zeros=1
## P24,10,31,ID=0, num_zeros=2
## P24,10,32,ID=0, num_zeros=1
## P24,10,33,ID=0, num_zeros=2
## P24,10,34,ID=0, num_zeros=3
## P24,10,35,ID=0, num_zeros=1
## P24,10,36,ID=0, num_zeros=3
## P24,10,37,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=38 in LISTP24[[10]]
## P24,10,39,ID=0, num_zeros=1
## P24,10,40,ID=0, num_zeros=1
## P24,10,41,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=42 in LISTP24[[10]]
## P24,10,43,ID=0, num_zeros=1
## P24,10,44,ID=0, num_zeros=2
## P24,10,45,ID=0, num_zeros=0
## P24,10,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP24[[10]]
## Warning: There are no valid values for INTERVALS=48 in LISTP24[[10]]
## Warning: There are no valid values for INTERVALS=49 in LISTP24[[10]]
## P24,10,50,ID=0, num_zeros=21
## P25,1,1,ID=0, num_zeros=5
## P25,1,2,ID=0, num_zeros=6
## P25,1,3,ID=0, num_zeros=3
## P25,1,4,ID=0, num_zeros=9
## P25,1,5,ID=0, num_zeros=2
## P25,1,6,ID=0, num_zeros=6
## P25,1,7,ID=0, num_zeros=1
## P25,1,8,ID=0, num_zeros=5
## P25,1,9,ID=0, num_zeros=4
## P25,1,10,ID=0, num_zeros=11
## P25,1,11,ID=0, num_zeros=2
## P25,1,12,ID=0, num_zeros=3
## P25,1,13,ID=0, num_zeros=6
## P25,1,14,ID=0, num_zeros=5
## P25,1,15,ID=0, num_zeros=8
## P25,1,16,ID=0, num_zeros=4
## P25,1,17,ID=0, num_zeros=8
## P25,1,18,ID=0, num_zeros=11
## P25,1,19,ID=0, num_zeros=6
## P25,1,20,ID=0, num_zeros=7
## P25,1,21,ID=0, num_zeros=5
## P25,1,22,ID=0, num_zeros=7
## P25,1,23,ID=0, num_zeros=2
## P25,1,24,ID=0, num_zeros=5
## P25,1,25,ID=0, num_zeros=2
## P25,1,26,ID=0, num_zeros=4
## P25,1,27,ID=0, num_zeros=2
## P25,1,28,ID=0, num_zeros=2
## P25,1,29,ID=0, num_zeros=2
## P25,1,30,ID=0, num_zeros=6
## P25,1,31,ID=0, num_zeros=2
## P25,1,32,ID=0, num_zeros=9
## P25,1,33,ID=0, num_zeros=2
## P25,1,34,ID=0, num_zeros=2
## P25,1,35,ID=0, num_zeros=1
## P25,1,36,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=37 in LISTP25[[1]]
## P25,1,38,ID=0, num_zeros=3
## P25,1,39,ID=0, num_zeros=5
## P25,1,40,ID=0, num_zeros=7
## P25,1,41,ID=0, num_zeros=5
## P25,1,42,ID=0, num_zeros=6
## P25,1,43,ID=0, num_zeros=4
## P25,1,44,ID=0, num_zeros=7
## P25,1,45,ID=0, num_zeros=3
## P25,1,46,ID=0, num_zeros=2
## P25,1,47,ID=0, num_zeros=4
## P25,1,48,ID=0, num_zeros=2
## P25,1,49,ID=0, num_zeros=7
## P25,1,50,ID=0, num_zeros=16
## P25,2,1,ID=0, num_zeros=1
## P25,2,2,ID=0, num_zeros=2
## P25,2,3,ID=0, num_zeros=4
## P25,2,4,ID=0, num_zeros=6
## P25,2,5,ID=0, num_zeros=4
## P25,2,6,ID=0, num_zeros=1
## P25,2,7,ID=0, num_zeros=8
## P25,2,8,ID=0, num_zeros=3
## P25,2,9,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=10 in LISTP25[[2]]
## P25,2,11,ID=0, num_zeros=4
## P25,2,12,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=13 in LISTP25[[2]]
## P25,2,14,ID=0, num_zeros=0
## P25,2,15,ID=0, num_zeros=0
## P25,2,16,ID=0, num_zeros=1
## P25,2,17,ID=0, num_zeros=1
## P25,2,18,ID=0, num_zeros=1
## P25,2,19,ID=0, num_zeros=2
## P25,2,20,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=21 in LISTP25[[2]]
## P25,2,22,ID=0, num_zeros=5
## P25,2,23,ID=0, num_zeros=4
## P25,2,24,ID=0, num_zeros=1
## P25,2,25,ID=0, num_zeros=1
## P25,2,26,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=27 in LISTP25[[2]]
## Warning: There are no valid values for INTERVALS=28 in LISTP25[[2]]
## P25,2,29,ID=0, num_zeros=2
## P25,2,30,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=31 in LISTP25[[2]]
## Warning: There are no valid values for INTERVALS=32 in LISTP25[[2]]
## P25,2,33,ID=0, num_zeros=2
## P25,2,34,ID=0, num_zeros=1
## P25,2,35,ID=0, num_zeros=3
## P25,2,36,ID=0, num_zeros=2
## P25,2,37,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=38 in LISTP25[[2]]
## P25,2,39,ID=0, num_zeros=1
## P25,2,40,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=41 in LISTP25[[2]]
## P25,2,42,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=43 in LISTP25[[2]]
## P25,2,44,ID=0, num_zeros=2
## P25,2,45,ID=0, num_zeros=1
## P25,2,46,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=47 in LISTP25[[2]]
## Warning: There are no valid values for INTERVALS=48 in LISTP25[[2]]
## P25,2,49,ID=0, num_zeros=3
## P25,2,50,ID=0, num_zeros=19
## Warning: There are no valid values for INTERVALS=1 in LISTP25[[3]]
## P25,3,2,ID=0, num_zeros=2
## P25,3,3,ID=0, num_zeros=7
## P25,3,4,ID=0, num_zeros=7
## P25,3,5,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=6 in LISTP25[[3]]
## P25,3,7,ID=0, num_zeros=4
## P25,3,8,ID=0, num_zeros=2
## P25,3,9,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=10 in LISTP25[[3]]
## P25,3,11,ID=0, num_zeros=0
## P25,3,12,ID=0, num_zeros=1
## P25,3,13,ID=0, num_zeros=1
## P25,3,14,ID=0, num_zeros=9
## P25,3,15,ID=0, num_zeros=3
## P25,3,16,ID=0, num_zeros=6
## P25,3,17,ID=0, num_zeros=1
## P25,3,18,ID=0, num_zeros=1
## P25,3,19,ID=0, num_zeros=2
## P25,3,20,ID=0, num_zeros=4
## P25,3,21,ID=0, num_zeros=1
## P25,3,22,ID=0, num_zeros=2
## P25,3,23,ID=0, num_zeros=2
## P25,3,24,ID=0, num_zeros=1
## P25,3,25,ID=0, num_zeros=2
## P25,3,26,ID=0, num_zeros=3
## P25,3,27,ID=0, num_zeros=5
## P25,3,28,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=29 in LISTP25[[3]]
## P25,3,30,ID=0, num_zeros=3
## P25,3,31,ID=0, num_zeros=2
## P25,3,32,ID=0, num_zeros=3
## P25,3,33,ID=0, num_zeros=3
## P25,3,34,ID=0, num_zeros=0
## P25,3,35,ID=0, num_zeros=1
## P25,3,36,ID=0, num_zeros=4
## P25,3,37,ID=0, num_zeros=2
## P25,3,38,ID=0, num_zeros=13
## P25,3,39,ID=0, num_zeros=6
## P25,3,40,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=41 in LISTP25[[3]]
## P25,3,42,ID=0, num_zeros=12
## P25,3,43,ID=0, num_zeros=7
## P25,3,44,ID=0, num_zeros=1
## P25,3,45,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=46 in LISTP25[[3]]
## P25,3,47,ID=0, num_zeros=3
## P25,3,48,ID=0, num_zeros=3
## P25,3,49,ID=0, num_zeros=4
## P25,3,50,ID=0, num_zeros=32
## P25,4,1,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=2 in LISTP25[[4]]
## P25,4,3,ID=0, num_zeros=1
## P25,4,4,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=5 in LISTP25[[4]]
## Warning: There are no valid values for INTERVALS=6 in LISTP25[[4]]
## P25,4,7,ID=0, num_zeros=1
## P25,4,8,ID=0, num_zeros=1
## P25,4,9,ID=0, num_zeros=2
## P25,4,10,ID=0, num_zeros=1
## P25,4,11,ID=0, num_zeros=2
## P25,4,12,ID=0, num_zeros=1
## P25,4,13,ID=0, num_zeros=4
## P25,4,14,ID=0, num_zeros=1
## P25,4,15,ID=0, num_zeros=1
## P25,4,16,ID=0, num_zeros=3
## P25,4,17,ID=0, num_zeros=2
## P25,4,18,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=19 in LISTP25[[4]]
## P25,4,20,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=21 in LISTP25[[4]]
## P25,4,22,ID=0, num_zeros=4
## P25,4,23,ID=0, num_zeros=5
## P25,4,24,ID=0, num_zeros=1
## P25,4,25,ID=0, num_zeros=7
## P25,4,26,ID=0, num_zeros=5
## P25,4,27,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=28 in LISTP25[[4]]
## P25,4,29,ID=0, num_zeros=4
## P25,4,30,ID=0, num_zeros=1
## P25,4,31,ID=0, num_zeros=0
## P25,4,32,ID=0, num_zeros=2
## P25,4,33,ID=0, num_zeros=5
## P25,4,34,ID=0, num_zeros=2
## P25,4,35,ID=0, num_zeros=2
## P25,4,36,ID=0, num_zeros=5
## P25,4,37,ID=0, num_zeros=6
## P25,4,38,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=39 in LISTP25[[4]]
## P25,4,40,ID=0, num_zeros=3
## P25,4,41,ID=0, num_zeros=6
## P25,4,42,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=43 in LISTP25[[4]]
## P25,4,44,ID=0, num_zeros=4
## P25,4,45,ID=0, num_zeros=1
## P25,4,46,ID=0, num_zeros=1
## P25,4,47,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=48 in LISTP25[[4]]
## P25,4,49,ID=0, num_zeros=2
## P25,4,50,ID=0, num_zeros=41
## Warning: There are no valid values for INTERVALS=1 in LISTP25[[5]]
## P25,5,2,ID=0, num_zeros=1
## P25,5,3,ID=0, num_zeros=1
## P25,5,4,ID=0, num_zeros=4
## P25,5,5,ID=0, num_zeros=4
## P25,5,6,ID=0, num_zeros=1
## P25,5,7,ID=0, num_zeros=1
## P25,5,8,ID=0, num_zeros=3
## P25,5,9,ID=0, num_zeros=2
## P25,5,10,ID=0, num_zeros=0
## P25,5,11,ID=0, num_zeros=7
## P25,5,12,ID=0, num_zeros=4
## P25,5,13,ID=0, num_zeros=5
## P25,5,14,ID=0, num_zeros=8
## P25,5,15,ID=0, num_zeros=2
## P25,5,16,ID=0, num_zeros=4
## P25,5,17,ID=0, num_zeros=4
## P25,5,18,ID=0, num_zeros=12
## P25,5,19,ID=0, num_zeros=5
## P25,5,20,ID=0, num_zeros=5
## P25,5,21,ID=0, num_zeros=1
## P25,5,22,ID=0, num_zeros=1
## P25,5,23,ID=0, num_zeros=6
## P25,5,24,ID=0, num_zeros=4
## P25,5,25,ID=0, num_zeros=3
## P25,5,26,ID=0, num_zeros=3
## P25,5,27,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=28 in LISTP25[[5]]
## Warning: There are no valid values for INTERVALS=29 in LISTP25[[5]]
## P25,5,30,ID=0, num_zeros=6
## P25,5,31,ID=0, num_zeros=1
## P25,5,32,ID=0, num_zeros=0
## P25,5,33,ID=0, num_zeros=2
## P25,5,34,ID=0, num_zeros=1
## P25,5,35,ID=0, num_zeros=2
## P25,5,36,ID=0, num_zeros=5
## P25,5,37,ID=0, num_zeros=9
## P25,5,38,ID=0, num_zeros=5
## P25,5,39,ID=0, num_zeros=4
## P25,5,40,ID=0, num_zeros=7
## P25,5,41,ID=0, num_zeros=1
## P25,5,42,ID=0, num_zeros=1
## P25,5,43,ID=0, num_zeros=7
## P25,5,44,ID=0, num_zeros=7
## P25,5,45,ID=0, num_zeros=2
## P25,5,46,ID=0, num_zeros=0
## P25,5,47,ID=0, num_zeros=4
## P25,5,48,ID=0, num_zeros=2
## P25,5,49,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=50 in LISTP25[[5]]
## P25,6,1,ID=0, num_zeros=7
## P25,6,2,ID=0, num_zeros=1
## P25,6,3,ID=0, num_zeros=4
## P25,6,4,ID=0, num_zeros=5
## P25,6,5,ID=0, num_zeros=5
## P25,6,6,ID=0, num_zeros=2
## P25,6,7,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=8 in LISTP25[[6]]
## Warning: There are no valid values for INTERVALS=9 in LISTP25[[6]]
## Warning: There are no valid values for INTERVALS=10 in LISTP25[[6]]
## P25,6,11,ID=0, num_zeros=1
## P25,6,12,ID=0, num_zeros=6
## P25,6,13,ID=0, num_zeros=3
## P25,6,14,ID=0, num_zeros=2
## P25,6,15,ID=0, num_zeros=1
## P25,6,16,ID=0, num_zeros=1
## P25,6,17,ID=0, num_zeros=4
## P25,6,18,ID=0, num_zeros=1
## P25,6,19,ID=0, num_zeros=1
## P25,6,20,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=21 in LISTP25[[6]]
## P25,6,22,ID=0, num_zeros=2
## P25,6,23,ID=0, num_zeros=1
## P25,6,24,ID=0, num_zeros=2
## P25,6,25,ID=0, num_zeros=4
## P25,6,26,ID=0, num_zeros=5
## P25,6,27,ID=0, num_zeros=1
## P25,6,28,ID=0, num_zeros=2
## P25,6,29,ID=0, num_zeros=3
## P25,6,30,ID=0, num_zeros=1
## P25,6,31,ID=0, num_zeros=1
## P25,6,32,ID=0, num_zeros=3
## P25,6,33,ID=0, num_zeros=4
## P25,6,34,ID=0, num_zeros=5
## P25,6,35,ID=0, num_zeros=4
## P25,6,36,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=37 in LISTP25[[6]]
## P25,6,38,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=39 in LISTP25[[6]]
## P25,6,40,ID=0, num_zeros=2
## P25,6,41,ID=0, num_zeros=3
## P25,6,42,ID=0, num_zeros=3
## P25,6,43,ID=0, num_zeros=5
## P25,6,44,ID=0, num_zeros=1
## P25,6,45,ID=0, num_zeros=5
## P25,6,46,ID=0, num_zeros=3
## P25,6,47,ID=0, num_zeros=1
## P25,6,48,ID=0, num_zeros=2
## P25,6,49,ID=0, num_zeros=1
## P25,6,50,ID=0, num_zeros=0
## P25,7,1,ID=0, num_zeros=2
## P25,7,2,ID=0, num_zeros=3
## P25,7,3,ID=0, num_zeros=4
## P25,7,4,ID=0, num_zeros=6
## P25,7,5,ID=0, num_zeros=7
## P25,7,6,ID=0, num_zeros=1
## P25,7,7,ID=0, num_zeros=4
## P25,7,8,ID=0, num_zeros=3
## P25,7,9,ID=0, num_zeros=3
## P25,7,10,ID=0, num_zeros=2
## P25,7,11,ID=0, num_zeros=5
## P25,7,12,ID=0, num_zeros=3
## P25,7,13,ID=0, num_zeros=5
## P25,7,14,ID=0, num_zeros=1
## P25,7,15,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=16 in LISTP25[[7]]
## P25,7,17,ID=0, num_zeros=1
## P25,7,18,ID=0, num_zeros=5
## P25,7,19,ID=0, num_zeros=4
## P25,7,20,ID=0, num_zeros=4
## P25,7,21,ID=0, num_zeros=4
## P25,7,22,ID=0, num_zeros=1
## P25,7,23,ID=0, num_zeros=1
## P25,7,24,ID=0, num_zeros=1
## P25,7,25,ID=0, num_zeros=2
## P25,7,26,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=27 in LISTP25[[7]]
## P25,7,28,ID=0, num_zeros=5
## P25,7,29,ID=0, num_zeros=7
## P25,7,30,ID=0, num_zeros=4
## P25,7,31,ID=0, num_zeros=2
## P25,7,32,ID=0, num_zeros=4
## P25,7,33,ID=0, num_zeros=9
## P25,7,34,ID=0, num_zeros=3
## P25,7,35,ID=0, num_zeros=7
## P25,7,36,ID=0, num_zeros=3
## P25,7,37,ID=0, num_zeros=4
## P25,7,38,ID=0, num_zeros=8
## P25,7,39,ID=0, num_zeros=1
## P25,7,40,ID=0, num_zeros=3
## P25,7,41,ID=0, num_zeros=1
## P25,7,42,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=43 in LISTP25[[7]]
## P25,7,44,ID=0, num_zeros=1
## P25,7,45,ID=0, num_zeros=1
## P25,7,46,ID=0, num_zeros=2
## P25,7,47,ID=0, num_zeros=2
## P25,7,48,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=49 in LISTP25[[7]]
## P25,7,50,ID=0, num_zeros=0
## P25,8,1,ID=0, num_zeros=7
## P25,8,2,ID=0, num_zeros=5
## P25,8,3,ID=0, num_zeros=2
## P25,8,4,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=5 in LISTP25[[8]]
## P25,8,6,ID=0, num_zeros=9
## P25,8,7,ID=0, num_zeros=4
## P25,8,8,ID=0, num_zeros=7
## P25,8,9,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=10 in LISTP25[[8]]
## P25,8,11,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=12 in LISTP25[[8]]
## P25,8,13,ID=0, num_zeros=1
## P25,8,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP25[[8]]
## P25,8,16,ID=0, num_zeros=3
## P25,8,17,ID=0, num_zeros=2
## P25,8,18,ID=0, num_zeros=3
## P25,8,19,ID=0, num_zeros=2
## P25,8,20,ID=0, num_zeros=2
## P25,8,21,ID=0, num_zeros=2
## P25,8,22,ID=0, num_zeros=2
## P25,8,23,ID=0, num_zeros=1
## P25,8,24,ID=0, num_zeros=1
## P25,8,25,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=26 in LISTP25[[8]]
## Warning: There are no valid values for INTERVALS=27 in LISTP25[[8]]
## Warning: There are no valid values for INTERVALS=28 in LISTP25[[8]]
## P25,8,29,ID=0, num_zeros=0
## P25,8,30,ID=0, num_zeros=3
## P25,8,31,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=32 in LISTP25[[8]]
## P25,8,33,ID=0, num_zeros=5
## P25,8,34,ID=0, num_zeros=1
## P25,8,35,ID=0, num_zeros=6
## P25,8,36,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=37 in LISTP25[[8]]
## P25,8,38,ID=0, num_zeros=5
## P25,8,39,ID=0, num_zeros=3
## P25,8,40,ID=0, num_zeros=1
## P25,8,41,ID=0, num_zeros=1
## P25,8,42,ID=0, num_zeros=4
## P25,8,43,ID=0, num_zeros=2
## P25,8,44,ID=0, num_zeros=2
## P25,8,45,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=46 in LISTP25[[8]]
## P25,8,47,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=48 in LISTP25[[8]]
## Warning: There are no valid values for INTERVALS=49 in LISTP25[[8]]
## P25,8,50,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=1 in LISTP25[[9]]
## P25,9,2,ID=0, num_zeros=2
## P25,9,3,ID=0, num_zeros=4
## P25,9,4,ID=0, num_zeros=1
## P25,9,5,ID=0, num_zeros=0
## P25,9,6,ID=0, num_zeros=1
## P25,9,7,ID=0, num_zeros=4
## P25,9,8,ID=0, num_zeros=5
## P25,9,9,ID=0, num_zeros=1
## P25,9,10,ID=0, num_zeros=2
## P25,9,11,ID=0, num_zeros=3
## P25,9,12,ID=0, num_zeros=3
## P25,9,13,ID=0, num_zeros=3
## P25,9,14,ID=0, num_zeros=2
## P25,9,15,ID=0, num_zeros=1
## P25,9,16,ID=0, num_zeros=3
## P25,9,17,ID=0, num_zeros=4
## P25,9,18,ID=0, num_zeros=6
## P25,9,19,ID=0, num_zeros=2
## P25,9,20,ID=0, num_zeros=5
## P25,9,21,ID=0, num_zeros=2
## P25,9,22,ID=0, num_zeros=3
## P25,9,23,ID=0, num_zeros=1
## P25,9,24,ID=0, num_zeros=2
## P25,9,25,ID=0, num_zeros=2
## P25,9,26,ID=0, num_zeros=0
## P25,9,27,ID=0, num_zeros=1
## P25,9,28,ID=0, num_zeros=4
## P25,9,29,ID=0, num_zeros=3
## P25,9,30,ID=0, num_zeros=3
## P25,9,31,ID=0, num_zeros=4
## P25,9,32,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=33 in LISTP25[[9]]
## P25,9,34,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=35 in LISTP25[[9]]
## Warning: There are no valid values for INTERVALS=36 in LISTP25[[9]]
## P25,9,37,ID=0, num_zeros=3
## P25,9,38,ID=0, num_zeros=2
## P25,9,39,ID=0, num_zeros=1
## P25,9,40,ID=0, num_zeros=1
## P25,9,41,ID=0, num_zeros=3
## P25,9,42,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=43 in LISTP25[[9]]
## P25,9,44,ID=0, num_zeros=1
## P25,9,45,ID=0, num_zeros=0
## P25,9,46,ID=0, num_zeros=1
## P25,9,47,ID=0, num_zeros=1
## P25,9,48,ID=0, num_zeros=0
## P25,9,49,ID=0, num_zeros=1
## P25,9,50,ID=0, num_zeros=1
## P25,10,1,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=2 in LISTP25[[10]]
## P25,10,3,ID=0, num_zeros=4
## P25,10,4,ID=0, num_zeros=1
## P25,10,5,ID=0, num_zeros=3
## P25,10,6,ID=0, num_zeros=1
## P25,10,7,ID=0, num_zeros=4
## P25,10,8,ID=0, num_zeros=5
## P25,10,9,ID=0, num_zeros=2
## P25,10,10,ID=0, num_zeros=3
## P25,10,11,ID=0, num_zeros=4
## P25,10,12,ID=0, num_zeros=3
## P25,10,13,ID=0, num_zeros=4
## P25,10,14,ID=0, num_zeros=3
## P25,10,15,ID=0, num_zeros=6
## P25,10,16,ID=0, num_zeros=3
## P25,10,17,ID=0, num_zeros=8
## P25,10,18,ID=0, num_zeros=3
## P25,10,19,ID=0, num_zeros=1
## P25,10,20,ID=0, num_zeros=1
## P25,10,21,ID=0, num_zeros=1
## P25,10,22,ID=0, num_zeros=3
## P25,10,23,ID=0, num_zeros=3
## P25,10,24,ID=0, num_zeros=3
## P25,10,25,ID=0, num_zeros=2
## P25,10,26,ID=0, num_zeros=2
## P25,10,27,ID=0, num_zeros=3
## P25,10,28,ID=0, num_zeros=1
## P25,10,29,ID=0, num_zeros=2
## P25,10,30,ID=0, num_zeros=1
## P25,10,31,ID=0, num_zeros=3
## P25,10,32,ID=0, num_zeros=4
## P25,10,33,ID=0, num_zeros=2
## P25,10,34,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=35 in LISTP25[[10]]
## P25,10,36,ID=0, num_zeros=1
## P25,10,37,ID=0, num_zeros=2
## P25,10,38,ID=0, num_zeros=2
## P25,10,39,ID=0, num_zeros=6
## P25,10,40,ID=0, num_zeros=0
## P25,10,41,ID=0, num_zeros=2
## P25,10,42,ID=0, num_zeros=8
## P25,10,43,ID=0, num_zeros=1
## P25,10,44,ID=0, num_zeros=11
## P25,10,45,ID=0, num_zeros=2
## P25,10,46,ID=0, num_zeros=2
## P25,10,47,ID=0, num_zeros=1
## P25,10,48,ID=0, num_zeros=3
## P25,10,49,ID=0, num_zeros=4
## P25,10,50,ID=0, num_zeros=3
## P26,1,1,ID=0, num_zeros=2
## P26,1,2,ID=0, num_zeros=3
## P26,1,3,ID=0, num_zeros=2
## P26,1,4,ID=0, num_zeros=4
## P26,1,5,ID=0, num_zeros=10
## P26,1,6,ID=0, num_zeros=13
## P26,1,7,ID=0, num_zeros=7
## P26,1,8,ID=0, num_zeros=3
## P26,1,9,ID=0, num_zeros=1
## P26,1,10,ID=0, num_zeros=3
## P26,1,11,ID=0, num_zeros=9
## P26,1,12,ID=0, num_zeros=3
## P26,1,13,ID=0, num_zeros=13
## P26,1,14,ID=0, num_zeros=8
## P26,1,15,ID=0, num_zeros=4
## P26,1,16,ID=0, num_zeros=4
## P26,1,17,ID=0, num_zeros=11
## P26,1,18,ID=0, num_zeros=1
## P26,1,19,ID=0, num_zeros=7
## P26,1,20,ID=0, num_zeros=7
## P26,1,21,ID=0, num_zeros=7
## P26,1,22,ID=0, num_zeros=6
## P26,1,23,ID=0, num_zeros=9
## P26,1,24,ID=0, num_zeros=15
## P26,1,25,ID=0, num_zeros=5
## P26,1,26,ID=0, num_zeros=15
## P26,1,27,ID=0, num_zeros=5
## P26,1,28,ID=0, num_zeros=6
## P26,1,29,ID=0, num_zeros=8
## P26,1,30,ID=0, num_zeros=8
## P26,1,31,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=32 in LISTP26[[1]]
## P26,1,33,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=34 in LISTP26[[1]]
## P26,1,35,ID=0, num_zeros=3
## P26,1,36,ID=0, num_zeros=6
## P26,1,37,ID=0, num_zeros=4
## P26,1,38,ID=0, num_zeros=2
## P26,1,39,ID=0, num_zeros=2
## P26,1,40,ID=0, num_zeros=7
## P26,1,41,ID=0, num_zeros=6
## P26,1,42,ID=0, num_zeros=3
## P26,1,43,ID=0, num_zeros=7
## P26,1,44,ID=0, num_zeros=3
## P26,1,45,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=46 in LISTP26[[1]]
## P26,1,47,ID=0, num_zeros=1
## P26,1,48,ID=0, num_zeros=3
## P26,1,49,ID=0, num_zeros=3
## P26,1,50,ID=0, num_zeros=21
## P26,2,1,ID=0, num_zeros=7
## P26,2,2,ID=0, num_zeros=6
## P26,2,3,ID=0, num_zeros=3
## P26,2,4,ID=0, num_zeros=2
## P26,2,5,ID=0, num_zeros=2
## P26,2,6,ID=0, num_zeros=3
## P26,2,7,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=8 in LISTP26[[2]]
## Warning: There are no valid values for INTERVALS=9 in LISTP26[[2]]
## P26,2,10,ID=0, num_zeros=4
## P26,2,11,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=12 in LISTP26[[2]]
## P26,2,13,ID=0, num_zeros=6
## P26,2,14,ID=0, num_zeros=4
## P26,2,15,ID=0, num_zeros=9
## P26,2,16,ID=0, num_zeros=9
## P26,2,17,ID=0, num_zeros=5
## P26,2,18,ID=0, num_zeros=10
## P26,2,19,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=20 in LISTP26[[2]]
## P26,2,21,ID=0, num_zeros=11
## P26,2,22,ID=0, num_zeros=2
## P26,2,23,ID=0, num_zeros=10
## P26,2,24,ID=0, num_zeros=11
## P26,2,25,ID=0, num_zeros=6
## P26,2,26,ID=0, num_zeros=4
## P26,2,27,ID=0, num_zeros=5
## P26,2,28,ID=0, num_zeros=7
## P26,2,29,ID=0, num_zeros=3
## P26,2,30,ID=0, num_zeros=7
## P26,2,31,ID=0, num_zeros=8
## P26,2,32,ID=0, num_zeros=5
## P26,2,33,ID=0, num_zeros=4
## P26,2,34,ID=0, num_zeros=14
## P26,2,35,ID=0, num_zeros=2
## P26,2,36,ID=0, num_zeros=10
## P26,2,37,ID=0, num_zeros=6
## P26,2,38,ID=0, num_zeros=1
## P26,2,39,ID=0, num_zeros=3
## P26,2,40,ID=0, num_zeros=1
## P26,2,41,ID=0, num_zeros=2
## P26,2,42,ID=0, num_zeros=2
## P26,2,43,ID=0, num_zeros=6
## P26,2,44,ID=0, num_zeros=5
## P26,2,45,ID=0, num_zeros=7
## P26,2,46,ID=0, num_zeros=6
## P26,2,47,ID=0, num_zeros=1
## P26,2,48,ID=0, num_zeros=1
## P26,2,49,ID=0, num_zeros=1
## P26,2,50,ID=0, num_zeros=11
## P26,3,1,ID=0, num_zeros=6
## P26,3,2,ID=0, num_zeros=5
## P26,3,3,ID=0, num_zeros=2
## P26,3,4,ID=0, num_zeros=4
## P26,3,5,ID=0, num_zeros=2
## P26,3,6,ID=0, num_zeros=2
## P26,3,7,ID=0, num_zeros=2
## P26,3,8,ID=0, num_zeros=7
## P26,3,9,ID=0, num_zeros=5
## P26,3,10,ID=0, num_zeros=9
## P26,3,11,ID=0, num_zeros=8
## P26,3,12,ID=0, num_zeros=7
## P26,3,13,ID=0, num_zeros=2
## P26,3,14,ID=0, num_zeros=1
## P26,3,15,ID=0, num_zeros=11
## P26,3,16,ID=0, num_zeros=7
## P26,3,17,ID=0, num_zeros=5
## P26,3,18,ID=0, num_zeros=2
## P26,3,19,ID=0, num_zeros=3
## P26,3,20,ID=0, num_zeros=2
## P26,3,21,ID=0, num_zeros=1
## P26,3,22,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=23 in LISTP26[[3]]
## P26,3,24,ID=0, num_zeros=4
## P26,3,25,ID=0, num_zeros=5
## P26,3,26,ID=0, num_zeros=6
## P26,3,27,ID=0, num_zeros=1
## P26,3,28,ID=0, num_zeros=4
## P26,3,29,ID=0, num_zeros=0
## P26,3,30,ID=0, num_zeros=9
## P26,3,31,ID=0, num_zeros=7
## P26,3,32,ID=0, num_zeros=2
## P26,3,33,ID=0, num_zeros=7
## P26,3,34,ID=0, num_zeros=4
## P26,3,35,ID=0, num_zeros=7
## P26,3,36,ID=0, num_zeros=3
## P26,3,37,ID=0, num_zeros=3
## P26,3,38,ID=0, num_zeros=5
## P26,3,39,ID=0, num_zeros=3
## P26,3,40,ID=0, num_zeros=2
## P26,3,41,ID=0, num_zeros=1
## P26,3,42,ID=0, num_zeros=7
## P26,3,43,ID=0, num_zeros=2
## P26,3,44,ID=0, num_zeros=3
## P26,3,45,ID=0, num_zeros=3
## P26,3,46,ID=0, num_zeros=4
## P26,3,47,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=48 in LISTP26[[3]]
## P26,3,49,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=50 in LISTP26[[3]]
## P26,4,1,ID=0, num_zeros=1
## P26,4,2,ID=0, num_zeros=2
## P26,4,3,ID=0, num_zeros=2
## P26,4,4,ID=0, num_zeros=5
## P26,4,5,ID=0, num_zeros=2
## P26,4,6,ID=0, num_zeros=2
## P26,4,7,ID=0, num_zeros=3
## P26,4,8,ID=0, num_zeros=5
## P26,4,9,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=10 in LISTP26[[4]]
## P26,4,11,ID=0, num_zeros=6
## P26,4,12,ID=0, num_zeros=4
## P26,4,13,ID=0, num_zeros=3
## P26,4,14,ID=0, num_zeros=0
## P26,4,15,ID=0, num_zeros=11
## P26,4,16,ID=0, num_zeros=1
## P26,4,17,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=18 in LISTP26[[4]]
## P26,4,19,ID=0, num_zeros=5
## P26,4,20,ID=0, num_zeros=3
## P26,4,21,ID=0, num_zeros=6
## P26,4,22,ID=0, num_zeros=4
## P26,4,23,ID=0, num_zeros=4
## P26,4,24,ID=0, num_zeros=4
## P26,4,25,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=26 in LISTP26[[4]]
## P26,4,27,ID=0, num_zeros=2
## P26,4,28,ID=0, num_zeros=1
## P26,4,29,ID=0, num_zeros=4
## P26,4,30,ID=0, num_zeros=5
## P26,4,31,ID=0, num_zeros=1
## P26,4,32,ID=0, num_zeros=3
## P26,4,33,ID=0, num_zeros=3
## P26,4,34,ID=0, num_zeros=7
## P26,4,35,ID=0, num_zeros=4
## P26,4,36,ID=0, num_zeros=5
## P26,4,37,ID=0, num_zeros=4
## P26,4,38,ID=0, num_zeros=1
## P26,4,39,ID=0, num_zeros=1
## P26,4,40,ID=0, num_zeros=1
## P26,4,41,ID=0, num_zeros=10
## P26,4,42,ID=0, num_zeros=9
## P26,4,43,ID=0, num_zeros=1
## P26,4,44,ID=0, num_zeros=5
## P26,4,45,ID=0, num_zeros=4
## P26,4,46,ID=0, num_zeros=5
## P26,4,47,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=48 in LISTP26[[4]]
## P26,4,49,ID=0, num_zeros=3
## P26,4,50,ID=0, num_zeros=7
## P26,5,1,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=2 in LISTP26[[5]]
## P26,5,3,ID=0, num_zeros=3
## P26,5,4,ID=0, num_zeros=4
## P26,5,5,ID=0, num_zeros=1
## P26,5,6,ID=0, num_zeros=6
## P26,5,7,ID=0, num_zeros=1
## P26,5,8,ID=0, num_zeros=1
## P26,5,9,ID=0, num_zeros=4
## P26,5,10,ID=0, num_zeros=4
## P26,5,11,ID=0, num_zeros=4
## P26,5,12,ID=0, num_zeros=1
## P26,5,13,ID=0, num_zeros=5
## P26,5,14,ID=0, num_zeros=4
## P26,5,15,ID=0, num_zeros=4
## P26,5,16,ID=0, num_zeros=3
## P26,5,17,ID=0, num_zeros=3
## P26,5,18,ID=0, num_zeros=5
## P26,5,19,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=20 in LISTP26[[5]]
## P26,5,21,ID=0, num_zeros=4
## P26,5,22,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=23 in LISTP26[[5]]
## P26,5,24,ID=0, num_zeros=8
## P26,5,25,ID=0, num_zeros=2
## P26,5,26,ID=0, num_zeros=10
## P26,5,27,ID=0, num_zeros=2
## P26,5,28,ID=0, num_zeros=3
## P26,5,29,ID=0, num_zeros=2
## P26,5,30,ID=0, num_zeros=5
## P26,5,31,ID=0, num_zeros=3
## P26,5,32,ID=0, num_zeros=7
## P26,5,33,ID=0, num_zeros=4
## P26,5,34,ID=0, num_zeros=7
## P26,5,35,ID=0, num_zeros=1
## P26,5,36,ID=0, num_zeros=7
## P26,5,37,ID=0, num_zeros=2
## P26,5,38,ID=0, num_zeros=1
## P26,5,39,ID=0, num_zeros=8
## P26,5,40,ID=0, num_zeros=4
## P26,5,41,ID=0, num_zeros=1
## P26,5,42,ID=0, num_zeros=5
## P26,5,43,ID=0, num_zeros=4
## P26,5,44,ID=0, num_zeros=1
## P26,5,45,ID=0, num_zeros=3
## P26,5,46,ID=0, num_zeros=5
## P26,5,47,ID=0, num_zeros=6
## P26,5,48,ID=0, num_zeros=2
## P26,5,49,ID=0, num_zeros=3
## P26,5,50,ID=0, num_zeros=22
## P26,6,1,ID=0, num_zeros=2
## P26,6,2,ID=0, num_zeros=1
## P26,6,3,ID=0, num_zeros=4
## P26,6,4,ID=0, num_zeros=1
## P26,6,5,ID=0, num_zeros=3
## P26,6,6,ID=0, num_zeros=0
## P26,6,7,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=8 in LISTP26[[6]]
## P26,6,9,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=10 in LISTP26[[6]]
## P26,6,11,ID=0, num_zeros=1
## P26,6,12,ID=0, num_zeros=2
## P26,6,13,ID=0, num_zeros=2
## P26,6,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP26[[6]]
## P26,6,16,ID=0, num_zeros=2
## P26,6,17,ID=0, num_zeros=4
## P26,6,18,ID=0, num_zeros=3
## P26,6,19,ID=0, num_zeros=1
## P26,6,20,ID=0, num_zeros=4
## P26,6,21,ID=0, num_zeros=0
## P26,6,22,ID=0, num_zeros=2
## P26,6,23,ID=0, num_zeros=6
## P26,6,24,ID=0, num_zeros=2
## P26,6,25,ID=0, num_zeros=2
## P26,6,26,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=27 in LISTP26[[6]]
## Warning: There are no valid values for INTERVALS=28 in LISTP26[[6]]
## P26,6,29,ID=0, num_zeros=4
## P26,6,30,ID=0, num_zeros=8
## P26,6,31,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=32 in LISTP26[[6]]
## P26,6,33,ID=0, num_zeros=1
## P26,6,34,ID=0, num_zeros=2
## P26,6,35,ID=0, num_zeros=3
## P26,6,36,ID=0, num_zeros=1
## P26,6,37,ID=0, num_zeros=2
## P26,6,38,ID=0, num_zeros=0
## P26,6,39,ID=0, num_zeros=3
## P26,6,40,ID=0, num_zeros=3
## P26,6,41,ID=0, num_zeros=1
## P26,6,42,ID=0, num_zeros=1
## P26,6,43,ID=0, num_zeros=2
## P26,6,44,ID=0, num_zeros=3
## P26,6,45,ID=0, num_zeros=0
## P26,6,46,ID=0, num_zeros=1
## P26,6,47,ID=0, num_zeros=1
## P26,6,48,ID=0, num_zeros=0
## P26,6,49,ID=0, num_zeros=1
## P26,6,50,ID=0, num_zeros=16
## P26,7,1,ID=0, num_zeros=2
## P26,7,2,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=3 in LISTP26[[7]]
## P26,7,4,ID=0, num_zeros=4
## P26,7,5,ID=0, num_zeros=4
## P26,7,6,ID=0, num_zeros=1
## P26,7,7,ID=0, num_zeros=1
## P26,7,8,ID=0, num_zeros=5
## P26,7,9,ID=0, num_zeros=1
## P26,7,10,ID=0, num_zeros=4
## P26,7,11,ID=0, num_zeros=4
## P26,7,12,ID=0, num_zeros=1
## P26,7,13,ID=0, num_zeros=7
## P26,7,14,ID=0, num_zeros=3
## P26,7,15,ID=0, num_zeros=1
## P26,7,16,ID=0, num_zeros=2
## P26,7,17,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=18 in LISTP26[[7]]
## P26,7,19,ID=0, num_zeros=0
## P26,7,20,ID=0, num_zeros=3
## P26,7,21,ID=0, num_zeros=6
## P26,7,22,ID=0, num_zeros=1
## P26,7,23,ID=0, num_zeros=2
## P26,7,24,ID=0, num_zeros=3
## P26,7,25,ID=0, num_zeros=2
## P26,7,26,ID=0, num_zeros=5
## P26,7,27,ID=0, num_zeros=0
## P26,7,28,ID=0, num_zeros=2
## P26,7,29,ID=0, num_zeros=2
## P26,7,30,ID=0, num_zeros=1
## P26,7,31,ID=0, num_zeros=1
## P26,7,32,ID=0, num_zeros=3
## P26,7,33,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=34 in LISTP26[[7]]
## P26,7,35,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=36 in LISTP26[[7]]
## Warning: There are no valid values for INTERVALS=37 in LISTP26[[7]]
## P26,7,38,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=39 in LISTP26[[7]]
## P26,7,40,ID=0, num_zeros=0
## P26,7,41,ID=0, num_zeros=3
## P26,7,42,ID=0, num_zeros=10
## P26,7,43,ID=0, num_zeros=1
## P26,7,44,ID=0, num_zeros=1
## P26,7,45,ID=0, num_zeros=2
## P26,7,46,ID=0, num_zeros=1
## P26,7,47,ID=0, num_zeros=0
## P26,7,48,ID=0, num_zeros=1
## P26,7,49,ID=0, num_zeros=4
## P26,7,50,ID=0, num_zeros=5
## P26,8,1,ID=0, num_zeros=2
## P26,8,2,ID=0, num_zeros=5
## P26,8,3,ID=0, num_zeros=0
## P26,8,4,ID=0, num_zeros=4
## P26,8,5,ID=0, num_zeros=1
## P26,8,6,ID=0, num_zeros=4
## P26,8,7,ID=0, num_zeros=1
## P26,8,8,ID=0, num_zeros=2
## P26,8,9,ID=0, num_zeros=1
## P26,8,10,ID=0, num_zeros=1
## P26,8,11,ID=0, num_zeros=1
## P26,8,12,ID=0, num_zeros=1
## P26,8,13,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=14 in LISTP26[[8]]
## P26,8,15,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=16 in LISTP26[[8]]
## P26,8,17,ID=0, num_zeros=1
## P26,8,18,ID=0, num_zeros=1
## P26,8,19,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=20 in LISTP26[[8]]
## P26,8,21,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=22 in LISTP26[[8]]
## Warning: There are no valid values for INTERVALS=23 in LISTP26[[8]]
## P26,8,24,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=25 in LISTP26[[8]]
## P26,8,26,ID=0, num_zeros=2
## P26,8,27,ID=0, num_zeros=4
## P26,8,28,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=29 in LISTP26[[8]]
## P26,8,30,ID=0, num_zeros=4
## P26,8,31,ID=0, num_zeros=3
## P26,8,32,ID=0, num_zeros=1
## P26,8,33,ID=0, num_zeros=2
## P26,8,34,ID=0, num_zeros=4
## P26,8,35,ID=0, num_zeros=2
## P26,8,36,ID=0, num_zeros=4
## P26,8,37,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=38 in LISTP26[[8]]
## Warning: There are no valid values for INTERVALS=39 in LISTP26[[8]]
## P26,8,40,ID=0, num_zeros=3
## P26,8,41,ID=0, num_zeros=1
## P26,8,42,ID=0, num_zeros=0
## P26,8,43,ID=0, num_zeros=2
## P26,8,44,ID=0, num_zeros=2
## P26,8,45,ID=0, num_zeros=3
## P26,8,46,ID=0, num_zeros=2
## P26,8,47,ID=0, num_zeros=6
## P26,8,48,ID=0, num_zeros=3
## P26,8,49,ID=0, num_zeros=2
## P26,8,50,ID=0, num_zeros=6
## P26,9,1,ID=0, num_zeros=1
## P26,9,2,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=3 in LISTP26[[9]]
## P26,9,4,ID=0, num_zeros=3
## P26,9,5,ID=0, num_zeros=0
## P26,9,6,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=7 in LISTP26[[9]]
## Warning: There are no valid values for INTERVALS=8 in LISTP26[[9]]
## P26,9,9,ID=0, num_zeros=0
## P26,9,10,ID=0, num_zeros=2
## P26,9,11,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=12 in LISTP26[[9]]
## P26,9,13,ID=0, num_zeros=4
## P26,9,14,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=15 in LISTP26[[9]]
## P26,9,16,ID=0, num_zeros=1
## P26,9,17,ID=0, num_zeros=1
## P26,9,18,ID=0, num_zeros=3
## P26,9,19,ID=0, num_zeros=4
## P26,9,20,ID=0, num_zeros=2
## P26,9,21,ID=0, num_zeros=4
## P26,9,22,ID=0, num_zeros=9
## P26,9,23,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=24 in LISTP26[[9]]
## P26,9,25,ID=0, num_zeros=1
## P26,9,26,ID=0, num_zeros=2
## P26,9,27,ID=0, num_zeros=3
## P26,9,28,ID=0, num_zeros=1
## P26,9,29,ID=0, num_zeros=4
## P26,9,30,ID=0, num_zeros=5
## P26,9,31,ID=0, num_zeros=4
## P26,9,32,ID=0, num_zeros=2
## P26,9,33,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=34 in LISTP26[[9]]
## P26,9,35,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=36 in LISTP26[[9]]
## P26,9,37,ID=0, num_zeros=2
## P26,9,38,ID=0, num_zeros=1
## P26,9,39,ID=0, num_zeros=1
## P26,9,40,ID=0, num_zeros=2
## P26,9,41,ID=0, num_zeros=5
## P26,9,42,ID=0, num_zeros=2
## P26,9,43,ID=0, num_zeros=2
## P26,9,44,ID=0, num_zeros=4
## P26,9,45,ID=0, num_zeros=2
## P26,9,46,ID=0, num_zeros=1
## P26,9,47,ID=0, num_zeros=3
## P26,9,48,ID=0, num_zeros=3
## P26,9,49,ID=0, num_zeros=1
## P26,9,50,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=1 in LISTP26[[10]]
## P26,10,2,ID=0, num_zeros=1
## P26,10,3,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=4 in LISTP26[[10]]
## P26,10,5,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=6 in LISTP26[[10]]
## P26,10,7,ID=0, num_zeros=3
## P26,10,8,ID=0, num_zeros=3
## P26,10,9,ID=0, num_zeros=2
## P26,10,10,ID=0, num_zeros=2
## P26,10,11,ID=0, num_zeros=4
## P26,10,12,ID=0, num_zeros=4
## P26,10,13,ID=0, num_zeros=4
## P26,10,14,ID=0, num_zeros=2
## P26,10,15,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=16 in LISTP26[[10]]
## P26,10,17,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=18 in LISTP26[[10]]
## P26,10,19,ID=0, num_zeros=3
## P26,10,20,ID=0, num_zeros=0
## P26,10,21,ID=0, num_zeros=4
## P26,10,22,ID=0, num_zeros=1
## P26,10,23,ID=0, num_zeros=3
## P26,10,24,ID=0, num_zeros=4
## P26,10,25,ID=0, num_zeros=2
## P26,10,26,ID=0, num_zeros=1
## P26,10,27,ID=0, num_zeros=0
## P26,10,28,ID=0, num_zeros=3
## P26,10,29,ID=0, num_zeros=5
## P26,10,30,ID=0, num_zeros=1
## P26,10,31,ID=0, num_zeros=3
## P26,10,32,ID=0, num_zeros=1
## P26,10,33,ID=0, num_zeros=1
## P26,10,34,ID=0, num_zeros=6
## P26,10,35,ID=0, num_zeros=2
## P26,10,36,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=37 in LISTP26[[10]]
## P26,10,38,ID=0, num_zeros=1
## P26,10,39,ID=0, num_zeros=3
## P26,10,40,ID=0, num_zeros=2
## P26,10,41,ID=0, num_zeros=0
## P26,10,42,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=43 in LISTP26[[10]]
## P26,10,44,ID=0, num_zeros=0
## P26,10,45,ID=0, num_zeros=5
## P26,10,46,ID=0, num_zeros=1
## P26,10,47,ID=0, num_zeros=1
## P26,10,48,ID=0, num_zeros=1
## P26,10,49,ID=0, num_zeros=2
## P26,10,50,ID=0, num_zeros=8
## P27,1,1,ID=0, num_zeros=9
## P27,1,2,ID=0, num_zeros=7
## P27,1,3,ID=0, num_zeros=10
## P27,1,4,ID=0, num_zeros=7
## P27,1,5,ID=0, num_zeros=11
## P27,1,6,ID=0, num_zeros=6
## P27,1,7,ID=0, num_zeros=20
## P27,1,8,ID=0, num_zeros=22
## P27,1,9,ID=0, num_zeros=12
## P27,1,10,ID=0, num_zeros=18
## P27,1,11,ID=0, num_zeros=8
## P27,1,12,ID=0, num_zeros=0
## P27,1,13,ID=0, num_zeros=8
## P27,1,14,ID=0, num_zeros=12
## P27,1,15,ID=0, num_zeros=16
## P27,1,16,ID=0, num_zeros=7
## P27,1,17,ID=0, num_zeros=7
## P27,1,18,ID=0, num_zeros=11
## P27,1,19,ID=0, num_zeros=12
## P27,1,20,ID=0, num_zeros=9
## P27,1,21,ID=0, num_zeros=11
## P27,1,22,ID=0, num_zeros=6
## P27,1,23,ID=0, num_zeros=6
## P27,1,24,ID=0, num_zeros=14
## P27,1,25,ID=0, num_zeros=4
## P27,1,26,ID=0, num_zeros=8
## P27,1,27,ID=0, num_zeros=2
## P27,1,28,ID=0, num_zeros=7
## P27,1,29,ID=0, num_zeros=9
## P27,1,30,ID=0, num_zeros=5
## P27,1,31,ID=0, num_zeros=10
## P27,1,32,ID=0, num_zeros=7
## P27,1,33,ID=0, num_zeros=7
## P27,1,34,ID=0, num_zeros=10
## P27,1,35,ID=0, num_zeros=9
## P27,1,36,ID=0, num_zeros=7
## P27,1,37,ID=0, num_zeros=7
## P27,1,38,ID=0, num_zeros=2
## P27,1,39,ID=0, num_zeros=14
## P27,1,40,ID=0, num_zeros=6
## P27,1,41,ID=0, num_zeros=4
## P27,1,42,ID=0, num_zeros=4
## P27,1,43,ID=0, num_zeros=6
## P27,1,44,ID=0, num_zeros=4
## P27,1,45,ID=0, num_zeros=9
## P27,1,46,ID=0, num_zeros=6
## P27,1,47,ID=0, num_zeros=12
## P27,1,48,ID=0, num_zeros=7
## P27,1,49,ID=0, num_zeros=15
## P27,1,50,ID=0, num_zeros=19
## P27,2,1,ID=0, num_zeros=4
## P27,2,2,ID=0, num_zeros=9
## P27,2,3,ID=0, num_zeros=5
## P27,2,4,ID=0, num_zeros=12
## P27,2,5,ID=0, num_zeros=4
## P27,2,6,ID=0, num_zeros=14
## P27,2,7,ID=0, num_zeros=3
## P27,2,8,ID=0, num_zeros=10
## P27,2,9,ID=0, num_zeros=17
## P27,2,10,ID=0, num_zeros=3
## P27,2,11,ID=0, num_zeros=6
## P27,2,12,ID=0, num_zeros=12
## P27,2,13,ID=0, num_zeros=6
## P27,2,14,ID=0, num_zeros=11
## P27,2,15,ID=0, num_zeros=6
## P27,2,16,ID=0, num_zeros=8
## P27,2,17,ID=0, num_zeros=6
## P27,2,18,ID=0, num_zeros=7
## P27,2,19,ID=0, num_zeros=1
## P27,2,20,ID=0, num_zeros=10
## P27,2,21,ID=0, num_zeros=3
## P27,2,22,ID=0, num_zeros=4
## P27,2,23,ID=0, num_zeros=8
## P27,2,24,ID=0, num_zeros=9
## P27,2,25,ID=0, num_zeros=8
## P27,2,26,ID=0, num_zeros=8
## P27,2,27,ID=0, num_zeros=6
## P27,2,28,ID=0, num_zeros=1
## P27,2,29,ID=0, num_zeros=16
## P27,2,30,ID=0, num_zeros=9
## P27,2,31,ID=0, num_zeros=12
## P27,2,32,ID=0, num_zeros=17
## P27,2,33,ID=0, num_zeros=4
## P27,2,34,ID=0, num_zeros=5
## P27,2,35,ID=0, num_zeros=7
## P27,2,36,ID=0, num_zeros=9
## P27,2,37,ID=0, num_zeros=8
## P27,2,38,ID=0, num_zeros=6
## P27,2,39,ID=0, num_zeros=11
## P27,2,40,ID=0, num_zeros=19
## P27,2,41,ID=0, num_zeros=1
## P27,2,42,ID=0, num_zeros=6
## P27,2,43,ID=0, num_zeros=6
## P27,2,44,ID=0, num_zeros=9
## P27,2,45,ID=0, num_zeros=7
## P27,2,46,ID=0, num_zeros=10
## P27,2,47,ID=0, num_zeros=12
## P27,2,48,ID=0, num_zeros=6
## P27,2,49,ID=0, num_zeros=12
## P27,2,50,ID=0, num_zeros=16
## P27,3,1,ID=0, num_zeros=3
## P27,3,2,ID=0, num_zeros=1
## P27,3,3,ID=0, num_zeros=10
## P27,3,4,ID=0, num_zeros=5
## P27,3,5,ID=0, num_zeros=3
## P27,3,6,ID=0, num_zeros=0
## P27,3,7,ID=0, num_zeros=14
## P27,3,8,ID=0, num_zeros=7
## P27,3,9,ID=0, num_zeros=8
## P27,3,10,ID=0, num_zeros=9
## P27,3,11,ID=0, num_zeros=4
## P27,3,12,ID=0, num_zeros=5
## P27,3,13,ID=0, num_zeros=3
## P27,3,14,ID=0, num_zeros=9
## P27,3,15,ID=0, num_zeros=13
## P27,3,16,ID=0, num_zeros=19
## P27,3,17,ID=0, num_zeros=13
## P27,3,18,ID=0, num_zeros=7
## P27,3,19,ID=0, num_zeros=2
## P27,3,20,ID=0, num_zeros=18
## P27,3,21,ID=0, num_zeros=4
## P27,3,22,ID=0, num_zeros=13
## P27,3,23,ID=0, num_zeros=8
## P27,3,24,ID=0, num_zeros=6
## P27,3,25,ID=0, num_zeros=11
## P27,3,26,ID=0, num_zeros=3
## P27,3,27,ID=0, num_zeros=9
## P27,3,28,ID=0, num_zeros=16
## P27,3,29,ID=0, num_zeros=7
## P27,3,30,ID=0, num_zeros=15
## P27,3,31,ID=0, num_zeros=6
## P27,3,32,ID=0, num_zeros=11
## P27,3,33,ID=0, num_zeros=15
## P27,3,34,ID=0, num_zeros=7
## P27,3,35,ID=0, num_zeros=15
## P27,3,36,ID=0, num_zeros=2
## P27,3,37,ID=0, num_zeros=5
## P27,3,38,ID=0, num_zeros=8
## P27,3,39,ID=0, num_zeros=4
## P27,3,40,ID=0, num_zeros=7
## P27,3,41,ID=0, num_zeros=6
## P27,3,42,ID=0, num_zeros=5
## P27,3,43,ID=0, num_zeros=4
## P27,3,44,ID=0, num_zeros=1
## P27,3,45,ID=0, num_zeros=2
## P27,3,46,ID=0, num_zeros=3
## P27,3,47,ID=0, num_zeros=2
## P27,3,48,ID=0, num_zeros=9
## P27,3,49,ID=0, num_zeros=7
## P27,3,50,ID=0, num_zeros=4
## P27,4,1,ID=0, num_zeros=5
## P27,4,2,ID=0, num_zeros=12
## P27,4,3,ID=0, num_zeros=2
## P27,4,4,ID=0, num_zeros=13
## P27,4,5,ID=0, num_zeros=15
## P27,4,6,ID=0, num_zeros=9
## P27,4,7,ID=0, num_zeros=11
## P27,4,8,ID=0, num_zeros=13
## P27,4,9,ID=0, num_zeros=7
## P27,4,10,ID=0, num_zeros=6
## P27,4,11,ID=0, num_zeros=3
## P27,4,12,ID=0, num_zeros=7
## P27,4,13,ID=0, num_zeros=5
## P27,4,14,ID=0, num_zeros=5
## P27,4,15,ID=0, num_zeros=9
## P27,4,16,ID=0, num_zeros=6
## P27,4,17,ID=0, num_zeros=10
## P27,4,18,ID=0, num_zeros=3
## P27,4,19,ID=0, num_zeros=11
## P27,4,20,ID=0, num_zeros=7
## P27,4,21,ID=0, num_zeros=3
## P27,4,22,ID=0, num_zeros=2
## P27,4,23,ID=0, num_zeros=8
## P27,4,24,ID=0, num_zeros=5
## P27,4,25,ID=0, num_zeros=16
## P27,4,26,ID=0, num_zeros=5
## P27,4,27,ID=0, num_zeros=2
## P27,4,28,ID=0, num_zeros=4
## P27,4,29,ID=0, num_zeros=2
## P27,4,30,ID=0, num_zeros=9
## P27,4,31,ID=0, num_zeros=7
## P27,4,32,ID=0, num_zeros=9
## P27,4,33,ID=0, num_zeros=11
## P27,4,34,ID=0, num_zeros=2
## P27,4,35,ID=0, num_zeros=9
## P27,4,36,ID=0, num_zeros=8
## P27,4,37,ID=0, num_zeros=7
## P27,4,38,ID=0, num_zeros=10
## P27,4,39,ID=0, num_zeros=10
## P27,4,40,ID=0, num_zeros=11
## P27,4,41,ID=0, num_zeros=6
## P27,4,42,ID=0, num_zeros=12
## P27,4,43,ID=0, num_zeros=10
## P27,4,44,ID=0, num_zeros=9
## P27,4,45,ID=0, num_zeros=12
## P27,4,46,ID=0, num_zeros=4
## P27,4,47,ID=0, num_zeros=6
## P27,4,48,ID=0, num_zeros=8
## P27,4,49,ID=0, num_zeros=5
## P27,4,50,ID=0, num_zeros=16
## P27,5,1,ID=0, num_zeros=10
## P27,5,2,ID=0, num_zeros=5
## P27,5,3,ID=0, num_zeros=10
## P27,5,4,ID=0, num_zeros=8
## P27,5,5,ID=0, num_zeros=6
## P27,5,6,ID=0, num_zeros=8
## P27,5,7,ID=0, num_zeros=8
## P27,5,8,ID=0, num_zeros=2
## P27,5,9,ID=0, num_zeros=12
## P27,5,10,ID=0, num_zeros=19
## P27,5,11,ID=0, num_zeros=4
## P27,5,12,ID=0, num_zeros=5
## P27,5,13,ID=0, num_zeros=11
## P27,5,14,ID=0, num_zeros=13
## P27,5,15,ID=0, num_zeros=9
## P27,5,16,ID=0, num_zeros=4
## P27,5,17,ID=0, num_zeros=10
## P27,5,18,ID=0, num_zeros=8
## P27,5,19,ID=0, num_zeros=5
## P27,5,20,ID=0, num_zeros=11
## P27,5,21,ID=0, num_zeros=9
## P27,5,22,ID=0, num_zeros=6
## P27,5,23,ID=0, num_zeros=8
## P27,5,24,ID=0, num_zeros=8
## P27,5,25,ID=0, num_zeros=5
## P27,5,26,ID=0, num_zeros=3
## P27,5,27,ID=0, num_zeros=9
## P27,5,28,ID=0, num_zeros=12
## P27,5,29,ID=0, num_zeros=6
## P27,5,30,ID=0, num_zeros=8
## P27,5,31,ID=0, num_zeros=11
## P27,5,32,ID=0, num_zeros=3
## P27,5,33,ID=0, num_zeros=5
## P27,5,34,ID=0, num_zeros=7
## P27,5,35,ID=0, num_zeros=8
## P27,5,36,ID=0, num_zeros=3
## P27,5,37,ID=0, num_zeros=7
## P27,5,38,ID=0, num_zeros=9
## P27,5,39,ID=0, num_zeros=5
## P27,5,40,ID=0, num_zeros=13
## P27,5,41,ID=0, num_zeros=3
## P27,5,42,ID=0, num_zeros=4
## P27,5,43,ID=0, num_zeros=4
## P27,5,44,ID=0, num_zeros=10
## P27,5,45,ID=0, num_zeros=8
## P27,5,46,ID=0, num_zeros=18
## P27,5,47,ID=0, num_zeros=8
## P27,5,48,ID=0, num_zeros=4
## P27,5,49,ID=0, num_zeros=10
## P27,5,50,ID=0, num_zeros=16
## Warning: There are no valid values for INTERVALS=1 in LISTP27[[6]]
## P27,6,2,ID=0, num_zeros=8
## P27,6,3,ID=0, num_zeros=10
## P27,6,4,ID=0, num_zeros=10
## P27,6,5,ID=0, num_zeros=15
## P27,6,6,ID=0, num_zeros=6
## P27,6,7,ID=0, num_zeros=20
## P27,6,8,ID=0, num_zeros=14
## P27,6,9,ID=0, num_zeros=11
## P27,6,10,ID=0, num_zeros=12
## P27,6,11,ID=0, num_zeros=4
## P27,6,12,ID=0, num_zeros=0
## P27,6,13,ID=0, num_zeros=9
## P27,6,14,ID=0, num_zeros=14
## P27,6,15,ID=0, num_zeros=12
## P27,6,16,ID=0, num_zeros=5
## P27,6,17,ID=0, num_zeros=5
## P27,6,18,ID=0, num_zeros=7
## P27,6,19,ID=0, num_zeros=3
## P27,6,20,ID=0, num_zeros=9
## P27,6,21,ID=0, num_zeros=14
## P27,6,22,ID=0, num_zeros=7
## P27,6,23,ID=0, num_zeros=10
## P27,6,24,ID=0, num_zeros=9
## P27,6,25,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=26 in LISTP27[[6]]
## P27,6,27,ID=0, num_zeros=6
## P27,6,28,ID=0, num_zeros=6
## P27,6,29,ID=0, num_zeros=16
## P27,6,30,ID=0, num_zeros=6
## P27,6,31,ID=0, num_zeros=7
## P27,6,32,ID=0, num_zeros=7
## P27,6,33,ID=0, num_zeros=4
## P27,6,34,ID=0, num_zeros=16
## P27,6,35,ID=0, num_zeros=15
## P27,6,36,ID=0, num_zeros=5
## P27,6,37,ID=0, num_zeros=7
## P27,6,38,ID=0, num_zeros=16
## P27,6,39,ID=0, num_zeros=2
## P27,6,40,ID=0, num_zeros=6
## P27,6,41,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=42 in LISTP27[[6]]
## P27,6,43,ID=0, num_zeros=11
## P27,6,44,ID=0, num_zeros=13
## P27,6,45,ID=0, num_zeros=9
## P27,6,46,ID=0, num_zeros=8
## P27,6,47,ID=0, num_zeros=7
## P27,6,48,ID=0, num_zeros=10
## P27,6,49,ID=0, num_zeros=5
## P27,6,50,ID=0, num_zeros=18
## Warning: There are no valid values for INTERVALS=1 in LISTP27[[7]]
## P27,7,2,ID=0, num_zeros=2
## P27,7,3,ID=0, num_zeros=2
## P27,7,4,ID=0, num_zeros=6
## P27,7,5,ID=0, num_zeros=5
## P27,7,6,ID=0, num_zeros=2
## P27,7,7,ID=0, num_zeros=5
## P27,7,8,ID=0, num_zeros=16
## P27,7,9,ID=0, num_zeros=3
## P27,7,10,ID=0, num_zeros=11
## P27,7,11,ID=0, num_zeros=10
## P27,7,12,ID=0, num_zeros=2
## P27,7,13,ID=0, num_zeros=7
## P27,7,14,ID=0, num_zeros=11
## P27,7,15,ID=0, num_zeros=2
## P27,7,16,ID=0, num_zeros=3
## P27,7,17,ID=0, num_zeros=10
## P27,7,18,ID=0, num_zeros=11
## P27,7,19,ID=0, num_zeros=6
## P27,7,20,ID=0, num_zeros=8
## P27,7,21,ID=0, num_zeros=4
## P27,7,22,ID=0, num_zeros=1
## P27,7,23,ID=0, num_zeros=7
## P27,7,24,ID=0, num_zeros=1
## P27,7,25,ID=0, num_zeros=10
## P27,7,26,ID=0, num_zeros=6
## P27,7,27,ID=0, num_zeros=1
## P27,7,28,ID=0, num_zeros=3
## P27,7,29,ID=0, num_zeros=7
## P27,7,30,ID=0, num_zeros=4
## P27,7,31,ID=0, num_zeros=7
## P27,7,32,ID=0, num_zeros=10
## P27,7,33,ID=0, num_zeros=9
## P27,7,34,ID=0, num_zeros=4
## P27,7,35,ID=0, num_zeros=11
## P27,7,36,ID=0, num_zeros=9
## P27,7,37,ID=0, num_zeros=5
## P27,7,38,ID=0, num_zeros=10
## P27,7,39,ID=0, num_zeros=2
## P27,7,40,ID=0, num_zeros=9
## P27,7,41,ID=0, num_zeros=3
## P27,7,42,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=43 in LISTP27[[7]]
## P27,7,44,ID=0, num_zeros=4
## P27,7,45,ID=0, num_zeros=3
## P27,7,46,ID=0, num_zeros=13
## P27,7,47,ID=0, num_zeros=2
## P27,7,48,ID=0, num_zeros=14
## P27,7,49,ID=0, num_zeros=7
## P27,7,50,ID=0, num_zeros=15
## P27,8,1,ID=0, num_zeros=1
## P27,8,2,ID=0, num_zeros=5
## P27,8,3,ID=0, num_zeros=1
## P27,8,4,ID=0, num_zeros=4
## P27,8,5,ID=0, num_zeros=7
## P27,8,6,ID=0, num_zeros=4
## P27,8,7,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=8 in LISTP27[[8]]
## P27,8,9,ID=0, num_zeros=0
## P27,8,10,ID=0, num_zeros=3
## P27,8,11,ID=0, num_zeros=3
## P27,8,12,ID=0, num_zeros=6
## P27,8,13,ID=0, num_zeros=0
## P27,8,14,ID=0, num_zeros=4
## P27,8,15,ID=0, num_zeros=5
## P27,8,16,ID=0, num_zeros=4
## P27,8,17,ID=0, num_zeros=1
## P27,8,18,ID=0, num_zeros=4
## P27,8,19,ID=0, num_zeros=6
## P27,8,20,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=21 in LISTP27[[8]]
## P27,8,22,ID=0, num_zeros=5
## P27,8,23,ID=0, num_zeros=1
## P27,8,24,ID=0, num_zeros=2
## P27,8,25,ID=0, num_zeros=3
## P27,8,26,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=27 in LISTP27[[8]]
## P27,8,28,ID=0, num_zeros=1
## P27,8,29,ID=0, num_zeros=7
## P27,8,30,ID=0, num_zeros=2
## P27,8,31,ID=0, num_zeros=2
## P27,8,32,ID=0, num_zeros=6
## P27,8,33,ID=0, num_zeros=1
## P27,8,34,ID=0, num_zeros=7
## P27,8,35,ID=0, num_zeros=5
## P27,8,36,ID=0, num_zeros=5
## P27,8,37,ID=0, num_zeros=4
## P27,8,38,ID=0, num_zeros=5
## P27,8,39,ID=0, num_zeros=3
## P27,8,40,ID=0, num_zeros=0
## P27,8,41,ID=0, num_zeros=0
## P27,8,42,ID=0, num_zeros=1
## P27,8,43,ID=0, num_zeros=3
## P27,8,44,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=45 in LISTP27[[8]]
## Warning: There are no valid values for INTERVALS=46 in LISTP27[[8]]
## P27,8,47,ID=0, num_zeros=2
## P27,8,48,ID=0, num_zeros=2
## P27,8,49,ID=0, num_zeros=2
## P27,8,50,ID=0, num_zeros=41
## P27,9,1,ID=0, num_zeros=4
## P27,9,2,ID=0, num_zeros=3
## P27,9,3,ID=0, num_zeros=3
## P27,9,4,ID=0, num_zeros=2
## P27,9,5,ID=0, num_zeros=3
## P27,9,6,ID=0, num_zeros=1
## P27,9,7,ID=0, num_zeros=1
## P27,9,8,ID=0, num_zeros=11
## P27,9,9,ID=0, num_zeros=3
## P27,9,10,ID=0, num_zeros=4
## P27,9,11,ID=0, num_zeros=8
## P27,9,12,ID=0, num_zeros=7
## P27,9,13,ID=0, num_zeros=3
## P27,9,14,ID=0, num_zeros=5
## P27,9,15,ID=0, num_zeros=6
## P27,9,16,ID=0, num_zeros=5
## P27,9,17,ID=0, num_zeros=15
## P27,9,18,ID=0, num_zeros=2
## P27,9,19,ID=0, num_zeros=4
## P27,9,20,ID=0, num_zeros=3
## P27,9,21,ID=0, num_zeros=5
## P27,9,22,ID=0, num_zeros=3
## P27,9,23,ID=0, num_zeros=6
## P27,9,24,ID=0, num_zeros=1
## P27,9,25,ID=0, num_zeros=5
## P27,9,26,ID=0, num_zeros=5
## P27,9,27,ID=0, num_zeros=12
## P27,9,28,ID=0, num_zeros=9
## P27,9,29,ID=0, num_zeros=6
## P27,9,30,ID=0, num_zeros=4
## P27,9,31,ID=0, num_zeros=5
## P27,9,32,ID=0, num_zeros=2
## P27,9,33,ID=0, num_zeros=2
## P27,9,34,ID=0, num_zeros=3
## P27,9,35,ID=0, num_zeros=3
## P27,9,36,ID=0, num_zeros=4
## P27,9,37,ID=0, num_zeros=3
## P27,9,38,ID=0, num_zeros=13
## P27,9,39,ID=0, num_zeros=2
## P27,9,40,ID=0, num_zeros=5
## P27,9,41,ID=0, num_zeros=9
## P27,9,42,ID=0, num_zeros=1
## P27,9,43,ID=0, num_zeros=6
## P27,9,44,ID=0, num_zeros=13
## P27,9,45,ID=0, num_zeros=4
## P27,9,46,ID=0, num_zeros=5
## P27,9,47,ID=0, num_zeros=8
## P27,9,48,ID=0, num_zeros=4
## P27,9,49,ID=0, num_zeros=2
## P27,9,50,ID=0, num_zeros=19
## P27,10,1,ID=0, num_zeros=3
## P27,10,2,ID=0, num_zeros=6
## P27,10,3,ID=0, num_zeros=2
## P27,10,4,ID=0, num_zeros=3
## P27,10,5,ID=0, num_zeros=3
## P27,10,6,ID=0, num_zeros=3
## P27,10,7,ID=0, num_zeros=10
## P27,10,8,ID=0, num_zeros=4
## P27,10,9,ID=0, num_zeros=10
## P27,10,10,ID=0, num_zeros=9
## P27,10,11,ID=0, num_zeros=5
## P27,10,12,ID=0, num_zeros=1
## P27,10,13,ID=0, num_zeros=1
## P27,10,14,ID=0, num_zeros=6
## P27,10,15,ID=0, num_zeros=2
## P27,10,16,ID=0, num_zeros=14
## P27,10,17,ID=0, num_zeros=4
## P27,10,18,ID=0, num_zeros=4
## P27,10,19,ID=0, num_zeros=2
## P27,10,20,ID=0, num_zeros=12
## P27,10,21,ID=0, num_zeros=6
## P27,10,22,ID=0, num_zeros=1
## P27,10,23,ID=0, num_zeros=3
## P27,10,24,ID=0, num_zeros=6
## P27,10,25,ID=0, num_zeros=3
## P27,10,26,ID=0, num_zeros=7
## P27,10,27,ID=0, num_zeros=3
## P27,10,28,ID=0, num_zeros=5
## P27,10,29,ID=0, num_zeros=1
## P27,10,30,ID=0, num_zeros=13
## P27,10,31,ID=0, num_zeros=1
## P27,10,32,ID=0, num_zeros=2
## P27,10,33,ID=0, num_zeros=5
## P27,10,34,ID=0, num_zeros=4
## P27,10,35,ID=0, num_zeros=4
## P27,10,36,ID=0, num_zeros=1
## P27,10,37,ID=0, num_zeros=2
## P27,10,38,ID=0, num_zeros=4
## P27,10,39,ID=0, num_zeros=8
## P27,10,40,ID=0, num_zeros=5
## P27,10,41,ID=0, num_zeros=5
## P27,10,42,ID=0, num_zeros=5
## P27,10,43,ID=0, num_zeros=8
## P27,10,44,ID=0, num_zeros=1
## P27,10,45,ID=0, num_zeros=7
## P27,10,46,ID=0, num_zeros=5
## P27,10,47,ID=0, num_zeros=5
## P27,10,48,ID=0, num_zeros=2
## P27,10,49,ID=0, num_zeros=4
## P27,10,50,ID=0, num_zeros=2
## P28,1,1,ID=0, num_zeros=2
## P28,1,2,ID=0, num_zeros=6
## P28,1,3,ID=0, num_zeros=8
## P28,1,4,ID=0, num_zeros=4
## P28,1,5,ID=0, num_zeros=6
## P28,1,6,ID=0, num_zeros=8
## P28,1,7,ID=0, num_zeros=5
## P28,1,8,ID=0, num_zeros=7
## P28,1,9,ID=0, num_zeros=5
## P28,1,10,ID=0, num_zeros=7
## P28,1,11,ID=0, num_zeros=4
## P28,1,12,ID=0, num_zeros=9
## P28,1,13,ID=0, num_zeros=3
## P28,1,14,ID=0, num_zeros=7
## P28,1,15,ID=0, num_zeros=5
## P28,1,16,ID=0, num_zeros=4
## P28,1,17,ID=0, num_zeros=6
## P28,1,18,ID=0, num_zeros=5
## P28,1,19,ID=0, num_zeros=7
## P28,1,20,ID=0, num_zeros=9
## P28,1,21,ID=0, num_zeros=6
## P28,1,22,ID=0, num_zeros=1
## P28,1,23,ID=0, num_zeros=4
## P28,1,24,ID=0, num_zeros=8
## P28,1,25,ID=0, num_zeros=6
## P28,1,26,ID=0, num_zeros=5
## P28,1,27,ID=0, num_zeros=3
## P28,1,28,ID=0, num_zeros=4
## P28,1,29,ID=0, num_zeros=8
## P28,1,30,ID=0, num_zeros=2
## P28,1,31,ID=0, num_zeros=3
## P28,1,32,ID=0, num_zeros=10
## P28,1,33,ID=0, num_zeros=8
## P28,1,34,ID=0, num_zeros=4
## P28,1,35,ID=0, num_zeros=2
## P28,1,36,ID=0, num_zeros=10
## P28,1,37,ID=0, num_zeros=10
## P28,1,38,ID=0, num_zeros=10
## P28,1,39,ID=0, num_zeros=2
## P28,1,40,ID=0, num_zeros=4
## P28,1,41,ID=0, num_zeros=9
## P28,1,42,ID=0, num_zeros=7
## P28,1,43,ID=0, num_zeros=6
## P28,1,44,ID=0, num_zeros=6
## P28,1,45,ID=0, num_zeros=9
## P28,1,46,ID=0, num_zeros=6
## P28,1,47,ID=0, num_zeros=4
## P28,1,48,ID=0, num_zeros=4
## P28,1,49,ID=0, num_zeros=5
## P28,1,50,ID=0, num_zeros=18
## P28,2,1,ID=0, num_zeros=1
## P28,2,2,ID=0, num_zeros=9
## P28,2,3,ID=0, num_zeros=1
## P28,2,4,ID=0, num_zeros=14
## P28,2,5,ID=0, num_zeros=3
## P28,2,6,ID=0, num_zeros=7
## P28,2,7,ID=0, num_zeros=0
## P28,2,8,ID=0, num_zeros=5
## P28,2,9,ID=0, num_zeros=8
## P28,2,10,ID=0, num_zeros=8
## P28,2,11,ID=0, num_zeros=7
## P28,2,12,ID=0, num_zeros=2
## P28,2,13,ID=0, num_zeros=10
## P28,2,14,ID=0, num_zeros=15
## P28,2,15,ID=0, num_zeros=5
## P28,2,16,ID=0, num_zeros=5
## P28,2,17,ID=0, num_zeros=9
## P28,2,18,ID=0, num_zeros=9
## P28,2,19,ID=0, num_zeros=9
## P28,2,20,ID=0, num_zeros=9
## P28,2,21,ID=0, num_zeros=6
## P28,2,22,ID=0, num_zeros=17
## P28,2,23,ID=0, num_zeros=13
## P28,2,24,ID=0, num_zeros=6
## P28,2,25,ID=0, num_zeros=7
## P28,2,26,ID=0, num_zeros=9
## P28,2,27,ID=0, num_zeros=6
## P28,2,28,ID=0, num_zeros=5
## P28,2,29,ID=0, num_zeros=6
## P28,2,30,ID=0, num_zeros=5
## P28,2,31,ID=0, num_zeros=7
## P28,2,32,ID=0, num_zeros=6
## P28,2,33,ID=0, num_zeros=4
## P28,2,34,ID=0, num_zeros=3
## P28,2,35,ID=0, num_zeros=17
## P28,2,36,ID=0, num_zeros=6
## P28,2,37,ID=0, num_zeros=5
## P28,2,38,ID=0, num_zeros=5
## P28,2,39,ID=0, num_zeros=3
## P28,2,40,ID=0, num_zeros=8
## P28,2,41,ID=0, num_zeros=9
## P28,2,42,ID=0, num_zeros=12
## P28,2,43,ID=0, num_zeros=2
## P28,2,44,ID=0, num_zeros=5
## P28,2,45,ID=0, num_zeros=9
## P28,2,46,ID=0, num_zeros=8
## P28,2,47,ID=0, num_zeros=5
## P28,2,48,ID=0, num_zeros=11
## P28,2,49,ID=0, num_zeros=6
## P28,2,50,ID=0, num_zeros=6
## P28,3,1,ID=0, num_zeros=4
## P28,3,2,ID=0, num_zeros=5
## P28,3,3,ID=0, num_zeros=5
## P28,3,4,ID=0, num_zeros=1
## P28,3,5,ID=0, num_zeros=2
## P28,3,6,ID=0, num_zeros=6
## P28,3,7,ID=0, num_zeros=6
## P28,3,8,ID=0, num_zeros=4
## P28,3,9,ID=0, num_zeros=6
## P28,3,10,ID=0, num_zeros=2
## P28,3,11,ID=0, num_zeros=7
## P28,3,12,ID=0, num_zeros=1
## P28,3,13,ID=0, num_zeros=9
## P28,3,14,ID=0, num_zeros=4
## P28,3,15,ID=0, num_zeros=6
## P28,3,16,ID=0, num_zeros=5
## P28,3,17,ID=0, num_zeros=8
## P28,3,18,ID=0, num_zeros=3
## P28,3,19,ID=0, num_zeros=5
## P28,3,20,ID=0, num_zeros=4
## P28,3,21,ID=0, num_zeros=3
## P28,3,22,ID=0, num_zeros=9
## P28,3,23,ID=0, num_zeros=4
## P28,3,24,ID=0, num_zeros=1
## P28,3,25,ID=0, num_zeros=8
## P28,3,26,ID=0, num_zeros=4
## P28,3,27,ID=0, num_zeros=4
## P28,3,28,ID=0, num_zeros=2
## P28,3,29,ID=0, num_zeros=7
## P28,3,30,ID=0, num_zeros=6
## P28,3,31,ID=0, num_zeros=4
## P28,3,32,ID=0, num_zeros=4
## P28,3,33,ID=0, num_zeros=6
## P28,3,34,ID=0, num_zeros=13
## P28,3,35,ID=0, num_zeros=7
## P28,3,36,ID=0, num_zeros=10
## P28,3,37,ID=0, num_zeros=4
## P28,3,38,ID=0, num_zeros=6
## P28,3,39,ID=0, num_zeros=9
## P28,3,40,ID=0, num_zeros=2
## P28,3,41,ID=0, num_zeros=4
## P28,3,42,ID=0, num_zeros=11
## P28,3,43,ID=0, num_zeros=4
## P28,3,44,ID=0, num_zeros=14
## P28,3,45,ID=0, num_zeros=4
## P28,3,46,ID=0, num_zeros=6
## P28,3,47,ID=0, num_zeros=5
## P28,3,48,ID=0, num_zeros=1
## P28,3,49,ID=0, num_zeros=3
## P28,3,50,ID=0, num_zeros=7
## P28,4,1,ID=0, num_zeros=11
## P28,4,2,ID=0, num_zeros=6
## P28,4,3,ID=0, num_zeros=3
## P28,4,4,ID=0, num_zeros=8
## P28,4,5,ID=0, num_zeros=5
## P28,4,6,ID=0, num_zeros=0
## P28,4,7,ID=0, num_zeros=10
## P28,4,8,ID=0, num_zeros=7
## P28,4,9,ID=0, num_zeros=3
## P28,4,10,ID=0, num_zeros=4
## P28,4,11,ID=0, num_zeros=4
## P28,4,12,ID=0, num_zeros=8
## P28,4,13,ID=0, num_zeros=2
## P28,4,14,ID=0, num_zeros=10
## P28,4,15,ID=0, num_zeros=8
## P28,4,16,ID=0, num_zeros=11
## P28,4,17,ID=0, num_zeros=5
## P28,4,18,ID=0, num_zeros=8
## P28,4,19,ID=0, num_zeros=1
## P28,4,20,ID=0, num_zeros=5
## P28,4,21,ID=0, num_zeros=9
## P28,4,22,ID=0, num_zeros=2
## P28,4,23,ID=0, num_zeros=9
## P28,4,24,ID=0, num_zeros=8
## P28,4,25,ID=0, num_zeros=1
## P28,4,26,ID=0, num_zeros=2
## P28,4,27,ID=0, num_zeros=2
## P28,4,28,ID=0, num_zeros=9
## P28,4,29,ID=0, num_zeros=2
## P28,4,30,ID=0, num_zeros=10
## P28,4,31,ID=0, num_zeros=5
## P28,4,32,ID=0, num_zeros=2
## P28,4,33,ID=0, num_zeros=9
## P28,4,34,ID=0, num_zeros=2
## P28,4,35,ID=0, num_zeros=2
## P28,4,36,ID=0, num_zeros=2
## P28,4,37,ID=0, num_zeros=5
## P28,4,38,ID=0, num_zeros=12
## P28,4,39,ID=0, num_zeros=7
## P28,4,40,ID=0, num_zeros=3
## P28,4,41,ID=0, num_zeros=9
## P28,4,42,ID=0, num_zeros=5
## P28,4,43,ID=0, num_zeros=10
## P28,4,44,ID=0, num_zeros=5
## P28,4,45,ID=0, num_zeros=7
## P28,4,46,ID=0, num_zeros=9
## P28,4,47,ID=0, num_zeros=2
## P28,4,48,ID=0, num_zeros=12
## P28,4,49,ID=0, num_zeros=1
## P28,4,50,ID=0, num_zeros=4
## P28,5,1,ID=0, num_zeros=4
## P28,5,2,ID=0, num_zeros=1
## P28,5,3,ID=0, num_zeros=5
## P28,5,4,ID=0, num_zeros=1
## P28,5,5,ID=0, num_zeros=2
## P28,5,6,ID=0, num_zeros=3
## P28,5,7,ID=0, num_zeros=8
## P28,5,8,ID=0, num_zeros=3
## P28,5,9,ID=0, num_zeros=0
## P28,5,10,ID=0, num_zeros=3
## P28,5,11,ID=0, num_zeros=2
## P28,5,12,ID=0, num_zeros=3
## P28,5,13,ID=0, num_zeros=2
## P28,5,14,ID=0, num_zeros=10
## P28,5,15,ID=0, num_zeros=7
## P28,5,16,ID=0, num_zeros=5
## P28,5,17,ID=0, num_zeros=5
## P28,5,18,ID=0, num_zeros=6
## P28,5,19,ID=0, num_zeros=5
## P28,5,20,ID=0, num_zeros=8
## P28,5,21,ID=0, num_zeros=2
## P28,5,22,ID=0, num_zeros=7
## P28,5,23,ID=0, num_zeros=8
## P28,5,24,ID=0, num_zeros=6
## P28,5,25,ID=0, num_zeros=5
## P28,5,26,ID=0, num_zeros=4
## P28,5,27,ID=0, num_zeros=1
## P28,5,28,ID=0, num_zeros=9
## P28,5,29,ID=0, num_zeros=6
## P28,5,30,ID=0, num_zeros=3
## P28,5,31,ID=0, num_zeros=4
## P28,5,32,ID=0, num_zeros=9
## P28,5,33,ID=0, num_zeros=6
## P28,5,34,ID=0, num_zeros=9
## P28,5,35,ID=0, num_zeros=2
## P28,5,36,ID=0, num_zeros=3
## P28,5,37,ID=0, num_zeros=5
## P28,5,38,ID=0, num_zeros=8
## P28,5,39,ID=0, num_zeros=12
## P28,5,40,ID=0, num_zeros=7
## P28,5,41,ID=0, num_zeros=6
## P28,5,42,ID=0, num_zeros=6
## P28,5,43,ID=0, num_zeros=2
## P28,5,44,ID=0, num_zeros=3
## P28,5,45,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=46 in LISTP28[[5]]
## P28,5,47,ID=0, num_zeros=8
## P28,5,48,ID=0, num_zeros=1
## P28,5,49,ID=0, num_zeros=11
## P28,5,50,ID=0, num_zeros=3
## P28,6,1,ID=0, num_zeros=9
## P28,6,2,ID=0, num_zeros=4
## P28,6,3,ID=0, num_zeros=7
## P28,6,4,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=5 in LISTP28[[6]]
## P28,6,6,ID=0, num_zeros=1
## P28,6,7,ID=0, num_zeros=5
## P28,6,8,ID=0, num_zeros=5
## P28,6,9,ID=0, num_zeros=1
## P28,6,10,ID=0, num_zeros=6
## P28,6,11,ID=0, num_zeros=3
## P28,6,12,ID=0, num_zeros=5
## P28,6,13,ID=0, num_zeros=4
## P28,6,14,ID=0, num_zeros=3
## P28,6,15,ID=0, num_zeros=2
## P28,6,16,ID=0, num_zeros=2
## P28,6,17,ID=0, num_zeros=11
## P28,6,18,ID=0, num_zeros=5
## P28,6,19,ID=0, num_zeros=4
## P28,6,20,ID=0, num_zeros=5
## P28,6,21,ID=0, num_zeros=2
## P28,6,22,ID=0, num_zeros=3
## P28,6,23,ID=0, num_zeros=3
## P28,6,24,ID=0, num_zeros=2
## P28,6,25,ID=0, num_zeros=2
## P28,6,26,ID=0, num_zeros=4
## P28,6,27,ID=0, num_zeros=3
## P28,6,28,ID=0, num_zeros=3
## P28,6,29,ID=0, num_zeros=2
## P28,6,30,ID=0, num_zeros=3
## P28,6,31,ID=0, num_zeros=4
## P28,6,32,ID=0, num_zeros=0
## P28,6,33,ID=0, num_zeros=10
## P28,6,34,ID=0, num_zeros=4
## P28,6,35,ID=0, num_zeros=6
## P28,6,36,ID=0, num_zeros=7
## P28,6,37,ID=0, num_zeros=1
## P28,6,38,ID=0, num_zeros=2
## P28,6,39,ID=0, num_zeros=4
## P28,6,40,ID=0, num_zeros=4
## P28,6,41,ID=0, num_zeros=2
## P28,6,42,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=43 in LISTP28[[6]]
## P28,6,44,ID=0, num_zeros=5
## P28,6,45,ID=0, num_zeros=6
## P28,6,46,ID=0, num_zeros=3
## P28,6,47,ID=0, num_zeros=2
## P28,6,48,ID=0, num_zeros=12
## P28,6,49,ID=0, num_zeros=3
## P28,6,50,ID=0, num_zeros=7
## P28,7,1,ID=0, num_zeros=2
## P28,7,2,ID=0, num_zeros=3
## P28,7,3,ID=0, num_zeros=4
## P28,7,4,ID=0, num_zeros=2
## P28,7,5,ID=0, num_zeros=3
## P28,7,6,ID=0, num_zeros=3
## P28,7,7,ID=0, num_zeros=1
## P28,7,8,ID=0, num_zeros=4
## P28,7,9,ID=0, num_zeros=5
## P28,7,10,ID=0, num_zeros=1
## P28,7,11,ID=0, num_zeros=1
## P28,7,12,ID=0, num_zeros=2
## P28,7,13,ID=0, num_zeros=5
## P28,7,14,ID=0, num_zeros=3
## P28,7,15,ID=0, num_zeros=4
## P28,7,16,ID=0, num_zeros=4
## P28,7,17,ID=0, num_zeros=0
## P28,7,18,ID=0, num_zeros=4
## P28,7,19,ID=0, num_zeros=6
## P28,7,20,ID=0, num_zeros=8
## P28,7,21,ID=0, num_zeros=4
## P28,7,22,ID=0, num_zeros=3
## P28,7,23,ID=0, num_zeros=11
## P28,7,24,ID=0, num_zeros=4
## P28,7,25,ID=0, num_zeros=2
## P28,7,26,ID=0, num_zeros=5
## P28,7,27,ID=0, num_zeros=4
## P28,7,28,ID=0, num_zeros=1
## P28,7,29,ID=0, num_zeros=3
## P28,7,30,ID=0, num_zeros=3
## P28,7,31,ID=0, num_zeros=8
## P28,7,32,ID=0, num_zeros=9
## P28,7,33,ID=0, num_zeros=10
## P28,7,34,ID=0, num_zeros=3
## P28,7,35,ID=0, num_zeros=5
## P28,7,36,ID=0, num_zeros=4
## P28,7,37,ID=0, num_zeros=7
## P28,7,38,ID=0, num_zeros=0
## P28,7,39,ID=0, num_zeros=2
## P28,7,40,ID=0, num_zeros=6
## P28,7,41,ID=0, num_zeros=4
## P28,7,42,ID=0, num_zeros=4
## P28,7,43,ID=0, num_zeros=3
## P28,7,44,ID=0, num_zeros=2
## P28,7,45,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=46 in LISTP28[[7]]
## P28,7,47,ID=0, num_zeros=2
## P28,7,48,ID=0, num_zeros=5
## P28,7,49,ID=0, num_zeros=2
## P28,7,50,ID=0, num_zeros=6
## P28,8,1,ID=0, num_zeros=6
## P28,8,2,ID=0, num_zeros=1
## P28,8,3,ID=0, num_zeros=4
## P28,8,4,ID=0, num_zeros=3
## P28,8,5,ID=0, num_zeros=5
## P28,8,6,ID=0, num_zeros=4
## P28,8,7,ID=0, num_zeros=4
## P28,8,8,ID=0, num_zeros=4
## P28,8,9,ID=0, num_zeros=7
## P28,8,10,ID=0, num_zeros=9
## P28,8,11,ID=0, num_zeros=1
## P28,8,12,ID=0, num_zeros=1
## P28,8,13,ID=0, num_zeros=3
## P28,8,14,ID=0, num_zeros=2
## P28,8,15,ID=0, num_zeros=5
## P28,8,16,ID=0, num_zeros=7
## P28,8,17,ID=0, num_zeros=4
## P28,8,18,ID=0, num_zeros=4
## P28,8,19,ID=0, num_zeros=5
## P28,8,20,ID=0, num_zeros=6
## P28,8,21,ID=0, num_zeros=2
## P28,8,22,ID=0, num_zeros=3
## P28,8,23,ID=0, num_zeros=6
## P28,8,24,ID=0, num_zeros=14
## P28,8,25,ID=0, num_zeros=4
## P28,8,26,ID=0, num_zeros=6
## P28,8,27,ID=0, num_zeros=5
## P28,8,28,ID=0, num_zeros=4
## P28,8,29,ID=0, num_zeros=1
## P28,8,30,ID=0, num_zeros=12
## P28,8,31,ID=0, num_zeros=6
## P28,8,32,ID=0, num_zeros=1
## P28,8,33,ID=0, num_zeros=3
## P28,8,34,ID=0, num_zeros=3
## P28,8,35,ID=0, num_zeros=2
## P28,8,36,ID=0, num_zeros=1
## P28,8,37,ID=0, num_zeros=1
## P28,8,38,ID=0, num_zeros=4
## P28,8,39,ID=0, num_zeros=5
## P28,8,40,ID=0, num_zeros=4
## P28,8,41,ID=0, num_zeros=7
## P28,8,42,ID=0, num_zeros=4
## P28,8,43,ID=0, num_zeros=4
## P28,8,44,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=45 in LISTP28[[8]]
## P28,8,46,ID=0, num_zeros=6
## P28,8,47,ID=0, num_zeros=9
## P28,8,48,ID=0, num_zeros=8
## P28,8,49,ID=0, num_zeros=2
## P28,8,50,ID=0, num_zeros=9
## P28,9,1,ID=0, num_zeros=2
## P28,9,2,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=3 in LISTP28[[9]]
## P28,9,4,ID=0, num_zeros=5
## P28,9,5,ID=0, num_zeros=10
## P28,9,6,ID=0, num_zeros=4
## P28,9,7,ID=0, num_zeros=8
## P28,9,8,ID=0, num_zeros=2
## P28,9,9,ID=0, num_zeros=5
## P28,9,10,ID=0, num_zeros=6
## P28,9,11,ID=0, num_zeros=8
## P28,9,12,ID=0, num_zeros=6
## P28,9,13,ID=0, num_zeros=3
## P28,9,14,ID=0, num_zeros=2
## P28,9,15,ID=0, num_zeros=4
## P28,9,16,ID=0, num_zeros=2
## P28,9,17,ID=0, num_zeros=5
## P28,9,18,ID=0, num_zeros=2
## P28,9,19,ID=0, num_zeros=1
## P28,9,20,ID=0, num_zeros=8
## P28,9,21,ID=0, num_zeros=5
## P28,9,22,ID=0, num_zeros=4
## P28,9,23,ID=0, num_zeros=6
## P28,9,24,ID=0, num_zeros=2
## P28,9,25,ID=0, num_zeros=5
## P28,9,26,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=27 in LISTP28[[9]]
## P28,9,28,ID=0, num_zeros=1
## P28,9,29,ID=0, num_zeros=2
## P28,9,30,ID=0, num_zeros=4
## P28,9,31,ID=0, num_zeros=5
## P28,9,32,ID=0, num_zeros=4
## P28,9,33,ID=0, num_zeros=3
## P28,9,34,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=35 in LISTP28[[9]]
## P28,9,36,ID=0, num_zeros=4
## P28,9,37,ID=0, num_zeros=3
## P28,9,38,ID=0, num_zeros=4
## P28,9,39,ID=0, num_zeros=4
## P28,9,40,ID=0, num_zeros=1
## P28,9,41,ID=0, num_zeros=5
## P28,9,42,ID=0, num_zeros=6
## P28,9,43,ID=0, num_zeros=1
## P28,9,44,ID=0, num_zeros=6
## P28,9,45,ID=0, num_zeros=2
## P28,9,46,ID=0, num_zeros=0
## P28,9,47,ID=0, num_zeros=4
## P28,9,48,ID=0, num_zeros=2
## P28,9,49,ID=0, num_zeros=2
## P28,9,50,ID=0, num_zeros=7
## P28,10,1,ID=0, num_zeros=3
## P28,10,2,ID=0, num_zeros=3
## P28,10,3,ID=0, num_zeros=3
## P28,10,4,ID=0, num_zeros=1
## P28,10,5,ID=0, num_zeros=0
## P28,10,6,ID=0, num_zeros=1
## P28,10,7,ID=0, num_zeros=6
## P28,10,8,ID=0, num_zeros=6
## P28,10,9,ID=0, num_zeros=0
## P28,10,10,ID=0, num_zeros=7
## P28,10,11,ID=0, num_zeros=3
## P28,10,12,ID=0, num_zeros=3
## P28,10,13,ID=0, num_zeros=1
## P28,10,14,ID=0, num_zeros=3
## P28,10,15,ID=0, num_zeros=3
## P28,10,16,ID=0, num_zeros=1
## P28,10,17,ID=0, num_zeros=3
## P28,10,18,ID=0, num_zeros=3
## P28,10,19,ID=0, num_zeros=2
## P28,10,20,ID=0, num_zeros=1
## P28,10,21,ID=0, num_zeros=1
## P28,10,22,ID=0, num_zeros=4
## P28,10,23,ID=0, num_zeros=1
## P28,10,24,ID=0, num_zeros=5
## P28,10,25,ID=0, num_zeros=1
## P28,10,26,ID=0, num_zeros=1
## P28,10,27,ID=0, num_zeros=0
## P28,10,28,ID=0, num_zeros=4
## P28,10,29,ID=0, num_zeros=3
## P28,10,30,ID=0, num_zeros=3
## P28,10,31,ID=0, num_zeros=3
## P28,10,32,ID=0, num_zeros=6
## P28,10,33,ID=0, num_zeros=1
## P28,10,34,ID=0, num_zeros=3
## P28,10,35,ID=0, num_zeros=1
## P28,10,36,ID=0, num_zeros=8
## P28,10,37,ID=0, num_zeros=7
## P28,10,38,ID=0, num_zeros=2
## P28,10,39,ID=0, num_zeros=3
## P28,10,40,ID=0, num_zeros=2
## P28,10,41,ID=0, num_zeros=3
## P28,10,42,ID=0, num_zeros=5
## P28,10,43,ID=0, num_zeros=8
## P28,10,44,ID=0, num_zeros=4
## P28,10,45,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=46 in LISTP28[[10]]
## P28,10,47,ID=0, num_zeros=8
## P28,10,48,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=49 in LISTP28[[10]]
## P28,10,50,ID=0, num_zeros=2
## P29,1,1,ID=0, num_zeros=8
## P29,1,2,ID=0, num_zeros=9
## P29,1,3,ID=0, num_zeros=4
## P29,1,4,ID=0, num_zeros=1
## P29,1,5,ID=0, num_zeros=8
## P29,1,6,ID=0, num_zeros=2
## P29,1,7,ID=0, num_zeros=4
## P29,1,8,ID=0, num_zeros=6
## P29,1,9,ID=0, num_zeros=5
## P29,1,10,ID=0, num_zeros=11
## P29,1,11,ID=0, num_zeros=2
## P29,1,12,ID=0, num_zeros=13
## P29,1,13,ID=0, num_zeros=6
## P29,1,14,ID=0, num_zeros=6
## P29,1,15,ID=0, num_zeros=3
## P29,1,16,ID=0, num_zeros=14
## P29,1,17,ID=0, num_zeros=10
## P29,1,18,ID=0, num_zeros=8
## P29,1,19,ID=0, num_zeros=3
## P29,1,20,ID=0, num_zeros=3
## P29,1,21,ID=0, num_zeros=3
## P29,1,22,ID=0, num_zeros=8
## P29,1,23,ID=0, num_zeros=3
## P29,1,24,ID=0, num_zeros=4
## P29,1,25,ID=0, num_zeros=5
## P29,1,26,ID=0, num_zeros=5
## P29,1,27,ID=0, num_zeros=9
## P29,1,28,ID=0, num_zeros=12
## P29,1,29,ID=0, num_zeros=6
## P29,1,30,ID=0, num_zeros=6
## P29,1,31,ID=0, num_zeros=7
## P29,1,32,ID=0, num_zeros=7
## P29,1,33,ID=0, num_zeros=3
## P29,1,34,ID=0, num_zeros=3
## P29,1,35,ID=0, num_zeros=9
## P29,1,36,ID=0, num_zeros=3
## P29,1,37,ID=0, num_zeros=2
## P29,1,38,ID=0, num_zeros=6
## P29,1,39,ID=0, num_zeros=4
## P29,1,40,ID=0, num_zeros=1
## P29,1,41,ID=0, num_zeros=2
## P29,1,42,ID=0, num_zeros=2
## P29,1,43,ID=0, num_zeros=2
## P29,1,44,ID=0, num_zeros=10
## P29,1,45,ID=0, num_zeros=5
## P29,1,46,ID=0, num_zeros=11
## P29,1,47,ID=0, num_zeros=1
## P29,1,48,ID=0, num_zeros=5
## P29,1,49,ID=0, num_zeros=2
## P29,1,50,ID=0, num_zeros=8
## P29,2,1,ID=0, num_zeros=1
## P29,2,2,ID=0, num_zeros=4
## P29,2,3,ID=0, num_zeros=8
## P29,2,4,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=5 in LISTP29[[2]]
## P29,2,6,ID=0, num_zeros=3
## P29,2,7,ID=0, num_zeros=10
## P29,2,8,ID=0, num_zeros=4
## P29,2,9,ID=0, num_zeros=5
## P29,2,10,ID=0, num_zeros=5
## P29,2,11,ID=0, num_zeros=2
## P29,2,12,ID=0, num_zeros=3
## P29,2,13,ID=0, num_zeros=3
## P29,2,14,ID=0, num_zeros=3
## P29,2,15,ID=0, num_zeros=2
## P29,2,16,ID=0, num_zeros=1
## P29,2,17,ID=0, num_zeros=1
## P29,2,18,ID=0, num_zeros=6
## P29,2,19,ID=0, num_zeros=3
## P29,2,20,ID=0, num_zeros=3
## P29,2,21,ID=0, num_zeros=4
## P29,2,22,ID=0, num_zeros=6
## P29,2,23,ID=0, num_zeros=1
## P29,2,24,ID=0, num_zeros=2
## P29,2,25,ID=0, num_zeros=2
## P29,2,26,ID=0, num_zeros=4
## P29,2,27,ID=0, num_zeros=12
## P29,2,28,ID=0, num_zeros=7
## P29,2,29,ID=0, num_zeros=11
## P29,2,30,ID=0, num_zeros=6
## P29,2,31,ID=0, num_zeros=3
## P29,2,32,ID=0, num_zeros=4
## P29,2,33,ID=0, num_zeros=5
## P29,2,34,ID=0, num_zeros=4
## P29,2,35,ID=0, num_zeros=1
## P29,2,36,ID=0, num_zeros=2
## P29,2,37,ID=0, num_zeros=4
## P29,2,38,ID=0, num_zeros=8
## P29,2,39,ID=0, num_zeros=1
## P29,2,40,ID=0, num_zeros=2
## P29,2,41,ID=0, num_zeros=5
## P29,2,42,ID=0, num_zeros=4
## P29,2,43,ID=0, num_zeros=2
## P29,2,44,ID=0, num_zeros=7
## P29,2,45,ID=0, num_zeros=5
## P29,2,46,ID=0, num_zeros=8
## P29,2,47,ID=0, num_zeros=6
## P29,2,48,ID=0, num_zeros=5
## P29,2,49,ID=0, num_zeros=5
## P29,2,50,ID=0, num_zeros=19
## P29,3,1,ID=0, num_zeros=6
## P29,3,2,ID=0, num_zeros=6
## P29,3,3,ID=0, num_zeros=1
## P29,3,4,ID=0, num_zeros=2
## P29,3,5,ID=0, num_zeros=10
## P29,3,6,ID=0, num_zeros=4
## P29,3,7,ID=0, num_zeros=10
## P29,3,8,ID=0, num_zeros=5
## P29,3,9,ID=0, num_zeros=2
## P29,3,10,ID=0, num_zeros=9
## P29,3,11,ID=0, num_zeros=5
## P29,3,12,ID=0, num_zeros=4
## P29,3,13,ID=0, num_zeros=1
## P29,3,14,ID=0, num_zeros=4
## P29,3,15,ID=0, num_zeros=3
## P29,3,16,ID=0, num_zeros=3
## P29,3,17,ID=0, num_zeros=0
## P29,3,18,ID=0, num_zeros=14
## P29,3,19,ID=0, num_zeros=9
## P29,3,20,ID=0, num_zeros=11
## P29,3,21,ID=0, num_zeros=2
## P29,3,22,ID=0, num_zeros=4
## P29,3,23,ID=0, num_zeros=8
## P29,3,24,ID=0, num_zeros=13
## P29,3,25,ID=0, num_zeros=7
## P29,3,26,ID=0, num_zeros=11
## P29,3,27,ID=0, num_zeros=3
## P29,3,28,ID=0, num_zeros=4
## P29,3,29,ID=0, num_zeros=2
## P29,3,30,ID=0, num_zeros=5
## P29,3,31,ID=0, num_zeros=1
## P29,3,32,ID=0, num_zeros=1
## P29,3,33,ID=0, num_zeros=4
## P29,3,34,ID=0, num_zeros=3
## P29,3,35,ID=0, num_zeros=3
## P29,3,36,ID=0, num_zeros=4
## P29,3,37,ID=0, num_zeros=1
## P29,3,38,ID=0, num_zeros=1
## P29,3,39,ID=0, num_zeros=7
## P29,3,40,ID=0, num_zeros=2
## P29,3,41,ID=0, num_zeros=3
## P29,3,42,ID=0, num_zeros=4
## P29,3,43,ID=0, num_zeros=1
## P29,3,44,ID=0, num_zeros=5
## P29,3,45,ID=0, num_zeros=1
## P29,3,46,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=47 in LISTP29[[3]]
## Warning: There are no valid values for INTERVALS=48 in LISTP29[[3]]
## P29,3,49,ID=0, num_zeros=3
## P29,3,50,ID=0, num_zeros=18
## P29,4,1,ID=0, num_zeros=1
## P29,4,2,ID=0, num_zeros=5
## P29,4,3,ID=0, num_zeros=4
## P29,4,4,ID=0, num_zeros=4
## P29,4,5,ID=0, num_zeros=6
## P29,4,6,ID=0, num_zeros=5
## P29,4,7,ID=0, num_zeros=6
## P29,4,8,ID=0, num_zeros=1
## P29,4,9,ID=0, num_zeros=3
## P29,4,10,ID=0, num_zeros=4
## P29,4,11,ID=0, num_zeros=3
## P29,4,12,ID=0, num_zeros=3
## P29,4,13,ID=0, num_zeros=3
## P29,4,14,ID=0, num_zeros=11
## P29,4,15,ID=0, num_zeros=4
## P29,4,16,ID=0, num_zeros=3
## P29,4,17,ID=0, num_zeros=2
## P29,4,18,ID=0, num_zeros=1
## P29,4,19,ID=0, num_zeros=2
## P29,4,20,ID=0, num_zeros=7
## P29,4,21,ID=0, num_zeros=4
## P29,4,22,ID=0, num_zeros=1
## P29,4,23,ID=0, num_zeros=4
## P29,4,24,ID=0, num_zeros=4
## P29,4,25,ID=0, num_zeros=6
## P29,4,26,ID=0, num_zeros=1
## P29,4,27,ID=0, num_zeros=4
## P29,4,28,ID=0, num_zeros=1
## P29,4,29,ID=0, num_zeros=2
## P29,4,30,ID=0, num_zeros=7
## P29,4,31,ID=0, num_zeros=2
## P29,4,32,ID=0, num_zeros=5
## P29,4,33,ID=0, num_zeros=2
## P29,4,34,ID=0, num_zeros=3
## P29,4,35,ID=0, num_zeros=5
## P29,4,36,ID=0, num_zeros=4
## P29,4,37,ID=0, num_zeros=2
## P29,4,38,ID=0, num_zeros=2
## P29,4,39,ID=0, num_zeros=7
## P29,4,40,ID=0, num_zeros=3
## P29,4,41,ID=0, num_zeros=2
## P29,4,42,ID=0, num_zeros=5
## P29,4,43,ID=0, num_zeros=5
## P29,4,44,ID=0, num_zeros=2
## P29,4,45,ID=0, num_zeros=3
## P29,4,46,ID=0, num_zeros=3
## P29,4,47,ID=0, num_zeros=3
## P29,4,48,ID=0, num_zeros=8
## P29,4,49,ID=0, num_zeros=2
## P29,4,50,ID=0, num_zeros=33
## P29,5,1,ID=0, num_zeros=1
## P29,5,2,ID=0, num_zeros=2
## P29,5,3,ID=0, num_zeros=1
## P29,5,4,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=5 in LISTP29[[5]]
## P29,5,6,ID=0, num_zeros=1
## P29,5,7,ID=0, num_zeros=6
## P29,5,8,ID=0, num_zeros=2
## P29,5,9,ID=0, num_zeros=3
## P29,5,10,ID=0, num_zeros=4
## P29,5,11,ID=0, num_zeros=6
## P29,5,12,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=13 in LISTP29[[5]]
## P29,5,14,ID=0, num_zeros=3
## P29,5,15,ID=0, num_zeros=2
## P29,5,16,ID=0, num_zeros=5
## P29,5,17,ID=0, num_zeros=7
## P29,5,18,ID=0, num_zeros=2
## P29,5,19,ID=0, num_zeros=7
## P29,5,20,ID=0, num_zeros=1
## P29,5,21,ID=0, num_zeros=6
## P29,5,22,ID=0, num_zeros=2
## P29,5,23,ID=0, num_zeros=3
## P29,5,24,ID=0, num_zeros=1
## P29,5,25,ID=0, num_zeros=6
## P29,5,26,ID=0, num_zeros=4
## P29,5,27,ID=0, num_zeros=4
## P29,5,28,ID=0, num_zeros=8
## P29,5,29,ID=0, num_zeros=5
## P29,5,30,ID=0, num_zeros=8
## P29,5,31,ID=0, num_zeros=5
## P29,5,32,ID=0, num_zeros=9
## P29,5,33,ID=0, num_zeros=4
## P29,5,34,ID=0, num_zeros=2
## P29,5,35,ID=0, num_zeros=2
## P29,5,36,ID=0, num_zeros=2
## P29,5,37,ID=0, num_zeros=3
## P29,5,38,ID=0, num_zeros=3
## P29,5,39,ID=0, num_zeros=3
## P29,5,40,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=41 in LISTP29[[5]]
## P29,5,42,ID=0, num_zeros=6
## P29,5,43,ID=0, num_zeros=3
## P29,5,44,ID=0, num_zeros=2
## P29,5,45,ID=0, num_zeros=3
## P29,5,46,ID=0, num_zeros=4
## P29,5,47,ID=0, num_zeros=7
## P29,5,48,ID=0, num_zeros=6
## P29,5,49,ID=0, num_zeros=5
## P29,5,50,ID=0, num_zeros=16
## P29,6,1,ID=0, num_zeros=4
## P29,6,2,ID=0, num_zeros=4
## P29,6,3,ID=0, num_zeros=7
## P29,6,4,ID=0, num_zeros=1
## P29,6,5,ID=0, num_zeros=8
## P29,6,6,ID=0, num_zeros=4
## P29,6,7,ID=0, num_zeros=1
## P29,6,8,ID=0, num_zeros=5
## P29,6,9,ID=0, num_zeros=1
## P29,6,10,ID=0, num_zeros=7
## P29,6,11,ID=0, num_zeros=2
## P29,6,12,ID=0, num_zeros=4
## P29,6,13,ID=0, num_zeros=3
## P29,6,14,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=15 in LISTP29[[6]]
## P29,6,16,ID=0, num_zeros=1
## P29,6,17,ID=0, num_zeros=1
## P29,6,18,ID=0, num_zeros=6
## P29,6,19,ID=0, num_zeros=3
## P29,6,20,ID=0, num_zeros=3
## P29,6,21,ID=0, num_zeros=5
## P29,6,22,ID=0, num_zeros=5
## P29,6,23,ID=0, num_zeros=2
## P29,6,24,ID=0, num_zeros=4
## P29,6,25,ID=0, num_zeros=1
## P29,6,26,ID=0, num_zeros=3
## P29,6,27,ID=0, num_zeros=2
## P29,6,28,ID=0, num_zeros=1
## P29,6,29,ID=0, num_zeros=5
## P29,6,30,ID=0, num_zeros=1
## P29,6,31,ID=0, num_zeros=1
## P29,6,32,ID=0, num_zeros=2
## P29,6,33,ID=0, num_zeros=5
## P29,6,34,ID=0, num_zeros=3
## P29,6,35,ID=0, num_zeros=2
## P29,6,36,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=37 in LISTP29[[6]]
## P29,6,38,ID=0, num_zeros=1
## P29,6,39,ID=0, num_zeros=2
## P29,6,40,ID=0, num_zeros=4
## P29,6,41,ID=0, num_zeros=1
## P29,6,42,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=43 in LISTP29[[6]]
## Warning: There are no valid values for INTERVALS=44 in LISTP29[[6]]
## P29,6,45,ID=0, num_zeros=1
## P29,6,46,ID=0, num_zeros=2
## P29,6,47,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=48 in LISTP29[[6]]
## P29,6,49,ID=0, num_zeros=1
## P29,6,50,ID=0, num_zeros=36
## P29,7,1,ID=0, num_zeros=4
## P29,7,2,ID=0, num_zeros=2
## P29,7,3,ID=0, num_zeros=3
## P29,7,4,ID=0, num_zeros=4
## P29,7,5,ID=0, num_zeros=3
## P29,7,6,ID=0, num_zeros=2
## P29,7,7,ID=0, num_zeros=3
## P29,7,8,ID=0, num_zeros=4
## P29,7,9,ID=0, num_zeros=2
## P29,7,10,ID=0, num_zeros=3
## P29,7,11,ID=0, num_zeros=2
## P29,7,12,ID=0, num_zeros=3
## P29,7,13,ID=0, num_zeros=3
## P29,7,14,ID=0, num_zeros=1
## P29,7,15,ID=0, num_zeros=3
## P29,7,16,ID=0, num_zeros=3
## P29,7,17,ID=0, num_zeros=3
## P29,7,18,ID=0, num_zeros=5
## P29,7,19,ID=0, num_zeros=3
## P29,7,20,ID=0, num_zeros=3
## P29,7,21,ID=0, num_zeros=6
## P29,7,22,ID=0, num_zeros=0
## P29,7,23,ID=0, num_zeros=1
## P29,7,24,ID=0, num_zeros=3
## P29,7,25,ID=0, num_zeros=6
## P29,7,26,ID=0, num_zeros=2
## P29,7,27,ID=0, num_zeros=3
## P29,7,28,ID=0, num_zeros=8
## P29,7,29,ID=0, num_zeros=1
## P29,7,30,ID=0, num_zeros=4
## P29,7,31,ID=0, num_zeros=2
## P29,7,32,ID=0, num_zeros=3
## P29,7,33,ID=0, num_zeros=0
## P29,7,34,ID=0, num_zeros=1
## P29,7,35,ID=0, num_zeros=1
## P29,7,36,ID=0, num_zeros=0
## P29,7,37,ID=0, num_zeros=2
## P29,7,38,ID=0, num_zeros=1
## P29,7,39,ID=0, num_zeros=3
## P29,7,40,ID=0, num_zeros=4
## P29,7,41,ID=0, num_zeros=3
## P29,7,42,ID=0, num_zeros=2
## P29,7,43,ID=0, num_zeros=3
## P29,7,44,ID=0, num_zeros=1
## P29,7,45,ID=0, num_zeros=1
## P29,7,46,ID=0, num_zeros=3
## P29,7,47,ID=0, num_zeros=2
## P29,7,48,ID=0, num_zeros=1
## P29,7,49,ID=0, num_zeros=4
## P29,7,50,ID=0, num_zeros=7
## P29,8,1,ID=0, num_zeros=5
## P29,8,2,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=3 in LISTP29[[8]]
## P29,8,4,ID=0, num_zeros=3
## P29,8,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP29[[8]]
## Warning: There are no valid values for INTERVALS=7 in LISTP29[[8]]
## P29,8,8,ID=0, num_zeros=0
## P29,8,9,ID=0, num_zeros=3
## P29,8,10,ID=0, num_zeros=2
## P29,8,11,ID=0, num_zeros=2
## P29,8,12,ID=0, num_zeros=1
## P29,8,13,ID=0, num_zeros=1
## P29,8,14,ID=0, num_zeros=2
## P29,8,15,ID=0, num_zeros=1
## P29,8,16,ID=0, num_zeros=3
## P29,8,17,ID=0, num_zeros=5
## P29,8,18,ID=0, num_zeros=4
## P29,8,19,ID=0, num_zeros=3
## P29,8,20,ID=0, num_zeros=4
## P29,8,21,ID=0, num_zeros=1
## P29,8,22,ID=0, num_zeros=4
## P29,8,23,ID=0, num_zeros=1
## P29,8,24,ID=0, num_zeros=2
## P29,8,25,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=26 in LISTP29[[8]]
## P29,8,27,ID=0, num_zeros=2
## P29,8,28,ID=0, num_zeros=3
## P29,8,29,ID=0, num_zeros=0
## P29,8,30,ID=0, num_zeros=1
## P29,8,31,ID=0, num_zeros=3
## P29,8,32,ID=0, num_zeros=1
## P29,8,33,ID=0, num_zeros=0
## P29,8,34,ID=0, num_zeros=3
## P29,8,35,ID=0, num_zeros=4
## P29,8,36,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=37 in LISTP29[[8]]
## P29,8,38,ID=0, num_zeros=3
## P29,8,39,ID=0, num_zeros=3
## P29,8,40,ID=0, num_zeros=3
## P29,8,41,ID=0, num_zeros=1
## P29,8,42,ID=0, num_zeros=1
## P29,8,43,ID=0, num_zeros=3
## P29,8,44,ID=0, num_zeros=1
## P29,8,45,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=46 in LISTP29[[8]]
## P29,8,47,ID=0, num_zeros=1
## P29,8,48,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=49 in LISTP29[[8]]
## P29,8,50,ID=0, num_zeros=7
## P29,9,1,ID=0, num_zeros=3
## P29,9,2,ID=0, num_zeros=6
## P29,9,3,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=4 in LISTP29[[9]]
## P29,9,5,ID=0, num_zeros=2
## P29,9,6,ID=0, num_zeros=2
## P29,9,7,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=8 in LISTP29[[9]]
## P29,9,9,ID=0, num_zeros=1
## P29,9,10,ID=0, num_zeros=1
## P29,9,11,ID=0, num_zeros=5
## P29,9,12,ID=0, num_zeros=5
## P29,9,13,ID=0, num_zeros=2
## P29,9,14,ID=0, num_zeros=3
## P29,9,15,ID=0, num_zeros=6
## P29,9,16,ID=0, num_zeros=5
## P29,9,17,ID=0, num_zeros=4
## P29,9,18,ID=0, num_zeros=0
## P29,9,19,ID=0, num_zeros=1
## P29,9,20,ID=0, num_zeros=4
## P29,9,21,ID=0, num_zeros=1
## P29,9,22,ID=0, num_zeros=3
## P29,9,23,ID=0, num_zeros=5
## P29,9,24,ID=0, num_zeros=4
## P29,9,25,ID=0, num_zeros=2
## P29,9,26,ID=0, num_zeros=5
## P29,9,27,ID=0, num_zeros=1
## P29,9,28,ID=0, num_zeros=5
## P29,9,29,ID=0, num_zeros=2
## P29,9,30,ID=0, num_zeros=2
## P29,9,31,ID=0, num_zeros=2
## P29,9,32,ID=0, num_zeros=3
## P29,9,33,ID=0, num_zeros=1
## P29,9,34,ID=0, num_zeros=1
## P29,9,35,ID=0, num_zeros=1
## P29,9,36,ID=0, num_zeros=1
## P29,9,37,ID=0, num_zeros=2
## P29,9,38,ID=0, num_zeros=1
## P29,9,39,ID=0, num_zeros=1
## P29,9,40,ID=0, num_zeros=3
## P29,9,41,ID=0, num_zeros=3
## P29,9,42,ID=0, num_zeros=2
## P29,9,43,ID=0, num_zeros=12
## Warning: There are no valid values for INTERVALS=44 in LISTP29[[9]]
## P29,9,45,ID=0, num_zeros=10
## P29,9,46,ID=0, num_zeros=2
## P29,9,47,ID=0, num_zeros=3
## P29,9,48,ID=0, num_zeros=2
## P29,9,49,ID=0, num_zeros=2
## P29,9,50,ID=0, num_zeros=7
## P29,10,1,ID=0, num_zeros=0
## P29,10,2,ID=0, num_zeros=2
## P29,10,3,ID=0, num_zeros=6
## P29,10,4,ID=0, num_zeros=2
## P29,10,5,ID=0, num_zeros=6
## P29,10,6,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=7 in LISTP29[[10]]
## P29,10,8,ID=0, num_zeros=2
## P29,10,9,ID=0, num_zeros=2
## P29,10,10,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=11 in LISTP29[[10]]
## P29,10,12,ID=0, num_zeros=0
## P29,10,13,ID=0, num_zeros=2
## P29,10,14,ID=0, num_zeros=3
## P29,10,15,ID=0, num_zeros=1
## P29,10,16,ID=0, num_zeros=2
## P29,10,17,ID=0, num_zeros=5
## P29,10,18,ID=0, num_zeros=3
## P29,10,19,ID=0, num_zeros=1
## P29,10,20,ID=0, num_zeros=3
## P29,10,21,ID=0, num_zeros=3
## P29,10,22,ID=0, num_zeros=1
## P29,10,23,ID=0, num_zeros=6
## P29,10,24,ID=0, num_zeros=1
## P29,10,25,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=26 in LISTP29[[10]]
## Warning: There are no valid values for INTERVALS=27 in LISTP29[[10]]
## P29,10,28,ID=0, num_zeros=1
## P29,10,29,ID=0, num_zeros=2
## P29,10,30,ID=0, num_zeros=1
## P29,10,31,ID=0, num_zeros=1
## P29,10,32,ID=0, num_zeros=1
## P29,10,33,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=34 in LISTP29[[10]]
## Warning: There are no valid values for INTERVALS=35 in LISTP29[[10]]
## P29,10,36,ID=0, num_zeros=2
## P29,10,37,ID=0, num_zeros=2
## P29,10,38,ID=0, num_zeros=3
## P29,10,39,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=40 in LISTP29[[10]]
## P29,10,41,ID=0, num_zeros=1
## P29,10,42,ID=0, num_zeros=2
## P29,10,43,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=44 in LISTP29[[10]]
## P29,10,45,ID=0, num_zeros=1
## P29,10,46,ID=0, num_zeros=1
## P29,10,47,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=48 in LISTP29[[10]]
## P29,10,49,ID=0, num_zeros=6
## P29,10,50,ID=0, num_zeros=6
## P30,1,1,ID=0, num_zeros=4
## P30,1,2,ID=0, num_zeros=8
## P30,1,3,ID=0, num_zeros=6
## P30,1,4,ID=0, num_zeros=3
## P30,1,5,ID=0, num_zeros=4
## P30,1,6,ID=0, num_zeros=13
## P30,1,7,ID=0, num_zeros=10
## P30,1,8,ID=0, num_zeros=15
## P30,1,9,ID=0, num_zeros=16
## P30,1,10,ID=0, num_zeros=7
## P30,1,11,ID=0, num_zeros=4
## P30,1,12,ID=0, num_zeros=7
## P30,1,13,ID=0, num_zeros=3
## P30,1,14,ID=0, num_zeros=6
## P30,1,15,ID=0, num_zeros=10
## P30,1,16,ID=0, num_zeros=2
## P30,1,17,ID=0, num_zeros=5
## P30,1,18,ID=0, num_zeros=5
## P30,1,19,ID=0, num_zeros=6
## P30,1,20,ID=0, num_zeros=11
## P30,1,21,ID=0, num_zeros=3
## P30,1,22,ID=0, num_zeros=9
## P30,1,23,ID=0, num_zeros=9
## P30,1,24,ID=0, num_zeros=6
## P30,1,25,ID=0, num_zeros=3
## P30,1,26,ID=0, num_zeros=4
## P30,1,27,ID=0, num_zeros=2
## P30,1,28,ID=0, num_zeros=3
## P30,1,29,ID=0, num_zeros=3
## P30,1,30,ID=0, num_zeros=2
## P30,1,31,ID=0, num_zeros=8
## P30,1,32,ID=0, num_zeros=7
## P30,1,33,ID=0, num_zeros=2
## P30,1,34,ID=0, num_zeros=3
## P30,1,35,ID=0, num_zeros=3
## P30,1,36,ID=0, num_zeros=4
## P30,1,37,ID=0, num_zeros=6
## P30,1,38,ID=0, num_zeros=6
## P30,1,39,ID=0, num_zeros=0
## P30,1,40,ID=0, num_zeros=5
## P30,1,41,ID=0, num_zeros=6
## P30,1,42,ID=0, num_zeros=10
## P30,1,43,ID=0, num_zeros=1
## P30,1,44,ID=0, num_zeros=5
## P30,1,45,ID=0, num_zeros=3
## P30,1,46,ID=0, num_zeros=5
## P30,1,47,ID=0, num_zeros=7
## P30,1,48,ID=0, num_zeros=3
## P30,1,49,ID=0, num_zeros=3
## P30,1,50,ID=0, num_zeros=7
## P30,2,1,ID=0, num_zeros=2
## P30,2,2,ID=0, num_zeros=6
## P30,2,3,ID=0, num_zeros=5
## P30,2,4,ID=0, num_zeros=4
## P30,2,5,ID=0, num_zeros=4
## P30,2,6,ID=0, num_zeros=5
## P30,2,7,ID=0, num_zeros=1
## P30,2,8,ID=0, num_zeros=4
## P30,2,9,ID=0, num_zeros=3
## P30,2,10,ID=0, num_zeros=3
## P30,2,11,ID=0, num_zeros=3
## P30,2,12,ID=0, num_zeros=5
## P30,2,13,ID=0, num_zeros=2
## P30,2,14,ID=0, num_zeros=7
## P30,2,15,ID=0, num_zeros=1
## P30,2,16,ID=0, num_zeros=2
## P30,2,17,ID=0, num_zeros=5
## P30,2,18,ID=0, num_zeros=1
## P30,2,19,ID=0, num_zeros=6
## P30,2,20,ID=0, num_zeros=4
## P30,2,21,ID=0, num_zeros=0
## P30,2,22,ID=0, num_zeros=7
## P30,2,23,ID=0, num_zeros=5
## P30,2,24,ID=0, num_zeros=6
## P30,2,25,ID=0, num_zeros=6
## P30,2,26,ID=0, num_zeros=2
## P30,2,27,ID=0, num_zeros=3
## P30,2,28,ID=0, num_zeros=9
## P30,2,29,ID=0, num_zeros=4
## P30,2,30,ID=0, num_zeros=4
## P30,2,31,ID=0, num_zeros=5
## P30,2,32,ID=0, num_zeros=1
## P30,2,33,ID=0, num_zeros=6
## P30,2,34,ID=0, num_zeros=11
## P30,2,35,ID=0, num_zeros=1
## P30,2,36,ID=0, num_zeros=3
## P30,2,37,ID=0, num_zeros=1
## P30,2,38,ID=0, num_zeros=2
## P30,2,39,ID=0, num_zeros=1
## P30,2,40,ID=0, num_zeros=8
## P30,2,41,ID=0, num_zeros=4
## P30,2,42,ID=0, num_zeros=9
## P30,2,43,ID=0, num_zeros=3
## P30,2,44,ID=0, num_zeros=1
## P30,2,45,ID=0, num_zeros=6
## P30,2,46,ID=0, num_zeros=3
## P30,2,47,ID=0, num_zeros=2
## P30,2,48,ID=0, num_zeros=3
## P30,2,49,ID=0, num_zeros=4
## P30,2,50,ID=0, num_zeros=6
## P30,3,1,ID=0, num_zeros=3
## P30,3,2,ID=0, num_zeros=6
## P30,3,3,ID=0, num_zeros=2
## P30,3,4,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=5 in LISTP30[[3]]
## P30,3,6,ID=0, num_zeros=3
## P30,3,7,ID=0, num_zeros=6
## P30,3,8,ID=0, num_zeros=2
## P30,3,9,ID=0, num_zeros=0
## P30,3,10,ID=0, num_zeros=4
## P30,3,11,ID=0, num_zeros=1
## P30,3,12,ID=0, num_zeros=1
## P30,3,13,ID=0, num_zeros=1
## P30,3,14,ID=0, num_zeros=1
## P30,3,15,ID=0, num_zeros=1
## P30,3,16,ID=0, num_zeros=5
## P30,3,17,ID=0, num_zeros=2
## P30,3,18,ID=0, num_zeros=4
## P30,3,19,ID=0, num_zeros=8
## P30,3,20,ID=0, num_zeros=1
## P30,3,21,ID=0, num_zeros=2
## P30,3,22,ID=0, num_zeros=6
## P30,3,23,ID=0, num_zeros=0
## P30,3,24,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=25 in LISTP30[[3]]
## P30,3,26,ID=0, num_zeros=3
## P30,3,27,ID=0, num_zeros=1
## P30,3,28,ID=0, num_zeros=4
## P30,3,29,ID=0, num_zeros=1
## P30,3,30,ID=0, num_zeros=2
## P30,3,31,ID=0, num_zeros=3
## P30,3,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP30[[3]]
## P30,3,34,ID=0, num_zeros=0
## P30,3,35,ID=0, num_zeros=7
## P30,3,36,ID=0, num_zeros=1
## P30,3,37,ID=0, num_zeros=4
## P30,3,38,ID=0, num_zeros=3
## P30,3,39,ID=0, num_zeros=4
## P30,3,40,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=41 in LISTP30[[3]]
## P30,3,42,ID=0, num_zeros=4
## P30,3,43,ID=0, num_zeros=1
## P30,3,44,ID=0, num_zeros=1
## P30,3,45,ID=0, num_zeros=1
## P30,3,46,ID=0, num_zeros=3
## P30,3,47,ID=0, num_zeros=0
## P30,3,48,ID=0, num_zeros=2
## P30,3,49,ID=0, num_zeros=1
## P30,3,50,ID=0, num_zeros=105
## P30,4,1,ID=0, num_zeros=4
## P30,4,2,ID=0, num_zeros=6
## P30,4,3,ID=0, num_zeros=2
## P30,4,4,ID=0, num_zeros=8
## P30,4,5,ID=0, num_zeros=3
## P30,4,6,ID=0, num_zeros=5
## P30,4,7,ID=0, num_zeros=6
## P30,4,8,ID=0, num_zeros=2
## P30,4,9,ID=0, num_zeros=3
## P30,4,10,ID=0, num_zeros=4
## P30,4,11,ID=0, num_zeros=3
## P30,4,12,ID=0, num_zeros=3
## P30,4,13,ID=0, num_zeros=2
## P30,4,14,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=15 in LISTP30[[4]]
## P30,4,16,ID=0, num_zeros=2
## P30,4,17,ID=0, num_zeros=8
## P30,4,18,ID=0, num_zeros=3
## P30,4,19,ID=0, num_zeros=3
## P30,4,20,ID=0, num_zeros=6
## P30,4,21,ID=0, num_zeros=13
## P30,4,22,ID=0, num_zeros=2
## P30,4,23,ID=0, num_zeros=2
## P30,4,24,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=25 in LISTP30[[4]]
## P30,4,26,ID=0, num_zeros=1
## P30,4,27,ID=0, num_zeros=9
## P30,4,28,ID=0, num_zeros=2
## P30,4,29,ID=0, num_zeros=2
## P30,4,30,ID=0, num_zeros=1
## P30,4,31,ID=0, num_zeros=7
## P30,4,32,ID=0, num_zeros=6
## P30,4,33,ID=0, num_zeros=4
## P30,4,34,ID=0, num_zeros=6
## P30,4,35,ID=0, num_zeros=2
## P30,4,36,ID=0, num_zeros=7
## P30,4,37,ID=0, num_zeros=5
## P30,4,38,ID=0, num_zeros=1
## P30,4,39,ID=0, num_zeros=5
## P30,4,40,ID=0, num_zeros=1
## P30,4,41,ID=0, num_zeros=2
## P30,4,42,ID=0, num_zeros=3
## P30,4,43,ID=0, num_zeros=0
## P30,4,44,ID=0, num_zeros=5
## P30,4,45,ID=0, num_zeros=2
## P30,4,46,ID=0, num_zeros=2
## P30,4,47,ID=0, num_zeros=5
## P30,4,48,ID=0, num_zeros=2
## P30,4,49,ID=0, num_zeros=6
## P30,4,50,ID=0, num_zeros=3
## P30,5,1,ID=0, num_zeros=0
## P30,5,2,ID=0, num_zeros=5
## P30,5,3,ID=0, num_zeros=4
## P30,5,4,ID=0, num_zeros=3
## P30,5,5,ID=0, num_zeros=3
## P30,5,6,ID=0, num_zeros=1
## P30,5,7,ID=0, num_zeros=2
## P30,5,8,ID=0, num_zeros=9
## P30,5,9,ID=0, num_zeros=1
## P30,5,10,ID=0, num_zeros=2
## P30,5,11,ID=0, num_zeros=2
## P30,5,12,ID=0, num_zeros=4
## P30,5,13,ID=0, num_zeros=2
## P30,5,14,ID=0, num_zeros=4
## P30,5,15,ID=0, num_zeros=0
## P30,5,16,ID=0, num_zeros=1
## P30,5,17,ID=0, num_zeros=6
## P30,5,18,ID=0, num_zeros=2
## P30,5,19,ID=0, num_zeros=3
## P30,5,20,ID=0, num_zeros=3
## P30,5,21,ID=0, num_zeros=6
## P30,5,22,ID=0, num_zeros=7
## P30,5,23,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=24 in LISTP30[[5]]
## P30,5,25,ID=0, num_zeros=5
## P30,5,26,ID=0, num_zeros=3
## P30,5,27,ID=0, num_zeros=3
## P30,5,28,ID=0, num_zeros=4
## P30,5,29,ID=0, num_zeros=1
## P30,5,30,ID=0, num_zeros=4
## P30,5,31,ID=0, num_zeros=2
## P30,5,32,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=33 in LISTP30[[5]]
## P30,5,34,ID=0, num_zeros=1
## P30,5,35,ID=0, num_zeros=6
## P30,5,36,ID=0, num_zeros=1
## P30,5,37,ID=0, num_zeros=2
## P30,5,38,ID=0, num_zeros=6
## P30,5,39,ID=0, num_zeros=0
## P30,5,40,ID=0, num_zeros=3
## P30,5,41,ID=0, num_zeros=6
## P30,5,42,ID=0, num_zeros=3
## P30,5,43,ID=0, num_zeros=7
## P30,5,44,ID=0, num_zeros=2
## P30,5,45,ID=0, num_zeros=4
## P30,5,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP30[[5]]
## P30,5,48,ID=0, num_zeros=3
## P30,5,49,ID=0, num_zeros=7
## P30,5,50,ID=0, num_zeros=7
## P30,6,1,ID=0, num_zeros=11
## P30,6,2,ID=0, num_zeros=3
## P30,6,3,ID=0, num_zeros=4
## P30,6,4,ID=0, num_zeros=3
## P30,6,5,ID=0, num_zeros=6
## P30,6,6,ID=0, num_zeros=5
## P30,6,7,ID=0, num_zeros=6
## P30,6,8,ID=0, num_zeros=7
## P30,6,9,ID=0, num_zeros=5
## P30,6,10,ID=0, num_zeros=5
## P30,6,11,ID=0, num_zeros=5
## P30,6,12,ID=0, num_zeros=10
## P30,6,13,ID=0, num_zeros=2
## P30,6,14,ID=0, num_zeros=0
## P30,6,15,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=16 in LISTP30[[6]]
## P30,6,17,ID=0, num_zeros=4
## P30,6,18,ID=0, num_zeros=2
## P30,6,19,ID=0, num_zeros=5
## P30,6,20,ID=0, num_zeros=4
## P30,6,21,ID=0, num_zeros=2
## P30,6,22,ID=0, num_zeros=0
## P30,6,23,ID=0, num_zeros=1
## P30,6,24,ID=0, num_zeros=5
## P30,6,25,ID=0, num_zeros=6
## P30,6,26,ID=0, num_zeros=3
## P30,6,27,ID=0, num_zeros=2
## P30,6,28,ID=0, num_zeros=2
## P30,6,29,ID=0, num_zeros=6
## P30,6,30,ID=0, num_zeros=1
## P30,6,31,ID=0, num_zeros=0
## P30,6,32,ID=0, num_zeros=1
## P30,6,33,ID=0, num_zeros=5
## P30,6,34,ID=0, num_zeros=2
## P30,6,35,ID=0, num_zeros=1
## P30,6,36,ID=0, num_zeros=2
## P30,6,37,ID=0, num_zeros=4
## P30,6,38,ID=0, num_zeros=1
## P30,6,39,ID=0, num_zeros=2
## P30,6,40,ID=0, num_zeros=4
## P30,6,41,ID=0, num_zeros=3
## P30,6,42,ID=0, num_zeros=4
## P30,6,43,ID=0, num_zeros=9
## P30,6,44,ID=0, num_zeros=1
## P30,6,45,ID=0, num_zeros=0
## P30,6,46,ID=0, num_zeros=1
## P30,6,47,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=48 in LISTP30[[6]]
## P30,6,49,ID=0, num_zeros=2
## P30,6,50,ID=0, num_zeros=5
## P30,7,1,ID=0, num_zeros=6
## P30,7,2,ID=0, num_zeros=6
## P30,7,3,ID=0, num_zeros=3
## P30,7,4,ID=0, num_zeros=2
## P30,7,5,ID=0, num_zeros=1
## P30,7,6,ID=0, num_zeros=1
## P30,7,7,ID=0, num_zeros=1
## P30,7,8,ID=0, num_zeros=2
## P30,7,9,ID=0, num_zeros=7
## P30,7,10,ID=0, num_zeros=10
## P30,7,11,ID=0, num_zeros=0
## P30,7,12,ID=0, num_zeros=9
## P30,7,13,ID=0, num_zeros=5
## P30,7,14,ID=0, num_zeros=2
## P30,7,15,ID=0, num_zeros=4
## P30,7,16,ID=0, num_zeros=4
## P30,7,17,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=18 in LISTP30[[7]]
## P30,7,19,ID=0, num_zeros=2
## P30,7,20,ID=0, num_zeros=1
## P30,7,21,ID=0, num_zeros=1
## P30,7,22,ID=0, num_zeros=3
## P30,7,23,ID=0, num_zeros=1
## P30,7,24,ID=0, num_zeros=9
## P30,7,25,ID=0, num_zeros=5
## P30,7,26,ID=0, num_zeros=1
## P30,7,27,ID=0, num_zeros=1
## P30,7,28,ID=0, num_zeros=3
## P30,7,29,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=30 in LISTP30[[7]]
## P30,7,31,ID=0, num_zeros=11
## P30,7,32,ID=0, num_zeros=3
## P30,7,33,ID=0, num_zeros=2
## P30,7,34,ID=0, num_zeros=3
## P30,7,35,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=36 in LISTP30[[7]]
## P30,7,37,ID=0, num_zeros=4
## P30,7,38,ID=0, num_zeros=4
## P30,7,39,ID=0, num_zeros=1
## P30,7,40,ID=0, num_zeros=4
## P30,7,41,ID=0, num_zeros=6
## P30,7,42,ID=0, num_zeros=4
## P30,7,43,ID=0, num_zeros=1
## P30,7,44,ID=0, num_zeros=7
## P30,7,45,ID=0, num_zeros=2
## P30,7,46,ID=0, num_zeros=1
## P30,7,47,ID=0, num_zeros=2
## P30,7,48,ID=0, num_zeros=5
## P30,7,49,ID=0, num_zeros=4
## P30,7,50,ID=0, num_zeros=7
## P30,8,1,ID=0, num_zeros=6
## P30,8,2,ID=0, num_zeros=7
## P30,8,3,ID=0, num_zeros=5
## P30,8,4,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=5 in LISTP30[[8]]
## P30,8,6,ID=0, num_zeros=12
## P30,8,7,ID=0, num_zeros=14
## P30,8,8,ID=0, num_zeros=7
## P30,8,9,ID=0, num_zeros=4
## P30,8,10,ID=0, num_zeros=3
## P30,8,11,ID=0, num_zeros=6
## P30,8,12,ID=0, num_zeros=4
## P30,8,13,ID=0, num_zeros=3
## P30,8,14,ID=0, num_zeros=1
## P30,8,15,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=16 in LISTP30[[8]]
## P30,8,17,ID=0, num_zeros=0
## P30,8,18,ID=0, num_zeros=8
## P30,8,19,ID=0, num_zeros=4
## P30,8,20,ID=0, num_zeros=3
## P30,8,21,ID=0, num_zeros=8
## P30,8,22,ID=0, num_zeros=3
## P30,8,23,ID=0, num_zeros=1
## P30,8,24,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=25 in LISTP30[[8]]
## P30,8,26,ID=0, num_zeros=1
## P30,8,27,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=28 in LISTP30[[8]]
## P30,8,29,ID=0, num_zeros=3
## P30,8,30,ID=0, num_zeros=3
## P30,8,31,ID=0, num_zeros=2
## P30,8,32,ID=0, num_zeros=5
## P30,8,33,ID=0, num_zeros=4
## P30,8,34,ID=0, num_zeros=5
## P30,8,35,ID=0, num_zeros=4
## P30,8,36,ID=0, num_zeros=2
## P30,8,37,ID=0, num_zeros=2
## P30,8,38,ID=0, num_zeros=6
## P30,8,39,ID=0, num_zeros=3
## P30,8,40,ID=0, num_zeros=7
## P30,8,41,ID=0, num_zeros=10
## P30,8,42,ID=0, num_zeros=3
## P30,8,43,ID=0, num_zeros=2
## P30,8,44,ID=0, num_zeros=2
## P30,8,45,ID=0, num_zeros=2
## P30,8,46,ID=0, num_zeros=2
## P30,8,47,ID=0, num_zeros=2
## P30,8,48,ID=0, num_zeros=0
## P30,8,49,ID=0, num_zeros=1
## P30,8,50,ID=0, num_zeros=0
## P30,9,1,ID=0, num_zeros=3
## P30,9,2,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=3 in LISTP30[[9]]
## P30,9,4,ID=0, num_zeros=1
## P30,9,5,ID=0, num_zeros=0
## P30,9,6,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=7 in LISTP30[[9]]
## P30,9,8,ID=0, num_zeros=1
## P30,9,9,ID=0, num_zeros=4
## P30,9,10,ID=0, num_zeros=4
## P30,9,11,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=12 in LISTP30[[9]]
## P30,9,13,ID=0, num_zeros=1
## P30,9,14,ID=0, num_zeros=2
## P30,9,15,ID=0, num_zeros=1
## P30,9,16,ID=0, num_zeros=0
## P30,9,17,ID=0, num_zeros=6
## P30,9,18,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=19 in LISTP30[[9]]
## P30,9,20,ID=0, num_zeros=1
## P30,9,21,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=22 in LISTP30[[9]]
## P30,9,23,ID=0, num_zeros=3
## P30,9,24,ID=0, num_zeros=3
## P30,9,25,ID=0, num_zeros=6
## P30,9,26,ID=0, num_zeros=3
## P30,9,27,ID=0, num_zeros=0
## P30,9,28,ID=0, num_zeros=2
## P30,9,29,ID=0, num_zeros=4
## P30,9,30,ID=0, num_zeros=5
## P30,9,31,ID=0, num_zeros=1
## P30,9,32,ID=0, num_zeros=6
## P30,9,33,ID=0, num_zeros=0
## P30,9,34,ID=0, num_zeros=1
## P30,9,35,ID=0, num_zeros=5
## P30,9,36,ID=0, num_zeros=3
## P30,9,37,ID=0, num_zeros=1
## P30,9,38,ID=0, num_zeros=2
## P30,9,39,ID=0, num_zeros=2
## P30,9,40,ID=0, num_zeros=1
## P30,9,41,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=42 in LISTP30[[9]]
## P30,9,43,ID=0, num_zeros=5
## P30,9,44,ID=0, num_zeros=2
## P30,9,45,ID=0, num_zeros=5
## P30,9,46,ID=0, num_zeros=3
## P30,9,47,ID=0, num_zeros=1
## P30,9,48,ID=0, num_zeros=3
## P30,9,49,ID=0, num_zeros=1
## P30,9,50,ID=0, num_zeros=6
## P30,10,1,ID=0, num_zeros=3
## P30,10,2,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=3 in LISTP30[[10]]
## P30,10,4,ID=0, num_zeros=5
## P30,10,5,ID=0, num_zeros=2
## P30,10,6,ID=0, num_zeros=2
## P30,10,7,ID=0, num_zeros=3
## P30,10,8,ID=0, num_zeros=2
## P30,10,9,ID=0, num_zeros=1
## P30,10,10,ID=0, num_zeros=4
## P30,10,11,ID=0, num_zeros=6
## P30,10,12,ID=0, num_zeros=4
## P30,10,13,ID=0, num_zeros=2
## P30,10,14,ID=0, num_zeros=3
## P30,10,15,ID=0, num_zeros=3
## P30,10,16,ID=0, num_zeros=3
## P30,10,17,ID=0, num_zeros=1
## P30,10,18,ID=0, num_zeros=0
## P30,10,19,ID=0, num_zeros=5
## P30,10,20,ID=0, num_zeros=4
## P30,10,21,ID=0, num_zeros=1
## P30,10,22,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=23 in LISTP30[[10]]
## P30,10,24,ID=0, num_zeros=2
## P30,10,25,ID=0, num_zeros=3
## P30,10,26,ID=0, num_zeros=5
## P30,10,27,ID=0, num_zeros=1
## P30,10,28,ID=0, num_zeros=5
## P30,10,29,ID=0, num_zeros=4
## P30,10,30,ID=0, num_zeros=1
## P30,10,31,ID=0, num_zeros=5
## P30,10,32,ID=0, num_zeros=0
## P30,10,33,ID=0, num_zeros=2
## P30,10,34,ID=0, num_zeros=4
## P30,10,35,ID=0, num_zeros=1
## P30,10,36,ID=0, num_zeros=3
## P30,10,37,ID=0, num_zeros=3
## P30,10,38,ID=0, num_zeros=1
## P30,10,39,ID=0, num_zeros=2
## P30,10,40,ID=0, num_zeros=2
## P30,10,41,ID=0, num_zeros=4
## P30,10,42,ID=0, num_zeros=1
## P30,10,43,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=44 in LISTP30[[10]]
## P30,10,45,ID=0, num_zeros=0
## P30,10,46,ID=0, num_zeros=0
## P30,10,47,ID=0, num_zeros=1
## P30,10,48,ID=0, num_zeros=1
## P30,10,49,ID=0, num_zeros=2
## P30,10,50,ID=0, num_zeros=9
## P31,1,1,ID=0, num_zeros=6
## P31,1,2,ID=0, num_zeros=3
## P31,1,3,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=4 in LISTP31[[1]]
## Warning: There are no valid values for INTERVALS=5 in LISTP31[[1]]
## P31,1,6,ID=0, num_zeros=3
## P31,1,7,ID=0, num_zeros=0
## P31,1,8,ID=0, num_zeros=3
## P31,1,9,ID=0, num_zeros=3
## P31,1,10,ID=0, num_zeros=0
## P31,1,11,ID=0, num_zeros=3
## P31,1,12,ID=0, num_zeros=1
## P31,1,13,ID=0, num_zeros=2
## P31,1,14,ID=0, num_zeros=1
## P31,1,15,ID=0, num_zeros=3
## P31,1,16,ID=0, num_zeros=1
## P31,1,17,ID=0, num_zeros=4
## P31,1,18,ID=0, num_zeros=7
## P31,1,19,ID=0, num_zeros=1
## P31,1,20,ID=0, num_zeros=2
## P31,1,21,ID=0, num_zeros=3
## P31,1,22,ID=0, num_zeros=2
## P31,1,23,ID=0, num_zeros=0
## P31,1,24,ID=0, num_zeros=6
## P31,1,25,ID=0, num_zeros=0
## P31,1,26,ID=0, num_zeros=4
## P31,1,27,ID=0, num_zeros=7
## P31,1,28,ID=0, num_zeros=6
## P31,1,29,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=30 in LISTP31[[1]]
## P31,1,31,ID=0, num_zeros=4
## P31,1,32,ID=0, num_zeros=2
## P31,1,33,ID=0, num_zeros=0
## P31,1,34,ID=0, num_zeros=3
## P31,1,35,ID=0, num_zeros=1
## P31,1,36,ID=0, num_zeros=2
## P31,1,37,ID=0, num_zeros=3
## P31,1,38,ID=0, num_zeros=1
## P31,1,39,ID=0, num_zeros=1
## P31,1,40,ID=0, num_zeros=2
## P31,1,41,ID=0, num_zeros=2
## P31,1,42,ID=0, num_zeros=5
## P31,1,43,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=44 in LISTP31[[1]]
## P31,1,45,ID=0, num_zeros=1
## P31,1,46,ID=0, num_zeros=4
## P31,1,47,ID=0, num_zeros=3
## P31,1,48,ID=0, num_zeros=3
## P31,1,49,ID=0, num_zeros=2
## P31,1,50,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=1 in LISTP31[[2]]
## P31,2,2,ID=0, num_zeros=1
## P31,2,3,ID=0, num_zeros=2
## P31,2,4,ID=0, num_zeros=1
## P31,2,5,ID=0, num_zeros=5
## P31,2,6,ID=0, num_zeros=1
## P31,2,7,ID=0, num_zeros=3
## P31,2,8,ID=0, num_zeros=1
## P31,2,9,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=10 in LISTP31[[2]]
## P31,2,11,ID=0, num_zeros=2
## P31,2,12,ID=0, num_zeros=2
## P31,2,13,ID=0, num_zeros=2
## P31,2,14,ID=0, num_zeros=3
## P31,2,15,ID=0, num_zeros=2
## P31,2,16,ID=0, num_zeros=1
## P31,2,17,ID=0, num_zeros=5
## P31,2,18,ID=0, num_zeros=1
## P31,2,19,ID=0, num_zeros=0
## P31,2,20,ID=0, num_zeros=1
## P31,2,21,ID=0, num_zeros=2
## P31,2,22,ID=0, num_zeros=2
## P31,2,23,ID=0, num_zeros=0
## P31,2,24,ID=0, num_zeros=1
## P31,2,25,ID=0, num_zeros=1
## P31,2,26,ID=0, num_zeros=2
## P31,2,27,ID=0, num_zeros=1
## P31,2,28,ID=0, num_zeros=3
## P31,2,29,ID=0, num_zeros=1
## P31,2,30,ID=0, num_zeros=1
## P31,2,31,ID=0, num_zeros=0
## P31,2,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP31[[2]]
## P31,2,34,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=35 in LISTP31[[2]]
## P31,2,36,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=37 in LISTP31[[2]]
## Warning: There are no valid values for INTERVALS=38 in LISTP31[[2]]
## P31,2,39,ID=0, num_zeros=0
## P31,2,40,ID=0, num_zeros=2
## P31,2,41,ID=0, num_zeros=1
## P31,2,42,ID=0, num_zeros=1
## P31,2,43,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=44 in LISTP31[[2]]
## P31,2,45,ID=0, num_zeros=3
## P31,2,46,ID=0, num_zeros=4
## P31,2,47,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=48 in LISTP31[[2]]
## P31,2,49,ID=0, num_zeros=2
## P31,2,50,ID=0, num_zeros=16
## P31,3,1,ID=0, num_zeros=1
## P31,3,2,ID=0, num_zeros=2
## P31,3,3,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=4 in LISTP31[[3]]
## P31,3,5,ID=0, num_zeros=2
## P31,3,6,ID=0, num_zeros=2
## P31,3,7,ID=0, num_zeros=2
## P31,3,8,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=9 in LISTP31[[3]]
## P31,3,10,ID=0, num_zeros=6
## P31,3,11,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=12 in LISTP31[[3]]
## P31,3,13,ID=0, num_zeros=6
## P31,3,14,ID=0, num_zeros=1
## P31,3,15,ID=0, num_zeros=1
## P31,3,16,ID=0, num_zeros=0
## P31,3,17,ID=0, num_zeros=4
## P31,3,18,ID=0, num_zeros=1
## P31,3,19,ID=0, num_zeros=1
## P31,3,20,ID=0, num_zeros=3
## P31,3,21,ID=0, num_zeros=3
## P31,3,22,ID=0, num_zeros=2
## P31,3,23,ID=0, num_zeros=2
## P31,3,24,ID=0, num_zeros=4
## P31,3,25,ID=0, num_zeros=2
## P31,3,26,ID=0, num_zeros=3
## P31,3,27,ID=0, num_zeros=2
## P31,3,28,ID=0, num_zeros=3
## P31,3,29,ID=0, num_zeros=1
## P31,3,30,ID=0, num_zeros=2
## P31,3,31,ID=0, num_zeros=7
## P31,3,32,ID=0, num_zeros=1
## P31,3,33,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=34 in LISTP31[[3]]
## P31,3,35,ID=0, num_zeros=5
## P31,3,36,ID=0, num_zeros=0
## P31,3,37,ID=0, num_zeros=2
## P31,3,38,ID=0, num_zeros=5
## P31,3,39,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=40 in LISTP31[[3]]
## P31,3,41,ID=0, num_zeros=4
## P31,3,42,ID=0, num_zeros=3
## P31,3,43,ID=0, num_zeros=6
## P31,3,44,ID=0, num_zeros=1
## P31,3,45,ID=0, num_zeros=3
## P31,3,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP31[[3]]
## P31,3,48,ID=0, num_zeros=0
## P31,3,49,ID=0, num_zeros=3
## P31,3,50,ID=0, num_zeros=7
## P31,4,1,ID=0, num_zeros=1
## P31,4,2,ID=0, num_zeros=1
## P31,4,3,ID=0, num_zeros=2
## P31,4,4,ID=0, num_zeros=7
## P31,4,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP31[[4]]
## P31,4,7,ID=0, num_zeros=1
## P31,4,8,ID=0, num_zeros=3
## P31,4,9,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=10 in LISTP31[[4]]
## P31,4,11,ID=0, num_zeros=2
## P31,4,12,ID=0, num_zeros=1
## P31,4,13,ID=0, num_zeros=5
## P31,4,14,ID=0, num_zeros=2
## P31,4,15,ID=0, num_zeros=1
## P31,4,16,ID=0, num_zeros=6
## P31,4,17,ID=0, num_zeros=2
## P31,4,18,ID=0, num_zeros=0
## P31,4,19,ID=0, num_zeros=4
## P31,4,20,ID=0, num_zeros=0
## P31,4,21,ID=0, num_zeros=3
## P31,4,22,ID=0, num_zeros=6
## P31,4,23,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=24 in LISTP31[[4]]
## P31,4,25,ID=0, num_zeros=2
## P31,4,26,ID=0, num_zeros=2
## P31,4,27,ID=0, num_zeros=1
## P31,4,28,ID=0, num_zeros=1
## P31,4,29,ID=0, num_zeros=3
## P31,4,30,ID=0, num_zeros=0
## P31,4,31,ID=0, num_zeros=2
## P31,4,32,ID=0, num_zeros=4
## P31,4,33,ID=0, num_zeros=1
## P31,4,34,ID=0, num_zeros=3
## P31,4,35,ID=0, num_zeros=2
## P31,4,36,ID=0, num_zeros=3
## P31,4,37,ID=0, num_zeros=2
## P31,4,38,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=39 in LISTP31[[4]]
## P31,4,40,ID=0, num_zeros=1
## P31,4,41,ID=0, num_zeros=4
## P31,4,42,ID=0, num_zeros=4
## P31,4,43,ID=0, num_zeros=2
## P31,4,44,ID=0, num_zeros=4
## P31,4,45,ID=0, num_zeros=0
## P31,4,46,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=47 in LISTP31[[4]]
## P31,4,48,ID=0, num_zeros=0
## P31,4,49,ID=0, num_zeros=6
## P31,4,50,ID=0, num_zeros=6
## P31,5,1,ID=0, num_zeros=4
## P31,5,2,ID=0, num_zeros=3
## P31,5,3,ID=0, num_zeros=1
## P31,5,4,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=5 in LISTP31[[5]]
## P31,5,6,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=7 in LISTP31[[5]]
## P31,5,8,ID=0, num_zeros=3
## P31,5,9,ID=0, num_zeros=4
## P31,5,10,ID=0, num_zeros=2
## P31,5,11,ID=0, num_zeros=2
## P31,5,12,ID=0, num_zeros=1
## P31,5,13,ID=0, num_zeros=3
## P31,5,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP31[[5]]
## P31,5,16,ID=0, num_zeros=0
## P31,5,17,ID=0, num_zeros=2
## P31,5,18,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=19 in LISTP31[[5]]
## P31,5,20,ID=0, num_zeros=1
## P31,5,21,ID=0, num_zeros=4
## P31,5,22,ID=0, num_zeros=1
## P31,5,23,ID=0, num_zeros=2
## P31,5,24,ID=0, num_zeros=0
## P31,5,25,ID=0, num_zeros=1
## P31,5,26,ID=0, num_zeros=2
## P31,5,27,ID=0, num_zeros=1
## P31,5,28,ID=0, num_zeros=7
## P31,5,29,ID=0, num_zeros=2
## P31,5,30,ID=0, num_zeros=2
## P31,5,31,ID=0, num_zeros=4
## P31,5,32,ID=0, num_zeros=2
## P31,5,33,ID=0, num_zeros=6
## P31,5,34,ID=0, num_zeros=2
## P31,5,35,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=36 in LISTP31[[5]]
## P31,5,37,ID=0, num_zeros=3
## P31,5,38,ID=0, num_zeros=5
## P31,5,39,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=40 in LISTP31[[5]]
## P31,5,41,ID=0, num_zeros=5
## P31,5,42,ID=0, num_zeros=3
## P31,5,43,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=44 in LISTP31[[5]]
## Warning: There are no valid values for INTERVALS=45 in LISTP31[[5]]
## P31,5,46,ID=0, num_zeros=5
## P31,5,47,ID=0, num_zeros=3
## P31,5,48,ID=0, num_zeros=7
## P31,5,49,ID=0, num_zeros=1
## P31,5,50,ID=0, num_zeros=14
## Warning: There are no valid values for INTERVALS=1 in LISTP31[[6]]
## Warning: There are no valid values for INTERVALS=2 in LISTP31[[6]]
## P31,6,3,ID=0, num_zeros=2
## P31,6,4,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=5 in LISTP31[[6]]
## Warning: There are no valid values for INTERVALS=6 in LISTP31[[6]]
## Warning: There are no valid values for INTERVALS=7 in LISTP31[[6]]
## P31,6,8,ID=0, num_zeros=4
## P31,6,9,ID=0, num_zeros=2
## P31,6,10,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=11 in LISTP31[[6]]
## P31,6,12,ID=0, num_zeros=1
## P31,6,13,ID=0, num_zeros=3
## P31,6,14,ID=0, num_zeros=4
## P31,6,15,ID=0, num_zeros=3
## P31,6,16,ID=0, num_zeros=2
## P31,6,17,ID=0, num_zeros=2
## P31,6,18,ID=0, num_zeros=2
## P31,6,19,ID=0, num_zeros=1
## P31,6,20,ID=0, num_zeros=1
## P31,6,21,ID=0, num_zeros=2
## P31,6,22,ID=0, num_zeros=7
## P31,6,23,ID=0, num_zeros=1
## P31,6,24,ID=0, num_zeros=1
## P31,6,25,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=26 in LISTP31[[6]]
## P31,6,27,ID=0, num_zeros=1
## P31,6,28,ID=0, num_zeros=1
## P31,6,29,ID=0, num_zeros=1
## P31,6,30,ID=0, num_zeros=3
## P31,6,31,ID=0, num_zeros=2
## P31,6,32,ID=0, num_zeros=1
## P31,6,33,ID=0, num_zeros=4
## P31,6,34,ID=0, num_zeros=1
## P31,6,35,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=36 in LISTP31[[6]]
## P31,6,37,ID=0, num_zeros=1
## P31,6,38,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=39 in LISTP31[[6]]
## Warning: There are no valid values for INTERVALS=40 in LISTP31[[6]]
## P31,6,41,ID=0, num_zeros=1
## P31,6,42,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=43 in LISTP31[[6]]
## P31,6,44,ID=0, num_zeros=1
## P31,6,45,ID=0, num_zeros=1
## P31,6,46,ID=0, num_zeros=2
## P31,6,47,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=48 in LISTP31[[6]]
## Warning: There are no valid values for INTERVALS=49 in LISTP31[[6]]
## P31,6,50,ID=0, num_zeros=10
## Warning: There are no valid values for INTERVALS=1 in LISTP31[[7]]
## P31,7,2,ID=0, num_zeros=1
## P31,7,3,ID=0, num_zeros=1
## P31,7,4,ID=0, num_zeros=5
## P31,7,5,ID=0, num_zeros=4
## P31,7,6,ID=0, num_zeros=4
## P31,7,7,ID=0, num_zeros=3
## P31,7,8,ID=0, num_zeros=3
## P31,7,9,ID=0, num_zeros=2
## P31,7,10,ID=0, num_zeros=4
## P31,7,11,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=12 in LISTP31[[7]]
## P31,7,13,ID=0, num_zeros=6
## P31,7,14,ID=0, num_zeros=2
## P31,7,15,ID=0, num_zeros=1
## P31,7,16,ID=0, num_zeros=1
## P31,7,17,ID=0, num_zeros=0
## P31,7,18,ID=0, num_zeros=1
## P31,7,19,ID=0, num_zeros=4
## P31,7,20,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=21 in LISTP31[[7]]
## P31,7,22,ID=0, num_zeros=1
## P31,7,23,ID=0, num_zeros=1
## P31,7,24,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=25 in LISTP31[[7]]
## P31,7,26,ID=0, num_zeros=1
## P31,7,27,ID=0, num_zeros=2
## P31,7,28,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=29 in LISTP31[[7]]
## P31,7,30,ID=0, num_zeros=2
## P31,7,31,ID=0, num_zeros=2
## P31,7,32,ID=0, num_zeros=4
## P31,7,33,ID=0, num_zeros=1
## P31,7,34,ID=0, num_zeros=1
## P31,7,35,ID=0, num_zeros=8
## P31,7,36,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=37 in LISTP31[[7]]
## P31,7,38,ID=0, num_zeros=3
## P31,7,39,ID=0, num_zeros=4
## P31,7,40,ID=0, num_zeros=1
## P31,7,41,ID=0, num_zeros=1
## P31,7,42,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=43 in LISTP31[[7]]
## Warning: There are no valid values for INTERVALS=44 in LISTP31[[7]]
## P31,7,45,ID=0, num_zeros=2
## P31,7,46,ID=0, num_zeros=1
## P31,7,47,ID=0, num_zeros=0
## P31,7,48,ID=0, num_zeros=2
## P31,7,49,ID=0, num_zeros=1
## P31,7,50,ID=0, num_zeros=11
## P31,8,1,ID=0, num_zeros=3
## P31,8,2,ID=0, num_zeros=1
## P31,8,3,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=4 in LISTP31[[8]]
## P31,8,5,ID=0, num_zeros=2
## P31,8,6,ID=0, num_zeros=7
## P31,8,7,ID=0, num_zeros=2
## P31,8,8,ID=0, num_zeros=4
## P31,8,9,ID=0, num_zeros=0
## P31,8,10,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=11 in LISTP31[[8]]
## P31,8,12,ID=0, num_zeros=2
## P31,8,13,ID=0, num_zeros=1
## P31,8,14,ID=0, num_zeros=2
## P31,8,15,ID=0, num_zeros=2
## P31,8,16,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=17 in LISTP31[[8]]
## P31,8,18,ID=0, num_zeros=1
## P31,8,19,ID=0, num_zeros=1
## P31,8,20,ID=0, num_zeros=2
## P31,8,21,ID=0, num_zeros=5
## P31,8,22,ID=0, num_zeros=1
## P31,8,23,ID=0, num_zeros=2
## P31,8,24,ID=0, num_zeros=6
## P31,8,25,ID=0, num_zeros=4
## P31,8,26,ID=0, num_zeros=2
## P31,8,27,ID=0, num_zeros=2
## P31,8,28,ID=0, num_zeros=7
## P31,8,29,ID=0, num_zeros=1
## P31,8,30,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=31 in LISTP31[[8]]
## P31,8,32,ID=0, num_zeros=5
## P31,8,33,ID=0, num_zeros=2
## P31,8,34,ID=0, num_zeros=6
## P31,8,35,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=36 in LISTP31[[8]]
## Warning: There are no valid values for INTERVALS=37 in LISTP31[[8]]
## P31,8,38,ID=0, num_zeros=1
## P31,8,39,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=40 in LISTP31[[8]]
## P31,8,41,ID=0, num_zeros=2
## P31,8,42,ID=0, num_zeros=1
## P31,8,43,ID=0, num_zeros=3
## P31,8,44,ID=0, num_zeros=5
## P31,8,45,ID=0, num_zeros=4
## P31,8,46,ID=0, num_zeros=3
## P31,8,47,ID=0, num_zeros=4
## P31,8,48,ID=0, num_zeros=2
## P31,8,49,ID=0, num_zeros=2
## P31,8,50,ID=0, num_zeros=7
## P31,9,1,ID=0, num_zeros=2
## P31,9,2,ID=0, num_zeros=2
## P31,9,3,ID=0, num_zeros=3
## P31,9,4,ID=0, num_zeros=3
## P31,9,5,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=6 in LISTP31[[9]]
## P31,9,7,ID=0, num_zeros=3
## P31,9,8,ID=0, num_zeros=8
## P31,9,9,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=10 in LISTP31[[9]]
## P31,9,11,ID=0, num_zeros=1
## P31,9,12,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=13 in LISTP31[[9]]
## Warning: There are no valid values for INTERVALS=14 in LISTP31[[9]]
## P31,9,15,ID=0, num_zeros=3
## P31,9,16,ID=0, num_zeros=5
## P31,9,17,ID=0, num_zeros=4
## P31,9,18,ID=0, num_zeros=4
## P31,9,19,ID=0, num_zeros=4
## P31,9,20,ID=0, num_zeros=2
## P31,9,21,ID=0, num_zeros=2
## P31,9,22,ID=0, num_zeros=1
## P31,9,23,ID=0, num_zeros=4
## P31,9,24,ID=0, num_zeros=1
## P31,9,25,ID=0, num_zeros=1
## P31,9,26,ID=0, num_zeros=0
## P31,9,27,ID=0, num_zeros=1
## P31,9,28,ID=0, num_zeros=2
## P31,9,29,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=30 in LISTP31[[9]]
## P31,9,31,ID=0, num_zeros=3
## P31,9,32,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=33 in LISTP31[[9]]
## P31,9,34,ID=0, num_zeros=8
## P31,9,35,ID=0, num_zeros=7
## P31,9,36,ID=0, num_zeros=3
## P31,9,37,ID=0, num_zeros=1
## P31,9,38,ID=0, num_zeros=0
## P31,9,39,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=40 in LISTP31[[9]]
## P31,9,41,ID=0, num_zeros=2
## P31,9,42,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=43 in LISTP31[[9]]
## P31,9,44,ID=0, num_zeros=2
## P31,9,45,ID=0, num_zeros=1
## P31,9,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP31[[9]]
## Warning: There are no valid values for INTERVALS=48 in LISTP31[[9]]
## P31,9,49,ID=0, num_zeros=3
## P31,9,50,ID=0, num_zeros=7
## P31,10,1,ID=0, num_zeros=0
## P31,10,2,ID=0, num_zeros=1
## P31,10,3,ID=0, num_zeros=9
## P31,10,4,ID=0, num_zeros=1
## P31,10,5,ID=0, num_zeros=4
## P31,10,6,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=7 in LISTP31[[10]]
## P31,10,8,ID=0, num_zeros=5
## P31,10,9,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=10 in LISTP31[[10]]
## P31,10,11,ID=0, num_zeros=2
## P31,10,12,ID=0, num_zeros=4
## P31,10,13,ID=0, num_zeros=2
## P31,10,14,ID=0, num_zeros=4
## P31,10,15,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=16 in LISTP31[[10]]
## Warning: There are no valid values for INTERVALS=17 in LISTP31[[10]]
## Warning: There are no valid values for INTERVALS=18 in LISTP31[[10]]
## P31,10,19,ID=0, num_zeros=2
## P31,10,20,ID=0, num_zeros=2
## P31,10,21,ID=0, num_zeros=4
## P31,10,22,ID=0, num_zeros=3
## P31,10,23,ID=0, num_zeros=4
## P31,10,24,ID=0, num_zeros=2
## P31,10,25,ID=0, num_zeros=3
## P31,10,26,ID=0, num_zeros=1
## P31,10,27,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=28 in LISTP31[[10]]
## Warning: There are no valid values for INTERVALS=29 in LISTP31[[10]]
## P31,10,30,ID=0, num_zeros=4
## P31,10,31,ID=0, num_zeros=1
## P31,10,32,ID=0, num_zeros=2
## P31,10,33,ID=0, num_zeros=1
## P31,10,34,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=35 in LISTP31[[10]]
## P31,10,36,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=37 in LISTP31[[10]]
## P31,10,38,ID=0, num_zeros=4
## P31,10,39,ID=0, num_zeros=6
## P31,10,40,ID=0, num_zeros=6
## P31,10,41,ID=0, num_zeros=2
## P31,10,42,ID=0, num_zeros=0
## P31,10,43,ID=0, num_zeros=4
## P31,10,44,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=45 in LISTP31[[10]]
## P31,10,46,ID=0, num_zeros=5
## P31,10,47,ID=0, num_zeros=4
## P31,10,48,ID=0, num_zeros=8
## P31,10,49,ID=0, num_zeros=2
## P31,10,50,ID=0, num_zeros=18
## Warning: There are no valid values for INTERVALS=1 in LISTP32[[1]]
## P32,1,2,ID=0, num_zeros=4
## P32,1,3,ID=0, num_zeros=2
## P32,1,4,ID=0, num_zeros=4
## P32,1,5,ID=0, num_zeros=3
## P32,1,6,ID=0, num_zeros=4
## P32,1,7,ID=0, num_zeros=3
## P32,1,8,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=9 in LISTP32[[1]]
## P32,1,10,ID=0, num_zeros=0
## P32,1,11,ID=0, num_zeros=3
## P32,1,12,ID=0, num_zeros=3
## P32,1,13,ID=0, num_zeros=0
## P32,1,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP32[[1]]
## Warning: There are no valid values for INTERVALS=16 in LISTP32[[1]]
## P32,1,17,ID=0, num_zeros=3
## P32,1,18,ID=0, num_zeros=0
## P32,1,19,ID=0, num_zeros=1
## P32,1,20,ID=0, num_zeros=0
## P32,1,21,ID=0, num_zeros=0
## P32,1,22,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=23 in LISTP32[[1]]
## P32,1,24,ID=0, num_zeros=3
## P32,1,25,ID=0, num_zeros=2
## P32,1,26,ID=0, num_zeros=3
## P32,1,27,ID=0, num_zeros=1
## P32,1,28,ID=0, num_zeros=2
## P32,1,29,ID=0, num_zeros=2
## P32,1,30,ID=0, num_zeros=2
## P32,1,31,ID=0, num_zeros=2
## P32,1,32,ID=0, num_zeros=3
## P32,1,33,ID=0, num_zeros=1
## P32,1,34,ID=0, num_zeros=3
## P32,1,35,ID=0, num_zeros=3
## P32,1,36,ID=0, num_zeros=3
## P32,1,37,ID=0, num_zeros=7
## P32,1,38,ID=0, num_zeros=1
## P32,1,39,ID=0, num_zeros=3
## P32,1,40,ID=0, num_zeros=1
## P32,1,41,ID=0, num_zeros=4
## P32,1,42,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=43 in LISTP32[[1]]
## P32,1,44,ID=0, num_zeros=1
## P32,1,45,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=46 in LISTP32[[1]]
## P32,1,47,ID=0, num_zeros=4
## P32,1,48,ID=0, num_zeros=2
## P32,1,49,ID=0, num_zeros=6
## P32,1,50,ID=0, num_zeros=7
## P32,2,1,ID=0, num_zeros=4
## P32,2,2,ID=0, num_zeros=3
## P32,2,3,ID=0, num_zeros=1
## P32,2,4,ID=0, num_zeros=1
## P32,2,5,ID=0, num_zeros=4
## P32,2,6,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=7 in LISTP32[[2]]
## P32,2,8,ID=0, num_zeros=2
## P32,2,9,ID=0, num_zeros=5
## P32,2,10,ID=0, num_zeros=1
## P32,2,11,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=12 in LISTP32[[2]]
## P32,2,13,ID=0, num_zeros=2
## P32,2,14,ID=0, num_zeros=7
## P32,2,15,ID=0, num_zeros=2
## P32,2,16,ID=0, num_zeros=4
## P32,2,17,ID=0, num_zeros=1
## P32,2,18,ID=0, num_zeros=6
## P32,2,19,ID=0, num_zeros=2
## P32,2,20,ID=0, num_zeros=3
## P32,2,21,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=22 in LISTP32[[2]]
## P32,2,23,ID=0, num_zeros=3
## P32,2,24,ID=0, num_zeros=6
## P32,2,25,ID=0, num_zeros=3
## P32,2,26,ID=0, num_zeros=1
## P32,2,27,ID=0, num_zeros=3
## P32,2,28,ID=0, num_zeros=1
## P32,2,29,ID=0, num_zeros=1
## P32,2,30,ID=0, num_zeros=1
## P32,2,31,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=32 in LISTP32[[2]]
## P32,2,33,ID=0, num_zeros=2
## P32,2,34,ID=0, num_zeros=2
## P32,2,35,ID=0, num_zeros=4
## P32,2,36,ID=0, num_zeros=2
## P32,2,37,ID=0, num_zeros=3
## P32,2,38,ID=0, num_zeros=3
## P32,2,39,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=40 in LISTP32[[2]]
## Warning: There are no valid values for INTERVALS=41 in LISTP32[[2]]
## P32,2,42,ID=0, num_zeros=3
## P32,2,43,ID=0, num_zeros=1
## P32,2,44,ID=0, num_zeros=1
## P32,2,45,ID=0, num_zeros=1
## P32,2,46,ID=0, num_zeros=4
## P32,2,47,ID=0, num_zeros=1
## P32,2,48,ID=0, num_zeros=3
## P32,2,49,ID=0, num_zeros=4
## P32,2,50,ID=0, num_zeros=7
## P32,3,1,ID=0, num_zeros=3
## P32,3,2,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=3 in LISTP32[[3]]
## P32,3,4,ID=0, num_zeros=2
## P32,3,5,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=6 in LISTP32[[3]]
## P32,3,7,ID=0, num_zeros=1
## P32,3,8,ID=0, num_zeros=3
## P32,3,9,ID=0, num_zeros=3
## P32,3,10,ID=0, num_zeros=3
## P32,3,11,ID=0, num_zeros=2
## P32,3,12,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=13 in LISTP32[[3]]
## P32,3,14,ID=0, num_zeros=1
## P32,3,15,ID=0, num_zeros=1
## P32,3,16,ID=0, num_zeros=2
## P32,3,17,ID=0, num_zeros=5
## P32,3,18,ID=0, num_zeros=3
## P32,3,19,ID=0, num_zeros=3
## P32,3,20,ID=0, num_zeros=1
## P32,3,21,ID=0, num_zeros=2
## P32,3,22,ID=0, num_zeros=1
## P32,3,23,ID=0, num_zeros=3
## P32,3,24,ID=0, num_zeros=4
## P32,3,25,ID=0, num_zeros=2
## P32,3,26,ID=0, num_zeros=1
## P32,3,27,ID=0, num_zeros=0
## P32,3,28,ID=0, num_zeros=1
## P32,3,29,ID=0, num_zeros=3
## P32,3,30,ID=0, num_zeros=1
## P32,3,31,ID=0, num_zeros=2
## P32,3,32,ID=0, num_zeros=1
## P32,3,33,ID=0, num_zeros=3
## P32,3,34,ID=0, num_zeros=4
## P32,3,35,ID=0, num_zeros=2
## P32,3,36,ID=0, num_zeros=4
## P32,3,37,ID=0, num_zeros=4
## P32,3,38,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=39 in LISTP32[[3]]
## P32,3,40,ID=0, num_zeros=7
## P32,3,41,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=42 in LISTP32[[3]]
## Warning: There are no valid values for INTERVALS=43 in LISTP32[[3]]
## Warning: There are no valid values for INTERVALS=44 in LISTP32[[3]]
## P32,3,45,ID=0, num_zeros=1
## P32,3,46,ID=0, num_zeros=5
## P32,3,47,ID=0, num_zeros=2
## P32,3,48,ID=0, num_zeros=2
## P32,3,49,ID=0, num_zeros=3
## P32,3,50,ID=0, num_zeros=5
## P32,4,1,ID=0, num_zeros=2
## P32,4,2,ID=0, num_zeros=1
## P32,4,3,ID=0, num_zeros=3
## P32,4,4,ID=0, num_zeros=2
## P32,4,5,ID=0, num_zeros=0
## P32,4,6,ID=0, num_zeros=1
## P32,4,7,ID=0, num_zeros=2
## P32,4,8,ID=0, num_zeros=1
## P32,4,9,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=10 in LISTP32[[4]]
## P32,4,11,ID=0, num_zeros=3
## P32,4,12,ID=0, num_zeros=3
## P32,4,13,ID=0, num_zeros=3
## P32,4,14,ID=0, num_zeros=5
## P32,4,15,ID=0, num_zeros=7
## P32,4,16,ID=0, num_zeros=7
## P32,4,17,ID=0, num_zeros=1
## P32,4,18,ID=0, num_zeros=4
## P32,4,19,ID=0, num_zeros=1
## P32,4,20,ID=0, num_zeros=3
## P32,4,21,ID=0, num_zeros=6
## P32,4,22,ID=0, num_zeros=2
## P32,4,23,ID=0, num_zeros=3
## P32,4,24,ID=0, num_zeros=3
## P32,4,25,ID=0, num_zeros=3
## P32,4,26,ID=0, num_zeros=2
## P32,4,27,ID=0, num_zeros=4
## P32,4,28,ID=0, num_zeros=5
## P32,4,29,ID=0, num_zeros=3
## P32,4,30,ID=0, num_zeros=5
## P32,4,31,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=32 in LISTP32[[4]]
## P32,4,33,ID=0, num_zeros=5
## P32,4,34,ID=0, num_zeros=5
## P32,4,35,ID=0, num_zeros=1
## P32,4,36,ID=0, num_zeros=11
## P32,4,37,ID=0, num_zeros=3
## P32,4,38,ID=0, num_zeros=2
## P32,4,39,ID=0, num_zeros=0
## P32,4,40,ID=0, num_zeros=2
## P32,4,41,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=42 in LISTP32[[4]]
## P32,4,43,ID=0, num_zeros=1
## P32,4,44,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=45 in LISTP32[[4]]
## P32,4,46,ID=0, num_zeros=3
## P32,4,47,ID=0, num_zeros=2
## P32,4,48,ID=0, num_zeros=5
## P32,4,49,ID=0, num_zeros=0
## P32,4,50,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=1 in LISTP32[[5]]
## P32,5,2,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=3 in LISTP32[[5]]
## P32,5,4,ID=0, num_zeros=3
## P32,5,5,ID=0, num_zeros=1
## P32,5,6,ID=0, num_zeros=4
## P32,5,7,ID=0, num_zeros=1
## P32,5,8,ID=0, num_zeros=1
## P32,5,9,ID=0, num_zeros=2
## P32,5,10,ID=0, num_zeros=6
## P32,5,11,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=12 in LISTP32[[5]]
## P32,5,13,ID=0, num_zeros=3
## P32,5,14,ID=0, num_zeros=1
## P32,5,15,ID=0, num_zeros=3
## P32,5,16,ID=0, num_zeros=5
## P32,5,17,ID=0, num_zeros=3
## P32,5,18,ID=0, num_zeros=1
## P32,5,19,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=20 in LISTP32[[5]]
## P32,5,21,ID=0, num_zeros=0
## P32,5,22,ID=0, num_zeros=1
## P32,5,23,ID=0, num_zeros=4
## P32,5,24,ID=0, num_zeros=4
## P32,5,25,ID=0, num_zeros=3
## P32,5,26,ID=0, num_zeros=0
## P32,5,27,ID=0, num_zeros=4
## P32,5,28,ID=0, num_zeros=2
## P32,5,29,ID=0, num_zeros=4
## P32,5,30,ID=0, num_zeros=1
## P32,5,31,ID=0, num_zeros=3
## P32,5,32,ID=0, num_zeros=2
## P32,5,33,ID=0, num_zeros=3
## P32,5,34,ID=0, num_zeros=3
## P32,5,35,ID=0, num_zeros=4
## P32,5,36,ID=0, num_zeros=8
## P32,5,37,ID=0, num_zeros=6
## P32,5,38,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=39 in LISTP32[[5]]
## P32,5,40,ID=0, num_zeros=2
## P32,5,41,ID=0, num_zeros=1
## P32,5,42,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=43 in LISTP32[[5]]
## P32,5,44,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=45 in LISTP32[[5]]
## P32,5,46,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=47 in LISTP32[[5]]
## P32,5,48,ID=0, num_zeros=2
## P32,5,49,ID=0, num_zeros=2
## P32,5,50,ID=0, num_zeros=3
## P32,6,1,ID=0, num_zeros=1
## P32,6,2,ID=0, num_zeros=0
## P32,6,3,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=4 in LISTP32[[6]]
## P32,6,5,ID=0, num_zeros=1
## P32,6,6,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=7 in LISTP32[[6]]
## P32,6,8,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=9 in LISTP32[[6]]
## P32,6,10,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=11 in LISTP32[[6]]
## P32,6,12,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=13 in LISTP32[[6]]
## Warning: There are no valid values for INTERVALS=14 in LISTP32[[6]]
## Warning: There are no valid values for INTERVALS=15 in LISTP32[[6]]
## P32,6,16,ID=0, num_zeros=0
## P32,6,17,ID=0, num_zeros=4
## P32,6,18,ID=0, num_zeros=5
## P32,6,19,ID=0, num_zeros=3
## P32,6,20,ID=0, num_zeros=2
## P32,6,21,ID=0, num_zeros=3
## P32,6,22,ID=0, num_zeros=3
## P32,6,23,ID=0, num_zeros=1
## P32,6,24,ID=0, num_zeros=1
## P32,6,25,ID=0, num_zeros=1
## P32,6,26,ID=0, num_zeros=1
## P32,6,27,ID=0, num_zeros=1
## P32,6,28,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=29 in LISTP32[[6]]
## P32,6,30,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=31 in LISTP32[[6]]
## Warning: There are no valid values for INTERVALS=32 in LISTP32[[6]]
## P32,6,33,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=34 in LISTP32[[6]]
## Warning: There are no valid values for INTERVALS=35 in LISTP32[[6]]
## P32,6,36,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=37 in LISTP32[[6]]
## P32,6,38,ID=0, num_zeros=4
## P32,6,39,ID=0, num_zeros=0
## P32,6,40,ID=0, num_zeros=6
## P32,6,41,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=42 in LISTP32[[6]]
## P32,6,43,ID=0, num_zeros=3
## P32,6,44,ID=0, num_zeros=1
## P32,6,45,ID=0, num_zeros=1
## P32,6,46,ID=0, num_zeros=1
## P32,6,47,ID=0, num_zeros=2
## P32,6,48,ID=0, num_zeros=1
## P32,6,49,ID=0, num_zeros=3
## P32,6,50,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=1 in LISTP32[[7]]
## P32,7,2,ID=0, num_zeros=2
## P32,7,3,ID=0, num_zeros=1
## P32,7,4,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=5 in LISTP32[[7]]
## P32,7,6,ID=0, num_zeros=0
## P32,7,7,ID=0, num_zeros=2
## P32,7,8,ID=0, num_zeros=2
## P32,7,9,ID=0, num_zeros=2
## P32,7,10,ID=0, num_zeros=4
## P32,7,11,ID=0, num_zeros=2
## P32,7,12,ID=0, num_zeros=3
## P32,7,13,ID=0, num_zeros=3
## P32,7,14,ID=0, num_zeros=1
## P32,7,15,ID=0, num_zeros=1
## P32,7,16,ID=0, num_zeros=1
## P32,7,17,ID=0, num_zeros=0
## P32,7,18,ID=0, num_zeros=2
## P32,7,19,ID=0, num_zeros=1
## P32,7,20,ID=0, num_zeros=1
## P32,7,21,ID=0, num_zeros=1
## P32,7,22,ID=0, num_zeros=1
## P32,7,23,ID=0, num_zeros=2
## P32,7,24,ID=0, num_zeros=0
## P32,7,25,ID=0, num_zeros=4
## P32,7,26,ID=0, num_zeros=1
## P32,7,27,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=28 in LISTP32[[7]]
## P32,7,29,ID=0, num_zeros=2
## P32,7,30,ID=0, num_zeros=1
## P32,7,31,ID=0, num_zeros=3
## P32,7,32,ID=0, num_zeros=1
## P32,7,33,ID=0, num_zeros=2
## P32,7,34,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=35 in LISTP32[[7]]
## P32,7,36,ID=0, num_zeros=2
## P32,7,37,ID=0, num_zeros=2
## P32,7,38,ID=0, num_zeros=1
## P32,7,39,ID=0, num_zeros=2
## P32,7,40,ID=0, num_zeros=1
## P32,7,41,ID=0, num_zeros=2
## P32,7,42,ID=0, num_zeros=1
## P32,7,43,ID=0, num_zeros=1
## P32,7,44,ID=0, num_zeros=2
## P32,7,45,ID=0, num_zeros=7
## P32,7,46,ID=0, num_zeros=4
## P32,7,47,ID=0, num_zeros=4
## P32,7,48,ID=0, num_zeros=2
## P32,7,49,ID=0, num_zeros=3
## P32,7,50,ID=0, num_zeros=3
## P32,8,1,ID=0, num_zeros=1
## P32,8,2,ID=0, num_zeros=1
## P32,8,3,ID=0, num_zeros=2
## P32,8,4,ID=0, num_zeros=4
## P32,8,5,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=6 in LISTP32[[8]]
## Warning: There are no valid values for INTERVALS=7 in LISTP32[[8]]
## Warning: There are no valid values for INTERVALS=8 in LISTP32[[8]]
## P32,8,9,ID=0, num_zeros=1
## P32,8,10,ID=0, num_zeros=2
## P32,8,11,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=12 in LISTP32[[8]]
## P32,8,13,ID=0, num_zeros=2
## P32,8,14,ID=0, num_zeros=1
## P32,8,15,ID=0, num_zeros=2
## P32,8,16,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=17 in LISTP32[[8]]
## Warning: There are no valid values for INTERVALS=18 in LISTP32[[8]]
## P32,8,19,ID=0, num_zeros=1
## P32,8,20,ID=0, num_zeros=1
## P32,8,21,ID=0, num_zeros=3
## P32,8,22,ID=0, num_zeros=2
## P32,8,23,ID=0, num_zeros=1
## P32,8,24,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=25 in LISTP32[[8]]
## Warning: There are no valid values for INTERVALS=26 in LISTP32[[8]]
## Warning: There are no valid values for INTERVALS=27 in LISTP32[[8]]
## P32,8,28,ID=0, num_zeros=1
## P32,8,29,ID=0, num_zeros=2
## P32,8,30,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=31 in LISTP32[[8]]
## P32,8,32,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=33 in LISTP32[[8]]
## P32,8,34,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=35 in LISTP32[[8]]
## P32,8,36,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=37 in LISTP32[[8]]
## P32,8,38,ID=0, num_zeros=2
## P32,8,39,ID=0, num_zeros=2
## P32,8,40,ID=0, num_zeros=2
## P32,8,41,ID=0, num_zeros=2
## P32,8,42,ID=0, num_zeros=1
## P32,8,43,ID=0, num_zeros=2
## P32,8,44,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=45 in LISTP32[[8]]
## P32,8,46,ID=0, num_zeros=1
## P32,8,47,ID=0, num_zeros=1
## P32,8,48,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=49 in LISTP32[[8]]
## P32,8,50,ID=0, num_zeros=1
## P32,9,1,ID=0, num_zeros=2
## P32,9,2,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=3 in LISTP32[[9]]
## P32,9,4,ID=0, num_zeros=3
## P32,9,5,ID=0, num_zeros=3
## P32,9,6,ID=0, num_zeros=1
## P32,9,7,ID=0, num_zeros=1
## P32,9,8,ID=0, num_zeros=2
## P32,9,9,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=10 in LISTP32[[9]]
## P32,9,11,ID=0, num_zeros=2
## P32,9,12,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=13 in LISTP32[[9]]
## P32,9,14,ID=0, num_zeros=7
## P32,9,15,ID=0, num_zeros=1
## P32,9,16,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=17 in LISTP32[[9]]
## P32,9,18,ID=0, num_zeros=4
## P32,9,19,ID=0, num_zeros=2
## P32,9,20,ID=0, num_zeros=2
## P32,9,21,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=22 in LISTP32[[9]]
## P32,9,23,ID=0, num_zeros=1
## P32,9,24,ID=0, num_zeros=3
## P32,9,25,ID=0, num_zeros=5
## P32,9,26,ID=0, num_zeros=1
## P32,9,27,ID=0, num_zeros=2
## P32,9,28,ID=0, num_zeros=0
## P32,9,29,ID=0, num_zeros=2
## P32,9,30,ID=0, num_zeros=0
## P32,9,31,ID=0, num_zeros=2
## P32,9,32,ID=0, num_zeros=1
## P32,9,33,ID=0, num_zeros=1
## P32,9,34,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=35 in LISTP32[[9]]
## Warning: There are no valid values for INTERVALS=36 in LISTP32[[9]]
## P32,9,37,ID=0, num_zeros=2
## P32,9,38,ID=0, num_zeros=1
## P32,9,39,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=40 in LISTP32[[9]]
## P32,9,41,ID=0, num_zeros=1
## P32,9,42,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=43 in LISTP32[[9]]
## Warning: There are no valid values for INTERVALS=44 in LISTP32[[9]]
## P32,9,45,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=46 in LISTP32[[9]]
## P32,9,47,ID=0, num_zeros=3
## P32,9,48,ID=0, num_zeros=1
## P32,9,49,ID=0, num_zeros=1
## P32,9,50,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=1 in LISTP32[[10]]
## P32,10,2,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=3 in LISTP32[[10]]
## Warning: There are no valid values for INTERVALS=4 in LISTP32[[10]]
## P32,10,5,ID=0, num_zeros=2
## P32,10,6,ID=0, num_zeros=3
## P32,10,7,ID=0, num_zeros=1
## P32,10,8,ID=0, num_zeros=2
## P32,10,9,ID=0, num_zeros=3
## P32,10,10,ID=0, num_zeros=2
## P32,10,11,ID=0, num_zeros=1
## P32,10,12,ID=0, num_zeros=2
## P32,10,13,ID=0, num_zeros=1
## P32,10,14,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=15 in LISTP32[[10]]
## P32,10,16,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=17 in LISTP32[[10]]
## P32,10,18,ID=0, num_zeros=4
## P32,10,19,ID=0, num_zeros=2
## P32,10,20,ID=0, num_zeros=1
## P32,10,21,ID=0, num_zeros=1
## P32,10,22,ID=0, num_zeros=3
## P32,10,23,ID=0, num_zeros=2
## P32,10,24,ID=0, num_zeros=3
## P32,10,25,ID=0, num_zeros=3
## P32,10,26,ID=0, num_zeros=3
## P32,10,27,ID=0, num_zeros=1
## P32,10,28,ID=0, num_zeros=1
## P32,10,29,ID=0, num_zeros=1
## P32,10,30,ID=0, num_zeros=2
## P32,10,31,ID=0, num_zeros=1
## P32,10,32,ID=0, num_zeros=1
## P32,10,33,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=34 in LISTP32[[10]]
## Warning: There are no valid values for INTERVALS=35 in LISTP32[[10]]
## Warning: There are no valid values for INTERVALS=36 in LISTP32[[10]]
## Warning: There are no valid values for INTERVALS=37 in LISTP32[[10]]
## P32,10,38,ID=0, num_zeros=1
## P32,10,39,ID=0, num_zeros=1
## P32,10,40,ID=0, num_zeros=2
## P32,10,41,ID=0, num_zeros=2
## P32,10,42,ID=0, num_zeros=1
## P32,10,43,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=44 in LISTP32[[10]]
## P32,10,45,ID=0, num_zeros=3
## P32,10,46,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=47 in LISTP32[[10]]
## P32,10,48,ID=0, num_zeros=3
## P32,10,49,ID=0, num_zeros=3
## P32,10,50,ID=0, num_zeros=3
## P33,1,1,ID=0, num_zeros=6
## P33,1,2,ID=0, num_zeros=3
## P33,1,3,ID=0, num_zeros=5
## P33,1,4,ID=0, num_zeros=4
## P33,1,5,ID=0, num_zeros=4
## P33,1,6,ID=0, num_zeros=2
## P33,1,7,ID=0, num_zeros=4
## P33,1,8,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=9 in LISTP33[[1]]
## P33,1,10,ID=0, num_zeros=10
## P33,1,11,ID=0, num_zeros=1
## P33,1,12,ID=0, num_zeros=8
## P33,1,13,ID=0, num_zeros=4
## P33,1,14,ID=0, num_zeros=9
## P33,1,15,ID=0, num_zeros=4
## P33,1,16,ID=0, num_zeros=2
## P33,1,17,ID=0, num_zeros=3
## P33,1,18,ID=0, num_zeros=3
## P33,1,19,ID=0, num_zeros=6
## P33,1,20,ID=0, num_zeros=9
## P33,1,21,ID=0, num_zeros=8
## P33,1,22,ID=0, num_zeros=1
## P33,1,23,ID=0, num_zeros=11
## P33,1,24,ID=0, num_zeros=15
## P33,1,25,ID=0, num_zeros=3
## P33,1,26,ID=0, num_zeros=8
## P33,1,27,ID=0, num_zeros=4
## P33,1,28,ID=0, num_zeros=5
## P33,1,29,ID=0, num_zeros=4
## P33,1,30,ID=0, num_zeros=5
## P33,1,31,ID=0, num_zeros=2
## P33,1,32,ID=0, num_zeros=6
## P33,1,33,ID=0, num_zeros=1
## P33,1,34,ID=0, num_zeros=0
## P33,1,35,ID=0, num_zeros=11
## P33,1,36,ID=0, num_zeros=4
## P33,1,37,ID=0, num_zeros=5
## P33,1,38,ID=0, num_zeros=3
## P33,1,39,ID=0, num_zeros=9
## P33,1,40,ID=0, num_zeros=5
## P33,1,41,ID=0, num_zeros=8
## P33,1,42,ID=0, num_zeros=3
## P33,1,43,ID=0, num_zeros=6
## P33,1,44,ID=0, num_zeros=1
## P33,1,45,ID=0, num_zeros=7
## P33,1,46,ID=0, num_zeros=1
## P33,1,47,ID=0, num_zeros=10
## P33,1,48,ID=0, num_zeros=7
## P33,1,49,ID=0, num_zeros=5
## P33,1,50,ID=0, num_zeros=17
## P33,2,1,ID=0, num_zeros=2
## P33,2,2,ID=0, num_zeros=1
## P33,2,3,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=4 in LISTP33[[2]]
## P33,2,5,ID=0, num_zeros=5
## P33,2,6,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=7 in LISTP33[[2]]
## P33,2,8,ID=0, num_zeros=4
## P33,2,9,ID=0, num_zeros=7
## P33,2,10,ID=0, num_zeros=10
## P33,2,11,ID=0, num_zeros=1
## P33,2,12,ID=0, num_zeros=3
## P33,2,13,ID=0, num_zeros=5
## P33,2,14,ID=0, num_zeros=4
## P33,2,15,ID=0, num_zeros=3
## P33,2,16,ID=0, num_zeros=2
## P33,2,17,ID=0, num_zeros=1
## P33,2,18,ID=0, num_zeros=3
## P33,2,19,ID=0, num_zeros=2
## P33,2,20,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=21 in LISTP33[[2]]
## P33,2,22,ID=0, num_zeros=3
## P33,2,23,ID=0, num_zeros=5
## P33,2,24,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=25 in LISTP33[[2]]
## P33,2,26,ID=0, num_zeros=3
## P33,2,27,ID=0, num_zeros=3
## P33,2,28,ID=0, num_zeros=2
## P33,2,29,ID=0, num_zeros=1
## P33,2,30,ID=0, num_zeros=5
## P33,2,31,ID=0, num_zeros=4
## P33,2,32,ID=0, num_zeros=8
## P33,2,33,ID=0, num_zeros=1
## P33,2,34,ID=0, num_zeros=1
## P33,2,35,ID=0, num_zeros=8
## P33,2,36,ID=0, num_zeros=8
## P33,2,37,ID=0, num_zeros=3
## P33,2,38,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=39 in LISTP33[[2]]
## P33,2,40,ID=0, num_zeros=3
## P33,2,41,ID=0, num_zeros=4
## P33,2,42,ID=0, num_zeros=2
## P33,2,43,ID=0, num_zeros=5
## P33,2,44,ID=0, num_zeros=2
## P33,2,45,ID=0, num_zeros=2
## P33,2,46,ID=0, num_zeros=1
## P33,2,47,ID=0, num_zeros=3
## P33,2,48,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=49 in LISTP33[[2]]
## P33,2,50,ID=0, num_zeros=7
## P33,3,1,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=2 in LISTP33[[3]]
## P33,3,3,ID=0, num_zeros=1
## P33,3,4,ID=0, num_zeros=1
## P33,3,5,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=6 in LISTP33[[3]]
## P33,3,7,ID=0, num_zeros=3
## P33,3,8,ID=0, num_zeros=1
## P33,3,9,ID=0, num_zeros=1
## P33,3,10,ID=0, num_zeros=3
## P33,3,11,ID=0, num_zeros=2
## P33,3,12,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=13 in LISTP33[[3]]
## P33,3,14,ID=0, num_zeros=6
## P33,3,15,ID=0, num_zeros=7
## P33,3,16,ID=0, num_zeros=3
## P33,3,17,ID=0, num_zeros=5
## P33,3,18,ID=0, num_zeros=3
## P33,3,19,ID=0, num_zeros=7
## P33,3,20,ID=0, num_zeros=4
## P33,3,21,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=22 in LISTP33[[3]]
## P33,3,23,ID=0, num_zeros=4
## P33,3,24,ID=0, num_zeros=3
## P33,3,25,ID=0, num_zeros=7
## P33,3,26,ID=0, num_zeros=4
## P33,3,27,ID=0, num_zeros=3
## P33,3,28,ID=0, num_zeros=1
## P33,3,29,ID=0, num_zeros=5
## P33,3,30,ID=0, num_zeros=3
## P33,3,31,ID=0, num_zeros=1
## P33,3,32,ID=0, num_zeros=8
## P33,3,33,ID=0, num_zeros=3
## P33,3,34,ID=0, num_zeros=1
## P33,3,35,ID=0, num_zeros=3
## P33,3,36,ID=0, num_zeros=3
## P33,3,37,ID=0, num_zeros=9
## P33,3,38,ID=0, num_zeros=2
## P33,3,39,ID=0, num_zeros=2
## P33,3,40,ID=0, num_zeros=1
## P33,3,41,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=42 in LISTP33[[3]]
## P33,3,43,ID=0, num_zeros=4
## P33,3,44,ID=0, num_zeros=3
## P33,3,45,ID=0, num_zeros=6
## P33,3,46,ID=0, num_zeros=7
## P33,3,47,ID=0, num_zeros=4
## P33,3,48,ID=0, num_zeros=5
## P33,3,49,ID=0, num_zeros=3
## P33,3,50,ID=0, num_zeros=6
## P33,4,1,ID=0, num_zeros=2
## P33,4,2,ID=0, num_zeros=2
## P33,4,3,ID=0, num_zeros=9
## P33,4,4,ID=0, num_zeros=1
## P33,4,5,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=6 in LISTP33[[4]]
## Warning: There are no valid values for INTERVALS=7 in LISTP33[[4]]
## P33,4,8,ID=0, num_zeros=1
## P33,4,9,ID=0, num_zeros=5
## P33,4,10,ID=0, num_zeros=1
## P33,4,11,ID=0, num_zeros=3
## P33,4,12,ID=0, num_zeros=2
## P33,4,13,ID=0, num_zeros=7
## P33,4,14,ID=0, num_zeros=6
## P33,4,15,ID=0, num_zeros=4
## P33,4,16,ID=0, num_zeros=2
## P33,4,17,ID=0, num_zeros=8
## P33,4,18,ID=0, num_zeros=4
## P33,4,19,ID=0, num_zeros=2
## P33,4,20,ID=0, num_zeros=4
## P33,4,21,ID=0, num_zeros=4
## P33,4,22,ID=0, num_zeros=2
## P33,4,23,ID=0, num_zeros=5
## P33,4,24,ID=0, num_zeros=1
## P33,4,25,ID=0, num_zeros=9
## P33,4,26,ID=0, num_zeros=1
## P33,4,27,ID=0, num_zeros=4
## P33,4,28,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=29 in LISTP33[[4]]
## P33,4,30,ID=0, num_zeros=1
## P33,4,31,ID=0, num_zeros=7
## P33,4,32,ID=0, num_zeros=1
## P33,4,33,ID=0, num_zeros=0
## P33,4,34,ID=0, num_zeros=4
## P33,4,35,ID=0, num_zeros=3
## P33,4,36,ID=0, num_zeros=7
## P33,4,37,ID=0, num_zeros=1
## P33,4,38,ID=0, num_zeros=11
## P33,4,39,ID=0, num_zeros=2
## P33,4,40,ID=0, num_zeros=5
## P33,4,41,ID=0, num_zeros=3
## P33,4,42,ID=0, num_zeros=7
## P33,4,43,ID=0, num_zeros=5
## P33,4,44,ID=0, num_zeros=5
## P33,4,45,ID=0, num_zeros=5
## P33,4,46,ID=0, num_zeros=5
## P33,4,47,ID=0, num_zeros=10
## P33,4,48,ID=0, num_zeros=3
## P33,4,49,ID=0, num_zeros=2
## P33,4,50,ID=0, num_zeros=4
## P33,5,1,ID=0, num_zeros=2
## P33,5,2,ID=0, num_zeros=3
## P33,5,3,ID=0, num_zeros=2
## P33,5,4,ID=0, num_zeros=11
## P33,5,5,ID=0, num_zeros=1
## P33,5,6,ID=0, num_zeros=6
## P33,5,7,ID=0, num_zeros=5
## P33,5,8,ID=0, num_zeros=9
## P33,5,9,ID=0, num_zeros=4
## P33,5,10,ID=0, num_zeros=6
## P33,5,11,ID=0, num_zeros=10
## P33,5,12,ID=0, num_zeros=2
## P33,5,13,ID=0, num_zeros=1
## P33,5,14,ID=0, num_zeros=2
## P33,5,15,ID=0, num_zeros=9
## P33,5,16,ID=0, num_zeros=10
## P33,5,17,ID=0, num_zeros=1
## P33,5,18,ID=0, num_zeros=9
## P33,5,19,ID=0, num_zeros=2
## P33,5,20,ID=0, num_zeros=9
## P33,5,21,ID=0, num_zeros=5
## P33,5,22,ID=0, num_zeros=1
## P33,5,23,ID=0, num_zeros=2
## P33,5,24,ID=0, num_zeros=7
## P33,5,25,ID=0, num_zeros=8
## Warning: There are no valid values for INTERVALS=26 in LISTP33[[5]]
## P33,5,27,ID=0, num_zeros=8
## P33,5,28,ID=0, num_zeros=4
## P33,5,29,ID=0, num_zeros=5
## P33,5,30,ID=0, num_zeros=3
## P33,5,31,ID=0, num_zeros=6
## P33,5,32,ID=0, num_zeros=8
## P33,5,33,ID=0, num_zeros=3
## P33,5,34,ID=0, num_zeros=3
## P33,5,35,ID=0, num_zeros=9
## P33,5,36,ID=0, num_zeros=3
## P33,5,37,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=38 in LISTP33[[5]]
## P33,5,39,ID=0, num_zeros=0
## P33,5,40,ID=0, num_zeros=3
## P33,5,41,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=42 in LISTP33[[5]]
## P33,5,43,ID=0, num_zeros=8
## P33,5,44,ID=0, num_zeros=17
## P33,5,45,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=46 in LISTP33[[5]]
## P33,5,47,ID=0, num_zeros=1
## P33,5,48,ID=0, num_zeros=5
## P33,5,49,ID=0, num_zeros=2
## P33,5,50,ID=0, num_zeros=7
## P33,6,1,ID=0, num_zeros=1
## P33,6,2,ID=0, num_zeros=6
## P33,6,3,ID=0, num_zeros=3
## P33,6,4,ID=0, num_zeros=3
## P33,6,5,ID=0, num_zeros=1
## P33,6,6,ID=0, num_zeros=2
## P33,6,7,ID=0, num_zeros=4
## P33,6,8,ID=0, num_zeros=4
## P33,6,9,ID=0, num_zeros=3
## P33,6,10,ID=0, num_zeros=3
## P33,6,11,ID=0, num_zeros=1
## P33,6,12,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=13 in LISTP33[[6]]
## P33,6,14,ID=0, num_zeros=6
## P33,6,15,ID=0, num_zeros=6
## P33,6,16,ID=0, num_zeros=2
## P33,6,17,ID=0, num_zeros=3
## P33,6,18,ID=0, num_zeros=3
## P33,6,19,ID=0, num_zeros=0
## P33,6,20,ID=0, num_zeros=4
## P33,6,21,ID=0, num_zeros=3
## P33,6,22,ID=0, num_zeros=2
## P33,6,23,ID=0, num_zeros=2
## P33,6,24,ID=0, num_zeros=2
## P33,6,25,ID=0, num_zeros=2
## P33,6,26,ID=0, num_zeros=1
## P33,6,27,ID=0, num_zeros=5
## P33,6,28,ID=0, num_zeros=2
## P33,6,29,ID=0, num_zeros=0
## P33,6,30,ID=0, num_zeros=3
## P33,6,31,ID=0, num_zeros=5
## P33,6,32,ID=0, num_zeros=3
## P33,6,33,ID=0, num_zeros=5
## P33,6,34,ID=0, num_zeros=1
## P33,6,35,ID=0, num_zeros=1
## P33,6,36,ID=0, num_zeros=0
## P33,6,37,ID=0, num_zeros=4
## P33,6,38,ID=0, num_zeros=2
## P33,6,39,ID=0, num_zeros=2
## P33,6,40,ID=0, num_zeros=14
## P33,6,41,ID=0, num_zeros=6
## P33,6,42,ID=0, num_zeros=3
## P33,6,43,ID=0, num_zeros=4
## P33,6,44,ID=0, num_zeros=1
## P33,6,45,ID=0, num_zeros=9
## P33,6,46,ID=0, num_zeros=1
## P33,6,47,ID=0, num_zeros=4
## P33,6,48,ID=0, num_zeros=2
## P33,6,49,ID=0, num_zeros=0
## P33,6,50,ID=0, num_zeros=7
## P33,7,1,ID=0, num_zeros=2
## P33,7,2,ID=0, num_zeros=6
## P33,7,3,ID=0, num_zeros=5
## P33,7,4,ID=0, num_zeros=3
## P33,7,5,ID=0, num_zeros=6
## P33,7,6,ID=0, num_zeros=1
## P33,7,7,ID=0, num_zeros=3
## P33,7,8,ID=0, num_zeros=6
## P33,7,9,ID=0, num_zeros=7
## P33,7,10,ID=0, num_zeros=2
## P33,7,11,ID=0, num_zeros=6
## P33,7,12,ID=0, num_zeros=5
## P33,7,13,ID=0, num_zeros=2
## P33,7,14,ID=0, num_zeros=10
## P33,7,15,ID=0, num_zeros=3
## P33,7,16,ID=0, num_zeros=2
## P33,7,17,ID=0, num_zeros=6
## P33,7,18,ID=0, num_zeros=7
## P33,7,19,ID=0, num_zeros=5
## P33,7,20,ID=0, num_zeros=2
## P33,7,21,ID=0, num_zeros=4
## P33,7,22,ID=0, num_zeros=7
## P33,7,23,ID=0, num_zeros=2
## P33,7,24,ID=0, num_zeros=2
## P33,7,25,ID=0, num_zeros=9
## P33,7,26,ID=0, num_zeros=4
## P33,7,27,ID=0, num_zeros=1
## P33,7,28,ID=0, num_zeros=6
## P33,7,29,ID=0, num_zeros=3
## P33,7,30,ID=0, num_zeros=10
## P33,7,31,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=32 in LISTP33[[7]]
## P33,7,33,ID=0, num_zeros=4
## P33,7,34,ID=0, num_zeros=2
## P33,7,35,ID=0, num_zeros=3
## P33,7,36,ID=0, num_zeros=4
## P33,7,37,ID=0, num_zeros=1
## P33,7,38,ID=0, num_zeros=2
## P33,7,39,ID=0, num_zeros=4
## P33,7,40,ID=0, num_zeros=3
## P33,7,41,ID=0, num_zeros=2
## P33,7,42,ID=0, num_zeros=2
## P33,7,43,ID=0, num_zeros=2
## P33,7,44,ID=0, num_zeros=1
## P33,7,45,ID=0, num_zeros=4
## P33,7,46,ID=0, num_zeros=10
## P33,7,47,ID=0, num_zeros=4
## P33,7,48,ID=0, num_zeros=7
## P33,7,49,ID=0, num_zeros=7
## P33,7,50,ID=0, num_zeros=7
## P33,8,1,ID=0, num_zeros=2
## P33,8,2,ID=0, num_zeros=5
## P33,8,3,ID=0, num_zeros=4
## P33,8,4,ID=0, num_zeros=0
## P33,8,5,ID=0, num_zeros=2
## P33,8,6,ID=0, num_zeros=4
## P33,8,7,ID=0, num_zeros=3
## P33,8,8,ID=0, num_zeros=0
## P33,8,9,ID=0, num_zeros=1
## P33,8,10,ID=0, num_zeros=5
## P33,8,11,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=12 in LISTP33[[8]]
## P33,8,13,ID=0, num_zeros=3
## P33,8,14,ID=0, num_zeros=6
## P33,8,15,ID=0, num_zeros=9
## P33,8,16,ID=0, num_zeros=10
## P33,8,17,ID=0, num_zeros=1
## P33,8,18,ID=0, num_zeros=4
## P33,8,19,ID=0, num_zeros=2
## P33,8,20,ID=0, num_zeros=5
## P33,8,21,ID=0, num_zeros=2
## P33,8,22,ID=0, num_zeros=4
## P33,8,23,ID=0, num_zeros=8
## P33,8,24,ID=0, num_zeros=3
## P33,8,25,ID=0, num_zeros=7
## P33,8,26,ID=0, num_zeros=9
## P33,8,27,ID=0, num_zeros=7
## P33,8,28,ID=0, num_zeros=4
## P33,8,29,ID=0, num_zeros=4
## P33,8,30,ID=0, num_zeros=2
## P33,8,31,ID=0, num_zeros=1
## P33,8,32,ID=0, num_zeros=5
## P33,8,33,ID=0, num_zeros=4
## P33,8,34,ID=0, num_zeros=4
## P33,8,35,ID=0, num_zeros=6
## Warning: There are no valid values for INTERVALS=36 in LISTP33[[8]]
## P33,8,37,ID=0, num_zeros=2
## P33,8,38,ID=0, num_zeros=11
## P33,8,39,ID=0, num_zeros=2
## P33,8,40,ID=0, num_zeros=2
## P33,8,41,ID=0, num_zeros=3
## P33,8,42,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=43 in LISTP33[[8]]
## P33,8,44,ID=0, num_zeros=2
## P33,8,45,ID=0, num_zeros=4
## P33,8,46,ID=0, num_zeros=7
## P33,8,47,ID=0, num_zeros=1
## P33,8,48,ID=0, num_zeros=4
## P33,8,49,ID=0, num_zeros=2
## P33,8,50,ID=0, num_zeros=7
## P33,9,1,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=2 in LISTP33[[9]]
## P33,9,3,ID=0, num_zeros=1
## P33,9,4,ID=0, num_zeros=3
## P33,9,5,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=6 in LISTP33[[9]]
## P33,9,7,ID=0, num_zeros=4
## P33,9,8,ID=0, num_zeros=3
## P33,9,9,ID=0, num_zeros=8
## P33,9,10,ID=0, num_zeros=2
## P33,9,11,ID=0, num_zeros=2
## P33,9,12,ID=0, num_zeros=3
## P33,9,13,ID=0, num_zeros=3
## P33,9,14,ID=0, num_zeros=1
## P33,9,15,ID=0, num_zeros=3
## P33,9,16,ID=0, num_zeros=0
## P33,9,17,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=18 in LISTP33[[9]]
## P33,9,19,ID=0, num_zeros=1
## P33,9,20,ID=0, num_zeros=2
## P33,9,21,ID=0, num_zeros=4
## P33,9,22,ID=0, num_zeros=4
## P33,9,23,ID=0, num_zeros=5
## P33,9,24,ID=0, num_zeros=0
## P33,9,25,ID=0, num_zeros=7
## P33,9,26,ID=0, num_zeros=1
## P33,9,27,ID=0, num_zeros=0
## P33,9,28,ID=0, num_zeros=2
## P33,9,29,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=30 in LISTP33[[9]]
## P33,9,31,ID=0, num_zeros=4
## P33,9,32,ID=0, num_zeros=3
## P33,9,33,ID=0, num_zeros=4
## P33,9,34,ID=0, num_zeros=5
## P33,9,35,ID=0, num_zeros=2
## P33,9,36,ID=0, num_zeros=2
## P33,9,37,ID=0, num_zeros=1
## P33,9,38,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=39 in LISTP33[[9]]
## P33,9,40,ID=0, num_zeros=2
## P33,9,41,ID=0, num_zeros=4
## P33,9,42,ID=0, num_zeros=2
## P33,9,43,ID=0, num_zeros=2
## P33,9,44,ID=0, num_zeros=7
## P33,9,45,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=46 in LISTP33[[9]]
## Warning: There are no valid values for INTERVALS=47 in LISTP33[[9]]
## P33,9,48,ID=0, num_zeros=0
## P33,9,49,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=50 in LISTP33[[9]]
## Warning: There are no valid values for INTERVALS=1 in LISTP33[[10]]
## P33,10,2,ID=0, num_zeros=1
## P33,10,3,ID=0, num_zeros=2
## P33,10,4,ID=0, num_zeros=0
## P33,10,5,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=6 in LISTP33[[10]]
## P33,10,7,ID=0, num_zeros=1
## P33,10,8,ID=0, num_zeros=1
## P33,10,9,ID=0, num_zeros=2
## P33,10,10,ID=0, num_zeros=4
## P33,10,11,ID=0, num_zeros=3
## P33,10,12,ID=0, num_zeros=5
## P33,10,13,ID=0, num_zeros=5
## P33,10,14,ID=0, num_zeros=6
## P33,10,15,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=16 in LISTP33[[10]]
## Warning: There are no valid values for INTERVALS=17 in LISTP33[[10]]
## P33,10,18,ID=0, num_zeros=6
## P33,10,19,ID=0, num_zeros=3
## P33,10,20,ID=0, num_zeros=4
## P33,10,21,ID=0, num_zeros=1
## P33,10,22,ID=0, num_zeros=1
## P33,10,23,ID=0, num_zeros=2
## P33,10,24,ID=0, num_zeros=3
## P33,10,25,ID=0, num_zeros=4
## P33,10,26,ID=0, num_zeros=1
## P33,10,27,ID=0, num_zeros=2
## P33,10,28,ID=0, num_zeros=1
## P33,10,29,ID=0, num_zeros=1
## P33,10,30,ID=0, num_zeros=4
## P33,10,31,ID=0, num_zeros=0
## P33,10,32,ID=0, num_zeros=4
## P33,10,33,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=34 in LISTP33[[10]]
## P33,10,35,ID=0, num_zeros=1
## P33,10,36,ID=0, num_zeros=1
## P33,10,37,ID=0, num_zeros=1
## P33,10,38,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=39 in LISTP33[[10]]
## P33,10,40,ID=0, num_zeros=2
## P33,10,41,ID=0, num_zeros=1
## P33,10,42,ID=0, num_zeros=4
## P33,10,43,ID=0, num_zeros=2
## P33,10,44,ID=0, num_zeros=1
## P33,10,45,ID=0, num_zeros=4
## P33,10,46,ID=0, num_zeros=0
## P33,10,47,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=48 in LISTP33[[10]]
## P33,10,49,ID=0, num_zeros=1
## P33,10,50,ID=0, num_zeros=12
## P34,1,1,ID=0, num_zeros=2
## P34,1,2,ID=0, num_zeros=1
## P34,1,3,ID=0, num_zeros=1
## P34,1,4,ID=0, num_zeros=3
## P34,1,5,ID=0, num_zeros=3
## P34,1,6,ID=0, num_zeros=4
## P34,1,7,ID=0, num_zeros=9
## P34,1,8,ID=0, num_zeros=2
## P34,1,9,ID=0, num_zeros=3
## P34,1,10,ID=0, num_zeros=7
## Warning: There are no valid values for INTERVALS=11 in LISTP34[[1]]
## P34,1,12,ID=0, num_zeros=5
## P34,1,13,ID=0, num_zeros=2
## P34,1,14,ID=0, num_zeros=2
## P34,1,15,ID=0, num_zeros=1
## P34,1,16,ID=0, num_zeros=2
## P34,1,17,ID=0, num_zeros=7
## P34,1,18,ID=0, num_zeros=7
## P34,1,19,ID=0, num_zeros=3
## P34,1,20,ID=0, num_zeros=1
## P34,1,21,ID=0, num_zeros=1
## P34,1,22,ID=0, num_zeros=2
## P34,1,23,ID=0, num_zeros=3
## P34,1,24,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=25 in LISTP34[[1]]
## P34,1,26,ID=0, num_zeros=1
## P34,1,27,ID=0, num_zeros=4
## P34,1,28,ID=0, num_zeros=2
## P34,1,29,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=30 in LISTP34[[1]]
## Warning: There are no valid values for INTERVALS=31 in LISTP34[[1]]
## P34,1,32,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=33 in LISTP34[[1]]
## P34,1,34,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=35 in LISTP34[[1]]
## P34,1,36,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=37 in LISTP34[[1]]
## Warning: There are no valid values for INTERVALS=38 in LISTP34[[1]]
## P34,1,39,ID=0, num_zeros=7
## P34,1,40,ID=0, num_zeros=2
## P34,1,41,ID=0, num_zeros=6
## P34,1,42,ID=0, num_zeros=1
## P34,1,43,ID=0, num_zeros=2
## P34,1,44,ID=0, num_zeros=4
## P34,1,45,ID=0, num_zeros=4
## P34,1,46,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=47 in LISTP34[[1]]
## P34,1,48,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=49 in LISTP34[[1]]
## P34,1,50,ID=0, num_zeros=3
## P34,2,1,ID=0, num_zeros=2
## P34,2,2,ID=0, num_zeros=3
## P34,2,3,ID=0, num_zeros=6
## P34,2,4,ID=0, num_zeros=5
## P34,2,5,ID=0, num_zeros=6
## P34,2,6,ID=0, num_zeros=6
## P34,2,7,ID=0, num_zeros=1
## P34,2,8,ID=0, num_zeros=2
## P34,2,9,ID=0, num_zeros=1
## P34,2,10,ID=0, num_zeros=3
## P34,2,11,ID=0, num_zeros=6
## P34,2,12,ID=0, num_zeros=2
## P34,2,13,ID=0, num_zeros=1
## P34,2,14,ID=0, num_zeros=5
## P34,2,15,ID=0, num_zeros=5
## P34,2,16,ID=0, num_zeros=4
## P34,2,17,ID=0, num_zeros=6
## P34,2,18,ID=0, num_zeros=6
## P34,2,19,ID=0, num_zeros=5
## P34,2,20,ID=0, num_zeros=1
## P34,2,21,ID=0, num_zeros=2
## P34,2,22,ID=0, num_zeros=2
## P34,2,23,ID=0, num_zeros=2
## P34,2,24,ID=0, num_zeros=4
## P34,2,25,ID=0, num_zeros=2
## P34,2,26,ID=0, num_zeros=2
## P34,2,27,ID=0, num_zeros=1
## P34,2,28,ID=0, num_zeros=2
## P34,2,29,ID=0, num_zeros=4
## P34,2,30,ID=0, num_zeros=3
## P34,2,31,ID=0, num_zeros=1
## P34,2,32,ID=0, num_zeros=4
## P34,2,33,ID=0, num_zeros=3
## P34,2,34,ID=0, num_zeros=1
## P34,2,35,ID=0, num_zeros=1
## P34,2,36,ID=0, num_zeros=6
## P34,2,37,ID=0, num_zeros=4
## P34,2,38,ID=0, num_zeros=5
## P34,2,39,ID=0, num_zeros=8
## P34,2,40,ID=0, num_zeros=2
## P34,2,41,ID=0, num_zeros=6
## P34,2,42,ID=0, num_zeros=4
## P34,2,43,ID=0, num_zeros=2
## P34,2,44,ID=0, num_zeros=4
## P34,2,45,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=46 in LISTP34[[2]]
## P34,2,47,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=48 in LISTP34[[2]]
## P34,2,49,ID=0, num_zeros=0
## P34,2,50,ID=0, num_zeros=20
## P34,3,1,ID=0, num_zeros=1
## P34,3,2,ID=0, num_zeros=5
## P34,3,3,ID=0, num_zeros=6
## P34,3,4,ID=0, num_zeros=7
## P34,3,5,ID=0, num_zeros=1
## P34,3,6,ID=0, num_zeros=1
## P34,3,7,ID=0, num_zeros=11
## P34,3,8,ID=0, num_zeros=2
## P34,3,9,ID=0, num_zeros=6
## P34,3,10,ID=0, num_zeros=6
## P34,3,11,ID=0, num_zeros=1
## P34,3,12,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=13 in LISTP34[[3]]
## P34,3,14,ID=0, num_zeros=4
## P34,3,15,ID=0, num_zeros=5
## P34,3,16,ID=0, num_zeros=3
## P34,3,17,ID=0, num_zeros=6
## P34,3,18,ID=0, num_zeros=2
## P34,3,19,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=20 in LISTP34[[3]]
## P34,3,21,ID=0, num_zeros=4
## P34,3,22,ID=0, num_zeros=5
## P34,3,23,ID=0, num_zeros=5
## P34,3,24,ID=0, num_zeros=2
## P34,3,25,ID=0, num_zeros=7
## P34,3,26,ID=0, num_zeros=3
## P34,3,27,ID=0, num_zeros=3
## P34,3,28,ID=0, num_zeros=3
## P34,3,29,ID=0, num_zeros=4
## P34,3,30,ID=0, num_zeros=4
## P34,3,31,ID=0, num_zeros=2
## P34,3,32,ID=0, num_zeros=3
## P34,3,33,ID=0, num_zeros=5
## P34,3,34,ID=0, num_zeros=4
## P34,3,35,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=36 in LISTP34[[3]]
## P34,3,37,ID=0, num_zeros=1
## P34,3,38,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=39 in LISTP34[[3]]
## P34,3,40,ID=0, num_zeros=4
## P34,3,41,ID=0, num_zeros=4
## P34,3,42,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=43 in LISTP34[[3]]
## P34,3,44,ID=0, num_zeros=2
## P34,3,45,ID=0, num_zeros=4
## P34,3,46,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=47 in LISTP34[[3]]
## P34,3,48,ID=0, num_zeros=2
## P34,3,49,ID=0, num_zeros=0
## P34,3,50,ID=0, num_zeros=14
## P34,4,1,ID=0, num_zeros=3
## P34,4,2,ID=0, num_zeros=1
## P34,4,3,ID=0, num_zeros=2
## P34,4,4,ID=0, num_zeros=0
## P34,4,5,ID=0, num_zeros=6
## P34,4,6,ID=0, num_zeros=1
## P34,4,7,ID=0, num_zeros=1
## P34,4,8,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=9 in LISTP34[[4]]
## P34,4,10,ID=0, num_zeros=1
## P34,4,11,ID=0, num_zeros=1
## P34,4,12,ID=0, num_zeros=2
## P34,4,13,ID=0, num_zeros=1
## P34,4,14,ID=0, num_zeros=1
## P34,4,15,ID=0, num_zeros=1
## P34,4,16,ID=0, num_zeros=3
## P34,4,17,ID=0, num_zeros=0
## P34,4,18,ID=0, num_zeros=2
## P34,4,19,ID=0, num_zeros=5
## P34,4,20,ID=0, num_zeros=4
## P34,4,21,ID=0, num_zeros=4
## P34,4,22,ID=0, num_zeros=3
## P34,4,23,ID=0, num_zeros=2
## P34,4,24,ID=0, num_zeros=1
## P34,4,25,ID=0, num_zeros=1
## P34,4,26,ID=0, num_zeros=3
## P34,4,27,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=28 in LISTP34[[4]]
## P34,4,29,ID=0, num_zeros=2
## P34,4,30,ID=0, num_zeros=1
## P34,4,31,ID=0, num_zeros=3
## P34,4,32,ID=0, num_zeros=4
## P34,4,33,ID=0, num_zeros=1
## P34,4,34,ID=0, num_zeros=2
## P34,4,35,ID=0, num_zeros=2
## P34,4,36,ID=0, num_zeros=3
## P34,4,37,ID=0, num_zeros=4
## P34,4,38,ID=0, num_zeros=3
## P34,4,39,ID=0, num_zeros=4
## P34,4,40,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=41 in LISTP34[[4]]
## P34,4,42,ID=0, num_zeros=4
## P34,4,43,ID=0, num_zeros=0
## P34,4,44,ID=0, num_zeros=2
## P34,4,45,ID=0, num_zeros=2
## P34,4,46,ID=0, num_zeros=1
## P34,4,47,ID=0, num_zeros=1
## P34,4,48,ID=0, num_zeros=1
## P34,4,49,ID=0, num_zeros=2
## P34,4,50,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=1 in LISTP34[[5]]
## P34,5,2,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=3 in LISTP34[[5]]
## P34,5,4,ID=0, num_zeros=4
## P34,5,5,ID=0, num_zeros=1
## P34,5,6,ID=0, num_zeros=1
## P34,5,7,ID=0, num_zeros=1
## P34,5,8,ID=0, num_zeros=1
## P34,5,9,ID=0, num_zeros=1
## P34,5,10,ID=0, num_zeros=1
## P34,5,11,ID=0, num_zeros=1
## P34,5,12,ID=0, num_zeros=1
## P34,5,13,ID=0, num_zeros=1
## P34,5,14,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=15 in LISTP34[[5]]
## Warning: There are no valid values for INTERVALS=16 in LISTP34[[5]]
## P34,5,17,ID=0, num_zeros=1
## P34,5,18,ID=0, num_zeros=6
## P34,5,19,ID=0, num_zeros=0
## P34,5,20,ID=0, num_zeros=3
## P34,5,21,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=22 in LISTP34[[5]]
## P34,5,23,ID=0, num_zeros=2
## P34,5,24,ID=0, num_zeros=2
## P34,5,25,ID=0, num_zeros=3
## P34,5,26,ID=0, num_zeros=5
## P34,5,27,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=28 in LISTP34[[5]]
## P34,5,29,ID=0, num_zeros=1
## P34,5,30,ID=0, num_zeros=4
## P34,5,31,ID=0, num_zeros=3
## P34,5,32,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=33 in LISTP34[[5]]
## P34,5,34,ID=0, num_zeros=2
## P34,5,35,ID=0, num_zeros=3
## P34,5,36,ID=0, num_zeros=4
## P34,5,37,ID=0, num_zeros=3
## P34,5,38,ID=0, num_zeros=1
## P34,5,39,ID=0, num_zeros=2
## P34,5,40,ID=0, num_zeros=1
## P34,5,41,ID=0, num_zeros=1
## P34,5,42,ID=0, num_zeros=3
## P34,5,43,ID=0, num_zeros=0
## P34,5,44,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=45 in LISTP34[[5]]
## P34,5,46,ID=0, num_zeros=3
## P34,5,47,ID=0, num_zeros=1
## P34,5,48,ID=0, num_zeros=1
## P34,5,49,ID=0, num_zeros=3
## P34,5,50,ID=0, num_zeros=12
## P34,6,1,ID=0, num_zeros=1
## P34,6,2,ID=0, num_zeros=2
## P34,6,3,ID=0, num_zeros=4
## P34,6,4,ID=0, num_zeros=4
## P34,6,5,ID=0, num_zeros=0
## P34,6,6,ID=0, num_zeros=5
## P34,6,7,ID=0, num_zeros=3
## P34,6,8,ID=0, num_zeros=2
## P34,6,9,ID=0, num_zeros=1
## P34,6,10,ID=0, num_zeros=3
## P34,6,11,ID=0, num_zeros=1
## P34,6,12,ID=0, num_zeros=2
## P34,6,13,ID=0, num_zeros=2
## P34,6,14,ID=0, num_zeros=1
## P34,6,15,ID=0, num_zeros=3
## P34,6,16,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=17 in LISTP34[[6]]
## P34,6,18,ID=0, num_zeros=3
## P34,6,19,ID=0, num_zeros=3
## P34,6,20,ID=0, num_zeros=3
## P34,6,21,ID=0, num_zeros=5
## P34,6,22,ID=0, num_zeros=3
## P34,6,23,ID=0, num_zeros=3
## P34,6,24,ID=0, num_zeros=2
## P34,6,25,ID=0, num_zeros=4
## P34,6,26,ID=0, num_zeros=5
## P34,6,27,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=28 in LISTP34[[6]]
## P34,6,29,ID=0, num_zeros=1
## P34,6,30,ID=0, num_zeros=1
## P34,6,31,ID=0, num_zeros=2
## P34,6,32,ID=0, num_zeros=4
## P34,6,33,ID=0, num_zeros=4
## P34,6,34,ID=0, num_zeros=1
## P34,6,35,ID=0, num_zeros=1
## P34,6,36,ID=0, num_zeros=1
## P34,6,37,ID=0, num_zeros=1
## P34,6,38,ID=0, num_zeros=0
## P34,6,39,ID=0, num_zeros=2
## P34,6,40,ID=0, num_zeros=2
## P34,6,41,ID=0, num_zeros=1
## P34,6,42,ID=0, num_zeros=6
## P34,6,43,ID=0, num_zeros=2
## P34,6,44,ID=0, num_zeros=3
## P34,6,45,ID=0, num_zeros=1
## P34,6,46,ID=0, num_zeros=4
## P34,6,47,ID=0, num_zeros=2
## P34,6,48,ID=0, num_zeros=2
## P34,6,49,ID=0, num_zeros=2
## P34,6,50,ID=0, num_zeros=8
## P34,7,1,ID=0, num_zeros=4
## P34,7,2,ID=0, num_zeros=5
## P34,7,3,ID=0, num_zeros=2
## P34,7,4,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=5 in LISTP34[[7]]
## P34,7,6,ID=0, num_zeros=2
## P34,7,7,ID=0, num_zeros=9
## P34,7,8,ID=0, num_zeros=4
## P34,7,9,ID=0, num_zeros=1
## P34,7,10,ID=0, num_zeros=1
## P34,7,11,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=12 in LISTP34[[7]]
## P34,7,13,ID=0, num_zeros=3
## P34,7,14,ID=0, num_zeros=1
## P34,7,15,ID=0, num_zeros=4
## P34,7,16,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=17 in LISTP34[[7]]
## P34,7,18,ID=0, num_zeros=9
## P34,7,19,ID=0, num_zeros=3
## P34,7,20,ID=0, num_zeros=5
## P34,7,21,ID=0, num_zeros=5
## Warning: There are no valid values for INTERVALS=22 in LISTP34[[7]]
## P34,7,23,ID=0, num_zeros=3
## P34,7,24,ID=0, num_zeros=3
## P34,7,25,ID=0, num_zeros=1
## P34,7,26,ID=0, num_zeros=2
## P34,7,27,ID=0, num_zeros=3
## P34,7,28,ID=0, num_zeros=3
## P34,7,29,ID=0, num_zeros=2
## P34,7,30,ID=0, num_zeros=2
## P34,7,31,ID=0, num_zeros=1
## P34,7,32,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=33 in LISTP34[[7]]
## P34,7,34,ID=0, num_zeros=4
## P34,7,35,ID=0, num_zeros=6
## P34,7,36,ID=0, num_zeros=4
## P34,7,37,ID=0, num_zeros=0
## P34,7,38,ID=0, num_zeros=4
## P34,7,39,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=40 in LISTP34[[7]]
## Warning: There are no valid values for INTERVALS=41 in LISTP34[[7]]
## P34,7,42,ID=0, num_zeros=3
## P34,7,43,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=44 in LISTP34[[7]]
## P34,7,45,ID=0, num_zeros=1
## P34,7,46,ID=0, num_zeros=2
## P34,7,47,ID=0, num_zeros=3
## P34,7,48,ID=0, num_zeros=2
## P34,7,49,ID=0, num_zeros=2
## P34,7,50,ID=0, num_zeros=11
## Warning: There are no valid values for INTERVALS=1 in LISTP34[[8]]
## P34,8,2,ID=0, num_zeros=2
## P34,8,3,ID=0, num_zeros=1
## P34,8,4,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=5 in LISTP34[[8]]
## P34,8,6,ID=0, num_zeros=3
## P34,8,7,ID=0, num_zeros=2
## P34,8,8,ID=0, num_zeros=3
## Warning: There are no valid values for INTERVALS=9 in LISTP34[[8]]
## P34,8,10,ID=0, num_zeros=0
## P34,8,11,ID=0, num_zeros=0
## P34,8,12,ID=0, num_zeros=3
## P34,8,13,ID=0, num_zeros=4
## Warning: There are no valid values for INTERVALS=14 in LISTP34[[8]]
## Warning: There are no valid values for INTERVALS=15 in LISTP34[[8]]
## P34,8,16,ID=0, num_zeros=3
## P34,8,17,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=18 in LISTP34[[8]]
## P34,8,19,ID=0, num_zeros=2
## P34,8,20,ID=0, num_zeros=2
## P34,8,21,ID=0, num_zeros=4
## P34,8,22,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=23 in LISTP34[[8]]
## P34,8,24,ID=0, num_zeros=2
## P34,8,25,ID=0, num_zeros=5
## P34,8,26,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=27 in LISTP34[[8]]
## Warning: There are no valid values for INTERVALS=28 in LISTP34[[8]]
## P34,8,29,ID=0, num_zeros=2
## P34,8,30,ID=0, num_zeros=1
## P34,8,31,ID=0, num_zeros=2
## P34,8,32,ID=0, num_zeros=3
## P34,8,33,ID=0, num_zeros=2
## P34,8,34,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=35 in LISTP34[[8]]
## Warning: There are no valid values for INTERVALS=36 in LISTP34[[8]]
## P34,8,37,ID=0, num_zeros=1
## P34,8,38,ID=0, num_zeros=2
## P34,8,39,ID=0, num_zeros=4
## P34,8,40,ID=0, num_zeros=1
## P34,8,41,ID=0, num_zeros=1
## P34,8,42,ID=0, num_zeros=4
## P34,8,43,ID=0, num_zeros=5
## P34,8,44,ID=0, num_zeros=3
## P34,8,45,ID=0, num_zeros=1
## P34,8,46,ID=0, num_zeros=2
## P34,8,47,ID=0, num_zeros=1
## P34,8,48,ID=0, num_zeros=2
## P34,8,49,ID=0, num_zeros=2
## P34,8,50,ID=0, num_zeros=7
## P34,9,1,ID=0, num_zeros=2
## P34,9,2,ID=0, num_zeros=1
## P34,9,3,ID=0, num_zeros=0
## P34,9,4,ID=0, num_zeros=8
## P34,9,5,ID=0, num_zeros=2
## P34,9,6,ID=0, num_zeros=3
## P34,9,7,ID=0, num_zeros=3
## P34,9,8,ID=0, num_zeros=2
## P34,9,9,ID=0, num_zeros=2
## P34,9,10,ID=0, num_zeros=2
## P34,9,11,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=12 in LISTP34[[9]]
## P34,9,13,ID=0, num_zeros=2
## P34,9,14,ID=0, num_zeros=2
## P34,9,15,ID=0, num_zeros=9
## P34,9,16,ID=0, num_zeros=4
## P34,9,17,ID=0, num_zeros=1
## P34,9,18,ID=0, num_zeros=4
## P34,9,19,ID=0, num_zeros=2
## P34,9,20,ID=0, num_zeros=8
## P34,9,21,ID=0, num_zeros=1
## P34,9,22,ID=0, num_zeros=0
## Warning: There are no valid values for INTERVALS=23 in LISTP34[[9]]
## P34,9,24,ID=0, num_zeros=2
## P34,9,25,ID=0, num_zeros=3
## P34,9,26,ID=0, num_zeros=4
## P34,9,27,ID=0, num_zeros=4
## P34,9,28,ID=0, num_zeros=2
## P34,9,29,ID=0, num_zeros=1
## P34,9,30,ID=0, num_zeros=4
## P34,9,31,ID=0, num_zeros=2
## P34,9,32,ID=0, num_zeros=4
## P34,9,33,ID=0, num_zeros=4
## P34,9,34,ID=0, num_zeros=4
## P34,9,35,ID=0, num_zeros=2
## P34,9,36,ID=0, num_zeros=2
## P34,9,37,ID=0, num_zeros=5
## P34,9,38,ID=0, num_zeros=4
## P34,9,39,ID=0, num_zeros=0
## P34,9,40,ID=0, num_zeros=2
## P34,9,41,ID=0, num_zeros=6
## P34,9,42,ID=0, num_zeros=5
## P34,9,43,ID=0, num_zeros=4
## P34,9,44,ID=0, num_zeros=4
## P34,9,45,ID=0, num_zeros=2
## P34,9,46,ID=0, num_zeros=6
## P34,9,47,ID=0, num_zeros=5
## P34,9,48,ID=0, num_zeros=1
## P34,9,49,ID=0, num_zeros=1
## P34,9,50,ID=0, num_zeros=9
## Warning: There are no valid values for INTERVALS=1 in LISTP34[[10]]
## Warning: There are no valid values for INTERVALS=2 in LISTP34[[10]]
## Warning: There are no valid values for INTERVALS=3 in LISTP34[[10]]
## P34,10,4,ID=0, num_zeros=3
## P34,10,5,ID=0, num_zeros=4
## P34,10,6,ID=0, num_zeros=8
## P34,10,7,ID=0, num_zeros=2
## P34,10,8,ID=0, num_zeros=4
## P34,10,9,ID=0, num_zeros=6
## P34,10,10,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=11 in LISTP34[[10]]
## P34,10,12,ID=0, num_zeros=2
## P34,10,13,ID=0, num_zeros=5
## P34,10,14,ID=0, num_zeros=5
## P34,10,15,ID=0, num_zeros=2
## P34,10,16,ID=0, num_zeros=1
## P34,10,17,ID=0, num_zeros=1
## P34,10,18,ID=0, num_zeros=2
## P34,10,19,ID=0, num_zeros=5
## P34,10,20,ID=0, num_zeros=1
## Warning: There are no valid values for INTERVALS=21 in LISTP34[[10]]
## P34,10,22,ID=0, num_zeros=2
## P34,10,23,ID=0, num_zeros=1
## P34,10,24,ID=0, num_zeros=1
## P34,10,25,ID=0, num_zeros=1
## P34,10,26,ID=0, num_zeros=3
## P34,10,27,ID=0, num_zeros=2
## P34,10,28,ID=0, num_zeros=2
## P34,10,29,ID=0, num_zeros=2
## P34,10,30,ID=0, num_zeros=2
## Warning: There are no valid values for INTERVALS=31 in LISTP34[[10]]
## P34,10,32,ID=0, num_zeros=3
## P34,10,33,ID=0, num_zeros=2
## P34,10,34,ID=0, num_zeros=3
## P34,10,35,ID=0, num_zeros=3
## P34,10,36,ID=0, num_zeros=5
## P34,10,37,ID=0, num_zeros=7
## P34,10,38,ID=0, num_zeros=6
## P34,10,39,ID=0, num_zeros=6
## P34,10,40,ID=0, num_zeros=1
## P34,10,41,ID=0, num_zeros=4
## P34,10,42,ID=0, num_zeros=2
## P34,10,43,ID=0, num_zeros=0
## P34,10,44,ID=0, num_zeros=6
## P34,10,45,ID=0, num_zeros=2
## P34,10,46,ID=0, num_zeros=2
## P34,10,47,ID=0, num_zeros=3
## P34,10,48,ID=0, num_zeros=0
## P34,10,49,ID=0, num_zeros=1
## P34,10,50,ID=0, num_zeros=14
# Close the file
sink()
close(output_file)

In order to calculate every error made per block and create an excel together with the total time in second of the block the following code was used.

# Define lists of data and time blocks for each participant
data_list <- list(LISTP5, LISTP6, LISTP7, LISTP8, LISTP9, LISTP10, LISTP11, LISTP12, LISTP13, LISTP14, LISTP15, LISTP16, LISTP17, LISTP18, LISTP19, LISTP20, LISTP21, LISTP22, LISTP23, LISTP24, LISTP25, LISTP26, LISTP27, LISTP28, LISTP29, LISTP30, LISTP31, LISTP32, LISTP33,LISTP34)
time_list <- list(PERCENTAGEP5, PERCENTAGEP6, PERCENTAGEP7, PERCENTAGEP8, PERCENTAGEP9, PERCENTAGEP10, PERCENTAGEP11, PERCENTAGEP12, PERCENTAGEP13, PERCENTAGEP14, PERCENTAGEP15, PERCENTAGEP16, PERCENTAGEP17, PERCENTAGEP18, PERCENTAGEP19, PERCENTAGEP20, PERCENTAGEP21, PERCENTAGEP22, PERCENTAGEP23, PERCENTAGEP24, PERCENTAGEP25, PERCENTAGEP26, PERCENTAGEP27, PERCENTAGEP28, PERCENTAGEP29, PERCENTAGEP30, PERCENTAGEP31, PERCENTAGEP32, PERCENTAGEP33,PERCENTAGEP34)

# Loop through each participant's data and time blocks
for (i in 1:length(data_list)) {
  # Loop through each block for the current participant
  for (j in 1:10) {
    # Get the error sum and time for the current block
    error_sum <- sum(subset(data_list[[i]][[paste0("P", i+4, "B", j)]], ID == 0)$VALUE)
    time_block <- time_list[[i]][[paste0("Block ", j)]][1]*60
    
    # Print or do something with the error sum and time for the current block
    print(paste0("Participant ", i+4, ", Block ", j, ":"))
    print(paste0("Error sum: ", error_sum))
    print(paste0("Time: ", time_block))
  }
}
## [1] "Participant 5, Block 1:"
## [1] "Error sum: 300"
## [1] "Time: 699"
## [1] "Participant 5, Block 2:"
## [1] "Error sum: 210"
## [1] "Time: 448.2"
## [1] "Participant 5, Block 3:"
## [1] "Error sum: 188"
## [1] "Time: 432"
## [1] "Participant 5, Block 4:"
## [1] "Error sum: 168"
## [1] "Time: 299.4"
## [1] "Participant 5, Block 5:"
## [1] "Error sum: 134"
## [1] "Time: 355.8"
## [1] "Participant 5, Block 6:"
## [1] "Error sum: 152"
## [1] "Time: 393.6"
## [1] "Participant 5, Block 7:"
## [1] "Error sum: 116"
## [1] "Time: 315"
## [1] "Participant 5, Block 8:"
## [1] "Error sum: 156"
## [1] "Time: 311.4"
## [1] "Participant 5, Block 9:"
## [1] "Error sum: 119"
## [1] "Time: 325.2"
## [1] "Participant 5, Block 10:"
## [1] "Error sum: 139"
## [1] "Time: 334.2"
## [1] "Participant 6, Block 1:"
## [1] "Error sum: 329"
## [1] "Time: 402.6"
## [1] "Participant 6, Block 2:"
## [1] "Error sum: 205"
## [1] "Time: 338.4"
## [1] "Participant 6, Block 3:"
## [1] "Error sum: 144"
## [1] "Time: 322.2"
## [1] "Participant 6, Block 4:"
## [1] "Error sum: 153"
## [1] "Time: 331.8"
## [1] "Participant 6, Block 5:"
## [1] "Error sum: 118"
## [1] "Time: 251.4"
## [1] "Participant 6, Block 6:"
## [1] "Error sum: 73"
## [1] "Time: 198.6"
## [1] "Participant 6, Block 7:"
## [1] "Error sum: 86"
## [1] "Time: 253.2"
## [1] "Participant 6, Block 8:"
## [1] "Error sum: 97"
## [1] "Time: 258"
## [1] "Participant 6, Block 9:"
## [1] "Error sum: 81"
## [1] "Time: 245.4"
## [1] "Participant 6, Block 10:"
## [1] "Error sum: 81"
## [1] "Time: 159"
## [1] "Participant 7, Block 1:"
## [1] "Error sum: 133"
## [1] "Time: 166.2"
## [1] "Participant 7, Block 2:"
## [1] "Error sum: 83"
## [1] "Time: 106.8"
## [1] "Participant 7, Block 3:"
## [1] "Error sum: 118"
## [1] "Time: 91.2"
## [1] "Participant 7, Block 4:"
## [1] "Error sum: 118"
## [1] "Time: 75.6"
## [1] "Participant 7, Block 5:"
## [1] "Error sum: 134"
## [1] "Time: 82.2"
## [1] "Participant 7, Block 6:"
## [1] "Error sum: 129"
## [1] "Time: 81"
## [1] "Participant 7, Block 7:"
## [1] "Error sum: 121"
## [1] "Time: 70.2"
## [1] "Participant 7, Block 8:"
## [1] "Error sum: 83"
## [1] "Time: 75"
## [1] "Participant 7, Block 9:"
## [1] "Error sum: 100"
## [1] "Time: 70.8"
## [1] "Participant 7, Block 10:"
## [1] "Error sum: 121"
## [1] "Time: 79.2"
## [1] "Participant 8, Block 1:"
## [1] "Error sum: 165"
## [1] "Time: 417"
## [1] "Participant 8, Block 2:"
## [1] "Error sum: 113"
## [1] "Time: 316.2"
## [1] "Participant 8, Block 3:"
## [1] "Error sum: 99"
## [1] "Time: 363"
## [1] "Participant 8, Block 4:"
## [1] "Error sum: 134"
## [1] "Time: 382.8"
## [1] "Participant 8, Block 5:"
## [1] "Error sum: 101"
## [1] "Time: 354.6"
## [1] "Participant 8, Block 6:"
## [1] "Error sum: 62"
## [1] "Time: 356.4"
## [1] "Participant 8, Block 7:"
## [1] "Error sum: 55"
## [1] "Time: 330.6"
## [1] "Participant 8, Block 8:"
## [1] "Error sum: 69"
## [1] "Time: 321.6"
## [1] "Participant 8, Block 9:"
## [1] "Error sum: 52"
## [1] "Time: 165.6"
## [1] "Participant 8, Block 10:"
## [1] "Error sum: 74"
## [1] "Time: 246.6"
## [1] "Participant 9, Block 1:"
## [1] "Error sum: 237"
## [1] "Time: 328.2"
## [1] "Participant 9, Block 2:"
## [1] "Error sum: 178"
## [1] "Time: 251.4"
## [1] "Participant 9, Block 3:"
## [1] "Error sum: 161"
## [1] "Time: 222"
## [1] "Participant 9, Block 4:"
## [1] "Error sum: 163"
## [1] "Time: 234"
## [1] "Participant 9, Block 5:"
## [1] "Error sum: 117"
## [1] "Time: 262.8"
## [1] "Participant 9, Block 6:"
## [1] "Error sum: 151"
## [1] "Time: 216.6"
## [1] "Participant 9, Block 7:"
## [1] "Error sum: 118"
## [1] "Time: 300.6"
## [1] "Participant 9, Block 8:"
## [1] "Error sum: 137"
## [1] "Time: 186.6"
## [1] "Participant 9, Block 9:"
## [1] "Error sum: 144"
## [1] "Time: 123"
## [1] "Participant 9, Block 10:"
## [1] "Error sum: 126"
## [1] "Time: 144.6"
## [1] "Participant 10, Block 1:"
## [1] "Error sum: 203"
## [1] "Time: 373.8"
## [1] "Participant 10, Block 2:"
## [1] "Error sum: 154"
## [1] "Time: 360"
## [1] "Participant 10, Block 3:"
## [1] "Error sum: 164"
## [1] "Time: 225.6"
## [1] "Participant 10, Block 4:"
## [1] "Error sum: 150"
## [1] "Time: 244.2"
## [1] "Participant 10, Block 5:"
## [1] "Error sum: 115"
## [1] "Time: 141.6"
## [1] "Participant 10, Block 6:"
## [1] "Error sum: 102"
## [1] "Time: 205.8"
## [1] "Participant 10, Block 7:"
## [1] "Error sum: 101"
## [1] "Time: 129.6"
## [1] "Participant 10, Block 8:"
## [1] "Error sum: 131"
## [1] "Time: 144.6"
## [1] "Participant 10, Block 9:"
## [1] "Error sum: 114"
## [1] "Time: 133.2"
## [1] "Participant 10, Block 10:"
## [1] "Error sum: 118"
## [1] "Time: 144"
## [1] "Participant 11, Block 1:"
## [1] "Error sum: 195"
## [1] "Time: 295.8"
## [1] "Participant 11, Block 2:"
## [1] "Error sum: 171"
## [1] "Time: 318.6"
## [1] "Participant 11, Block 3:"
## [1] "Error sum: 166"
## [1] "Time: 330.6"
## [1] "Participant 11, Block 4:"
## [1] "Error sum: 154"
## [1] "Time: 259.8"
## [1] "Participant 11, Block 5:"
## [1] "Error sum: 194"
## [1] "Time: 226.8"
## [1] "Participant 11, Block 6:"
## [1] "Error sum: 120"
## [1] "Time: 195.6"
## [1] "Participant 11, Block 7:"
## [1] "Error sum: 82"
## [1] "Time: 162"
## [1] "Participant 11, Block 8:"
## [1] "Error sum: 50"
## [1] "Time: 192"
## [1] "Participant 11, Block 9:"
## [1] "Error sum: 91"
## [1] "Time: 251.4"
## [1] "Participant 11, Block 10:"
## [1] "Error sum: 82"
## [1] "Time: 188.4"
## [1] "Participant 12, Block 1:"
## [1] "Error sum: 124"
## [1] "Time: 241.2"
## [1] "Participant 12, Block 2:"
## [1] "Error sum: 129"
## [1] "Time: 148.8"
## [1] "Participant 12, Block 3:"
## [1] "Error sum: 137"
## [1] "Time: 148.2"
## [1] "Participant 12, Block 4:"
## [1] "Error sum: 106"
## [1] "Time: 118.8"
## [1] "Participant 12, Block 5:"
## [1] "Error sum: 102"
## [1] "Time: 115.2"
## [1] "Participant 12, Block 6:"
## [1] "Error sum: 95"
## [1] "Time: 123.6"
## [1] "Participant 12, Block 7:"
## [1] "Error sum: 116"
## [1] "Time: 121.8"
## [1] "Participant 12, Block 8:"
## [1] "Error sum: 121"
## [1] "Time: 103.8"
## [1] "Participant 12, Block 9:"
## [1] "Error sum: 113"
## [1] "Time: 108"
## [1] "Participant 12, Block 10:"
## [1] "Error sum: 97"
## [1] "Time: 85.8"
## [1] "Participant 13, Block 1:"
## [1] "Error sum: 461"
## [1] "Time: 375.6"
## [1] "Participant 13, Block 2:"
## [1] "Error sum: 331"
## [1] "Time: 331.2"
## [1] "Participant 13, Block 3:"
## [1] "Error sum: 273"
## [1] "Time: 231.6"
## [1] "Participant 13, Block 4:"
## [1] "Error sum: 251"
## [1] "Time: 178.2"
## [1] "Participant 13, Block 5:"
## [1] "Error sum: 243"
## [1] "Time: 135"
## [1] "Participant 13, Block 6:"
## [1] "Error sum: 179"
## [1] "Time: 180"
## [1] "Participant 13, Block 7:"
## [1] "Error sum: 174"
## [1] "Time: 159.6"
## [1] "Participant 13, Block 8:"
## [1] "Error sum: 205"
## [1] "Time: 151.2"
## [1] "Participant 13, Block 9:"
## [1] "Error sum: 178"
## [1] "Time: 119.4"
## [1] "Participant 13, Block 10:"
## [1] "Error sum: 177"
## [1] "Time: 118.2"
## [1] "Participant 14, Block 1:"
## [1] "Error sum: 178"
## [1] "Time: 57"
## [1] "Participant 14, Block 2:"
## [1] "Error sum: 187"
## [1] "Time: 61.8"
## [1] "Participant 14, Block 3:"
## [1] "Error sum: 226"
## [1] "Time: 102.6"
## [1] "Participant 14, Block 4:"
## [1] "Error sum: 209"
## [1] "Time: 109.2"
## [1] "Participant 14, Block 5:"
## [1] "Error sum: 146"
## [1] "Time: 95.4"
## [1] "Participant 14, Block 6:"
## [1] "Error sum: 147"
## [1] "Time: 114.6"
## [1] "Participant 14, Block 7:"
## [1] "Error sum: 125"
## [1] "Time: 94.8"
## [1] "Participant 14, Block 8:"
## [1] "Error sum: 139"
## [1] "Time: 94.8"
## [1] "Participant 14, Block 9:"
## [1] "Error sum: 94"
## [1] "Time: 87.6"
## [1] "Participant 14, Block 10:"
## [1] "Error sum: 122"
## [1] "Time: 94.8"
## [1] "Participant 15, Block 1:"
## [1] "Error sum: 373"
## [1] "Time: 390"
## [1] "Participant 15, Block 2:"
## [1] "Error sum: 245"
## [1] "Time: 174.6"
## [1] "Participant 15, Block 3:"
## [1] "Error sum: 247"
## [1] "Time: 289.8"
## [1] "Participant 15, Block 4:"
## [1] "Error sum: 233"
## [1] "Time: 205.8"
## [1] "Participant 15, Block 5:"
## [1] "Error sum: 234"
## [1] "Time: 211.8"
## [1] "Participant 15, Block 6:"
## [1] "Error sum: 182"
## [1] "Time: 199.8"
## [1] "Participant 15, Block 7:"
## [1] "Error sum: 154"
## [1] "Time: 130.8"
## [1] "Participant 15, Block 8:"
## [1] "Error sum: 147"
## [1] "Time: 111"
## [1] "Participant 15, Block 9:"
## [1] "Error sum: 163"
## [1] "Time: 121.8"
## [1] "Participant 15, Block 10:"
## [1] "Error sum: 134"
## [1] "Time: 112.8"
## [1] "Participant 16, Block 1:"
## [1] "Error sum: 354"
## [1] "Time: 390"
## [1] "Participant 16, Block 2:"
## [1] "Error sum: 265"
## [1] "Time: 297"
## [1] "Participant 16, Block 3:"
## [1] "Error sum: 194"
## [1] "Time: 243"
## [1] "Participant 16, Block 4:"
## [1] "Error sum: 258"
## [1] "Time: 247.2"
## [1] "Participant 16, Block 5:"
## [1] "Error sum: 221"
## [1] "Time: 187.8"
## [1] "Participant 16, Block 6:"
## [1] "Error sum: 193"
## [1] "Time: 295.8"
## [1] "Participant 16, Block 7:"
## [1] "Error sum: 263"
## [1] "Time: 227.4"
## [1] "Participant 16, Block 8:"
## [1] "Error sum: 175"
## [1] "Time: 216.6"
## [1] "Participant 16, Block 9:"
## [1] "Error sum: 215"
## [1] "Time: 216.6"
## [1] "Participant 16, Block 10:"
## [1] "Error sum: 224"
## [1] "Time: 255"
## [1] "Participant 17, Block 1:"
## [1] "Error sum: 251"
## [1] "Time: 222"
## [1] "Participant 17, Block 2:"
## [1] "Error sum: 169"
## [1] "Time: 295.8"
## [1] "Participant 17, Block 3:"
## [1] "Error sum: 129"
## [1] "Time: 350.4"
## [1] "Participant 17, Block 4:"
## [1] "Error sum: 96"
## [1] "Time: 321.6"
## [1] "Participant 17, Block 5:"
## [1] "Error sum: 144"
## [1] "Time: 262.2"
## [1] "Participant 17, Block 6:"
## [1] "Error sum: 77"
## [1] "Time: 324.6"
## [1] "Participant 17, Block 7:"
## [1] "Error sum: 130"
## [1] "Time: 198.6"
## [1] "Participant 17, Block 8:"
## [1] "Error sum: 133"
## [1] "Time: 310.8"
## [1] "Participant 17, Block 9:"
## [1] "Error sum: 110"
## [1] "Time: 217.8"
## [1] "Participant 17, Block 10:"
## [1] "Error sum: 109"
## [1] "Time: 193.2"
## [1] "Participant 18, Block 1:"
## [1] "Error sum: 255"
## [1] "Time: 294.6"
## [1] "Participant 18, Block 2:"
## [1] "Error sum: 239"
## [1] "Time: 223.8"
## [1] "Participant 18, Block 3:"
## [1] "Error sum: 215"
## [1] "Time: 186"
## [1] "Participant 18, Block 4:"
## [1] "Error sum: 155"
## [1] "Time: 161.4"
## [1] "Participant 18, Block 5:"
## [1] "Error sum: 184"
## [1] "Time: 257.4"
## [1] "Participant 18, Block 6:"
## [1] "Error sum: 145"
## [1] "Time: 220.2"
## [1] "Participant 18, Block 7:"
## [1] "Error sum: 164"
## [1] "Time: 187.8"
## [1] "Participant 18, Block 8:"
## [1] "Error sum: 189"
## [1] "Time: 235.2"
## [1] "Participant 18, Block 9:"
## [1] "Error sum: 140"
## [1] "Time: 186.6"
## [1] "Participant 18, Block 10:"
## [1] "Error sum: 120"
## [1] "Time: 153"
## [1] "Participant 19, Block 1:"
## [1] "Error sum: 80"
## [1] "Time: 325.8"
## [1] "Participant 19, Block 2:"
## [1] "Error sum: 140"
## [1] "Time: 394.8"
## [1] "Participant 19, Block 3:"
## [1] "Error sum: 168"
## [1] "Time: 366"
## [1] "Participant 19, Block 4:"
## [1] "Error sum: 145"
## [1] "Time: 332.4"
## [1] "Participant 19, Block 5:"
## [1] "Error sum: 107"
## [1] "Time: 293.4"
## [1] "Participant 19, Block 6:"
## [1] "Error sum: 117"
## [1] "Time: 228.6"
## [1] "Participant 19, Block 7:"
## [1] "Error sum: 106"
## [1] "Time: 179.4"
## [1] "Participant 19, Block 8:"
## [1] "Error sum: 129"
## [1] "Time: 151.2"
## [1] "Participant 19, Block 9:"
## [1] "Error sum: 78"
## [1] "Time: 178.8"
## [1] "Participant 19, Block 10:"
## [1] "Error sum: 133"
## [1] "Time: 180"
## [1] "Participant 20, Block 1:"
## [1] "Error sum: 419"
## [1] "Time: 168.6"
## [1] "Participant 20, Block 2:"
## [1] "Error sum: 223"
## [1] "Time: 185.4"
## [1] "Participant 20, Block 3:"
## [1] "Error sum: 276"
## [1] "Time: 358.2"
## [1] "Participant 20, Block 4:"
## [1] "Error sum: 235"
## [1] "Time: 430.8"
## [1] "Participant 20, Block 5:"
## [1] "Error sum: 148"
## [1] "Time: 384"
## [1] "Participant 20, Block 6:"
## [1] "Error sum: 161"
## [1] "Time: 345"
## [1] "Participant 20, Block 7:"
## [1] "Error sum: 153"
## [1] "Time: 352.2"
## [1] "Participant 20, Block 8:"
## [1] "Error sum: 166"
## [1] "Time: 345"
## [1] "Participant 20, Block 9:"
## [1] "Error sum: 226"
## [1] "Time: 336"
## [1] "Participant 20, Block 10:"
## [1] "Error sum: 183"
## [1] "Time: 301.8"
## [1] "Participant 21, Block 1:"
## [1] "Error sum: 294"
## [1] "Time: 151.8"
## [1] "Participant 21, Block 2:"
## [1] "Error sum: 235"
## [1] "Time: 146.4"
## [1] "Participant 21, Block 3:"
## [1] "Error sum: 262"
## [1] "Time: 215.4"
## [1] "Participant 21, Block 4:"
## [1] "Error sum: 175"
## [1] "Time: 151.8"
## [1] "Participant 21, Block 5:"
## [1] "Error sum: 201"
## [1] "Time: 148.2"
## [1] "Participant 21, Block 6:"
## [1] "Error sum: 168"
## [1] "Time: 131.4"
## [1] "Participant 21, Block 7:"
## [1] "Error sum: 164"
## [1] "Time: 118.2"
## [1] "Participant 21, Block 8:"
## [1] "Error sum: 198"
## [1] "Time: 116.4"
## [1] "Participant 21, Block 9:"
## [1] "Error sum: 176"
## [1] "Time: 100.2"
## [1] "Participant 21, Block 10:"
## [1] "Error sum: 184"
## [1] "Time: 102"
## [1] "Participant 22, Block 1:"
## [1] "Error sum: 285"
## [1] "Time: 321"
## [1] "Participant 22, Block 2:"
## [1] "Error sum: 254"
## [1] "Time: 349.2"
## [1] "Participant 22, Block 3:"
## [1] "Error sum: 124"
## [1] "Time: 188.4"
## [1] "Participant 22, Block 4:"
## [1] "Error sum: 160"
## [1] "Time: 260.4"
## [1] "Participant 22, Block 5:"
## [1] "Error sum: 133"
## [1] "Time: 213"
## [1] "Participant 22, Block 6:"
## [1] "Error sum: 137"
## [1] "Time: 164.4"
## [1] "Participant 22, Block 7:"
## [1] "Error sum: 63"
## [1] "Time: 154.2"
## [1] "Participant 22, Block 8:"
## [1] "Error sum: 107"
## [1] "Time: 135"
## [1] "Participant 22, Block 9:"
## [1] "Error sum: 126"
## [1] "Time: 177.6"
## [1] "Participant 22, Block 10:"
## [1] "Error sum: 93"
## [1] "Time: 133.2"
## [1] "Participant 23, Block 1:"
## [1] "Error sum: 229"
## [1] "Time: 144.6"
## [1] "Participant 23, Block 2:"
## [1] "Error sum: 296"
## [1] "Time: 197.4"
## [1] "Participant 23, Block 3:"
## [1] "Error sum: 252"
## [1] "Time: 152.4"
## [1] "Participant 23, Block 4:"
## [1] "Error sum: 257"
## [1] "Time: 274.8"
## [1] "Participant 23, Block 5:"
## [1] "Error sum: 212"
## [1] "Time: 289.8"
## [1] "Participant 23, Block 6:"
## [1] "Error sum: 198"
## [1] "Time: 259.2"
## [1] "Participant 23, Block 7:"
## [1] "Error sum: 214"
## [1] "Time: 136.2"
## [1] "Participant 23, Block 8:"
## [1] "Error sum: 198"
## [1] "Time: 142.8"
## [1] "Participant 23, Block 9:"
## [1] "Error sum: 190"
## [1] "Time: 124.2"
## [1] "Participant 23, Block 10:"
## [1] "Error sum: 175"
## [1] "Time: 114.6"
## [1] "Participant 24, Block 1:"
## [1] "Error sum: 228"
## [1] "Time: 373.8"
## [1] "Participant 24, Block 2:"
## [1] "Error sum: 141"
## [1] "Time: 366.6"
## [1] "Participant 24, Block 3:"
## [1] "Error sum: 93"
## [1] "Time: 387.6"
## [1] "Participant 24, Block 4:"
## [1] "Error sum: 118"
## [1] "Time: 390.6"
## [1] "Participant 24, Block 5:"
## [1] "Error sum: 58"
## [1] "Time: 302.4"
## [1] "Participant 24, Block 6:"
## [1] "Error sum: 49"
## [1] "Time: 290.4"
## [1] "Participant 24, Block 7:"
## [1] "Error sum: 55"
## [1] "Time: 279"
## [1] "Participant 24, Block 8:"
## [1] "Error sum: 102"
## [1] "Time: 419.4"
## [1] "Participant 24, Block 9:"
## [1] "Error sum: 222"
## [1] "Time: 412.2"
## [1] "Participant 24, Block 10:"
## [1] "Error sum: 106"
## [1] "Time: 380.4"
## [1] "Participant 25, Block 1:"
## [1] "Error sum: 223"
## [1] "Time: 297.6"
## [1] "Participant 25, Block 2:"
## [1] "Error sum: 102"
## [1] "Time: 160.2"
## [1] "Participant 25, Block 3:"
## [1] "Error sum: 174"
## [1] "Time: 154.2"
## [1] "Participant 25, Block 4:"
## [1] "Error sum: 129"
## [1] "Time: 117.6"
## [1] "Participant 25, Block 5:"
## [1] "Error sum: 166"
## [1] "Time: 132"
## [1] "Participant 25, Block 6:"
## [1] "Error sum: 109"
## [1] "Time: 140.4"
## [1] "Participant 25, Block 7:"
## [1] "Error sum: 134"
## [1] "Time: 112.2"
## [1] "Participant 25, Block 8:"
## [1] "Error sum: 106"
## [1] "Time: 108"
## [1] "Participant 25, Block 9:"
## [1] "Error sum: 110"
## [1] "Time: 109.8"
## [1] "Participant 25, Block 10:"
## [1] "Error sum: 130"
## [1] "Time: 110.4"
## [1] "Participant 26, Block 1:"
## [1] "Error sum: 265"
## [1] "Time: 312.6"
## [1] "Participant 26, Block 2:"
## [1] "Error sum: 218"
## [1] "Time: 255.6"
## [1] "Participant 26, Block 3:"
## [1] "Error sum: 171"
## [1] "Time: 205.2"
## [1] "Participant 26, Block 4:"
## [1] "Error sum: 162"
## [1] "Time: 181.2"
## [1] "Participant 26, Block 5:"
## [1] "Error sum: 176"
## [1] "Time: 295.8"
## [1] "Participant 26, Block 6:"
## [1] "Error sum: 91"
## [1] "Time: 265.8"
## [1] "Participant 26, Block 7:"
## [1] "Error sum: 98"
## [1] "Time: 172.8"
## [1] "Participant 26, Block 8:"
## [1] "Error sum: 100"
## [1] "Time: 145.8"
## [1] "Participant 26, Block 9:"
## [1] "Error sum: 92"
## [1] "Time: 146.4"
## [1] "Participant 26, Block 10:"
## [1] "Error sum: 102"
## [1] "Time: 159"
## [1] "Participant 27, Block 1:"
## [1] "Error sum: 449"
## [1] "Time: 274.8"
## [1] "Participant 27, Block 2:"
## [1] "Error sum: 414"
## [1] "Time: 284.4"
## [1] "Participant 27, Block 3:"
## [1] "Error sum: 351"
## [1] "Time: 192.6"
## [1] "Participant 27, Block 4:"
## [1] "Error sum: 380"
## [1] "Time: 194.4"
## [1] "Participant 27, Block 5:"
## [1] "Error sum: 380"
## [1] "Time: 229.2"
## [1] "Participant 27, Block 6:"
## [1] "Error sum: 416"
## [1] "Time: 310.8"
## [1] "Participant 27, Block 7:"
## [1] "Error sum: 284"
## [1] "Time: 197.4"
## [1] "Participant 27, Block 8:"
## [1] "Error sum: 183"
## [1] "Time: 132"
## [1] "Participant 27, Block 9:"
## [1] "Error sum: 272"
## [1] "Time: 252.6"
## [1] "Participant 27, Block 10:"
## [1] "Error sum: 232"
## [1] "Time: 139.2"
## [1] "Participant 28, Block 1:"
## [1] "Error sum: 306"
## [1] "Time: 142.8"
## [1] "Participant 28, Block 2:"
## [1] "Error sum: 361"
## [1] "Time: 140.4"
## [1] "Participant 28, Block 3:"
## [1] "Error sum: 238"
## [1] "Time: 135"
## [1] "Participant 28, Block 4:"
## [1] "Error sum: 285"
## [1] "Time: 139.2"
## [1] "Participant 28, Block 5:"
## [1] "Error sum: 218"
## [1] "Time: 117.6"
## [1] "Participant 28, Block 6:"
## [1] "Error sum: 177"
## [1] "Time: 118.2"
## [1] "Participant 28, Block 7:"
## [1] "Error sum: 183"
## [1] "Time: 96.6"
## [1] "Participant 28, Block 8:"
## [1] "Error sum: 212"
## [1] "Time: 109.2"
## [1] "Participant 28, Block 9:"
## [1] "Error sum: 175"
## [1] "Time: 97.8"
## [1] "Participant 28, Block 10:"
## [1] "Error sum: 139"
## [1] "Time: 82.2"
## [1] "Participant 29, Block 1:"
## [1] "Error sum: 256"
## [1] "Time: 323.4"
## [1] "Participant 29, Block 2:"
## [1] "Error sum: 220"
## [1] "Time: 354.6"
## [1] "Participant 29, Block 3:"
## [1] "Error sum: 216"
## [1] "Time: 373.2"
## [1] "Participant 29, Block 4:"
## [1] "Error sum: 186"
## [1] "Time: 357.6"
## [1] "Participant 29, Block 5:"
## [1] "Error sum: 164"
## [1] "Time: 294.6"
## [1] "Participant 29, Block 6:"
## [1] "Error sum: 149"
## [1] "Time: 376.2"
## [1] "Participant 29, Block 7:"
## [1] "Error sum: 120"
## [1] "Time: 328.2"
## [1] "Participant 29, Block 8:"
## [1] "Error sum: 98"
## [1] "Time: 291"
## [1] "Participant 29, Block 9:"
## [1] "Error sum: 124"
## [1] "Time: 274.2"
## [1] "Participant 29, Block 10:"
## [1] "Error sum: 103"
## [1] "Time: 145.8"
## [1] "Participant 30, Block 1:"
## [1] "Error sum: 291"
## [1] "Time: 144"
## [1] "Participant 30, Block 2:"
## [1] "Error sum: 192"
## [1] "Time: 136.8"
## [1] "Participant 30, Block 3:"
## [1] "Error sum: 187"
## [1] "Time: 119.4"
## [1] "Participant 30, Block 4:"
## [1] "Error sum: 175"
## [1] "Time: 123.6"
## [1] "Participant 30, Block 5:"
## [1] "Error sum: 155"
## [1] "Time: 105"
## [1] "Participant 30, Block 6:"
## [1] "Error sum: 173"
## [1] "Time: 100.8"
## [1] "Participant 30, Block 7:"
## [1] "Error sum: 174"
## [1] "Time: 88.8"
## [1] "Participant 30, Block 8:"
## [1] "Error sum: 176"
## [1] "Time: 82.8"
## [1] "Participant 30, Block 9:"
## [1] "Error sum: 118"
## [1] "Time: 92.4"
## [1] "Participant 30, Block 10:"
## [1] "Error sum: 121"
## [1] "Time: 84"
## [1] "Participant 31, Block 1:"
## [1] "Error sum: 133"
## [1] "Time: 78.6"
## [1] "Participant 31, Block 2:"
## [1] "Error sum: 91"
## [1] "Time: 58.8"
## [1] "Participant 31, Block 3:"
## [1] "Error sum: 112"
## [1] "Time: 73.8"
## [1] "Participant 31, Block 4:"
## [1] "Error sum: 108"
## [1] "Time: 69.6"
## [1] "Participant 31, Block 5:"
## [1] "Error sum: 130"
## [1] "Time: 62.4"
## [1] "Participant 31, Block 6:"
## [1] "Error sum: 77"
## [1] "Time: 72"
## [1] "Participant 31, Block 7:"
## [1] "Error sum: 102"
## [1] "Time: 67.2"
## [1] "Participant 31, Block 8:"
## [1] "Error sum: 121"
## [1] "Time: 70.2"
## [1] "Participant 31, Block 9:"
## [1] "Error sum: 94"
## [1] "Time: 67.2"
## [1] "Participant 31, Block 10:"
## [1] "Error sum: 126"
## [1] "Time: 64.8"
## [1] "Participant 32, Block 1:"
## [1] "Error sum: 99"
## [1] "Time: 106.8"
## [1] "Participant 32, Block 2:"
## [1] "Error sum: 105"
## [1] "Time: 125.4"
## [1] "Participant 32, Block 3:"
## [1] "Error sum: 95"
## [1] "Time: 114.6"
## [1] "Participant 32, Block 4:"
## [1] "Error sum: 114"
## [1] "Time: 124.8"
## [1] "Participant 32, Block 5:"
## [1] "Error sum: 115"
## [1] "Time: 130.8"
## [1] "Participant 32, Block 6:"
## [1] "Error sum: 80"
## [1] "Time: 131.4"
## [1] "Participant 32, Block 7:"
## [1] "Error sum: 92"
## [1] "Time: 123"
## [1] "Participant 32, Block 8:"
## [1] "Error sum: 57"
## [1] "Time: 102.6"
## [1] "Participant 32, Block 9:"
## [1] "Error sum: 76"
## [1] "Time: 130.8"
## [1] "Participant 32, Block 10:"
## [1] "Error sum: 67"
## [1] "Time: 141"
## [1] "Participant 33, Block 1:"
## [1] "Error sum: 263"
## [1] "Time: 289.2"
## [1] "Participant 33, Block 2:"
## [1] "Error sum: 163"
## [1] "Time: 154.2"
## [1] "Participant 33, Block 3:"
## [1] "Error sum: 139"
## [1] "Time: 152.4"
## [1] "Participant 33, Block 4:"
## [1] "Error sum: 175"
## [1] "Time: 183.6"
## [1] "Participant 33, Block 5:"
## [1] "Error sum: 215"
## [1] "Time: 189.6"
## [1] "Participant 33, Block 6:"
## [1] "Error sum: 140"
## [1] "Time: 149.4"
## [1] "Participant 33, Block 7:"
## [1] "Error sum: 192"
## [1] "Time: 155.4"
## [1] "Participant 33, Block 8:"
## [1] "Error sum: 177"
## [1] "Time: 188.4"
## [1] "Participant 33, Block 9:"
## [1] "Error sum: 127"
## [1] "Time: 146.4"
## [1] "Participant 33, Block 10:"
## [1] "Error sum: 97"
## [1] "Time: 149.4"
## [1] "Participant 34, Block 1:"
## [1] "Error sum: 107"
## [1] "Time: 57.6"
## [1] "Participant 34, Block 2:"
## [1] "Error sum: 152"
## [1] "Time: 51"
## [1] "Participant 34, Block 3:"
## [1] "Error sum: 159"
## [1] "Time: 66"
## [1] "Participant 34, Block 4:"
## [1] "Error sum: 100"
## [1] "Time: 55.8"
## [1] "Participant 34, Block 5:"
## [1] "Error sum: 91"
## [1] "Time: 48"
## [1] "Participant 34, Block 6:"
## [1] "Error sum: 120"
## [1] "Time: 62.4"
## [1] "Participant 34, Block 7:"
## [1] "Error sum: 130"
## [1] "Time: 65.4"
## [1] "Participant 34, Block 8:"
## [1] "Error sum: 91"
## [1] "Time: 54.6"
## [1] "Participant 34, Block 9:"
## [1] "Error sum: 153"
## [1] "Time: 66.6"
## [1] "Participant 34, Block 10:"
## [1] "Error sum: 150"
## [1] "Time: 65.4"

The result of this code was subsequently placed in an ecxel file called TIMEERROR