├── www
└── stuti6.jpg
├── UI
├── ui_plots.R
├── ui_fullTable.R
├── ui_overview.R
└── ui_about.R
├── server.R
├── rsconnect
└── shinyapps.io
│ └── covidstats
│ └── COVID-19-Statistical-Analysis-Simulator-master.dcf
├── LICENSE
├── README.md
├── utils.R
├── covid 19 data.py
├── ui.R
├── sections
├── content_overview
│ ├── keyFigures.R
│ ├── summary_table.R
│ └── map.R
├── fullTable.R
└── content_plots
│ └── case_evolution.R
├── global.R
└── data
└── time_series_covid19_deaths_global.csv
/www/stuti6.jpg:
--------------------------------------------------------------------------------
https://raw.githubusercontent.com/stuti24m/COVIDstats/HEAD/www/stuti6.jpg
--------------------------------------------------------------------------------
/UI/ui_plots.R:
--------------------------------------------------------------------------------
1 |
2 |
3 |
4 | page_plots <- dashboardPage(
5 | title = "Plots",
6 | header = dashboardHeader(disable = TRUE),
7 | sidebar = dashboardSidebar(disable = TRUE),
8 | body = dashboardBody(fluidRow(fluidRow(uiOutput("box_caseEvolution"))))
9 | )
--------------------------------------------------------------------------------
/server.R:
--------------------------------------------------------------------------------
1 | server <- function(input, output) {
2 | sourceDirectory("sections", recursive = TRUE)
3 |
4 | showNotification("Welcome to the COVID-19 Statistical Simulator Analyzer",
5 | duration = NULL, type = "warning")
6 |
7 | # Trigger once an hour
8 | dataLoadingTrigger <- reactiveTimer(3600000)
9 |
10 | observeEvent(dataLoadingTrigger, {
11 | updateData()
12 | })
13 |
14 | observe({
15 | data <- data_atDate(input$timeSlider)
16 | })
17 | }
--------------------------------------------------------------------------------
/rsconnect/shinyapps.io/covidstats/COVID-19-Statistical-Analysis-Simulator-master.dcf:
--------------------------------------------------------------------------------
1 | name: COVID-19-Statistical-Analysis-Simulator-master
2 | title: COVID-19-Statistical-Analysis-Simulator-master
3 | username:
4 | account: covidstats
5 | server: shinyapps.io
6 | hostUrl: https://api.shinyapps.io/v1
7 | appId: 2528294
8 | bundleId: 3342261
9 | url: https://covidstats.shinyapps.io/COVID-19-Statistical-Analysis-Simulator-master/
10 | when: 1593671092.15177
11 | asMultiple: FALSE
12 | asStatic: FALSE
13 |
--------------------------------------------------------------------------------
/LICENSE:
--------------------------------------------------------------------------------
1 | MIT License
2 |
3 | Copyright (c) 2020 Stuti Mittra
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 | # COVIDstats --
2 | 🤓**COVID-19 Statistical Analysis Simulator App using R**
3 |
4 | This dashboard demonstrates some recent news and the related statistics about the Coronavirus pandemic. This App is a simulator, that reads from the John Hopkins dataset, and shows some data related to confirmed cases, deceased and recovered cases
5 |
6 | ## ✔Import libraries --
7 | 1. shiny
8 | 2. shinydashboard
9 | 3. tidyverse
10 | 4. leaflet
11 | 5. plotly
12 | 6. DT
13 | 7. fs
14 | 8. wbstats
15 |
16 | ## ✨Inspiration --
17 | https://coronavirus.jhu.edu/map.html John Hopkins University covid-19 webapp
18 |
19 | ## Dataset --
20 | https://github.com/CSSEGISandData/COVID-19 .
21 |
22 | ## **COVIDstats** made with ❤ by me--
23 |
24 | https://covidstats.shinyapps.io/COVID-19-Statistical-Analysis-Simulator-master/
25 |
26 |
27 | ## 🚀 Deployment --
28 |
29 | - publish your app on Rstudio
30 | - create an account on https://www.shinyapps.io/
31 | - give a name to your app
32 | - use your rsconnect secret key access on the publish segment in Rstudio
33 | - proceed to deploy
34 |
35 |
36 | 
37 |
38 |
39 |
40 | and it's done... Explore R and create beautiful dashboards and deploy them using shinyapps.io
41 |
42 | Cheerio 🙋♀️.
43 |
44 |
45 |
46 |
47 |
--------------------------------------------------------------------------------
/utils.R:
--------------------------------------------------------------------------------
1 |
2 |
3 | ## YOU DELETED SOMETHING HERE
4 | capFirst <- function(x) {
5 | s <- strsplit(x, " ")[[1]]
6 | paste(toupper(substring(s, 1, 1)), substring(s, 2),
7 | sep = "", collapse = " ")
8 | }
9 |
10 |
11 |
12 |
13 |
14 |
15 |
16 |
17 | # This function helps to source multiple files which are in the same directory. Just provide it with a path and all .R files in the directory it is
18 | # pointed to will be sourced. Can be done recursively or not.
19 | sourceDirectory <- function(path, recursive = FALSE, local = TRUE) {
20 | if (!dir.exists(path)) {
21 | warning(paste(path, "is not a valid directory!"))
22 | return(NULL)
23 | }
24 |
25 | # Source it where function is called (local)
26 | if (is.logical(local) && local) { env <- parent.frame() }
27 | # Source it in global environment
28 | else if (is.logical(local) && !local) { env <- globalenv() }
29 | # Source it in defined environment
30 | else if (is.environment(local)) { env <- local }
31 | else { stop("'local' must be TRUE, FALSE or an environment") }
32 |
33 | files <- list.files(path = path, pattern = ".*\\.R", all.files = F, full.names = TRUE, recursive = recursive)
34 | for (fileToSource in files) {
35 | tryCatch(
36 | {
37 | source(fileToSource, local = env)
38 | cat(fileToSource, "sourced.\n")
39 | },
40 |
41 | error = function(cond) {
42 | message("Loading of file \"", fileToSource, "\" failed.")
43 | message(cond)
44 | }
45 |
46 | )
47 | }
48 | }
49 |
--------------------------------------------------------------------------------
/covid 19 data.py:
--------------------------------------------------------------------------------
1 | import xlwt, os
2 | import requests
3 | from bs4 import BeautifulSoup
4 | from xlwt import Workbook
5 | import pandas
6 |
7 | url = 'https://www.worldometers.info/coronavirus/countries-where-coronavirus-has-spread/'
8 | page = requests.get(url)
9 | soup = BeautifulSoup(page.text, 'html5lib')
10 | data_iterator = soup.findAll('tr')
11 |
12 | # print(soup.prettify())
13 |
14 | wb = Workbook()
15 | file = 'covid 19 data.xls'
16 | sheet1 = wb.add_sheet('covid')
17 |
18 | l = []
19 | for i in range(4):
20 | l.append(data_iterator[0].findAll('span')[i].text)
21 |
22 | for i in range(4):
23 | sheet1.write(0, i, l[i])
24 |
25 | for i in range(1, int(len(soup.findAll('td'))/4)):
26 | for j in range(4):
27 | put = data_iterator[i+1].find_all('td')[j]
28 | # print(f'{l[j%4]} : {put.text}')
29 | sheet1.write(i, j, put.text)
30 | # print()
31 |
32 | wb.save(file)
33 | # os.startfile(file)
34 |
35 | df = pandas.read_excel(file)
36 | print(df)
37 |
38 |
39 | # =================================================
40 | # Output :
41 |
42 | # Country Number of cases Deaths Continent
43 | # 0 India 8,684,039 128,165 Asia
44 | # 1 Brazil 5,749,007 163,406 South America
45 | # 2 France 1,865,538 42,535 Europe
46 | # 3 Russia 1,836,960 31,593 Europe
47 | # 4 Spain 1,463,093 40,105 Europe
48 | # ... ... ... ... ...
49 | # 212 MS Zaandam 9 2 NaN
50 | # 213 Anguilla 3 0 North America
51 | # 214 Vanuatu 1 0 Australia/Oceania
52 | # 215 Marshall Islands 1 0 Australia/Oceania
53 | # 216 Wallis & Futuna 1 0 Australia/Oceania
54 |
55 | # 217 rows × 4 columns
56 |
--------------------------------------------------------------------------------
/UI/ui_fullTable.R:
--------------------------------------------------------------------------------
1 | body_fullTable <- dashboardBody(
2 | tags$head(
3 | tags$style(type = "text/css", "@media (min-width: 768px) { .full-table { margin-top: -30px; } }")
4 | ),
5 | fluidPage(
6 | fluidRow(
7 | h3(paste0("Complete Table (", strftime(current_date, format = "%d.%m.%Y"), ")"),
8 | class = "box-title", style = "margin-top: 10px; font-size: 18px;"),
9 | div(
10 | dataTableOutput("fullTable"),
11 | class = "full-table"
12 | ),
13 | div(
14 | tags$h5("Growth Rate Coloring", style = "margin-left: 10px;"),
15 | tags$ul(class = "legend",
16 | tags$li(tags$span(class = "pos1"), " 0 % to 10 %"),
17 | tags$li(tags$span(class = "pos2"), "10 % to 20 %"),
18 | tags$li(tags$span(class = "pos3"), "20 % to 33 %"),
19 | tags$li(tags$span(class = "pos4"), "33 % to 50 %"),
20 | tags$li(tags$span(class = "pos5"), "50 % to 75 %"),
21 | tags$li(tags$span(class = "pos6"), "> 75 %"),
22 | tags$br()
23 | ),
24 | tags$ul(class = "legend",
25 | tags$li(tags$span(class = "neg1"), " 0 % to 10 %"),
26 | tags$li(tags$span(class = "neg2"), "10 % to 20 %"),
27 | tags$li(tags$span(class = "neg3"), "20 % to 33 %"),
28 | tags$li(tags$span(class = "neg4"), "> 33 %")
29 | )
30 | ),
31 | width = 12
32 | )
33 | )
34 | )
35 |
36 | page_fullTable <- dashboardPage(
37 | title = "Full Table",
38 | header = dashboardHeader(disable = TRUE),
39 | sidebar = dashboardSidebar(disable = TRUE),
40 | body = body_fullTable
41 | )
42 |
--------------------------------------------------------------------------------
/ui.R:
--------------------------------------------------------------------------------
1 | source("UI/ui_overview.R", local = TRUE)
2 | source("UI/ui_plots.R", local = TRUE)
3 | source("UI/ui_about.R", local = TRUE)
4 | source("UI/ui_fullTable.R", local = TRUE)
5 |
6 | ui <- fluidPage(
7 | title = "COVID-19 Global Cases",
8 | tags$head(
9 | tags$link(rel = "shortcut icon", type = "image/png", href = "logo.png")
10 | ),
11 | tags$style(type = "text/css", ".container-fluid {padding-left: 0px; padding-right: 0px !important;}"),
12 | tags$style(type = "text/css", ".navbar {margin-bottom: 0px;}"),
13 | tags$style(type = "text/css", ".content {padding: 0px;}"),
14 | tags$style(type = "text/css", ".row {margin-left: 0px; margin-right: 0px;}"),
15 | tags$style(HTML(".col-sm-12 { padding: 5px; margin-bottom: -15px; }")),
16 | tags$style(HTML(".col-sm-6 { padding: 5px; margin-bottom: -15px; }")),
17 | navbarPage(
18 | title = div("COVID-19 Statistical Analysis Simulator App", style = "padding-left: 10px"),
19 | inverse = TRUE,
20 | collapsible = TRUE,
21 | fluid = TRUE,
22 | tabPanel("Overview", page_overview, value = "page-overview"),
23 | tabPanel("Table", page_fullTable, value = "page-fullTable"),
24 | tabPanel("Plots", page_plots, value = "page-plots"),
25 | tabPanel("About", page_about, value = "page-about"),
26 | tags$script(HTML("var header = $('.navbar > .container-fluid');
27 | header.append('
');
28 | console.log(header)")
29 | )
30 | )
31 | )
--------------------------------------------------------------------------------
/UI/ui_overview.R:
--------------------------------------------------------------------------------
1 | body_overview <- dashboardBody(
2 | tags$head(
3 | tags$style(type = "text/css", "#overview_map {height: 48vh !important;}"),
4 | tags$style(type = 'text/css', ".slider-animate-button { font-size: 20pt !important; }"),
5 | tags$style(type = 'text/css', ".slider-animate-container { text-align: left !important; }"),
6 | tags$style(type = "text/css", "@media (max-width: 991px) { .details { display: flex; flex-direction: column; } }"),
7 | tags$style(type = "text/css", "@media (max-width: 991px) { .details .map { order: 1; width: 100%; } }"),
8 | tags$style(type = "text/css", "@media (max-width: 991px) { .details .summary { order: 3; width: 100%; } }"),
9 | tags$style(type = "text/css", "@media (max-width: 991px) { .details .slider { order: 2; width: 100%; } }")
10 | ),
11 | fluidRow(
12 | fluidRow(
13 | uiOutput("box_keyFigures")
14 | ),
15 | fluidRow(
16 | class = "details",
17 | column(
18 | box(
19 | width = 12,
20 | leafletOutput("overview_map")
21 | ),
22 | class = "map",
23 | width = 8,
24 | style = 'padding:0px;'
25 | ),
26 | column(
27 | uiOutput("summaryTables"),
28 | class = "summary",
29 | width = 4,
30 | style = 'padding:0px;'
31 | ),
32 | column(
33 | sliderInput(
34 | "timeSlider",
35 | label = "Select date",
36 | min = min(data_evolution$date),
37 | max = max(data_evolution$date),
38 | value = max(data_evolution$date),
39 | width = "100%",
40 | timeFormat = "%d.%m.%Y",
41 | animate = animationOptions(loop = TRUE)
42 | ),
43 | class = "slider",
44 | width = 12
45 | )
46 | )
47 | )
48 | )
49 |
50 | page_overview <- dashboardPage(
51 | title = "Overview",
52 | header = dashboardHeader(disable = TRUE),
53 | sidebar = dashboardSidebar(disable = TRUE),
54 | body = body_overview
55 | )
--------------------------------------------------------------------------------
/UI/ui_about.R:
--------------------------------------------------------------------------------
1 | body_about <- dashboardBody(
2 | fluidRow(
3 | fluidRow(
4 | column(
5 | box(
6 | title = div("About this project", style = "padding-left: 20px", class = "h2"),
7 | column(
8 | h3("The COVIDstats"),
9 | "The COVIDstats dashboard demonstrates some recent news about the Coronavirus pandemic.
10 | This App is a simulator, that reads from the John Hopkins dataset, and shows some data related to death rate,
11 | recovery, affected etc.",
12 | tags$br(),
13 | h3("COVID-19 Social Distancing"),
14 | "Please stay safe and respect social distancing, which can be tough on people and could disrupt the social and economic loop of life.C",
15 | tags$br(),
16 | h3("Disclaimer"),
17 | "This App is for educational purposes only. Opinions or points of view expressed in this App represent the view of the
18 | creator only, that relies on public data from the John Hopkins, WHITING SCHOOL OF ENGINEERING, CENTER FOR SYSTEMS SCIENCE AND ENGINEERING.
19 | Nothing in this App constitutes legal advice.",
20 | tags$br(),
21 | h3("Creator"),
22 | "Made with ❤ by Stuti Mittra",
23 | tags$br(),
24 | tags$a(href = "https://www.linkedin.com/in/stuti-mittra-577160162/", "LinkedIn"), " | ",
25 | tags$a(href = "https://github.com/stuti24m", "GitHub"), " | ",
26 | tags$a(href = "https://www.hackerrank.com/stuti24m", "HackerRank"), " | ",
27 | tags$a(href = "https://www.quora.com/profile/Stuti-Mittra", "Quora"),
28 | width = 12
29 | ),
30 | width = 6,
31 | ),
32 | width = 12,
33 | style = "padding: 15px"
34 | )
35 | )
36 | )
37 | )
38 |
39 |
40 | page_about <- dashboardPage(
41 | title = "About",
42 | header = dashboardHeader(disable = TRUE),
43 | sidebar = dashboardSidebar(disable = TRUE),
44 | body = body_about
45 | )
46 |
--------------------------------------------------------------------------------
/sections/content_overview/keyFigures.R:
--------------------------------------------------------------------------------
1 | sumData <- function(date) {
2 | if (date >= min(data_evolution$date)) {
3 | data <- data_atDate(date) %>% summarise(
4 | confirmed = sum(confirmed, na.rm = T),
5 | recovered = sum(recovered, na.rm = T),
6 | deceased = sum(deceased, na.rm = T),
7 | countries = n_distinct(`Country/Region`)
8 | )
9 | return(data)
10 | }
11 | return(NULL)
12 | }
13 |
14 | key_figures <- reactive({
15 | data <- sumData(input$timeSlider)
16 | data_yesterday <- sumData(input$timeSlider - 1)
17 |
18 | data_new <- list(
19 | new_confirmed = (data$confirmed - data_yesterday$confirmed) / data_yesterday$confirmed * 100,
20 | new_recovered = (data$recovered - data_yesterday$recovered) / data_yesterday$recovered * 100,
21 | new_deceased = (data$deceased - data_yesterday$deceased) / data_yesterday$deceased * 100,
22 | new_countries = data$countries - data_yesterday$countries
23 | )
24 |
25 | keyFigures <- list(
26 | "confirmed" = HTML(paste(format(data$confirmed, big.mark = " "), sprintf("(%+.1f %%)
", data_new$new_confirmed))),
27 | "recovered" = HTML(paste(format(data$recovered, big.mark = " "), sprintf("(%+.1f %%)
", data_new$new_recovered))),
28 | "deceased" = HTML(paste(format(data$deceased, big.mark = " "), sprintf("(%+.1f %%)
", data_new$new_deceased))),
29 | "countries" = HTML(paste(format(data$countries, big.mark = " "), "/ 195", sprintf("(%+d)
", data_new$new_countries)))
30 | )
31 | return(keyFigures)
32 | })
33 |
34 | output$valueBox_confirmed <- renderValueBox({
35 | valueBox(
36 | key_figures()$confirmed,
37 | subtitle = "Confirmed",
38 | icon = icon("file-medical"),
39 | color = "yellow",
40 | width = NULL
41 | )
42 | })
43 |
44 |
45 | output$valueBox_recovered <- renderValueBox({
46 | valueBox(
47 | key_figures()$recovered,
48 | subtitle = "Estimated Recoveries",
49 | icon = icon("heart"),
50 | color = "yellow"
51 | )
52 | })
53 |
54 | output$valueBox_deceased <- renderValueBox({
55 | valueBox(
56 | key_figures()$deceased,
57 | subtitle = "Deceased",
58 | icon = icon("heartbeat"),
59 | color = "yellow"
60 | )
61 | })
62 |
63 | output$valueBox_countries <- renderValueBox({
64 | valueBox(
65 | key_figures()$countries,
66 | subtitle = "Affected Countries",
67 | icon = icon("flag"),
68 | color = "yellow"
69 | )
70 | })
71 |
72 | output$box_keyFigures <- renderUI(box(
73 | title = paste0("Key Figures (", strftime(input$timeSlider, format = "%d.%m.%Y"), ")"),
74 | fluidRow(
75 | column(
76 | valueBoxOutput("valueBox_confirmed", width = 3),
77 | valueBoxOutput("valueBox_recovered", width = 3),
78 | valueBoxOutput("valueBox_deceased", width = 3),
79 | valueBoxOutput("valueBox_countries", width = 3),
80 | width = 12,
81 | style = "margin-left: -20px"
82 | )
83 | ),
84 | div("Last updated: ", strftime(changed_date, format = "%d.%m.%Y - %R %Z")),
85 | width = 12
86 | ))
--------------------------------------------------------------------------------
/sections/content_overview/summary_table.R:
--------------------------------------------------------------------------------
1 | output$summaryTables <- renderUI({
2 | tabBox(
3 | tabPanel("Country/Region",
4 | div(
5 | dataTableOutput("summaryDT_country"),
6 | style = "margin-top: -10px")
7 | ),
8 | tabPanel("Province/State",
9 | div(
10 | dataTableOutput("summaryDT_state"),
11 | style = "margin-top: -10px"
12 | )
13 | ),
14 | width = 12
15 | )
16 | })
17 |
18 | output$summaryDT_country <- renderDataTable(getSummaryDT(data_atDate(current_date), "Country/Region", selectable = TRUE))
19 | proxy_summaryDT_country <- dataTableProxy("summaryDT_country")
20 | output$summaryDT_state <- renderDataTable(getSummaryDT(data_atDate(current_date), "Province/State", selectable = TRUE))
21 | proxy_summaryDT_state <- dataTableProxy("summaryDT_state")
22 |
23 | observeEvent(input$timeSlider, {
24 | data <- data_atDate(input$timeSlider)
25 | replaceData(proxy_summaryDT_country, summariseData(data, "Country/Region"), rownames = FALSE)
26 | replaceData(proxy_summaryDT_state, summariseData(data, "Province/State"), rownames = FALSE)
27 | }, ignoreInit = TRUE, ignoreNULL = TRUE)
28 |
29 | observeEvent(input$summaryDT_country_row_last_clicked, {
30 | selectedRow <- input$summaryDT_country_row_last_clicked
31 | selectedCountry <- summariseData(data_atDate(input$timeSlider), "Country/Region")[selectedRow, "Country/Region"]
32 | location <- data_evolution %>%
33 | distinct(`Country/Region`, Lat, Long) %>%
34 | filter(`Country/Region` == selectedCountry) %>%
35 | summarise(
36 | Lat = mean(Lat),
37 | Long = mean(Long)
38 | )
39 | leafletProxy("overview_map") %>%
40 | setView(lng = location$Long, lat = location$Lat, zoom = 4)
41 | })
42 |
43 | observeEvent(input$summaryDT_state_row_last_clicked, {
44 | selectedRow <- input$summaryDT_state_row_last_clicked
45 | selectedCountry <- summariseData(data_atDate(input$timeSlider), "Province/State")[selectedRow, "Province/State"]
46 | location <- data_evolution %>%
47 | distinct(`Province/State`, Lat, Long) %>%
48 | filter(`Province/State` == selectedCountry) %>%
49 | summarise(
50 | Lat = mean(Lat),
51 | Long = mean(Long)
52 | )
53 | leafletProxy("overview_map") %>%
54 | setView(lng = location$Long, lat = location$Lat, zoom = 4)
55 | })
56 |
57 | summariseData <- function(df, groupBy) {
58 | df %>%
59 | group_by(!!sym(groupBy)) %>%
60 | summarise(
61 | "Confirmed" = sum(confirmed, na.rm = T),
62 | "Estimated Recoveries" = sum(recovered, na.rm = T),
63 | "Deceased" = sum(deceased, na.rm = T),
64 | "Active" = sum(active, na.rm = T)
65 | ) %>%
66 | as.data.frame()
67 | }
68 |
69 | getSummaryDT <- function(data, groupBy, selectable = FALSE) {
70 | datatable(
71 | na.omit(summariseData(data, groupBy)),
72 | rownames = FALSE,
73 | options = list(
74 | order = list(1, "desc"),
75 | scrollX = TRUE,
76 | scrollY = "37vh",
77 | scrollCollapse = T,
78 | dom = 'ft',
79 | paging = FALSE
80 | ),
81 | selection = ifelse(selectable, "single", "none")
82 | )
83 | }
--------------------------------------------------------------------------------
/sections/content_overview/map.R:
--------------------------------------------------------------------------------
1 | library("htmltools")
2 |
3 | addLabel <- function(data) {
4 | data$label <- paste0(
5 | '', ifelse(is.na(data$`Province/State`), data$`Country/Region`, data$`Province/State`), '
6 |
7 | | Confirmed: | ', data$confirmed, ' |
8 | | Deceased: | ', data$deceased, ' |
9 | | Estimated Recoveries: | ', data$recovered, ' |
10 | | Active: | ', data$active, ' |
11 |
'
12 | )
13 | data$label <- lapply(data$label, HTML)
14 |
15 | return(data)
16 | }
17 |
18 | map <- leaflet(addLabel(data_latest)) %>%
19 | setMaxBounds(-180, -90, 180, 90) %>%
20 | setView(0, 20, zoom = 2) %>%
21 | addTiles() %>%
22 | addProviderTiles(providers$CartoDB.Positron, group = "Light") %>%
23 | addProviderTiles(providers$HERE.satelliteDay, group = "Satellite") %>%
24 | addLayersControl(
25 | baseGroups = c("Light", "Satellite"),
26 | overlayGroups = c("Confirmed", "Confirmed (per capita)", "Estimated Recoveries", "Deceased", "Active", "Active (per capita)")
27 | ) %>%
28 | hideGroup("Confirmed (per capita)") %>%
29 | hideGroup("Estimated Recoveries") %>%
30 | hideGroup("Deceased") %>%
31 | hideGroup("Active") %>%
32 | hideGroup("Active (per capita)") %>%
33 | addEasyButton(easyButton(
34 | icon = "glyphicon glyphicon-globe", title = "Reset zoom",
35 | onClick = JS("function(btn, map){ map.setView([20, 0], 2); }"))) %>%
36 | addEasyButton(easyButton(
37 | icon = "glyphicon glyphicon-map-marker", title = "Locate Me",
38 | onClick = JS("function(btn, map){ map.locate({setView: true, maxZoom: 6}); }")))
39 |
40 | observe({
41 | req(input$timeSlider, input$overview_map_zoom)
42 | zoomLevel <- input$overview_map_zoom
43 | data <- data_atDate(input$timeSlider) %>% addLabel()
44 | data$confirmedPerCapita <- data$confirmed / data$population * 100000
45 | data$activePerCapita <- data$active / data$population * 100000
46 |
47 | leafletProxy("overview_map", data = data) %>%
48 | clearMarkers() %>%
49 | addCircleMarkers(
50 | lng = ~Long,
51 | lat = ~Lat,
52 | radius = ~log(confirmed^(zoomLevel / 2)),
53 | stroke = FALSE,
54 | fillOpacity = 0.5,
55 | label = ~label,
56 | labelOptions = labelOptions(textsize = 15),
57 | group = "Confirmed"
58 | ) %>%
59 | addCircleMarkers(
60 | lng = ~Long,
61 | lat = ~Lat,
62 | radius = ~log(confirmedPerCapita^(zoomLevel)),
63 | stroke = FALSE,
64 | color = "#00b3ff",
65 | fillOpacity = 0.5,
66 | label = ~label,
67 | labelOptions = labelOptions(textsize = 15),
68 | group = "Confirmed (per capita)"
69 | ) %>%
70 | addCircleMarkers(
71 | lng = ~Long,
72 | lat = ~Lat,
73 | radius = ~log(recovered^(zoomLevel)),
74 | stroke = FALSE,
75 | color = "#000000",
76 | fillOpacity = 0.5,
77 | label = ~label,
78 | labelOptions = labelOptions(textsize = 15),
79 | group = "Estimated Recoveries"
80 | ) %>%
81 | addCircleMarkers(
82 | lng = ~Long,
83 | lat = ~Lat,
84 | radius = ~log(deceased^(zoomLevel)),
85 | stroke = FALSE,
86 | color = "#EEEEEE",
87 | fillOpacity = 0.5,
88 | label = ~label,
89 | labelOptions = labelOptions(textsize = 15),
90 | group = "Deceased"
91 | ) %>%
92 | addCircleMarkers(
93 | lng = ~Long,
94 | lat = ~Lat,
95 | radius = ~log(active^(zoomLevel / 2)),
96 | stroke = FALSE,
97 | color = "#000000",
98 | fillOpacity = 0.5,
99 | label = ~label,
100 | labelOptions = labelOptions(textsize = 15),
101 | group = "Active"
102 | ) %>%
103 | addCircleMarkers(
104 | lng = ~Long,
105 | lat = ~Lat,
106 | radius = ~log(activePerCapita^(zoomLevel)),
107 | stroke = FALSE,
108 | color = "#EEEEEE",
109 | fillOpacity = 0.5,
110 | label = ~label,
111 | labelOptions = labelOptions(textsize = 15),
112 | group = "Active (per capita)"
113 | )
114 | })
115 |
116 | output$overview_map <- renderLeaflet(map)
117 |
118 |
119 |
--------------------------------------------------------------------------------
/sections/fullTable.R:
--------------------------------------------------------------------------------
1 | getFullTableData <- function(groupBy) {
2 | padding_left <- max(str_length(data_evolution$value_new), na.rm = TRUE)
3 | data <- data_evolution %>%
4 | filter(date == current_date) %>%
5 | pivot_wider(names_from = var, values_from = c(value, value_new)) %>%
6 | select(-date, -Lat, -Long) %>%
7 | add_row(
8 | "Province/State" = "World",
9 | "Country/Region" = "World",
10 | "population" = 7800000000,
11 | "value_confirmed" = sum(.$value_confirmed, na.rm = T),
12 | "value_new_confirmed" = sum(.$value_new_confirmed, na.rm = T),
13 | "value_recovered" = sum(.$value_recovered, na.rm = T),
14 | "value_new_recovered" = sum(.$value_new_recovered, na.rm = T),
15 | "value_deceased" = sum(.$value_deceased, na.rm = T),
16 | "value_new_deceased" = sum(.$value_new_deceased, na.rm = T),
17 | "value_active" = sum(.$value_active, na.rm = T),
18 | "value_new_active" = sum(.$value_new_active, na.rm = T)
19 | ) %>%
20 | group_by(!!sym(groupBy), population) %>%
21 | summarise(
22 | confirmed_total = sum(value_confirmed, na.rm = T),
23 | confirmed_new = sum(value_new_confirmed, na.rm = T),
24 | confirmed_totalNorm = round(sum(value_confirmed, na.rm = T) / max(population, na.rm = T) * 100000, 2),
25 | recovered_total = sum(value_recovered, na.rm = T),
26 | recovered_new = sum(value_new_recovered, na.rm = T),
27 | deceased_total = sum(value_deceased, na.rm = T),
28 | deceased_new = sum(value_new_deceased, na.rm = T),
29 | active_total = sum(value_active, na.rm = T),
30 | active_new = sum(value_new_active, na.rm = T),
31 | active_totalNorm = round(sum(value_active, na.rm = T) / max(population, na.rm = T) * 100000, 2)
32 | ) %>%
33 | mutate(
34 | "confirmed_newPer" = confirmed_new / (confirmed_total - confirmed_new) * 100,
35 | "recovered_newPer" = recovered_new / (recovered_total - recovered_new) * 100,
36 | "deceased_newPer" = deceased_new / (deceased_total - deceased_new) * 100,
37 | "active_newPer" = active_new / (active_total - active_new) * 100
38 | ) %>%
39 | mutate_at(vars(contains('_newPer')), list(~na_if(., Inf))) %>%
40 | mutate_at(vars(contains('_newPer')), list(~na_if(., 0))) %>%
41 | mutate(
42 | confirmed_new = str_c(str_pad(confirmed_new, width = padding_left, side = "left", pad = "0"), "|",
43 | confirmed_new, if_else(!is.na(confirmed_newPer), sprintf(" (%+.2f %%)", confirmed_newPer), "")),
44 | recovered_new = str_c(str_pad(recovered_new, width = padding_left, side = "left", pad = "0"), "|",
45 | recovered_new, if_else(!is.na(recovered_newPer), sprintf(" (%+.2f %%)", recovered_newPer), "")),
46 | deceased_new = str_c(str_pad(deceased_new, width = padding_left, side = "left", pad = "0"), "|",
47 | deceased_new, if_else(!is.na(deceased_newPer), sprintf(" (%+.2f %%)", deceased_newPer), "")),
48 | active_new = str_c(str_pad(active_new, width = padding_left, side = "left", pad = "0"), "|",
49 | active_new, if_else(!is.na(active_newPer), sprintf(" (%+.2f %%)", active_newPer), ""))
50 | ) %>%
51 | select(-population) %>%
52 | as.data.frame()
53 | }
54 |
55 | output$fullTable <- renderDataTable({
56 | data <- getFullTableData("Country/Region")
57 | columNames <- c(
58 | "Country",
59 | "Total Confirmed",
60 | "New Confirmed",
61 | "Total Confirmed
(per 100k)",
62 | "Total Estimated Recoveries",
63 | "New Estimated Recoveries",
64 | "Total Deceased",
65 | "New Deceased",
66 | "Total Active",
67 | "New Active",
68 | "Total Active
(per 100k)")
69 | datatable(
70 | data,
71 | rownames = FALSE,
72 | colnames = columNames,
73 | escape = FALSE,
74 | selection = "none",
75 | options = list(
76 | pageLength = -1,
77 | order = list(8, "desc"),
78 | scrollX = TRUE,
79 | scrollY = "calc(100vh - 250px)",
80 | scrollCollapse = TRUE,
81 | dom = "ft",
82 | server = FALSE,
83 | columnDefs = list(
84 | list(
85 | targets = c(2, 5, 7, 9),
86 | render = JS(
87 | "function(data, type, row, meta) {
88 | if (data != null) {
89 | split = data.split('|')
90 | if (type == 'display') {
91 | return split[1];
92 | } else {
93 | return split[0];
94 | }
95 | }
96 | }"
97 | )
98 | ),
99 | list(className = 'dt-right', targets = 1:ncol(data) - 1),
100 | list(width = '100px', targets = 0),
101 | list(visible = FALSE, targets = 11:14)
102 | )
103 | )
104 | ) %>%
105 | formatStyle(
106 | columns = "Country/Region",
107 | fontWeight = "bold"
108 | ) %>%
109 | formatStyle(
110 | columns = "confirmed_new",
111 | valueColumns = "confirmed_newPer",
112 | backgroundColor = styleInterval(c(10, 20, 33, 50, 75), c("NULL", "#FFE5E5", "#FFB2B2", "#FF7F7F", "#FF4C4C", "#983232")),
113 | color = styleInterval(75, c("#000000", "#FFFFFF"))
114 | ) %>%
115 | formatStyle(
116 | columns = "deceased_new",
117 | valueColumns = "deceased_newPer",
118 | backgroundColor = styleInterval(c(10, 20, 33, 50, 75), c("NULL", "#FFE5E5", "#FFB2B2", "#FF7F7F", "#FF4C4C", "#983232")),
119 | color = styleInterval(75, c("#000000", "#FFFFFF"))
120 | ) %>%
121 | formatStyle(
122 | columns = "active_new",
123 | valueColumns = "active_newPer",
124 | backgroundColor = styleInterval(c(-33, -20, -10, 10, 20, 33, 50, 75), c("#66B066", "#99CA99", "#CCE4CC", "NULL", "#FFE5E5", "#FFB2B2", "#FF7F7F", "#FF4C4C", "#983232")),
125 | color = styleInterval(75, c("#000000", "#FFFFFF"))
126 | ) %>%
127 | formatStyle(
128 | columns = "recovered_new",
129 | valueColumns = "recovered_newPer",
130 | backgroundColor = styleInterval(c(10, 20, 33), c("NULL", "#CCE4CC", "#99CA99", "#66B066"))
131 | )
132 | })
--------------------------------------------------------------------------------
/global.R:
--------------------------------------------------------------------------------
1 | # ---- Loading libraries ----
2 | library("shiny")
3 | library("shinydashboard")
4 | library("tidyverse")
5 | library("leaflet")
6 | library("plotly")
7 | library("DT")
8 | library("fs")
9 | library("wbstats")
10 |
11 | source("utils.R", local = T)
12 |
13 | downloadGithubData <- function() {
14 | download.file(
15 | url = "https://github.com/CSSEGISandData/COVID-19/archive/master.zip",
16 | destfile = "data/covid19_data.zip"
17 | )
18 |
19 | data_path <- "COVID-19-master/csse_covid_19_data/csse_covid_19_time_series/time_series_covid19_"
20 | unzip(
21 | zipfile = "data/covid19_data.zip",
22 | files = paste0(data_path, c("confirmed_global.csv", "deaths_global.csv", "recovered_global.csv")),
23 | exdir = "data",
24 | junkpaths = T
25 | )
26 | }
27 |
28 |
29 | updateData <- function() {
30 | # Download data from Johns Hopkins (https://github.com/CSSEGISandData/COVID-19) if the data is older than 0.5h
31 | if (!dir_exists("data")) {
32 | dir.create('data')
33 | downloadGithubData()
34 | } else if ((!file.exists("data/covid19_data.zip")) || (as.double(Sys.time() - file_info("data/covid19_data.zip")$change_time, units = "hours") > 0.5)) {
35 | downloadGithubData()
36 | }
37 | }
38 |
39 | # Update with start of app
40 | updateData()
41 |
42 | # TODO: Still throws a warning but works for now
43 | data_confirmed <- read_csv("data/time_series_covid19_confirmed_global.csv")
44 | data_deceased <- read_csv("data/time_series_covid19_deaths_global.csv")
45 | # data_recovered <- read_csv("data/time_series_covid19_recovered_global.csv")
46 |
47 | # Get latest data
48 | current_date <- as.Date(names(data_confirmed)[ncol(data_confirmed)], format = "%m/%d/%y")
49 | changed_date <- file_info("data/covid19_data.zip")$change_time
50 |
51 | # Get evolution data by country
52 | data_confirmed_sub <- data_confirmed %>%
53 | pivot_longer(names_to = "date", cols = 5:ncol(data_confirmed)) %>%
54 | group_by(`Province/State`, `Country/Region`, date, Lat, Long) %>%
55 | summarise("confirmed" = sum(value, na.rm = T))
56 |
57 | # data_recovered_sub <- data_recovered %>%
58 | # pivot_longer(names_to = "date", cols = 5:ncol(data_recovered)) %>%
59 | # group_by(`Province/State`, `Country/Region`, date, Lat, Long) %>%
60 | # summarise("recovered" = sum(value, na.rm = T))
61 |
62 | data_deceased_sub <- data_deceased %>%
63 | pivot_longer(names_to = "date", cols = 5:ncol(data_deceased)) %>%
64 | group_by(`Province/State`, `Country/Region`, date, Lat, Long) %>%
65 | summarise("deceased" = sum(value, na.rm = T))
66 |
67 | data_evolution <- data_confirmed_sub %>%
68 | full_join(data_deceased_sub) %>%
69 | ungroup() %>%
70 | mutate(date = as.Date(date, "%m/%d/%y")) %>%
71 | arrange(date) %>%
72 | group_by(`Province/State`, `Country/Region`, Lat, Long) %>%
73 | mutate(
74 | recovered = lag(confirmed, 14, default = 0) - deceased,
75 | recovered = ifelse(recovered > 0, recovered, 0),
76 | active = confirmed - recovered - deceased
77 | ) %>%
78 | pivot_longer(names_to = "var", cols = c(confirmed, recovered, deceased, active)) %>%
79 | ungroup()
80 |
81 | # Calculating new cases
82 | data_evolution <- data_evolution %>%
83 | group_by(`Province/State`, `Country/Region`) %>%
84 | mutate(value_new = value - lag(value, 4, default = 0)) %>%
85 | ungroup()
86 |
87 | rm(data_confirmed, data_confirmed_sub, data_recovered, data_recovered_sub, data_deceased, data_deceased_sub)
88 |
89 |
90 |
91 |
92 |
93 |
94 |
95 |
96 |
97 |
98 |
99 |
100 |
101 |
102 |
103 |
104 |
105 |
106 |
107 |
108 |
109 |
110 |
111 |
112 |
113 |
114 |
115 |
116 |
117 |
118 |
119 | # ---- Download population data ----
120 | population <- wb(country = "countries_only", indicator = "SP.POP.TOTL", startdate = 2018, enddate = 2020) %>%
121 | select(country, value) %>%
122 | rename(population = value)
123 | countryNamesPop <- c("Brunei Darussalam", "Congo, Dem. Rep.", "Congo, Rep.", "Czech Republic",
124 | "Egypt, Arab Rep.", "Iran, Islamic Rep.", "Korea, Rep.", "St. Lucia", "West Bank and Gaza", "Russian Federation",
125 | "Slovak Republic", "United States", "St. Vincent and the Grenadines", "Venezuela, RB")
126 | countryNamesDat <- c("Brunei", "Congo (Kinshasa)", "Congo (Brazzaville)", "Czechia", "Egypt", "Iran", "Korea, South",
127 | "Saint Lucia", "occupied Palestinian territory", "Russia", "Slovakia", "US", "Saint Vincent and the Grenadines", "Venezuela")
128 | population[which(population$country %in% countryNamesPop), "country"] <- countryNamesDat
129 |
130 |
131 | # Data from wikipedia
132 | noDataCountries <- data.frame(
133 | country = c("Cruise Ship", "Guadeloupe", "Guernsey", "Holy See", "Jersey", "Martinique", "Reunion", "Taiwan*"),
134 | population = c(3700, 395700, 63026, 800, 106800, 376480, 859959, 23780452)
135 | )
136 | population <- bind_rows(population, noDataCountries)
137 |
138 | data_evolution <- data_evolution %>%
139 | left_join(population, by = c("Country/Region" = "country"))
140 | rm(population, countryNamesPop, countryNamesDat, noDataCountries)
141 |
142 | data_atDate <- function(inputDate) {
143 | data_evolution[which(data_evolution$date == inputDate),] %>%
144 | distinct() %>%
145 | pivot_wider(id_cols = c("Province/State", "Country/Region", "date", "Lat", "Long", "population"), names_from = var, values_from = value) %>%
146 | filter(confirmed > 0 |
147 | recovered > 0 |
148 | deceased > 0 |
149 | active > 0)
150 | }
151 |
152 | data_latest <- data_atDate(max(data_evolution$date))
153 |
154 | top5_countries <- data_evolution %>%
155 | filter(var == "active", date == current_date) %>%
156 | group_by(`Country/Region`) %>%
157 | summarise(value = sum(value, na.rm = T)) %>%
158 | arrange(desc(value)) %>%
159 | top_n(5) %>%
160 | select(`Country/Region`) %>%
161 | pull()
162 |
163 |
164 |
165 |
166 |
167 |
168 |
169 |
170 |
171 |
172 |
173 |
174 |
175 |
176 |
177 |
178 |
179 |
180 |
181 |
--------------------------------------------------------------------------------
/sections/content_plots/case_evolution.R:
--------------------------------------------------------------------------------
1 | output$case_evolution <- renderPlotly({
2 | data <- data_evolution %>%
3 | group_by(date, var) %>%
4 | summarise(
5 | "value" = sum(value, na.rm = T)
6 | ) %>%
7 | as.data.frame()
8 |
9 | p <- plot_ly(
10 | data,
11 | x = ~date,
12 | y = ~value,
13 | name = sapply(data$var, capFirst),
14 | color = ~var,
15 | type = 'scatter',
16 | mode = 'lines') %>%
17 | layout(
18 | yaxis = list(title = "# Cases"),
19 | xaxis = list(title = "Date")
20 | )
21 |
22 |
23 | if (input$checkbox_logCaseEvolution) {
24 | p <- layout(p, yaxis = list(type = "log"))
25 | }
26 |
27 | return(p)
28 | })
29 |
30 | output$selectize_casesByCountries <- renderUI({
31 | selectizeInput(
32 | "caseEvolution_country",
33 | label = "Select Countries",
34 | choices = unique(data_evolution$`Country/Region`),
35 | selected = top5_countries,
36 | multiple = TRUE
37 | )
38 | })
39 |
40 | getDataByCountry <- function(countries, normalizeByPopulation) {
41 | req(countries)
42 | data_confirmed <- data_evolution %>%
43 | select(`Country/Region`, date, var, value, population) %>%
44 | filter(`Country/Region` %in% countries &
45 | var == "confirmed" &
46 | value > 0) %>%
47 | group_by(`Country/Region`, date, population) %>%
48 | summarise("Confirmed" = sum(value, na.rm = T)) %>%
49 | arrange(date)
50 | if (nrow(data_confirmed) > 0) {
51 | data_confirmed <- data_confirmed %>%
52 | mutate(Confirmed = if_else(normalizeByPopulation, round(Confirmed / population * 100000, 2), Confirmed))
53 | }
54 | data_confirmed <- data_confirmed %>% as.data.frame()
55 |
56 | data_recovered <- data_evolution %>%
57 | select(`Country/Region`, date, var, value, population) %>%
58 | filter(`Country/Region` %in% countries &
59 | var == "recovered" &
60 | value > 0) %>%
61 | group_by(`Country/Region`, date, population) %>%
62 | summarise("Estimated Recoveries" = sum(value, na.rm = T)) %>%
63 | arrange(date)
64 | if (nrow(data_recovered) > 0) {
65 | data_recovered <- data_recovered %>%
66 | mutate(`Estimated Recoveries` = if_else(normalizeByPopulation, round(`Estimated Recoveries` / population * 100000, 2), `Estimated Recoveries`))
67 | }
68 | data_recovered <- data_recovered %>% as.data.frame()
69 |
70 | data_deceased <- data_evolution %>%
71 | select(`Country/Region`, date, var, value, population) %>%
72 | filter(`Country/Region` %in% countries &
73 | var == "deceased" &
74 | value > 0) %>%
75 | group_by(`Country/Region`, date, population) %>%
76 | summarise("Deceased" = sum(value, na.rm = T)) %>%
77 | arrange(date)
78 | if (nrow(data_deceased) > 0) {
79 | data_deceased <- data_deceased %>%
80 | mutate(Deceased = if_else(normalizeByPopulation, round(Deceased / population * 100000, 2), Deceased))
81 | }
82 | data_deceased <- data_deceased %>% as.data.frame()
83 |
84 | return(list(
85 | "confirmed" = data_confirmed,
86 | "recovered" = data_recovered,
87 | "deceased" = data_deceased
88 | ))
89 | }
90 |
91 | output$case_evolution_byCountry <- renderPlotly({
92 | data <- getDataByCountry(input$caseEvolution_country, input$checkbox_per100kEvolutionCountry)
93 |
94 | req(nrow(data$confirmed) > 0)
95 | p <- plot_ly(data = data$confirmed, x = ~date, y = ~Confirmed, color = ~`Country/Region`, type = 'scatter', mode = 'lines',
96 | legendgroup = ~`Country/Region`) %>%
97 | add_trace(data = data$recovered, x = ~date, y = ~`Estimated Recoveries`, color = ~`Country/Region`, line = list(dash = 'dash'),
98 | legendgroup = ~`Country/Region`, showlegend = FALSE) %>%
99 | add_trace(data = data$deceased, x = ~date, y = ~Deceased, color = ~`Country/Region`, line = list(dash = 'dot'),
100 | legendgroup = ~`Country/Region`, showlegend = FALSE) %>%
101 | add_trace(data = data$confirmed[which(data$confirmed$`Country/Region` == input$caseEvolution_country[1]),],
102 | x = ~date, y = -100, line = list(color = 'rgb(0, 0, 0)'), legendgroup = 'helper', name = "Confirmed") %>%
103 | add_trace(data = data$confirmed[which(data$confirmed$`Country/Region` == input$caseEvolution_country[1]),],
104 | x = ~date, y = -100, line = list(color = 'rgb(0, 0, 0)', dash = 'dash'), legendgroup = 'helper', name = "Estimated Recoveries") %>%
105 | add_trace(data = data$confirmed[which(data$confirmed$`Country/Region` == input$caseEvolution_country[1]),],
106 | x = ~date, y = -100, line = list(color = 'rgb(0, 0, 0)', dash = 'dot'), legendgroup = 'helper', name = "Deceased") %>%
107 | layout(
108 | yaxis = list(title = "# Cases", rangemode = "nonnegative"),
109 | xaxis = list(title = "Date")
110 | )
111 |
112 | if (input$checkbox_logCaseEvolutionCountry) {
113 | p <- layout(p, yaxis = list(type = "log"))
114 | }
115 | if (input$checkbox_per100kEvolutionCountry) {
116 | p <- layout(p, yaxis = list(title = "# Cases per 100k Inhabitants"))
117 | }
118 |
119 | return(p)
120 | })
121 |
122 | output$selectize_casesByCountries_new <- renderUI({
123 | selectizeInput(
124 | "selectize_casesByCountries_new",
125 | label = "Select Country",
126 | choices = c("All", unique(data_evolution$`Country/Region`)),
127 | selected = "All"
128 | )
129 | })
130 |
131 | output$case_evolution_new <- renderPlotly({
132 | req(input$selectize_casesByCountries_new)
133 | data <- data_evolution %>%
134 | mutate(var = sapply(var, capFirst)) %>%
135 | filter(if (input$selectize_casesByCountries_new == "All") TRUE else `Country/Region` %in% input$selectize_casesByCountries_new) %>%
136 | group_by(date, var, `Country/Region`) %>%
137 | summarise(new_cases = sum(value_new, na.rm = T))
138 |
139 | if (input$selectize_casesByCountries_new == "All") {
140 | data <- data %>%
141 | group_by(date, var) %>%
142 | summarise(new_cases = sum(new_cases, na.rm = T))
143 | }
144 |
145 | p <- plot_ly(data = data, x = ~date, y = ~new_cases, color = ~var, type = 'bar') %>%
146 | layout(
147 | yaxis = list(title = "# New Cases"),
148 | xaxis = list(title = "Date")
149 | )
150 | })
151 |
152 | output$selectize_casesByCountriesAfter100th <- renderUI({
153 | selectizeInput(
154 | "caseEvolution_countryAfter100th",
155 | label = "Select Countries",
156 | choices = unique(data_evolution$`Country/Region`),
157 | selected = top5_countries,
158 | multiple = TRUE
159 | )
160 | })
161 |
162 | output$selectize_casesSince100th <- renderUI({
163 | selectizeInput(
164 | "caseEvolution_var100th",
165 | label = "Select Variable",
166 | choices = list("Confirmed" = "confirmed", "Deceased" = "deceased"),
167 | multiple = FALSE
168 | )
169 | })
170 |
171 | output$case_evolution_after100 <- renderPlotly({
172 | req(!is.null(input$checkbox_per100kEvolutionCountry100th), input$caseEvolution_var100th)
173 | data <- data_evolution %>%
174 | arrange(date) %>%
175 | filter(if (input$caseEvolution_var100th == "confirmed") (value >= 100 & var == "confirmed") else (value >= 10 & var == "deceased")) %>%
176 | group_by(`Country/Region`, population, date) %>%
177 | filter(if (is.null(input$caseEvolution_countryAfter100th)) TRUE else `Country/Region` %in% input$caseEvolution_countryAfter100th) %>%
178 | summarise(value = sum(value, na.rm = T)) %>%
179 | mutate("daysSince" = row_number()) %>%
180 | ungroup()
181 |
182 | if (input$checkbox_per100kEvolutionCountry100th) {
183 | data$value <- data$value / data$population * 100000
184 | }
185 |
186 | p <- plot_ly(data = data, x = ~daysSince, y = ~value, color = ~`Country/Region`, type = 'scatter', mode = 'lines')
187 |
188 | if (input$caseEvolution_var100th == "confirmed") {
189 | p <- layout(p,
190 | yaxis = list(title = "# Confirmed cases"),
191 | xaxis = list(title = "# Days since 100th confirmed case")
192 | )
193 | } else {
194 | p <- layout(p,
195 | yaxis = list(title = "# Deceased cases"),
196 | xaxis = list(title = "# Days since 10th deceased case")
197 | )
198 | }
199 | if (input$checkbox_logCaseEvolution100th) {
200 | p <- layout(p, yaxis = list(type = "log"))
201 | }
202 | if (input$checkbox_per100kEvolutionCountry100th) {
203 | p <- layout(p, yaxis = list(title = "# Cases per 100k Inhabitants"))
204 | }
205 |
206 | return(p)
207 | })
208 |
209 | output$box_caseEvolution <- renderUI({
210 | tagList(
211 | fluidRow(
212 | box(
213 | title = "Evolution of Cases since Outbreak",
214 | plotlyOutput("case_evolution"),
215 | column(
216 | checkboxInput("checkbox_logCaseEvolution", label = "Logarithmic Y-Axis", value = FALSE),
217 | width = 3,
218 | style = "float: right; padding: 10px; margin-right: 50px"
219 | ),
220 | width = 6
221 | ),
222 | box(
223 | title = "New cases",
224 | plotlyOutput("case_evolution_new"),
225 | column(
226 | uiOutput("selectize_casesByCountries_new"),
227 | width = 3,
228 | ),
229 | column(
230 | HTML("Note: Active cases are calculated as Confirmed - (Estimated Recoveries + Deceased). Therefore, new active cases can
231 | be negative for some days, if on this day there were more new estimated recoveries + deceased cases than there were new
232 | confirmed cases."),
233 | width = 7
234 | ),
235 | width = 6
236 | )
237 | ),
238 | fluidRow(
239 | box(
240 | title = "Cases per Country",
241 | plotlyOutput("case_evolution_byCountry"),
242 | fluidRow(
243 | column(
244 | uiOutput("selectize_casesByCountries"),
245 | width = 3,
246 | ),
247 | column(
248 | checkboxInput("checkbox_logCaseEvolutionCountry", label = "Logarithmic Y-Axis", value = FALSE),
249 | checkboxInput("checkbox_per100kEvolutionCountry", label = "Per Population", value = FALSE),
250 | width = 3,
251 | style = "float: right; padding: 10px; margin-right: 50px"
252 | )
253 | ),
254 | width = 6
255 | ),
256 | box(
257 | title = "Evolution of Cases since 10th/100th case",
258 | plotlyOutput("case_evolution_after100"),
259 | fluidRow(
260 | column(
261 | uiOutput("selectize_casesByCountriesAfter100th"),
262 | width = 3,
263 | ),
264 | column(
265 | uiOutput("selectize_casesSince100th"),
266 | width = 3
267 | ),
268 | column(
269 | checkboxInput("checkbox_logCaseEvolution100th", label = "Logarithmic Y-Axis", value = FALSE),
270 | checkboxInput("checkbox_per100kEvolutionCountry100th", label = "Per Population", value = FALSE),
271 | width = 3,
272 | style = "float: right; padding: 10px; margin-right: 50px"
273 | )
274 | ),
275 | width = 6
276 | )
277 | )
278 | )
279 | })
--------------------------------------------------------------------------------
/data/time_series_covid19_deaths_global.csv:
--------------------------------------------------------------------------------
1 | Province/State,Country/Region,Lat,Long,1/22/20,1/23/20,1/24/20,1/25/20,1/26/20,1/27/20,1/28/20,1/29/20,1/30/20,1/31/20,2/1/20,2/2/20,2/3/20,2/4/20,2/5/20,2/6/20,2/7/20,2/8/20,2/9/20,2/10/20,2/11/20,2/12/20,2/13/20,2/14/20,2/15/20,2/16/20,2/17/20,2/18/20,2/19/20,2/20/20,2/21/20,2/22/20,2/23/20,2/24/20,2/25/20,2/26/20,2/27/20,2/28/20,2/29/20,3/1/20,3/2/20,3/3/20,3/4/20,3/5/20,3/6/20,3/7/20,3/8/20,3/9/20,3/10/20,3/11/20,3/12/20,3/13/20,3/14/20,3/15/20,3/16/20,3/17/20,3/18/20,3/19/20,3/20/20,3/21/20,3/22/20,3/23/20,3/24/20,3/25/20,3/26/20,3/27/20,3/28/20,3/29/20,3/30/20,3/31/20,4/1/20,4/2/20,4/3/20,4/4/20,4/5/20,4/6/20,4/7/20,4/8/20,4/9/20,4/10/20,4/11/20,4/12/20,4/13/20,4/14/20,4/15/20,4/16/20,4/17/20,4/18/20,4/19/20,4/20/20,4/21/20,4/22/20,4/23/20,4/24/20,4/25/20,4/26/20,4/27/20,4/28/20,4/29/20,4/30/20,5/1/20,5/2/20,5/3/20,5/4/20,5/5/20,5/6/20,5/7/20,5/8/20,5/9/20,5/10/20,5/11/20,5/12/20,5/13/20,5/14/20,5/15/20,5/16/20,5/17/20,5/18/20,5/19/20,5/20/20,5/21/20,5/22/20,5/23/20,5/24/20,5/25/20,5/26/20,5/27/20,5/28/20,5/29/20,5/30/20,5/31/20,6/1/20,6/2/20,6/3/20,6/4/20,6/5/20,6/6/20,6/7/20,6/8/20,6/9/20,6/10/20,6/11/20,6/12/20,6/13/20,6/14/20,6/15/20,6/16/20,6/17/20,6/18/20,6/19/20,6/20/20,6/21/20,6/22/20,6/23/20,6/24/20,6/25/20,6/26/20,6/27/20,6/28/20,6/29/20,6/30/20,7/1/20
2 | ,Afghanistan,33.0,65.0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,4,4,4,4,4,4,4,6,6,7,7,11,14,14,15,15,18,18,21,23,25,30,30,30,33,36,36,40,42,43,47,50,57,58,60,64,68,72,85,90,95,104,106,109,115,120,122,127,132,136,153,168,169,173,178,187,193,205,216,218,219,220,227,235,246,249,257,265,270,294,300,309,327,357,369,384,405,426,446,451,471,478,491,504,546,548,569,581,598,618,639,675,683,703,721,733,746,774
3 | ,Albania,41.1533,20.1683,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,2,2,2,2,2,4,5,5,6,8,10,10,11,15,15,16,17,20,20,21,22,22,23,23,23,23,23,24,25,26,26,26,26,26,26,27,27,27,27,28,28,30,30,31,31,31,31,31,31,31,31,31,31,31,31,31,31,31,31,31,31,31,31,31,31,31,31,32,32,33,33,33,33,33,33,33,33,33,33,33,34,34,34,34,34,35,36,36,36,36,37,38,39,42,43,44,44,45,47,49,51,53,55,58,62,65
4 | ,Algeria,28.0339,1.6596,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,4,4,4,7,9,11,15,17,17,19,21,25,26,29,31,35,44,58,86,105,130,152,173,193,205,235,256,275,293,313,326,336,348,364,367,375,384,392,402,407,415,419,425,432,437,444,450,453,459,463,465,470,476,483,488,494,502,507,515,522,529,536,542,548,555,561,568,575,582,592,600,609,617,623,630,638,646,653,661,667,673,681,690,698,707,715,724,732,741,751,760,767,777,788,799,811,825,837,845,852,861,869,878,885,892,897,905,912,920
5 | ,Andorra,42.5063,1.5218,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,3,3,3,6,8,12,14,15,16,17,18,21,22,23,25,26,26,29,29,31,33,33,35,35,36,37,37,37,37,40,40,40,40,41,42,42,43,44,45,45,46,46,47,47,48,48,48,48,49,49,49,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,51,52,52,52,52,52,52,52,52,52,52,52,52,52,52,52,52
6 | ,Angola,-11.2027,17.8739,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,5,5,6,6,6,6,7,8,8,9,9,10,10,10,10,10,10,11,11,13,15
7 | ,Antigua and Barbuda,17.0608,-61.7964,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3
8 | ,Argentina,-38.4161,-63.6167,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,2,2,2,2,2,2,3,3,4,4,4,6,8,9,13,18,19,23,27,28,36,39,43,44,48,56,63,72,82,83,90,97,102,111,115,123,129,132,136,147,152,165,176,185,192,197,207,214,218,225,237,246,260,264,273,282,293,300,305,314,319,329,353,356,363,373,382,393,403,416,433,445,452,467,484,500,508,520,528,539,556,569,583,608,632,648,664,693,717,735,765,785,815,833,854,878,913,948,979,992,1011,1043,1078,1116,1150,1184,1207,1232,1280,1307,1351
9 | ,Armenia,40.0691,45.0382,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,3,4,7,7,7,7,8,8,9,10,12,13,13,14,16,17,18,19,20,20,22,24,24,24,27,28,28,29,30,30,32,33,33,35,39,40,40,42,43,44,45,46,47,48,49,52,55,60,61,64,67,70,74,77,81,87,91,98,113,120,127,131,139,158,170,176,183,190,200,211,217,227,245,258,264,269,285,293,302,309,319,332,350,360,372,386,397,410,421,426,433,443,453
10 | Australian Capital Territory,Australia,-35.4735,149.0124,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3
11 | New South Wales,Australia,-33.8688,151.2093,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,2,2,2,2,2,2,2,2,2,4,5,5,6,6,6,6,7,7,7,7,8,8,8,8,9,10,12,12,16,18,21,21,21,22,23,24,25,25,25,25,26,26,26,26,26,26,31,33,33,34,34,39,40,41,41,42,42,43,44,44,44,44,44,44,44,45,45,45,45,45,46,46,47,47,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,48,49,49,49,49,49,49,49,49
12 | Northern Territory,Australia,-12.4634,130.8456,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Queensland,Australia,-28.0167,153.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,1,1,1,2,2,2,2,4,4,4,4,4,4,4,4,4,5,5,5,5,5,5,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,7,7,7,7,7,7,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6
14 | South Australia,Australia,-34.9285,138.6007,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,3,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4
15 | Tasmania,Australia,-41.4545,145.9707,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,3,3,4,4,5,5,6,6,6,7,7,7,7,7,7,8,9,10,11,11,11,12,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13
16 | Victoria,Australia,-37.8136,144.9631,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,4,4,4,4,5,7,8,8,10,11,12,12,13,14,14,14,14,14,14,14,14,14,14,14,14,16,16,16,17,17,18,18,18,18,18,18,18,18,18,18,18,18,18,18,18,18,18,18,18,18,18,18,18,18,18,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,20,20,20,20,20,20,20,20,20
17 | Western Australia,Australia,-31.9505,115.8605,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,3,4,4,6,6,6,6,6,6,6,6,6,7,7,7,7,7,7,7,8,8,8,8,8,8,8,8,8,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9
18 | ,Austria,47.5162,14.5501,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,3,3,4,6,6,8,16,21,28,30,49,58,68,86,108,128,146,158,168,186,204,220,243,273,295,319,337,350,368,384,393,410,431,443,452,470,491,510,522,530,536,542,549,569,580,584,589,596,598,600,606,608,609,614,615,618,620,623,624,626,628,629,629,629,632,633,633,635,639,640,641,643,645,668,668,668,668,668,669,670,670,672,672,672,672,672,673,674,675,677,677,678,681,687,688,688,688,690,690,693,693,698,698,700,702,703,705,705
19 | ,Azerbaijan,40.1431,47.5769,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,2,3,3,4,4,4,5,5,5,5,5,7,7,8,8,9,10,11,11,12,13,13,15,15,18,19,19,20,20,20,21,21,21,22,22,23,24,25,25,25,26,26,28,28,28,31,32,32,33,35,35,36,36,39,40,41,43,44,46,49,49,51,52,54,56,58,61,63,68,71,76,78,82,84,88,93,98,102,108,113,115,119,122,126,133,139,143,148,154,161,167,174,180,187,193,198,206,213,220
20 | ,Bahamas,25.0343,-77.3963,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,4,4,5,6,7,8,8,8,8,8,8,8,8,9,9,9,9,9,9,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11
21 | ,Bahrain,26.0275,50.55,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,2,2,3,4,4,4,4,4,4,4,4,4,4,4,4,4,5,5,5,6,6,6,6,7,7,7,7,7,7,7,7,7,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,9,10,10,12,12,12,12,12,12,12,12,13,14,14,14,15,15,15,17,19,19,19,20,21,22,24,26,27,29,31,34,36,37,42,46,47,49,55,57,60,63,65,67,69,71,73,78,83,84,87,92
22 | ,Bangladesh,23.685,90.3563,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,3,4,5,5,5,5,5,5,5,6,6,6,8,9,12,17,20,21,27,30,34,39,46,50,60,75,84,91,101,110,120,127,131,140,145,152,155,163,168,170,175,177,182,183,186,199,206,214,228,239,250,269,283,298,314,328,349,370,386,408,432,452,480,501,522,544,559,582,610,650,672,709,746,781,811,846,888,930,975,1012,1049,1095,1139,1171,1209,1262,1305,1343,1388,1425,1464,1502,1545,1582,1621,1661,1695,1738,1783,1847,1888
23 | ,Barbados,13.1939,-59.5432,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,3,4,4,4,4,4,5,5,5,5,5,5,5,5,6,6,6,6,6,6,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7
24 | ,Belarus,53.7098,27.9534,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,4,5,8,13,13,13,16,19,23,26,29,33,36,40,42,45,47,51,55,58,60,63,67,72,75,79,84,89,93,97,99,103,107,112,116,121,126,131,135,142,146,151,156,160,165,171,175,179,185,190,194,199,204,208,214,219,224,229,235,240,243,248,253,259,263,269,276,282,288,293,298,303,308,312,318,324,331,337,343,346,351,357,362,367,373,377,383,387,392,398
25 | ,Belgium,50.8333,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,3,3,3,4,4,5,10,14,21,37,67,75,88,122,178,220,289,353,431,513,705,828,1011,1143,1283,1447,1632,2035,2240,2523,3019,3346,3600,3903,4157,4440,4857,5163,5453,5683,5828,5998,6262,6490,6679,6917,7094,7207,7331,7501,7594,7703,7765,7844,7924,8016,8339,8415,8521,8581,8656,8707,8761,8843,8903,8959,9005,9052,9080,9108,9150,9186,9212,9237,9280,9312,9334,9364,9388,9430,9453,9467,9486,9505,9522,9548,9566,9580,9595,9606,9619,9629,9636,9646,9650,9655,9661,9663,9675,9683,9695,9696,9696,9696,9713,9722,9726,9731,9732,9732,9732,9747,9754
26 | ,Benin,9.3077,2.3158,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,4,4,4,4,5,6,6,9,9,9,11,11,11,13,13,13,13,14,14,14,16,19,21,21
27 | ,Bhutan,27.5142,90.4336,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Bolivia,-16.2902,-63.5887,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,6,7,8,9,10,10,11,14,15,18,19,20,24,27,28,28,29,31,31,32,33,34,37,43,44,46,50,53,55,59,62,66,71,76,82,86,91,102,106,114,118,122,128,142,152,164,165,169,174,189,199,215,230,240,250,261,274,280,293,300,310,313,343,376,400,415,427,454,465,475,487,512,533,559,585,611,632,659,679,697,715,740,773,820,846,876,913,934,970,1014,1071,1123,1201
29 | ,Bosnia and Herzegovina,43.9159,17.6791,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,3,4,5,6,10,13,13,16,17,21,23,29,33,34,35,36,37,39,39,40,41,43,46,47,48,49,51,53,54,55,57,59,60,63,65,69,70,72,77,78,79,86,90,98,102,107,113,117,120,122,128,129,133,133,134,136,140,141,141,144,146,149,151,153,153,153,153,154,157,157,159,159,159,159,160,160,161,161,163,163,163,165,168,168,168,169,169,169,171,172,173,175,178,178,178,184,186,188
30 | ,Brazil,-14.235,-51.9253,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,6,11,15,25,34,46,59,77,92,111,136,159,201,240,324,359,445,486,564,686,819,950,1057,1124,1223,1328,1532,1736,1924,2141,2354,2462,2587,2741,2906,3331,3704,4057,4286,4603,5083,5513,6006,6412,6761,7051,7367,7938,8588,9190,10017,10656,11123,11653,12461,13240,13999,14962,15662,16118,16853,17983,18859,20047,21048,22013,22666,23473,24512,25598,26754,27878,28834,29314,29937,31199,32548,34021,35026,35930,36455,37134,38406,39680,40919,41828,42720,43332,43959,45241,46510,47748,48954,49976,50591,51271,52645,53830,54971,55961,57070,57622,58314,59594,60632
31 | ,Brunei,4.5353,114.7277,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3
32 | ,Bulgaria,42.7339,25.4858,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,3,3,3,3,3,3,3,3,3,7,8,8,8,10,10,14,17,20,22,23,24,24,25,28,29,32,35,36,38,41,41,42,43,45,49,52,54,55,56,58,58,64,66,68,72,73,78,80,84,84,86,90,91,93,95,96,99,102,105,108,110,112,116,120,125,126,130,130,130,133,134,136,139,140,140,144,146,147,159,160,160,164,167,167,168,172,172,174,176,181,184,190,193,199,199,207,208,209,211,215,216,219,223,230,232
33 | ,Burkina Faso,12.2383,-1.5616,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,4,4,4,4,7,9,11,12,12,14,16,16,16,16,17,18,19,23,24,24,27,27,27,30,32,32,35,36,36,38,38,39,41,41,41,42,42,42,43,43,44,44,45,46,48,48,48,48,48,49,50,51,51,51,51,51,51,51,51,52,52,52,52,52,52,52,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53,53
34 | ,Cabo Verde,16.5388,-23.0418,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,4,4,4,4,4,4,4,5,5,5,5,5,5,5,5,5,6,6,6,6,7,7,7,7,8,8,8,8,8,8,8,10,12,12,12,15,15
35 | ,Cambodia,11.55,104.9167,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Cameroon,3.8480000000000003,11.5021,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,6,6,6,6,7,8,9,9,9,9,10,10,12,12,12,12,14,17,22,22,22,42,42,43,43,43,43,53,56,58,58,61,61,61,64,64,64,64,108,108,108,108,114,125,125,136,139,140,140,140,140,140,146,156,159,159,165,165,175,175,175,177,191,191,199,200,200,203,205,212,212,212,212,212,212,212,212,212,276,276,276,276,282,301,303,308,313,313,313,313,313,313,313,313,313
37 | Alberta,Canada,53.9333,-116.5765,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,2,2,2,2,2,3,8,9,13,13,18,20,23,24,26,29,32,40,40,46,48,48,48,50,51,51,59,61,66,68,72,73,73,75,80,87,90,92,94,95,104,106,112,114,115,116,117,117,118,120,121,125,126,127,128,128,128,132,134,135,135,138,139,141,143,143,143,143,143,143,145,146,146,146,146,149,151,151,149,149,150,150,151,151,151,152,152,152,152,153,153,153,154,154,154,154,154,154,154
38 | British Columbia,Canada,49.2827,-123.1207,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,4,4,7,7,8,10,10,13,13,13,14,14,17,17,19,24,24,31,31,38,38,38,39,43,48,50,58,58,69,69,72,75,77,78,81,82,87,90,94,98,100,100,104,106,109,111,112,114,114,117,121,124,126,127,129,129,130,132,132,135,140,141,141,143,146,149,152,155,157,157,161,161,162,164,164,164,164,165,165,166,166,167,167,167,167,167,167,167,168,168,168,168,168,168,168,168,168,168,169,170,171,173,174,174,174,174,174,174
39 | Grand Princess,Canada,37.6489,-122.6655,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Manitoba,Canada,53.7609,-98.8139,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,2,2,2,2,3,3,3,3,4,4,4,4,5,5,5,5,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7
41 | New Brunswick,Canada,46.5653,-66.4619,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2
42 | Newfoundland and Labrador,Canada,53.1355,-57.6604,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3
43 | Nova Scotia,Canada,44.681999999999995,-63.7443,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,3,3,3,3,4,7,9,9,10,12,16,16,22,24,24,27,28,28,29,31,37,38,41,41,44,46,47,47,48,48,51,51,55,55,55,55,56,57,58,58,58,58,58,59,59,59,59,60,60,60,60,60,61,61,61,61,61,62,62,62,62,62,62,62,62,62,62,62,62,62,63,63,63,63,63,63,63,63,63,63
44 | Ontario,Canada,51.2538,-85.3232,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,5,6,7,8,13,18,18,21,31,33,37,53,67,94,119,150,153,153,200,222,253,274,291,334,385,490,524,564,591,624,694,762,806,862,916,960,1023,1072,1153,1205,1265,1292,1326,1446,1505,1560,1607,1665,1726,1751,1788,1852,1883,1915,1939,1976,1999,2019,2032,2079,2106,2129,2157,2181,2210,2235,2264,2292,2313,2332,2344,2353,2375,2392,2436,2446,2483,2502,2524,2536,2552,2563,2573,2582,2590,2579,2595,2607,2613,2625,2650,2657,2666,2676,2690,2703,2706,2711,2717,2726,2730,2734
45 | Prince Edward Island,Canada,46.5107,-63.4168,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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
46 | Quebec,Canada,52.9399,-73.5491,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,5,4,4,4,6,8,18,22,22,22,31,33,36,61,61,75,121,150,175,216,241,289,328,360,435,487,630,688,688,820,939,1044,1134,1243,1340,1446,1516,1600,1683,1762,1859,2022,2136,2206,2281,2399,2511,2632,2726,2787,2929,3014,3132,3221,3352,3402,3484,3563,3597,3648,3719,3801,3866,3941,3985,4070,4140,4229,4303,4363,4439,4641,4661,4713,4794,4885,4935,4970,4978,4984,5029,5081,5105,5148,5195,5222,5242,5269,5298,5340,5375,5408,5417,5417,5424,5441,5448,5448,5448,5448,5485,5503,5527
47 | Saskatchewan,Canada,52.9399,-106.4509,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,3,3,3,3,3,3,3,3,3,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,5,5,6,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,8,10,10,10,10,11,11,11,11,11,11,11,11,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13
48 | ,Central African Republic,6.6111,20.9394,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,2,4,4,4,4,4,5,5,5,5,5,5,7,7,7,7,14,18,19,19,19,23,30,37,38,40,40,45,45,47,47,47
49 | ,Chad,15.4542,18.7322,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,5,5,10,10,10,17,17,27,28,31,31,31,40,42,46,48,50,53,53,56,57,58,58,60,60,61,62,64,65,65,65,65,66,66,66,66,68,69,69,70,71,72,72,72,72,73,73,74,74,74,74,74,74,74,74,74,74,74,74,74,74,74,74
50 | ,Chile,-35.6751,-71.543,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,4,5,6,7,8,12,16,18,22,27,34,37,43,48,57,65,73,80,82,92,94,105,116,126,133,139,147,160,168,174,181,189,198,207,216,227,234,247,260,270,275,281,285,294,304,312,323,335,346,368,394,421,450,478,509,544,589,630,673,718,761,806,841,890,944,997,1054,1113,1188,1275,1356,1448,1541,1637,2264,2283,2475,2648,2870,3101,3323,3362,3383,3615,3841,4093,4295,4479,4502,4505,4731,4903,5068,5347,5509,5575,5688,5753
51 | Anhui,China,31.8257,117.2264,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,3,4,4,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6
52 | Beijing,China,40.1824,116.4142,0,0,0,0,0,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,3,3,3,3,4,4,4,4,4,4,4,4,4,4,4,4,5,7,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9
53 | Chongqing,China,30.0572,107.874,0,0,0,0,0,0,0,0,0,0,1,2,2,2,2,2,2,2,2,2,3,3,4,5,5,5,5,5,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6
54 | Fujian,China,26.0789,117.9874,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
55 | Gansu,China,37.8099,101.0583,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2
56 | Guangdong,China,23.3417,113.4244,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,1,2,2,2,2,4,4,5,5,5,5,6,6,7,7,7,7,7,7,7,7,7,7,7,7,7,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8
57 | Guangxi,China,23.8298,108.7881,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2
58 | Guizhou,China,26.8154,106.8748,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2
59 | Hainan,China,19.1959,109.7453,0,0,0,0,0,1,1,1,1,1,1,1,1,1,1,1,2,2,3,3,3,4,4,4,4,4,4,4,4,4,4,4,5,5,5,5,5,5,5,5,5,5,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6
60 | Hebei,China,39.549,116.1306,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,3,3,3,3,3,4,4,5,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6
61 | Heilongjiang,China,47.861999999999995,127.7615,0,0,1,1,1,1,1,1,2,2,2,2,2,2,2,3,3,5,6,7,8,8,9,11,11,11,11,11,12,12,12,12,12,12,12,12,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13
62 | Henan,China,33.882,113.61399999999999,0,0,0,0,1,1,1,2,2,2,2,2,2,2,2,2,3,4,6,6,7,8,10,11,13,13,16,19,19,19,19,19,19,19,19,19,20,20,21,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22
63 | Hong Kong,China,22.3,114.2,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,5,5,5,6,6,7,7,7,7,7,7,7
64 | Hubei,China,30.9756,112.2707,17,17,24,40,52,76,125,125,162,204,249,350,414,479,549,618,699,780,871,974,1068,1068,1310,1457,1596,1696,1789,1921,2029,2144,2144,2346,2346,2495,2563,2615,2641,2682,2727,2761,2803,2835,2871,2902,2931,2959,2986,3008,3024,3046,3056,3062,3075,3085,3099,3111,3122,3130,3133,3139,3153,3153,3160,3163,3169,3174,3177,3182,3186,3187,3193,3199,3203,3207,3210,3212,3212,3213,3215,3216,3219,3219,3221,3221,3222,3222,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512,4512
65 | Hunan,China,27.6104,111.7088,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,1,2,2,2,2,3,3,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4
66 | Inner Mongolia,China,44.0935,113.9448,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
67 | Jiangsu,China,32.9711,119.455,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Jiangxi,China,27.614,115.7221,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
69 | Jilin,China,43.6661,126.1923,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2
70 | Liaoning,China,41.2956,122.6085,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2
71 | Macau,China,22.1667,113.55,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Ningxia,China,37.2692,106.1655,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Qinghai,China,35.7452,95.9956,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Shaanxi,China,35.1917,108.8701,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3
75 | Shandong,China,36.3427,118.1498,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,2,2,2,2,2,2,3,3,4,4,4,4,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7
76 | Shanghai,China,31.201999999999998,121.4491,0,0,0,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,4,4,4,5,5,5,5,5,5,5,6,6,6,6,6,6,6,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7
77 | Shanxi,China,37.5777,112.2922,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Sichuan,China,30.6171,102.7103,0,0,0,0,0,0,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3
79 | Tianjin,China,39.3054,117.323,0,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,1,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3
80 | Tibet,China,31.6927,88.0924,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Xinjiang,China,41.1129,85.2401,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,1,1,1,1,1,1,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3
82 | Yunnan,China,24.974,101.48700000000001,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2
83 | Zhejiang,China,29.1832,120.0934,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
84 | ,Colombia,4.5709,-74.2973,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,4,6,6,6,10,12,16,17,19,25,32,35,46,50,54,69,80,100,109,112,127,131,144,153,153,179,189,196,206,215,225,233,244,253,269,278,293,314,324,340,358,378,397,407,428,445,463,479,493,509,525,546,562,574,592,613,630,652,682,705,727,750,776,803,833,855,891,916,963,1014,1057,1099,1204,1204,1265,1373,1373,1439,1505,1562,1623,1670,1808,1808,1887,1955,2046,2148,2353,2426,2524,2524,2611,2786,2946,3256,3256,3376,3488
85 | ,Congo (Brazzaville),-4.0383,21.7587,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,5,5,5,5,5,5,5,5,5,5,5,5,6,6,6,6,6,6,6,6,6,6,6,8,8,9,9,9,9,10,10,10,10,10,10,10,11,11,11,15,15,15,15,15,15,15,16,16,16,16,16,16,19,19,19,19,20,20,20,20,20,20,22,22,22,24,24,24,24,24,24,27,27,27,27,27,27,27,37,37,37,37,37,37,37,37,37,41
86 | ,Congo (Kinshasa),-4.0383,21.7587,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,3,3,6,6,8,8,9,13,13,18,18,18,18,18,18,20,20,20,20,20,21,22,23,25,25,25,25,25,25,25,28,28,28,30,30,31,32,33,33,34,34,35,36,39,39,41,41,44,50,50,50,61,61,61,61,61,61,63,63,63,67,68,68,69,69,69,72,72,72,75,78,81,82,85,88,90,96,98,101,106,107,112,112,115,117,122,125,130,135,135,142,142,149,153,157,167,170,175
87 | ,Costa Rica,9.7489,-83.7534,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,4,4,4,4,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,7,7,7,8,8,9,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,11,11,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,14,15,15,16,17
88 | ,Cote d'Ivoire,7.54,-5.5471,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,3,3,3,3,3,3,4,5,6,6,6,6,6,8,9,9,13,14,14,14,14,14,14,14,14,14,15,15,17,17,18,18,20,20,21,21,21,21,24,24,24,25,27,28,28,29,29,29,30,30,30,30,31,32,32,33,33,33,33,35,35,36,36,36,38,38,41,41,45,45,45,46,46,48,49,49,52,54,56,58,58,60,64,66,66,66,68,68
89 | ,Croatia,45.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,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,3,3,5,6,6,6,6,7,8,12,15,16,18,19,20,21,21,23,25,31,33,35,36,39,47,47,48,48,50,51,54,55,59,63,67,69,75,77,79,80,83,85,86,86,87,90,91,91,94,94,95,95,95,95,96,96,97,99,99,99,100,101,101,102,103,103,103,103,103,103,103,103,104,104,104,106,106,106,107,107,107,107,107,107,107,107,107,107,107,107,107,107,107,107,107,107,107,108
90 | ,Diamond Princess,0.0,0.0,0,0,0,0,0,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,2,2,3,3,3,4,4,6,6,6,6,6,6,6,6,6,6,6,6,7,7,7,7,7,7,7,7,7,7,8,8,8,10,10,10,10,10,10,10,10,11,11,11,11,11,11,11,11,11,11,11,11,11,12,12,12,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13
91 | ,Cuba,22.0,-80.0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,2,2,3,3,4,6,6,6,6,6,8,9,11,12,15,15,16,18,21,21,24,27,31,32,34,36,38,40,43,49,51,54,56,58,58,61,64,66,67,69,69,69,73,74,74,77,77,78,79,79,79,79,79,79,79,79,80,81,81,82,82,82,82,82,82,83,83,83,83,83,83,83,83,83,83,83,83,84,84,84,84,84,84,84,85,85,85,85,85,85,85,85,85,86,86,86,86,86
92 | ,Cyprus,35.1264,33.4299,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,3,5,5,5,7,8,9,10,11,11,9,9,9,9,10,10,10,11,12,12,12,12,12,12,12,12,12,13,13,14,14,14,15,15,15,15,15,15,15,15,15,15,15,15,15,16,16,16,17,17,17,17,17,17,17,17,17,17,17,17,17,17,17,17,17,17,17,17,17,17,17,17,18,18,18,18,18,18,18,18,18,18,18,18,19,19,19,19,19,19,19,19,19,19,19,19,19,19
93 | ,Czechia,49.8175,15.472999999999999,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,6,9,9,11,16,23,31,39,44,53,59,67,78,88,99,112,119,129,138,143,161,166,169,173,181,186,194,201,208,210,214,218,220,223,227,227,236,240,245,248,252,257,262,270,273,276,280,282,283,290,293,295,296,298,297,302,304,306,312,314,315,317,317,317,319,319,319,320,321,323,325,326,327,327,327,328,328,330,328,329,328,329,330,331,333,334,335,336,336,336,339,343,345,349,349,348,348,349,349
94 | Faroe Islands,Denmark,61.8926,-6.9118,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Greenland,Denmark,71.7069,-42.6043,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Denmark,56.2639,9.5018,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,4,4,6,9,13,13,24,32,34,41,52,65,72,77,90,104,123,139,161,179,187,203,218,237,247,260,273,285,299,309,321,336,346,355,364,370,384,394,403,418,422,427,434,443,452,460,475,484,493,503,506,514,522,526,529,533,527,533,537,537,543,547,548,551,554,561,561,561,562,563,563,565,568,568,571,574,576,580,580,582,586,587,589,593,593,593,593,594,597,597,598,598,598,600,600,600,600,602,603,603,603,604,604,604,605,605,606
97 | ,Djibouti,11.8251,42.5903,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,4,4,4,7,7,9,10,10,10,10,14,14,18,20,20,22,24,24,25,26,26,26,26,28,31,34,34,37,38,41,43,43,43,43,43,45,45,45,48,49,52,52,52,52,52,53,54,55
98 | ,Dominican Republic,18.7357,-70.1627,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,3,3,6,10,10,20,28,39,42,51,57,60,68,68,82,86,98,108,118,126,135,173,177,183,189,196,200,217,226,235,245,260,265,267,273,278,282,286,293,301,313,326,333,346,354,362,373,380,385,388,393,402,409,422,424,428,428,434,441,446,448,456,458,458,460,468,474,485,488,498,502,502,515,516,520,525,536,538,539,544,550,561,568,577,592,605,615,633,635,647,655,662,669,675,691,698,712,718,726,733,747,754
99 | ,Ecuador,-1.8312,-78.1834,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,3,5,7,14,18,27,28,34,36,48,58,60,75,93,120,145,172,180,191,191,242,272,297,315,333,355,369,388,403,421,456,474,507,520,537,560,576,576,576,663,871,883,900,1063,1371,1564,1569,1569,1618,1654,1704,1717,2127,2145,2327,2334,2338,2594,2688,2736,2799,2839,2888,2939,3056,3096,3108,3203,3203,3275,3313,3334,3334,3358,3358,3438,3486,3486,3534,3608,3621,3642,3690,3720,3720,3828,3874,3896,3929,3970,4007,4087,4156,4156,4223,4223,4274,4274,4343,4406,4424,4429,4502,4527,4576
100 | ,Egypt,26.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,0,0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,2,2,2,2,4,6,6,8,10,14,19,20,21,24,30,36,40,41,46,52,58,66,71,78,85,94,103,118,135,146,159,164,178,183,196,205,224,239,250,264,276,287,294,307,317,337,359,380,392,406,415,429,436,452,469,482,503,514,525,533,544,556,571,592,612,630,645,659,680,696,707,735,764,783,797,816,845,879,913,959,1005,1052,1088,1126,1166,1198,1237,1271,1306,1342,1377,1422,1484,1575,1672,1766,1850,1938,2017,2106,2193,2278,2365,2450,2533,2620,2708,2789,2872,2953,3034
101 | ,El Salvador,13.7942,-88.8965,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,3,3,4,4,5,6,6,6,6,6,6,6,6,7,7,7,7,7,7,8,8,8,8,8,8,9,10,10,11,11,13,14,15,15,16,17,17,18,20,20,23,25,26,30,30,30,31,33,33,33,35,35,36,39,39,42,46,46,46,49,51,52,53,53,53,56,60,64,68,68,72,74,74,76,79,82,86,93,98,107,113,119,126,133,143,152,164,174,182
102 | ,Equatorial Guinea,1.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,0,0,0,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,1,1,1,1,1,1,1,1,1,3,3,4,4,4,4,4,4,4,6,7,7,7,7,7,7,7,10,11,11,11,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,32,32,32,32,32,32,32,32,32,32,32,32,32,32,32,32
103 | ,Eritrea,15.1794,39.7823,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Estonia,58.5953,25.0136,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,3,3,4,5,11,12,13,15,19,21,24,24,24,24,25,28,31,35,36,38,38,40,40,43,44,45,46,46,49,50,50,50,52,52,53,55,55,55,55,56,56,60,60,61,61,61,62,63,63,63,64,64,64,64,64,64,64,65,65,66,66,67,67,68,68,68,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69,69
105 | ,Eswatini,-26.5225,31.4659,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,4,4,4,4,4,4,5,5,6,7,7,8,8,8,11,11,11,11
106 | ,Ethiopia,9.145,40.4897,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,4,4,4,4,5,5,5,5,5,5,5,5,5,5,5,5,5,5,5,5,5,6,6,7,8,8,11,12,14,17,18,19,20,27,27,32,35,40,47,55,57,60,61,63,65,72,72,74,75,75,78,81,89,94,98,103,103,103
107 | ,Fiji,-17.7134,178.065,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Finland,64.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,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,1,3,5,7,9,11,13,17,17,19,20,25,28,27,34,40,42,48,49,56,59,64,72,75,82,90,94,98,141,149,172,177,186,190,193,199,206,211,218,220,230,240,246,252,255,260,265,267,271,275,284,287,293,297,298,300,301,304,306,306,306,307,308,312,313,313,314,316,320,318,320,321,322,322,322,323,323,324,324,325,325,325,326,326,326,326,326,326,326,326,327,327,327,327,328,328,328,328,328,328
109 | French Guiana,France,3.9339,-53.1258,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,3,3,5,5,5,5,5,6,8,8,9,10,11,12,12,15,15,16
110 | French Polynesia,France,-17.6797,149.4068,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0
111 | Guadeloupe,France,16.25,-61.5833,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,2,4,4,4,6,6,7,7,7,7,7,8,8,8,8,8,8,8,8,8,8,8,8,8,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14
112 | Mayotte,France,-12.8275,45.1662,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,3,3,3,3,3,3,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,6,6,9,9,10,10,11,11,11,12,14,16,16,18,18,18,18,19,19,19,19,20,20,20,20,21,21,21,21,24,24,24,25,25,25,25,25,28,28,28,28,28,29,29,29,29,29,29,31,31,31,31,32,32,32,32,32,32,35,35
113 | New Caledonia,France,-20.9043,165.618,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Reunion,France,-21.1351,55.2471,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2
115 | Saint Barthelemy,France,17.9,-62.8333,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | St Martin,France,18.0708,-63.0501,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3
117 | Martinique,France,14.6415,-61.0242,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,3,3,3,3,3,4,4,4,6,6,6,6,6,6,6,8,8,8,8,12,12,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14
118 | ,France,46.2276,2.2137,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,1,1,1,1,1,1,1,1,2,2,2,2,2,3,4,4,6,9,11,19,19,33,48,48,79,91,91,148,148,148,243,450,562,674,860,1100,1331,1696,1995,2314,2606,3024,3523,4403,5387,6507,7560,8078,8911,10328,10869,12210,13197,13832,14393,14967,15712,17148,17901,18661,19303,19694,20240,20765,21309,21825,22214,22583,22825,23262,23629,24056,24345,24563,24729,24864,25168,25498,25772,25949,26192,26271,26341,26604,26951,27032,27381,27485,27483,28062,28193,27976,28084,28167,28241,28284,28317,28407,28480,28546,28611,28663,28720,28751,28779,28886,28967,29010,29056,29087,29100,29153,29237,29260,29287,29315,29339,29346,29375,29484,29512,29540,29554,29568,29574,29595,29652,29661,29680,29705,29704,29704,29736,29763,29780
119 | ,Gabon,-0.8037,11.6094,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,3,3,3,3,3,3,3,3,5,5,6,6,6,8,8,8,8,9,9,9,10,10,11,11,11,12,12,12,12,12,12,14,14,14,14,15,17,17,17,20,20,21,21,21,21,21,21,22,23,23,23,23,27,29,30,32,34,34,34,39,39,39,40,40,40,40,42,42,42
120 | ,Gambia,13.4432,-15.3101,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2
121 | ,Georgia,42.3154,43.3569,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,3,3,3,3,3,3,3,3,3,3,4,4,4,4,5,5,5,5,6,6,6,6,6,7,8,9,9,9,9,9,10,10,10,11,11,11,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,13,13,13,13,13,13,13,13,13,13,13,14,14,14,14,14,14,14,14,14,14,14,14,14,14,14,15,15,15,15
122 | ,Germany,51.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,2,2,3,3,7,9,11,17,24,28,44,67,84,94,123,157,206,267,342,433,533,645,775,920,1107,1275,1444,1584,1810,2016,2349,2607,2767,2736,3022,3194,3294,3804,4052,4352,4459,4586,4862,5033,5279,5575,5760,5877,5976,6126,6314,6467,6623,6736,6812,6866,6993,6993,7275,7392,7510,7549,7569,7661,7738,7861,7884,7897,7938,7962,8003,8081,8144,8203,8228,8261,8283,8309,8372,8428,8470,8504,8530,8540,8555,8563,8602,8635,8658,8673,8685,8695,8736,8752,8772,8783,8793,8801,8807,8820,8851,8875,8887,8895,8895,8899,8914,8928,8940,8965,8968,8968,8976,8990,8995
123 | ,Ghana,7.9465,-1.0232,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,4,4,4,5,5,5,5,5,5,5,5,5,5,5,6,6,6,8,8,8,8,8,8,8,9,9,9,9,9,9,10,10,11,11,16,16,17,17,18,18,18,18,18,18,18,22,22,22,22,24,24,28,29,29,29,31,31,31,31,31,32,32,34,34,34,34,35,36,36,38,38,38,42,44,44,48,48,48,48,48,48,54,54,58,66,66,70,85,85,85,95,95,95,103,103,112,112,112,117
124 | ,Greece,39.0742,21.8243,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,4,4,5,5,6,6,13,15,17,20,22,26,28,32,38,43,49,50,53,63,68,73,79,81,83,87,92,93,98,99,101,102,105,108,110,113,116,121,121,125,130,130,134,136,138,139,140,140,143,144,146,146,147,148,150,151,151,151,152,155,156,160,162,163,165,165,166,168,169,171,171,172,173,173,175,175,175,175,179,179,179,180,180,180,180,182,183,183,183,183,183,183,184,185,187,188,189,190,190,190,190,190,191,191,191,191,191,192,192
125 | ,Guatemala,15.7835,-90.2308,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,3,3,3,3,3,3,5,5,5,5,5,7,7,7,7,7,8,11,11,13,15,15,15,16,16,16,17,17,19,19,21,23,24,24,26,26,27,29,29,30,33,33,35,43,45,48,51,55,58,59,63,68,80,90,102,108,116,123,143,158,216,230,252,267,289,316,334,351,367,384,399,418,432,449,483,514,531,547,582,601,623,672,706,727,746,773,817
126 | ,Guinea,9.9456,-9.6966,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,5,5,6,6,6,6,7,7,7,7,7,7,7,7,7,9,10,11,11,11,11,11,11,11,14,15,15,16,16,16,18,18,18,19,20,20,20,20,20,22,22,23,23,23,23,23,23,23,23,23,23,23,23,23,24,25,25,26,26,26,26,27,27,27,27,28,29,29,29,30,31,31,33,33
127 | ,Guyana,5.0,-58.75,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,4,4,4,4,4,5,6,6,6,6,6,6,6,6,6,6,6,7,7,7,7,7,7,7,8,8,8,8,9,9,9,9,9,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,11,11,11,11,11,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,13
128 | ,Haiti,18.9712,-72.2852,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,2,2,2,3,3,3,3,3,3,3,3,3,3,4,5,5,6,6,6,6,6,8,8,8,9,11,12,12,12,12,12,15,16,16,18,20,20,20,20,21,21,22,25,25,26,26,27,33,34,34,35,41,44,45,45,48,50,50,50,51,54,56,58,64,64,70,70,76,80,82,84,87,88,88,88,89,92,96,98,100,100,105,105,107
129 | ,Holy See,41.9029,12.4534,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0
130 | ,Honduras,15.2,-86.2419,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,7,7,10,14,15,15,22,22,22,22,23,23,24,25,25,26,31,35,41,46,46,46,46,46,47,55,59,59,61,64,66,71,75,76,82,83,93,99,105,107,108,108,116,121,123,133,134,138,142,146,147,147,156,167,167,180,182,188,194,196,196,201,212,217,225,234,243,248,250,258,262,271,290,294,306,310,312,322,330,336,343,349,358,363,395,405,417,426,471,479,479,485,497,542
131 | ,Hungary,47.1625,19.5033,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,3,4,6,7,9,10,10,10,11,13,15,16,20,21,26,32,34,38,47,58,66,77,85,99,109,122,134,142,156,172,189,199,213,225,239,262,262,272,280,291,300,312,323,335,340,351,363,373,383,392,405,413,421,425,430,436,442,448,451,462,467,470,473,476,482,486,491,499,505,509,517,524,526,527,532,534,539,542,545,546,548,550,551,553,555,559,562,563,565,567,568,568,570,570,572,573,576,577,578,578,581,585,585,586
132 | ,Iceland,64.9631,-19.0208,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,0,1,1,1,2,2,2,2,2,2,2,2,2,4,4,4,4,6,6,6,6,7,8,8,8,8,8,8,9,9,9,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10
133 | ,India,21.0,78.0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,3,3,4,5,4,7,10,10,12,20,20,24,27,32,35,58,72,72,86,99,136,150,178,226,246,288,331,358,393,405,448,486,521,559,592,645,681,721,780,825,881,939,1008,1079,1154,1223,1323,1391,1566,1693,1785,1889,1985,2101,2212,2294,2415,2551,2649,2753,2871,3025,3156,3302,3434,3584,3726,3868,4024,4172,4344,4534,4711,4980,5185,5408,5608,5829,6088,6363,6649,6946,7207,7473,7750,8102,8498,8884,9195,9520,9900,11903,12237,12573,12948,13254,13699,14011,14476,14894,15301,15685,16095,16475,16893,17400,17834
134 | ,Indonesia,-0.7893,113.9213,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,4,5,5,5,5,19,25,32,38,48,49,55,58,78,87,102,114,122,136,157,170,181,191,198,209,221,240,280,306,327,373,399,459,469,496,520,535,582,590,616,635,647,689,720,743,765,773,784,792,800,831,845,864,872,895,930,943,959,973,991,1007,1028,1043,1076,1089,1148,1191,1221,1242,1278,1326,1351,1372,1391,1418,1473,1496,1520,1573,1613,1641,1663,1698,1721,1770,1801,1851,1883,1923,1959,2000,2048,2091,2134,2198,2231,2276,2339,2373,2429,2465,2500,2535,2573,2620,2683,2720,2754,2805,2876,2934
135 | ,Iran,32.0,53.0,0,0,0,0,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,2,4,5,8,12,16,19,26,34,43,54,66,77,92,107,124,145,194,237,291,354,429,514,611,724,853,988,1135,1284,1433,1556,1685,1812,1934,2077,2234,2378,2517,2640,2757,2898,3036,3160,3294,3452,3603,3739,3872,3993,4110,4232,4357,4474,4585,4683,4777,4869,4958,5031,5118,5209,5297,5391,5481,5574,5650,5710,5806,5877,5957,6028,6091,6156,6203,6277,6340,6418,6486,6541,6589,6640,6685,6733,6783,6854,6902,6937,6988,7057,7119,7183,7249,7300,7359,7417,7451,7508,7564,7627,7677,7734,7797,7878,7942,8012,8071,8134,8209,8281,8351,8425,8506,8584,8659,8730,8837,8950,9065,9185,9272,9392,9507,9623,9742,9863,9996,10130,10239,10364,10508,10670,10817,10958
136 | ,Iraq,33.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,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,2,2,3,4,6,6,7,7,8,9,10,10,10,11,12,13,17,17,20,23,27,29,36,40,42,42,46,50,52,54,54,56,61,64,65,69,69,70,72,76,78,78,79,80,81,82,82,82,83,83,83,86,86,87,88,90,92,93,94,95,97,98,102,102,102,104,107,109,110,112,115,115,117,121,123,127,131,134,140,147,152,160,163,169,175,179,185,195,205,215,235,256,271,285,318,346,370,392,426,457,496,549,607,652,712,773,856,925,1013,1100,1167,1251,1330,1437,1559,1660,1756,1839,1943,2050
137 | ,Ireland,53.1424,-7.6921,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,3,3,3,4,6,7,9,19,22,36,46,54,71,85,98,120,137,158,174,210,235,263,287,320,334,365,406,444,486,530,571,610,687,730,769,794,1014,1063,1087,1102,1159,1190,1232,1265,1286,1303,1319,1339,1375,1403,1429,1446,1458,1467,1488,1497,1506,1518,1533,1543,1547,1561,1571,1583,1592,1604,1608,1606,1615,1631,1639,1645,1651,1652,1650,1658,1659,1664,1670,1678,1679,1683,1691,1695,1703,1705,1705,1706,1706,1709,1710,1714,1714,1715,1715,1717,1720,1726,1727,1730,1734,1735,1735,1736,1738
138 | ,Israel,31.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,0,0,0,0,0,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,3,5,8,12,12,15,16,20,26,36,40,44,49,57,65,73,86,95,101,103,116,123,130,142,151,164,172,177,184,189,192,194,199,201,204,210,215,222,225,229,232,235,238,239,240,245,247,252,258,260,264,265,266,268,272,276,278,279,279,279,279,279,281,281,281,284,284,284,285,285,290,291,291,291,295,298,298,299,299,300,300,300,300,302,302,303,303,304,305,306,307,308,308,309,314,317,318,319,320,322
139 | ,Italy,43.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,1,2,3,7,10,12,17,21,29,34,52,79,107,148,197,233,366,463,631,827,1016,1266,1441,1809,2158,2503,2978,3405,4032,4825,5476,6077,6820,7503,8215,9134,10023,10779,11591,12428,13155,13915,14681,15362,15887,16523,17127,17669,18279,18849,19468,19899,20465,21067,21645,22170,22745,23227,23660,24114,24648,25085,25549,25969,26384,26644,26977,27359,27682,27967,28236,28710,28884,29079,29315,29684,29958,30201,30395,30560,30739,30911,31106,31368,31610,31763,31908,32007,32169,32330,32486,32616,32735,32785,32877,32955,33072,33142,33229,33340,33415,33475,33530,33601,33689,33774,33846,33899,33964,34043,34114,34167,34223,34301,34345,34371,34405,34448,34514,34561,34610,34634,34657,34675,34644,34678,34708,34716,34738,34744,34767,34788
140 | ,Jamaica,18.1096,-77.2975,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,3,3,3,3,3,3,3,4,4,4,4,4,4,4,5,5,5,5,5,5,6,6,6,7,7,7,7,7,7,8,8,8,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10
141 | ,Japan,36.0,138.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,1,1,1,1,1,1,1,1,1,1,2,4,4,5,6,6,6,6,6,6,6,6,10,10,15,16,19,22,22,27,29,29,29,33,35,41,42,43,45,47,49,52,54,54,56,57,62,63,77,77,85,92,93,94,99,99,108,123,143,146,178,190,222,236,236,263,281,328,345,360,372,385,394,413,430,455,474,487,536,556,556,577,590,607,624,633,657,678,697,713,725,744,749,768,768,777,796,808,820,830,846,858,881,887,894,898,899,902,905,911,916,915,917,920,920,922,922,924,927,927,929,934,935,935,951,955,955,955,965,967,971,971,971,972,972,972,976
142 | ,Jordan,31.24,36.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,1,1,3,5,5,5,5,5,5,5,6,6,6,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,8,8,8,8,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9
143 | ,Kazakhstan,48.0196,66.9237,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,2,3,3,6,5,6,6,6,7,8,10,10,10,12,14,16,17,17,17,17,19,19,19,20,25,25,25,25,25,25,25,25,25,27,29,29,30,30,31,31,31,32,32,32,32,34,34,34,35,35,35,35,35,35,35,35,37,37,37,37,38,40,41,44,48,52,52,53,56,56,61,67,67,70,73,77,81,88,97,100,113,118,120,127,134,136,140,150,166,178,188,188,188
144 | ,Kenya,-0.0236,37.9062,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,3,4,4,4,6,6,6,7,7,7,8,9,9,10,11,11,12,14,14,14,14,14,14,14,14,14,14,15,17,21,22,24,24,24,26,29,29,30,32,33,36,40,42,45,50,50,50,50,50,50,50,50,51,52,52,55,58,62,63,64,69,71,74,78,79,83,84,85,88,89,92,96,100,103,104,105,107,117,119,121,123,125,128,130,132,137,141,143,144,148,149
145 | ,"Korea, South",36.0,128.0,0,0,0,0,0,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,2,6,8,10,12,13,13,16,17,28,28,35,35,42,44,50,53,54,60,66,66,72,75,75,81,84,91,94,102,111,111,120,126,131,139,144,152,158,162,165,169,174,177,183,186,192,200,204,208,211,214,217,222,225,229,230,232,234,236,237,238,240,240,242,243,244,246,247,248,250,250,252,254,255,256,256,256,256,256,258,259,260,260,262,262,263,263,263,264,264,266,266,267,269,269,269,269,269,270,271,272,273,273,273,273,273,273,274,276,276,277,277,277,277,278,279,280,280,280,280,280,281,281,282,282,282,282,282,282,282,282
146 | ,Kuwait,29.5,47.75,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,2,3,3,3,5,6,7,9,11,13,14,15,19,20,22,23,24,26,30,33,38,40,40,42,44,47,49,58,65,75,82,88,96,107,112,118,121,124,129,138,148,156,165,172,175,185,194,205,212,220,226,230,236,244,254,264,269,273,275,279,285,289,296,298,303,306,308,313,319,326,330,334,337,339,341,344,348,350,354,358
147 | ,Kyrgyzstan,41.2044,74.7661,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,4,4,4,4,5,5,5,5,5,5,5,5,5,5,7,7,7,8,8,8,8,8,8,8,8,8,8,10,10,11,12,12,12,12,12,12,12,12,12,14,14,14,14,14,14,14,14,14,14,16,16,16,16,16,16,16,16,17,20,20,22,22,22,23,24,26,26,26,27,27,28,30,31,31,32,35,40,40,42,43,43,46,46,50,57,61,66
148 | ,Latvia,56.8796,24.6032,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,2,2,3,3,3,5,5,5,5,5,5,5,5,5,9,11,11,12,12,12,13,13,15,15,16,16,16,16,17,17,18,18,18,18,18,18,19,19,19,19,19,19,21,21,22,22,22,22,22,22,23,24,24,24,24,24,24,24,25,25,25,25,26,26,26,26,27,28,28,28,28,30,30,30,30,30,30,30,30,30,30,30,30,30,30,30
149 | ,Lebanon,33.8547,35.8623,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,3,3,3,3,3,4,4,4,4,4,4,6,6,8,8,10,11,12,14,16,17,17,18,19,19,19,19,20,20,20,20,21,21,21,21,21,21,21,21,22,22,22,24,24,24,24,24,24,24,25,25,25,25,25,25,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,27,27,27,27,28,28,29,30,30,30,30,31,31,32,32,32,32,32,32,32,32,32,32,32,33,33,33,33,34,34,34,34
150 | ,Liberia,6.4281,-9.4295,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,4,4,5,5,5,6,6,6,6,7,7,8,8,8,8,8,8,11,12,12,16,16,16,18,18,18,18,20,20,20,20,20,20,20,20,20,20,20,20,21,22,23,23,23,24,26,26,26,26,27,27,27,27,27,27,28,28,28,30,30,30,30,31,31,31,32,32,32,33,33,33,33,33,33,34,34,34,34,34,34,34,34,36,36,37
151 | ,Liechtenstein,47.14,9.55,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,1,1,1,1,1,1,1,1
152 | ,Lithuania,55.1694,23.8813,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,4,4,5,7,7,7,8,8,9,9,11,13,15,15,15,16,22,23,23,24,29,30,32,33,33,35,37,38,38,40,40,41,41,41,44,45,45,45,46,46,46,46,48,49,49,49,50,50,50,54,54,54,55,56,59,60,60,61,61,63,63,63,65,66,68,68,70,70,70,71,71,71,71,71,71,71,72,74,74,74,75,75,76,76,76,76,76,76,76,76,77,78,78,78,78,78,78,78,78
153 | ,Luxembourg,49.8153,6.1296,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,2,4,4,8,8,8,8,8,9,15,18,21,22,23,29,30,31,31,36,41,44,46,52,54,62,66,69,67,69,69,72,72,73,75,78,80,83,85,85,88,88,89,89,90,92,92,96,96,96,98,100,100,101,101,101,102,103,103,104,104,107,107,109,109,109,109,109,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110,110
154 | ,Madagascar,-18.7669,46.8691,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,5,6,6,6,6,6,7,7,8,9,9,9,10,10,10,10,10,10,12,12,13,13,13,14,15,15,16,16,16,16,18,20,20,22
155 | ,Malaysia,2.5,112.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,2,2,2,3,4,10,14,16,20,23,26,27,35,37,43,45,50,53,57,61,62,63,65,67,70,73,76,77,82,83,84,86,88,89,89,92,93,95,96,98,98,99,100,100,102,103,103,105,105,106,107,107,107,108,108,109,109,111,112,112,113,113,113,114,114,114,115,115,115,115,115,115,115,115,115,115,115,115,115,115,116,117,117,117,117,118,118,119,120,121,121,121,121,121,121,121,121,121,121,121,121,121,121,121,121,121,121
156 | ,Maldives,3.2028,73.2207,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,2,2,3,3,3,3,3,3,4,4,4,4,4,4,4,4,4,4,4,4,4,5,5,5,5,5,5,6,7,7,7,7,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,9,9
157 | ,Malta,35.9375,14.3754,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,4,4,4,4,4,4,4,4,4,4,5,5,5,5,5,5,5,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,7,7,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9
158 | ,Mauritania,21.0079,10.9408,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,3,4,4,4,4,4,5,6,6,6,9,13,16,19,20,20,23,23,31,34,39,43,49,55,59,61,71,74,81,83,87,91,93,95,97,102,108,111,112,114,116,119,120,121,126,128,129,129
159 | ,Mauritius,-20.2,57.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,1,2,2,2,2,2,2,2,3,3,5,6,7,7,7,7,7,7,7,7,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10
160 | ,Mexico,23.6345,-102.5528,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,4,5,6,8,12,16,20,28,29,37,50,60,79,94,125,141,174,194,233,273,296,332,406,449,486,546,650,686,712,857,970,1069,1221,1305,1351,1434,1569,1732,1859,1972,2061,2154,2271,2507,2704,2961,3160,3353,3465,3573,3926,4220,4477,4767,5045,5177,5332,5666,6090,6510,6989,7179,7394,7633,8134,8597,9044,9415,9779,9930,10167,10637,11729,12545,13170,13511,13699,14053,14649,15357,15944,16448,16872,17141,17580,18310,19080,19747,20394,20781,21825,22584,23377,24324,25060,25779,26381,26648,27121,27769,28510
161 | ,Moldova,47.4116,28.3699,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,2,2,2,2,4,5,6,8,12,15,19,22,27,29,29,30,31,35,40,46,54,56,57,67,70,72,75,80,84,94,96,102,103,111,116,122,124,125,132,136,143,145,150,161,169,175,182,185,194,202,207,211,217,221,228,233,237,242,250,261,267,274,282,288,291,295,305,307,310,315,323,331,341,353,365,371,375,385,398,406,411,423,433,444,450,464,473,480,490,495,502,515,521,530,536,545,549
162 | ,Monaco,43.7333,7.4167,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,3,3,3,3,3,3,3,3,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4
163 | ,Mongolia,46.8625,103.8467,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Montenegro,42.5,19.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,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,3,3,4,4,4,5,5,5,5,5,5,5,6,6,7,7,7,7,7,7,8,8,8,8,8,8,8,8,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,11,11,12,12
165 | ,Morocco,31.7917,-7.0926,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,2,2,2,3,3,4,4,5,6,11,23,25,26,33,36,39,44,48,59,70,80,90,93,97,107,111,118,126,126,127,130,135,137,141,143,145,149,155,158,159,161,162,165,168,170,171,173,174,179,181,183,183,186,186,188,188,188,188,190,190,192,192,192,193,194,196,197,198,199,200,202,202,202,202,204,205,205,206,206,208,208,208,208,208,210,211,211,212,212,212,212,212,213,213,213,213,214,214,214,216,217,218,220,221,225,228,228
166 | ,Namibia,-22.9576,18.4904,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Nepal,28.1667,84.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,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,3,3,3,3,4,4,4,5,6,6,8,8,8,9,10,11,13,13,14,15,15,15,16,18,19,19,19,20,22,22,22,23,23,24,24,26,27,28,28,29,29,30
168 | Aruba,Netherlands,12.5186,-70.0358,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3
169 | Curacao,Netherlands,12.1696,-68.99,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
170 | Sint Maarten,Netherlands,18.0425,-63.0548,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,4,4,6,6,6,6,8,9,9,9,9,9,9,9,9,10,10,10,11,12,12,12,13,13,13,13,13,13,13,13,13,14,14,14,14,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15,15
171 | ,Netherlands,52.1326,5.2913,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,4,5,5,10,12,20,24,43,58,76,106,136,179,213,276,356,434,546,639,771,864,1039,1173,1339,1487,1651,1766,1867,2101,2248,2396,2511,2643,2737,2823,2945,3134,3315,3459,3601,3684,3751,3916,4054,4177,4289,4409,4475,4518,4566,4711,4795,4893,4987,5056,5082,5168,5204,5288,5359,5422,5440,5456,5510,5562,5590,5643,5670,5680,5694,5715,5748,5775,5788,5811,5822,5830,5856,5871,5903,5931,5951,5956,5962,5967,5977,5990,6005,6011,6013,6016,6031,6042,6044,6053,6057,6059,6065,6070,6074,6078,6081,6089,6090,6090,6095,6097,6100,6103,6105,6105,6107,6113,6113
172 | ,New Zealand,-40.9006,174.886,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,2,4,4,5,9,9,9,11,11,12,12,13,14,17,18,18,19,19,19,19,19,20,20,20,20,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22,22
173 | ,Nicaragua,12.8654,-85.2072,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,5,5,5,5,5,5,5,5,5,8,8,8,8,8,8,8,17,17,17,17,17,17,17,35,35,35,35,35,35,35,46,46,46,46,46,46,46,55,55,55,55,55,55,55,64,64,64,64,64,64,64,74,74,74,74,74,74,74,83,83
174 | ,Niger,17.6078,8.0817,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,3,3,5,5,5,8,10,10,11,11,11,11,11,12,12,14,14,14,18,19,20,20,20,22,24,24,27,29,29,31,32,32,33,35,36,37,38,38,42,44,45,46,46,47,49,50,51,51,54,55,55,58,60,60,61,61,62,63,63,64,64,64,64,65,65,65,65,65,65,65,65,65,65,65,65,66,66,66,66,67,67,67,67,67,67,67,67,67,67,67,67,67,67,67
175 | ,Nigeria,9.082,8.6753,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,2,2,2,2,4,4,5,5,6,6,7,7,10,10,10,11,12,13,17,19,21,22,22,28,31,32,35,40,40,44,51,58,68,85,87,93,98,103,107,117,128,143,150,158,164,167,171,176,182,191,192,200,211,221,221,226,233,249,254,259,261,273,287,299,314,315,323,333,342,354,361,365,382,387,399,407,420,424,455,469,475,487,506,518,525,533,542,549,554,558,565,573,590,603
176 | ,North Macedonia,41.6086,21.7453,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,3,3,4,6,7,9,11,11,12,17,18,23,26,29,30,32,34,34,38,44,45,46,49,49,51,54,55,56,56,57,59,61,65,71,73,77,81,82,84,85,86,88,89,90,91,91,91,92,95,95,97,98,101,104,106,110,111,112,113,113,113,116,119,121,126,131,133,140,141,145,147,149,151,153,156,157,164,169,171,179,188,193,201,210,216,222,233,238,247,251,259,265,268,277,286,298,302,306
177 | ,Norway,60.472,8.4689,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,3,6,7,7,7,7,10,12,14,14,19,23,25,32,39,44,50,59,62,71,76,89,101,108,113,119,128,134,139,150,152,161,164,165,181,182,187,194,199,201,201,205,206,207,210,210,211,211,214,215,216,217,218,219,219,224,228,229,232,232,232,232,233,233,234,235,235,235,235,235,235,235,236,236,236,236,236,237,237,238,238,238,238,239,239,239,242,242,242,242,242,242,243,244,244,244,244,248,248,249,249,249,249,249,249,250,251
178 | ,Oman,21.0,57.0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,2,2,2,2,2,3,3,3,4,4,4,4,4,6,6,7,7,8,8,9,10,10,10,10,10,10,11,11,12,12,12,13,13,15,16,17,17,17,17,17,18,20,21,22,25,27,30,31,34,36,37,37,37,39,40,40,42,49,50,59,67,67,72,72,75,81,83,84,89,96,99,104,108,114,116,119,125,128,131,137,140,142,144,153,159,163,169,176,185
179 | ,Pakistan,30.3753,69.3451,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,5,6,7,8,9,11,12,14,21,26,27,34,40,41,47,53,57,61,65,66,86,91,93,96,111,128,135,143,168,176,201,212,237,253,269,281,292,312,343,385,417,440,457,476,514,564,585,599,636,659,706,737,761,770,834,834,873,903,939,985,1017,1067,1101,1133,1167,1197,1225,1260,1317,1395,1483,1543,1621,1688,1770,1838,1935,2002,2067,2172,2255,2356,2463,2463,2551,2729,2839,2975,3093,3229,3382,3501,3590,3695,3755,3903,3962,4035,4118,4167,4304,4395,4473
180 | ,Panama,8.538,-80.7821,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,3,6,6,8,8,9,14,17,24,30,30,32,37,41,46,54,55,59,63,66,74,79,87,94,95,103,109,116,120,126,136,141,146,154,159,165,167,167,178,188,192,197,197,200,210,218,225,231,237,244,249,252,256,260,266,269,275,279,281,287,291,295,299,306,310,313,315,320,326,330,336,344,352,357,363,370,386,393,398,403,413,418,421,429,437,448,457,470,475,485,493,501,521,536,547,564,575,592,604,620,631,645
181 | ,Papua New Guinea,-6.315,143.9555,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Paraguay,-23.4425,-58.4438,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,3,3,3,3,3,3,3,3,3,3,3,5,5,5,5,6,6,6,6,7,8,8,8,8,8,8,8,9,9,9,9,9,9,9,9,10,10,10,10,10,10,10,10,10,10,10,10,10,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,12,13,13,13,13,13,13,13,13,13,13,13,15,15,16,17,19
183 | ,Peru,-9.19,-75.0152,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,5,5,7,9,9,11,16,18,24,30,38,55,61,73,83,92,107,121,138,169,181,193,216,230,254,274,300,348,400,445,484,530,572,634,700,728,782,854,943,1051,1124,1200,1286,1344,1444,1533,1627,1714,1814,1889,1961,2057,2169,2267,2392,2523,2648,2789,2914,3024,3148,3244,3373,3456,3629,3788,3983,4099,4230,4371,4506,4634,4634,4894,5031,5162,5301,5465,5571,5738,5903,6088,6088,6308,6688,6860,7056,7257,7461,7660,7861,8045,8223,8404,8586,8761,8939,9135,9317,9504,9677,9860
184 | ,Philippines,13.0,122.0,0,0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,5,8,11,12,12,19,17,18,19,25,33,35,38,45,54,68,71,78,88,96,107,136,144,152,163,177,182,203,221,247,297,315,335,349,362,387,397,409,428,437,446,462,477,494,501,511,530,558,568,579,603,607,623,637,658,685,696,704,719,726,751,772,790,806,817,824,831,837,842,846,857,863,868,873,886,904,921,942,950,957,960,966,974,984,987,994,1003,1011,1017,1027,1036,1052,1074,1088,1098,1103,1108,1116,1130,1150,1169,1177,1186,1204,1212,1224,1236,1244,1255,1266,1270
185 | ,Poland,51.9194,19.1451,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,4,5,5,5,5,5,7,8,10,14,16,16,18,22,31,33,43,57,71,79,94,107,129,159,174,181,208,232,245,263,286,314,332,347,360,380,401,426,454,494,524,535,562,596,624,644,651,664,678,698,716,733,755,776,785,800,811,839,861,883,907,915,925,936,948,962,972,982,993,996,1007,1024,1028,1038,1051,1061,1064,1074,1092,1115,1117,1137,1153,1157,1166,1183,1206,1215,1222,1237,1247,1256,1272,1286,1316,1334,1346,1356,1359,1375,1396,1412,1429,1435,1438,1444,1463,1477
186 | ,Portugal,39.3999,-8.2245,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,6,12,14,23,33,43,60,76,100,119,140,160,187,209,246,266,295,311,345,380,409,435,470,504,535,567,599,629,657,687,714,735,762,785,820,854,880,903,928,948,973,989,1007,1023,1043,1063,1074,1089,1105,1114,1126,1135,1144,1163,1175,1184,1190,1203,1218,1231,1247,1263,1277,1289,1302,1316,1330,1342,1356,1369,1383,1396,1410,1424,1436,1447,1455,1465,1474,1479,1485,1492,1497,1504,1505,1512,1517,1520,1522,1523,1524,1527,1528,1530,1534,1540,1543,1549,1555,1561,1564,1568,1576,1579
187 | ,Qatar,25.3548,51.1839,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,3,3,3,4,4,6,6,6,6,6,7,7,7,7,7,7,8,8,9,9,10,10,10,10,10,10,10,10,10,12,12,12,12,12,12,12,12,13,14,14,14,14,14,14,15,15,15,15,16,17,19,21,23,26,28,30,33,36,36,38,40,43,45,45,49,51,54,57,62,66,69,70,70,73,76,80,82,86,93,94,98,99,99,104,106,109,110,110,113,113,115
188 | ,Romania,45.9432,24.9668,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,7,11,17,23,26,37,43,65,82,92,115,133,146,151,176,197,220,248,270,291,316,331,351,372,392,411,421,451,478,498,524,545,567,601,619,641,663,693,717,744,771,790,818,841,864,888,923,939,961,982,1002,1036,1053,1070,1094,1107,1120,1137,1147,1156,1166,1176,1185,1205,1216,1227,1235,1248,1259,1266,1276,1288,1296,1305,1316,1322,1333,1339,1354,1360,1369,1380,1394,1410,1427,1437,1451,1473,1484,1500,1512,1523,1539,1555,1565,1579,1589,1612,1634,1651,1667
189 | ,Russia,60.0,90.0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,3,3,4,4,8,9,17,24,30,34,43,45,47,58,63,76,94,106,130,148,170,198,232,273,313,361,405,456,513,555,615,681,747,794,867,972,1073,1169,1222,1280,1356,1451,1537,1625,1723,1827,1915,2009,2116,2212,2305,2418,2537,2631,2722,2837,2972,3099,3249,3388,3541,3633,3807,3968,4142,4374,4555,4693,4849,5031,5208,5376,5520,5717,5851,5963,6134,6350,6522,6705,6819,6938,7081,7274,7468,7650,7831,7992,8101,8196,8349,8503,8594,8770,8958,9060,9152,9306,9521
190 | ,Rwanda,-1.9403,29.8739,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3
191 | ,Saint Lucia,13.9094,-60.9789,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Saint Vincent and the Grenadines,12.9843,-61.2872,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,San Marino,43.9424,12.4578,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,2,2,3,5,5,5,7,7,11,11,14,20,20,20,21,21,21,21,22,22,25,26,26,30,30,32,32,32,34,34,34,34,35,35,35,36,36,38,39,39,39,39,40,40,40,40,40,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,41,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42,42
194 | ,Saudi Arabia,24.0,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,1,2,3,3,4,8,8,10,16,21,25,29,34,38,41,41,44,47,52,59,65,73,79,83,87,92,97,103,109,114,121,127,136,139,144,152,157,162,169,176,184,191,200,209,219,229,239,246,255,264,273,283,292,302,312,320,329,339,351,364,379,390,399,411,425,441,458,480,503,525,549,579,611,642,676,712,746,783,819,857,893,932,972,1011,1052,1091,1139,1184,1230,1267,1307,1346,1387,1428,1474,1511,1551,1599,1649,1698
195 | ,Senegal,14.4974,-14.4524,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,5,5,6,6,7,7,9,9,9,9,9,9,9,9,10,11,12,13,13,17,19,19,19,21,23,25,25,25,26,30,30,33,33,34,35,35,36,38,39,41,42,42,42,43,45,45,45,47,49,49,52,52,55,56,60,60,64,70,73,76,79,82,84,86,89,93,94,98,102,105,108,112,116
196 | ,Serbia,44.0165,21.0059,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,3,4,1,1,10,13,16,16,28,31,39,44,51,58,61,65,66,71,74,80,85,94,99,103,110,117,122,125,130,134,139,144,151,156,162,168,173,179,179,189,193,197,200,203,206,209,215,215,218,220,222,224,225,228,230,231,234,235,237,237,238,238,239,239,240,241,242,242,243,244,245,245,246,247,248,249,250,250,251,252,252,253,254,255,256,257,258,259,260,261,262,263,263,264,265,267,270,274,277,281
197 | ,Seychelles,-4.6796,55.492,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Singapore,1.2833,103.8333,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,3,3,3,3,4,5,6,6,6,6,6,6,7,8,8,9,10,10,10,11,11,11,11,11,12,12,12,12,12,14,14,14,15,16,17,18,18,18,20,20,20,20,20,21,21,21,21,21,22,22,22,22,22,23,23,23,23,23,23,23,23,23,23,23,24,24,24,24,24,25,25,25,25,25,25,25,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26,26
199 | ,Slovakia,48.669,19.699,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,2,2,2,2,2,2,2,2,2,6,8,9,11,12,13,14,14,15,17,17,18,18,20,22,23,23,24,24,25,25,25,26,26,26,26,26,27,27,27,27,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28,28
200 | ,Slovenia,46.1512,14.9955,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,2,3,4,5,6,9,9,11,11,15,15,17,20,22,28,30,36,40,43,45,50,53,55,56,61,61,66,70,74,77,77,79,79,80,81,82,83,86,89,91,92,94,96,97,98,99,99,100,101,102,102,102,103,103,103,103,104,104,104,105,106,106,106,107,107,108,108,108,108,108,108,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,109,111,111,111,111
201 | ,Somalia,5.1521,46.1996,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,2,2,5,5,6,7,7,8,8,8,16,16,18,23,26,28,28,28,28,31,32,35,38,39,44,44,48,51,52,52,52,53,53,55,56,57,59,61,61,61,61,61,66,67,67,72,72,73,78,79,79,79,79,79,82,83,84,85,85,85,85,87,88,88,88,88,88,88,88,90,90,90,90,90,90,90,90,90,90,90
202 | ,South Africa,-30.5595,22.9375,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,5,5,5,9,9,11,12,13,18,18,24,25,25,27,27,34,48,50,52,54,58,58,65,75,79,86,87,90,93,103,103,116,123,131,138,148,153,161,178,186,194,206,206,219,238,247,261,264,286,312,339,369,397,407,429,481,524,552,577,611,643,683,705,755,792,848,908,952,998,1080,1162,1210,1284,1354,1423,1480,1568,1625,1674,1737,1831,1877,1930,1991,2102,2205,2292,2340,2413,2456,2529,2657,2749
203 | ,Spain,40.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,1,2,3,5,10,17,28,35,54,55,133,195,289,342,533,623,830,1043,1375,1772,2311,2808,3647,4365,5138,5982,6803,7716,8464,9387,10348,11198,11947,12641,13341,14045,14792,15447,16081,16606,17209,17756,18056,18708,19315,20002,20043,20453,20852,21282,21717,22157,22524,22902,23190,23521,23822,24275,24543,24543,25100,25264,25428,25613,25857,26070,26299,26478,26621,26744,26920,27104,27321,27459,27563,27563,27709,27778,27888,27940,28628,28678,28752,26834,27117,27117,27119,27121,27125,27127,27127,27127,27128,27133,27134,27135,27136,27136,27136,27136,27136,27136,27136,27136,27136,27136,27136,27136,28315,28322,28323,28324,28325,28327,28330,28338,28341,28343,28346,28355,28364
204 | ,Sri Lanka,7.0,81.0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,3,4,4,5,5,5,6,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,8,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,10,10,10,10,10,10,10,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11,11
205 | ,Sudan,12.8628,30.2176,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,4,5,5,5,6,10,10,12,12,13,16,16,17,21,22,25,28,31,36,41,41,41,45,49,52,59,64,70,74,80,90,90,91,97,97,105,111,111,121,137,146,165,170,170,195,195,233,262,286,298,307,314,333,347,359,359,372,389,401,413,433,447,459,468,477,487,487,506,521,521,533,548,548,556,572,572,572,572,572,602
206 | ,Suriname,3.9193,-56.0278,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,3,3,3,5,6,6,7,8,8,8,8,9,10,10,10,11,11,13,13,13
207 | ,Sweden,63.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,0,0,0,0,0,0,1,1,1,2,3,6,7,10,11,16,20,21,25,36,62,77,105,105,110,146,180,239,308,358,373,401,477,591,687,793,870,887,899,919,1033,1203,1333,1400,1511,1540,1580,1765,1937,2021,2152,2192,2194,2274,2355,2462,2586,2653,2669,2679,2769,2854,2941,3040,3175,3220,3225,3256,3313,3460,3529,3646,3674,3679,3698,3743,3831,3871,3925,3992,3998,4029,4125,4220,4266,4350,4395,4395,4403,4468,4542,4562,4639,4656,4659,4694,4717,4795,4814,4854,4874,4874,4891,4939,5041,5053,5105,5109,5111,5122,5161,5209,5230,5280,5280,5280,5310,5333,5370
208 | ,Switzerland,46.8182,8.2275,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,3,4,4,11,13,14,14,27,28,41,54,75,98,120,122,153,191,231,264,300,359,433,488,536,591,666,715,765,821,895,948,1002,1036,1106,1138,1174,1239,1281,1327,1368,1393,1429,1478,1509,1549,1589,1599,1610,1665,1699,1716,1737,1754,1762,1762,1784,1795,1805,1810,1823,1830,1833,1845,1867,1870,1872,1878,1879,1881,1886,1891,1892,1898,1903,1905,1906,1913,1915,1917,1919,1919,1919,1920,1920,1920,1921,1921,1921,1921,1921,1923,1934,1936,1937,1938,1938,1938,1939,1954,1956,1956,1956,1956,1956,1956,1956,1958,1958,1962,1962,1962,1962,1963,1965
209 | ,Taiwan*,23.7,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,5,5,5,5,5,5,5,5,5,5,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7
210 | ,Tanzania,-6.369,34.8888,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,3,3,3,3,3,4,4,5,5,7,10,10,10,10,10,10,10,10,10,16,16,16,16,16,16,16,16,16,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21,21
211 | ,Thailand,15.0,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,0,0,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,4,4,4,5,6,7,9,10,12,15,19,20,23,26,27,30,32,33,35,38,40,41,43,46,47,47,47,47,48,49,50,51,51,51,52,54,54,54,54,54,54,54,54,55,55,55,56,56,56,56,56,56,56,56,56,56,56,56,56,56,56,56,57,57,57,57,57,57,57,57,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58,58
212 | ,Togo,8.6195,0.8248,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,5,5,5,5,6,6,6,6,6,6,6,6,6,7,9,9,9,9,9,9,9,9,10,10,11,11,11,11,11,11,11,11,12,12,12,12,12,12,12,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,13,14,14,14,14,14,14,14,14
213 | ,Trinidad and Tobago,10.6918,-61.2225,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,3,3,3,5,5,6,6,7,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8,8
214 | ,Tunisia,34.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,1,1,1,3,3,4,5,6,6,8,8,8,10,12,14,18,18,22,22,23,24,25,25,28,31,34,34,35,37,37,37,38,38,38,38,38,38,38,38,39,40,40,41,41,42,42,43,43,43,44,45,45,45,45,45,45,45,45,45,45,46,47,47,47,47,48,48,48,48,48,48,48,48,48,48,48,49,49,49,49,49,49,49,49,49,49,49,49,49,49,50,50,50,50,50,50,50,50,50,50,50,50,50,50,50
215 | ,Turkey,38.9637,35.2433,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,4,9,30,37,44,59,75,92,108,131,168,214,277,356,425,501,574,649,725,812,908,1006,1101,1198,1296,1403,1518,1643,1769,1890,2017,2140,2259,2376,2491,2600,2706,2805,2900,2992,3081,3174,3258,3336,3397,3461,3520,3584,3641,3689,3739,3786,3841,3894,3952,4007,4055,4096,4140,4171,4199,4222,4249,4276,4308,4340,4369,4397,4431,4461,4489,4515,4540,4563,4585,4609,4630,4648,4669,4692,4711,4729,4746,4763,4778,4792,4807,4825,4842,4861,4882,4905,4927,4950,4974,5001,5025,5046,5065,5082,5097,5115,5131,5150
216 | ,Uganda,1.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,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Ukraine,48.3794,31.1656,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,2,2,2,3,3,3,3,3,5,5,5,9,10,13,17,20,22,27,32,37,38,45,52,57,69,73,83,93,98,108,116,125,133,141,151,161,174,187,201,201,209,220,239,250,261,272,279,288,303,316,327,340,361,376,391,408,425,439,456,476,497,514,535,548,564,579,588,605,617,623,644,658,669,679,696,708,724,733,742,755,770,785,796,805,818,841,864,880,890,899,911,922,953,976,995,1004,1012,1022,1045,1061,1078,1097,1121,1142,1161,1173,1188
218 | ,United Arab Emirates,24.0,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,2,2,2,2,2,2,2,2,2,3,5,6,8,8,9,10,10,11,12,12,14,16,20,22,25,28,33,35,37,37,41,43,46,52,56,64,71,76,82,89,98,105,111,119,126,137,146,157,165,174,185,198,201,203,206,208,210,214,220,224,227,233,237,241,244,245,248,253,255,258,260,262,264,266,269,270,273,274,275,276,281,283,284,286,287,288,289,291,293,295,298,300,301,302,303,305,307,308,310,311,313,314,315,316
219 | Bermuda,United Kingdom,32.3078,-64.7505,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,4,4,4,4,5,5,5,5,5,5,5,5,5,5,5,5,5,5,6,6,6,6,6,7,7,7,7,7,7,7,7,7,8,8,8,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9,9
220 | Cayman Islands,United Kingdom,19.3133,-81.2546,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
221 | Channel Islands,United Kingdom,49.3723,-2.3644,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,3,3,3,4,5,6,7,7,8,8,9,9,9,9,13,15,19,20,21,21,24,24,28,29,34,35,35,35,36,38,40,41,41,41,41,40,40,40,41,41,41,41,42,43,43,43,43,43,43,44,45,45,45,45,45,45,45,45,45,45,45,45,45,46,46,46,46,46,46,46,48,48,48,48,48,48,48,48,48,48,48,48,48,47,47,47,47,47,47,47,47,47,47
222 | Gibraltar,United Kingdom,36.1408,-5.3536,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Isle of Man,United Kingdom,54.2361,-4.5481,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,2,2,2,2,4,4,4,6,6,9,9,15,16,18,18,18,20,21,21,21,22,22,22,23,23,23,23,23,23,23,23,23,23,23,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24,24
224 | Montserrat,United Kingdom,16.7425,-62.1874,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
225 | ,United Kingdom,55.3781,-3.4360000000000004,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,7,7,9,10,28,43,65,81,115,158,194,250,285,359,508,694,877,1161,1455,1669,2043,2425,3095,3747,4461,5221,5865,6433,7471,8505,9608,10760,11599,12285,13029,14073,14915,15944,16879,17994,18492,19051,20223,21060,21787,22792,23635,24055,24393,25302,26097,26771,27510,28131,28446,28734,29427,30076,30615,31241,31587,31855,32065,32692,33186,33614,33998,34466,34636,34796,35341,35704,36042,36393,36675,36793,36914,37048,37460,37837,38161,38376,38489,39045,39369,39728,39904,40261,40465,40542,40597,40883,41128,41279,41481,41662,41698,41736,41969,42153,42288,42461,42589,42632,42647,42927,43081,43230,43414,43514,43550,43575,43730,43906
226 | ,Uruguay,-32.5228,-55.7658,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,2,4,4,5,6,6,7,7,7,7,7,7,8,8,9,9,9,9,10,10,12,12,12,12,14,15,15,15,15,17,17,17,17,17,17,17,17,18,18,19,19,19,19,19,19,19,20,20,20,20,20,20,22,22,22,22,22,22,22,22,22,23,23,23,23,23,23,23,23,23,23,23,23,23,23,23,24,24,24,24,25,25,25,25,26,26,26,26,27,27,27,28
227 | ,US,37.0902,-95.7129,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,6,7,11,12,14,17,21,22,28,33,43,52,58,70,97,131,188,265,362,456,601,784,1021,1333,1746,2300,2934,3561,4381,5605,6846,8432,9747,11031,12470,14138,16447,18563,20638,22731,24777,26548,28376,30780,33329,35442,38056,40442,41671,43466,45919,48312,50749,52867,54517,55810,57233,59454,61955,64256,66125,67681,68777,70086,72393,74851,76770,78497,79976,80855,81868,83480,85234,87008,88669,89892,90644,91414,92965,94528,95756,97025,98146,98754,99267,99952,101461,102643,103809,104773,105364,106136,107169,108159,109168,110138,110818,111269,111774,112714,113631,114512,115334,116082,116378,116769,117607,118357,119061,119733,120340,120593,120999,121834,122590,125012,125618,126109,126349,126698,127417,128062
228 | ,Uzbekistan,41.3775,64.5853,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,3,3,3,4,4,4,4,4,4,4,5,5,5,6,7,7,8,8,8,8,8,9,9,9,9,10,10,10,10,10,10,10,10,10,10,11,11,11,11,12,13,13,13,13,13,13,13,13,14,14,14,14,14,15,15,15,16,16,16,17,17,18,18,19,19,19,19,19,19,19,19,19,19,19,19,19,19,19,20,20,20,22,23,26,26
229 | ,Venezuela,6.4238,-66.5897,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,3,3,5,7,7,7,7,7,9,9,9,9,9,9,9,9,9,9,9,9,9,10,10,10,10,10,10,10,10,10,16,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,10,11,11,11,14,14,14,17,18,20,20,20,22,22,22,23,23,23,23,24,25,26,27,28,28,30,33,33,35,35,38,39,41,42,44,48,51,54
230 | ,Vietnam,16.0,108.0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Zambia,-15.4167,28.2833,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,4,4,4,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,7,10,10,10,10,10,10,11,11,11,11,11,11,11,11,11,18,18,18,21,21,22,22,24,30
232 | ,Zimbabwe,-20.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,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,6,6,6,6,6,6,6,6,7,7,7
233 | Diamond Princess,Canada,0.0,0.0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
234 | ,Dominica,15.415,-61.371,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Grenada,12.1165,-61.678999999999995,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Mozambique,-18.665695,35.529562,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,4,4,4,4,4,5,5,5,5,5,5,5,5,6,6,6
237 | ,Syria,34.802075,38.996815000000005,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,4,4,4,4,4,4,4,4,4,5,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,7,7,7,7,7,7,7,7,7,8,9,9,9,9,9
238 | ,Timor-Leste,-8.874217,125.727539,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Belize,13.1939,-59.5432,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2
240 | ,Laos,19.856270000000002,102.495496,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Libya,26.3351,17.228331,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,4,5,5,5,5,5,5,5,5,5,5,5,5,5,5,5,6,8,10,10,10,10,10,10,10,10,10,17,18,18,18,18,21,23,24,25
242 | ,West Bank and Gaza,31.9522,35.2332,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,4,4,5,8,8
243 | ,Guinea-Bissau,11.8037,-15.1804,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,2,2,2,3,3,3,3,3,3,3,4,4,4,6,6,6,6,6,6,7,7,7,8,8,8,8,8,8,8,8,12,12,12,12,12,12,12,15,15,15,15,15,15,15,17,17,17,19,19,19,19,22,22,22,24,24,24
244 | ,Mali,17.570692,-3.9961660000000006,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,3,3,3,5,5,5,7,7,7,7,9,10,13,13,13,13,13,14,14,14,17,21,21,21,23,23,24,25,26,26,26,27,29,32,32,32,35,37,38,39,40,44,46,46,48,52,52,53,55,60,62,63,65,67,70,70,72,73,76,77,78,78,79,85,87,90,90,92,94,96,97,101,104,104,104,104,107,107,108,109,109,111,111,112,113,113,113,114,115,116,116
245 | ,Saint Kitts and Nevis,17.357822,-62.782998,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Northwest Territories,Canada,64.8255,-124.8457,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Yukon,Canada,64.2823,-135.0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Kosovo,42.602636,20.902977,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,4,5,5,7,7,7,7,8,8,11,12,12,12,15,18,18,19,19,20,21,22,22,22,22,22,22,22,26,26,26,27,27,28,28,28,29,29,29,29,29,29,29,29,29,29,29,29,29,30,30,30,30,30,30,30,30,30,30,30,30,30,30,31,31,31,31,31,32,32,33,33,33,33,33,33,33,37,37,37,37,37,37,37,49,51,54
249 | ,Burma,21.9162,95.956,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,3,3,3,3,4,4,4,4,4,4,5,5,5,5,5,5,5,5,5,5,5,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6,6
250 | Anguilla,United Kingdom,18.2206,-63.0686,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | British Virgin Islands,United Kingdom,18.4207,-64.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,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
252 | Turks and Caicos Islands,United Kingdom,21.694000000000003,-71.7979,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2
253 | ,MS Zaandam,0.0,0.0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2
254 | ,Botswana,-22.3285,24.6849,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
255 | ,Burundi,-3.3731,29.9189,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
256 | ,Sierra Leone,8.460555000000001,-11.779889,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,4,4,4,4,7,7,8,8,9,11,14,16,17,18,18,19,19,26,26,27,29,32,33,33,34,35,38,39,40,42,44,45,45,45,46,46,46,46,47,47,47,48,48,49,50,50,50,51,51,51,51,51,51,51,53,53,55,55,55,55,56,59,59,60,60,60,60
257 | "Bonaire, Sint Eustatius and Saba",Netherlands,12.1784,-68.2385,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,Malawi,-13.254307999999998,34.301525,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,2,2,2,2,2,2,2,2,2,2,2,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,3,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,4,5,6,6,6,6,8,8,8,11,11,11,11,12,13,13,13,13,14,16
259 | Falkland Islands (Malvinas),United Kingdom,-51.7963,-59.5236,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | Saint Pierre and Miquelon,France,46.8852,-56.3159,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 | ,South Sudan,6.877000000000001,31.307,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,4,4,4,4,4,6,8,8,8,8,10,10,10,10,10,10,10,10,10,10,10,14,19,19,19,24,24,27,27,27,30,31,32,34,34,34,35,36,36,36,36,36,36,36,38,38
262 | ,Western Sahara,24.2155,-12.8858,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1
263 | ,Sao Tome and Principe,0.18636,6.613081,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,3,3,3,4,5,5,5,5,5,6,7,7,7,7,7,8,8,8,8,8,8,11,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,12,13,13,13,13,13,13,13,13
264 | ,Yemen,15.552726999999999,48.516388,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,2,2,2,4,5,5,7,7,8,9,10,12,12,15,18,20,20,28,30,33,33,39,42,44,49,53,57,65,77,80,84,87,95,103,111,111,112,112,127,129,136,139,160,164,208,214,244,248,251,254,256,257,261,274,288,293,296,302,304,312,318
265 | ,Comoros,-11.6455,43.3333,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,2,3,3,5,5,5,5,5,7,7,7,7,7,7,7,7,7
266 | ,Tajikistan,38.861034000000004,71.276093,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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,2,3,5,8,12,12,20,20,21,21,23,29,33,36,39,41,41,41,44,44,44,46,46,47,47,47,47,47,47,47,47,48,48,48,48,48,48,48,48,49,49,50,50,50,50,51,51,51,52,52,52,52,52,52,52,52,52,52,52,52
267 | ,Lesotho,-29.609988,28.233608,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,0,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 |
--------------------------------------------------------------------------------