├── .DS_Store ├── .gitignore ├── 01GenerateData.R ├── 02PlotDataCircles.R ├── 02PlotDataPeaks.R ├── 02PlotDataSteps.R ├── GeneratedData ├── LevyTable.csv ├── NBSums200.csv └── WorldPopulation.csv ├── LICENSE └── README.md /.DS_Store: -------------------------------------------------------------------------------- https://raw.githubusercontent.com/Brideau/GeospatialLineGraphs/cb41c3bd7d4088ef1b35e745240919c1ea77e140/.DS_Store -------------------------------------------------------------------------------- /.gitignore: -------------------------------------------------------------------------------- 1 | *.sublime-project 2 | *.sublime-workspace 3 | *.ods 4 | *.ods# 5 | .Rproj.user 6 | *.Rproj 7 | /TestPlots 8 | *.RData 9 | *.RHistory 10 | *.history 11 | /DataSets 12 | /Performance 13 | Progress.txt 14 | /Export 15 | Canada/ 16 | GeneratedData/ 17 | .DS_Store 18 | *.csv 19 | Design/ 20 | GeneratedData/ 21 | -------------------------------------------------------------------------------- /01GenerateData.R: -------------------------------------------------------------------------------- 1 | library(foreach) 2 | library(doParallel) 3 | library(data.table) 4 | library(raster) 5 | 6 | # Time the code 7 | start <- proc.time() 8 | 9 | if (!file.exists("./DataSets")) { 10 | dir.create("./DataSets") 11 | } 12 | 13 | # Data Source: 14 | # http://sedac.ciesin.columbia.edu/data/set/gpw-v3-population-count/data-download 15 | # Format: .ascii, 1/2 degree, 2000 16 | 17 | population.file <- "./Canada/VoteDensityRaster64Bit.tif" 18 | # Load the raster file 19 | population.raster <- raster(population.file) 20 | # Convert the raster file to a points file 21 | population.points <- rasterToPoints(population.raster) 22 | all.data <- as.data.table(population.points) 23 | setnames(all.data, c("x", "y", "population")) 24 | 25 | # If you have your data in a CSV file, use this instead 26 | # file <- "./DataSets/NBBuildingsWGS84.csv" 27 | # all.data <- data.table(fread(file)) 28 | 29 | 30 | # The following are used to manipulate various data sets 31 | # colnames(all.data) <- c("Name", "Mass", "Latitude", "Longitude") # Meteorites 32 | # all.data$X <- as.numeric(all.data$X) 33 | # all.data$Y <- as.numeric(all.data$Y) 34 | # all.data$Mass <- as.numeric(all.data$Mass) 35 | 36 | startEnd <- function(lats, lngs) { 37 | # Find the "upper left" (NW) and "bottom right" (SE) coordinates 38 | # of a set of data. 39 | # 40 | # Args: 41 | # lats: A list of latitude coordinates 42 | # lngs: A list of longitude coordinates 43 | # 44 | # Returns: 45 | # A list of values corresponding to the northwest-most and 46 | # southeast-most coordinates 47 | 48 | # Convert to real number and remove NA values 49 | lats <- na.omit(as.numeric(lats)) 50 | lngs <- na.omit(as.numeric(lngs)) 51 | 52 | topLat <- max(lats) 53 | topLng <- min(lngs) 54 | botLat <- min(lats) 55 | botLng <- max(lngs) 56 | 57 | return(c(topLat, topLng, botLat, botLng)) 58 | } 59 | 60 | startEndVals <- startEnd(all.data$y, all.data$x) 61 | remove(startEnd) 62 | 63 | startLat <- startEndVals[1] 64 | endLat <- startEndVals[3] 65 | startLng <- startEndVals[2] 66 | endLng <- startEndVals[4] 67 | remove(startEndVals) 68 | 69 | interval.v.num = 200.0 70 | interval.h.num = 800.0 71 | interval.v <- (startLat - endLat) / interval.v.num 72 | interval.h <- (endLng - startLng) / interval.h.num 73 | remove(num_intervals) 74 | 75 | lat.list <- seq(startLat, endLat + interval.v, -1*interval.v) 76 | 77 | # testLng <- -66.66152983 # Fredericton 78 | # testLat <- 45.96538183 # Fredericton 79 | 80 | # Prepare the data to be sent in 81 | # If you have a value you want to sum, use this 82 | data <- all.data[,list(x, y, population)] 83 | 84 | # If you want to perform a count, use this 85 | # data <- all.data[,list(x, y)] 86 | # data[,Value:=1] 87 | 88 | sumInsideSquare <- function(pointLat, pointLng, data) { 89 | # Sum all the values that fall within a square on a map given a point, 90 | # an interval of the map, and data that contains lat, lng and the values 91 | # of interest 92 | 93 | setnames(data, c("lng", "lat", "value")) 94 | 95 | # Get data inside lat/lon boundaries 96 | lng.interval <- c(pointLng, pointLng + interval.h) 97 | lat.interval <- c(pointLat - interval.v, pointLat) 98 | data <- data[lng %between% lng.interval][lat %between% lat.interval] 99 | 100 | return(sum(data$value)) 101 | } 102 | 103 | # Debugging 104 | # squareSumTemp <- sumInsideSquare(testLat, testLng, interval, data) 105 | 106 | # Given a start longitude and an end longitude, calculate an array of values 107 | # corresponding to the sums for that latitude 108 | 109 | calcSumLat <- function(startLng, endLng, lat, data) { 110 | row <- c() 111 | lng <- startLng 112 | while (lng < endLng) { 113 | row <- c(row, sumInsideSquare(lat, lng, data)) 114 | lng <- lng + interval.h 115 | } 116 | 117 | return(row) 118 | } 119 | 120 | # Debugging 121 | # rowTemp <- calcSumLat(startLng, endLng, testLat, interval, data) 122 | # write.csv(rowTemp, file = "Temp.csv", row.names = FALSE) 123 | 124 | # Set up parallel computing with the number of cores you have 125 | cl <- makeCluster(detectCores(), outfile = "./Progress.txt") 126 | registerDoParallel(cl) 127 | 128 | all.sums <- foreach(lat=lat.list, .packages=c("data.table")) %dopar% { 129 | 130 | lat.data <- calcSumLat(startLng, endLng, lat, data) 131 | 132 | # Progress indicator that works on Mac/Windows 133 | print((startLat - lat)/(startLat - endLat)*100) # Prints to Progress.txt 134 | 135 | lat.data 136 | 137 | } 138 | 139 | stopCluster(cl = cl) 140 | 141 | # Convert to data frame 142 | all.sums.table <- as.data.table(all.sums) 143 | 144 | 145 | # Save to disk so I don't have to run it again 146 | if (!file.exists("./GeneratedData")) { 147 | dir.create("./GeneratedData") 148 | } 149 | output.file <- "./GeneratedData/VoteDensityHighRes.csv" 150 | write.csv(all.sums.table, file = output.file, row.names = FALSE) 151 | 152 | # End timer 153 | totalTime <- proc.time() - start 154 | print(totalTime) 155 | 156 | # remove(cl, endLat, endLng, startLat, startLng, lat.list, start, calcSumLat, sumInsideSquare, interval) 157 | 158 | -------------------------------------------------------------------------------- /02PlotDataCircles.R: -------------------------------------------------------------------------------- 1 | library(graphics) 2 | library(tcltk) 3 | library(pracma) 4 | 5 | # Load the data generated by 01GenerateData.R 6 | plot.data <- read.csv("GeneratedData/VoteDensity1200.csv", header=TRUE, stringsAsFactors=FALSE) 7 | 8 | # Add padding above/below where there was data 9 | 10 | # On top 11 | top.padding <- 1:5 12 | for (i in top.padding) { 13 | plot.data <- cbind(0, plot.data) 14 | } 15 | # On bottom 16 | bottom.padding <- 1:1 17 | for (i in bottom.padding) { 18 | plot.data <- cbind(plot.data, 0) 19 | } 20 | 21 | # On left 22 | zero.row <- vector(mode="integer", length=dim(plot.data)[1]) 23 | 24 | left.padding <- 1:10 25 | for (i in left.padding) { 26 | plot.data <- rbind(zero.row, plot.data) 27 | } 28 | 29 | # On right 30 | right.padding <- 1:10 31 | for (i in left.padding) { 32 | plot.data <- rbind(plot.data, zero.row) 33 | } 34 | 35 | 36 | max <- max(plot.data) # Max value in the data, used for scaling 37 | plottingHeight <- 1000 # Arbitrary number that provides the graph's height 38 | scaleFactor <- 300 # Discovered through trial and error to keep the graph in the boundaries 39 | gap <- plottingHeight / length(plot.data) # Space between lines 40 | 41 | # Output the file to a 36 inch by 24 inch SVG canvas 42 | plot.width = 36 43 | plot.height = 26.5 44 | svg(filename = "./TestPlots/CanadaSGBigCirclesColorOdd.svg", pointsize=12, width=plot.width, height=plot.height) 45 | 46 | # Create a blank plot 47 | yVals <- as.vector(plot.data[[1]] / max * scaleFactor) 48 | plot(0, 0, xlim=c(0, length(yVals)), ylim=c(0,1100), type="n", las=1, xlab=NA, ylab=NA, bty="n", axes=FALSE) 49 | 50 | plotting.threshold <- 0.1 51 | 52 | plot.length = length(plot.data) 53 | 54 | # Plot each line 55 | for (i in 1:plot.length) { 56 | # Grabs a row of data 57 | yVals <- as.vector(plot.data[[i]] / max * scaleFactor) 58 | xVals <- seq_along(yVals) 59 | # yVals.smooth = savgol(yVals, 3, forder=4) 60 | 61 | # polygon(xVals, yVals + plottingHeight, border = NA, col = "#ffffff") 62 | lines(xVals, yVals + plottingHeight, col=c("red", "blue"), lwd=0.5, type="o", cex=1 ) 63 | 64 | plottingHeight <- plottingHeight - gap 65 | 66 | } 67 | 68 | dev.off() -------------------------------------------------------------------------------- /02PlotDataPeaks.R: -------------------------------------------------------------------------------- 1 | library(graphics) 2 | library(tcltk) 3 | library(pracma) 4 | 5 | # Load the data generated by 01GenerateData.R 6 | plot.data <- read.csv("GeneratedData/VoteDensity1200.csv", header=TRUE, stringsAsFactors=FALSE) 7 | 8 | # Add padding above/below where there was data 9 | 10 | # On top 11 | top.padding <- 1:1 12 | for (i in top.padding) { 13 | plot.data <- cbind(0, plot.data) 14 | } 15 | # On bottom 16 | bottom.padding <- 1:1 17 | for (i in bottom.padding) { 18 | plot.data <- cbind(plot.data, 0) 19 | } 20 | 21 | # On left 22 | zero.row <- vector(mode="integer", length=dim(plot.data)[1]) 23 | 24 | left.padding <- 1:10 25 | for (i in left.padding) { 26 | plot.data <- rbind(zero.row, plot.data) 27 | } 28 | 29 | # On right 30 | right.padding <- 1:10 31 | for (i in left.padding) { 32 | plot.data <- rbind(plot.data, zero.row) 33 | } 34 | 35 | 36 | max <- max(plot.data) # Max value in the data, used for scaling 37 | plottingHeight <- 1000 # Arbitrary number that provides the graph's height 38 | scaleFactor <- 300 # Discovered through trial and error to keep the graph in the boundaries 39 | gap <- plottingHeight / length(plot.data) # Space between lines 40 | 41 | plot.width = 25 42 | plot.height = 15 43 | svg(filename = "./CanadaSGBigPeaks2.svg", pointsize=12, width=plot.width, height=plot.height) 44 | 45 | # Create a blank plot 46 | yVals <- as.vector(plot.data[[1]] / max * scaleFactor) 47 | plot(0, 0, xlim=c(0, length(yVals)), ylim=c(0,1100), type="n", las=1, xlab=NA, ylab=NA, bty="n", axes=FALSE) 48 | 49 | plotting.threshold <- 0.1 50 | 51 | plot.length = length(plot.data) 52 | 53 | # Plot each line 54 | for (i in 1:plot.length) { 55 | # Grabs a row of data 56 | yVals <- as.vector(plot.data[[i]] / max * scaleFactor) 57 | xVals <- c(0:(length(yVals) - 1)) 58 | yVals.smooth = savgol(yVals, 3, forder=4) 59 | 60 | polygon(xVals, yVals.smooth + plottingHeight, border = NA, col = "#ffffff") 61 | lines(xVals, yVals.smooth + plottingHeight, col="#8C8C8C", lwd=0.5) 62 | 63 | #Plot the peaks with a darker line. 64 | j <- 2 # Skip padding 65 | while (j <= (length(yVals.smooth) - 2)) { 66 | 67 | if ((yVals.smooth[j]) > plotting.threshold | (yVals.smooth[j+1]) > plotting.threshold) { 68 | segments(xVals[j], yVals.smooth[j] + plottingHeight, xVals[j+1], yVals.smooth[j+1] + plottingHeight, col="#000000", lwd=1.5) 69 | } else { } # Do nothing 70 | 71 | j <- j + 1 72 | 73 | } 74 | plottingHeight <- plottingHeight - gap 75 | 76 | } 77 | 78 | dev.off() -------------------------------------------------------------------------------- /02PlotDataSteps.R: -------------------------------------------------------------------------------- 1 | library(graphics) 2 | library(tcltk) 3 | library(pracma) 4 | 5 | # Load the data generated by 01GenerateData.R 6 | plot.data <- read.csv("GeneratedData/VoteDensity1200.csv", header=TRUE, stringsAsFactors=FALSE) 7 | 8 | # Add padding above/below where there was data 9 | 10 | # On top 11 | top.padding <- 1:5 12 | for (i in top.padding) { 13 | plot.data <- cbind(0, plot.data) 14 | } 15 | # On bottom 16 | bottom.padding <- 1:1 17 | for (i in bottom.padding) { 18 | plot.data <- cbind(plot.data, 0) 19 | } 20 | 21 | # On left 22 | zero.row <- vector(mode="integer", length=dim(plot.data)[1]) 23 | 24 | left.padding <- 1:10 25 | for (i in left.padding) { 26 | plot.data <- rbind(zero.row, plot.data) 27 | } 28 | 29 | # On right 30 | right.padding <- 1:10 31 | for (i in left.padding) { 32 | plot.data <- rbind(plot.data, zero.row) 33 | } 34 | 35 | 36 | max <- max(plot.data) # Max value in the data, used for scaling 37 | plottingHeight <- 1000 # Arbitrary number that provides the graph's height 38 | scaleFactor <- 300 # Discovered through trial and error to keep the graph in the boundaries 39 | gap <- plottingHeight / length(plot.data) # Space between lines 40 | 41 | # Output the file to a 36 inch by 24 inch SVG canvas 42 | plot.width = 36 43 | plot.height = 26.5 44 | svg(filename = "./TestPlots/CanadaSGBigStairsBevel.svg", pointsize=12, width=plot.width, height=plot.height) 45 | 46 | # Create a blank plot 47 | yVals <- as.vector(plot.data[[1]] / max * scaleFactor) 48 | plot(0, 0, xlim=c(0, length(yVals)), ylim=c(0,1100), type="n", las=1, xlab=NA, ylab=NA, bty="n", axes=FALSE) 49 | 50 | plotting.threshold <- 0.1 51 | 52 | plot.length = length(plot.data) 53 | 54 | # Plot each line 55 | for (i in 1:plot.length) { 56 | # Grabs a row of data 57 | yVals <- as.vector(plot.data[[i]] / max * scaleFactor) 58 | xVals <- seq_along(yVals) 59 | # yVals.smooth = savgol(yVals, 3, forder=4) 60 | 61 | y2 <- rep(yVals, each=2) 62 | y2 <- y2[-length(y2)] 63 | x2 <- rep(xVals, each=2)[-1] 64 | x3 <- c(min(x2), x2, max(x2)) 65 | y3 <- c(0, y2, 0) 66 | 67 | polygon(x3, y3 + plottingHeight, border = NA, col = "#ffffff") 68 | lines(x2, y2 + plottingHeight, col="#464646", lwd=0.5, type="s", cex=1, lend="square", ljoin="bevel" ) 69 | 70 | plottingHeight <- plottingHeight - gap 71 | 72 | } 73 | 74 | dev.off() 75 | 76 | -------------------------------------------------------------------------------- /GeneratedData/LevyTable.csv: -------------------------------------------------------------------------------- 1 | "V1","V2","V3","V4","V5","V6","V7","V8","V9","V10","V11","V12","V13","V14","V15","V16","V17","V18","V19","V20","V21","V22","V23","V24","V25","V26","V27","V28","V29","V30","V31","V32","V33","V34","V35","V36","V37","V38","V39","V40","V41","V42","V43","V44","V45","V46","V47","V48","V49","V50","V51","V52","V53","V54","V55","V56","V57","V58","V59","V60","V61","V62","V63","V64","V65","V66","V67","V68","V69","V70","V71","V72","V73","V74","V75","V76","V77","V78","V79","V80","V81","V82","V83","V84","V85","V86","V87","V88","V89","V90","V91","V92","V93","V94","V95","V96","V97","V98","V99","V100","V101","V102","V103","V104","V105","V106","V107","V108","V109","V110","V111","V112","V113","V114","V115","V116","V117","V118","V119","V120","V121","V122","V123","V124","V125","V126","V127","V128","V129","V130","V131","V132","V133","V134","V135","V136","V137","V138","V139","V140","V141","V142","V143","V144","V145","V146","V147","V148","V149","V150","V151","V152","V153","V154","V155","V156","V157","V158","V159","V160","V161","V162","V163","V164","V165","V166","V167","V168","V169","V170","V171","V172","V173","V174","V175","V176","V177","V178","V179","V180","V181","V182","V183","V184","V185","V186","V187","V188","V189","V190","V191","V192","V193","V194","V195","V196","V197","V198","V199","V200" 2 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 3 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 4 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 5 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 6 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5,44,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 7 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,20,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 8 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,17,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 9 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,4,7,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 10 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,1,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 11 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,7,3,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 12 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,2,6,18,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 13 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,6,4,29,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 14 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,6,6,22,23,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 15 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,4,16,41,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 16 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,17,19,46,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 17 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,7,19,102,37,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 18 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,39,71,6,0,11,30,69,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 19 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,33,9,49,30,14,9,19,45,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 20 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,11,43,16,3,5,25,25,37,126,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 21 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,8,94,28,7,4,3,10,10,222,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 22 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,67,121,10,8,15,8,7,35,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 23 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,22,177,17,4,17,7,6,43,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 24 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,2,71,95,10,8,18,8,39,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 25 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,7,2,1,9,120,8,6,18,35,47,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 26 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,4,6,9,13,67,28,7,25,403,24,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 27 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,2,10,15,8,21,33,61,11,7,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 28 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,18,11,11,15,9,10,2,34,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 29 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,5,11,12,36,44,17,5,29,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 30 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,6,8,34,18,9,8,28,38,72,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 31 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,7,7,7,10,7,7,6,13,105,61,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 32 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5,6,11,7,21,10,9,11,5,58,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 33 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,56,15,8,11,18,14,4,32,10,7,26,36,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 34 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,20,71,2,8,22,14,11,14,15,7,8,37,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 35 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,16,5,89,6,6,22,27,11,10,19,9,5,52,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 36 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,4,11,15,53,66,8,35,11,34,10,23,61,9,41,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 37 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5,4,7,17,7,76,168,54,7,19,19,9,10,40,79,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 38 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,6,3,0,0,0,0,10,31,13,11,27,38,485,506,9,6,50,161,109,87,134,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 39 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,4,0,0,0,0,0,0,1,3,4,0,11,0,3,13,10,15,31,24,64,339,46,10,73,121,0,0,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 40 | 0,0,0,0,0,0,0,0,0,0,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,1,0,6,2,5,8,7,16,7,167,7,18,353,281,526,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 41 | 0,0,0,0,0,0,0,0,0,0,1,0,1,1,0,0,0,0,0,0,0,0,0,0,3,0,0,2,0,9,9,11,45,54,72,54,71,630,502,875,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 42 | 0,0,0,0,0,0,0,0,0,0,0,0,11,1,0,0,2,0,0,0,0,0,0,0,0,0,0,2,0,1,11,9,25,47,63,68,124,16,819,731,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 43 | 0,0,0,0,0,0,0,0,0,0,1,3,0,0,2,2,1,1,0,0,0,0,0,0,0,1,1,2,0,0,4,13,16,28,29,45,32,121,80,59,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 44 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,5,0,1,4,0,0,1,10,20,9,6,99,83,68,135,368,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 45 | 0,0,0,0,0,0,0,0,0,0,0,0,0,2,3,4,1,0,0,1,0,0,0,0,0,0,0,1,0,0,0,0,13,12,12,39,29,45,26,185,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 46 | 0,0,0,0,0,0,0,0,0,0,1,0,0,1,2,1,2,1,1,0,0,0,0,0,0,0,0,1,0,0,1,0,5,59,37,7,21,41,26,206,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 47 | 0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,51,51,20,14,51,44,237,148,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 48 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,7,39,22,16,56,26,147,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 49 | 0,0,0,0,0,0,0,0,0,0,0,4,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,8,0,0,0,2,0,6,32,27,27,9,104,9,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 50 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,2,0,4,0,0,0,0,0,0,0,0,0,0,0,5,0,0,6,4,6,12,11,28,9,9,55,26,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 51 | 0,0,0,0,0,0,0,0,0,0,1,0,0,1,0,1,0,1,2,0,0,0,0,1,0,0,0,1,0,0,0,13,23,0,2,11,7,9,28,58,20,152,17,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 52 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,1,1,0,0,0,0,0,0,0,6,7,20,2,0,2,5,12,10,47,103,206,227,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 53 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,12,4,0,0,0,4,0,0,0,1,0,0,0,0,2,4,0,0,0,0,7,7,25,18,17,69,40,38,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 54 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,2,0,0,1,0,7,1,0,0,5,0,0,0,0,0,1,0,0,0,1,0,2,8,17,14,48,8,10,16,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 55 | 0,0,0,0,0,0,0,0,0,0,0,4,0,0,0,0,1,0,1,0,0,5,5,0,9,4,0,0,0,0,0,0,2,0,0,0,0,1,2,10,14,15,16,10,51,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 56 | 0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,1,2,5,11,0,0,0,0,0,0,0,1,0,0,0,0,0,0,2,1,0,23,33,23,4,9,9,24,31,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 57 | 0,0,0,0,0,1,0,0,0,0,0,1,0,1,0,0,1,0,1,3,0,0,1,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,38,5,4,11,58,10,98,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 58 | 0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,1,3,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,22,41,6,5,20,58,324,185,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 59 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,1,0,5,22,15,10,4,10,57,113,179,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 60 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5,0,0,0,0,0,0,6,0,0,0,0,0,0,0,0,0,0,0,3,0,1,13,8,27,14,26,29,61,9,46,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 61 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5,2,12,14,22,38,15,6,105,14,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 62 | 0,0,0,0,0,1,0,0,1,0,0,1,0,1,0,0,0,0,0,1,0,0,1,0,8,0,0,0,0,0,1,0,0,0,0,1,0,1,1,1,0,1,9,14,24,8,17,78,36,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 63 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,3,1,0,0,0,0,0,0,0,0,0,0,0,0,2,3,6,4,22,32,7,43,46,17,22,66,30,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 64 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,7,3,0,0,0,0,0,0,0,0,0,0,0,0,2,5,7,8,47,9,18,19,37,44,46,46,707,41,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 65 | 0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,6,8,18,18,6,21,19,5,13,9,44,110,136,24,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 66 | 0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,7,21,12,4,4,22,9,5,9,12,11,29,41,45,46,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 67 | 0,0,0,0,0,1,0,0,1,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,12,6,3,0,2,24,0,2,12,11,28,34,11,12,46,28,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 68 | 0,0,0,0,0,0,0,0,0,0,1,0,0,0,4,0,1,0,0,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,4,4,0,0,0,1,0,0,3,6,24,25,7,18,14,58,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 69 | 0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,12,20,5,10,32,82,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 70 | 0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,17,10,12,37,39,14,58,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 71 | 0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,9,8,4,12,18,22,20,90,3,1,0,0,0,0,0,0,2,0,0,0,0,1,0,2,4,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,0,0,0,7,33,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 72 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,3,36,11,9,18,15,17,103,66,88,160,17,6,14,9,8,16,11,35,33,18,4,15,12,27,64,58,33,17,12,17,28,25,23,9,18,20,5,3,12,16,13,9,23,6,6,8,9,12,5,8,3,6,7,6,3,11,7,7,6,23,12,5,8,6,16,6,4,5,2,2,10,1,0,1,0,0,0,40,112,21,43,9,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 73 | 0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,1,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,15,11,10,35,23,7,24,227,148,294,419,69,25,19,22,16,52,27,21,11,25,10,16,16,10,12,67,29,16,18,5,9,11,26,19,34,8,23,20,10,12,19,30,44,21,11,4,8,7,12,30,16,11,18,26,14,13,32,16,6,40,12,5,20,25,8,9,10,10,2,4,13,3,0,0,1,1,1,6,43,24,16,0,2,8,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 74 | 0,0,0,0,0,0,0,1,0,0,1,0,0,0,0,0,0,0,0,1,0,0,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,3,12,0,10,13,7,24,20,36,74,537,918,77,21,27,30,8,28,31,26,9,59,26,74,13,7,10,35,10,7,25,2,7,14,22,25,42,17,16,8,27,26,25,10,67,67,14,19,23,9,12,9,22,7,10,13,34,10,15,21,16,44,9,13,10,9,6,7,6,12,7,6,21,2,1,3,0,1,0,46,27,4,7,0,0,18,5,14,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 75 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,4,0,0,0,0,1,19,47,7,8,70,83,773,222,52,88,16,27,21,45,44,27,20,16,16,45,225,111,31,36,57,105,52,60,70,30,26,60,51,46,18,25,12,10,22,35,25,68,2,15,15,18,23,17,9,17,16,13,7,8,10,5,21,33,12,45,13,26,22,14,9,8,23,15,23,11,1,5,1,0,48,17,2,0,1,1,5,4,7,18,38,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 76 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,4,1,0,0,0,0,1,6,11,23,23,35,61,163,66,7,35,59,11,15,55,45,51,27,15,21,11,2,0,23,338,607,282,15,11,27,83,82,70,14,149,76,32,37,29,15,29,48,291,48,50,24,5,17,4,5,3,8,20,2,19,45,23,30,65,21,19,20,11,15,5,3,9,9,20,23,34,14,10,0,0,12,1,0,1,0,1,1,0,3,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 77 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,5,0,1,0,9,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,5,0,0,0,0,0,0,19,35,10,30,20,13,69,257,102,11,18,19,27,35,10,17,24,29,42,9,0,30,44,132,169,23,16,7,6,11,19,21,20,12,57,41,37,24,30,35,12,29,13,14,36,28,105,29,7,8,10,10,31,2,34,14,7,66,8,17,27,129,30,14,12,10,9,3,7,9,12,28,5,19,15,0,0,0,0,1,1,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 78 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,1,0,2,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,2,0,0,0,0,0,0,10,11,1,8,18,37,31,109,79,12,12,19,27,13,9,9,7,10,55,38,1,32,1,10,8,8,11,18,7,17,41,10,18,28,21,38,9,35,26,41,22,23,12,12,10,5,12,22,30,15,19,9,21,16,25,12,24,63,10,13,16,6,9,35,12,7,3,0,0,1,6,5,31,145,32,0,0,1,0,0,1,0,1,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 79 | 0,0,0,0,0,1,0,0,1,0,1,0,0,1,0,0,1,0,0,1,3,2,1,0,2,1,0,2,3,0,0,0,0,0,0,0,0,0,0,0,2,2,2,0,0,0,0,0,0,0,0,0,0,2,10,29,30,18,72,20,24,11,27,17,20,16,13,9,29,8,0,17,5,10,6,9,4,17,29,19,22,11,31,12,26,92,15,16,46,17,27,30,16,13,21,16,4,18,15,41,37,5,12,14,28,19,11,45,45,41,19,26,6,15,7,25,2,0,1,2,2,1,0,1,89,38,3,1,0,0,1,0,2,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 80 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,6,1,1,2,3,9,0,0,0,2,0,0,0,0,0,0,0,0,1,1,1,0,0,0,0,0,1,0,0,0,0,0,0,0,22,15,38,39,37,47,50,19,8,8,15,3,11,24,4,0,23,22,45,6,6,2,20,8,20,18,24,26,14,36,63,17,9,36,36,127,19,11,8,20,28,14,19,25,26,45,8,9,8,19,74,11,117,108,27,4,1,5,19,13,13,4,0,0,0,8,5,1,1,1,20,3,0,0,0,0,1,0,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 81 | 0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,2,0,0,0,0,1,2,0,0,0,0,1,1,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,1,0,1,0,0,0,0,8,20,32,115,77,23,27,26,50,5,3,6,19,24,19,16,32,46,16,15,6,3,9,4,9,12,20,13,51,11,59,127,11,12,18,193,223,83,16,10,12,18,26,40,48,20,63,84,103,72,67,25,58,100,20,14,6,11,8,4,5,28,3,1,0,4,3,2,2,0,2,0,1,0,0,0,1,1,0,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 82 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,1,0,0,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,21,13,42,56,64,66,26,17,26,4,0,3,16,7,10,14,35,25,12,5,5,9,9,9,14,18,15,22,62,28,34,182,153,6,35,105,39,54,55,24,5,6,30,16,77,14,20,23,44,122,87,183,143,123,11,3,4,10,8,3,22,78,8,10,5,2,5,1,0,1,0,0,0,0,0,0,2,2,0,0,1,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 83 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,2,0,0,0,0,0,3,2,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,9,32,28,80,24,28,82,11,11,14,16,16,13,19,0,1,18,10,42,18,13,18,18,8,5,8,13,17,25,35,32,16,39,156,88,313,23,58,13,32,23,11,6,11,20,18,76,30,26,13,13,121,1048,1029,183,48,9,0,25,6,4,18,9,3,11,3,2,3,2,0,0,0,2,0,0,0,0,0,2,1,1,0,3,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 84 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,1,0,0,0,0,0,1,1,1,1,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,32,18,58,10,6,3,23,21,12,8,32,28,11,2,0,0,9,13,78,9,9,7,5,8,2,7,9,18,12,11,27,34,18,15,38,202,31,13,57,58,127,59,40,18,5,46,28,12,6,18,23,110,313,161,40,54,32,24,47,21,9,15,8,4,7,8,3,12,5,3,4,1,1,0,1,0,0,0,0,0,0,2,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 85 | 0,0,0,0,0,0,0,0,1,0,1,0,0,1,0,1,2,0,2,2,0,1,3,1,1,0,0,0,0,2,2,0,0,0,0,0,0,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,18,5,9,23,16,5,0,0,4,63,59,30,9,16,8,0,0,1,0,9,80,24,2,4,3,1,0,2,5,14,21,25,13,20,22,27,56,77,10,5,5,28,8,35,43,93,58,86,11,14,40,7,33,88,103,23,5,16,10,26,28,47,16,26,19,11,7,18,16,22,4,7,11,117,22,0,1,0,0,0,1,0,1,2,1,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 86 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,1,1,0,3,5,0,0,0,0,0,1,2,1,20,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,4,2,0,3,5,0,0,0,1,11,74,23,8,5,15,3,0,0,0,10,49,16,7,2,0,0,1,0,7,11,8,19,16,16,18,26,11,86,25,4,14,55,15,32,4,17,372,262,8,8,32,41,54,21,74,18,21,9,4,3,11,27,50,36,12,14,9,3,17,9,13,14,55,34,4,0,0,0,0,0,0,0,0,2,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 87 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,1,0,2,0,2,0,0,1,0,1,1,14,7,0,0,1,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,3,0,0,0,0,0,0,0,4,12,34,14,1,14,10,0,10,7,56,52,5,2,0,0,0,0,0,14,26,11,4,7,12,15,32,29,44,5,1,10,13,50,9,8,13,126,102,100,65,72,75,33,36,53,9,9,11,1,4,3,2,16,49,11,5,10,1,11,9,21,17,23,26,1,0,0,0,0,0,0,0,0,5,2,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 88 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,2,6,0,0,0,10,53,1,0,0,1,1,17,40,34,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,1,25,24,60,9,13,21,2,4,29,96,47,5,25,12,1,0,0,2,8,3,22,20,7,11,24,10,14,46,15,25,16,14,8,4,10,30,25,16,45,27,26,25,29,11,17,4,3,0,6,4,2,4,2,125,14,9,17,2,13,31,11,22,8,3,1,0,0,0,0,0,3,5,1,0,0,3,1,0,0,0,0,0,2,2,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 89 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,3,7,5,0,0,0,3,0,10,11,12,1,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,1,1,3,47,18,7,29,14,5,5,47,19,7,10,40,9,5,0,0,3,7,14,10,2,7,21,10,26,10,12,11,13,28,42,37,17,68,91,7,30,7,9,2,13,50,6,12,0,1,0,9,17,6,1,5,54,72,18,44,21,27,170,49,5,3,2,1,0,0,1,0,0,3,5,2,6,5,3,0,0,0,0,0,0,0,0,1,14,0,0,0,0,0,0,1,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 90 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,1,0,1,0,1,12,2,1,1,0,2,21,15,18,13,4,0,0,2,0,0,1,0,0,0,0,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,4,22,15,4,50,10,12,4,57,5,3,4,7,2,0,1,1,0,11,9,3,0,10,18,23,40,30,11,7,11,9,19,33,31,70,41,16,22,32,21,1,1,23,25,13,23,0,0,1,7,1,1,0,16,29,18,2,4,9,159,6,2,1,2,0,0,1,0,1,0,4,3,2,21,7,0,0,0,0,0,0,0,0,0,3,5,1,0,0,0,0,1,3,2,9,7,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 91 | 0,0,0,0,0,0,0,0,0,0,0,1,0,1,1,0,0,2,1,0,1,0,9,3,1,0,1,4,17,8,10,29,8,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,26,23,26,99,31,40,31,16,28,55,0,0,2,0,0,0,0,1,0,5,1,0,1,6,6,31,16,19,6,2,30,19,3,4,20,34,24,5,33,18,8,3,2,18,10,9,24,2,0,1,2,0,0,4,16,34,12,11,16,12,7,9,3,0,0,0,0,0,0,0,1,1,1,0,8,5,10,7,0,0,1,0,0,0,0,3,6,4,0,0,0,0,3,5,1,14,26,16,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 92 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,2,0,1,0,4,18,0,17,21,9,6,22,12,27,50,19,0,1,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,4,10,10,37,17,21,55,29,18,37,19,0,0,0,0,0,0,0,0,0,1,5,0,5,21,25,13,22,79,22,23,30,12,8,20,43,16,18,7,11,8,1,1,1,17,16,8,11,8,1,0,2,3,0,3,5,60,10,8,5,4,7,5,2,1,0,1,0,1,1,0,0,0,0,0,1,3,3,9,70,2,0,0,0,0,0,1,6,3,1,29,3,0,11,38,16,10,14,24,12,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 93 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,1,0,0,0,0,3,15,31,10,7,8,3,16,11,78,252,17,7,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,6,18,78,28,349,431,45,0,1,0,0,0,0,0,0,0,1,0,0,0,0,0,0,2,6,7,5,10,23,10,6,8,7,34,7,8,25,14,9,15,4,0,2,0,0,18,8,8,17,5,2,0,2,0,4,9,16,20,10,4,7,4,0,0,1,1,0,0,0,1,1,1,0,0,0,1,0,3,5,19,0,0,0,0,0,0,0,1,16,3,6,5,0,6,12,32,20,9,16,21,10,0,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 94 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,1,0,0,1,0,4,43,61,49,41,38,46,24,57,273,715,73,21,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,29,30,31,4,146,80,68,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,3,3,8,17,24,16,17,15,10,17,16,25,33,45,26,26,6,1,0,0,0,2,2,5,3,5,20,2,2,0,2,4,6,12,52,13,13,7,2,0,0,0,0,0,1,2,1,1,0,0,0,0,0,3,5,0,17,36,0,0,0,0,0,0,0,1,9,7,3,14,4,4,20,30,16,4,5,29,4,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 95 | 0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,1,0,2,14,94,19,7,8,26,11,8,9,61,32,6,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,62,10,0,0,3,4,21,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,2,1,2,7,7,20,10,12,20,18,11,10,36,11,15,18,16,5,0,0,1,1,0,0,1,0,10,3,20,8,2,0,12,20,18,48,12,9,11,0,1,0,0,0,1,1,0,1,0,1,0,0,0,0,1,15,1,2,1,9,3,0,0,0,2,0,0,1,25,4,7,12,6,2,6,18,6,3,23,12,18,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 96 | 0,0,0,0,0,0,0,0,0,0,1,1,0,1,0,0,1,0,0,1,0,18,54,588,134,62,25,23,10,28,28,72,31,16,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,57,1,0,0,1,0,0,0,0,1,0,0,0,0,0,1,0,0,1,0,0,0,3,17,26,14,22,22,7,8,9,13,17,3,33,6,3,7,16,26,2,0,0,1,0,1,0,1,4,11,6,9,8,2,21,21,6,43,10,2,0,0,0,0,2,1,0,0,0,0,0,0,0,4,0,2,1,13,11,7,0,0,6,0,0,0,5,0,0,4,24,16,11,10,8,0,7,14,9,7,22,21,44,15,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 97 | 0,0,0,0,0,0,0,0,0,0,2,1,0,0,0,0,0,1,0,0,0,4,16,44,33,16,6,33,83,8,9,32,7,1,4,0,0,0,0,0,0,0,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,20,80,3,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,8,7,11,7,42,7,10,8,9,12,1,0,30,2,1,2,5,3,19,4,0,0,0,0,1,0,1,1,4,21,18,30,22,11,3,24,11,0,0,1,0,1,1,5,0,1,0,0,0,0,0,0,1,0,1,131,743,0,3,0,4,14,0,1,2,0,1,3,3,10,26,14,12,10,21,20,34,75,64,22,35,68,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 98 | 0,0,0,0,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,1,16,13,9,2,2,9,7,7,11,64,14,1,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,31,18,10,33,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,5,11,13,22,8,5,8,6,8,5,0,15,3,0,0,0,0,3,15,0,0,1,0,0,0,1,3,8,16,14,12,34,8,2,24,15,3,3,2,1,0,1,0,0,0,1,0,0,0,0,0,0,0,0,30,306,1,0,0,0,3,1,1,0,0,4,8,25,16,8,14,18,9,28,36,21,46,98,189,32,34,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 99 | 0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,1,23,19,5,2,0,1,3,7,8,24,7,2,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,56,13,23,88,27,5,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,2,6,11,18,9,3,9,5,7,9,6,7,0,0,1,0,0,0,0,2,10,1,0,0,0,0,4,4,8,20,24,13,12,17,2,5,18,15,21,8,8,2,3,3,0,0,0,0,0,0,0,0,0,0,0,0,0,3,1,0,0,0,0,5,0,0,2,14,14,3,11,11,6,5,38,30,35,58,73,514,579,3,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 100 | 0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,0,0,1,2,33,26,14,4,1,0,0,0,1,9,7,33,8,1,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,3,28,5,1,3,4,13,8,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,2,2,0,0,2,8,6,7,22,2,0,0,0,0,0,0,0,0,0,1,5,5,1,0,25,0,0,0,0,0,8,23,24,1,21,17,2,19,7,8,38,12,8,3,0,1,2,0,0,0,0,0,0,0,0,0,1,0,0,1,0,4,0,0,0,0,0,1,6,4,1,7,12,16,20,23,16,60,67,29,43,60,131,964,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 101 | 0,0,0,0,0,0,0,0,0,0,0,0,0,6,0,0,1,0,1,13,16,7,6,1,0,0,0,0,1,0,1,0,2,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,11,27,17,0,0,0,0,4,4,0,0,0,0,0,1,0,0,0,1,0,0,0,0,0,1,1,0,1,1,0,2,2,2,5,1,1,0,0,0,0,1,0,0,0,0,5,5,1,4,37,0,0,2,5,4,4,24,7,14,31,20,29,47,26,3,58,16,1,0,1,0,0,1,1,0,0,0,0,4,4,1,0,0,0,1,3,1,0,0,0,3,0,0,1,21,19,6,11,10,7,6,9,26,24,30,52,62,103,203,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 102 | 0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,1,1,1,7,1,0,0,0,0,0,0,1,0,0,1,1,1,0,0,1,2,0,0,0,0,0,1,1,2,0,0,0,0,0,4,23,2,4,7,0,0,0,2,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,1,0,0,0,0,0,1,0,1,0,12,22,1,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,0,0,26,24,6,40,5,1,10,52,118,66,20,456,53,96,6,0,2,0,1,2,0,3,1,0,1,1,1,1,2,1,0,0,0,9,0,1,0,0,1,1,1,1,5,15,14,5,15,4,10,14,20,7,23,16,14,76,57,60,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 103 | 0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,9,22,20,1,0,0,1,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,0,0,0,1,0,0,0,2,0,7,71,41,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,1,2,1,73,52,0,0,0,0,0,0,0,2,0,0,1,0,0,0,1,0,1,0,0,6,11,32,5,20,38,6,6,7,12,49,10,8,7,1,0,0,1,0,1,6,4,0,1,1,1,0,0,3,2,0,1,17,0,0,0,1,0,0,2,0,2,10,19,17,36,4,7,14,11,5,13,15,44,77,12,46,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 104 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,9,48,72,2,1,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,6,54,49,1,0,1,0,0,0,0,0,0,0,0,0,0,1,0,0,6,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,1,57,16,1,0,0,1,0,0,0,0,0,1,0,0,0,0,3,0,0,0,0,12,27,61,62,40,7,1,2,0,1,35,18,12,10,8,0,1,0,0,0,0,7,7,41,1,5,7,0,17,1,0,18,14,0,0,0,0,0,0,0,0,1,8,10,11,26,17,18,26,10,2,7,17,32,47,27,115,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 105 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,6,35,4,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,28,23,2,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,1,1,2,0,0,0,0,0,0,0,1,2,1,0,0,0,0,1,3,57,5,2,0,1,0,0,1,0,0,0,0,0,0,0,2,0,0,0,0,1,4,14,154,12,4,2,3,2,7,18,47,10,7,3,2,0,1,0,0,0,0,1,26,81,30,9,0,8,0,1,16,3,0,0,0,0,0,0,0,0,7,33,7,5,4,5,19,13,18,26,18,28,160,33,51,84,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 106 | 0,0,0,0,0,0,0,0,0,2,2,0,0,0,28,4,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,1,1,0,0,0,0,0,0,0,0,2,19,5,0,0,0,0,0,0,0,0,0,0,0,0,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,53,77,1,1,0,0,0,1,0,0,2,0,0,0,0,0,0,0,0,0,0,12,23,4,29,2,14,8,7,15,4,17,14,11,14,0,2,1,0,2,4,8,2,18,39,6,3,1,2,0,5,38,3,1,0,1,0,0,0,0,0,23,61,37,5,3,10,11,10,13,14,9,31,105,57,0,29,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 107 | 0,0,0,0,0,0,0,0,0,0,0,0,0,1,20,1,2,0,0,1,0,0,1,0,1,0,0,1,1,1,0,0,0,1,1,1,2,1,0,0,0,0,0,0,0,1,12,12,0,1,0,0,0,0,0,1,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,22,0,0,0,0,0,2,0,1,0,0,4,0,1,0,0,0,0,0,0,23,4,2,9,23,15,13,11,2,6,33,17,131,89,0,0,0,0,0,2,17,9,9,6,3,1,0,1,3,35,3,0,0,0,0,0,0,0,0,4,5,1,7,10,3,17,12,9,4,14,14,22,18,37,51,9,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 108 | 0,0,0,0,0,0,0,0,0,1,1,0,0,3,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,1,5,1,0,0,0,0,0,0,0,2,1,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,1,0,2,0,0,0,0,0,0,0,0,0,0,1,0,0,1,0,0,0,0,0,0,0,8,7,67,9,9,6,11,4,14,30,208,19,6,0,0,0,1,8,17,2,2,1,1,2,0,0,73,14,5,0,0,1,0,2,1,0,0,8,2,5,11,14,42,25,9,13,18,14,4,22,64,48,33,32,52,20,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 109 | 0,0,0,0,0,0,0,0,0,1,0,0,0,1,1,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,1,1,11,0,0,1,0,0,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,24,0,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,22,19,26,3,2,7,16,1,6,8,55,8,10,0,2,1,5,18,0,1,0,1,0,1,3,3,34,8,2,0,0,0,17,38,45,32,7,1,2,3,4,2,9,21,39,42,46,21,21,41,11,29,12,16,33,42,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 110 | 0,0,0,0,0,0,0,0,1,0,0,0,0,1,2,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,12,3,0,0,1,0,7,0,0,0,0,0,0,0,3,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,52,81,4,18,9,30,3,2,2,5,28,25,11,7,8,1,2,23,4,0,0,0,1,1,4,46,29,5,6,3,16,31,13,3,10,5,2,0,0,1,1,2,3,7,19,8,15,7,10,12,2,9,20,15,47,22,73,27,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1 111 | 0,0,0,0,0,0,0,0,6,1,0,0,1,4,5,0,0,0,0,0,1,0,0,0,0,0,0,1,0,0,2,3,2,1,1,1,0,0,0,0,0,0,0,3,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,2,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,9,25,7,58,12,8,11,0,0,10,21,49,12,16,27,7,14,8,2,0,1,0,1,7,6,26,14,2,0,8,4,1,0,1,1,10,4,1,0,0,1,0,0,5,13,55,18,13,7,3,1,3,23,38,24,79,58,95,58,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0 112 | 0,0,0,0,0,0,0,0,3,3,0,0,3,5,0,0,0,0,0,0,0,1,1,0,0,1,0,0,0,0,2,3,9,1,2,0,0,0,0,0,0,0,2,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,7,35,8,45,12,4,41,6,0,10,2,22,58,11,1,6,87,139,74,0,11,1,0,11,12,75,13,7,4,1,2,1,0,0,0,12,21,2,0,0,2,6,8,5,1,14,16,11,3,0,1,1,9,7,42,51,79,66,473,143,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 113 | 0,0,0,0,0,0,0,2,9,0,1,0,11,14,0,1,1,0,0,0,0,0,0,0,0,0,0,1,0,1,3,1,2,1,0,1,0,0,1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,3,27,27,32,31,3,27,14,0,4,8,18,36,2,5,2,52,135,56,16,0,4,8,12,86,65,20,21,2,9,35,23,5,3,0,0,16,8,0,0,1,7,12,2,3,19,11,13,8,7,2,1,6,26,54,90,24,24,144,440,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 114 | 0,0,0,0,0,0,0,0,2,2,0,0,15,5,0,1,0,0,0,1,1,0,0,0,0,3,0,0,0,0,0,0,2,0,1,0,0,0,0,0,0,3,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,7,0,0,0,0,0,0,7,0,0,0,0,0,0,0,0,0,0,0,1,0,4,1,29,50,0,7,7,4,3,4,26,48,21,14,38,36,7,1,12,36,70,102,67,21,38,14,14,15,84,34,0,0,1,0,1,11,23,1,1,6,5,3,2,5,16,53,6,8,9,8,31,6,41,10,17,14,1,0,0,0,0,0,0,9,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 115 | 0,0,0,0,0,0,0,0,0,14,1,1,13,0,1,0,0,0,0,0,0,2,4,0,0,0,2,0,0,5,1,0,6,1,0,1,2,0,0,0,3,0,1,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,10,22,0,0,0,0,0,0,0,0,0,0,0,0,1,3,44,3,1,0,2,1,5,23,7,23,66,68,15,7,0,1,1,6,29,262,59,16,6,29,171,99,18,0,0,0,0,11,0,0,2,2,0,6,10,6,2,9,16,9,8,25,20,11,19,15,30,33,2,3,0,0,1,0,1,0,5,48,82,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 116 | 0,0,0,0,0,0,0,0,0,3,8,0,1,0,1,0,0,0,0,0,1,0,0,0,0,0,0,0,2,3,0,0,1,1,0,0,1,0,1,3,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,1,0,0,0,11,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,3,63,3,0,1,6,3,53,10,3,5,27,80,9,1,0,0,1,2,16,62,14,8,8,5,73,0,0,1,3,2,0,0,1,1,1,0,1,2,15,8,19,6,7,5,3,7,15,8,9,44,49,16,11,2,0,0,0,0,0,3,44,47,30,90,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 117 | 0,0,0,0,0,0,0,3,14,0,3,3,2,0,0,0,0,0,0,0,0,0,0,0,3,1,0,0,1,0,0,0,0,0,1,0,1,2,5,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,1,0,0,0,1,0,0,0,0,0,0,0,0,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,17,0,0,0,0,0,0,1,5,22,65,10,4,0,3,4,35,18,8,4,15,22,12,2,1,1,1,5,22,17,5,3,4,2,1,1,2,0,0,0,0,12,2,0,0,0,0,1,8,7,0,1,1,4,1,8,14,13,4,18,33,52,1,0,0,0,0,0,2,28,27,44,41,71,67,0,0,35,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 118 | 0,0,0,0,0,0,15,28,4,4,42,43,8,1,0,1,1,0,0,1,0,1,0,1,0,1,0,1,0,0,1,0,0,1,0,1,0,0,2,1,0,1,0,0,2,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,23,0,1,0,0,0,0,0,0,0,0,15,0,0,0,0,0,3,2,0,53,120,57,9,18,23,6,7,11,4,3,28,14,18,6,2,2,1,10,55,15,0,0,6,1,2,1,8,2,1,0,0,1,0,1,0,1,1,3,0,3,1,1,2,1,0,2,13,11,9,20,25,1,0,1,0,0,0,0,8,180,152,180,28,1,0,158,184,9,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 119 | 0,0,0,0,0,9,35,2,16,5,21,51,15,0,0,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,1,0,0,0,0,0,0,0,2,0,0,0,0,0,0,2,1,0,0,0,0,0,1,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,109,0,0,0,0,0,0,0,0,0,0,0,0,0,1,14,5,3,9,24,119,24,9,49,42,66,11,10,0,12,66,49,60,6,0,10,21,26,24,15,7,5,6,0,1,1,0,0,0,0,1,0,0,0,0,1,31,4,0,1,0,1,0,1,0,13,45,26,16,6,5,9,0,0,0,0,2,18,139,9,1,2,143,246,159,113,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 120 | 0,0,0,0,0,8,5,3,21,4,22,7,18,1,3,1,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,3,0,0,0,0,0,0,0,1,0,0,0,0,1,0,0,0,0,1,0,0,0,0,0,0,5,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,2,0,0,0,0,0,0,0,0,0,1,0,0,0,9,8,0,0,19,92,19,55,35,41,6,8,8,40,51,24,82,17,31,16,10,18,33,5,17,19,8,1,2,3,0,0,0,0,0,3,0,0,0,0,0,10,14,1,2,2,0,0,0,0,2,38,24,2,27,54,6,0,12,22,21,1,5,1,4,2,19,74,135,67,59,25,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 121 | 0,0,0,0,26,21,1,16,38,18,29,0,7,4,2,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,0,0,0,0,0,0,0,2,6,2,1,0,0,4,0,2,13,103,23,64,81,37,30,8,33,35,113,107,23,53,15,8,7,33,2,0,3,4,0,3,0,0,0,0,0,0,1,1,1,0,0,1,5,1,38,7,2,0,0,0,0,0,1,4,11,10,3,14,13,14,33,17,42,56,1,6,3,2,9,4,42,65,39,0,0,0,0,0,0,0,0,0,0,0,0,0,0,9,16,0,0,0,0,0,0 122 | 0,0,0,0,64,7,14,65,14,25,4,0,1,26,32,3,1,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,9,0,0,2,0,1,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,1,11,11,0,0,0,0,1,5,9,22,128,38,33,47,99,48,24,57,35,8,144,6,20,0,0,8,18,8,0,0,2,1,0,0,0,0,0,19,7,2,1,0,2,1,0,2,0,6,0,5,1,2,1,1,0,1,4,8,7,4,18,12,20,15,2,22,83,4,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,2,14,23,20,0,0,0,0,1,0 123 | 0,0,0,0,98,14,64,33,5,0,0,0,2,0,7,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,1,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,5,10,11,9,0,0,0,0,1,6,30,96,168,16,13,37,74,54,68,28,5,1,74,7,6,2,3,149,85,3,1,0,2,2,0,0,0,2,4,55,12,1,2,1,0,1,3,0,0,0,0,1,2,2,0,1,3,3,14,32,20,0,17,46,45,18,7,110,200,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,6,19,30,34,1,0,0,0,0,1,0 124 | 0,0,0,0,42,38,91,2,1,0,0,1,0,2,1,0,1,0,1,0,0,0,1,0,1,0,0,1,0,0,1,0,0,1,0,0,0,0,0,0,0,1,0,0,1,0,0,1,0,1,1,0,1,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,8,0,13,6,5,12,0,0,0,2,3,6,42,17,102,47,10,35,92,131,45,5,7,8,20,8,4,3,10,31,1,3,0,0,21,3,0,1,0,1,0,0,0,0,0,1,3,11,5,4,1,0,0,1,5,4,14,1,2,29,71,67,43,47,49,63,91,9,38,30,2,1,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5,0,2,1,0,314,36,2,1,0,0,0,0,0,1 125 | 0,0,0,0,19,7,29,0,1,0,0,1,0,0,1,0,0,1,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,1,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,1,0,1,0,0,0,0,0,0,0,0,0,0,3,2,1,10,3,10,22,11,12,1,0,0,5,8,16,9,13,7,38,21,143,77,66,5,10,5,104,27,4,21,3,2,1,1,0,1,0,2,2,0,2,0,0,0,0,0,0,0,0,0,4,13,2,1,0,1,0,0,1,3,5,15,33,5,2,6,1,94,186,316,79,66,60,14,6,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,3,0,0,5,13,97,15,33,3,0,0,0,0,0,0 126 | 0,0,0,0,23,5,66,23,9,10,5,1,0,0,0,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,0,0,0,0,0,0,0,0,0,0,1,7,28,16,26,8,9,6,39,31,33,4,6,2,2,22,11,5,5,3,9,50,40,76,5,5,1,69,49,14,14,6,2,4,1,0,1,0,2,2,0,6,3,2,0,2,0,0,1,0,1,0,0,4,0,0,3,1,1,0,1,6,10,7,7,6,7,1,31,168,105,13,28,37,60,1,0,0,0,0,0,0,0,0,0,0,0,0,0,3,1,6,6,4,7,32,10,9,3,0,0,0,0,0,0,0 127 | 0,0,0,0,29,15,59,40,58,28,5,2,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,38,15,21,5,11,6,2,11,15,22,28,23,14,8,27,4,2,1,7,15,52,281,5,1,1,8,71,19,6,5,1,4,2,1,0,0,1,1,1,1,5,11,0,0,0,0,0,0,0,1,1,0,2,0,0,0,4,1,1,2,2,18,3,1,8,6,34,154,35,9,6,74,180,0,0,0,0,0,0,0,0,0,0,0,0,0,16,22,10,11,24,24,37,71,1,0,1,0,0,0,0,0,0,0 128 | 0,0,0,0,133,190,8,18,14,60,39,3,0,0,0,0,1,0,0,0,1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,30,14,12,26,22,7,16,11,10,36,22,10,38,7,18,29,5,8,7,171,155,321,31,3,27,131,143,3,4,4,1,4,0,0,1,0,1,8,1,0,0,1,0,1,15,2,3,0,1,0,1,1,0,0,5,0,51,2,1,0,1,65,4,4,10,45,146,68,8,36,62,132,111,0,0,0,0,0,0,0,0,0,0,0,0,0,17,70,100,56,135,36,134,91,1,0,0,0,1,0,0,0,1,0 129 | 0,0,0,0,29,151,11,51,1,8,85,5,0,2,1,1,1,0,0,1,4,0,1,0,0,1,0,1,0,0,1,0,0,1,0,1,0,0,0,0,0,1,0,0,1,0,0,1,0,0,1,0,0,1,0,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,9,7,7,17,7,23,54,9,3,4,9,20,15,13,9,25,4,36,35,6,12,198,190,278,52,190,277,417,64,3,12,2,3,10,3,0,0,1,0,8,3,1,0,0,1,0,0,0,2,0,0,0,0,0,0,0,0,4,7,13,4,9,5,0,1,0,0,5,40,48,76,122,35,38,29,0,0,0,0,0,0,0,0,0,0,0,0,0,0,30,258,112,133,36,117,49,55,0,2,1,1,0,0,0,0,0 130 | 0,0,0,0,76,130,36,13,2,5,45,1,0,1,0,1,0,0,1,1,2,1,0,1,1,0,0,0,0,1,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,10,8,11,16,14,191,68,18,1,1,4,0,0,3,8,29,55,10,16,54,9,20,110,101,6,31,169,4,2,83,164,5,6,8,1,2,0,2,0,41,23,0,0,0,0,1,1,0,0,1,1,0,1,1,0,1,1,0,3,9,28,3,0,1,0,1,0,2,6,18,127,131,89,205,8,0,0,0,0,0,3,0,0,0,0,0,0,0,0,0,112,0,19,164,58,7,0,0,1,0,0,0,0,0,0,0 131 | 0,0,0,0,526,3,44,22,7,12,66,0,1,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,6,16,6,23,69,36,36,25,6,1,0,0,0,0,4,17,6,68,15,45,11,7,227,544,36,135,45,1,3,110,3,2,3,21,1,0,4,4,0,52,39,2,3,3,0,0,0,0,1,0,0,0,0,0,3,3,0,1,1,8,7,0,0,3,1,0,0,4,10,15,70,29,57,11,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,8,2,3,3,1,59,76,0,0,0,0,0,0,0 132 | 0,0,0,0,278,18,61,23,15,61,3,0,0,0,0,0,0,1,7,0,0,0,0,0,2,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,11,27,30,12,16,34,11,5,6,1,1,0,1,1,4,2,2,47,91,129,42,389,408,492,189,46,17,75,98,11,7,96,46,2,2,3,2,4,53,12,0,2,0,0,1,1,0,0,2,0,0,0,0,0,4,0,1,0,0,2,1,1,4,4,5,3,3,0,3,77,30,7,4,1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,3,0,1,69,7,0,0,0,0,0,0,0 133 | 0,0,0,316,1071,2,135,23,75,16,0,0,0,0,1,0,0,1,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,1,0,0,0,0,0,0,0,1,0,0,0,2,0,0,0,0,0,0,0,0,1,0,1,0,0,0,0,0,0,0,0,0,0,0,2,1,0,1,0,0,0,0,0,0,0,0,0,0,22,10,7,6,20,32,13,2,7,6,1,0,0,0,0,0,2,5,3,251,58,375,610,513,0,307,767,206,125,54,43,164,78,44,14,6,7,33,178,81,0,1,0,1,0,0,0,2,1,1,2,1,0,1,0,1,2,0,1,1,1,1,1,4,5,2,1,1,5,58,6,5,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,13,5,0,0,0,0,0,0,0 134 | 0,0,0,937,281,3,39,90,81,0,0,0,0,0,0,0,0,0,1,0,0,0,1,0,0,0,8,6,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,2,0,0,0,0,0,1,4,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,5,4,0,9,9,20,5,2,2,15,2,0,0,1,1,0,0,2,26,54,237,1258,587,836,74,42,426,7,4,101,100,4,28,15,32,25,63,22,33,16,0,2,1,0,0,0,1,3,5,0,0,0,0,0,0,0,2,0,1,1,0,0,1,0,0,3,3,1,5,56,15,14,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 135 | 0,0,0,159,67,4,49,137,21,1,2,0,0,0,1,0,1,0,0,1,1,1,1,1,1,0,0,1,0,0,1,0,0,1,0,0,1,0,0,1,0,0,0,0,0,0,0,1,0,0,1,0,1,0,0,1,0,0,1,1,1,0,0,1,0,0,1,0,0,3,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,3,0,35,10,4,1,22,10,3,1,3,9,4,0,2,3,98,996,1796,1598,1566,435,0,18,3,3,4,103,17,34,2,1,3,9,33,41,40,1,3,1,0,5,1,15,5,5,3,0,4,0,0,0,0,0,0,0,0,0,0,1,0,1,4,6,2,7,38,11,34,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 136 | 0,0,0,166,31,30,17,75,15,0,0,0,1,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,2,0,0,0,2,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,2,0,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,6,38,17,13,6,31,3,1,5,9,7,5,15,129,215,143,891,1324,638,1460,140,26,5,7,94,102,147,32,3,1,1,15,18,19,46,2,3,1,0,9,8,21,2,3,0,0,2,2,7,1,0,2,0,0,1,1,0,0,0,0,1,2,4,2,7,49,21,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 137 | 0,0,0,112,19,7,13,108,6,0,0,0,0,0,10,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,3,3,0,0,3,3,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,2,1,0,0,1,2,0,0,0,1,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,4,12,46,110,53,83,126,63,100,110,81,82,96,67,123,34,9,395,960,562,260,165,45,27,73,106,39,67,48,12,6,1,4,18,49,279,29,7,1,7,7,8,10,1,2,3,2,3,2,11,1,0,1,0,0,1,1,1,0,2,2,30,5,2,1,11,28,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 138 | 0,0,0,73,10,6,11,56,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,1,0,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,2,4,2,0,0,0,0,0,2,0,0,1,1,1,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,3,0,0,0,1,1,0,4,27,61,37,10,6,5,48,17,58,60,11,27,45,23,22,4,13,795,310,469,218,831,101,32,7,25,270,59,34,28,5,2,1,3,6,44,4,18,4,6,9,21,19,5,18,4,4,20,50,10,1,0,0,0,0,0,0,0,1,0,0,26,3,1,0,40,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 139 | 0,0,17,84,12,5,5,43,2,0,0,3,0,9,0,0,1,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,1,1,4,1,0,0,1,0,0,1,0,0,0,0,1,1,7,7,0,0,0,0,0,0,0,0,0,0,1,2,2,0,1,2,31,16,11,1,0,8,2,1,6,4,7,10,30,47,8,7,8,59,74,55,204,368,221,128,23,301,218,216,16,50,87,13,15,23,2,4,0,0,2,3,22,71,22,12,32,9,16,6,18,1,11,19,13,3,0,1,0,0,0,0,0,1,1,1,1,2,2,0,15,72,12,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 140 | 0,0,76,21,7,8,10,39,0,0,1,2,3,1,0,0,2,0,1,0,0,0,1,0,0,1,0,1,0,0,0,1,0,1,2,1,0,0,1,0,0,1,0,0,1,0,0,2,0,0,1,0,1,0,0,1,0,0,1,0,1,0,0,1,1,0,0,0,0,0,0,1,0,0,2,1,0,0,1,0,0,0,0,0,3,9,0,0,0,1,8,13,0,0,2,92,17,0,0,0,8,1,0,11,4,0,6,30,26,3,4,7,13,46,6,6,7,36,28,2,93,116,155,121,102,2,4,4,3,5,1,3,5,2,3,14,23,64,78,13,26,9,10,2,0,5,4,6,5,0,0,1,0,0,0,1,0,1,1,1,3,8,1,12,39,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 141 | 0,0,73,33,28,13,23,31,5,0,0,4,0,1,1,8,0,0,0,1,0,0,0,1,0,0,0,0,0,1,0,1,0,0,0,4,21,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,10,2,0,0,0,0,0,0,0,1,0,1,1,0,2,1,0,1,0,0,1,0,0,0,3,34,15,2,0,12,19,1,6,0,19,8,6,0,0,0,0,0,1,8,18,0,0,25,27,4,1,3,10,24,3,2,6,72,9,1,80,71,68,49,55,7,6,18,50,8,5,7,10,2,2,0,0,6,55,84,112,20,19,6,5,14,1,0,1,1,1,0,0,0,0,0,1,0,0,2,8,11,2,41,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 142 | 0,1,75,34,56,3,59,10,2,2,0,1,0,0,0,7,8,1,0,0,0,0,0,0,0,0,0,0,0,1,3,0,0,0,0,1,15,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,1,0,0,0,0,1,0,1,0,0,0,0,0,0,0,0,1,0,1,3,40,21,8,20,47,18,5,3,5,3,0,0,0,0,0,0,6,16,11,0,0,24,37,1,3,2,37,5,3,2,3,117,6,4,61,39,64,126,304,47,16,46,53,17,14,14,0,0,0,0,0,0,0,33,29,47,17,10,5,0,2,0,0,2,3,2,0,0,0,0,0,0,1,1,0,5,4,114,35,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 143 | 0,78,12,59,67,5,44,12,2,2,0,0,0,0,0,1,1,1,2,0,0,3,1,0,0,0,0,0,2,0,6,0,2,0,0,0,1,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,1,0,1,0,0,0,0,0,4,11,0,0,0,0,1,0,2,6,45,14,18,28,42,3,15,3,0,0,0,0,0,0,0,2,8,9,1,0,2,32,0,3,1,31,6,4,2,13,103,6,1,7,7,57,89,1003,393,95,46,50,70,28,0,0,0,0,0,0,0,0,0,16,30,30,5,2,1,3,3,0,0,4,1,0,0,0,0,0,0,0,0,0,11,12,15,3,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 144 | 3,86,11,64,74,10,60,29,0,0,0,0,0,0,0,0,1,0,3,0,0,5,1,0,0,0,0,0,0,1,0,0,0,0,1,2,1,1,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,0,1,0,0,0,0,0,0,0,1,0,0,0,0,0,3,3,0,0,0,0,0,0,2,20,78,94,47,21,21,21,27,0,0,0,0,0,0,0,0,0,2,3,1,1,0,19,0,1,4,39,5,0,2,8,162,7,2,4,9,36,222,124,10,90,130,167,140,23,0,0,0,0,0,0,0,0,0,16,5,36,13,3,2,4,6,2,2,0,1,0,0,0,0,1,0,0,1,0,14,30,32,6,5,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 145 | 86,20,23,104,18,92,128,18,1,0,0,0,0,0,1,0,0,1,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,1,4,1,1,0,1,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,10,8,0,0,0,0,0,0,1,0,0,0,0,1,0,0,0,0,0,1,1,1,13,37,8,48,33,66,8,59,2,0,0,4,0,0,0,0,1,0,0,1,0,1,0,25,1,0,5,15,1,2,0,7,96,1,1,3,6,26,178,21,86,201,52,145,77,0,0,0,0,0,0,0,0,0,0,0,0,13,12,2,6,4,4,0,1,0,0,0,0,0,0,0,0,3,4,2,61,26,63,75,123,44,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 146 | 64,13,14,54,23,166,31,12,0,0,0,1,0,1,0,0,1,0,0,5,2,0,3,0,1,0,1,2,0,0,0,0,0,0,2,3,0,0,1,0,0,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,2,11,3,6,8,56,34,15,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,4,1,0,0,9,19,1,3,3,3,46,53,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,18,21,6,3,7,7,4,0,0,0,0,0,0,0,1,3,9,21,38,6,35,40,57,13,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 147 | 26,22,11,126,50,137,64,12,1,1,0,0,0,0,0,0,0,0,0,0,0,0,1,3,1,0,1,0,0,0,1,0,3,1,2,0,1,3,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,3,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,1,0,1,1,3,1,2,18,108,17,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,1,0,2,0,0,14,3,9,13,85,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,21,21,0,4,4,3,1,0,0,0,0,1,0,0,3,2,8,7,0,5,3,23,71,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 148 | 65,29,220,348,156,129,20,0,0,0,0,0,0,0,0,0,0,0,0,8,0,0,1,1,1,2,1,0,0,0,0,5,1,4,3,0,0,1,0,0,0,0,0,0,0,0,0,0,1,0,0,0,1,0,0,0,0,1,0,0,0,1,0,0,1,0,1,0,0,0,1,1,0,0,0,0,1,0,0,0,2,0,0,0,0,2,1,1,2,52,125,3,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,2,5,6,4,23,19,33,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,45,11,0,0,2,2,0,1,0,1,0,1,0,0,2,1,7,29,2,1,6,71,37,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 149 | 235,180,21,59,86,137,34,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,7,0,0,0,0,0,0,0,0,1,8,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,2,0,27,99,6,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,1,0,0,1,0,0,0,0,1,1,4,8,6,8,75,106,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,40,5,0,1,2,0,0,0,1,0,0,0,0,7,1,7,5,17,4,5,14,14,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 150 | 871,251,9,49,54,18,15,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,16,1,1,0,1,0,0,0,0,0,0,0,1,1,0,0,0,0,0,0,1,0,9,57,18,4,0,0,1,0,0,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,3,2,5,8,201,100,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,11,3,3,0,2,1,0,0,0,2,0,0,0,12,10,12,57,1,10,10,18,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 151 | 727,21,2,144,73,38,5,0,1,0,0,1,0,0,0,0,1,0,0,1,0,0,0,0,0,1,0,0,0,0,0,0,0,1,0,0,0,0,3,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,2,0,1,1,0,0,0,3,1,1,1,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,1,26,103,12,2,0,0,0,1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,6,1,1,3,22,177,33,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,25,1,3,0,1,0,1,2,0,0,0,1,0,0,6,15,23,62,38,121,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 152 | 8,0,0,191,27,126,7,0,0,0,0,0,0,1,0,0,0,0,0,0,0,1,0,0,0,0,0,0,1,0,0,0,0,0,0,0,1,0,2,1,0,1,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,3,0,0,1,0,0,1,7,0,1,0,0,0,0,0,0,0,0,0,1,0,1,0,0,0,0,0,2,48,53,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,1,0,0,4,0,3,8,29,150,64,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,121,60,4,1,5,4,0,0,0,0,4,1,2,4,7,43,59,2,47,37,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 153 | 0,0,0,39,174,35,8,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,9,1,0,0,0,1,0,0,0,0,0,0,0,0,0,1,0,0,6,2,1,0,1,0,0,0,0,6,86,25,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,0,0,0,7,4,2,2,17,2,17,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,62,15,10,6,3,0,0,1,2,3,3,2,14,18,161,2,2,3,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 154 | 0,0,0,0,217,23,9,2,0,0,0,0,0,0,0,1,0,0,0,0,0,0,15,1,0,0,2,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,1,0,1,1,1,0,0,0,0,0,0,0,0,0,2,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,1,1,1,6,18,86,3,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,1,1,1,0,0,0,0,0,0,32,17,5,5,36,3,29,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,8,16,40,30,5,9,4,3,4,0,0,4,5,0,6,15,4,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 155 | 0,0,0,0,126,38,6,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,18,0,1,0,0,1,1,0,0,0,0,2,0,0,0,0,0,1,0,0,2,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,3,1,0,0,0,0,2,0,0,2,3,0,0,0,0,0,1,0,0,0,11,0,0,0,0,0,0,8,48,229,16,3,0,1,0,0,0,0,0,0,0,0,0,1,0,0,0,1,0,0,0,0,5,2,0,0,0,0,2,12,31,82,6,10,10,36,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,4,150,65,11,9,0,0,0,1,0,2,1,15,37,23,8,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 156 | 0,0,0,0,42,50,12,3,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,1,0,0,0,2,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,1,0,0,0,0,0,0,1,2,0,0,0,0,1,0,0,2,4,8,94,127,31,15,0,0,0,0,0,0,0,0,1,0,0,2,0,0,0,0,0,0,0,1,1,9,0,0,0,0,1,5,52,74,1,4,8,42,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,4,8,156,59,60,7,1,1,1,3,1,3,4,46,29,11,3,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 157 | 0,0,0,0,26,71,12,3,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,7,0,9,1,0,0,0,0,0,1,0,1,0,0,1,1,0,0,0,0,0,1,0,1,0,0,1,0,0,1,0,0,1,1,0,0,0,1,10,2,1,0,1,5,0,0,0,1,0,0,1,0,0,0,6,0,1,0,0,0,2,8,50,46,8,14,2,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,3,0,0,0,0,5,6,4,36,138,6,3,29,11,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,1,9,6,82,14,109,93,15,4,5,22,3,3,8,12,22,2,2,7,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 158 | 0,0,0,0,0,51,17,2,0,0,0,1,0,0,0,1,0,0,0,0,1,0,0,0,3,0,0,0,0,0,0,0,0,0,1,0,0,0,1,1,0,0,0,0,0,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,7,0,1,0,0,0,0,0,1,0,1,0,0,0,0,0,0,5,0,6,85,37,5,16,4,0,0,0,7,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,2,1,0,8,2,26,13,13,5,39,0,6,8,112,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,7,4,11,6,9,21,118,201,20,9,16,64,2,3,0,2,7,0,1,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 159 | 0,0,0,0,0,46,9,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,4,0,0,3,0,1,0,0,1,0,0,0,1,0,1,0,0,0,1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,1,10,0,0,0,0,0,0,1,0,0,0,0,5,19,7,14,45,2,8,10,0,1,0,0,0,1,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,1,11,0,17,36,45,52,4,26,36,0,2,2,44,27,7,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,9,14,14,13,90,146,136,334,91,74,11,15,1,0,0,2,1,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 160 | 0,0,0,0,0,54,9,4,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,3,1,1,0,0,0,1,0,0,0,28,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,1,1,0,0,0,1,0,3,0,0,0,5,0,0,0,0,0,0,0,0,0,0,0,6,7,10,9,54,20,1,5,10,1,0,1,0,0,0,1,0,0,0,0,0,0,3,0,0,0,0,2,0,1,0,5,16,20,18,50,7,6,57,6,0,0,10,39,29,34,42,8,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,4,19,19,13,93,39,53,77,269,882,481,65,42,2,0,2,4,2,5,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 161 | 0,0,0,0,1,86,23,12,1,1,9,0,0,0,0,0,0,0,0,0,0,0,0,1,0,1,0,0,0,0,1,0,0,0,1,2,1,2,0,0,0,0,0,0,0,0,0,0,7,0,0,1,0,0,0,0,0,1,1,0,0,0,0,0,0,1,0,6,6,0,0,0,0,0,0,0,0,0,0,1,0,14,7,3,31,103,1,8,13,7,1,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,2,1,0,1,0,0,3,27,8,3,0,16,59,21,2,18,2,13,53,58,22,6,6,3,8,0,0,0,0,0,0,0,0,0,0,5,11,9,45,43,57,14,48,14,26,84,290,249,248,11,4,12,17,3,28,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 162 | 0,0,0,0,0,12,88,13,5,0,36,16,0,0,0,0,0,0,0,0,0,0,0,5,1,0,4,0,0,0,0,0,0,0,1,1,2,0,0,0,0,0,0,0,6,0,0,0,0,0,0,0,5,0,0,0,0,0,0,0,0,0,0,0,0,4,0,7,0,0,0,0,0,0,0,0,0,0,0,0,1,8,11,7,33,83,7,15,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,1,0,0,0,1,0,0,1,2,56,15,50,33,31,0,12,27,19,27,12,20,3,24,9,1,0,0,0,0,0,0,0,2,21,29,10,33,110,5,15,19,4,8,21,0,0,335,46,9,198,120,127,101,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 163 | 0,0,0,0,3,1,74,11,14,1,67,22,0,0,0,0,0,0,0,0,0,0,3,3,0,0,0,0,0,0,0,1,0,1,0,0,1,4,0,0,0,0,0,0,0,7,0,0,0,0,6,0,0,0,0,0,0,0,0,0,0,0,5,0,0,1,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,3,15,33,209,41,5,14,3,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,1,0,4,0,0,0,0,1,0,0,0,1,11,24,57,7,31,0,0,8,22,48,246,65,21,8,18,9,5,1,2,0,0,0,0,0,4,39,17,55,66,10,67,12,4,18,30,90,28,0,115,228,293,128,0,95,15,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 164 | 0,0,0,0,1,0,46,15,31,37,53,99,3,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,0,2,0,0,0,0,0,0,6,0,0,0,0,2,2,0,0,0,0,0,0,0,0,2,0,0,0,0,8,2,0,1,0,0,2,0,0,0,1,0,0,0,0,1,1,2,4,64,263,8,7,17,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,1,0,1,0,0,1,0,0,0,1,6,18,64,28,45,0,38,13,32,1,1,2,7,10,18,26,6,7,5,2,1,0,0,2,6,34,26,100,84,41,14,7,22,14,89,56,38,154,121,81,425,327,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 165 | 0,0,0,0,0,0,37,70,22,42,20,92,7,0,5,0,0,0,1,0,0,0,0,1,2,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,1,0,0,0,0,0,0,2,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,2,0,0,6,0,0,0,0,0,0,0,0,0,0,1,2,2,62,124,9,20,13,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,1,0,0,7,2,1,14,19,52,0,1,0,3,2,4,42,40,0,22,76,81,46,10,11,6,10,38,16,42,19,9,23,6,1,0,0,5,10,34,84,7,22,15,9,17,8,6,36,77,1,718,274,827,1251,38,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 166 | 0,0,0,0,0,0,0,19,102,50,47,62,8,4,6,1,0,0,0,0,0,7,1,0,0,0,2,0,0,0,0,0,0,0,0,0,1,0,0,1,1,1,0,0,0,0,0,0,0,1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,4,0,3,8,0,0,0,0,0,0,0,0,0,3,1,3,5,40,44,6,45,9,0,0,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,3,0,5,3,11,106,106,72,3,1,0,2,0,10,21,21,0,57,34,20,13,23,36,6,9,13,11,9,20,13,8,60,5,4,2,6,9,71,3,32,42,8,16,30,40,128,78,14,15,805,1062,536,1658,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 167 | 0,0,0,0,0,0,0,0,108,51,9,34,26,9,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,1,0,0,0,0,2,2,0,0,1,0,1,0,0,0,0,0,0,0,1,0,0,0,0,1,0,0,7,2,0,17,6,2,0,0,0,2,0,0,0,0,0,0,1,5,70,7,5,9,6,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,3,5,78,266,638,8,2,2,3,68,74,82,40,29,0,21,81,25,7,12,13,5,11,16,9,15,18,45,20,23,25,6,2,9,10,48,13,83,22,23,11,41,89,11,3,46,316,170,2356,1205,1276,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 168 | 0,0,0,0,0,0,0,0,40,32,44,17,4,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,1,8,1,2,0,0,0,0,0,1,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,1,4,1,3,3,0,1,0,0,0,1,0,0,0,0,0,5,28,22,1,0,0,0,2,0,0,1,0,0,0,0,0,0,0,0,0,0,1,1,0,0,14,6,8,100,217,474,40,7,27,9,20,22,10,2,0,0,112,47,27,8,5,1,2,1,12,18,30,15,17,7,13,26,4,5,9,23,5,50,14,26,15,24,22,15,9,1,16,12,7,2124,1923,13,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 169 | 0,0,0,0,0,0,0,0,194,75,21,7,2,0,0,0,0,0,0,0,0,0,0,6,0,1,0,0,0,0,0,0,1,0,5,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,11,3,3,2,0,0,0,0,2,0,0,2,0,1,1,8,41,24,1,0,1,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,1,2,6,13,36,59,16,30,93,60,57,57,77,24,0,0,0,0,0,0,58,20,8,5,8,10,4,10,67,67,6,3,6,0,7,7,48,14,34,46,60,17,4,18,28,77,13,21,10,102,99,104,567,1533,16,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 170 | 0,0,0,0,0,0,0,0,109,17,12,0,12,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,1,0,2,0,2,10,0,0,1,0,0,0,0,0,0,0,1,0,1,1,0,0,1,0,0,0,0,0,0,0,0,0,1,0,0,20,4,4,2,1,0,0,0,0,4,0,0,2,0,0,2,2,23,49,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,1,5,8,34,12,6,3,5,0,36,26,32,2,0,0,0,0,0,63,128,54,9,16,3,5,10,8,39,2,60,9,13,25,13,6,13,18,15,3,42,46,1,21,7,46,10,14,3,18,448,167,914,785,230,126,18,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 171 | 0,0,0,0,0,0,0,0,167,66,14,30,14,3,1,0,0,0,1,0,0,0,0,2,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,6,0,0,0,0,0,7,0,0,0,0,1,1,0,0,0,0,0,1,1,3,3,1,1,11,0,0,1,1,13,0,2,0,0,0,0,6,27,15,0,0,0,0,1,0,1,1,2,0,0,0,0,0,0,0,0,0,2,8,6,34,10,3,5,3,1,46,109,1,2,0,12,20,1,56,33,57,94,14,24,2,7,28,48,64,38,55,19,11,4,10,14,18,27,52,19,70,72,9,23,9,100,575,538,260,528,284,34,853,671,469,113,503,78,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 172 | 0,0,0,0,0,0,0,0,79,47,33,20,7,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,9,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,2,3,5,2,1,2,10,1,0,0,0,0,1,2,0,0,0,3,4,41,2,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,2,8,27,37,17,11,7,0,2,39,7,8,1,0,59,110,32,27,19,11,13,1,9,11,15,18,55,15,11,24,12,9,4,5,9,19,24,16,35,18,26,94,30,36,676,1139,772,873,106,9,136,606,1052,159,163,16,65,25,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 173 | 0,0,0,0,0,0,0,0,103,12,16,6,15,0,1,0,0,0,0,1,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,11,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,1,0,0,0,0,0,1,1,12,20,7,0,0,0,19,0,2,0,0,2,1,1,1,0,1,3,24,22,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,6,16,28,6,2,14,14,2,4,12,11,19,9,17,8,28,43,6,43,6,18,12,17,31,72,78,55,6,5,6,8,15,6,9,8,11,53,87,28,12,40,57,42,18,376,569,996,523,200,123,88,159,134,10,92,46,38,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 174 | 0,0,0,0,0,0,0,0,52,15,11,8,6,1,0,0,0,0,0,0,0,0,0,1,1,0,0,13,0,0,1,0,0,0,0,0,0,11,1,0,0,0,0,0,2,0,0,1,0,1,0,0,1,1,1,0,0,0,0,0,0,0,3,43,9,1,0,1,0,19,1,5,1,0,1,1,4,1,0,6,19,24,35,5,0,0,1,0,0,1,2,0,0,0,0,1,0,0,0,0,0,3,13,10,49,5,8,35,11,4,1,7,19,6,9,26,6,4,32,5,11,5,12,38,59,96,80,10,122,10,7,5,6,0,3,4,5,71,43,62,21,37,60,27,149,8,276,390,566,279,89,36,83,387,57,3,8,6,23,39,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 175 | 0,0,0,0,0,0,0,0,54,18,5,6,5,5,0,0,1,0,0,3,6,2,0,2,1,0,4,30,2,1,0,0,0,0,0,0,1,3,0,0,0,0,0,0,0,0,0,0,4,3,3,0,1,0,0,1,0,0,2,2,0,1,15,84,1,1,0,0,0,18,13,6,0,0,0,2,3,2,0,1,2,8,23,2,1,0,0,0,0,1,0,0,0,0,1,0,0,0,0,0,0,0,2,6,40,2,5,15,13,4,6,2,13,6,5,21,6,6,29,0,2,4,40,76,106,48,11,4,4,3,6,15,2,2,3,7,8,71,77,17,31,14,90,60,102,170,185,524,7,328,214,72,179,130,282,2,4,2,6,52,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 176 | 0,0,0,0,0,0,0,0,45,15,6,3,5,1,0,1,0,1,0,13,8,17,9,21,0,0,8,13,3,0,0,1,0,0,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,2,0,0,0,0,1,1,1,2,2,0,0,0,21,157,0,0,0,0,0,26,32,2,0,0,10,10,15,0,0,0,0,35,10,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,2,11,22,38,24,6,2,4,15,45,10,9,16,64,3,3,15,1,8,26,26,40,10,2,0,4,6,4,5,10,15,10,5,13,68,62,71,68,43,1,15,79,281,50,79,114,97,54,112,26,259,121,24,5,9,0,2,15,17,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 177 | 0,0,0,0,0,0,0,0,78,26,6,2,6,5,0,0,1,8,1,19,20,23,13,12,1,1,11,32,6,3,0,0,4,0,1,0,0,0,0,0,0,0,0,1,1,0,0,6,0,2,0,0,0,0,0,0,0,6,0,0,1,0,26,59,0,0,1,0,0,41,29,3,1,1,5,14,22,1,1,3,4,57,9,0,0,0,0,2,1,0,0,0,0,1,0,1,0,0,0,1,1,2,4,82,47,128,113,70,24,9,23,20,14,12,32,26,0,2,15,1,10,5,23,18,3,2,5,4,2,3,4,8,6,20,8,10,55,66,19,45,12,8,39,43,87,102,36,164,68,118,27,2,284,12,3,1,1,1,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 178 | 0,0,0,0,0,0,0,0,3,103,10,11,11,8,0,0,2,18,12,12,51,16,35,13,0,3,15,54,1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,1,2,11,5,0,0,3,95,36,0,1,0,2,0,30,103,21,8,6,28,8,2,0,0,21,93,16,0,0,0,0,0,7,0,0,0,0,0,0,0,1,0,0,2,5,6,9,12,34,32,468,154,11,2,32,47,19,13,49,6,4,1,6,22,11,7,3,27,18,4,1,0,6,7,4,4,13,4,22,33,41,50,11,13,28,45,37,94,105,115,8,17,81,87,54,5,29,114,5,19,1,4,1,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 179 | 0,0,0,0,0,0,0,0,0,32,21,16,4,7,4,2,10,19,19,16,28,17,61,18,1,12,26,14,0,0,0,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5,2,0,3,3,1,0,10,1,2,12,4,10,19,55,0,2,0,0,0,2,2,80,14,26,6,32,13,5,9,36,80,31,5,1,1,0,9,11,3,0,0,0,0,0,0,1,0,1,1,10,23,26,30,39,36,34,131,46,6,0,5,10,16,20,40,19,4,1,12,33,17,15,7,19,47,4,3,1,1,4,2,23,11,5,8,71,130,55,3,3,5,19,74,28,36,50,13,23,40,11,4,44,23,7,38,52,4,7,5,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 180 | 0,0,0,0,0,0,0,0,2,24,11,8,2,10,12,13,24,23,27,7,70,27,42,37,5,37,43,5,1,0,0,0,3,0,0,1,1,1,0,0,0,0,0,0,0,0,0,0,2,7,21,12,42,49,11,11,3,13,6,18,13,31,16,21,4,1,1,0,0,5,62,10,5,26,118,58,15,54,16,61,4,2,1,0,4,19,0,0,0,0,0,0,0,0,0,0,1,0,2,7,7,19,16,12,4,23,16,16,3,6,4,5,11,21,9,2,2,0,32,9,9,7,47,13,5,6,3,5,1,8,22,13,5,15,44,70,4,7,4,19,58,348,413,127,37,14,19,61,1,3,2,9,170,39,111,16,6,7,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 181 | 0,0,0,0,0,0,0,0,0,5,11,6,5,26,9,15,39,68,23,28,40,50,26,17,7,78,46,6,9,0,1,0,0,0,0,2,1,1,1,0,0,0,0,0,0,0,0,4,18,19,1,16,46,30,23,45,54,51,0,42,37,80,147,44,13,11,10,10,0,6,91,8,11,92,310,110,4,3,2,48,1,2,0,0,9,9,0,0,0,0,0,0,0,0,0,0,0,0,1,3,5,42,15,15,23,33,19,3,6,4,4,3,17,11,4,5,1,0,11,10,22,42,36,5,19,20,19,3,3,14,6,27,20,41,14,35,22,10,4,11,187,294,462,57,46,22,27,60,4,134,46,6,131,113,4,10,15,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 182 | 0,0,0,0,0,0,0,0,0,0,79,26,1,21,60,11,6,64,51,96,49,104,36,25,21,42,8,9,26,0,5,0,0,0,0,0,103,43,3,0,0,0,0,0,1,3,1,3,1,0,1,0,3,27,4,12,0,0,0,4,3,3,100,103,35,12,42,30,6,20,99,12,53,128,17,88,45,6,18,28,4,1,0,4,15,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,35,7,2,11,6,4,3,1,6,2,0,0,4,6,0,4,6,1,6,45,14,42,5,8,3,6,14,5,12,6,9,58,15,56,34,28,18,3,5,30,41,85,312,24,35,44,14,16,25,128,50,49,105,16,0,10,18,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 183 | 0,0,0,0,0,0,0,0,0,0,6,103,21,32,57,15,51,66,67,69,40,195,55,5,25,48,4,40,34,24,0,0,0,0,1,0,79,25,1,0,0,0,0,0,0,3,0,0,0,0,0,1,5,46,14,4,1,0,0,1,1,18,120,66,12,4,4,34,36,159,111,66,48,88,2,5,76,6,83,5,0,1,0,0,1,0,0,1,0,1,0,0,0,0,0,0,0,1,1,12,18,1,4,6,1,1,0,3,1,0,0,0,1,1,2,0,5,2,7,56,34,20,7,6,3,7,10,15,27,9,19,20,31,5,59,23,17,18,51,56,18,102,31,58,23,15,5,18,8,37,16,15,40,13,1,18,52,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 184 | 0,0,0,0,0,0,0,0,0,0,0,164,285,15,84,33,164,95,72,65,173,186,30,13,65,16,7,114,19,1,1,13,1,4,0,0,0,11,0,0,0,1,0,0,0,0,0,0,0,0,0,0,2,38,24,0,0,0,0,0,1,21,95,28,0,1,0,8,41,79,60,54,101,37,0,4,76,79,28,8,0,0,0,2,6,0,0,1,1,0,0,0,0,0,1,0,0,1,2,3,3,2,2,2,0,1,0,3,1,0,0,0,0,1,1,0,1,6,14,17,10,12,33,17,9,8,6,8,9,22,13,33,11,9,31,5,12,18,44,14,38,18,21,12,55,10,6,28,26,45,5,8,6,8,4,28,52,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 185 | 0,0,0,0,0,0,0,0,0,0,0,0,144,59,84,44,156,50,131,145,143,41,64,100,250,60,54,25,1,4,0,3,3,7,1,0,0,12,0,0,0,0,0,0,0,0,0,0,0,1,0,0,2,10,5,0,0,0,11,2,2,26,89,10,0,1,3,5,30,46,2,36,78,12,0,1,11,19,2,3,0,0,1,2,0,0,0,0,0,0,0,0,0,0,0,0,0,1,2,13,3,4,0,4,3,2,0,3,1,0,0,0,0,0,0,1,0,13,33,18,3,1,33,5,23,8,5,4,6,22,39,68,28,22,19,6,12,23,45,104,26,23,15,18,51,11,8,94,24,11,5,6,30,3,2,4,38,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 186 | 0,0,0,0,0,0,0,0,0,0,0,0,0,153,219,324,165,106,147,61,158,171,64,76,335,60,26,2,8,0,4,0,0,1,0,0,1,1,1,0,0,0,0,0,0,1,0,0,0,1,0,1,0,1,39,2,1,1,31,9,13,53,38,15,2,2,8,15,78,16,1,3,6,1,0,2,0,0,1,0,1,1,9,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,3,16,0,2,0,14,4,2,2,0,0,1,1,0,0,0,0,0,1,5,26,4,0,0,22,9,11,17,6,7,6,12,27,58,24,31,22,17,8,38,19,56,10,6,60,29,34,8,66,38,53,2,9,5,105,5,3,5,27,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 187 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,237,596,282,392,230,214,53,18,28,181,37,5,7,13,0,58,0,0,0,0,1,0,2,0,0,0,0,0,1,0,0,0,0,0,0,0,1,0,2,20,21,1,4,31,2,18,112,16,18,25,2,8,50,40,9,2,2,2,0,0,0,0,0,0,1,0,11,2,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5,16,2,0,4,3,0,0,0,1,0,0,0,0,0,1,1,0,0,3,4,4,0,0,4,8,15,16,5,4,6,10,8,11,12,9,94,41,39,26,6,23,5,34,16,16,34,53,22,16,10,6,5,8,13,5,11,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 188 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,37,140,567,592,55,213,600,30,16,48,8,40,119,2,3,2,4,2,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,2,0,0,2,20,3,24,24,2,10,68,14,25,15,6,16,46,33,2,2,1,0,0,1,0,0,2,0,0,0,2,1,0,0,0,0,1,1,1,1,0,0,0,0,0,0,1,14,4,0,1,7,2,0,0,0,1,0,0,0,0,0,0,0,0,0,6,0,3,1,0,5,10,12,4,27,21,17,10,2,12,19,13,19,245,26,5,9,19,5,20,5,11,37,6,16,13,5,7,4,3,47,20,10,23,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 189 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,30,176,125,279,772,322,109,43,46,134,4,11,26,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,1,0,20,32,6,2,3,14,116,40,18,13,53,63,63,13,1,0,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,1,1,2,0,0,0,0,0,0,0,0,1,16,0,2,1,4,0,0,0,0,0,0,0,1,0,0,0,0,0,8,7,0,2,0,1,5,12,24,32,12,30,30,17,18,8,14,13,16,53,33,8,7,25,11,9,2,16,37,7,12,8,5,5,25,10,59,18,11,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 190 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,134,73,170,366,632,283,190,138,47,15,2,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,0,0,1,3,10,10,2,89,4,2,3,20,74,25,16,15,34,81,42,2,1,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,9,5,0,0,2,3,0,0,0,0,0,0,0,0,0,0,0,0,7,19,6,0,4,3,5,7,19,23,27,13,44,23,9,22,6,7,11,48,12,18,32,6,23,12,11,4,21,26,4,6,5,6,2,12,18,40,9,33,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 191 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,173,72,0,699,214,207,65,13,5,1,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,7,26,27,8,7,21,5,0,0,41,39,10,19,74,34,11,1,1,0,0,0,0,0,2,0,0,1,2,6,0,0,1,0,0,1,0,0,3,0,0,0,1,0,0,0,19,0,0,1,0,0,1,0,0,0,0,1,0,0,12,24,0,4,14,2,1,0,3,2,7,7,10,13,21,38,12,17,14,7,9,10,34,12,8,5,22,17,17,39,9,6,13,11,3,5,5,3,2,10,20,78,18,12,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 192 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,110,53,15,639,330,59,103,2,0,0,0,1,1,5,0,0,1,0,0,0,0,6,0,0,0,0,3,13,6,3,7,17,18,3,1,64,14,4,2,2,98,86,98,87,11,6,1,0,1,0,1,0,1,1,2,0,0,1,0,0,0,0,8,0,4,2,0,0,0,0,0,1,3,3,6,21,0,0,1,0,0,0,0,1,0,0,1,0,0,0,1,42,35,2,5,1,0,2,1,6,8,11,16,10,18,12,8,29,16,9,28,22,24,9,9,41,30,22,19,6,8,13,21,22,9,14,14,3,13,9,35,3,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 193 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,71,185,105,248,17,8,3,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,4,38,56,21,8,1,9,36,15,21,79,222,122,46,39,3,0,0,0,0,0,0,0,0,0,1,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,1,7,0,1,1,0,0,1,0,0,1,0,0,1,1,0,0,13,3,2,2,13,0,2,1,8,4,9,15,16,8,12,16,13,56,48,139,8,15,5,20,18,17,5,7,3,4,21,6,6,18,3,32,15,13,11,22,4,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 194 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,28,68,9,25,127,10,4,0,0,0,0,0,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,24,5,8,25,7,11,145,342,85,101,109,31,12,10,14,0,4,4,0,0,0,0,0,0,0,0,0,2,0,0,0,1,0,0,0,0,0,0,1,0,0,0,0,0,2,3,1,1,0,0,1,0,0,1,0,1,5,0,0,0,0,72,4,1,0,8,2,6,0,8,6,5,7,5,35,91,20,7,5,33,78,4,5,21,10,10,29,64,11,5,17,6,4,6,7,6,20,20,16,9,32,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 195 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,10,39,8,12,7,17,71,8,2,0,1,0,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,1,0,1,25,22,173,1616,415,41,60,8,3,20,22,10,16,10,0,0,0,0,0,0,0,0,1,1,0,1,0,0,0,1,0,0,0,0,0,0,1,0,1,1,9,1,0,0,0,0,0,1,0,0,0,0,2,17,10,17,2,52,2,0,0,0,6,2,6,6,7,5,35,1,6,33,66,36,8,42,13,7,26,11,4,6,36,22,6,12,10,7,7,9,4,5,3,7,24,46,24,14,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 196 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,60,50,1,6,9,9,32,24,4,1,0,2,4,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,9,6,105,435,272,117,51,4,2,46,18,29,4,1,0,0,0,0,2,0,1,0,0,5,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,12,2,0,1,0,0,0,0,1,0,0,0,1,0,15,0,14,43,5,4,0,2,6,8,7,8,7,26,13,5,4,4,34,7,6,99,83,16,31,10,5,8,10,8,23,11,26,3,11,9,7,6,4,4,1,8,141,141,76,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 197 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,54,8,4,3,1,0,3,24,13,9,0,2,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,0,1,4,0,2,11,70,212,157,138,175,36,41,4,34,20,6,1,0,0,0,1,0,4,3,2,1,12,8,0,0,1,0,0,0,0,0,0,0,1,0,0,0,0,16,0,0,0,0,1,0,0,0,0,1,0,0,0,1,1,1,50,10,1,1,0,6,10,5,10,15,22,8,21,6,14,15,33,30,141,57,4,42,21,25,17,20,51,13,30,14,6,12,7,6,10,10,6,13,35,208,5,7,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 198 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,52,6,8,1,0,1,0,6,58,50,8,38,16,0,1,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,1,6,3,14,112,365,132,116,28,46,45,9,35,37,2,1,0,0,0,3,11,20,7,29,26,17,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,0,0,1,0,0,1,0,0,0,0,0,0,0,0,2,25,0,0,1,5,3,6,10,8,24,14,22,8,9,19,11,5,32,686,583,36,88,32,17,12,16,8,19,33,9,21,5,9,7,6,7,10,10,30,47,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 199 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,110,11,10,0,0,0,0,0,9,26,58,181,12,99,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,0,0,0,2,18,200,253,318,80,55,18,30,14,7,8,19,2,2,1,0,0,23,9,15,25,10,8,0,0,0,0,0,0,0,0,2,0,0,0,0,0,0,0,2,5,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,3,13,2,0,0,2,5,4,4,19,11,16,4,6,13,5,10,47,107,325,502,35,19,13,9,47,12,21,24,4,12,7,7,6,6,7,6,21,34,30,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 200 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,9,44,10,3,0,0,0,0,0,0,0,17,133,56,27,7,3,1,0,0,0,0,0,0,2,0,0,0,2,0,0,0,0,15,65,60,297,314,60,24,17,11,5,5,1,15,1,1,3,0,1,23,9,23,22,3,0,0,1,0,0,0,0,0,0,2,0,0,1,0,0,0,0,9,0,0,0,0,0,0,1,0,0,0,0,6,0,0,0,0,8,9,0,0,0,2,0,2,9,9,6,6,8,15,11,8,51,59,25,133,401,85,13,16,27,23,2,17,5,5,10,6,6,4,6,5,6,27,21,32,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 201 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,33,9,8,3,0,1,0,1,0,0,0,26,25,13,29,42,19,10,5,0,0,0,0,0,1,0,0,0,2,0,3,6,22,18,23,76,608,1050,8,7,15,5,11,1,1,4,6,0,2,6,8,64,43,33,24,16,1,0,0,0,0,0,0,0,0,1,0,0,0,0,0,0,2,9,0,0,0,1,0,1,1,0,0,1,1,18,0,0,1,2,8,18,0,0,4,4,4,5,1,4,7,9,5,12,10,15,62,34,57,51,223,143,24,10,7,9,17,5,3,6,8,8,5,4,3,7,5,10,7,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 202 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,7,94,14,6,1,0,0,0,0,0,1,1,49,12,0,7,27,43,26,27,0,0,0,0,1,0,0,0,2,1,1,7,28,30,6,13,135,305,186,54,34,8,4,4,1,0,0,17,44,12,36,97,103,85,55,37,10,2,1,1,0,1,0,0,0,0,0,0,0,0,0,0,0,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,13,8,2,3,3,7,6,2,8,8,5,32,18,41,12,5,4,10,25,50,50,32,10,5,8,8,38,12,4,10,5,6,5,4,2,1,1,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 203 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,56,34,4,3,0,0,0,0,0,0,0,12,49,3,0,0,0,10,8,24,3,1,0,0,0,0,0,0,2,5,7,6,9,4,3,43,240,191,18,137,43,33,5,3,0,3,0,1,9,8,43,17,7,11,513,87,1,1,1,1,2,0,0,0,0,0,0,0,0,0,2,0,2,1,0,0,0,0,0,0,0,0,0,1,1,0,0,0,0,0,3,10,1,8,6,6,3,6,6,16,7,10,3,19,35,16,8,2,5,18,10,65,39,7,9,9,6,7,4,5,6,3,1,6,2,0,0,2,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 204 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,16,15,24,8,0,0,1,0,0,0,0,0,13,43,0,0,0,0,0,1,0,0,1,0,0,0,0,1,2,15,18,7,1,3,11,13,29,73,17,16,93,9,8,25,24,8,3,0,0,6,31,17,9,17,37,127,31,11,9,2,1,0,1,1,1,0,0,0,0,0,0,0,0,2,0,0,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,8,10,3,61,3,4,3,5,31,8,3,7,3,13,17,13,7,8,27,31,5,32,56,39,26,9,11,11,6,5,1,2,1,0,0,1,2,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 205 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,6,46,22,15,17,5,0,0,0,0,0,0,1,32,26,0,0,0,0,0,0,0,0,0,0,0,0,2,1,6,3,34,1,8,2,55,34,164,73,12,94,4,31,7,6,2,2,3,0,1,0,9,4,18,29,27,36,34,40,19,11,2,1,1,1,2,0,0,1,0,0,2,2,7,0,0,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,5,8,4,19,4,10,3,15,7,7,7,5,8,9,17,9,5,30,53,10,3,8,36,56,6,14,26,8,18,4,7,3,1,0,1,0,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 206 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,39,17,20,26,24,7,1,0,0,0,1,0,1,33,15,0,0,0,0,0,0,0,0,0,0,0,3,26,4,0,0,2,0,8,7,12,35,164,27,38,25,17,45,10,3,3,1,0,0,0,0,3,5,10,3,38,9,7,17,21,6,16,3,0,1,0,1,0,0,0,1,0,4,16,0,0,0,0,0,0,0,1,1,0,0,0,0,0,0,0,0,0,1,51,0,13,12,22,6,31,15,11,8,8,7,18,2,6,2,28,51,9,11,11,9,73,10,12,7,3,6,5,7,4,1,0,0,2,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 207 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,37,40,8,11,43,8,0,0,0,1,0,0,0,10,59,3,0,1,0,0,0,0,0,0,0,0,0,11,22,8,0,1,0,2,1,6,19,60,67,21,49,20,8,23,50,1,0,0,1,0,1,0,4,14,11,7,10,2,8,31,10,6,15,13,5,6,1,0,0,0,0,0,0,4,0,0,1,0,0,0,0,0,0,0,0,1,0,0,1,1,0,0,0,2,40,13,14,12,10,5,8,8,3,17,15,14,10,4,28,14,64,10,5,11,14,11,34,42,5,7,10,8,6,3,9,1,0,1,2,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 208 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,26,21,3,7,14,7,0,0,0,0,3,1,0,15,32,0,0,0,0,0,0,0,0,0,0,1,0,16,23,5,0,0,0,0,0,9,17,76,84,33,61,9,16,9,40,17,2,4,2,0,0,0,8,20,1,6,15,2,8,23,8,6,0,2,7,27,21,3,1,0,0,0,11,9,0,0,0,0,0,0,0,0,0,0,0,0,0,1,0,1,0,1,0,14,13,5,19,19,14,20,14,8,9,30,12,14,4,5,11,36,123,7,3,1,5,34,11,23,8,10,5,7,9,2,3,3,2,3,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 209 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,20,11,6,4,11,14,1,0,0,1,1,5,1,31,22,0,0,0,0,0,0,0,0,0,0,0,0,10,47,5,0,0,4,5,5,7,29,11,79,11,40,6,4,9,38,3,2,2,1,0,0,2,7,4,0,12,20,1,23,74,15,0,1,0,15,9,8,0,1,0,0,9,30,2,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,20,0,4,8,158,30,14,10,9,37,21,28,3,3,5,31,29,44,1,8,7,17,9,12,11,6,8,4,6,4,2,1,3,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 210 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,6,22,12,1,1,5,17,14,4,5,1,2,3,0,71,16,0,0,0,0,0,0,0,0,1,1,0,5,32,34,0,2,1,4,6,5,9,45,0,2,27,5,5,4,19,8,21,4,1,0,0,1,0,32,1,1,8,3,4,25,11,5,0,1,1,1,1,1,0,1,2,0,17,17,0,0,0,1,0,2,0,0,2,0,1,0,0,0,0,0,0,0,0,0,4,30,2,6,11,69,26,10,14,9,15,30,29,5,2,24,84,4,12,63,9,6,20,5,7,7,8,10,36,9,1,3,3,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 211 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,39,20,3,5,0,1,7,25,36,11,1,2,0,8,92,11,0,0,0,0,0,1,0,0,1,0,0,21,65,3,0,1,2,0,4,1,21,88,0,0,38,10,5,26,32,5,10,7,1,1,0,0,3,14,7,8,7,1,15,38,6,0,2,4,0,0,1,1,0,0,2,8,27,4,1,0,0,0,5,0,0,0,1,0,0,0,0,0,0,1,0,0,0,0,9,8,5,7,7,9,41,23,27,14,9,22,32,4,8,62,24,1,0,45,5,7,5,9,7,8,7,3,4,5,1,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 212 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,43,19,16,11,1,1,0,7,72,22,23,0,0,9,101,1,0,0,0,0,0,1,0,1,1,0,0,36,25,7,0,4,0,0,0,12,63,66,0,0,14,3,6,56,6,2,11,47,1,0,0,4,6,11,7,15,24,0,40,41,0,0,0,1,0,2,1,1,1,1,0,33,43,5,0,0,8,2,45,3,0,0,0,0,0,0,1,0,0,0,0,1,0,0,3,15,26,6,12,21,22,16,7,15,19,10,24,11,26,31,2,0,3,11,15,4,6,7,6,4,4,2,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 213 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,38,24,12,10,1,0,0,0,17,66,70,47,1,0,15,54,0,1,1,2,0,0,1,2,3,0,0,7,33,22,23,0,4,0,2,22,48,25,0,0,6,8,7,13,30,2,4,3,39,8,2,5,1,0,0,1,3,12,10,31,3,0,0,1,1,0,10,11,0,0,2,0,2,19,91,1,1,8,13,27,0,0,0,0,0,0,0,0,0,0,1,0,0,0,0,0,7,13,23,22,22,15,31,9,19,9,4,70,51,36,2,1,0,5,10,6,6,5,2,3,1,10,1,1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 214 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,45,14,33,18,1,0,1,0,14,54,35,15,0,3,57,2,2,1,1,3,0,1,3,0,0,1,0,18,18,5,38,0,1,5,25,49,10,5,0,0,6,13,9,31,17,2,0,1,10,17,7,13,5,1,0,0,2,12,29,7,5,0,1,0,8,0,2,8,0,3,1,0,6,12,24,8,3,20,7,4,0,6,31,1,0,0,0,0,0,1,3,0,1,2,0,0,29,13,19,53,14,11,19,10,16,1,2,38,36,55,7,1,32,21,10,10,7,4,1,0,0,0,3,3,1,2,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 215 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,32,45,12,29,10,5,0,0,7,40,28,29,12,4,3,37,20,3,1,2,8,2,0,3,2,1,10,0,18,8,1,61,19,19,20,23,9,18,0,0,0,40,17,12,38,28,6,0,2,4,83,85,4,2,2,0,1,0,3,18,48,3,1,2,7,13,0,0,5,1,0,0,1,4,4,18,7,8,18,15,1,0,3,2,0,1,0,0,0,0,0,0,0,0,1,0,2,8,11,13,10,30,17,29,45,28,4,4,6,5,36,13,2,8,12,2,19,7,5,0,0,0,0,2,1,0,3,1,2,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 216 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,147,28,17,81,22,15,8,1,32,19,13,34,2,0,0,14,20,5,1,3,8,0,1,2,0,0,12,10,31,19,0,26,66,41,31,3,15,5,0,0,0,4,0,77,53,16,0,6,1,2,30,42,3,0,3,5,0,2,2,10,37,1,0,0,3,16,0,2,2,2,0,0,0,15,14,20,0,1,17,28,3,1,1,0,1,0,0,0,0,0,0,1,0,0,1,12,0,5,9,12,15,44,29,37,54,31,6,0,0,5,62,36,5,3,12,7,26,124,14,6,0,0,0,1,2,3,1,3,3,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 217 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,255,34,147,98,4,9,22,11,60,35,13,29,2,1,4,10,52,2,3,0,0,8,1,0,0,0,1,1,3,31,0,11,43,82,28,5,4,0,0,0,0,0,0,87,12,6,0,0,0,2,5,27,5,0,12,3,1,4,6,6,27,1,0,2,5,13,0,1,1,2,0,0,4,14,8,11,0,5,8,49,6,2,0,0,0,1,0,1,0,0,0,0,0,0,1,0,0,17,10,21,39,17,9,10,136,539,4,0,0,3,16,17,15,29,11,9,2,10,10,6,5,0,0,0,0,2,3,5,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 218 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,70,84,255,27,12,15,64,44,22,45,9,35,3,2,6,14,66,9,4,0,0,1,1,0,2,3,0,0,0,30,12,23,37,80,26,14,0,0,0,0,0,0,0,86,14,4,1,0,1,1,0,5,16,1,17,0,0,4,7,8,27,0,0,4,30,11,3,2,0,0,6,2,6,23,7,14,3,3,10,10,8,28,4,0,0,1,0,0,0,0,0,0,0,0,0,1,3,19,20,15,30,36,10,32,24,122,0,0,0,52,15,6,9,18,9,9,9,8,10,6,4,0,0,0,0,0,1,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 219 | 0,0,0,0,0,0,0,0,0,0,0,0,0,42,45,85,51,8,2,18,92,106,44,49,10,7,0,12,27,13,51,28,1,0,0,0,0,0,0,8,0,1,15,26,44,40,4,24,98,26,0,0,0,0,0,0,49,132,21,11,1,0,3,3,1,4,5,24,6,0,0,12,10,3,3,2,2,4,29,4,7,3,0,1,12,4,12,13,8,17,15,11,16,0,0,43,12,0,1,1,0,0,0,12,0,0,0,0,0,5,4,14,17,12,20,29,16,32,8,25,4,0,3,43,21,7,9,13,8,10,7,4,2,5,10,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 220 | 0,0,0,0,0,0,0,0,0,0,0,0,0,37,69,36,15,1,33,51,99,84,166,66,15,4,0,2,34,25,22,47,1,1,0,0,0,0,0,16,9,5,28,78,103,69,77,11,27,2,0,0,0,0,0,1,64,25,29,34,2,1,13,2,2,0,0,13,17,1,1,23,3,0,1,1,3,20,23,7,1,2,4,1,10,50,10,6,2,19,9,3,10,1,1,9,4,7,8,1,1,0,0,0,0,0,0,0,0,11,6,12,8,6,19,22,117,6,2,6,10,0,1,23,19,9,22,14,5,8,14,1,3,7,4,0,0,0,0,1,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 221 | 0,0,0,0,0,0,0,0,0,0,0,0,0,29,31,30,22,28,56,128,80,42,303,157,26,8,9,16,8,47,23,54,0,0,0,0,0,0,2,9,37,19,37,94,31,97,157,11,0,0,0,0,0,0,2,34,28,4,6,11,12,7,5,0,1,2,1,3,14,2,2,14,3,0,7,24,31,57,11,8,18,5,11,5,19,36,14,6,16,15,6,3,4,11,74,16,0,2,18,3,1,1,0,0,0,0,2,1,0,17,34,52,7,38,42,66,55,2,6,3,45,31,26,12,5,28,159,67,15,18,12,5,6,6,1,0,0,0,0,0,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 222 | 0,0,0,0,0,0,0,0,0,0,0,0,1,165,32,10,47,29,139,83,19,34,121,93,104,56,27,24,11,84,37,24,0,0,0,0,0,0,5,24,40,30,35,70,18,104,204,32,0,0,0,0,0,0,0,6,30,0,2,0,0,1,5,0,0,0,1,1,2,4,4,11,2,1,22,18,112,55,6,7,41,11,14,33,28,24,59,49,28,25,27,7,9,17,17,18,4,2,2,9,7,1,0,0,2,2,2,1,0,3,20,46,28,33,39,61,61,31,26,45,30,28,19,6,3,15,21,21,24,23,5,6,2,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 223 | 0,0,0,0,0,0,0,0,0,0,0,0,0,110,61,35,24,157,112,47,19,104,46,49,53,43,143,65,32,90,50,6,0,0,0,0,0,0,5,26,22,14,35,22,126,357,96,13,0,0,0,0,0,0,0,10,15,0,1,0,2,2,0,0,0,0,0,0,1,0,16,26,5,17,13,36,88,22,6,14,43,4,8,27,22,49,80,12,10,12,61,17,11,20,18,10,11,5,5,34,16,22,1,0,0,3,0,2,0,0,5,13,17,31,87,46,15,29,35,20,5,3,9,8,8,12,17,9,12,41,5,1,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 224 | 0,0,0,0,0,0,0,0,0,0,0,0,0,69,39,42,17,125,34,119,77,33,12,23,11,23,45,66,159,127,124,0,0,0,0,0,0,0,11,16,14,14,63,30,103,152,0,0,0,1,2,0,1,2,0,58,27,3,3,0,0,1,0,1,0,1,0,0,0,1,3,143,11,29,8,44,65,6,4,22,42,17,11,10,17,86,44,4,14,6,7,7,4,2,16,38,24,10,20,24,12,30,14,1,1,1,1,0,1,0,8,9,67,190,360,12,8,22,1,2,2,1,1,11,15,28,15,9,8,6,7,0,2,1,0,0,0,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 225 | 0,0,0,0,0,0,0,0,0,0,0,0,0,57,48,42,194,105,27,35,40,32,6,13,12,38,23,16,127,26,42,0,0,0,0,0,0,0,3,17,38,48,17,83,35,10,2,0,0,0,0,0,9,7,1,61,10,12,44,2,1,1,0,0,0,0,0,0,0,0,0,25,30,17,12,48,28,36,20,36,7,9,15,10,13,59,10,6,25,13,6,8,17,4,9,22,24,31,38,18,30,2,0,2,3,0,1,0,0,0,8,20,31,388,170,12,8,26,3,1,0,2,9,10,13,19,12,6,19,17,5,2,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 226 | 0,0,0,0,0,0,0,0,0,0,0,0,0,123,134,0,198,34,44,15,12,16,59,30,13,23,14,13,93,48,41,101,25,15,1,0,0,0,1,7,47,156,118,48,16,2,4,1,0,0,0,0,1,12,3,114,71,160,140,59,1,1,0,1,0,0,0,0,0,0,0,1,17,30,10,74,9,26,31,43,3,9,4,13,12,13,5,5,23,12,19,15,6,1,14,22,29,85,17,13,1,0,1,4,27,0,8,5,0,0,24,33,35,252,105,12,47,58,2,0,3,6,11,26,6,7,23,13,14,12,2,3,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 227 | 0,0,0,0,0,0,0,0,0,0,0,0,0,189,164,0,187,61,15,7,16,43,83,5,30,68,18,27,89,88,94,72,212,52,90,75,1,0,3,11,64,45,27,2,0,2,4,0,0,0,0,0,0,8,7,5,17,134,21,40,3,1,0,0,0,0,0,0,0,0,0,0,48,64,27,61,10,7,56,11,3,6,6,8,26,8,8,14,28,40,14,3,7,4,7,26,75,28,61,3,1,0,2,43,20,1,11,5,1,18,28,41,99,114,36,35,17,70,24,5,0,2,20,26,15,16,20,21,20,4,7,1,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 228 | 0,0,0,0,0,0,0,0,0,0,0,0,0,118,1,85,355,24,13,10,2,17,93,14,29,61,25,42,64,29,113,47,134,57,220,128,124,112,17,113,59,28,4,2,0,0,0,0,0,0,0,0,0,0,3,1,1,128,101,5,1,0,0,0,1,0,0,1,0,0,0,0,45,144,386,31,18,30,98,14,5,11,1,22,6,6,8,10,26,31,9,6,7,8,2,22,51,31,12,3,0,1,1,0,15,0,8,5,10,12,31,15,171,58,33,52,11,40,24,39,8,57,31,44,6,7,14,9,8,10,3,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 229 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,324,187,39,6,13,5,17,104,19,30,110,112,146,49,39,105,87,159,262,273,213,142,140,121,62,30,24,6,1,1,0,0,0,0,0,0,0,0,0,0,0,59,91,9,2,0,0,1,6,0,1,0,0,0,0,0,0,0,85,248,35,52,111,13,12,15,3,2,54,8,20,8,9,17,53,19,8,8,8,24,14,19,10,10,12,0,0,5,1,6,27,21,30,43,39,81,84,146,20,27,5,10,73,3,1,1,40,0,26,21,23,24,1,2,6,58,11,1,0,0,0,1,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 230 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,508,57,33,19,12,11,37,91,12,52,72,45,133,164,78,188,215,205,307,271,104,233,155,117,12,12,1,4,0,0,0,0,0,0,0,0,0,0,0,0,4,89,23,6,0,0,1,2,1,2,0,0,0,0,0,0,0,0,24,28,72,107,9,1,15,26,8,41,29,11,32,6,4,16,35,28,5,11,5,34,15,19,7,13,8,4,9,21,1,3,14,70,44,52,153,14,3,72,7,1,4,1,9,17,3,0,0,1,7,24,12,21,4,5,3,4,8,1,1,0,0,5,310,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 231 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,300,133,47,37,18,26,37,96,15,10,72,7,135,145,151,380,478,363,315,73,175,94,17,6,0,1,2,0,0,0,0,0,0,0,0,0,0,0,0,0,41,22,13,2,0,3,0,0,4,0,0,0,0,0,1,0,0,0,0,0,146,202,8,0,12,80,33,101,16,13,16,12,16,8,8,15,47,23,9,42,12,32,9,9,3,1,13,3,1,1,4,56,65,54,76,3,4,92,4,2,1,3,19,8,1,0,0,3,1,28,2,11,0,4,0,2,2,1,0,7,6,41,40,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 232 | 0,0,0,0,0,0,0,0,0,0,0,0,0,1,3,357,40,33,88,67,20,46,49,41,16,84,56,32,25,129,450,746,138,310,141,13,14,16,6,2,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,83,42,2,3,0,4,3,0,30,0,0,0,0,0,0,0,0,0,2,1,167,142,12,1,7,46,122,92,17,19,24,33,12,16,26,12,32,47,12,23,10,13,7,6,2,3,13,4,1,0,21,40,218,207,83,4,3,104,35,3,7,3,11,0,0,1,4,14,2,16,3,1,7,4,2,4,3,0,0,1,5,18,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 233 | 0,0,0,0,0,0,0,0,0,0,0,0,0,11,2,403,113,23,33,101,119,53,58,25,10,68,92,18,38,4,60,110,115,63,324,31,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,71,13,2,4,0,2,2,9,25,0,0,0,0,0,0,0,0,0,0,0,62,131,15,11,40,21,11,18,17,11,18,13,6,5,14,40,19,26,25,13,15,7,10,24,6,5,12,13,8,4,46,38,159,293,139,3,5,133,77,6,17,21,59,39,15,9,2,5,1,4,6,6,3,1,1,3,1,0,2,1,4,12,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 234 | 0,0,0,0,0,0,0,0,0,0,0,0,0,2,3,250,44,52,49,38,99,214,103,85,65,170,41,12,1,1,3,13,10,120,85,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,27,13,1,1,0,0,1,54,4,0,0,0,0,0,0,0,0,0,0,0,69,162,521,160,410,122,13,9,6,8,11,10,9,3,4,15,39,36,41,21,9,11,11,8,12,19,5,6,10,25,58,84,209,1316,699,40,10,295,10,73,66,1,16,14,3,17,25,17,15,26,2,5,1,4,2,4,0,1,2,0,5,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 235 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,79,190,43,27,125,109,112,102,52,20,44,56,19,2,4,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,3,1,4,0,5,1,20,123,2,0,0,0,0,0,0,0,0,0,0,1,2,32,166,106,119,28,44,12,2,3,8,11,9,22,18,18,21,59,76,22,13,9,7,1,25,21,15,9,4,27,13,70,22,1242,2258,167,18,662,101,6,1,0,1,0,1,4,3,16,39,8,2,1,2,2,3,3,1,4,0,10,22,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 236 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,33,202,42,23,161,70,23,65,96,69,5,65,16,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,9,7,1,23,48,68,25,0,0,0,0,0,0,0,0,0,0,0,0,0,8,24,14,8,45,11,6,3,9,10,7,17,18,7,8,16,82,101,18,27,32,16,7,10,6,16,23,18,32,28,30,139,691,1321,423,501,440,5,1,0,0,1,7,8,14,4,8,8,1,5,1,1,1,5,5,3,14,6,4,28,31,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 237 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,17,349,54,20,102,84,11,127,146,60,18,201,12,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,4,4,0,0,6,39,50,0,0,0,0,0,0,0,0,0,0,0,0,0,2,19,25,26,6,19,40,11,2,5,8,25,19,24,13,18,122,194,42,20,26,47,14,12,9,8,6,62,111,47,176,2,3,32,2237,1139,774,1701,294,1,0,1,0,22,8,4,5,32,18,3,2,2,0,4,1,9,4,18,18,12,12,24,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 238 | 0,0,0,0,0,0,0,0,0,0,0,0,0,1,19,56,85,85,20,7,20,69,60,29,4,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,4,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,10,48,52,23,20,10,14,19,13,30,8,21,45,12,31,132,105,50,27,25,17,10,14,11,46,56,41,176,78,96,63,108,105,1534,2432,935,1545,572,6,4,0,1,17,27,21,11,8,13,7,5,3,0,1,5,2,9,15,9,6,9,28,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 239 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,20,85,19,8,36,36,25,34,1,9,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,11,113,45,25,22,27,12,13,71,59,11,6,23,28,120,41,27,66,27,70,10,14,18,11,37,78,14,73,135,77,140,946,1031,1058,3268,496,597,98,23,3,0,13,42,9,14,8,10,6,14,3,1,2,1,2,5,14,9,11,2,12,24,31,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 240 | 0,0,0,0,0,0,0,0,0,0,0,0,0,1,23,103,51,12,146,15,6,7,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,11,46,84,110,27,7,17,27,76,30,38,36,23,68,99,73,18,32,136,244,19,15,12,51,58,10,38,23,73,8,3,77,640,1816,454,1054,13,12,81,31,8,4,27,7,12,12,16,5,20,3,3,4,6,4,26,28,5,15,4,17,19,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 241 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,14,27,170,117,52,59,7,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,12,115,128,41,35,40,72,31,44,54,84,44,110,112,14,14,45,130,518,83,35,72,130,15,15,33,98,17,5,3,58,86,1207,958,448,19,18,21,70,5,7,31,5,18,23,6,9,23,6,9,15,15,165,38,15,9,10,9,26,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 242 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,237,602,163,125,7,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,18,46,33,17,57,58,114,67,17,24,74,157,544,107,47,48,28,36,43,66,116,152,15,22,10,7,54,6,1,0,32,599,1026,1425,801,100,285,19,8,8,6,20,6,20,21,6,6,3,4,3,17,30,148,12,14,4,13,31,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 243 | 0,0,0,0,0,0,0,0,0,0,0,0,0,81,6,0,0,0,901,7,267,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,14,123,44,29,11,0,4,99,149,39,27,128,171,41,140,26,15,60,11,31,199,57,17,49,9,38,19,16,1,0,18,196,364,1454,1369,357,148,197,43,12,10,16,9,14,3,4,6,6,6,2,13,21,22,38,38,42,21,7,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 244 | 0,0,0,0,0,0,0,0,0,0,0,1,78,274,105,187,82,115,43,100,278,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,54,110,25,71,110,264,66,32,38,15,11,40,214,81,17,45,12,56,79,90,36,34,47,88,211,556,866,390,202,40,30,62,46,46,31,14,9,4,10,7,11,12,17,66,27,58,14,9,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 245 | 0,0,0,0,0,0,0,0,0,0,0,24,179,99,262,142,19,56,66,11,12,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,11,137,83,67,62,38,69,28,47,22,34,112,46,39,46,8,11,43,9,11,450,303,11,297,180,155,230,40,13,25,50,10,107,37,41,9,47,13,7,6,15,35,68,27,36,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 246 | 0,0,0,0,0,0,0,0,0,0,2,184,82,29,62,276,21,8,196,37,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,50,74,36,30,55,51,29,49,85,87,35,18,30,14,10,9,12,33,26,6,64,14,45,31,93,23,40,52,112,28,374,110,36,38,35,8,10,11,16,45,7,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 247 | 0,0,0,0,0,0,0,0,0,0,9,285,24,25,152,488,25,3,41,43,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,0,132,74,19,70,98,47,56,114,56,20,72,21,17,6,2,54,9,8,23,97,46,11,11,70,25,53,19,120,71,166,242,61,13,14,39,10,3,21,16,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 248 | 0,0,0,0,0,0,0,0,0,0,100,35,31,42,189,125,34,7,68,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,0,170,94,144,315,130,315,218,19,25,100,33,21,38,17,19,5,4,9,30,29,1,1,17,38,115,17,75,146,23,31,78,14,7,25,27,30,22,0,0,2,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 249 | 0,0,0,0,0,0,0,0,8,11,62,17,24,93,59,110,27,8,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5,19,2,28,116,37,70,241,95,25,44,44,17,16,5,2,35,51,8,9,14,151,66,37,84,120,147,78,14,23,7,20,27,30,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 250 | 0,0,0,0,0,0,0,18,29,99,74,35,25,53,33,70,172,13,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,9,0,5,203,21,165,240,30,37,61,16,9,90,12,21,76,19,59,58,95,66,124,38,51,19,15,44,68,2,85,45,38,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 251 | 0,0,0,0,0,0,41,219,165,77,23,105,19,124,104,295,107,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,258,226,65,91,183,361,161,226,336,84,73,186,86,164,22,3,4,18,52,113,353,329,265,122,12,15,13,6,11,28,6,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 252 | 0,0,0,1,54,9,75,45,19,4,1,116,67,113,116,33,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,197,67,28,91,67,19,2,25,887,52,20,26,16,43,3,0,0,1,22,79,210,268,348,99,50,20,23,8,2,0,0,0,0,0,0,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 253 | 0,0,0,28,81,13,2,1,3,0,0,164,69,142,121,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,90,411,397,150,2,6,1,351,967,26,5,6,9,52,16,0,0,1,35,61,84,73,72,34,15,17,58,55,30,5,0,0,0,0,1,12,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 254 | 0,0,0,25,1,5,0,1,1,1,2,18,328,16,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,278,53,0,0,1,1114,283,20,16,3,15,7,5,0,1,0,9,120,159,55,54,7,48,137,210,11,8,36,8,0,1,14,12,23,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 255 | 0,0,0,6,2,3,3,18,7,1,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,575,172,26,23,5,5,5,1,0,0,0,21,33,44,59,18,12,16,8,48,19,11,3,29,19,8,20,23,20,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 256 | 0,0,0,0,1,2,2,52,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,150,69,17,23,8,4,3,2,0,0,4,34,16,4,19,17,24,32,21,9,11,10,6,1,6,5,13,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 257 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,274,46,7,12,7,3,6,5,1,0,5,23,14,4,10,22,10,26,16,11,4,7,3,0,0,9,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 258 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,92,89,17,18,16,6,5,4,0,0,0,0,0,0,1,13,12,29,23,12,26,12,8,7,13,15,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 259 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,311,176,127,78,71,61,14,0,0,0,0,0,0,0,0,9,24,12,23,19,31,14,10,16,37,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 260 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,411,234,51,26,103,53,78,11,0,0,0,0,0,0,5,24,20,30,30,57,33,33,25,33,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 261 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,6,286,53,33,56,43,51,7,0,0,0,4,4,2,18,18,78,92,270,354,101,65,26,3,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 262 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,299,62,30,19,5,5,0,1,0,1,6,7,8,12,10,42,171,394,914,86,79,19,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 263 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,16,286,70,53,71,8,0,0,0,0,5,11,13,5,14,38,108,171,92,272,33,21,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 264 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,38,147,15,20,35,9,3,0,2,2,26,10,15,11,17,31,45,43,38,25,20,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 265 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,87,215,43,38,24,12,3,2,0,1,4,6,9,7,12,30,45,42,40,33,22,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 266 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,25,173,47,62,13,9,8,3,0,0,4,5,12,23,33,47,26,32,35,23,37,11,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 267 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,166,179,40,85,21,9,0,2,7,2,17,20,4,8,20,29,0,3,10,26,85,24,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 268 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,219,336,95,71,54,13,1,9,5,0,1,3,4,6,18,3,0,3,9,27,81,10,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 269 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,159,112,100,19,18,50,5,8,0,0,0,0,0,16,16,5,1,20,50,66,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 270 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,18,200,30,34,14,11,8,0,0,0,0,1,1,5,18,8,12,33,54,2,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 271 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,132,38,12,13,18,2,0,0,0,1,0,1,3,6,11,32,19,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 272 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,50,185,21,73,22,10,2,1,0,0,0,0,4,5,18,8,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 273 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,152,70,63,30,28,15,0,0,1,7,1,6,7,9,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 274 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,87,64,39,22,7,6,1,1,0,7,8,5,14,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 275 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,8,18,17,11,10,1,5,15,10,15,7,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 276 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,48,7,22,16,20,20,10,6,15,29,16,4,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 277 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,38,4,8,9,9,8,19,50,32,105,14,16,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 278 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,6,14,12,6,4,12,291,92,8,26,10,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 279 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,14,14,8,7,3,15,6,2,0,117,17,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 280 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,19,15,8,10,3,5,33,21,0,0,82,62,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 281 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,36,11,7,4,11,20,29,110,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 282 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,24,9,8,6,8,5,14,33,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 283 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,45,10,8,8,8,5,6,63,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 284 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,50,12,13,5,7,18,9,54,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 285 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,36,24,5,6,9,12,6,1,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 286 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,57,3,7,11,16,14,13,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 287 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,70,8,6,9,7,13,34,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 288 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,7,18,6,8,5,18,5,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 289 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5,30,11,16,5,12,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 290 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,5,33,12,25,13,23,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 291 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,7,236,20,13,19,10,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 292 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,18,27,8,28,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 293 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,17,43,27,6,34,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 294 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,13,143,15,17,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 295 | 0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,61,42,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0 296 | -------------------------------------------------------------------------------- /LICENSE: -------------------------------------------------------------------------------- 1 | The MIT License (MIT) 2 | 3 | Copyright (c) 2014 Ryan Brideau 4 | 5 | Permission is hereby granted, free of charge, to any person obtaining a copy 6 | of this software and associated documentation files (the "Software"), to deal 7 | in the Software without restriction, including without limitation the rights 8 | to use, copy, modify, merge, publish, distribute, sublicense, and/or sell 9 | copies of the Software, and to permit persons to whom the Software is 10 | furnished to do so, subject to the following conditions: 11 | 12 | The above copyright notice and this permission notice shall be included in all 13 | copies or substantial portions of the Software. 14 | 15 | THE SOFTWARE IS PROVIDED "AS IS", WITHOUT WARRANTY OF ANY KIND, EXPRESS OR 16 | IMPLIED, INCLUDING BUT NOT LIMITED TO THE WARRANTIES OF MERCHANTABILITY, 17 | FITNESS FOR A PARTICULAR PURPOSE AND NONINFRINGEMENT. IN NO EVENT SHALL THE 18 | AUTHORS OR COPYRIGHT HOLDERS BE LIABLE FOR ANY CLAIM, DAMAGES OR OTHER 19 | LIABILITY, WHETHER IN AN ACTION OF CONTRACT, TORT OR OTHERWISE, ARISING FROM, 20 | OUT OF OR IN CONNECTION WITH THE SOFTWARE OR THE USE OR OTHER DEALINGS IN THE 21 | SOFTWARE. 22 | -------------------------------------------------------------------------------- /README.md: -------------------------------------------------------------------------------- 1 | GeospatialLineGraphs 2 | ==================== 3 | 4 | A library for creating geospatial line graphs along lines of latitude. 5 | 6 | [![New Brunswick Property Locations](http://i.imgur.com/0R4daMp.png)](http://i.imgur.com/zn6UGPW.png) 7 | 8 | [![Fredericton Property Values](http://i.imgur.com/O1eIg5u.png)](http://i.imgur.com/6TDo0Sf.png) 9 | 10 | [![World Population Line Plot](http://i.imgur.com/SnWymMz.png)](http://i.imgur.com/A8FlGkz.png) --------------------------------------------------------------------------------