diff --git a/.gitignore b/.gitignore
new file mode 100644
index 0000000..9e8910d
--- /dev/null
+++ b/.gitignore
@@ -0,0 +1,10 @@
+.Rproj.user
+.Rhistory
+.RData
+.Ruserdata
+data/
+*.rds
+02_build_dashboard.R
+03_map.R
+03_plotlymap.R
+99_updates.R
\ No newline at end of file
diff --git a/00_load_data.R b/00_load_data.R
new file mode 100644
index 0000000..3310e28
--- /dev/null
+++ b/00_load_data.R
@@ -0,0 +1,126 @@
+library(pacman)
+p_load(wbstats, rio, tidyverse, magrittr)
+
+
+### get data from WDI: ----
+from <- 1990
+to <- 2020
+
+wdi <- wb_data(indicator = c(pop = "SP.POP.TOTL",
+ area = "AG.LND.TOTL.K2",
+ internet = "IT.NET.USER.ZS",
+ import = "BM.GSR.GNFS.CD",
+ export = "BX.GSR.GNFS.CD",
+ fdi_in = "BX.KLT.DINV.CD.WD",
+ fdi_out = "BM.KLT.DINV.CD.WD",
+ tourism_in = "ST.INT.ARVL",
+ tourism_out = "ST.INT.DPRT"),
+ start_date = from, end_date = to,
+ return_wide = T) %>%
+ rowwise() %>%
+ # if only in OR out is not reported, it's assumed that the other is neglectable (see Schröder 2020)
+ mutate(fdi = ifelse(is.na(fdi_in) && is.na(fdi_out),
+ NA,
+ sum(abs(fdi_in), abs(fdi_out), na.rm = T)),
+ trade = ifelse(is.na(import) && is.na(export),
+ NA,
+ sum(import, export, na.rm = T)),
+ tourism = ifelse(is.na(tourism_in) && is.na(tourism_out),
+ NA,
+ sum(tourism_in, tourism_out, na.rm = T)))
+
+### Indicators not available via WDI: ----
+# - International telephone traffic (ITU)
+# - International Meetings/Conferences (UIA)
+# - International aircraft passengers (ICAO)
+
+### join data from other sources:
+icao <- rio::import("data/ICAO.xlsx")
+
+uia <- rio::import("data/UIA.xlsx",
+ na.strings = c("NA", "..")) %>%
+ pivot_longer(., cols = `1990`:`2018`,
+ names_to = "Year",
+ values_to = "int_meetings",
+ names_transform = list(Year = as.integer))
+
+phone <- rio::import("data/phone.xlsx",
+ which = "total total",
+ na.strings = c("NA", "..")) %>%
+ pivot_longer(., cols = `1990_value`:`2017_value`,
+ # string removal not very elegant!
+ names_to = c("Year", "drop"),
+ values_to = "int_phone_minutes",
+ names_sep = 4, names_transform = list(Year = as.integer))
+
+
+# join local data:
+other_sources <- right_join(uia, full_join(phone, icao,
+ by = c("Year", "Country" = "Name")),
+ by = c("Year", "Code" = "State")) %>%
+ select(Code, Year, Int_Departures, int_phone_minutes, int_meetings)
+
+
+### join wdi and others: ----
+data_raw <- full_join(wdi, other_sources,
+ by = c("date" = "Year",
+ "iso3c" = "Code"))
+
+
+
+### Even more valid indicators (see Schröder 2020): ----
+# Note: Some of this data is not publicly available.
+# The processed data can be found in folder /data_processed.
+# Raw data for replication upon request.
+
+# - Replace air passengers with international revenue passenger kilometres (ICAO)
+RPK <- rio::import("data/ICAO_RPK.xlsx",
+ which = "Int. RPK clean",
+ na.strings = c("NA", "..")) %>%
+ pivot_longer(., cols = `1990`:`2017`,
+ names_to = "date",
+ values_to = "int_rpk",
+ names_transform = list(date = as.integer))
+
+data_raw %<>% left_join(., RPK,
+ by = c("iso3c" = "Code", "date"))
+
+# - Replace number of internet users with internationally transferred bandwidth (ITU)
+international_internet <- rio::import("data/ITU.xlsx",
+ which = "int. IT bandwidth",
+ na.strings = c("NA", "..")) %>%
+ pivot_longer(., cols = `1990`:`2017`,
+ names_to = "date",
+ values_to = "int_mbits",
+ names_transform = list(date = as.integer)) %>%
+ select(-`1988`, -`1989`)
+
+data_raw %<>% left_join(., international_internet,
+ by = c("country" = "Country", "date"))
+
+# - Extend Trade in goods & services with primary income (WDI)
+data_raw <- wbstats::wb_data(indicator = c(
+ import_g_s_pi = "BM.GSR.TOTL.CD",
+ export_g_s_pi = "BX.GSR.TOTL.CD"),
+ start_date = from, end_date = to,
+ return_wide = T) %>%
+ select(-iso2c, -country) %>%
+ rowwise() %>%
+ # if only in OR out is not reported, the other is assumed to be neglectable (see Schröder 2020)
+ mutate(trade_g_s_pi = ifelse(is.na(import_g_s_pi) && is.na(export_g_s_pi),
+ NA,
+ sum(import_g_s_pi, export_g_s_pi, na.rm = T))) %>%
+ right_join(., data_raw,
+ by = c("iso3c", "date"))
+
+
+# - create communication technology indicator reflecting technological change relevant for globalization:
+# - until 2005: phone traffic correlates highly with all other globalization indicators while internet does not
+# - from 2006: other way round, hence include:
+# - telephone traffic prior to 2006
+# - internet traffic from 2006
+data_raw %<>% mutate(comtech = ifelse(date < 2006,
+ int_phone_minutes,
+ int_mbits))
+
+ # however, coverage (esp. in terms of years) are not that good for some indicators, hence we offer both indices.
diff --git a/01_build_index.R b/01_build_index.R
new file mode 100644
index 0000000..13414f6
--- /dev/null
+++ b/01_build_index.R
@@ -0,0 +1,159 @@
+source("00_load_data.R")
+p_load(tidyverse,
+ magrittr,
+ stats,
+ magrittr)
+options(scipen = 999)
+
+### normalize data:
+
+# by population:
+data_pc <- data_raw %>%
+ select(country,
+ iso3c,
+ date,
+ area,
+ pop,
+ import,
+ int_rpk:comtech,
+ everything(),
+ -iso2c) %>%
+ mutate(across(import:int_meetings,
+ ~ .x / pop)) %>%
+ filter(!is.na(iso3c) && !is.na(country)) # excluding rows with no information
+
+
+
+
+### panel normalization:
+
+# exclude small states (as defined by Kessler 2016) for normalization
+data_pc %<>%
+ mutate(small = if_else(pop < 1000000 | area < 3000,
+ T,
+ F),
+# There are some NAs for variable small:
+ # NAs <- filter(data_pc, is.na(small))
+ # some years for Kosovo, South Sudan, Eritrea, and Kuwait, none of them being a small state according to the definition
+ small = ifelse(is.na(small),
+ F,
+ small))
+
+# get long df:
+data_pc_long <- data_pc %>%
+ pivot_longer(cols = import:int_meetings,
+ names_to = "variable",
+ values_to = "value")
+
+
+# only relevant variables
+normal_range <- data_pc %>%
+ # for now, we use all years. This is to allow to adapt code later to avoid biases induced by skewed patterns of data availability:
+ filter(., between(date, 1990, 2020)) %>%
+ select(import:int_meetings)
+
+distribution_step1 <- as.data.frame(apply(normal_range, 2, summary)) %>%
+ t() %>%
+ as.data.frame() %>%
+ mutate(iqr = `3rd Qu.`- `1st Qu.`) %>%
+ select(lower_quartile = `1st Qu.`,
+ upper_quartile = `3rd Qu.`,
+ iqr) %>%
+ rownames_to_column(var = "variable") %>%
+ right_join(., data_pc_long,
+ by = "variable")
+
+# exclude small states and extreme outliers before defining max/min:
+distribution_step2 <- distribution_step1 %>%
+ mutate(value = ifelse(value > upper_quartile + 3 * iqr |
+ value < lower_quartile - 3 * iqr |
+ small == T,
+ NA,
+ value)) %>%
+ select(variable, value) %>%
+ rownames_to_column(var = "unique_identifier_i_actually_dont_need") %>%
+ pivot_wider(names_from = "variable",
+ values_from = "value") %>%
+ select(-unique_identifier_i_actually_dont_need) # not pretty but works as well
+
+# join data with max/min
+distribution <- as.data.frame(apply(distribution_step2, 2, summary)) %>%
+ t() %>%
+ as.data.frame() %>%
+ select(minimum = Min.,
+ maximum = Max.) %>%
+ rownames_to_column(var = "variable")
+
+data_pc_long %<>% left_join(., distribution,
+ by = "variable")
+
+# exclude extreme outlier values outside between(25% quantile - 3 * IQR, 75% quantile + 3 * IQR)(see Schröder 2020):
+data_normalized_long <- data_pc_long %>%
+ mutate(normalized = ((value - minimum) / (maximum - minimum)) * 100) %>%
+ # set outliers to 0 / 100:
+ mutate(normalized = case_when(normalized > 100 ~ 100,
+ normalized < 0 ~ 0,
+ TRUE ~ normalized))
+
+
+indicators <- c("internet", "fdi", "trade", "tourism", "Int_Departures", "int_phone_minutes", "int_meetings", "comtech", "int_rpk", "trade_g_s_pi")
+data_normalized <- data_pc %>%
+ select(country:pop, small)
+
+for (i in 1:length(indicators)){
+ data_normalized %<>%
+ bind_cols(., data_normalized_long %>%
+ filter(variable == indicators[i]) %>%
+ select(normalized))
+ }
+
+data_normalized %<>% rename("internet" = normalized...7,
+ "fdi" = normalized...8,
+ "trade" = normalized...9,
+ "tourism" = normalized...10,
+ "Int_Departures" = normalized...11,
+ "int_phone_minutes" = normalized...12,
+ "int_meetings" = normalized...13,
+ "comtech" = normalized...14,
+ "int_rpk" = normalized...15,
+ "trade_g_s_pi" = normalized...16)
+
+### Combining to index ----
+
+# all variables are theoretically valid, load strongly on a common factor and are highly intercorrelated (Kessler 2016, Schröder 2020)
+# therefore the index can be constructed simply by taking the average of all available normalized variables:
+
+index <- data_normalized %>%
+ rowwise() %>%
+ mutate(KGI_original = mean(c(internet,
+ fdi,
+ trade,
+ tourism,
+ int_rpk,
+ int_phone_minutes,
+ int_meetings),
+ na.rm = T),
+ KGI_new = mean(c(comtech,
+ fdi,
+ trade_g_s_pi,
+ tourism,
+ int_rpk,
+ int_meetings),
+ na.rm = T)) %>%
+ bind_cols(.,
+ apply(data_normalized %>%
+ select(internet:int_meetings),
+ 1,
+ function(x) sum(!is.na(x))),
+ apply(data_normalized %>%
+ select(fdi, tourism, int_meetings:trade_g_s_pi),
+ 1,
+ function(x) sum(!is.na(x)))) %>%
+ rename(n_vars_original = ...19,
+ n_vars_new = ...20)
+
+### save processed data ----
+try(dir.create("data_processed"), silent = T)
+save(index, file = "data_processed/KGI.Rdata")
+rio::export(index, file = "data_processed/KGI.csv")
+rio::export(index, file = "data_processed/KGI.xlsx")
diff --git a/02 Shinyapp.R b/02 Shinyapp.R
new file mode 100644
index 0000000..41c686e
--- /dev/null
+++ b/02 Shinyapp.R
@@ -0,0 +1,243 @@
+# Load packages and data
+# library(pacman)
+# p_load(rio,
+# shiny,
+# shinydashboard,
+# plotly,
+# readr,
+# tidyverse)
+
+library(shiny)
+library(shinydashboard)
+library(plotly)
+library(readr)
+library(tidyverse)
+library(rio)
+
+KGIdata_original <- rio::import(file = "rsconnect/shinyapps.io/milanschroeder/KGI.Rdata")
+
+# Define UI ----------------------------------------------------------------
+header <- dashboardHeader(title = "How globalized is the world? The Kessler Globality Index",
+ titleWidth = 750)
+
+sidebar <- dashboardSidebar(
+ sidebarMenu(
+ menuItem("About",
+ tabName = "model",
+ icon = icon("book"),
+
+ menuItem("Method",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard/blob/main/README.md#kessler-globality-index-kgi",
+ newtab = F),
+
+ menuItem("Full Report",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard/blob/main/README.md",
+ newtab = F),
+
+ menuItem("Sources",
+ menuSubItem(text = "Kessler (2016)",
+ href = "https://link.springer.com/book/10.1007/978-3-658-02388-1",
+ newtab = F),
+ menuSubItem(text = "Schröder (2020)",
+ href = "https://hertieschool-my.sharepoint.com/:b:/g/personal/204856_hertie-school_org/EWp8tWUAvD5IjOmgbVoQjd8BaXL1bQNd_nuxH0u5ftVhoQ",
+ newtab = F)),
+
+ menuItem("Contributors",
+ menuSubItem(text = "Francesco Danovi, Università Bocconi",
+ href = "https://it.linkedin.com/in/francesco-danovi-189152186",
+ newtab = F),
+ menuSubItem(text = "Federico Mammana, Università Bocconi",
+ href = "https://www.linkedin.com/in/federico-mammana/",
+ newtab = F),
+ menuSubItem(text = "Milan Schröder, Hertie School",
+ href = "https://www.linkedin.com/in/milan-schroeder/",
+ newtab = F))),
+
+ menuItem("Controls", tabName = "model", icon = icon("mouse"), startExpanded = T,
+ sliderInput("year", "Select year", 1990, 2020, 2017, step = 1, sep = "", animate = T),
+ checkboxInput("small_include",
+ "Include small countries? (pop. < 1 Mio.)",
+ value = FALSE),
+
+ sliderInput("min_vars",
+ "Min. Number of Indicators",
+ 1, 7, 3),
+
+ selectInput("version",
+ "KGI version:",
+ c("Kessler (2016)" = "KGI_original",
+ "Schröder (2020)" = "KGI_new"))),
+
+ menuItem("Link to Code",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard",
+ icon = icon("code"),
+ newtab = F),
+ menuItem("Download Data",
+ icon = icon("save"),
+ menuItem(text = ".csv",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard/raw/main/data_processed/KGI.csv",
+ newtab = F),
+ menuItem(text = ".xlsx",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard/raw/main/data_processed/KGI.xlsx",
+ newtab = F),
+ menuItem(text = ".Rdata",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard/raw/main/data_processed/KGI.Rdata",
+ newtab = F)),
+ collapsed = F
+ ),
+ width = 300
+)
+
+body <- dashboardBody(
+ fluidRow(
+ column(3,
+ wellPanel(
+ h4("Most globalized countries"),
+ tableOutput("ranking"))),
+ column(9,
+ plotlyOutput("world_map"))),
+
+ fluidRow(
+ wellPanel(
+ htmlOutput("description"))),
+
+ fluidRow(
+ column(12,
+ span("For detailled information consult our methods.",
+ align = "right"))),
+ fluidRow(
+ column(12,
+ span("Note: Since all indicators are computed on a per capita basis, including small countries may produce an uniformative ranking.",
+ align = "right"))),
+ fluidRow(
+ column(12,
+ span("Data for 2020 should tread lightly due to the effects of the COVID-19 pandemic.",
+ align = "right")))
+)
+
+ui <- dashboardPage(skin = "red",
+ header,
+ sidebar,
+ body
+)
+
+# Define Server -----------------------------------------------------------
+server <- function(input, output, session) {
+
+ # creating temp vars here to filter:
+ filtered_data <- reactive({
+ year <- input$year
+ small_include <- input$small_include
+ min_vars <- input$min_vars
+ version <- input$version
+
+ # filtering data:
+ KGIdata_filtered <- KGIdata_original %>%
+ mutate(KGI = ifelse(version == "KGI_original",
+ KGI_original,
+ KGI_new),
+ n_vars = ifelse(version == "KGI_original",
+ n_vars_original,
+ n_vars_new),
+ indicators_max = ifelse(version == "KGI_original",
+ 7,
+ 6),
+ hover = paste0(country, "\nKGI: ", KGI, "\nIndicators available: ", n_vars, "/", indicators_max)) %>%
+ filter(ifelse(small_include == T,
+ !is.na(small),
+ small == F),
+ date == year,
+ n_vars >= min_vars) %>%
+ # just to make sure:
+ as.data.frame() %>%
+ arrange(desc(KGI))
+ KGIdata_filtered
+ })
+
+ # construct Top10 list:
+ output$ranking <- renderTable({
+ filtered_data() %>%
+ select(country, KGI) %>%
+ arrange(desc(KGI)) %>%
+ head(10)
+ })
+
+ # construct worldmap:
+ output$world_map <- renderPlotly({
+ # Define plotly map's properties, font, labels, and layout
+ graph_properties <- list(
+ scope = 'world',
+ showland = TRUE,
+ landcolor = toRGB("lightgrey"),
+ color = toRGB("lightgrey"))
+
+ font = list(
+ family = "DM Sans",
+ size = 15,
+ color = "black")
+
+ label = list(
+ bgcolor = "#EEEEEE",
+ bordercolor = "gray",
+ font = font)
+
+ borders_layout <- list(color = toRGB("grey"), width = 0.5)
+
+ map_layout <- list(
+ showframe = FALSE,
+ showcoastlines = TRUE,
+ projection = list(type = 'Mercator'))
+ # Build actual plotly map
+ world_map = plot_geo(filtered_data(),
+ locationmode = "world",
+ frame = ~ date) %>%
+ add_trace(locations = ~ iso3c,
+ z = ~ KGI,
+ zmin = 0,
+ zmax = 100,
+ color = ~ KGI,
+ colorscale = "Inferno",
+ text = ~ hover,
+ hoverinfo = 'text') %>%
+ layout(geo = map_layout,
+ font = list(family = "DM Sans")) %>%
+ style(hoverlabel = label) %>%
+ config(displayModeBar = FALSE)
+ })
+
+ # include short description of chosen index:
+ output$description <- renderText({
+ ifelse(input$version == "KGI_original",
+ "
The Kessler Globality Index (KGI) is a clear and effective measure of the level of globality, i.e. the level of transboarder interaction between people (see Kessler 2016).
+
It comprises seven highly intercorrelated, theoretically valid indicators all loading strongly on one common factor:
+
+ - volume of international trade in goods and services (World Development Indicators)
+ - foreign direct investments, inflows and outflows (World Development Indicators)
+ - international tourism, arrivals and departures (World Development Indicators)
+ - international meetings (Union of International Associations)
+ - international arrivals and departures at commercial airports (International Civil Aviation Organization)
+ - international incoming and outgoing telephone traffic in minutes (International Telecommunications Union)
+ - share of individuals using the internet (International Telecommunications Union)
+
",
+
+ " The refined version of the Kessler Globality Index (KGI) is a clear and effective measure of the level of globality, i.e. the level of transboarder interaction between people (see Schröder 2020).
+
It comprises six highly intercorrelated, theoretically valid indicators all loading strongly on one common factor:
+
+ - volume of international trade in goods, services, and primary income (World Development Indicators)
+ - foreign direct investments, inflows and outflows (World Development Indicators)
+ - international tourism, arrivals and departures (World Development Indicators)
+ - international meetings (Union of International Associations)
+ - internationally operated revenue passenger kilometres (International Civil Aviation Organization)
+ - a communication technology indicator, covering the shift in predominant communication tools, i.e.:
+
+ - until 2005: international incoming and outgoing telephone traffic in minutes (International Telecommunications Union)
+ - from 2006: international bandwidth usage in Mbit/s (International Telecommunications Union)
+
+
+
")
+ })
+}
+
+# Run the app:
+shinyApp(ui = ui,
+ server = server)
diff --git a/03_Report.Rhtml b/03_Report.Rhtml
new file mode 100644
index 0000000..2b16b92
--- /dev/null
+++ b/03_Report.Rhtml
@@ -0,0 +1,114 @@
+
+
+
+Globalization Dashboard Report
+
+
+
+
+ Authors:
Francesco Danovi: wrote the report and worked on the html file
Federico Mammana: set out the dashboard and prepared the plotly map
Milan Schröder: elaborated the data, constructed the index and implemented reactivity between dashboard and sidebar
+
+
+ Introduction
+
We aim to fill a gap in research resources: Currently, there is only one curated Index of Globality (i.e., the level of Globalization) available to researchers interested in a measurement of globalization as a multidimensional phenomenon beyond its pure economic dimension – the KOF Globalisation Index (Dreher et al. 2008; Gygli et al. 2018). This index, however, applies a “flexible definition” (Gygli et al. 2018), operationalizing globalization as a catch-all-term that incorporates theoretically distinct concepts (e.g., cross-border interaction, integration, interdependence) in a complex but rather arbitrary fashion (see Kessler 2016; Schröder 2020). Indicators of these concepts yield empirically strongly differential results. The KOF’s dominance seems to originate less from its validity than its availability.
To provide an alternative to scholars interested in a more valid measure, we plan to construct an updated version of the Kessler Globality Index (Kessler 2016), that was only constructed for a single year yet. The KGI follows the contrary approach to the KOF, focussing on a clear definition, the strong validity of its indicators, and simple replicability. This makes it feasible to construct the KGI for a wide range of countries over a period of at least up to 30 years, using data available via APIs mostly. With approval of the author, we will include some minor updates and present the data as an interactive dashboard. We will proceed by illustrating what we mean by globality measures and globalization. Later on, we will discuss the KOF index, what parameters it follows and why we identify the need to offer an alternative index. We will then delve into KGI, by explaining how it its structure and benefits. Finally, we will illustrate our dashboard in detail and how it can complement existing research resources.
+
+
+ Globalization measurement
+
Although it is hard to find a precise definition of globalization everyone can agree on, we believe that globality measures should:
- depict the cross-border interaction of individuals;
- be clearly delineated from ambiguous terms;
- include the socio-cultural, political and economic dimensions (without weighting them arbitrarily);
- be spatially and temporally adequate;
- show clear distinction from causes and consequences.
When measured, the process of globalization must go beyond a single point in time and be chronologically repeatable.s
+In the following, existing approaches for measuring globalization will first be examined in detail with regard to these criteria.
+
+
+
+
+ Existing approaches to measuring globality
+
In line with the conceptual disagreement, the literature contains a large number of indicators for measuring globalization. By means of a comparison with the KGI, Kessler (2016: 172-175) developed some alternative measures, showing that even a single valid indicator can be superior to complex multiple measures. As he himself notes, the tested indicator, the per capita standardized foreign trade volume, is itself part of the KGI and has by far the best data availability of all the indicators included (ibid .: 165). Multiple globality measurements have - in addition to the mapping of the multi-dimensionality of the phenomenon - in principle, however, the advantage of being more robust against random measurement errors, outliers and the influence of insufficiently valid indicators, as these are affected by other indicators and tend to be evened out. However, all individual indicators should represent the common theoretical construct with satisfactory validity and correlate strongly with one another in the sense of the criterion of convergence validity.
If this criterion is not met, it could be argued that the theoretical construct consists of mutually independent dimensions, which however, it is not convincing because the measurement would then lead to arbitrarily different results depending on the choice of dimensions and indicators (ibid .: 149-156).
+It should be noted, however, that Kessler (2016: 149-160) found far-reaching deficiencies in the validity of various globalization indexes. This especially applies to the KOF index, which has since been partially revised, the results of which are published annually, and which is probably also the most common multiple measure for globalization for this reason. The KOF index is therefore to be examined in the following and compared to the KGI, which is particularly concerned with validity.
+
+
+
+
+ KOF Globalization Index
+
The KOF Globalization Index is an index that provides annual data on the level of globalization at the level of nation states. Globalization is defined here as the “process of creating networks of connections among actors at multi-continental distances, mediated through a variety of flows including people, information and ideas, capital and goods” (Gygli et al. 2019: 546). The concept here corresponds to a catch-all approach that combines the understanding of interaction, integration and interdependence. Aspects of globalization as universalization, such as “the global spread of ideas” (ibid.), are part of the globalization concept used as a core component of the social dimension. In particular, the sub-dimension of cultural proximity also includes the understanding of globalization as “westernization” in the concept, because according to the authors, cultural globalization denotes the “domination of U.S. cultural products "(ibid.). Already the theoretical conception of the KOF-Index thus shows a contradiction to the demarcation of cross-border interaction from alternative globalization terms required in the above analysis framework.
+With the current edition, the KOF-Index has undergone a far-reaching revision: while 23 indicators were included in the 2007 KOF-Index, after the revision there were almost twice as many.
+
+
+
+A fundamental problem of the KOF is based on its very broad concept of globalization. Following this catch-all term, some indicators do not depict cross-border interaction, but one or more of the globalization concepts. In addition to the number of McDonald's restaurants and IKEA stores that depict globalization (at most) as Americanization or Westernization (Kessler 2016: 157), the many indicators that depict globalization as integration, i.e. cross-border interaction, are particularly noticeable in relation to internal interaction. This applies to almost all indicators of economic de facto globalization. The standardization of the indicators with GDP can be seen as a clear indication of this. The number of memberships in intergovernmental organizations should also be seen as an indicator of political integration.
+A large number of indicators of all dimensions also violate the requirement set out above for an adequate representation of the phenomenon in terms of time: all those variables that depict stocks instead of the more volatile flows are obviously problematic for measuring the annual globalization level. The problem exists, for example, with trade agreements and the proportion of the population born abroad, which is included in the KOF as a migration indicator (cf. ibid .: 153).
+
+
+Some indicators, such as the number of embassies or NGOs, are also included in the index as absolute values in a completely unstandardized manner: if, however, there are as many embassies in a country the size of China as in a small state, the latter would, according to the general understanding, be much more globalized. Standardization with the population size, which is missing here, is therefore recommended (cf. ibid .: 151-153).
+The most dramatic problem, however, is the lack of separation between the globalization process and its (possible) causes and consequences: this affects almost the entire de jure globalization index. While in the original version of the KOF only the economic dimension was subordinated to a sub dimension “Restrictions” with a weight of 50% (Dreher et al. 2008: 47f.), enabling factors in the latest edition have a share of 50% in the overall index (Gygli et al. 2019: 545). For many of the variables included, it also appears to be questionable whether they can even be regarded as enabling factors or consequences. Whether, for example, telephone and television connections actually lead to cross-border interaction can certainly be doubted. It is much more likely that most of the usage will be limited to national TV channels and that domestic calls will be predominantly made.
+
+
+Formal education, civil liberties and freedom of the press may at least be related to globalization as enabling factors or consequences, but the inclusion of such indicators in the KOF index implies an implicit assessment of globalization as a just, democratic development that has yet to be proven. The investigation of such relationships would be a typical application of a globalization measure, for which the KOF disqualifies itself by including central normatively relevant dependent variables in the independent variable. While the above-mentioned variables can still be justified to some extent comprehensibly, at least in terms of understanding globalization as universalization (Gygli et al. 2019: 557), gender parity as an indicator of globalization can still be surprising. One could argue that the universalization of a “western” value of gender equality could be mapped, but global dissemination requires a starting point. To see such a “place of origin” of gender equality in the “western” world seems at least somewhat debatable, if not presumptuous.
+
+
+In summary, the validity of the content of many of the KOF indicators must be seriously questioned for various reasons - in particular the mixture of globalization with enabling factors and integration.
+
+
+The weighting procedure is probably the heart of the KOF. However, the weighting on the upper levels is arbitrary. De facto and de jure globalization make up 50% each, which in turn are made up of 33.3% each from the three defined dimensions. The economic dimension in turn consists of two sub-indices, the social of three, the political, on the other hand, has no sub-indices whatsoever (Gygli et al .: 545), which means that the total weight of the indicators depends not only on the calculated weights, but on the (somewhat arbitrary) classification under dimensions and sub-indices.
+In addition to the inadequate theoretical foundation and the content-related validity problems of the individual indicators, the ultimately arbitrary weighting speaks against using the KOF index as a measure of globalization without hesitation.
+
+
+
+ Kessler Globality Index (KGI)
+
The Kessler Globality Index (KGI) is currently only available for a single year of investigation, 2016, which is obviously problematic for the investigation here, since only the globality of the subjects of investigation, instead of possible globalization processes, could actually be investigated.
+The KGI pursues a fundamentally different approach than the KOF Index: it is "more important that each individual indicator represents the selected theoretical construct in a satisfactorily valid manner than on maximizing the number of indicators" (Kessler 2016: 164) . The KGI also has significantly higher demands on the theoretical justification than the KOF. Attention is paid to an adequate measurement of globality in the sense of the concept of cross-border interaction, to a spatially and temporally appropriate recording, and it avoids mixing with related concepts.
+The simplicity is shown by its calculation: the index is composed of seven indicators that are standardized, consistently averaged per capita and equally weighted, as usual, for a uniform value range from 0 to 100 (ibid .: 160).
+This already has the advantage over the KOF of a less arbitrary weighting. Equally weighting the individual indicators would be problematic if several of the variables represented the same aspect of globalization and this would therefore be implicitly weighted twice. However, this only seems conceivable in one place: the definition of the tourism indicator of the World Bank includes not only leisure tourism trips, but is defined as the “activity of people traveling to and staying in places outside their usual environment for no more than one year for leisure, business, and other purposes not related to an activity remunerated from within the place visited”(World Bank 2020), thus includes almost all non-permanent entries and exits, including business trips. However, this results in a strong overlap with the air traffic indicator used in the KGI. Obviously planes are not the only form of travel, but in many cases this accounts for the majority of trips, which is why an extremely strong correlation between the two indicators is to be expected. The strong correlation between all indicators that the KGI assumes should ultimately ensure that such a weighting is empirically not too significant. For the above-mentioned reasons, however, it should be avoided.
+
+
+
+The indicators used are the volume of foreign trade, as well as foreign direct investments (FDIs; sum of inflows and outflows; both in US dollars), international meetings , international arrivals and departures at commercial airports, international tourist arrivals and departures, international incoming and outgoing telephone traffic in minutes and the estimated number of people with Internet access, each per capita (ibid .: 161-164).
+Correlation and factor analysis were used to examine whether the indicators actually depict the same theoretical construct. The analysis consistently showed very strong relationships between the individual indicators, all of which also have a very strong impact on a single factor (ibid .: 164-167). Attention is paid to the occurrence of all dimensions in the KGI - even if the assignment is only a tendency.
+There are only more serious validity concerns for one single indicator, Internet users. On the one hand, this is not about the interaction process itself, but rather an enabling factor which cannot distinguish between domestic and cross-border interaction via the Internet. Since access to the Internet is also increasing globally, further use of this indicator would presumably lead to an approximation of usage figures to 100% in many countries in the future and the potentially serious differences in usage intensity between the countries would be completely ignored. Since complete coverage with Internet connections does not, of course, mean that globalization has reached its maximum, the fixed limitation of the scale must be viewed as problematic.
+There are no fundamental problems with the other indicators, only minor optimization possibilities or concerns about the suitability of the data used.
+The total index is finally calculated using a simple additive procedure with the same weighting, that is, by calculating the arithmetic mean from all existing values. A KGI value is shown when at least three of the seven values are available. Due to the strong correlations between the individual indicators, this appears to be entirely justifiable, since it can be assumed that a single value present represents a satisfactorily valid proxy for the level of globalization (Kessler 2016: 168f.). Since the KGI has proven to be a theoretically superior measure of globality, a slight revision and reproduction for the years 1990-2020 will be carried out below and its validity will be tested.
+
+
+
+
+ Our revised Dashboard
+
Our Dashboard uses data from 1990 to 2020. As previously explained, its aim is to replicate the KGI for this range of years. The indicators used to assess the level of globalization are: population, area, internet users, level of imports, level of exports, foreign direct investments (in and out), level of tourism in and out. The following indicators were not available via WDI but can be made available upon request: International telephone traffic (ITU), International Meetings and Conferences (UIA) and International aircraft passengers (ICAO).
+
+
+
+For the constriuction of an informative index with an easily interpretable range, data was first per capita- and then panel-normalized. To identify the maximum and minimum values for normalization we excluded small states (as defined by Kessler 2016) and extreme outliers (outside 25% quantile - 3 * IQR, 75% quantile + 3 * IQR, see Schröder 2020).
+We then normalized the data on a scale ranging from 0 to 100.
+Finally, we combined the variables that are all theoretically valid, load strongly on a common factor and are highly intercorrelated (Kessler 2016, Schröder 2020); for this reason, the index can be constructed simply by taking the average of all available normalized variables.
+
+
+The following step was to build an interactive dashboard in the form of a map, where countries are given different colors according to the level of globalization reached. We cover all years from 1990 to 2020 (with varying data quality).
+A small table stating the top 10 countries is provided as well.
+
+Users get the option to select between Kessler's (2016) original KGI (as described above), and a refined edition developed by Schröder (2020). While the latter has some theoretical benefits due to newly available indicators that more precisely depict the volume and reach of cross-boarder interactions, the original index has advantages in terms of data coverage. By providing both alternatives, we allow interested researchers to test the robustness of their findings based on an alternative measure.
+
+Additionally, users can choose a minimal number of indicators as a condition to be included in the output, animate the global changes over time, zoom in, find detailled information about the method, contributors, and download the data in several formats.
+
+
+
+
+ References
+
+ - Dreher, Axel; Gaston, Noel; Martens, Pim (2008): Measuring Globalisation. New York, NY: Springer.
+ - Gygli, Savina; Haelg, Florian; Potrafke, Niklas; Sturm, Jan-Egbert (2019): The KOF Globalisation Index – revisited. In: The Review of International Organizations 14 (3), S. 543– 574.
+ - Kessler, Johannes (2016): Theorie und Empirie der Globalisierung. Wiesbaden: Springer Fachmedien.
+ - Schröder, Milan Aljoscha (2020): Gerechte Globalisierung? Zur Messung von Globalisierungsprozessen und ihrem Einfluss auf die Verteilungsgerechtigkeit Hausarbeit zur Erlangung des akademischen Grades Bachelor of Arts in Politikwissenschaft. Sozialwissenschaften, Medien und Sport der Johannes Gutenberg-Universität Mainz. Available online: https://hertieschool-my.sharepoint.com/:b:/g/personal/204856_hertie-school_org/EWp8tWUAvD5IjOmgbVoQjd8BaXL1bQNd_nuxH0u5ftVhoQ?e=DUxeYO
+
+
+ Data Sources
+
+ - Central Intelligence Agency (CIA) (2018): The World Factbook 2016-17. Washington, DC.
+ - International Civil Aviation Organisation (ICAO) (1993-2018): The World of Air Transport. Presentation of Air Transport Statistical Results. Compilation from the ICAO Annual Report to the Council.
+ - International Civil Aviation Organisation (ICAO) (2019): State Traffic Statistics. Available online: https://www.icao.int/safety/iStars/Pages/API-Data-Service.aspx.
+ - International Telecommunication Union (ITU) (2018): World Telecommunication Indicators Database.
+ - Union of International Associations (UIA) (2001-2018): Yearbook of International Organizations. Guide to Global and Civil Society Networks. Vol 5: Statistics, Visualizations and Patterns. Leiden: Brill.
+ - United Nations, Department of Economic and Social Affairs, Population Division (UN DESA) (2019): World Population Prospects 2019. Custom data acquired via website. Available online: https://population.un.org/wpp/DataQuery/.
+ - World Bank (2020): World Development Indicators. Available online: https://databank.worldbank.org/source/world-development-indicators.
+
+
+
+
+
diff --git a/03_Report.html b/03_Report.html
new file mode 100644
index 0000000..f097ec1
--- /dev/null
+++ b/03_Report.html
@@ -0,0 +1,176 @@
+
+
+
+
+Globalization Dashboard Report
+
+
+
+
+ Authors:
Francesco Danovi: wrote the report and worked on the html file
Federico Mammana: set out the dashboard and prepared the plotly map
Milan Schröder: elaborated the data, constructed the index and implemented reactivity between dashboard and sidebar
+
+
+ Introduction
+
We aim to fill a gap in research resources: Currently, there is only one curated Index of Globality (i.e., the level of Globalization) available to researchers interested in a measurement of globalization as a multidimensional phenomenon beyond its pure economic dimension – the KOF Globalisation Index (Dreher et al. 2008; Gygli et al. 2018). This index, however, applies a “flexible definition” (Gygli et al. 2018), operationalizing globalization as a catch-all-term that incorporates theoretically distinct concepts (e.g., cross-border interaction, integration, interdependence) in a complex but rather arbitrary fashion (see Kessler 2016; Schröder 2020). Indicators of these concepts yield empirically strongly differential results. The KOF’s dominance seems to originate less from its validity than its availability.
To provide an alternative to scholars interested in a more valid measure, we plan to construct an updated version of the Kessler Globality Index (Kessler 2016), that was only constructed for a single year yet. The KGI follows the contrary approach to the KOF, focussing on a clear definition, the strong validity of its indicators, and simple replicability. This makes it feasible to construct the KGI for a wide range of countries over a period of at least up to 30 years, using data available via APIs mostly. With approval of the author, we will include some minor updates and present the data as an interactive dashboard. We will proceed by illustrating what we mean by globality measures and globalization. Later on, we will discuss the KOF index, what parameters it follows and why we identify the need to offer an alternative index. We will then delve into KGI, by explaining how it its structure and benefits. Finally, we will illustrate our dashboard in detail and how it can complement existing research resources.
+
+
+ Globalization measurement
+
Although it is hard to find a precise definition of globalization everyone can agree on, we believe that globality measures should:
- depict the cross-border interaction of individuals;
- be clearly delineated from ambiguous terms;
- include the socio-cultural, political and economic dimensions (without weighting them arbitrarily);
- be spatially and temporally adequate;
- show clear distinction from causes and consequences.
When measured, the process of globalization must go beyond a single point in time and be chronologically repeatable.s
+In the following, existing approaches for measuring globalization will first be examined in detail with regard to these criteria.
+
+
+
+
+ Existing approaches to measuring globality
+
In line with the conceptual disagreement, the literature contains a large number of indicators for measuring globalization. By means of a comparison with the KGI, Kessler (2016: 172-175) developed some alternative measures, showing that even a single valid indicator can be superior to complex multiple measures. As he himself notes, the tested indicator, the per capita standardized foreign trade volume, is itself part of the KGI and has by far the best data availability of all the indicators included (ibid .: 165). Multiple globality measurements have - in addition to the mapping of the multi-dimensionality of the phenomenon - in principle, however, the advantage of being more robust against random measurement errors, outliers and the influence of insufficiently valid indicators, as these are affected by other indicators and tend to be evened out. However, all individual indicators should represent the common theoretical construct with satisfactory validity and correlate strongly with one another in the sense of the criterion of convergence validity.
If this criterion is not met, it could be argued that the theoretical construct consists of mutually independent dimensions, which however, it is not convincing because the measurement would then lead to arbitrarily different results depending on the choice of dimensions and indicators (ibid .: 149-156).
+It should be noted, however, that Kessler (2016: 149-160) found far-reaching deficiencies in the validity of various globalization indexes. This especially applies to the KOF index, which has since been partially revised, the results of which are published annually, and which is probably also the most common multiple measure for globalization for this reason. The KOF index is therefore to be examined in the following and compared to the KGI, which is particularly concerned with validity.
+
+
+
+
+ KOF Globalization Index
+
The KOF Globalization Index is an index that provides annual data on the level of globalization at the level of nation states. Globalization is defined here as the “process of creating networks of connections among actors at multi-continental distances, mediated through a variety of flows including people, information and ideas, capital and goods” (Gygli et al. 2019: 546). The concept here corresponds to a catch-all approach that combines the understanding of interaction, integration and interdependence. Aspects of globalization as universalization, such as “the global spread of ideas” (ibid.), are part of the globalization concept used as a core component of the social dimension. In particular, the sub-dimension of cultural proximity also includes the understanding of globalization as “westernization” in the concept, because according to the authors, cultural globalization denotes the “domination of U.S. cultural products "(ibid.). Already the theoretical conception of the KOF-Index thus shows a contradiction to the demarcation of cross-border interaction from alternative globalization terms required in the above analysis framework.
+With the current edition, the KOF-Index has undergone a far-reaching revision: while 23 indicators were included in the 2007 KOF-Index, after the revision there were almost twice as many.
+
+
+
+A fundamental problem of the KOF is based on its very broad concept of globalization. Following this catch-all term, some indicators do not depict cross-border interaction, but one or more of the globalization concepts. In addition to the number of McDonald's restaurants and IKEA stores that depict globalization (at most) as Americanization or Westernization (Kessler 2016: 157), the many indicators that depict globalization as integration, i.e. cross-border interaction, are particularly noticeable in relation to internal interaction. This applies to almost all indicators of economic de facto globalization. The standardization of the indicators with GDP can be seen as a clear indication of this. The number of memberships in intergovernmental organizations should also be seen as an indicator of political integration.
+A large number of indicators of all dimensions also violate the requirement set out above for an adequate representation of the phenomenon in terms of time: all those variables that depict stocks instead of the more volatile flows are obviously problematic for measuring the annual globalization level. The problem exists, for example, with trade agreements and the proportion of the population born abroad, which is included in the KOF as a migration indicator (cf. ibid .: 153).
+
+
+Some indicators, such as the number of embassies or NGOs, are also included in the index as absolute values in a completely unstandardized manner: if, however, there are as many embassies in a country the size of China as in a small state, the latter would, according to the general understanding, be much more globalized. Standardization with the population size, which is missing here, is therefore recommended (cf. ibid .: 151-153).
+The most dramatic problem, however, is the lack of separation between the globalization process and its (possible) causes and consequences: this affects almost the entire de jure globalization index. While in the original version of the KOF only the economic dimension was subordinated to a sub dimension “Restrictions” with a weight of 50% (Dreher et al. 2008: 47f.), enabling factors in the latest edition have a share of 50% in the overall index (Gygli et al. 2019: 545). For many of the variables included, it also appears to be questionable whether they can even be regarded as enabling factors or consequences. Whether, for example, telephone and television connections actually lead to cross-border interaction can certainly be doubted. It is much more likely that most of the usage will be limited to national TV channels and that domestic calls will be predominantly made.
+
+
+Formal education, civil liberties and freedom of the press may at least be related to globalization as enabling factors or consequences, but the inclusion of such indicators in the KOF index implies an implicit assessment of globalization as a just, democratic development that has yet to be proven. The investigation of such relationships would be a typical application of a globalization measure, for which the KOF disqualifies itself by including central normatively relevant dependent variables in the independent variable. While the above-mentioned variables can still be justified to some extent comprehensibly, at least in terms of understanding globalization as universalization (Gygli et al. 2019: 557), gender parity as an indicator of globalization can still be surprising. One could argue that the universalization of a “western” value of gender equality could be mapped, but global dissemination requires a starting point. To see such a “place of origin” of gender equality in the “western” world seems at least somewhat debatable, if not presumptuous.
+
+
+In summary, the validity of the content of many of the KOF indicators must be seriously questioned for various reasons - in particular the mixture of globalization with enabling factors and integration.
+
+
+The weighting procedure is probably the heart of the KOF. However, the weighting on the upper levels is arbitrary. De facto and de jure globalization make up 50% each, which in turn are made up of 33.3% each from the three defined dimensions. The economic dimension in turn consists of two sub-indices, the social of three, the political, on the other hand, has no sub-indices whatsoever (Gygli et al .: 545), which means that the total weight of the indicators depends not only on the calculated weights, but on the (somewhat arbitrary) classification under dimensions and sub-indices.
+In addition to the inadequate theoretical foundation and the content-related validity problems of the individual indicators, the ultimately arbitrary weighting speaks against using the KOF index as a measure of globalization without hesitation.
+
+
+
+ Kessler Globality Index (KGI)
+
The Kessler Globality Index (KGI) is currently only available for a single year of investigation, 2016, which is obviously problematic for the investigation here, since only the globality of the subjects of investigation, instead of possible globalization processes, could actually be investigated.
+The KGI pursues a fundamentally different approach than the KOF Index: it is "more important that each individual indicator represents the selected theoretical construct in a satisfactorily valid manner than on maximizing the number of indicators" (Kessler 2016: 164) . The KGI also has significantly higher demands on the theoretical justification than the KOF. Attention is paid to an adequate measurement of globality in the sense of the concept of cross-border interaction, to a spatially and temporally appropriate recording, and it avoids mixing with related concepts.
+The simplicity is shown by its calculation: the index is composed of seven indicators that are standardized, consistently averaged per capita and equally weighted, as usual, for a uniform value range from 0 to 100 (ibid .: 160).
+This already has the advantage over the KOF of a less arbitrary weighting. Equally weighting the individual indicators would be problematic if several of the variables represented the same aspect of globalization and this would therefore be implicitly weighted twice. However, this only seems conceivable in one place: the definition of the tourism indicator of the World Bank includes not only leisure tourism trips, but is defined as the “activity of people traveling to and staying in places outside their usual environment for no more than one year for leisure, business, and other purposes not related to an activity remunerated from within the place visited”(World Bank 2020), thus includes almost all non-permanent entries and exits, including business trips. However, this results in a strong overlap with the air traffic indicator used in the KGI. Obviously planes are not the only form of travel, but in many cases this accounts for the majority of trips, which is why an extremely strong correlation between the two indicators is to be expected. The strong correlation between all indicators that the KGI assumes should ultimately ensure that such a weighting is empirically not too significant. For the above-mentioned reasons, however, it should be avoided.
+
+
+
+The indicators used are the volume of foreign trade, as well as foreign direct investments (FDIs; sum of inflows and outflows; both in US dollars), international meetings , international arrivals and departures at commercial airports, international tourist arrivals and departures, international incoming and outgoing telephone traffic in minutes and the estimated number of people with Internet access, each per capita (ibid .: 161-164).
+Correlation and factor analysis were used to examine whether the indicators actually depict the same theoretical construct. The analysis consistently showed very strong relationships between the individual indicators, all of which also have a very strong impact on a single factor (ibid .: 164-167). Attention is paid to the occurrence of all dimensions in the KGI - even if the assignment is only a tendency.
+There are only more serious validity concerns for one single indicator, Internet users. On the one hand, this is not about the interaction process itself, but rather an enabling factor which cannot distinguish between domestic and cross-border interaction via the Internet. Since access to the Internet is also increasing globally, further use of this indicator would presumably lead to an approximation of usage figures to 100% in many countries in the future and the potentially serious differences in usage intensity between the countries would be completely ignored. Since complete coverage with Internet connections does not, of course, mean that globalization has reached its maximum, the fixed limitation of the scale must be viewed as problematic.
+There are no fundamental problems with the other indicators, only minor optimization possibilities or concerns about the suitability of the data used.
+The total index is finally calculated using a simple additive procedure with the same weighting, that is, by calculating the arithmetic mean from all existing values. A KGI value is shown when at least three of the seven values are available. Due to the strong correlations between the individual indicators, this appears to be entirely justifiable, since it can be assumed that a single value present represents a satisfactorily valid proxy for the level of globalization (Kessler 2016: 168f.). Since the KGI has proven to be a theoretically superior measure of globality, a slight revision and reproduction for the years 1990-2020 will be carried out below and its validity will be tested.
+
+
+
+
+ Our revised Dashboard
+
Our Dashboard uses data from 1990 to 2020. As previously explained, its aim is to replicate the KGI for this range of years. The indicators used to assess the level of globalization are: population, area, internet users, level of imports, level of exports, foreign direct investments (in and out), level of tourism in and out. The following indicators were not available via WDI but can be made available upon request: International telephone traffic (ITU), International Meetings and Conferences (UIA) and International aircraft passengers (ICAO).
+
+
+
+For the constriuction of an informative index with an easily interpretable range, data was first per capita- and then panel-normalized. To identify the maximum and minimum values for normalization we excluded small states (as defined by Kessler 2016) and extreme outliers (outside 25% quantile - 3 * IQR, 75% quantile + 3 * IQR, see Schröder 2020).
+We then normalized the data on a scale ranging from 0 to 100.
+Finally, we combined the variables that are all theoretically valid, load strongly on a common factor and are highly intercorrelated (Kessler 2016, Schröder 2020); for this reason, the index can be constructed simply by taking the average of all available normalized variables.
+
+
+The following step was to build an interactive dashboard in the form of a map, where countries are given different colors according to the level of globalization reached. We cover all years from 1990 to 2020 (with varying data quality).
+A small table stating the top 10 countries is provided as well.
+
+Users get the option to select between Kessler's (2016) original KGI (as described above), and a refined edition developed by Schröder (2020). While the latter has some theoretical benefits due to newly available indicators that more precisely depict the volume and reach of cross-boarder interactions, the original index has advantages in terms of data coverage. By providing both alternatives, we allow interested researchers to test the robustness of their findings based on an alternative measure.
+
+Additionally, users can choose a minimal number of indicators as a condition to be included in the output, animate the global changes over time, zoom in, find detailled information about the method, contributors, and download the data in several formats.
+
+
+
+
+ References
+
+ - Dreher, Axel; Gaston, Noel; Martens, Pim (2008): Measuring Globalisation. New York, NY: Springer.
+ - Gygli, Savina; Haelg, Florian; Potrafke, Niklas; Sturm, Jan-Egbert (2019): The KOF Globalisation Index – revisited. In: The Review of International Organizations 14 (3), S. 543– 574.
+ - Kessler, Johannes (2016): Theorie und Empirie der Globalisierung. Wiesbaden: Springer Fachmedien.
+ - Schröder, Milan Aljoscha (2020): Gerechte Globalisierung? Zur Messung von Globalisierungsprozessen und ihrem Einfluss auf die Verteilungsgerechtigkeit Hausarbeit zur Erlangung des akademischen Grades Bachelor of Arts in Politikwissenschaft. Sozialwissenschaften, Medien und Sport der Johannes Gutenberg-Universität Mainz. Available online: https://hertieschool-my.sharepoint.com/:b:/g/personal/204856_hertie-school_org/EWp8tWUAvD5IjOmgbVoQjd8BaXL1bQNd_nuxH0u5ftVhoQ?e=DUxeYO
+
+
+ Data Sources
+
+ - Central Intelligence Agency (CIA) (2018): The World Factbook 2016-17. Washington, DC.
+ - International Civil Aviation Organisation (ICAO) (1993-2018): The World of Air Transport. Presentation of Air Transport Statistical Results. Compilation from the ICAO Annual Report to the Council.
+ - International Civil Aviation Organisation (ICAO) (2019): State Traffic Statistics. Available online: https://www.icao.int/safety/iStars/Pages/API-Data-Service.aspx.
+ - International Telecommunication Union (ITU) (2018): World Telecommunication Indicators Database.
+ - Union of International Associations (UIA) (2001-2018): Yearbook of International Organizations. Guide to Global and Civil Society Networks. Vol 5: Statistics, Visualizations and Patterns. Leiden: Brill.
+ - United Nations, Department of Economic and Social Affairs, Population Division (UN DESA) (2019): World Population Prospects 2019. Custom data acquired via website. Available online: https://population.un.org/wpp/DataQuery/.
+ - World Bank (2020): World Development Indicators. Available online: https://databank.worldbank.org/source/world-development-indicators.
+
+
+
+
+
diff --git a/KGI/KGI.Rdata b/KGI/KGI.Rdata
new file mode 100644
index 0000000..383d912
Binary files /dev/null and b/KGI/KGI.Rdata differ
diff --git a/KGI/app.R b/KGI/app.R
new file mode 100644
index 0000000..63a01bb
--- /dev/null
+++ b/KGI/app.R
@@ -0,0 +1,235 @@
+# Load packages and data
+library(shiny)
+library(shinydashboard)
+library(plotly)
+library(readr)
+library(tidyverse)
+library(rio)
+
+KGIdata_original <- rio::import(file = "KGI.Rdata")
+
+# Define UI ----------------------------------------------------------------
+header <- dashboardHeader(title = "How globalized is the world? The Kessler Globality Index",
+ titleWidth = 750)
+
+sidebar <- dashboardSidebar(
+ sidebarMenu(
+ menuItem("About",
+ tabName = "model",
+ icon = icon("book"),
+
+ menuItem("Method",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard/blob/main/README.md#kessler-globality-index-kgi",
+ newtab = F),
+
+ menuItem("Full Report",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard/blob/main/README.md",
+ newtab = F),
+
+ menuItem("Sources",
+ menuSubItem(text = "Kessler (2016)",
+ href = "https://link.springer.com/book/10.1007/978-3-658-02388-1",
+ newtab = F),
+ menuSubItem(text = "Schröder (2020)",
+ href = "https://hertieschool-my.sharepoint.com/:b:/g/personal/204856_hertie-school_org/EWp8tWUAvD5IjOmgbVoQjd8BaXL1bQNd_nuxH0u5ftVhoQ",
+ newtab = F)),
+
+ menuItem("Contributors",
+ menuSubItem(text = "Francesco Danovi, Università Bocconi",
+ href = "https://it.linkedin.com/in/francesco-danovi-189152186",
+ newtab = F),
+ menuSubItem(text = "Federico Mammana, Università Bocconi",
+ href = "https://www.linkedin.com/in/federico-mammana/",
+ newtab = F),
+ menuSubItem(text = "Milan Schröder, Hertie School",
+ href = "https://www.linkedin.com/in/milan-schroeder/",
+ newtab = F))),
+
+ menuItem("Controls", tabName = "model", icon = icon("mouse"), startExpanded = T,
+ sliderInput("year", "Select year", 1990, 2020, 2017, step = 1, sep = "", animate = T),
+ checkboxInput("small_include",
+ "Include small countries? (pop. < 1 Mio.)",
+ value = FALSE),
+
+ sliderInput("min_vars",
+ "Min. Number of Indicators",
+ 1, 7, 3),
+
+ selectInput("version",
+ "KGI version:",
+ c("Kessler (2016)" = "KGI_original",
+ "Schröder (2020)" = "KGI_new"))),
+
+ menuItem("Link to Code",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard",
+ icon = icon("code"),
+ newtab = F),
+ menuItem("Download Data",
+ icon = icon("save"),
+ menuItem(text = ".csv",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard/raw/main/data_processed/KGI.csv",
+ newtab = F),
+ menuItem(text = ".xlsx",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard/raw/main/data_processed/KGI.xlsx",
+ newtab = F),
+ menuItem(text = ".Rdata",
+ href = "https://github.com/intro-to-data-science-21/data-project-globalization_dashboard/raw/main/data_processed/KGI.Rdata",
+ newtab = F)),
+ collapsed = F
+ ),
+ width = 300
+)
+
+body <- dashboardBody(
+ fluidRow(
+ column(3,
+ wellPanel(
+ h4("Most globalized countries"),
+ tableOutput("ranking"))),
+ column(9,
+ plotlyOutput("world_map"))),
+
+ fluidRow(
+ wellPanel(
+ htmlOutput("description"))),
+
+ fluidRow(
+ column(12,
+ span("For detailled information consult our methods.",
+ align = "right"))),
+ fluidRow(
+ column(12,
+ span("Note: Since all indicators are computed on a per capita basis, including small countries may produce an uniformative ranking.",
+ align = "right"))),
+ fluidRow(
+ column(12,
+ span("Data for 2020 should tread lightly due to the effects of the COVID-19 pandemic.",
+ align = "right")))
+)
+
+ui <- dashboardPage(skin = "red",
+ header,
+ sidebar,
+ body
+)
+
+# Define Server -----------------------------------------------------------
+server <- function(input, output, session) {
+
+ # creating temp vars here to filter:
+ filtered_data <- reactive({
+ year <- input$year
+ small_include <- input$small_include
+ min_vars <- input$min_vars
+ version <- input$version
+
+ # filtering data:
+ KGIdata_filtered <- KGIdata_original %>%
+ mutate(KGI = ifelse(version == "KGI_original",
+ KGI_original,
+ KGI_new),
+ n_vars = ifelse(version == "KGI_original",
+ n_vars_original,
+ n_vars_new),
+ indicators_max = ifelse(version == "KGI_original",
+ 7,
+ 6),
+ hover = paste0(country, "\nKGI: ", KGI, "\nIndicators available: ", n_vars, "/", indicators_max)) %>%
+ filter(ifelse(small_include == T,
+ !is.na(small),
+ small == F),
+ date == year,
+ n_vars >= min_vars) %>%
+ # just to make sure:
+ as.data.frame() %>%
+ arrange(desc(KGI))
+ KGIdata_filtered
+ })
+
+ # construct Top10 list:
+ output$ranking <- renderTable({
+ filtered_data() %>%
+ select(country, KGI) %>%
+ arrange(desc(KGI)) %>%
+ head(10)
+ })
+
+ # construct worldmap:
+ output$world_map <- renderPlotly({
+ # Define plotly map's properties, font, labels, and layout
+ graph_properties <- list(
+ scope = 'world',
+ showland = TRUE,
+ landcolor = toRGB("lightgrey"),
+ color = toRGB("lightgrey"))
+
+ font = list(
+ family = "DM Sans",
+ size = 15,
+ color = "black")
+
+ label = list(
+ bgcolor = "#EEEEEE",
+ bordercolor = "gray",
+ font = font)
+
+ borders_layout <- list(color = toRGB("grey"), width = 0.5)
+
+ map_layout <- list(
+ showframe = FALSE,
+ showcoastlines = TRUE,
+ projection = list(type = 'Mercator'))
+ # Build actual plotly map
+ world_map = plot_geo(filtered_data(),
+ locationmode = "world",
+ frame = ~ date) %>%
+ add_trace(locations = ~ iso3c,
+ z = ~ KGI,
+ zmin = 0,
+ zmax = 100,
+ color = ~ KGI,
+ colorscale = "Inferno",
+ text = ~ hover,
+ hoverinfo = 'text') %>%
+ layout(geo = map_layout,
+ font = list(family = "DM Sans")) %>%
+ style(hoverlabel = label) %>%
+ config(displayModeBar = FALSE)
+ })
+
+ # include short description of chosen index:
+ output$description <- renderText({
+ ifelse(input$version == "KGI_original",
+ " The Kessler Globality Index (KGI) is a clear and effective measure of the level of globality, i.e. the level of transboarder interaction between people (see Kessler 2016).
+
It comprises seven highly intercorrelated, theoretically valid indicators all loading strongly on one common factor:
+
+ - volume of international trade in goods and services (World Development Indicators)
+ - foreign direct investments, inflows and outflows (World Development Indicators)
+ - international tourism, arrivals and departures (World Development Indicators)
+ - international meetings (Union of International Associations)
+ - international arrivals and departures at commercial airports (International Civil Aviation Organization)
+ - international incoming and outgoing telephone traffic in minutes (International Telecommunications Union)
+ - share of individuals using the internet (International Telecommunications Union)
+
",
+
+ " The refined version of the Kessler Globality Index (KGI) is a clear and effective measure of the level of globality, i.e. the level of transboarder interaction between people (see Schröder 2020).
+
It comprises six highly intercorrelated, theoretically valid indicators all loading strongly on one common factor:
+
+ - volume of international trade in goods, services, and primary income (World Development Indicators)
+ - foreign direct investments, inflows and outflows (World Development Indicators)
+ - international tourism, arrivals and departures (World Development Indicators)
+ - international meetings (Union of International Associations)
+ - internationally operated revenue passenger kilometres (International Civil Aviation Organization)
+ - a communication technology indicator, covering the shift in predominant communication tools, i.e.:
+
+ - until 2005: international incoming and outgoing telephone traffic in minutes (International Telecommunications Union)
+ - from 2006: international bandwidth usage in Mbit/s (International Telecommunications Union)
+
+
+
")
+ })
+}
+
+# Run the app:
+shinyApp(ui = ui,
+ server = server)
diff --git a/KGI/rsconnect/shinyapps.io/milanschroeder/Kessler-Globality-Index.dcf b/KGI/rsconnect/shinyapps.io/milanschroeder/Kessler-Globality-Index.dcf
new file mode 100644
index 0000000..ecf23b4
--- /dev/null
+++ b/KGI/rsconnect/shinyapps.io/milanschroeder/Kessler-Globality-Index.dcf
@@ -0,0 +1,13 @@
+name: Kessler-Globality-Index
+title: Kessler-Globality-Index
+username:
+account: milanschroeder
+server: shinyapps.io
+hostUrl: https://api.shinyapps.io/v1
+appId: 5362829
+bundleId: 5409164
+url: https://milanschroeder.shinyapps.io/Kessler-Globality-Index/
+when: 1640473702.55841
+lastSyncTime: 1640473702.55941
+asMultiple: FALSE
+asStatic: FALSE
diff --git a/README.md b/README.md
index f2d4e13..b6aaff9 100644
--- a/README.md
+++ b/README.md
@@ -1,3 +1,100 @@
-# Final data science project
+# A Globalization Dashboard
+## Final project for Introduction to Data Science by Federico Mammana, Francesco Danovi & Milan Schröder (Hertie School)
-Please use this repository to submit your project materials.
\ No newline at end of file
+We aim to fill a gap in research resources:
+Currently, there is only one curated Index of Globality (i.e., the level of Globalization) available to researchers interested in a measurement of globalization as a multidimensional phenomenon beyond its pure economic dimension – the KOF Globalisation Index (Dreher et al. 2008; Gygli et al. 2018). This index, however, applies a “flexible definition” (Gygli et al. 2018), operationalizing globalization as a catch-all-term that incorporates theoretically distinct concepts (e.g., cross-border interaction, integration, interdependence) in a complex but rather arbitrary fashion (see Kessler 2016; Schröder 2020). Indicators of these concepts yield empirically strongly differential results. The KOF’s dominance seems to originate less from its validity than its availability.
+
+
+To provide an alternative to scholars interested in a more valid measure, we plan to construct an updated version of the Kessler Globality Index (Kessler 2016), that was only constructed for a single year yet. The KGI follows the contrary approach to the KOF, focussing on a clear definition, the strong validity of its indicators, and simple replicability. This makes it feasible to construct the KGI for a wide range of countries over a period of at least up to 30 years, using data available via APIs mostly. With approval of the author, we will include some minor updates and present the data as an interactive dashboard. We will proceed by illustrating what we mean by globality measures and globalization. Later on, we will discuss the KOF index, what parameters it follows and why we identify the need to offer an alternative index. We will then delve into KGI, by explaining how it its structure and benefits. Finally, we will illustrate our dashboard in detail and how it can complement existing research resources.
+
+## Globalization measurement
+Although it is hard to find a precise definition of globalization everyone can agree on, we believe that globality measures should:
+
+a) depict the cross-border interaction of individuals;
+
+b) be clearly delineated from ambiguous terms;
+
+c)include the socio-cultural, political and economic dimensions (without weighting them arbitrarily);
+
+d) be spatially and temporally adequate;
+
+e) show clear distinction from causes and consequences.
+
+When measured, the process of globalization must go beyond a single point in time and be chronologically repeatable.
+In the following, existing approaches for measuring globalization will first be examined in detail with regard to these criteria.
+
+In line with the conceptual disagreement, the literature contains a large number of indicators for measuring globalization. By means of a comparison with the KGI, Kessler (2016: 172-175) developed some alternative measures, showing that even a single valid indicator can be superior to complex multiple measures. As he himself notes, the tested indicator, the per capita standardized foreign trade volume, is itself part of the KGI and has by far the best data availability of all the indicators included (ibid .: 165). Multiple globality measurements have - in addition to the mapping of the multi-dimensionality of the phenomenon - in principle, however, the advantage of being more robust against random measurement errors, outliers and the influence of insufficiently valid indicators, as these are affected by other indicators and tend to be evened out. However, all individual indicators should represent the common theoretical construct with satisfactory validity and correlate strongly with one another in the sense of the criterion of convergence validity. If this criterion is not met, it could be argued that the theoretical construct consists of mutually independent dimensions, which however, it is not convincing because the measurement would then lead to arbitrarily different results depending on the choice of dimensions and indicators (ibid .: 149-156).
+
+It should be noted, however, that Kessler (2016: 149-160) found far-reaching deficiencies in the validity of various globalization indexes. This especially applies to the KOF index, which has since been partially revised, the results of which are published annually, and which is probably also the most common multiple measure for globalization for this reason. The KOF index is therefore to be examined in the following and compared to the KGI, which is particularly concerned with validity.
+
+### The problems with existing measures: The KOF Globalization Index
+The KOF Globalization Index is an index that provides annual data on the level of globalization at the level of nation states. Globalization is defined here as the “process of creating networks of connections among actors at multi-continental distances, mediated through a variety of flows including people, information and ideas, capital and goods” (Gygli et al. 2019: 546). The concept here corresponds to a catch-all approach that combines the understanding of interaction, integration and interdependence. Aspects of globalization as universalization, such as “the global spread of ideas” (ibid.), are part of the globalization concept used as a core component of the social dimension. In particular, the sub-dimension of cultural proximity also includes the understanding of globalization as “westernization” in the concept, because according to the authors, cultural globalization denotes the “domination of U.S. cultural products "(ibid.). Already the theoretical conception of the KOF-Index thus shows a contradiction to the demarcation of cross-border interaction from alternative globalization terms required in the above analysis framework.
+With the current edition, the KOF-Index has undergone a far-reaching revision: while 23 indicators were included in the 2007 KOF-Index, after the revision there were almost twice as many.
+
+A fundamental problem of the KOF is based on its very broad concept of globalization. Following this catch-all term, some indicators do not depict cross-border interaction, but one or more of the globalization concepts. In addition to the number of McDonald's restaurants and IKEA stores that depict globalization (at most) as Americanization or Westernization (Kessler 2016: 157), the many indicators that depict globalization as integration, i.e. cross-border interaction, are particularly noticeable in relation to internal interaction. This applies to almost all indicators of economic de facto globalization. The standardization of the indicators with GDP can be seen as a clear indication of this. The number of memberships in intergovernmental organizations should also be seen as an indicator of political integration.
+
+A large number of indicators of all dimensions also violate the requirement set out above for an adequate representation of the phenomenon in terms of time: all those variables that depict stocks instead of the more volatile flows are obviously problematic for measuring the annual globalization level. The problem exists, for example, with trade agreements and the proportion of the population born abroad, which is included in the KOF as a migration indicator (cf. ibid .: 153).
+
+Some indicators, such as the number of embassies or NGOs, are also included in the index as absolute values in a completely unstandardized manner: if, however, there are as many embassies in a country the size of China as in a small state, the latter would, according to the general understanding, be much more globalized. Standardization with the population size, which is missing here, is therefore recommended (cf. ibid .: 151-153).
+
+The most dramatic problem, however, is the lack of separation between the globalization process and its (possible) causes and consequences: this affects almost the entire de jure globalization index. While in the original version of the KOF only the economic dimension was subordinated to a sub dimension “Restrictions” with a weight of 50% (Dreher et al. 2008: 47f.), enabling factors in the latest edition have a share of 50% in the overall index (Gygli et al. 2019: 545). For many of the variables included, it also appears to be questionable whether they can even be regarded as enabling factors or consequences. Whether, for example, telephone and television connections actually lead to cross-border interaction can certainly be doubted. It is much more likely that most of the usage will be limited to national TV channels and that domestic calls will be predominantly made.
+Formal education, civil liberties and freedom of the press may at least be related to globalization as enabling factors or consequences, but the inclusion of such indicators in the KOF index implies an implicit assessment of globalization as a just, democratic development that has yet to be proven. The investigation of such relationships would be a typical application of a globalization measure, for which the KOF disqualifies itself by including central normatively relevant dependent variables in the independent variable. While the above-mentioned variables can still be justified to some extent comprehensibly, at least in terms of understanding globalization as universalization (Gygli et al. 2019: 557), gender parity as an indicator of globalization can still be surprising. One could argue that the universalization of a “western” value of gender equality could be mapped, but global dissemination requires a starting point. To see such a “place of origin” of gender equality in the “western” world seems at least somewhat debatable, if not presumptuous.
+
+In summary, the validity of the content of many of the KOF indicators must be seriously questioned for various reasons - in particular the mixture of globalization with enabling factors and integration.
+
+(Possible tables?)
+The weighting procedure is probably the heart of the KOF. However, the weighting on the upper levels is arbitrary. De facto and de jure globalization make up 50% each, which in turn are made up of 33.3% each from the three defined dimensions. The economic dimension in turn consists of two sub-indices, the social of three, the political, on the other hand, has no sub-indices whatsoever (Gygli et al .: 545), which means that the total weight of the indicators depends not only on the calculated weights, but on the (somewhat arbitrary) classification under dimensions and sub-indices.
+In addition to the inadequate theoretical foundation and the content-related validity problems of the individual indicators, the ultimately arbitrary weighting speaks against using the KOF index as a measure of globalization without hesitation.
+
+### Alternative measure: The Kessler Globality Index (KGI)
+The Kessler Globality Index (KGI) is currently only available for a single year of investigation, 2016, which is obviously problematic for the investigation here, since only the globality of the subjects of investigation, instead of possible globalization processes, could actually be investigated.
+
+The KGI pursues a fundamentally different approach than the KOF Index: It is "more important that each individual indicator represents the selected theoretical construct in a satisfactorily valid manner than on maximizing the number of indicators" (Kessler 2016: 164) . The KGI also has significantly higher demands on the theoretical justification than the KOF. Attention is paid to an adequate measurement of globality in the sense of the concept of cross-border interaction, to a spatially and temporally appropriate recording, and it avoids mixing with related concepts.
+The simplicity can be seen in its calculation: the index is composed of seven indicators that are standardized, consistently averaged per capita and equally weighted, as usual, for a uniform value range (ibid .: 160),
+
+This already has the advantage over the KOF of a less arbitrary weighting. Equally weighting the individual indicators would be problematic if several of the variables represented the same aspect of globalization and this would therefore be implicitly weighted twice. However, this only seems conceivable in one place: the definition of the tourism indicator of the World Bank includes not only leisure tourism trips, but is defined as the “activity of people traveling to and staying in places outside their usual environment for no more than one year for leisure, business, and other purposes not related to an activity remunerated from within the place visited”(World Bank 2020), thus includes almost all non-permanent entries and exits, including business trips. However, this results in a strong overlap with the air traffic indicator used in the KGI. Obviously planes are not the only form of travel, but in many cases this accounts for the majority of trips, which is why an extremely strong correlation between the two indicators is to be expected. The strong correlation between all indicators that the KGI assumes should ultimately ensure that such a weighting is empirically not too significant. For the above-mentioned reasons, however, it should be avoided.
+
+The indicators used are the volume of foreign trade, as well as foreign direct investments (FDIs; sum of inflows and outflows; both in US dollars), international meetings , international arrivals and departures at commercial airports, international tourist arrivals and departures, international incoming and outgoing telephone traffic in minutes and the estimated number of people with Internet access, each per capita (ibid .: 161-164).
+Correlation and factor analysis were used to examine whether the indicators actually depict the same theoretical construct. The analysis consistently showed very strong relationships between the individual indicators, all of which also have a very strong impact on a single factor (ibid .: 164-167). Attention is paid to the occurrence of all dimensions in the KGI - even if the assignment is only a tendency.
+There are only more serious validity concerns for one single indicator, Internet users. On the one hand, this is not about the interaction process itself, but rather an enabling factor which cannot distinguish between domestic and cross-border interaction via the Internet. Since access to the Internet is also increasing globally, further use of this indicator would presumably lead to an approximation of usage figures to 100% in many countries in the future and the potentially serious differences in usage intensity between the countries would be completely ignored. Since complete coverage with Internet connections does not, of course, mean that globalization has reached its maximum, the fixed limitation of the scale must be viewed as problematic.
+
+There are no fundamental problems with the other indicators, only minor optimization possibilities or concerns about the suitability of the data used.
+The total index is finally calculated using a simple additive procedure with the same weighting, that is, by calculating the arithmetic mean from all existing values. A KGI value is shown when at least three of the seven values are available. Due to the strong correlations between the individual indicators, this appears to be entirely justifiable, since it can be assumed that a single value present represents a satisfactorily valid proxy for the level of globalization (Kessler 2016: 168f.). Since the KGI has proven to be a theoretically superior measure of globality, a slight revision and reproduction for the years 1992-2017 will be carried out below and its validity will be tested.
+
+# Our revised Dashboard
+Our Dashboard uses data from 1990 to 2020. As previously explained, its aim is to replicate the KGI for this range of years. The indicators used to assess the level of globalization are: population, area, internet users, level of imports, level of exports, foreign direct investments (in and out), level of tourism in and out. The following indicators were not available via WDI but can be made available upon request: International telephone traffic (ITU), International Meetings/Conferences (UIA) and International aircraft passengers (ICAO).
+
+For the construction of an informative index with an easily interpretable range, data was first per capita- and then panel-normalized. To identify the maximum and minimum values for normalization we excluded small states (as defined by Kessler 2016) and extreme outliers (outside 25% quantile - 3 * IQR, 75% quantile + 3 * IQR, see Schröder 2020).
+We then normalized the data on a scale ranging from 0 to 100.
+Finally, we combined the variables that are all theoretically valid, load strongly on a common factor and are highly intercorrelated (Kessler 2016, Schröder 2020); for this reason, the index can be constructed simply by taking the average of all available normalized variables.
+
+The following step was to build an interactive dashboard in the form of a map, where countries are given different colours according to the level of globalization reached. We cover all years from 1990 to 2020 (with varying data quality)
+A small table stating the top 10 countries is provided as well.
+
+Users get the option to select between Kessler's (2016) original KGI (as described above), and a refined edition developed by Schröder (2020). While the latter has some theoretical benefits due to newly available indicators that more precisely depict the volume and reach of cross-boarder interactions, the original index has advantages in terms of data coverage. By providing both alternatives, we allow interested researchers to test the robustness of their findings based on an alternative measure.
+
+Additionally, users can choose a minimal number of indicators as a condition to be included in the output, animate the global changes over time, zoom in, find detailled information about the method, contributors, and download the datein several formats.
+
+
+### References:
+Dreher, Axel; Gaston, Noel; Martens, Pim (2008): Measuring Globalisation. New York, NY: Springer.
+Gygli, Savina; Haelg, Florian; Potrafke, Niklas; Sturm, Jan-Egbert (2019): The KOF Globalisation Index – revisited. In: The Review of International Organizations 14 (3), S. 543– 574.
+
+Kessler, Johannes (2016): Theorie und Empirie der Globalisierung. Wiesbaden: Springer Fachmedien.
+
+Schröder, Milan (2020): Gerechte Globalisierung? Zur Messung von Globalisierungsprozessen und ihrem Einfluss auf die Verteilungsgerechtigkeit. Hausarbeit zur Erlangung des akademischen Grades Bachelor of Arts in Politikwissenschaft. Sozialwissenschaften, Medien und Sport der Johannes Gutenberg-Universität Mainz. Available online: https://hertieschool-my.sharepoint.com/:b:/g/personal/204856_hertie-school_org/EWp8tWUAvD5IjOmgbVoQjd8BaXL1bQNd_nuxH0u5ftVhoQ?e=DUxeYO
+
+#### Data Sources:
+Central Intelligence Agency (CIA) (2018): The World Factbook 2016-17. Washington, DC.
+
+International Civil Aviation Organisation (ICAO) (1993-2018): The World of Air Transport. Presentation of Air Transport Statistical Results. Compilation from the ICAO Annual Report to the Council.
+
+International Civil Aviation Organisation (ICAO) (2019): State Traffic Statistics. Available online: https://www.icao.int/safety/iStars/Pages/API-Data-Service.aspx.
+
+International Telecommunication Union (ITU) (2018): World Telecommunication Indicators Database.
+
+Union of International Associations (UIA) (2001-2018): Yearbook of International Organizations. Guide to Global and Civil Society Networks. Vol 5: Statistics, Visualizations and Patterns. Leiden: Brill.
+
+United Nations, Department of Economic and Social Affairs, Population Division (UN DESA) (2019): World Population Prospects 2019. Custom data acquired via website. Available online: https://population.un.org/wpp/DataQuery/.
+
+World Bank (2020): World Development Indicators. Available online: https://databank.worldbank.org/source/world-development-indicators.
diff --git a/data-project-globalization_dashboard.Rproj b/data-project-globalization_dashboard.Rproj
new file mode 100644
index 0000000..8e3c2eb
--- /dev/null
+++ b/data-project-globalization_dashboard.Rproj
@@ -0,0 +1,13 @@
+Version: 1.0
+
+RestoreWorkspace: Default
+SaveWorkspace: Default
+AlwaysSaveHistory: Default
+
+EnableCodeIndexing: Yes
+UseSpacesForTab: Yes
+NumSpacesForTab: 2
+Encoding: UTF-8
+
+RnwWeave: Sweave
+LaTeX: pdfLaTeX
diff --git a/data_processed/KGI.Rdata b/data_processed/KGI.Rdata
new file mode 100644
index 0000000..383d912
Binary files /dev/null and b/data_processed/KGI.Rdata differ
diff --git a/data_processed/KGI.csv b/data_processed/KGI.csv
new file mode 100644
index 0000000..8cdcfdc
--- /dev/null
+++ b/data_processed/KGI.csv
@@ -0,0 +1,6728 @@
+country,iso3c,date,area,pop,small,internet,fdi,trade,tourism,Int_Departures,int_phone_minutes,int_meetings,comtech,int_rpk,trade_g_s_pi,KGI_original,KGI_new,n_vars_original,n_vars_new
+Aruba,ABW,1990,180,62152,TRUE,0,100,49.8818585529723,,,,,,,44.941981555753,49.9606195176574,72.4709907778765,3,2
+Aruba,ABW,1991,180,64623,TRUE,0,100,100,,,,,,,96.5417397151491,66.6666666666667,98.2708698575745,3,2
+Aruba,ABW,1992,180,68240,TRUE,0,30.1610502266645,100,,,,,,,100,43.3870167422215,65.0805251133323,3,2
+Aruba,ABW,1993,180,72495,TRUE,0,15.0065585796767,100,,,,,,,100,38.3355195265589,57.5032792898384,3,2
+Aruba,ABW,1994,180,76705,TRUE,0,42.7084613004997,100,,,,,,,100,47.5694871001666,71.3542306502499,3,2
+Aruba,ABW,1995,180,80324,TRUE,0,3.93505289740592,100,100,,,,,,100,50.9837632243515,67.978350965802,4,3
+Aruba,ABW,1996,180,83211,TRUE,87.1486117933655,45.2878586302689,100,100,,,,,,100,83.1091176059086,81.762619543423,4,3
+Aruba,ABW,1997,180,85450,TRUE,,100,100,100,,,,,,100,100,100,3,3
+Aruba,ABW,1998,180,87280,TRUE,,72.7375832679978,100,100,,,,,,100,90.9125277559993,90.9125277559993,3,3
+Aruba,ABW,1999,180,89009,TRUE,100,100,77.1830070873207,100,,,,,,70.4125913981492,94.2957517718302,90.1375304660497,4,3
+Aruba,ABW,2000,180,90866,TRUE,100,63.0178371981691,88.4103104543321,100,,,,,,80.4387173019086,87.8570369131253,81.1521848333592,4,3
+Aruba,ABW,2001,180,92892,TRUE,100,100,93.8918235645271,100,,,,,,85.7847071109185,98.4729558911318,95.2615690369728,4,3
+Aruba,ABW,2002,180,94992,TRUE,100,100,77.2792112861043,100,,,,,,72.1227231728037,94.3198028215261,90.7075743909346,4,3
+Aruba,ABW,2003,180,97016,TRUE,100,73.6967124822806,88.6694991111398,100,100,,,,,80.2200863297999,90.5915528983551,84.6389329373602,5,3
+Aruba,ABW,2004,180,98744,TRUE,100,50.5707804006419,100,100,100,,,,,100,87.6426951001605,83.5235934668807,5,3
+Aruba,ABW,2005,180,100028,TRUE,100,94.9990942283253,100,100,100,,,,,100,98.7497735570813,98.3330314094418,5,3
+Aruba,ABW,2006,180,100830,TRUE,100,100,100,100,100,,,4.70902727997941,,100,100,76.1772568199949,5,4
+Aruba,ABW,2007,180,101226,TRUE,100,100,100,100,100,,,4.50935626348895,,100,100,76.1273390658722,5,4
+Aruba,ABW,2008,180,101362,TRUE,100,9.37913412391834,100,100,100,,,8.9922422059477,,100,77.3447835309796,54.5928440824665,5,4
+Aruba,ABW,2009,180,101452,TRUE,100,5.24089323781295,100,100,100,,35.5517613974815,28.9350772653774,,100,68.1585309270589,53.9455463801344,6,5
+Aruba,ABW,2010,180,101665,TRUE,100,81.7505288008456,92.7422405867989,100,100,,35.4772763222082,36.959333086279,,86.0374985132042,81.9940091419705,68.0449273445074,6,5
+Aruba,ABW,2011,180,102050,TRUE,100,100,100,100,100,,35.3434326045791,36.8198976527216,,100,87.0686865209158,74.4326660514602,6,5
+Aruba,ABW,2012,180,102565,TRUE,100,100,100,100,100,,0,36.6350168017036,,100,80,67.3270033603407,6,5
+Aruba,ABW,2013,180,103165,TRUE,100,98.1174137007107,100,100,100,,34.9614432927572,,,95.8995719006621,86.6157713986936,82.2446072235325,6,4
+Aruba,ABW,2014,180,103776,TRUE,100,100,100,100,100,,69.5112029235526,,,97.0382957744565,93.9022405847105,91.6373746745023,6,4
+Aruba,ABW,2015,180,104339,TRUE,100,16.5158793483056,100,100,100,,34.5680646479006,,,97.2782746007697,70.2167887992412,62.090554649244,6,4
+Aruba,ABW,2016,180,104865,TRUE,100,11.6982631898097,100,100,100,,0,,,92.7932560218472,62.339652637962,51.1228798029142,6,4
+Aruba,ABW,2017,180,105361,TRUE,100,100,99.7203589090612,100,100,,100,,,93.0849146169347,99.9440717818123,98.2712286542337,6,4
+Aruba,ABW,2018,180,105846,TRUE,,68.9057150977398,100,100,100,,0,,,100,67.2264287744349,67.2264287744349,5,4
+Aruba,ABW,2019,180,106310,TRUE,,55.6889075185902,100,100,,,,,,100,85.2296358395301,85.2296358395301,3,3
+Aruba,ABW,2020,180,106766,TRUE,,5.86219318819621,70.6633089320225,,,,,,,66.3312435839431,38.2627510601093,36.0967183860696,2,2
+Afghanistan,AFG,1990,652860,12412311,FALSE,0,0.0000000353351203069577,,,,,,,,,0.0000000176675601534789,0.0000000353351203069577,2,1
+Afghanistan,AFG,1991,652860,13299016,FALSE,0,0.00092341674521081,,,,,,,,,0.000461708372605405,0.00092341674521081,2,1
+Afghanistan,AFG,1992,652860,14485543,FALSE,0,0.00109000111966845,,,,,,,,,0.000545000559834225,0.00109000111966845,2,1
+Afghanistan,AFG,1993,652860,15816601,FALSE,0,0.0000554595140223079,,,,,,,,,0.0000277297570111539,0.0000554595140223079,2,1
+Afghanistan,AFG,1994,652860,17075728,FALSE,0,0.0000513700502224414,,,,,,,,,0.0000256850251112207,0.0000513700502224414,2,1
+Afghanistan,AFG,1995,652860,18110662,FALSE,0,0.000226011559610713,,,,,,,,,0.000113005779805357,0.000226011559610713,2,1
+Afghanistan,AFG,1996,652860,18853444,FALSE,,0.00160515737446134,,,,,,,,,0.00160515737446134,0.00160515737446134,1,1
+Afghanistan,AFG,1997,652860,19357126,FALSE,,0.00330804342343831,,,,,,,,,0.00330804342343831,0.00330804342343831,1,1
+Afghanistan,AFG,1998,652860,19737770,FALSE,,0.0000222208741145719,,,,,,,,,0.0000222208741145719,0.0000222208741145719,1,1
+Afghanistan,AFG,1999,652860,20170847,FALSE,,0.0131332444043284,,,,,,,,,0.0131332444043284,0.0131332444043284,1,1
+Afghanistan,AFG,2000,652860,20779957,FALSE,,0.000358809142003054,,,,,,,,,0.000358809142003054,0.000358809142003054,1,1
+Afghanistan,AFG,2001,652860,21606992,FALSE,0.000572530994860411,0.00138030106958532,,,,,,,,,0.000976416032222866,0.00138030106958532,2,1
+Afghanistan,AFG,2002,652860,22600774,FALSE,0.000528675839544216,0.097029973945223,,,,,,,,,0.0487793248923836,0.097029973945223,2,1
+Afghanistan,AFG,2003,652860,23680871,FALSE,0.00972216702461517,0.108902757611304,,,0.140787524624938,,,,,,0.0593124623179597,0.108902757611304,3,1
+Afghanistan,AFG,2004,652860,24726689,FALSE,0.0112091288246949,0.332756149696457,,,0.179350268276825,,,,,,0.171982639260576,0.332756149696457,3,1
+Afghanistan,AFG,2005,652860,25654274,FALSE,0.124994044859496,0.465871347299565,,,0.306074107688656,,,,,,0.295432696079531,0.465871347299565,3,1
+Afghanistan,AFG,2006,652860,26433058,FALSE,0.208813083046022,0.394901488841832,,,0.207229285717896,,,0,,,0.301857285943927,0.197450744420916,3,2
+Afghanistan,AFG,2007,652860,27100542,FALSE,0.183649909322535,0.305372644988105,,,0.237436888789259,0.990187992141852,,0.000457625032322298,,,0.493070182150831,0.152915135010214,4,2
+Afghanistan,AFG,2008,652860,27722281,FALSE,0.17386171355586,0.0758638641201493,0.449391374716387,,0.264689840310527,,,0.00385984722394214,,0.401232655298481,0.233038984130799,0.160318788880857,4,3
+Afghanistan,AFG,2009,652860,28394806,FALSE,0.327494899987676,0.0870457998111873,0.488309325776531,,0.367569897674903,,0,0.0412420389438013,,0.430089575628448,0.225712506393848,0.139594353595859,5,4
+Afghanistan,AFG,2010,652860,29185511,FALSE,0.359011023322428,0.288565225930293,0.653098143013937,,0.611357578373884,,0.123581776495101,0.0501798702574772,,0.582293269638625,0.35606404219044,0.261155035580374,5,4
+Afghanistan,AFG,2011,652860,30117411,FALSE,0.434878024969426,0.0776345104524423,0.786591140944865,,0.748636894905691,,0,0.0729911626291068,0.954096460009757,0.695175080655737,0.450640027275298,0.359979442749409,5,5
+Afghanistan,AFG,2012,652860,31161378,FALSE,0.45851864961453,0.0924497075673946,0.901451371033629,,0.796952522339428,,0,0.0940931459294995,0.827170206196744,0.794031832023991,0.45591798688246,0.361548978343526,5,5
+Afghanistan,AFG,2013,652860,32269592,FALSE,0.478931752567232,0.0663924121607994,0.819524140674746,,0.602627518104023,,0,0.181826957710863,0.411135529179151,0.725581704937129,0.355196766916386,0.276987320797588,5,5
+Afghanistan,AFG,2014,652860,33370804,FALSE,0.549473135199903,0.0565073068343362,0.70378779315201,,0.470434943657244,,0.108082421307479,0.329765555366582,0.550410299142161,0.627034025180717,0.393652191127178,0.334359921566255,5,5
+Afghanistan,AFG,2015,652860,34413603,FALSE,0.628731177949177,0.218328753124444,0.656525928432732,,0.405614854196417,7.82295541278777,0,0.796178655797118,0.563081648109756,0.585360170875705,1.64827048673398,0.432589845581405,6,5
+Afghanistan,AFG,2016,652860,35383028,FALSE,,0.13337236428388,0.540654051364176,,0.355371554755065,0.164085371334168,0,0.860644898802072,0.434779034634983,0.477603970012227,0.254578164323442,0.381280053546633,5,5
+Afghanistan,AFG,2017,652860,36296111,FALSE,,0.0758790092795275,0.569150664181342,,0.351847506168348,3.7878613471563,0,0.950197629911224,0.321361144483453,0.505062352506171,0.950850433020124,0.370500027236075,5,5
+Afghanistan,AFG,2018,652860,37171922,FALSE,,0.186705540891511,0.586593084275153,,0.359002960207285,,0,,,0.521984741200435,0.257766208388888,0.236230094030649,4,3
+Afghanistan,AFG,2019,652860,38041757,FALSE,,0.057329570734446,0.527114139424173,,,,,,,0.469982330623807,0.292221855079309,0.263655950679126,2,2
+Afghanistan,AFG,2020,652860,38928341,FALSE,,0.0419438807170375,0.487673335899509,,,,,,,0.429106401076608,0.264808608308273,0.235525140896823,2,2
+Angola,AGO,1990,1246700,11848385,FALSE,0,1.2426573890026,1.46860083805042,,,,,,,1.41289074037995,0.903752742351008,1.32777406469128,3,2
+Angola,AGO,1991,1246700,12248901,FALSE,0,2.37934316632074,1.30653566202397,,,,,,,1.31577681734708,1.2286262761149,1.84755999183391,3,2
+Angola,AGO,1992,1246700,12657361,FALSE,0,0.998451547638622,1.49238840947278,,,,,,1.1749657394895,1.42928054179772,0.916451424150226,1.20089927630861,3,3
+Angola,AGO,1993,1246700,13075044,FALSE,0,1.02007589268418,1.07794616466108,,,,,,0.82574739518167,1.06605758230171,0.730942363131732,0.97062695672252,3,3
+Angola,AGO,1994,1246700,13503753,FALSE,0,0.559615860686952,1.06992933122262,,,,,,,1.04248279804122,0.543181730636522,0.801049329364084,3,2
+Angola,AGO,1995,1246700,13945205,FALSE,0,1.48897478247174,1.23804304641977,0.00900018525836218,,,,,1.40839185108974,1.1917595206758,0.828881973047923,1.02453158487391,4,4
+Angola,AGO,1996,1246700,14400722,FALSE,0.000141140876822342,0.587742586880358,1.6129673690428,0.0187923186562306,,,,,1.46627573134831,1.628201910364,0.737183829360905,0.925253136812225,4,4
+Angola,AGO,1997,1246700,14871572,FALSE,0.000999374135675561,1.22578077331038,1.64551242952869,0.035305335481311,,,,,0.610103642917958,1.59033602904096,0.703540311074802,0.865381445187652,4,4
+Angola,AGO,1998,1246700,15359600,FALSE,0.00314716279910792,3.18092047995489,1.28190751596442,0.0396737103581465,,,,,,1.25190764230674,1.12641221726914,1.49083394420659,4,3
+Angola,AGO,1999,1246700,15866871,FALSE,0.0118806341640135,6.83182969221143,1.64137899770813,0.0329995375129623,,,,,,1.61321192105817,2.12952221539914,2.82601371692752,4,3
+Angola,AGO,2000,1246700,16395477,FALSE,0.0167829672305369,2.35037008854502,2.01726197717329,0.0363343474281783,,,,,0.444541404982707,1.97881497145323,0.973058157071944,1.20251520310228,4,4
+Angola,AGO,2001,1246700,16945753,FALSE,0.0210250680580486,5.55291207973706,1.88014447195929,0.0465772523822026,,,,,,1.83355855957725,1.87516471803415,2.4776826305655,4,3
+Angola,AGO,2002,1246700,17519418,FALSE,0.0404263709058847,4.61540462825652,2.11879154854062,0.0616461093360381,,,,,,2.04359572146956,1.70906716425977,2.24021548635404,4,3
+Angola,AGO,2003,1246700,18121477,FALSE,0.0535825126951739,8.88937849551008,2.43352016085968,0.0702755277506907,0.271750064869622,,,,,2.32195987941569,2.86168917420391,3.76053796755882,5,3
+Angola,AGO,2004,1246700,18758138,FALSE,0.0649090339002671,6.96872538422808,3.11350845048993,0.12418309371333,0.224689315379312,,,,0.32280507005073,3.00125076555916,2.11882620647647,2.60424107838782,5,4
+Angola,AGO,2005,1246700,19433604,FALSE,0.154115859552774,3.43765679863793,4.87140711498185,0.129817883061608,0.220084051293479,,,,0.347897752779518,4.69719887345114,1.78817908180274,2.15314282698255,5,4
+Angola,AGO,2006,1246700,20149905,FALSE,0.194999433687739,0.496926352732029,5.92232770980878,0.0714951236641941,0.237364480818872,,,0.00684538873632992,0.363731449347925,5.85253169375902,1.40989601384813,1.3583060016479,5,5
+Angola,AGO,2007,1246700,20905360,FALSE,0.213013125455703,3.78711521839675,8.1811508630427,0.111859881143089,0.277719589828913,,,0.0100694018355084,,8.04685297972076,3.07328477200956,2.98897437027403,5,4
+Angola,AGO,2008,1246700,21695636,FALSE,0.229401529454658,8.58883408899185,11.9362243909423,0.1631650994805,0.358134491057591,,,0.0100368358772919,,11.8609801767111,5.22940627721732,5.15575405026518,5,4
+Angola,AGO,2009,1246700,22514275,FALSE,0.267599294133226,4.30919802290064,8.91237259274837,0.196028253137881,0.396530177426206,,0.480601391423525,0.019446754468074,0.341031225403628,8.45763806186591,2.41780512995788,2.30065728486661,6,6
+Angola,AGO,2010,1246700,23356247,FALSE,0.314029223924913,8.57725032251527,8.96189268206565,0.219596068131165,0.432952084189835,,0.308850758197351,0.0375944808802931,0.366361403294081,8.59210030818812,3.12466340968807,3.01695889020105,6,6
+Angola,AGO,2011,1246700,24220660,FALSE,0.33526700477943,9.26486037125481,11.1450368819508,0.239794023965198,0.424507527341318,2.88594150453104,0,0.123512470178456,1.52089961529523,10.6309806592873,3.62739991453949,3.6300078566635,7,6
+Angola,AGO,2012,1246700,25107925,FALSE,0.678137292378172,4.10695733304297,11.3069334837707,0.254008811755058,0.457949681271772,3.27528092400966,0.287303494597606,0.313371525153207,1.5026504249567,10.8110541512531,3.05875310921584,2.87922429012645,7,6
+Angola,AGO,2013,1246700,26015786,FALSE,0.896124083235963,13.5570080377099,11.0257868801733,0.302061444742529,0.464223273275438,3.77752327892747,0,0.390049683266013,1.57620070885771,10.5811108721702,4.44781491909241,4.40107179112439,7,6
+Angola,AGO,2014,1246700,26941773,FALSE,2.08066755336014,7.39776830942353,10.2354247435203,0.266830338936351,0.494684586719216,,0.401621374060716,0.383449784420018,1.83149183976524,9.74693310552388,3.70230069317772,3.33801579202162,6,6
+Angola,AGO,2015,1246700,27884380,FALSE,2.72428224097722,17.0077891269908,6.24499923911588,0.25645428314825,0.487119258876896,19.2702549543735,0.129348305298425,0.485339052570728,1.52952257294205,5.92913012181722,6.73752153183517,4.22293057712792,7,6
+Angola,AGO,2016,1246700,28842482,FALSE,2.63378585915943,0.688124284214644,4.48850638180801,0.165756337525256,0.455314108195671,1.71040351471289,0,0.808515868781607,1.3970008942511,4.35427840223161,1.58336818166733,1.23561263116737,7,6
+Angola,AGO,2017,1246700,29816769,FALSE,2.81128251563353,12.8698052015769,5.14382335825317,0.104883455864129,0.435762243197163,1.48564781215361,0,0.725409356913911,1.86881177190334,5.05805084466968,3.46917915934066,3.43782677182132,7,6
+Angola,AGO,2018,1246700,30809787,FALSE,2.97573629736899,9.19863541289285,5.2455333468367,0.0845017329354199,0.413055580745686,,0.117066609298445,,,5.17986185424837,3.52429467986648,3.64501640234377,6,4
+Angola,AGO,2019,1246700,31825299,FALSE,2.96309176962271,8.88598002155559,4.33208045477507,0.081758998845434,,,,,,4.37245201497778,4.0657278111997,4.44673034512627,4,3
+Angola,AGO,2020,1246700,32866268,FALSE,,0.120788847823337,2.62334001422131,,,,,,,2.66999543804996,1.37206443102232,1.39539214293665,2,2
+Albania,ALB,1990,27400,3286542,FALSE,0,0,0.579285779995218,,,,,,,0.494685610758003,0.193095259998406,0.247342805379002,3,2
+Albania,ALB,1991,27400,3266790,FALSE,0,0,0.25563057879221,,,,,,,0.227353764182324,0.0852101929307368,0.113676882091162,3,2
+Albania,ALB,1992,27400,3247039,FALSE,0,0.27014797325956,0.498341577807259,,,,,,,0.448876460392562,0.25616318368894,0.359512216826061,3,2
+Albania,ALB,1993,27400,3227287,FALSE,0,0.788223952297943,0.676094997231381,,,,,,,0.641201556631809,0.488106316509775,0.714712754464876,3,2
+Albania,ALB,1994,27400,3207536,FALSE,0,0.724708830424221,0.681473665698692,,,,,,,0.646629688072609,0.468727498707638,0.685669259248415,3,2
+Albania,ALB,1995,27400,3187784,FALSE,0.00917758971564621,0.963093332956882,0.827116654606295,1.15702539049287,,,,,,0.77722284930535,0.739103241942922,0.965780524251699,4,3
+Albania,ALB,1996,27400,3168033,FALSE,0.0266218654856827,1.24736719196931,1.09555932439876,1.09906065288039,,,,,,1.00950402452976,0.867152258683533,1.11864395645982,4,3
+Albania,ALB,1997,27400,3148281,FALSE,0.040431842332683,0.661727744996008,0.565352536781987,0.457720230872851,,,,,,0.53052620948654,0.431308088745882,0.549991395118466,4,3
+Albania,ALB,1998,27400,3128530,FALSE,0.0544466244325953,0.630997897296225,0.67388310398318,0.713011537329605,,,,,,0.640500390959918,0.518084790760401,0.661503275195249,4,3
+Albania,ALB,1999,27400,3108778,FALSE,0.0686194749524543,0.581255036604795,1.00150593171676,1.44827811397567,,,,,,0.928428278477219,0.774914639312421,0.98598714301923,4,3
+Albania,ALB,2000,27400,3089027,FALSE,0.0967540016248472,2.0303623715024,1.45394188860962,1.24518627471096,,,,,,1.34527979513011,1.20656113411196,1.54027614711449,4,3
+Albania,ALB,2001,27400,3060173,FALSE,0.278880424882731,2.9710676867786,1.74357217264852,5.19488012526303,,,,,,1.63496354956444,2.54710010239322,3.26697045386869,4,3
+Albania,ALB,2002,27400,3051010,FALSE,0.334908803840549,1.94065957941044,1.94036532300519,7.05795735747622,,,,,,1.80262661672912,2.8184727659331,3.60041451787193,4,3
+Albania,ALB,2003,27400,3039616,FALSE,0.837564264848708,2.56891246877127,2.43975399816896,7.61995647632445,3.89036127665137,,,,,2.27543413088645,3.36654680202835,4.15476769199406,5,3
+Albania,ALB,2004,27400,3026939,FALSE,2.09457723864004,5.14218989442955,3.27339225281237,9.38561318987978,4.58607096884896,,5.95782950580983,,,3.01513929772382,5.17072041631431,5.87519297196075,6,4
+Albania,ALB,2005,27400,3011487,FALSE,5.25715418919169,3.88187456432853,3.94808697958174,11.4749187450021,6.24644177671861,37.5762741413325,,100,,3.64003309703093,12.4276617238873,29.7492066015904,6,4
+Albania,ALB,2006,27400,2992547,FALSE,8.41195826216805,4.91914673406685,4.76698575740857,14.4216119452776,6.76843297053971,34.1180724961295,,0.104605134044553,,4.44472571609438,13.3275550390101,5.97252238237085,6,4
+Albania,ALB,2007,27400,2970017,FALSE,13.2614743398243,9.70484359068152,6.32356003941618,16.7929025233183,7.23657118739465,35.3478886007609,,0.169891886977993,,5.85729189697447,16.2861338188002,8.13123247448808,6,4
+Albania,ALB,2008,27400,2947314,FALSE,21.2060180272029,24.0048395256641,8.18096842216886,21.1676249544681,7.74724861834948,,8.56630175172414,0.298689757060996,,7.79068217637391,16.6251505362456,12.3656276330582,6,5
+Albania,ALB,2009,27400,2927519,FALSE,36.8648598878672,26.06907805004,7.47500883243374,21.8253111714218,7.70168562617873,,3.69609621385613,1.5039950113395,,7.21760698126262,19.1860708311238,12.062417485584,6,5
+Albania,ALB,2010,27400,2913021,FALSE,40.4654143982664,17.1081394123966,7.5249839262777,24.4360785508669,9.49950003097432,34.6270310397571,1.23816385027684,4.28273279761773,,7.21384579794433,20.8999685296403,10.8557920818205,7,5
+Albania,ALB,2011,27400,2905195,FALSE,42.3777274850746,18.8829853233281,8.69504410409479,29.4862097779623,9.38841338904728,38.119949414647,4.96599683986417,7.57820827995817,7.26574640296846,8.03840265633165,21.3990941925628,12.7029248800688,7,6
+Albania,ALB,2012,27400,2900401,FALSE,44.615318400173,15.1394575455321,7.8105570472188,31.2982539940523,8.791228923112,45.9656814721305,1.24355125284307,7.59073429373816,7.79039205030381,7.24593527505584,21.9804588231791,11.7180540685875,7,6
+Albania,ALB,2013,27400,2895092,FALSE,46.8686543313162,19.4306854762087,8.076773147832,30.1429918524138,8.97075981564903,43.2313608266877,2.49166333732904,10.1395761308012,,7.44046819948891,25.0403548286312,13.9290769992483,7,5
+Albania,ALB,2014,27400,2889104,FALSE,49.2324839506626,18.6052756998486,8.31322269269583,32.8754858352111,7.7489727985865,53.5158814267396,7.49048278766835,17.5271013659109,,7.8306636866991,28.3388053988043,16.8658018750676,7,5
+Albania,ALB,2015,27400,2880703,FALSE,51.740292012918,16.2739621467494,6.82803827309499,36.4124468529916,7.74434894213119,61.5497795440799,2.50410909927007,24.7114501829039,,6.47805996669726,29.2181046548507,17.2760056497224,7,5
+Albania,ALB,2016,27400,2876101,FALSE,54.2821724749722,16.0337372078602,7.43381985838268,40.4959551462048,8.74450393210355,23.6852248505708,2.5081158813945,30.9387661753724,,7.02050046199252,24.0731709032309,19.3994149745649,7,5
+Albania,ALB,2017,27400,2873457,FALSE,56.8846357041879,17.2314994306373,8.60695138698615,43.5602133673369,9.76937114964852,14.5620401053472,3.76563557133164,40.2408370632482,,8.17839551972798,24.1018292609712,22.5953161904564,7,5
+Albania,ALB,2018,27400,2866376,FALSE,59.7667559260795,18.4975945548654,9.78714115686056,48.0669641377692,9.48565878591319,,3.77493807228776,,,9.25357419894135,27.9786787695725,19.8982677409659,6,4
+Albania,ALB,2019,27400,2854191,FALSE,62.913232313295,19.0698654752464,9.9216647770331,52.4687725138634,,,,,,9.5221942788966,36.0933837698595,27.0202774226688,4,3
+Albania,ALB,2020,27400,2837743,FALSE,66.6815682433489,0.774298292901875,7.74868049212279,,,,,,,7.53522046511014,25.0681823427912,4.15475937900601,3,2
+Andorra,AND,1990,470,54508,TRUE,0,,,,,,,,,,0,,1,0
+Andorra,AND,1991,470,56666,TRUE,0,,,,,,,,,,0,,1,0
+Andorra,AND,1992,470,58882,TRUE,0,,,,,,,,,,0,,1,0
+Andorra,AND,1993,470,60974,TRUE,0,,,,,,,,,,0,,1,0
+Andorra,AND,1994,470,62676,TRUE,0,,,,,,,,,,0,,1,0
+Andorra,AND,1995,470,63860,TRUE,0,,,,,,,,,,0,,1,0
+Andorra,AND,1996,470,64363,TRUE,62.1304307245204,,,,,,,,,,62.1304307245204,,1,0
+Andorra,AND,1997,470,64318,TRUE,100,,,,,,,,,,100,,1,0
+Andorra,AND,1998,470,64140,TRUE,100,,,,,,,,,,100,,1,0
+Andorra,AND,1999,470,64368,TRUE,100,,,100,,,,,,,100,100,2,1
+Andorra,AND,2000,470,65390,TRUE,100,,,100,,,,,,,100,100,2,1
+Andorra,AND,2001,470,67344,TRUE,,,,100,,,,,,,100,100,1,1
+Andorra,AND,2002,470,70048,TRUE,100,,,100,,,,,,,100,100,2,1
+Andorra,AND,2003,470,73180,TRUE,100,,,100,,,,,,,100,100,2,1
+Andorra,AND,2004,470,76250,TRUE,100,,,100,,,,,,,100,100,2,1
+Andorra,AND,2005,470,78871,TRUE,100,,,100,,,,,,,100,100,2,1
+Andorra,AND,2006,470,80995,TRUE,100,,,100,,,,9.24195135598067,,,100,54.6209756779903,2,2
+Andorra,AND,2007,470,82682,TRUE,100,,,100,,,,12.2487313807557,,,100,56.1243656903778,2,2
+Andorra,AND,2008,470,83860,TRUE,100,,,100,,,,12.0766691772052,,,100,56.0383345886026,2,2
+Andorra,AND,2009,470,84461,TRUE,100,,,100,,,,16.5090238663187,,,100,58.2545119331594,2,2
+Andorra,AND,2010,470,84454,TRUE,100,,,100,,,,19.9862876607628,,,100,59.9931438303814,2,2
+Andorra,AND,2011,470,83748,TRUE,100,,,100,,,,21.9073727466077,,,100,60.9536863733039,2,2
+Andorra,AND,2012,470,82427,TRUE,,,,100,,,,22.2584686994193,,,100,61.1292343497096,1,2
+Andorra,AND,2013,470,80770,TRUE,,,,100,,,,27.2581475076782,,,100,63.6290737538391,1,2
+Andorra,AND,2014,470,79213,TRUE,,,,100,,,,41.6909537471954,,,100,70.8454768735977,1,2
+Andorra,AND,2015,470,77993,TRUE,,,,100,,,,61.1623096614025,,,100,80.5811548307012,1,2
+Andorra,AND,2016,470,77295,TRUE,,,,100,,,,80.7037771873477,,,100,90.3518885936739,1,2
+Andorra,AND,2017,470,76997,TRUE,100,,,100,,,,100,,,100,100,2,2
+Andorra,AND,2018,470,77008,TRUE,,,,100,,,,,,,100,100,1,1
+Andorra,AND,2019,470,77146,TRUE,,,,100,,,,,,,100,100,1,1
+Andorra,AND,2020,470,77265,TRUE,,,,,,,,,,,,,0,0
+United Arab Emirates,ARE,1990,71020,1828437,FALSE,0,4.16108974011068,,,,,,,,,2.08054487005534,4.16108974011068,2,1
+United Arab Emirates,ARE,1991,71020,1937159,FALSE,0,0.823717781522488,,,,,,,,,0.411858890761244,0.823717781522488,2,1
+United Arab Emirates,ARE,1992,71020,2052892,FALSE,0,3.0960649165097,,,,,,,,,1.54803245825485,3.0960649165097,2,1
+United Arab Emirates,ARE,1993,71020,2173135,FALSE,0,8.72039469707332,,,,,,,,,4.36019734853666,8.72039469707332,2,1
+United Arab Emirates,ARE,1994,71020,2294377,FALSE,0,12.2238617837042,,,,,,,,,6.1119308918521,12.2238617837042,2,1
+United Arab Emirates,ARE,1995,71020,2415099,FALSE,0.111650542901796,8.39583759817601,,11.6430079009317,,,,,,,6.71683201400316,10.0194227495538,3,2
+United Arab Emirates,ARE,1996,71020,2539121,FALSE,0.387274127709751,7.41255919620847,,12.3038099105184,,,,,,,6.70121441147887,9.85818455336343,3,2
+United Arab Emirates,ARE,1997,71020,2671361,FALSE,3.23158842641909,7.61086761418494,,11.2581061939959,,,,,,,7.36685407819998,9.43448690409043,3,2
+United Arab Emirates,ARE,1998,71020,2813214,FALSE,6.4325578501617,6.00167030792561,,12.9142179991974,,,,,7.3053549471447,,8.16345027610735,8.74041441808923,3,3
+United Arab Emirates,ARE,1999,71020,2966029,FALSE,13.1968034656785,19.2594417812215,,13.8952507074614,,,,,5.31353279331686,,12.9162571869196,12.8227417606666,3,3
+United Arab Emirates,ARE,2000,71020,3134067,FALSE,19.7462288314122,13.0146512297858,,15.1424725767242,,,,,5.6060991081356,,13.3773629365145,11.2544076382152,3,3
+United Arab Emirates,ARE,2001,71020,3302722,FALSE,20.8368539072688,18.5588837666979,,15.2040847925449,,,,,5.47958303935428,,15.0198513764665,13.0808505328657,3,3
+United Arab Emirates,ARE,2002,71020,3478769,FALSE,21.322044707596,6.76294232006697,,19.0126405496207,,,,,5.64404791097194,,13.1854188720639,10.4732102602199,3,3
+United Arab Emirates,ARE,2003,71020,3711931,FALSE,20.8023561465544,61.998222515966,,19.2124467032666,60.6031699437941,,27.2069508631287,,7.74620054964191,,27.3932353557115,29.0409551580008,5,4
+United Arab Emirates,ARE,2004,71020,4068577,FALSE,19.3994924943577,100,,18.495581408196,64.3961969968099,,27.4815288530157,,9.98828299769808,,35.0729771506535,38.9913483147275,5,4
+United Arab Emirates,ARE,2005,71020,4588222,FALSE,22.83655884632,100,,18.8656286340216,64.1828189043466,,22.0107754865227,,10.5248545284308,,34.847563499059,37.8503146622438,5,4
+United Arab Emirates,ARE,2006,71020,5300172,FALSE,25.6997248794707,100,,,60.8369592127944,,26.5397225966619,1.3949140593723,11.60648735951,,40.9614837089106,34.8852810038861,4,4
+United Arab Emirates,ARE,2007,71020,6168846,FALSE,25.9024593249765,100,,,57.240214083296,,21.0484590963533,2.34387683519809,,,48.9836394737766,41.1307786438505,4,3
+United Arab Emirates,ARE,2008,71020,7089486,FALSE,23.2777443501818,100,,,57.5870506808175,82.428694918685,21.367626156041,4.0328124687643,,,56.768516356227,41.8001462082684,5,3
+United Arab Emirates,ARE,2009,71020,7917368,FALSE,21.1745522912119,21.3672786505294,,,57.8459328226858,73.949289161417,27.7888605323303,5.64043253858155,9.21882819060145,,30.699761765218,16.0038499780107,5,4
+United Arab Emirates,ARE,2010,71020,8549998,FALSE,20.8332964399601,55.4612934323781,,,59.5788801750709,71.900965838314,37.5444484851879,9.02107495695589,10.2704975943614,,39.2021003580403,28.0743286172208,5,4
+United Arab Emirates,ARE,2011,71020,8946778,FALSE,22.8372094759488,45.7381575385609,,,60.9734957040641,100,43.5390380881372,12.509105688398,14.2548634324974,,45.2738537070289,29.0102911868984,5,4
+United Arab Emirates,ARE,2012,71020,9141598,FALSE,24.3563304088904,58.0654799854665,,,65.3737203380124,100,36.6929445649053,20.3808543592823,14.3220496236201,,46.6873609165764,32.3653321333185,5,4
+United Arab Emirates,ARE,2013,71020,9197908,FALSE,25.0615948481498,88.6595507755134,,,70.5823288194678,100,40.7817646054863,37.995933735197,10.3267335090696,,52.9659287476438,44.4409956563166,5,4
+United Arab Emirates,ARE,2014,71020,9214182,FALSE,25.699622152974,100,,21.3987839493444,74.5873674471891,100,64.1961225377095,54.163491804612,10.7614199089083,,53.6759914248227,50.1039636401148,6,5
+United Arab Emirates,ARE,2015,71020,9262896,FALSE,25.5927459244919,100,,22.9124551351535,83.300992098061,100,68.9204673810028,74.7059949729671,11.290750209582,,54.7860697750384,55.5659335397411,6,5
+United Arab Emirates,ARE,2016,71020,9360975,FALSE,25.3525846433564,100,,24.6124731791008,85.8510797451059,100,80.1427028528372,92.6858466228163,14.7944917643491,,57.4837087399406,62.4471028838207,6,5
+United Arab Emirates,ARE,2017,71020,9487206,FALSE,26.1804049297538,100,,26.1121874076964,83.056265829761,100,86.2996952407786,100,17.4065626817151,,59.3331417099907,65.963689066038,6,5
+United Arab Emirates,ARE,2018,71020,9630966,FALSE,26.7769416748158,100,,50.6919555890115,79.0942423870095,,66.2865097459198,,,,60.9388517524368,72.3261551116438,5,3
+United Arab Emirates,ARE,2019,71020,9770526,FALSE,26.5821355133666,100,,50.2980895054311,,,,,,,58.9600750062659,75.1490447527156,3,2
+United Arab Emirates,ARE,2020,71020,9890400,FALSE,26.4850768682207,,,,,,,,,,26.4850768682207,,1,0
+Argentina,ARG,1990,2736690,32618648,FALSE,0,2.51561708141722,1.56760461212361,,,,,,,1.88563573932787,1.36107389784694,2.20062641037255,3,2
+Argentina,ARG,1991,2736690,33079002,FALSE,0,3.29932061384053,1.86023844661164,,,,,,,2.11176129289874,1.71985302015073,2.70554095336964,3,2
+Argentina,ARG,1992,2736690,33529320,FALSE,0.000233818452415382,7.32118515069272,2.46502528691095,,,,,,2.90427727670981,2.59556163523521,3.17268038319147,4.27367468754591,3,3
+Argentina,ARG,1993,2736690,33970103,FALSE,0.0022768714443786,4.51649422152607,2.68725514672183,,,,,,2.19893371349633,2.84713260511853,2.35123998829715,3.18752018004698,3,3
+Argentina,ARG,1994,2736690,34402669,FALSE,0.00332784838252633,5.9253261943919,3.24153009218261,,,,,,3.08007602397213,3.47267431011398,3.06256503973229,4.159358842826,3,3
+Argentina,ARG,1995,2736690,34828168,FALSE,0.00648903186096619,8.94929403503434,3.50453144613414,0.796943008591972,,,,,3.25361451599997,3.86870180372649,3.30217440752428,4.21713834083819,4,4
+Argentina,ARG,1996,2736690,35246376,FALSE,0.0105499502722654,10.6383575579132,3.98736270883047,0.89948379653723,,,,,3.2700454190627,4.34075617098428,3.76115988652317,4.78716073612435,4,4
+Argentina,ARG,1997,2736690,35657438,FALSE,0.0205944332297988,15.7602450415127,4.61130172442335,0.940200489426489,,,,,3.2507976897011,5.0416238570647,4.91662787565868,6.24821676942624,4,4
+Argentina,ARG,1998,2736690,36063451,FALSE,0.0603429976320312,11.6947906644636,4.66215890893379,1.01313777763998,,,,,3.1696611719547,5.22467248030867,4.12001830412482,5.27556552359174,4,4
+Argentina,ARG,1999,2736690,36467218,FALSE,0.235927921179456,30.9309624416033,4.00278352936596,0.96392849114127,,,,,2.79653818482356,4.6326441155174,7.78602811362271,9.83101830827139,4,4
+Argentina,ARG,2000,2736690,36870796,FALSE,0.500062159487516,13.4647381402049,4.18203272048277,0.956985888578084,,,,,3.4111814646256,4.93501640042999,4.50300007467578,5.69198047345965,4,4
+Argentina,ARG,2001,2736690,37275644,FALSE,0.687328956230099,2.73799703579822,3.77306828245155,0.852392591552819,,,,,1.26106367626743,4.33863202470929,1.86237010846002,2.29752133208194,4,4
+Argentina,ARG,2002,2736690,37681743,FALSE,0.75648060213731,3.2311381254005,2.68402048474905,0.907667263298376,,,,,1.98996357747242,3.09959883594588,1.91385401061153,2.30709195052929,4,4
+Argentina,ARG,2003,2736690,38087866,FALSE,0.819360432165289,2.79335275699736,3.33277829490041,0.953788990801485,1.98404566872908,,4.35605070852948,,2.75417031717161,3.69376456974977,2.5015835834276,2.91022546864994,6,5
+Argentina,ARG,2004,2736690,38491970,FALSE,1.09133863440132,5.47007966913392,4.21017653718137,2.489555775379,2.17238199742564,,5.90326319306935,,3.12221704515615,4.59369179990495,3.71443847572019,4.31576149652868,6,5
+Argentina,ARG,2005,2736690,38892924,FALSE,1.19350024905539,7.41602021826413,5.0441211895628,2.59224878361213,2.05460995591824,,6.86250794617551,,3.20935512547552,5.27115419791916,4.38629225202425,5.07025725428929,6,5
+Argentina,ARG,2006,2736690,39289876,FALSE,1.39522935241315,8.90363689142578,5.86120897186688,2.69033778117339,2.01155808045923,,6.05877762560568,0.986590431211383,3.09647992142433,6.1484867626486,4.6676117573182,4.6473849022482,6,6
+Argentina,ARG,2007,2736690,39684303,FALSE,1.7126844122306,8.81660389959929,7.2588505939477,2.90357789463549,2.25874562287187,,4.36258815658852,1.69446116780227,,7.45572677493618,5.01086099140032,5.04659157871235,6,5
+Argentina,ARG,2008,2736690,40080159,FALSE,1.83732944148927,12.1645873065075,9.0071228918824,3.06734920959797,2.26846158254427,2.32110757553651,6.56924047388891,3.61760007516105,,8.94610173314546,5.82778948315043,6.87297575966018,7,5
+Argentina,ARG,2009,2736690,40482786,FALSE,2.20000474887111,5.12307934075366,6.89642391079096,3.02962616936417,2.1864809884926,,5.25658092159321,3.9421729544855,2.32557815102759,6.93514753573069,4.13854887373345,4.4353641788258,6,6
+Argentina,ARG,2010,2736690,40788453,FALSE,2.88995029833204,13.2232463641722,8.85457235750163,3.83546998755147,2.45246357315169,1.7570765512193,7.78156901812781,5.42122250557908,2.91991369232742,8.78317600008729,5.89454260989026,6.99409959464087,7,6
+Argentina,ARG,2011,2736690,41261490,FALSE,3.23772801639735,13.1040188501981,10.8715418053743,4.23192539732191,2.61168807288622,1.8351041102523,4.10841859983663,6.82648132559822,3.42464107381444,10.6128106783618,5.83048255045643,7.05138265418851,7,6
+Argentina,ARG,2012,2736690,41733271,FALSE,3.50240905812671,17.2130741510912,10.2659836475067,4.30428684015789,2.65855235745444,2.02074093576155,4.06197426923408,7.80302489754397,3.35851149278894,9.90347954332774,6.38956862780958,7.77405853235731,7,6
+Argentina,ARG,2013,2736690,42202935,FALSE,3.71791332878181,11.1319775574364,10.2769960201611,4.70598548515588,2.53183171108142,2.11223128989935,4.78593843410769,10.3817357217236,3.64598450309174,9.89042262687339,5.76814665980485,7.42367405473146,7,6
+Argentina,ARG,2014,2736690,42669500,FALSE,3.97193214719108,7.18063087851065,9.19243026052105,4.89166669075219,2.51796840429485,1.89478062508723,5.32530800055613,15.4652779898384,3.52688323360779,8.86716892041106,5.14051883374659,7.54282261894604,7,6
+Argentina,ARG,2015,2736690,43131966,FALSE,4.13237477910842,12.8472049545467,8.18867360983391,5.62443203247344,2.37620882148032,1.7653905493985,4.01387384637812,17.533095438932,4.41883280237426,7.98348788443779,5.85582608201619,8.73682115985705,7,6
+Argentina,ARG,2016,2736690,43590368,FALSE,4.2647455717704,5.0778020895688,8.11100924702443,7.05288731360012,2.40107517282284,,3.3924625089008,20.645200477223,4.62617580935075,7.95626264685496,5.42084709003589,8.12513180758307,6,6
+Argentina,ARG,2017,2736690,44044811,FALSE,4.41854605326598,12.6190449395815,8.94294615233376,7.8022893698274,2.59009254028725,,3.35745995570714,22.9937165331577,4.99345936729819,8.99203258814761,7.02229097300232,10.1263337922866,6,6
+Argentina,ARG,2018,2736690,44494502,FALSE,,13.2507676732547,8.87861659755781,6.92046306980309,2.74541215900294,,4.21520527321464,,,9.24720522422973,8.31626315345755,8.40841031012553,5,4
+Argentina,ARG,2019,2736690,44938712,FALSE,,8.00521686044565,7.8489478443414,6.14866134604664,,,,,,8.29990431984203,7.3342753502779,7.48459417544477,3,3
+Argentina,ARG,2020,2736690,45376763,FALSE,,1.25055031140673,6.16351135029118,,,,,,,6.23698878207291,3.70703083084895,3.74376954673982,2,2
+Armenia,ARM,1990,28470,3538164,FALSE,0,,,,,,,,,,0,,1,0
+Armenia,ARM,1991,28470,3505249,FALSE,0,,,,,,,,,,0,,1,0
+Armenia,ARM,1992,28470,3442820,FALSE,0,0.0305742735877478,,,,,,,,,0.0152871367938739,0.0305742735877478,2,1
+Armenia,ARM,1993,28470,3363111,FALSE,0,0.0104329711977363,0.304703341094778,,,,,,,0.144532262060739,0.105045437430838,0.0774826166292375,3,2
+Armenia,ARM,1994,28470,3283664,FALSE,0.00727292324088953,0.10685392962797,0.457271363403023,,,,,,,0.389206533731051,0.190466072090628,0.248030231679511,3,2
+Armenia,ARM,1995,28470,3217349,FALSE,0.0429420488985037,0.3451634100808,0.753712567334269,0.0438559362844399,,,,,,0.691479208333248,0.296418490649503,0.360166184899496,4,3
+Armenia,ARM,1996,28470,3168213,FALSE,0.0781929211695532,0.243229704834859,0.936687680406111,0.0483929647494066,,,,,,0.880910071607672,0.326625817789982,0.390844247063979,4,3
+Armenia,ARM,1997,28470,3133081,FALSE,0.0933481757947791,0.72709229982931,0.974926112092301,0.087725109037766,,,,,,0.962129551252958,0.470772924188539,0.592315653373345,4,3
+Armenia,ARM,1998,28470,3108691,FALSE,0.108412490951675,3.44136596250847,1.02027798382987,0.123594449905777,,,,,,0.980116474371313,1.17341272179895,1.51502562892852,4,3
+Armenia,ARM,1999,28470,3089020,FALSE,0.823182815596866,1.73268393790632,0.971704702701316,0.15978439046509,,,,,,0.927769553312078,0.921838961667397,0.940079293894495,4,3
+Armenia,ARM,2000,28470,3069597,FALSE,1.10977280359455,1.48866729303042,1.09709268569573,0.615918233188827,,,,,,1.04933694448837,1.07786275387738,1.05130749023587,4,3
+Armenia,ARM,2001,28470,3050686,FALSE,1.40054398510899,1.00448425442642,1.26681075533758,0.926362508052416,,,,,,1.19545729656206,1.14955037573135,1.04210135301363,4,3
+Armenia,ARM,2002,28470,3033976,FALSE,1.69257828452148,1.60066355264265,1.52072903913034,1.17171098105981,,,,,,1.45112652693465,1.49642046433857,1.40783368687903,4,3
+Armenia,ARM,2003,28470,3017938,FALSE,3.97115189620548,1.79424710481107,1.97545219198211,1.50801606651143,4.84991227169663,,7.17071847857172,,,1.88391113663905,3.28391714761636,3.08922319663332,6,4
+Armenia,ARM,2004,28470,3000715,FALSE,4.27659913725092,3.61407262069609,2.28417478567872,1.95795056173011,5.9396786945179,,,,,2.43862756267098,3.03319927633896,2.67021691503239,5,3
+Armenia,ARM,2005,28470,2981262,FALSE,4.61552357845103,4.37613754871297,2.96516271242646,2.39451201894834,5.79181267148491,,7.25893389570718,,4.8744893888255,3.12558069962517,4.41412652384525,4.40593071036383,6,5
+Armenia,ARM,2006,28470,2958301,FALSE,4.98676628438637,7.25215308090296,3.50244663962449,2.91819530610646,5.62218295928072,,,,5.30903735642419,3.77663610534754,4.79371973348889,4.81400546219529,5,4
+Armenia,ARM,2007,28470,2932615,FALSE,5.37832381840964,10.11841742885,4.78354863578881,4.05392136329712,6.27992804557091,,,,,5.19789662125019,6.08355281158638,6.45674513779909,5,3
+Armenia,ARM,2008,28470,2907615,FALSE,5.594609693645,14.6956251358391,5.79950395666437,4.48569810456595,7.23259590682487,,,0.273314295105174,,6.21276506044209,7.6438592226786,6.41685064898807,5,4
+Armenia,ARM,2009,28470,2888094,FALSE,13.8769876089178,12.3354296273445,4.55721528723576,4.62959528783655,7.36127554499462,,8.74195267919988,0.828275822387067,,4.9988233675571,8.8282360981069,6.30681535686503,6,5
+Armenia,ARM,2010,28470,2877314,FALSE,22.7597686816115,8.48703406073856,5.63652322430824,5.26335469255787,8.20327233838667,54.651415421503,8.77470483968072,2.68999016890939,5.63458296288604,6.12975730244986,15.8867691261837,6.16323733787041,7,6
+Armenia,ARM,2011,28470,2876536,FALSE,29.1403832117463,13.3001311762403,6.40538659880648,6.21920398301424,9.16924273457159,41.8195519573064,5.01547319038913,6.64595799259326,,6.89996704684917,16.9833550195838,7.61614667781723,7,5
+Armenia,ARM,2012,28470,2884239,FALSE,34.057684400129,7.90830953464386,6.71428708962025,8.11897855233164,9.11585367115473,42.3077058519092,6.25259782094566,7.63327003454608,,7.19371799358296,17.5599272082633,7.42137478721004,7,5
+Armenia,ARM,2013,28470,2897593,FALSE,37.878409350061,5.69665389689723,7.17046852884399,9.08354538505654,7.56976736625363,41.0352944825412,2.48951270747638,11.5491552049047,,7.6078063298647,17.2256473918127,7.28533470483991,7,5
+Armenia,ARM,2014,28470,2912403,FALSE,49.1289666367227,6.55660033283613,7.27779955247004,10.0175581849811,8.67251178614615,37.7760953188543,12.3842658357971,15.5040497300399,,7.74434853818703,20.5235476436102,10.4413645243683,7,5
+Armenia,ARM,2015,28470,2925559,FALSE,52.9175636382749,3.19142792805966,6.21099342644533,9.87699934275988,7.35160095141061,27.4951676089821,6.16428740165093,29.6473688134868,,6.39819765538957,17.6427398910288,11.0556562282694,7,5
+Armenia,ARM,2016,28470,2936147,FALSE,57.4062336802004,6.03857345257473,6.58229660941396,10.4371596920114,7.23909591353177,20.036283783381,3.68523506891579,27.7575805128239,,6.79533422615302,17.3642970477495,10.9427765904958,7,5
+Armenia,ARM,2017,28470,2944789,FALSE,57.592558367078,4.17013928948935,8.22779302368063,12.2793844402091,8.67865959377737,19.6009512368544,2.44961340000747,51.8593664757929,,8.3622937381613,17.3867399595532,15.824159468732,7,5
+Armenia,ARM,2018,28470,2951741,FALSE,60.5630888345297,4.06887019469303,9.45731530354622,13.4768863832473,9.52765620509802,,4.88768804213825,,,9.43070150327797,18.4907697516309,7.96603653083914,6,4
+Armenia,ARM,2019,28470,2957728,FALSE,58.9339344818172,3.46902637182233,10.786096774625,15.4498066501421,,,,,,10.6488785658274,22.1597160696017,9.85590386259729,4,3
+Armenia,ARM,2020,28470,2963234,FALSE,,0.403756602169702,7.13240352052574,,,,,,,7.03030214408712,3.76808006134772,3.71702937312841,2,2
+American Samoa,ASM,1990,200,47351,TRUE,0,,,,,,,,,,0,,1,0
+American Samoa,ASM,1991,200,48682,TRUE,0,,,,,,,,,,0,,1,0
+American Samoa,ASM,1992,200,49900,TRUE,0,,,,,,,,,,0,,1,0
+American Samoa,ASM,1993,200,51025,TRUE,0,,,,,,,,,,0,,1,0
+American Samoa,ASM,1994,200,52099,TRUE,0,,,,,,,,,,0,,1,0
+American Samoa,ASM,1995,200,53158,TRUE,0,,,,,,,,,,0,,1,0
+American Samoa,ASM,1996,200,54209,TRUE,,,,,,,,,,,,,0,0
+American Samoa,ASM,1997,200,55227,TRUE,,,,,,,,,,,,,0,0
+American Samoa,ASM,1998,200,56180,TRUE,,,,,,,,,,,,,0,0
+American Samoa,ASM,1999,200,57049,TRUE,,,,,,,,,,,,,0,0
+American Samoa,ASM,2000,200,57816,TRUE,,,,,,,,,,,,,0,0
+American Samoa,ASM,2001,200,58496,TRUE,,,,,,,,,,,,,0,0
+American Samoa,ASM,2002,200,59077,TRUE,,,,,,,,,,,,,0,0
+American Samoa,ASM,2003,200,59495,TRUE,,,,,100,,,,,,,,1,0
+American Samoa,ASM,2004,200,59684,TRUE,,,,,100,,,,,,,,1,0
+American Samoa,ASM,2005,200,59557,TRUE,,,,,87.1263252229814,,,,,,,,1,0
+American Samoa,ASM,2006,200,59109,TRUE,,,,,97.9050088722304,,,,,,,,1,0
+American Samoa,ASM,2007,200,58367,TRUE,,,,,98.0577817068676,,,,,,,,1,0
+American Samoa,ASM,2008,200,57490,TRUE,,,,,73.4602362580735,,,0.319024090484003,,,,0.319024090484003,1,1
+American Samoa,ASM,2009,200,56675,TRUE,,,,,32.9106732930319,,63.6400052456515,0.323613329899291,,,63.6400052456515,31.9818092877754,2,2
+American Samoa,ASM,2010,200,56084,TRUE,,,,8.72764528999493,89.1564533592499,,0,0.327024661325138,,,4.36382264499746,3.01822331710669,3,3
+American Samoa,ASM,2011,200,55755,TRUE,,,,8.99703517510264,94.6943550481834,,0,,,,4.49851758755132,4.49851758755132,3,2
+American Samoa,ASM,2012,200,55669,TRUE,,,,10.9530740684676,100,,64.7900500691102,,,,37.8715620687889,37.8715620687889,3,2
+American Samoa,ASM,2013,200,55717,TRUE,,,,10.7474097379079,100,,0,,,,5.37370486895393,5.37370486895393,3,2
+American Samoa,ASM,2014,200,55791,TRUE,,,,11.2339556323024,100,,0,,,,5.6169778161512,5.6169778161512,3,2
+American Samoa,ASM,2015,200,55806,TRUE,,,,10.2513668529472,100,,0,,,,5.1256834264736,5.1256834264736,3,2
+American Samoa,ASM,2016,200,55739,TRUE,,,,8.34578734067612,100,,0,,,,4.17289367033806,4.17289367033806,3,2
+American Samoa,ASM,2017,200,55617,TRUE,,,,9.23778442486806,100,,0,,,,4.61889221243403,4.61889221243403,3,2
+American Samoa,ASM,2018,200,55461,TRUE,,,,11.3446151250693,45.3872857425845,,0,,,,5.67230756253467,5.67230756253467,3,2
+American Samoa,ASM,2019,200,55312,TRUE,,,,11.5728431114733,,,,,,,11.5728431114733,11.5728431114733,1,1
+American Samoa,ASM,2020,200,55197,TRUE,,,,,,,,,,,,,0,0
+Antigua and Barbuda,ATG,1990,440,62533,TRUE,0,42.5084887473218,26.5010697203917,,,,,,,24.8977458256907,23.0031861559045,33.7031172865062,3,2
+Antigua and Barbuda,ATG,1991,440,63363,TRUE,0,37.9267249292952,28.2114770209152,,,,,,,25.9456711984446,22.0460673167368,31.9361980638699,3,2
+Antigua and Barbuda,ATG,1992,440,64459,TRUE,0,13.3689495166663,29.7610144873602,,,,,,,27.2664164124349,14.3766546680088,20.3176829645506,3,2
+Antigua and Barbuda,ATG,1993,440,65777,TRUE,0,10.1622818607304,30.7766628746298,,,,,,,27.8766770071115,13.6463149117867,19.0194794339209,3,2
+Antigua and Barbuda,ATG,1994,440,67201,TRUE,0,16.1785854875815,30.869703133873,,,,,,,28.1246330313605,15.6827628738182,22.151609259471,3,2
+Antigua and Barbuda,ATG,1995,440,68672,TRUE,83.9478965977339,20.1087826054376,29.5786150056959,79.0720839819441,,,,,,27.0383354986619,53.1768445477029,42.0730673620145,4,3
+Antigua and Barbuda,ATG,1996,440,70176,TRUE,100,12.0946455019874,29.9560680430852,86.2058525148933,,,,,,27.3602142710777,57.0641415149915,41.8869040959861,4,3
+Antigua and Barbuda,ATG,1997,440,71707,TRUE,100,14.0337978409895,31.059874472399,89.1087697223177,,,,,,28.059153279918,58.5506105089266,43.7339069477418,4,3
+Antigua and Barbuda,ATG,1998,440,73219,TRUE,100,13.6419407414622,31.5493813722178,94.5687673471847,,,,,,28.9686057012336,59.9400223652162,45.7264379299602,4,3
+Antigua and Barbuda,ATG,1999,440,74674,TRUE,100,30.4198425408895,32.4352402859399,91.0992964846962,,,,,,29.7187163335881,63.4885948278814,50.4126184530579,4,3
+Antigua and Barbuda,ATG,2000,440,76007,TRUE,100,24.8795974270969,30.6931997741235,100,,,,,,28.9707804610589,63.8931993003051,51.2834592960519,4,3
+Antigua and Barbuda,ATG,2001,440,77212,TRUE,100,55.9242211236159,29.1663763872981,98.1740479841298,,,,,,27.2328722967823,70.816161373761,60.4437138015094,4,3
+Antigua and Barbuda,ATG,2002,440,78298,TRUE,100,36.8946740306331,27.8464908246514,81.9179147774313,,,,,,25.9308248504413,61.664769908179,48.2478045528352,4,3
+Antigua and Barbuda,ATG,2003,440,79311,TRUE,100,91.9757334906728,30.3912622366475,95.4226221195889,100,,100,,,28.0937737997162,83.5579235693819,78.8730323524945,6,4
+Antigua and Barbuda,ATG,2004,440,80347,TRUE,100,43.8697412204056,33.8814872351484,100,100,,,,,31.4537816979165,69.4378071138885,58.4411743061073,5,3
+Antigua and Barbuda,ATG,2005,440,81462,TRUE,100,100,36.4374164194136,100,100,,,,,33.922254625614,84.1093541048534,77.9740848752047,5,3
+Antigua and Barbuda,ATG,2006,440,82715,TRUE,100,100,39.9392033421844,100,100,,,,,37.5267730534627,84.9848008355461,79.1755910178209,5,3
+Antigua and Barbuda,ATG,2007,440,84029,TRUE,100,100,43.5493379812538,100,100,,,10.4803161501849,,40.7511109583926,85.8873344953135,62.8078567771444,5,4
+Antigua and Barbuda,ATG,2008,440,85394,TRUE,100,81.5526329930081,44.6636867937016,100,100,,,10.3127893551458,,41.4132994215568,81.5540799466774,58.3196804424277,5,4
+Antigua and Barbuda,ATG,2009,440,86743,TRUE,100,40.776611234682,35.3356406952588,100,100,94.6879610389482,0,10.1524063541685,,32.8113596230748,61.8000354948148,36.7480754423851,7,5
+Antigua and Barbuda,ATG,2010,440,88030,TRUE,100,48.1683316118217,33.022545249177,100,100,,40.9723650721038,10.003976388179,,30.1981359123006,64.4326483866205,45.868561796881,6,5
+Antigua and Barbuda,ATG,2011,440,89250,TRUE,100,32.0210853456494,31.9371891416344,100,100,68.8195755600429,80.8245892951775,10.6895039115041,,29.3762828959041,68.9337398904174,50.5822922896471,7,5
+Antigua and Barbuda,ATG,2012,440,90407,TRUE,100,62.7597403394552,32.8602462821127,100,100,,39.8951109681474,23.9466561758021,,30.4520429497962,67.103019517943,51.4107100866402,6,5
+Antigua and Barbuda,ATG,2013,440,91510,TRUE,100,64.3622334434181,32.8314072099351,100,100,,100,29.6727965077674,,30.3901424888229,79.4387281306707,64.8850344880017,6,5
+Antigua and Barbuda,ATG,2014,440,92562,TRUE,100,24.9214114092887,50.97706849872,100,100,,0,34.1323309385033,,46.6869668747343,55.1796959816018,41.1481418445053,6,5
+Antigua and Barbuda,ATG,2015,440,93571,TRUE,100,60.0437381413879,48.2811078541192,100,100,,0,39.2152003861577,,45.1257239879615,61.6649691991014,48.8769325031014,6,5
+Antigua and Barbuda,ATG,2016,440,94520,TRUE,100,62.8348914148537,50.2982814043367,100,100,,38.1590911690362,46.5857870431702,,47.0337429356667,70.2584527976453,58.9227025125454,6,5
+Antigua and Barbuda,ATG,2017,440,95425,TRUE,,73.2050664294213,49.7935437828347,100,100,,75.5943892543316,49.989311831331,,46.0461161553216,74.6482498666469,68.9669767340811,5,5
+Antigua and Barbuda,ATG,2018,440,96282,TRUE,,75.1813165272455,54.4733023628861,100,100,,0,,,50.43018629671,57.4136547225329,56.4028757059889,5,4
+Antigua and Barbuda,ATG,2019,440,97115,TRUE,,68.0783849829139,58.5787323920029,100,,,,,,54.6979361151714,75.5523724583056,74.2587736993618,3,3
+Antigua and Barbuda,ATG,2020,440,97928,TRUE,,,30.9507154570622,,,,,,,28.5199339860289,30.9507154570622,28.5199339860289,1,1
+Australia,AUS,1990,7682300,17065100,FALSE,0.0898115991760887,23.364426005775,14.6349722353832,,,,,,,15.418193883132,12.6964032801114,19.3913099444535,3,2
+Australia,AUS,1991,7682300,17284000,FALSE,0.166286952968617,9.60240569690651,14.8457367329696,,,,,,,15.3764667462328,8.20480979428158,12.4894362215697,3,2
+Australia,AUS,1992,7682300,17495000,FALSE,0.26483248868874,22.0041101577849,15.1400672433505,,,,,,23.8063849060159,15.3718354785404,15.30384869896,20.3941101807804,3,3
+Australia,AUS,1993,7682300,17667000,FALSE,0.292774899431695,19.5083630715338,15.2870506590787,,,,,,28.3857475248468,15.3743134439974,15.8684840387227,21.089474680126,3,3
+Australia,AUS,1994,7682300,17855000,FALSE,0.327468198703921,15.4416804896029,17.41506847835,,,,,,28.0461105650917,17.7648606739623,15.3075819329371,20.417550576219,3,3
+Australia,AUS,1995,7682300,18072000,FALSE,0.400003315693013,42.0207280181662,19.4573500178919,4.19642233326684,,,,,29.7166558707231,20.0449389264313,19.1582319111482,23.9946862871468,4,4
+Australia,AUS,1996,7682300,18311000,FALSE,0.468540858986932,22.9231814908696,21.1339765537969,4.57418310022139,,,,,31.972818965978,21.8568231768798,16.2145401939706,20.3317516834872,4,4
+Australia,AUS,1997,7682300,18517000,FALSE,2.31566709435435,33.5633186464139,21.8029437059519,4.75551898691464,,,,,35.7396177611762,22.5306395041557,19.6354132389622,24.1472737246651,4,4
+Australia,AUS,1998,7682300,18711000,FALSE,4.31375478382499,28.7477275372668,19.7136036229076,4.75618919554599,,,,,33.890450613813,20.1542606441617,18.2843451506717,21.8871569976969,4,4
+Australia,AUS,1999,7682300,18926000,FALSE,5.64473782028538,5.84513015474565,20.3825407216594,4.92101858902901,,,,,34.1609890080356,21.0530297273115,14.190883258751,16.4950418697804,4,4
+Australia,AUS,2000,7682300,19153000,FALSE,6.39464896928423,43.4812062477058,21.7240898442251,5.34471452176679,,,,,37.723172563676,22.4626673488457,22.9335664293316,27.2529401704986,4,4
+Australia,AUS,2001,7682300,19413000,FALSE,7.10959057699868,54.4436070085834,20.0361165612651,5.19176349022916,,,,,38.3010215402327,20.667138277904,25.0164198354618,29.6508825792373,4,4
+Australia,AUS,2002,7682300,19651400,FALSE,,48.2764955301244,21.3515781731693,5.13061675280914,,,,,35.2429695238163,22.0667801654837,27.5004149949798,27.6792154930584,3,4
+Australia,AUS,2003,7682300,19895400,FALSE,,60.8063994932117,24.6015866781598,4.96509696931382,5.61587563441753,,39.8833602443482,,33.7347710328267,25.7378810539832,32.798242883572,33.0255017587367,5,5
+Australia,AUS,2004,7682300,20127400,FALSE,,100,29.89557109745,5.78300200392347,6.72875448744446,,40.1404351577747,,37.0511239404163,31.995949949483,42.5740264399129,42.9941022103195,5,5
+Australia,AUS,2005,7682300,20394800,FALSE,8.09163329290766,100,34.3340645370638,6.10683541074929,7.25008592741759,,35.3697736412938,,37.6103146067469,37.0919526251315,36.9187702481269,43.2357752567843,6,5
+Australia,AUS,2006,7682300,20697900,FALSE,8.35281273993578,100,38.2811226822199,6.14533365932613,7.03623516919159,,35.2003369450067,2.30928772528185,39.2747007022147,42.2257032292522,37.8757177881172,37.5258937101803,6,6
+Australia,AUS,2007,7682300,20827600,FALSE,8.73470246004334,100,45.1347068224948,6.47626089889789,7.04312850068956,,47.1033083439698,4.05203925761897,,51.4241595461082,41.4897957050812,41.811153609319,6,5
+Australia,AUS,2008,7682300,21249200,FALSE,8.83506836263549,100,54.5189580054848,6.51238499197539,7.17673177483601,,46.338481550466,5.18043584555204,,60.4344983376509,43.2409785821123,43.6931601451289,6,5
+Australia,AUS,2009,7682300,21691700,FALSE,8.96639697032304,81.174556512204,44.6091407838353,6.58783631895417,7.82693610671446,,39.0747320341359,15.2244878290293,31.4527960004616,48.8350278282251,35.3109097699857,37.0582394205017,6,6
+Australia,AUS,2010,7682300,22031750,FALSE,9.03607217927135,100,56.4478726521128,7.10754367619142,8.19095090484703,,61.390901153403,23.3170665163359,29.0112268590148,61.8622587019393,43.8322694199989,47.1148328178141,6,6
+Australia,AUS,2011,7682300,22340024,FALSE,9.32033187527191,100,68.8180301156042,7.3715998913177,8.58897163891903,,55.8617065435948,29.5654285000575,35.9469180748761,74.5465942912823,46.2197644167774,50.5487078835214,6,6
+Australia,AUS,2012,7682300,22733465,FALSE,9.1028324702541,100,68.6584544377658,7.61003652788674,8.64266911560202,,47.7554119658612,35.5101597949807,43.2207420318128,72.7885174380368,46.0579129055968,51.147477959763,6,6
+Australia,AUS,2013,7682300,23128129,FALSE,9.45190033832231,100,65.9481269639716,8.15771969331449,8.99241866743072,,46.1607594803713,41.2504430120488,44.9113500393369,69.7912202733313,45.7716427525528,51.7119154164005,6,6
+Australia,AUS,2014,7682300,23475686,FALSE,9.37294542005109,100,62.7588231270721,8.48608714862708,9.22532551185949,,45.7846298759744,14.0675260573748,43.0834512874398,66.3633115537541,44.9143228098608,46.297500987195,6,6
+Australia,AUS,2015,7682300,23815995,FALSE,9.30066458262895,100,52.1829434911504,8.80194273236316,9.15347599768634,,39.2240802872187,17.2561312965627,44.4164032260769,55.2184245496615,42.3210057199064,44.1528303486472,6,6
+Australia,AUS,2016,7692020,24190907,FALSE,9.37086827229739,83.5414669493981,51.1936392983488,9.36854590547867,9.69553050482856,,30.2667382976319,24.2696091789039,45.5601082704997,54.3715735963779,38.2168944989424,41.2296736997151,6,6
+Australia,AUS,2017,7692020,24601860,FALSE,9.21487351957168,99.6152454977668,57.6538970342937,9.74926308688405,9.98826494967394,,27.4154512949263,42.6573526230673,47.5302568379066,61.4535419068503,41.8631645452248,48.0701852079002,6,6
+Australia,AUS,2018,7692020,24982688,FALSE,,100,61.7600944956672,10.0392284328706,10.1673066645698,,32.4836699674547,,,66.2724001599527,51.0707482239981,52.1988246400695,5,4
+Australia,AUS,2019,7692020,25365745,FALSE,,87.6835840679718,60.8213036935407,10.0988007727632,,,,,,64.8060254037939,52.8678961780919,54.1961367481763,3,3
+Australia,AUS,2020,7692020,25687041,FALSE,,21.2733813232083,51.8293532319737,,,,,,,53.8722826352345,36.551367277591,37.5728319792214,2,2
+Austria,AUT,1990,82580,7677850,FALSE,0.044478595077316,13.4470202311841,,,,,,,,,6.74574941313071,13.4470202311841,2,1
+Austria,AUT,1991,82580,7754891,FALSE,0.0875136681460393,9.34881097086774,,,,,,,,,4.71816231950689,9.34881097086774,2,1
+Austria,AUT,1992,82580,7840709,FALSE,0.214757099643126,18.1548657277123,,,,,,,7.83750724651544,,8.73571002462361,12.9961864871139,2,2
+Austria,AUT,1993,82580,7905633,FALSE,0.253591332530169,12.7802663712162,,,,,,,10.5679445544943,,7.86726741941356,11.6741054628552,2,2
+Austria,AUT,1994,82580,7936118,FALSE,0.459928097785456,18.3305475042537,,,,,,,9.54072502844007,,9.44373354349306,13.9356362663469,2,2
+Austria,AUT,1995,82580,7948278,FALSE,0.622948611495758,16.0500562748832,,26.2453527147059,,,,,11.4841127241338,,13.6006175813047,17.9265072379076,3,3
+Austria,AUT,1996,82580,7959017,FALSE,2.27395077741266,34.235202554787,,26.0832541668788,,,,,14.8720770269284,,19.3661211315017,25.0635112495314,3,3
+Austria,AUT,1997,82580,7968041,FALSE,3.13427797997015,25.6908067347535,,25.3783212340214,,,,,16.9898227351162,,17.7983071709653,22.686316901297,3,3
+Austria,AUT,1998,82580,7976789,FALSE,5.06413999930351,40.3572193233066,,26.4241417094461,,,,,20.2080505183688,,23.0133878876063,28.9964705170405,3,3
+Austria,AUT,1999,82580,7992324,FALSE,7.55276296834415,34.4372429996521,,26.5475718579601,,,,,21.6517584109343,,22.5473340592226,27.5455244228488,3,3
+Austria,AUT,2000,82580,8011566,FALSE,11.0284818343766,76.7000305353473,,38.67943008359,,,,,26.1130287351525,,38.1302427971166,47.1641631180299,3,3
+Austria,AUT,2001,82580,8042293,FALSE,12.7632137632647,47.5076851147864,,40.0723625854399,,,,,23.1418375577692,,30.8712747553151,36.9072950859985,3,3
+Austria,AUT,2002,82580,8081957,FALSE,11.8496287912103,32.1199534047931,,40.3972658429071,,,,,23.0652675708047,,26.8580289024288,31.8608289395016,3,3
+Austria,AUT,2003,82580,8121423,FALSE,13.7724383790785,70.5013510982769,,41.0759868661813,31.4447918315154,33.6721431916723,100,100,24.2260987946547,,47.2080030549773,67.1606873518226,6,5
+Austria,AUT,2004,82580,8171966,FALSE,17.3991640091189,60.1832674059509,,41.2426169666619,35.69252041772,26.8140453874221,100,100,29.0282817657747,,45.7778959224881,66.0908332276775,6,5
+Austria,AUT,2005,82580,8227829,FALSE,18.4653621835506,100,90.5010740903368,41.5723624958191,36.3406273433696,24.141683827889,100,100,30.9960465634587,93.106027672295,57.9537898801506,77.6124061219288,7,6
+Austria,AUT,2006,82580,8268641,FALSE,20.1482844288122,100,98.4611956846781,44.5302665203955,36.4822935824221,24.4380744308575,100,12.2215403573763,32.6195199091709,100,60.028191567702,64.8952211311571,7,6
+Austria,AUT,2007,82578,8295487,FALSE,21.9050829147695,100,100,44.8811213649606,39.5397610821482,24.3743184335292,100,12.7260209466488,,100,65.1934204522099,71.5214284623219,7,5
+Austria,AUT,2008,82578,8321496,FALSE,22.9383647726807,100,100,46.1466551379625,41.6813223983091,23.808733695775,100,25.9566038902426,,100,65.4822922677364,74.420651805641,7,5
+Austria,AUT,2009,82578,8343323,FALSE,23.0604531464378,100,100,45.8279095649622,38.6940397065276,21.9007661108717,100,29.1237990606578,23.9146009602426,100,59.2433899689306,66.4777182643104,7,6
+Austria,AUT,2010,82571,8363404,FALSE,23.5438004430164,100,100,46.3134013586083,39.6248631256652,27.8541657939441,100,30.3199184041565,31.0868122119766,100,61.2568828296493,67.9533553291236,7,6
+Austria,AUT,2011,82561,8391643,FALSE,24.5789579558977,100,100,47.6051715685243,39.5230592386277,27.1181559782768,100,37.37958720732,31.8045636295579,100,61.5866927331796,69.464887067567,7,6
+Austria,AUT,2012,82554,8429991,FALSE,24.8679947440986,100,100,50.5949246185559,38.4974181990932,51.071019445915,100,44.4479238555971,30.5676199241252,100,65.3002226760993,70.9350780663797,7,6
+Austria,AUT,2013,82531,8479823,FALSE,24.9037435871368,59.387365284002,100,50.8319425651931,36.2096107954874,47.0743891284613,100,63.0163259531513,34.0921910971319,100,59.469947380275,67.8879708165797,7,6
+Austria,AUT,2014,82523,8546356,FALSE,24.8254281724956,13.2790061939851,100,51.5747641057789,36.153421623564,45.3130700603436,100,28.3372820809691,35.620454594482,100,52.9446747324408,54.8019178292025,7,6
+Austria,AUT,2015,82520,8642699,FALSE,25.4410718869772,51.3318905500903,100,52.5051976708201,35.4596824918893,42.9441932029306,100,30.5688055870442,35.3162099898335,100,58.2197947572359,61.6203506329647,7,6
+Austria,AUT,2016,82520,8736668,FALSE,25.2824487295734,100,100,55.1371119982407,35.0302896842357,,100,33.1800277166122,35.1390415338835,100,69.2597670436163,70.5760302081227,6,6
+Austria,AUT,2017,82520,8797566,FALSE,26.1828685462077,100,100,56.5449931461949,34.715070751606,,100,33.7845389783467,37.0940892319782,100,69.9703251540635,71.2372702260866,6,6
+Austria,AUT,2018,82520,8840521,FALSE,25.9204015369253,100,100,57.5179442571963,36.7900082445484,,100,,,100,76.6876691588243,89.3794860642991,6,4
+Austria,AUT,2019,82520,8879920,FALSE,25.8859481999066,43.4160403641025,100,59.8989242033615,,,,,,100,57.3002281918427,67.7716548558214,4,3
+Austria,AUT,2020,82520,8917205,FALSE,25.7122708432175,72.6600851717524,100,,,,,,,100,66.1241186716566,86.3300425858762,3,2
+Azerbaijan,AZE,1990,83217,7175200,FALSE,0,,,,,,,,,,0,,1,0
+Azerbaijan,AZE,1991,83217,7271300,FALSE,0,,,,,,,,,,0,,1,0
+Azerbaijan,AZE,1992,83217,7382050,FALSE,0,,,,,,,,,,0,,1,0
+Azerbaijan,AZE,1993,83217,7494800,FALSE,0,,,,,,,,,,0,,1,0
+Azerbaijan,AZE,1994,83217,7596550,FALSE,0.000493587618740319,0.127018068128193,,,,,,,,,0.0637558278734666,0.127018068128193,2,1
+Azerbaijan,AZE,1995,83217,7684850,FALSE,0.000700662721900136,1.88366455221647,0.615149023111046,0.145558093692895,,,,,,0.532004735862378,0.661268082935577,0.85374246059058,4,3
+Azerbaijan,AZE,1996,83217,7763000,FALSE,0.00214423658203571,3.56599141023395,0.763367391884972,1.00318283841936,,,,,,0.666190126794029,1.33367146928008,1.74512145848245,4,3
+Azerbaijan,AZE,1997,83217,7838250,FALSE,0.00841760441516965,6.23811581612359,0.965521101838355,1.48638410045301,,,,,,0.846567858284112,2.17460965570753,2.85702259162024,4,3
+Azerbaijan,AZE,1998,83092,7913000,FALSE,0.012408883472669,5.67006675537352,1.01198104914387,2.49937148099819,,,,,1.06389134256484,0.896435058974758,2.05154390231062,2.53244115947783,4,4
+Azerbaijan,AZE,1999,82705,7982750,FALSE,0.0325612393241404,2.80379805768933,0.93200305422836,2.74687470063484,,,,,0.640879880670221,0.820133568569637,1.43122338650938,1.75292155189101,4,4
+Azerbaijan,AZE,2000,82605,8048600,FALSE,0.0480888628421321,0.712204146082945,1.20699128703741,3.02776361136694,,,,,,1.16089675385564,1.24876197683236,1.63362150376851,4,3
+Azerbaijan,AZE,2001,82604,8111200,FALSE,0.0986808944370131,7.63848358276319,1.30390277622938,2.83964045639215,,,,,0.448715412525192,1.24559800041582,2.46588462446938,3.04310936302409,4,4
+Azerbaijan,AZE,2002,82618,8171950,FALSE,1.60263464633383,16.0062522287819,1.66867862836702,2.93447025915646,,,,,0.553680946364904,1.56644704982501,4.55314334180083,5.26521262103208,4,4
+Azerbaijan,AZE,2003,82652,8234100,FALSE,,30.1635862829859,2.25092596448879,3.7060341979189,0.236287951790699,,,,0.797783043294831,2.09816003447231,9.2295823721721,9.19139088966798,4,4
+Azerbaijan,AZE,2004,82672,8306500,FALSE,,37.4196187115758,2.96917304952794,4.02324845863914,0.761534923615543,,,,1.58864497465235,2.79833571890221,11.5001712985988,11.4574619659424,4,4
+Azerbaijan,AZE,2005,82660,8391850,FALSE,2.50664728032842,44.3910493396565,4.2725382343395,4.35145039394274,2.41984028150417,,,,1.77377192073167,4.24508112506775,11.4590914337998,13.6903381948497,5,4
+Azerbaijan,AZE,2006,82637,8484550,FALSE,3.70240839914307,53.0441290605105,6.12391068804187,4.33682249994771,2.49015871606269,6.13158221344328,2.12550889398807,0.0670966612479865,1.81680978359219,6.15820650282322,11.0401673626667,11.2580955670183,7,6
+Azerbaijan,AZE,2007,82629,8581300,FALSE,4.43839975516917,72.6937397849866,8.87709098374506,4.19447885560503,2.51947270108634,7.54279391156085,,0.246916967134009,,9.17596017382549,19.5493006582133,21.5777739453878,6,4
+Azerbaijan,AZE,2008,82627,8763400,FALSE,5.10540647775662,42.6130456294347,11.8651310075551,5.62796728055304,2.72328355676365,9.19786374247729,100,0.418609521917031,,11.9375739511204,29.0682356896295,32.119439276605,7,5
+Azerbaijan,AZE,2009,82622,8947243,FALSE,8.0218848606818,27.7102012432828,8.76370053189672,5.69151770701278,2.78042707142956,10.6319938190876,3.62806460891648,0.984169596966262,1.72458683363439,8.75517327652261,9.45313565778751,8.08228554438922,7,6
+Azerbaijan,AZE,2010,82656,9054332,FALSE,13.3081139457253,30.8796257989048,10.2430041408765,6.89340816469083,3.24671873121672,11.9098053889519,3.1868036624213,3.07991305822575,2.10761104834269,10.0835574900599,11.218338878559,9.37181987044088,7,6
+Azerbaijan,AZE,2011,82658,9173082,FALSE,14.2780803800429,38.4302730633074,13.8754375387789,7.6649491754166,3.92907364098196,12.5735970254897,1.57277447091274,4.9601364651029,2.62123873717931,13.7301516016557,13.0023357701611,11.4965872522624,7,6
+Azerbaijan,AZE,2012,82658,9295784,FALSE,15.2731408461661,46.1157914177192,14.0386808567015,8.30733782290557,4.35128873351455,12.5177885594272,0.388003561323854,7.42099716419688,3.06024071507436,13.7774790405949,14.2429976827597,13.1783082869691,7,6
+Azerbaijan,AZE,2013,82659,9416801,FALSE,20.306476339112,19.0834168838454,14.1984920942828,8.76301331428438,4.54548697594215,11.5266100580817,2.29810354745564,11.1443630539673,3.22771293029353,13.8118567609786,11.3434035953365,9.72141108180414,7,6
+Azerbaijan,AZE,2014,82663,9535079,FALSE,20.6040289924976,29.5191225436733,13.2277578281761,8.33323927652103,4.91015285122074,10.6115154641703,3.02612892650165,14.3926543237056,3.63795876632147,12.8874086874329,12.7085359711231,11.9660854206927,7,6
+Azerbaijan,AZE,2015,82663,9649341,FALSE,20.9029780664023,32.9852037063053,9.61037860340431,7.68061016207904,4.80117930870774,4.56241664757848,2.61650832746828,19.7742576977507,4.16847474372379,9.39989829546664,11.7895100367088,12.770825488799,7,6
+Azerbaijan,AZE,2016,82670,9757812,FALSE,20.9927532247317,31.7926572847608,8.41928506241267,8.12929615589096,4.65509105872227,2.87911942115175,1.10889530274737,19.5544394072345,4.37485952788668,8.29573509346679,11.0995522827974,12.2093137953312,7,6
+Azerbaijan,AZE,2017,82662,9854033,FALSE,21.0004293027418,24.1765535100564,9.03402353763514,8.38891981000736,5.18919557787687,2.24822517065168,2.5621571473407,26.8110377703433,5.25236844904261,8.82828140574094,10.3803824182108,12.6698863487552,7,6
+Azerbaijan,AZE,2018,82654,9939771,FALSE,21.0301118188326,13.9605381855355,10.4758127264481,9.48003989224018,5.59125818663803,,3.26578707655093,,,10.3795012853638,11.6424579399215,9.27146660992259,6,4
+Azerbaijan,AZE,2019,82654,10024283,FALSE,21.1925211026739,17.2195159432238,9.94122215342329,10.58772015997,,,,,,9.79934334936656,14.7352448398227,12.5355264841868,4,3
+Azerbaijan,AZE,2020,82654,10093121,FALSE,,3.58619591204144,7.33298695256138,,,,,,,7.28257812016015,5.45959143230141,5.4343870161008,2,2
+Burundi,BDI,1990,25680,5438959,FALSE,0,0.0101707474931263,0.143238224686421,,,,,,,0.123790641311502,0.0511363240598491,0.0669806944023143,3,2
+Burundi,BDI,1991,25680,5564923,FALSE,0,0.00725119854580858,0.160080581333278,,,,,,,0.137920657525564,0.0557772599596954,0.0725859280356864,3,2
+Burundi,BDI,1992,25680,5685569,FALSE,0,0.0046291416654943,0.137866134131419,,,,,,,0.12239406106495,0.0474984252656377,0.0635116013652222,3,2
+Burundi,BDI,1993,25680,5798054,FALSE,0,0.00461132546334907,0.118861273021495,,,,,,,0.102460726838636,0.0411575328282813,0.0535360261509924,3,2
+Burundi,BDI,1994,25680,5898964,FALSE,0,0.000794522960769269,0.110398421048009,,,,,,,0.0927559379760082,0.0370643146695926,0.0467752304683887,3,2
+Burundi,BDI,1995,25680,5987044,FALSE,0,0.0189185544434292,0.118776706290237,0.140579626299117,,,,,,0.101979314354043,0.0695687217581958,0.0871591650321965,4,3
+Burundi,BDI,1996,25680,6060110,FALSE,0.000347352309838027,0,0.0374610316371149,0.12283053391698,,,,,,0.0283482282953422,0.0401597294659833,0.0503929207374409,4,3
+Burundi,BDI,1997,25680,6122130,FALSE,0.00341416814269553,0,0.0502025587467446,0.0402164068661144,,,,,,0.037467700002532,0.0234582834388886,0.0258947022895488,4,3
+Burundi,BDI,1998,25680,6185564,FALSE,0.0067091433458579,0,0.0531396859730389,0.0594282883031931,,,,,,0.0380145963344533,0.0298192794055224,0.0324809615458821,4,3
+Burundi,BDI,1999,25680,6267132,FALSE,0.0163863349495799,0.00499572273103151,0.03198353041569,0.101279828215896,,,,,,0.0186561127477109,0.0386613540780493,0.0416438878982128,4,3
+Burundi,BDI,2000,25680,6378871,FALSE,0.0317220343907838,0.160660392171049,0.0390694253510289,0.107097871143178,,,,,,0.0259844410621024,0.0846374307640099,0.0979142347921097,4,3
+Burundi,BDI,2001,25680,6525546,FALSE,0.0425509445133862,0.000138412573794236,0.0326449432530163,0.130720369044025,,,,,,0.020455190394731,0.0515136673460556,0.0504379906708502,4,3
+Burundi,BDI,2002,25680,6704118,FALSE,0.0461950350067339,0,0.0290079188366305,0.132635813934648,,,,,,0.0157963470552501,0.051959691944503,0.0494773869966326,4,3
+Burundi,BDI,2003,25680,6909161,FALSE,0.076308993616832,0.0000293175630977526,0.0389718688126763,0.128656455639368,0.358998587123405,,,,,0.0263725892499461,0.0609916589079934,0.0516861208174705,5,3
+Burundi,BDI,2004,25680,7131688,FALSE,0.12821044805393,0.000274842644593943,0.062405884534031,0.225095993039397,0.316796581378372,,,,,0.0472967232453468,0.103996792067988,0.0908891863097793,5,3
+Burundi,BDI,2005,25680,7364857,FALSE,0.192825525018495,0.00348200391593108,0.099395592835837,0.242665258837606,0.324670820174839,,,,,0.0801504796101819,0.134592095151967,0.10876591412124,5,3
+Burundi,BDI,2006,25680,7607850,FALSE,0.226417537891766,0.000182137279925977,0.133650180512592,0.340254754196508,0.38350255575759,,,,,0.10824434207913,0.175126152470198,0.149560411185188,5,3
+Burundi,BDI,2007,25680,7862226,FALSE,0.233220977087424,0.00298601726028597,0.123717695093219,0.295206770219087,0.452707128678089,,,0.000822373903880432,,0.100778625416478,0.163782864915004,0.0999484466999331,5,4
+Burundi,BDI,2008,25680,8126104,FALSE,0.261106532046026,0.0238276157821439,0.184368272102783,0.300522668127499,0.500375968681075,,,0.0012887777366094,,0.154426246484731,0.192456272014613,0.120016327032746,5,4
+Burundi,BDI,2009,25680,8397661,FALSE,0.280736747805972,0.00181963668074521,0.14570537343384,0.305223491077322,0.533162348524179,,1.71800090396471,0.0107254757295225,,0.118751924007007,0.490297230592518,0.430904286291861,6,5
+Burundi,BDI,2010,25680,8675606,FALSE,0.301936261579248,0.0039461895018495,0.181502297500771,0.197381290256233,0.707853309849375,,0,0.0127891599305003,,0.148326846552819,0.13695320776762,0.0724886972482805,6,5
+Burundi,BDI,2011,25680,8958406,FALSE,0.324569219932395,0.0164255870565627,0.232240431114731,0.193816538540074,0.779016260839942,,0.402615967315759,0.0146347568597154,,0.197219090385505,0.233933548791904,0.164942388031523,6,5
+Burundi,BDI,2012,25680,9245992,FALSE,0.345637926992526,0.00286948132681076,0.262692891966578,0.191684481423808,0.894959516819858,2.20875372037418,0.390093058408151,0.0329081602601173,,0.222947129921603,0.566955260082009,0.168100462268098,7,5
+Burundi,BDI,2013,25680,9540302,FALSE,0.347116276950743,0.537389122582962,0.249692893494656,0.296506122977129,0.773762769436663,0.900844164743298,0,0.0691210154127855,,0.210640480131154,0.388591430124798,0.222731348220806,7,5
+Burundi,BDI,2014,25680,9844301,FALSE,0.372527420647164,0.364328229953698,0.239214620867324,0.288538935001645,0.67585087530811,0.943805150448636,0,0.0744379838654528,,0.203195465590371,0.368069059486411,0.186100122882233,7,5
+Burundi,BDI,2015,25680,10160034,FALSE,0.54142614969659,0.214869941671698,0.202584868269014,0.155178366730489,0.585058316346385,0.632093843115771,0,0.21658600925163,,0.170337333263748,0.29102552824726,0.151394330183513,7,5
+Burundi,BDI,2016,25680,10488002,FALSE,0.599423236397055,0.000384158131240741,0.178608442511674,0.215143608488388,0.415718257512765,0.255202207312399,0,0.245496255418367,,0.147196674990462,0.208126942140126,0.121644139405692,7,5
+Burundi,BDI,2017,25680,10827010,FALSE,0.643739840061275,0.00132229660241536,0.220245865894174,0.334026236681568,0.477570206390985,0.241701886938395,0,0.397688237402823,,0.184273550254534,0.240172687696305,0.183462064188268,7,5
+Burundi,BDI,2018,25680,11175379,FALSE,1.17198711675662,0.00386084987244957,0.219616429449864,,0.436734067385881,,0,,,0.183690121051139,0.348866099019733,0.0625169903078628,5,3
+Burundi,BDI,2019,25680,11530577,FALSE,1.18131956634845,0.00682007123017521,,,,,,,,,0.594069818789311,0.00682007123017521,2,1
+Burundi,BDI,2020,25680,11890781,FALSE,,,,,,,,,,,,,0,0
+Belgium,BEL,1990,32820,9967379,FALSE,0.000264576609162895,63.1928691222757,,,,,,,,,31.5965668494424,63.1928691222757,2,1
+Belgium,BEL,1991,32820,10004486,FALSE,0.00525563162157284,68.5362569800872,,,,,,,,,34.2707563058544,68.5362569800872,2,1
+Belgium,BEL,1992,32820,10045158,FALSE,0.0260877403486492,99.0810354053674,,,,,,,8.39718502109972,,35.8347693889386,53.7391102132336,2,2
+Belgium,BEL,1993,32820,10084475,FALSE,0.0518068586734198,68.0799223150582,,,,,,,8.38734025154828,,25.5063564750933,38.2336312833032,2,2
+Belgium,BEL,1994,32820,10115603,FALSE,0.180230896783199,42.8590324602431,,,,,,,10.0819893263975,,17.7070842278079,26.4705108933203,2,2
+Belgium,BEL,1995,32820,10136811,FALSE,0.256258246431225,96.4497404949488,,6.66165365072594,,,,,11.5732548040272,,28.7352267990333,38.2282163165673,3,3
+Belgium,BEL,1996,32820,10156637,FALSE,0.765577726905292,95.3905605903293,,13.7221531478836,,,,,12.1294191038033,,30.5019276422304,40.4140442806721,3,3
+Belgium,BEL,1997,32820,10181245,FALSE,1.27049338193542,82.9274944331882,,16.2077658848225,,,,,15.0821905804728,,28.8719860701047,38.0724836328278,3,3
+Belgium,BEL,1998,32820,10203008,FALSE,2.02478041461738,100,,16.6137230126422,,,,,20.4788422428588,,34.7793364175296,45.6975217518337,3,3
+Belgium,BEL,1999,32820,10226419,FALSE,3.5277295913678,100,,15.1787164473679,,,,,23.5716016922661,,35.5695119327505,46.2501060465447,3,3
+Belgium,BEL,2000,30280,10251250,FALSE,7.52061738823662,100,,17.0498322813457,,,,,25.759067018623,,37.5823791720513,47.6029664333229,3,3
+Belgium,BEL,2001,30280,10286570,FALSE,7.96760510088615,100,,15.376921660486,,,,,20.2884096629929,,35.9082341060913,45.2217771078263,3,3
+Belgium,BEL,2002,30280,10332785,FALSE,11.7451887726761,100,88.9759301878191,15.8618806897816,,,,,3.41453687434004,91.915370335544,43.9995073049234,52.7979469749164,4,4
+Belgium,BEL,2003,30280,10376133,FALSE,12.6150481809984,100,99.3886822505676,16.3400123234755,25.8894504270902,,98.3722582521962,,5.17740668360446,100,55.3155679484737,63.9779354518552,6,5
+Belgium,BEL,2004,30280,10421137,FALSE,13.538368710925,100,100,18.0587966267989,25.6061681540595,31.1499784310806,97.6013306261915,100,6.17584127997543,100,52.3606165249959,70.3059947554943,7,6
+Belgium,BEL,2005,30280,10478617,FALSE,13.9540719902739,100,100,18.6332866930973,24.5531712289258,32.3386217778641,83.2977239215773,100,6.37612490412154,100,50.657118469562,68.0511892531327,7,6
+Belgium,BEL,2006,30280,10547958,FALSE,14.8308656654254,100,100,17.0976626456313,24.0715241686396,31.0688801446878,81.7243066434332,12.4198049914019,6.84352833600108,100,50.2236062050255,53.0142171027446,7,6
+Belgium,BEL,2007,30280,10625700,FALSE,15.8859457676671,100,100,17.6230745765401,25.3069371055499,29.3399533656397,100,18.3065989298575,,100,60.4748289516411,67.1859347012795,7,5
+Belgium,BEL,2008,30280,10709973,FALSE,16.1424947392413,100,100,18.2057866415552,27.5447676836845,30.2812561406368,100,36.5673038073706,,100,60.7715895869055,70.9546180897852,7,5
+Belgium,BEL,2009,30280,10796493,FALSE,16.983626347946,100,100,17.5400475222945,26.1938431844005,31.4217935451445,100,39.343163073798,9.01754126045176,100,53.5661440965481,60.9834586427574,7,6
+Belgium,BEL,2010,30280,10895586,FALSE,18.0312470750162,100,100,17.8231438175574,26.8469210075856,31.7546070587545,100,42.477753530081,10.7517407859515,100,54.0515341053257,61.8421063555983,7,6
+Belgium,BEL,2011,30280,11038264,FALSE,19.3667913538383,100,100,18.9508034121899,27.0372625764541,32.6563109115793,100,52.3448262415994,9.58435484917515,100,54.3654657895404,63.4799974171607,7,6
+Belgium,BEL,2012,30280,11106932,FALSE,19.0371566407832,100,100,18.7406652634014,26.4779309219856,37.5298147321337,100,56.5899166429929,11.3976972812179,100,55.2436191310766,64.4547131979354,7,6
+Belgium,BEL,2013,30280,11159407,FALSE,19.2880498931847,100,100,20.1232119144894,26.4111812385563,35.6633701019292,100,60.5024341845916,22.6474545935456,100,56.8174409290213,67.2121834487711,7,6
+Belgium,BEL,2014,30280,11209057,FALSE,19.8639192948017,61.1343365925005,100,20.4578219164714,27.8870275517336,37.5316789885164,100,68.0911216535102,24.8346988789442,100,51.974636524462,62.4196631735711,7,6
+Belgium,BEL,2015,30280,11274196,FALSE,19.7614520340409,100,100,20.6757945927635,29.1275569054318,30.2763680931506,100,73.556175792774,25.6819039235282,100,56.6279312347833,69.9856457181776,7,6
+Belgium,BEL,2016,30280,11331422,FALSE,19.9999774048422,100,100,22.3542053571929,28.8288087045093,30.4886641699753,100,83.5471528254394,28.2411576613705,100,57.2977149419116,72.3570859740005,7,6
+Belgium,BEL,2017,30280,11375158,FALSE,20.1909436376437,100,100,21.9201030861346,29.3762604703922,32.2609169330031,100,87.0969028816266,31.0498349534853,100,57.9173998014667,73.3444734868744,7,6
+Belgium,BEL,2018,30280,11427054,FALSE,20.321068388734,100,100,23.6171643469222,29.3243502746043,,100,,,100,68.7876465471313,80.9042910867306,6,4
+Belgium,BEL,2019,30280,11488980,FALSE,20.5827398709137,100,100,24.8823990591817,,,,,,100,61.3662847325238,74.9607996863939,4,3
+Belgium,BEL,2020,30280,11555997,FALSE,20.7464499298655,73.7674194783853,100,,,,,,,100,64.8379564694169,86.8837097391926,3,2
+Benin,BEN,1990,112760,4978489,FALSE,0,0.601584037565373,0.35935404383612,,,,,,,0.322123066842345,0.320312693800498,0.461853552203859,3,2
+Benin,BEN,1991,112760,5149496,FALSE,0,1.02870872539823,0.611481283582893,,,,,,,0.547801770400154,0.546730002993707,0.788255247899192,3,2
+Benin,BEN,1992,112760,5331805,FALSE,0,0.638099528121243,0.528165175202018,,,,,,,0.473035326166513,0.388754901107754,0.555567427143878,3,2
+Benin,BEN,1993,112760,5521761,FALSE,0,0.354857059084967,0.521245477353208,,,,,,,0.469728836363595,0.292034178812725,0.412292947724281,3,2
+Benin,BEN,1994,112760,5714215,FALSE,0,0.21386643817585,0.458572494757854,,,,,,,0.402765728365374,0.224146310977901,0.308316083270612,3,2
+Benin,BEN,1995,112760,5905552,FALSE,0,0.213936861989856,0.580142310807144,1.19163022246928,,,,,,0.51377752923245,0.496427348816571,0.639781537897197,4,3
+Benin,BEN,1996,112760,6094272,FALSE,0.000727739369047341,0.308873520647859,0.514834203962079,1.02711046826198,,,,,,0.469716419689882,0.462886483060241,0.601900136199907,4,3
+Benin,BEN,1997,112760,6281644,FALSE,0.0102786832866508,0.0968836288663969,0.458485340857661,1.04477701328427,,,,,,0.411555155620178,0.402606166573744,0.517738599256947,4,3
+Benin,BEN,1998,112760,6470275,FALSE,0.0193830466742561,0.221986770847788,0.455744067497834,1.07811086127672,,,,,,0.410013449979238,0.44380618657415,0.570037027367916,4,3
+Benin,BEN,1999,112760,6664102,FALSE,0.0608896917408762,0.249002225168218,0.488112062066043,1.71389112764582,,,,,,0.434849981785226,0.627973776655239,0.799247778199754,4,3
+Benin,BEN,2000,112760,6865946,FALSE,0.0859360458598558,0.523061657488746,0.398589721424451,1.88816556818872,,,,,,0.353541683328005,0.723938248240442,0.921589636335155,4,3
+Benin,BEN,2001,112760,7076728,FALSE,0.134520630151326,0.257756514686465,0.394965247988619,1.98122762311846,,,,,,0.349495097129342,0.692117503986218,0.862826411644757,4,3
+Benin,BEN,2002,112760,7295400,FALSE,0.252399040096246,0.306645831639745,0.4576383483256,1.4189225267076,,,,,,0.406603284663236,0.608901436692299,0.710723881003528,4,3
+Benin,BEN,2003,112760,7520556,FALSE,0.331356137990658,0.259615263157405,0.537742612943118,1.37155235743354,1.05156920486123,,2.39795920494263,,,0.480691412145739,0.979645115293469,1.12745455941983,6,4
+Benin,BEN,2004,112760,7750003,FALSE,0.399695646226754,0.830890632530096,0.560330163535801,1.32306568984266,1.48466996616235,,,,,0.499520038682109,0.778495533033829,0.884492120351623,5,3
+Benin,BEN,2005,112760,7982223,FALSE,0.417107049996629,0.390268691043844,0.543054268580367,1.45954841707191,1.54858508253957,,,,,0.479942526522545,0.702494606673187,0.776586544879432,5,3
+Benin,BEN,2006,112760,8216893,FALSE,0.4902557168182,0.425439531042341,0.654653260093341,1.43999919444163,1.04878085751375,,2.19474520192565,0.00408670035365999,,0.579560898256719,1.04101858086423,0.928766305204001,6,5
+Benin,BEN,2007,112760,8454790,FALSE,0.554581400154037,1.35747188067311,0.950722055997035,1.44972875257229,1.12879756025773,1.95630359307021,2.55958856267084,0.0133430804764447,,0.84977034469688,1.47139937418959,1.24598052421791,7,5
+Benin,BEN,2008,112760,8696915,FALSE,0.557213457733325,0.880171911363046,1.08764302054625,1.43307317612652,1.13141437825249,,4.14721461264977,0.0129685128695436,,0.963365409840033,1.62106323568378,1.48735872456978,6,5
+Benin,BEN,2009,112760,8944713,FALSE,0.655989219035521,0.692004329414485,0.96115431064573,,1.12631805290533,6.84678710120795,2.82262617940688,0.0167084951608964,,0.856210303348941,2.39571222794211,1.0968873268328,6,4
+Benin,BEN,2010,112760,9199254,FALSE,0.891264936619662,0.929254464481164,1.00130015670045,,1.37140448079603,7.83069123476276,0,0.0495098529042825,,0.898128396993168,2.13050215851281,0.469223178594653,6,4
+Benin,BEN,2011,112760,9460829,FALSE,1.14857265484224,1.024663925467,0.977592864342105,0.283600722304232,1.41270808455705,8.54624911197111,0.381234804824957,0.0840531602507766,,0.892172885833543,2.06031901395861,0.533145099736102,7,5
+Benin,BEN,2012,112760,9729254,FALSE,1.21156875867207,1.45102909452668,1.07197238155015,0.288222246162663,1.58832332122031,8.55889987559308,1.48286694840007,0.0817311138148577,,0.979602535722844,2.34409321748412,0.856690387725423,7,5
+Benin,BEN,2013,112760,10004594,FALSE,1.28295583095276,1.83655653690853,1.37737940139304,0.304534745897675,1.28631724409425,9.2489982760166,0.360514109547804,0.116889561988075,,1.27233990020298,2.4018231501194,0.778166970909013,7,5
+Benin,BEN,2014,112760,10286839,FALSE,1.52786295726481,1.8035728044435,1.65747729065956,0.31149119663455,1.14778889412562,9.40517518473442,0.350622508750968,0.113679359199549,,1.51485169630644,2.50936699041464,0.818843513067002,7,5
+Benin,BEN,2015,112760,10575962,FALSE,2.78766283480049,0.756649916191316,1.38719938411289,0.319016941612779,1.19260340860645,,2.04622367060167,0.153730175644373,,1.25284663908296,1.45935054946383,0.905693468626619,6,5
+Benin,BEN,2016,112760,10872072,FALSE,2.88882981187654,0.601775342170077,1.49874659781281,0.324814276471193,1.01058646612182,5.88014688004923,0.331748842106389,0.503181509330486,,1.34911522179145,1.92101029174771,0.622127038373919,7,5
+Benin,BEN,2017,112760,11175192,FALSE,3.11753789699907,0.913705122993872,1.54946542868132,0.332270182099713,1.00943719216155,,0.322750365031518,3.36761607697815,,1.39414329249388,1.2471457991611,1.26609700791943,6,5
+Benin,BEN,2018,112760,11485035,FALSE,5.93001946506361,0.778440213105268,1.75611697069292,0.339132809865276,0.986841713438191,,2.82638892051053,,,1.57358576737061,2.32601967584752,1.37938692771292,6,4
+Benin,BEN,2019,112760,11801151,FALSE,6.43707730158358,0.911872233649149,1.57892948012847,0.345450387400992,,,,,,1.42609119662163,2.31833235069055,0.894471272557257,4,3
+Benin,BEN,2020,112760,12123198,FALSE,,,,,,,,,,,,,0,0
+Burkina Faso,BFA,1990,273600,8811033,FALSE,0,0.00503220072708518,,,,,,,,,0.00251610036354259,0.00503220072708518,2,1
+Burkina Faso,BFA,1991,273600,9050086,FALSE,0,0.0034095247191328,,,,,,,,,0.0017047623595664,0.0034095247191328,2,1
+Burkina Faso,BFA,1992,273600,9297110,FALSE,0,0.0152617743255393,,,,,,,,,0.00763088716276965,0.0152617743255393,2,1
+Burkina Faso,BFA,1993,273600,9552473,FALSE,0,0.0217275970084904,,,,,,,,,0.0108637985042452,0.0217275970084904,2,1
+Burkina Faso,BFA,1994,273600,9816584,FALSE,0,0.112660974337411,,,,,,,,,0.0563304871687055,0.112660974337411,2,1
+Burkina Faso,BFA,1995,273600,10089880,FALSE,0,0.0435425531681016,,0.147839589480424,,,,,,,0.0637940475495086,0.0956910713242628,3,2
+Burkina Faso,BFA,1996,273600,10372734,FALSE,0.000242564819556118,0.0713737535569468,,0.151966528058005,,,,,,,0.0745276154781695,0.111670140807476,3,2
+Burkina Faso,BFA,1997,273600,10665552,FALSE,0.00458940416323525,0.0444638882688962,,0.155727387335704,,,,,,,0.0682602265892785,0.1000956378023,3,2
+Burkina Faso,BFA,1998,273600,10968722,FALSE,0.0108477459636776,0.0386739278768477,,0.175748193138821,,,,,,,0.0750899556597821,0.107211060507834,3,2
+Burkina Faso,BFA,1999,273600,11282696,FALSE,0.0143434020147228,0.0315617463153005,,0.124519398669368,,,,,,,0.0568081823331305,0.0780405724923343,3,2
+Burkina Faso,BFA,2000,273600,11607951,FALSE,0.0173941089494407,0.0879401131011638,,0.130408327529558,,,,,,,0.0785808498600541,0.109174220315361,3,2
+Burkina Faso,BFA,2001,273600,11944589,FALSE,0.0345911478522685,0.0252058625414735,,0.128726084318398,,,,,,,0.0628410315707133,0.0769659734299357,3,2
+Burkina Faso,BFA,2002,273600,12293097,FALSE,0.0428285971522228,0.0597318895483983,,0.146775772426993,,,,,,,0.0831120863758713,0.103253830987696,3,2
+Burkina Faso,BFA,2003,273600,12654624,FALSE,0.0773013422446587,0.107583328845356,,0.155020559124297,0.363542713300438,,2.28014505831057,,,,0.655012572131222,0.847582982093409,5,3
+Burkina Faso,BFA,2004,273600,13030576,FALSE,0.0804696208513092,0.0784114581922427,,0.205509729379243,0.435571358029938,,2.21435939427224,,,,0.644687550673759,0.832760193947908,5,3
+Burkina Faso,BFA,2005,273600,13421935,FALSE,0.0917104445560265,0.228411008086366,0.31154626905331,0.220291967595014,0.432669672640249,,1.88106864480279,,,0.27425469595205,0.546605666818701,0.651006579109054,6,4
+Burkina Faso,BFA,2006,273600,13829173,FALSE,0.119845549454326,0.422338376223743,0.33282494503209,0.2304522387468,0.393987117349717,,2.34729695518855,0.0112985122273614,,0.296246743871192,0.690551612929102,0.661526565251529,6,5
+Burkina Faso,BFA,2007,273600,14252029,FALSE,0.137847743077906,1.03824052411574,0.377027631786707,0.244880805832286,0.45687588423746,,2.27765293458747,0.0109599917183885,,0.335561346506798,0.81512992788002,0.781459120552135,6,5
+Burkina Faso,BFA,2008,273600,14689725,FALSE,0.164054918602529,0.311288883047304,0.513680122891104,0.223482532463168,0.445200853441218,,3.19191576866584,0.0248184588095242,,0.461246925667215,0.88088444513399,0.842550513730611,6,5
+Burkina Faso,BFA,2009,273600,15141098,FALSE,0.19549523080223,0.206719183074497,0.442401350840168,0.214369994862158,0.432188387729875,,1.66748680188723,0.0312003155324806,,0.398926611624654,0.545294512293256,0.503740581396203,6,5
+Burkina Faso,BFA,2010,273600,15605211,FALSE,0.402862358104532,0.111167525804599,0.651898650276672,0.211843493759773,0.524980913034765,,1.84902199517702,0.0375584403175612,,0.582848149569001,0.645358804624519,0.558487920925591,6,5
+Burkina Faso,BFA,2011,273600,16081915,FALSE,0.488650768750083,0.671493257322678,0.914959149577573,0.178327213846566,0.610255629126534,,1.12138302475088,0.05058839271818,,0.814477327120221,0.674962682849555,0.567253843151704,6,5
+Burkina Faso,BFA,2012,273600,16571252,FALSE,0.588830259799028,1.06460048211859,1.00787583402399,0.172285352911781,0.625896499132467,,0.652961640550267,0.0490912749492045,,0.905198249660276,0.697310713880731,0.568827400038023,6,5
+Burkina Faso,BFA,2013,273600,17072791,FALSE,0.767150503562802,1.40960648966154,1.08374256620945,0.153662274484401,0.627115739892436,,0.422519937987561,0.100776012649335,,0.988824294886512,0.76733635438115,0.61507780193387,6,5
+Burkina Faso,BFA,2014,273600,17586029,FALSE,0.893713996232292,1.06453486596616,0.999597675394057,0.130484438300087,0.578783810005612,4.2727226667292,0.410188940015656,0.195315378795658,,0.943096039781265,1.29520709710624,0.548723932571766,7,5
+Burkina Faso,BFA,2015,273600,18110616,FALSE,1.01246474984735,0.595762029101552,0.833948184571826,0.107881359883086,0.62529741038409,4.24833568076446,0.199153761379364,0.335818521726849,,0.793242028737846,1.16625762759127,0.406371540165739,7,5
+Burkina Faso,BFA,2016,273600,18646350,FALSE,1.26433969024342,1.0376083435574,0.914476390209103,0.0975736142882869,0.571382508594665,4.06841722696795,0,0.621351881568911,,0.871446324513046,1.23040254421103,0.525596032785529,7,5
+Burkina Faso,BFA,2017,273600,19193236,FALSE,1.63775199298826,0.0293445291560229,1.01589083634591,0.0890556108198227,0.526688695113474,4.25437507634819,0.563760685894338,0.694455925933829,,0.962479939862754,1.26502978859209,0.467819338333353,7,5
+Burkina Faso,BFA,2018,273600,19751466,FALSE,1.85670879295962,0.746388451355304,1.14753073390879,0.087112625399162,0.460364559067059,,0.182609093284382,,,1.0938422227545,0.80406993938145,0.527488098198337,6,4
+Burkina Faso,BFA,2019,273600,20321383,FALSE,2.32024763109582,0.387203251037605,1.0919589360081,0.0840309863920931,,,,,,1.04046415779335,0.970860201133405,0.50389946507435,4,3
+Burkina Faso,BFA,2020,273600,20903278,FALSE,,,,,,,,,,,,,0,0
+Bangladesh,BGD,1990,130170,103171957,FALSE,0,0.00158937948642247,0.103146337599421,,,,,,,0.0815150719700518,0.0349119056952812,0.0415522257282372,3,2
+Bangladesh,BGD,1991,130170,105599125,FALSE,0,0.000743634831297344,0.0968208165977786,,,,,,,0.0757185569780577,0.032521483809692,0.0382310959046775,3,2
+Bangladesh,BGD,1992,130170,107983708,FALSE,0,0.00155229768115894,0.112536846725561,,,,,,0.253026535597619,0.089947983644109,0.0917789200010848,0.114842272307629,3,3
+Bangladesh,BGD,1993,130170,110350641,FALSE,0,0.00566364167380609,0.129910855629302,,,,,,0.234074161664296,0.105241155414396,0.092412164741851,0.114992986250833,3,3
+Bangladesh,BGD,1994,130170,112737684,FALSE,0,0.00441470146275232,0.15288679572168,,,,,,0.324157388223914,0.126438655316252,0.120364721352087,0.151670248334306,3,3
+Bangladesh,BGD,1995,130170,115169933,FALSE,0,0.00136957156891826,0.214410033885462,0.102548602514345,,,,,0.344959820462305,0.182619839818471,0.132657605686206,0.15787445859101,4,4
+Bangladesh,BGD,1996,130170,117649927,FALSE,,0.00970373478664285,0.210005693164726,0.109752519575901,,,,,0.353149877485879,0.175888959926454,0.170652956253287,0.162123772943719,3,4
+Bangladesh,BGD,1997,130170,120160571,FALSE,0.0000163726752601351,0.0519917705757358,0.230936475632762,0.104497143697858,,,,,0.209137151179445,0.19342913301716,0.119315782752212,0.13976379961755,4,4
+Bangladesh,BGD,1998,130170,122682818,FALSE,0.0000786768210208463,0.0690194082141875,0.2344094260014,0.113805131828698,,,,,0.348512095082465,0.196591786382307,0.153164947589554,0.181982105376915,4,4
+Bangladesh,BGD,1999,130170,125189655,FALSE,0.000756832976880533,0.0629432778832375,0.2550451301345,0.122365243781161,,,,,0.350174901412889,0.215494352805646,0.158257077237734,0.187744443970733,4,4
+Bangladesh,BGD,2000,130170,127657862,FALSE,0.00145769596849826,0.0970180877860401,0.281963610615014,0.124824443896538,,,,,0.392274312258615,0.240119188196269,0.179507630104941,0.213559008034365,4,4
+Bangladesh,BGD,2001,130170,130088709,FALSE,0.00261382713283771,0.0334204087735881,0.268625035706625,0.118262614043854,,,,,0.427770649127577,0.228558060426456,0.170138506956896,0.202002933092869,4,4
+Bangladesh,BGD,2002,130170,132478077,FALSE,0.00276663439632171,0.0181912481321136,0.254198077911479,0.123714348948281,,,,,0.446364756032211,0.21483894649569,0.169047013084081,0.200777324902074,4,4
+Bangladesh,BGD,2003,130170,134791598,FALSE,0.00318472574893881,0.0881996213989085,0.302914656261665,0.148062470581791,0.153759552734111,,0.321099892053862,,0.438265937802585,0.258010697053479,0.216954550641292,0.250727723778125,6,5
+Bangladesh,BGD,2004,130170,136986429,FALSE,0.00380600989795998,0.145029105236362,0.352058879000747,0.161363255872217,0.164681517660351,,,,0.455030938521415,0.303394586721725,0.22345763770574,0.26620447158793,5,4
+Bangladesh,BGD,2005,130170,139035505,FALSE,0.0045525360806081,0.257176122710124,0.401477046161928,0.171108557696414,0.180874969355668,,0.129707778502236,,0.496117339128671,0.353363384606,0.243356563379997,0.281494636528689,6,5
+Bangladesh,BGD,2006,130170,140921154,FALSE,0.0185882670431048,0.143203041933328,0.47134542732661,0.172592502354441,0.192253954932357,,0.179161044062136,0.00170124421404504,0.509753934025157,0.416913582386162,0.249107369457463,0.237220891495878,6,6
+Bangladesh,BGD,2007,130170,142660381,FALSE,0.0330509707291059,0.241428037606911,0.532508812972203,0.22130698597746,0.233577138678484,,,0.00319156446614901,,0.47412463980429,0.25707370182142,0.235012806963703,5,4
+Bangladesh,BGD,2008,130170,144304164,FALSE,0.0453812275745296,0.461702330681336,0.677242847146504,0.111520340668016,0.285875816268029,,0.224949681117141,0.00934828856869543,,0.599851451281586,0.304159285437505,0.281474418463355,6,5
+Bangladesh,BGD,2009,130170,145924795,FALSE,0.0556477611085966,0.325239941588605,0.627137274805226,0.208415154621492,0.288556043801182,8.07042193229076,0.0741504683415309,0.0225202892066434,0.380544357135798,0.556706936827775,1.39165098427029,0.261262857953641,7,6
+Bangladesh,BGD,2010,130170,147575433,FALSE,0.0656754038290752,0.38597049633568,0.800139438017443,0.167461116892605,0.317394066234282,14.9379040629391,0.244403639818377,0.0396724325277881,0.424803398088227,0.710893696161888,2.43233679370293,0.328867463304094,7,6
+Bangladesh,BGD,2011,130170,149273134,FALSE,0.0789670577398424,0.458989722397281,1.01337722788505,0.184420367681792,0.340771748057012,18.8305359778913,0.0966496033317636,0.05642729390598,0.440606814052718,0.899606359391928,3.01479239585425,0.356116693460244,7,6
+Bangladesh,BGD,2012,130170,151005733,FALSE,0.086734456716769,0.544140142529423,1.00887273545562,0.194274308208051,0.27723225935275,21.1100495596409,0.0955406718842204,0.143476728781303,0.444923770656002,0.900079335350104,3.35493366358442,0.387072492901517,7,6
+Bangladesh,BGD,2013,130170,152761413,FALSE,0.113688086154773,0.904344492397973,1.12139689462181,0.122919823577432,0.294142546178552,21.9156453686917,0.165274597722404,0.328778561532082,0.419874004176404,1.00664327508317,3.53759189533465,0.49130579241491,7,6
+Bangladesh,BGD,2014,130170,154517385,FALSE,0.125449652898612,0.73259389027777,1.18699238326968,0.00908164337589557,0.329148756375989,29.8485911849334,0.140054038474595,0.479490575050222,0.617134441992559,1.06525330407659,4.66569960503179,0.507267982207938,7,6
+Bangladesh,BGD,2015,130170,156256287,FALSE,0.139141181265675,0.811480419051906,1.20914784797523,0.0083424548703162,0.359533558664759,31.0758169937168,0.25390831327171,0.947703795133722,0.554640680486788,1.08382282946448,4.86463969866263,0.609983082046487,7,6
+Bangladesh,BGD,2016,130170,157977151,FALSE,0.152548746696194,0.658880770219118,1.27652020153232,0.0125419775971348,0.374150671011469,20.8521337700991,0.0456622653904842,1.61884641470348,0.593649597216784,1.14258703625912,3.37027676125016,0.678694676897687,7,6
+Bangladesh,BGD,2017,130170,159685421,FALSE,0.168961225574358,0.532052555435389,1.41557238162293,0.0165763479291545,0.430143321505972,16.5552768738367,0.135521349715349,2.08641234520362,0.545855606299789,1.26048653115583,2.7671166200591,0.762817455956522,7,6
+Bangladesh,BGD,2018,130170,161376713,FALSE,0.186668943304148,0.663371803621133,1.60692445073837,0.0186457013148911,0.420630624935269,,0.0894006881227602,,,1.42638879079949,0.51300231742026,0.549451745964569,6,4
+Bangladesh,BGD,2019,130170,163046173,FALSE,0.207249835598478,0.519463437391472,1.58238466534947,0.0226122545031662,,,,,,1.40972539053606,0.582927548210647,0.650600360810232,4,3
+Bangladesh,BGD,2020,130170,164689383,FALSE,,0.00269669052650776,1.37282212582172,,,,,,,1.22982781107467,0.687759408174113,0.616262250800587,2,2
+Bulgaria,BGR,1990,110630,8718289,FALSE,0,0.0327296997046699,4.11863665953323,,,,,,,3.83543364622649,1.38378878641263,1.93408167296558,3,2
+Bulgaria,BGR,1991,110630,8632367,FALSE,0,0.314855165891499,2.31411269257756,,,,,,,2.046843912275,0.876322619489686,1.18084953908325,3,2
+Bulgaria,BGR,1992,110630,8540164,FALSE,0,0.2270663710476,2.8973611264837,,,,,,1.7568988533999,2.60920007801418,1.2203315877328,1.53105510082056,3,3
+Bulgaria,BGR,1993,110630,8472313,FALSE,0.00072318785174055,0.223692564265907,3.02894168373062,,,,,,2.56164195425624,2.73304066993622,1.45374984752613,1.83945839615279,3,3
+Bulgaria,BGR,1994,110630,8443591,FALSE,0.00605781589177615,0.548420515051396,2.93936084670442,,,,,,3.24890718756282,2.65095073310206,1.6856865913026,2.14942614523876,3,3
+Bulgaria,BGR,1995,110630,8406067,FALSE,0.0372899142237649,0.513406631701623,3.78405502337231,16.6595876768197,,,,,3.62211915959592,3.48429724516301,4.92329168114266,6.06985267832006,4,4
+Bulgaria,BGR,1996,110630,8362826,FALSE,0.227169733988291,0.721122191110415,3.49318227912999,14.258860124077,,,,,2.79938713513324,3.23727295411487,4.29994429268778,5.25416060110887,4,4
+Bulgaria,BGR,1997,110630,8312068,FALSE,0.384414101875043,2.67257305284627,2.60858779894247,15.4932067738217,,,,,2.87242978284664,2.46890402988638,4.80624230206642,5.87677840985025,4,4
+Bulgaria,BGR,1998,110630,8256786,FALSE,0.585318465769313,2.85450223681674,3.46994043138106,11.5215315542637,,,,,3.2651707080863,3.25486349407856,4.33929267926343,5.22401699831134,4,4
+Bulgaria,BGR,1999,110630,8210624,FALSE,0.927804199683263,4.46519117635698,3.6033082204523,10.9944997692864,,,,,2.42980081151885,3.32634878363766,4.48412083545955,5.30396013519996,4,4
+Bulgaria,BGR,2000,110630,8170172,FALSE,1.72199885598987,5.39389344244457,4.30646101072872,10.7917147211888,,,,,,4.007647647939,5.55351700758799,6.73108527052412,4,3
+Bulgaria,BGR,2001,110630,8009142,FALSE,2.48968766337771,4.50467468712603,4.74240702580936,11.8808576808293,,,,,,4.50588745807689,5.9044067642856,6.96380660867741,4,3
+Bulgaria,BGR,2002,108800,7837161,FALSE,3.03488454385158,5.22132879614556,4.99279464722051,13.5629987890515,,,,,,4.76535843818048,6.7030016940673,7.84989534112586,4,3
+Bulgaria,BGR,2003,108770,7775327,FALSE,4.05623322499451,11.9770588037707,6.84267514230882,15.0660702699627,3.2190550460411,,13.9163174640654,,,6.59193225405668,10.3716709810204,11.8878446979639,6,4
+Bulgaria,BGR,2004,108760,7716860,FALSE,6.15420950644117,18.5619941908535,9.61314492801996,17.1007661999398,3.70054071035555,,14.4891466498312,,,9.16646710174845,13.1838522950171,14.8295935355932,6,4
+Bulgaria,BGR,2005,108640,7658972,FALSE,6.83003103421878,24.0023656414444,11.5775151490802,18.2657568686457,4.45341261725497,10.3004130030185,11.7731116437601,100,1.94059881160081,10.9384629609069,12.0985417359669,27.8200493210597,7,6
+Bulgaria,BGR,2006,108630,7601022,FALSE,9.33581225700216,47.1201924916827,14.8046965938269,18.6639341513349,5.45062360793983,11.6861504377701,13.2864138959635,1.31259080684219,2.37728577686478,14.0731266122242,16.7534979434922,16.1389239558187,7,6
+Bulgaria,BGR,2007,108610,7545338,FALSE,11.6786429755971,86.304342346328,19.6974455469345,19.7065006657865,6.4280796846247,11.0795474731048,9.56033327412847,6.22968960439944,,18.8794467497008,26.3378020469799,28.1360625280687,7,5
+Bulgaria,BGR,2008,108610,7492561,FALSE,13.8690593628708,66.8150482502146,23.0566928850815,23.1187994987455,7.05045957235557,13.5653272879129,17.8111996685779,13.741341722294,,21.7267996906239,26.3726878255672,28.6426377660912,7,5
+Bulgaria,BGR,2009,108560,7444443,FALSE,15.8341734789093,25.0855508622081,16.3607306300368,20.993488661265,6.70290768434991,15.7620689273347,12.1123813336246,20.2816199222519,,15.4226784056179,17.6913989822298,18.7791438369935,7,5
+Bulgaria,BGR,2010,108560,7395599,FALSE,16.3744089381021,14.423684823747,17.0521754865652,19.7917931520925,7.33515727985186,19.9329815559398,12.6800722605065,23.0813496875394,1.97188519368735,15.7831327336752,14.6038573443772,14.6219863085413,7,6
+Bulgaria,BGR,2011,108560,7348328,FALSE,17.1035688985764,15.4954962640308,22.3178058017705,20.6894933818652,7.51978719094541,20.1265657991008,8.83498278130091,25.2472198003909,2.14622049360231,20.6746993265989,15.2448762028924,15.5146853412982,7,6
+Bulgaria,BGR,2012,108560,7305888,FALSE,18.6084130924848,13.1956772069255,22.223261194034,20.9909285221564,6.9219965604748,18.2342332772241,12.3420907126461,34.4399896075091,2.25591729130581,20.3779876933671,15.4072173281109,17.2670985056517,7,6
+Bulgaria,BGR,2013,108560,7265115,FALSE,19.1316366332903,14.129936804535,24.0572351125476,21.9397721830574,6.87448470680318,19.8332184041856,13.9007193037308,41.756322350935,2.51090881291591,22.3402048484873,16.5004896077518,19.4296440506102,7,6
+Bulgaria,BGR,2014,108560,7223938,FALSE,20.1212894632344,11.9967431789325,24.7884043587316,22.8131622745734,7.62386027046474,22.7320652635154,11.9828181159826,54.5961257784432,2.71229105867487,22.7551526777336,16.7352533876635,21.1427155140567,7,6
+Bulgaria,BGR,2015,108560,7177991,FALSE,20.675690507201,14.326065301583,21.7276896290704,23.605693738437,8.24363484750971,25.7772888615142,14.5719215337023,63.1653487746735,2.80012375280235,20.3108580180399,17.64063904633,23.1300018532064,7,6
+Bulgaria,BGR,2016,108560,7127822,FALSE,21.9859345718032,14.2474710921465,22.514456456473,27.260557776698,9.89730649829391,30.4219492005549,6.07220095669723,91.1383481391758,2.91760475219383,21.2509480752422,17.9171678295095,27.1478551320256,7,6
+Bulgaria,BGR,2017,108560,7075947,FALSE,23.4741010726247,15.5147903611842,26.3400628845473,30.5987239623766,11.3174071337443,31.9723194033304,4.58753798971017,100,3.06833141333512,24.7591936982292,19.3651238695869,29.7547629041392,7,6
+Bulgaria,BGR,2018,108560,7025037,FALSE,24.1557708692926,17.0703519108154,29.387671037799,32.969924118272,12.9496823855838,,13.3489303657375,,,27.4896200917601,23.3865296603833,22.7197066216463,6,4
+Bulgaria,BGR,2019,108560,6975761,FALSE,25.5148879850556,17.9390038699599,29.7526477471355,34.0596251164435,,,,,,27.81839481576,26.8165411796486,26.6056746007211,4,3
+Bulgaria,BGR,2020,108560,6934015,FALSE,26.5054554253871,1.728171875681,27.0470375824678,,,,,,,24.9819439540597,18.426888294512,13.3550579148704,3,2
+Bahrain,BHR,1990,690,495927,TRUE,0,34.5992191292858,39.5699416989408,,,,,,,80.6632481621393,24.7230536094089,57.6312336457125,3,2
+Bahrain,BHR,1991,690,509762,TRUE,0,57.5953120385553,39.5465769348775,,,,,,,63.0652611213543,32.3806296578109,60.3302865799548,3,2
+Bahrain,BHR,1992,710,523082,TRUE,0,77.268919873735,39.7651643619322,,,,,,,55.1372709815222,39.011361411889,66.2030954276286,3,2
+Bahrain,BHR,1993,710,536212,TRUE,0,25.669468053596,38.650100523826,,,,,,,52.6477837248127,21.439856192474,39.1586258892044,3,2
+Bahrain,BHR,1994,710,549590,TRUE,0,32.4731207386944,37.6263965199425,,,,,,,57.8712317959344,23.3665057528789,45.1721762673144,3,2
+Bahrain,BHR,1995,710,563698,TRUE,1.60880347097321,34.7530007319419,38.2512104496026,49.8016943070113,,,,,,64.4296270812978,31.1036772398823,49.6614407067504,4,3
+Bahrain,BHR,1996,710,578661,TRUE,3.81723945019146,100,41.8530527499549,41.7330747625971,,,,,,64.6694554462218,46.8508417406859,68.8008434029397,4,3
+Bahrain,BHR,1997,710,594927,TRUE,7.24870093935108,27.7879120394627,38.3290201495349,53.0885813275303,,,,,,64.8156591919421,31.6135536139698,48.5640508529784,4,3
+Bahrain,BHR,1998,710,613697,TRUE,13.7364469885217,25.7480180028794,31.2895470516954,57.3636421755759,,,,,,60.8437373247431,32.0344135546681,47.9851325010661,4,3
+Bahrain,BHR,1999,710,636540,TRUE,19.425148276472,42.5188514283362,35.6581291573865,62.5952532282064,,,,,,66.1891873346442,40.0493455226003,57.1010973303956,4,3
+Bahrain,BHR,2000,710,664610,TRUE,24.2541935745597,24.622667214716,44.7733064062411,70.7173980417594,,,,,,80.256940999143,41.091891309319,58.5323354185395,4,3
+Bahrain,BHR,2001,710,697550,TRUE,56.4739477965053,18.631026840165,39.5110570356955,76.4163616721733,,,,,,58.6150865388188,47.7580983361348,51.2208250170524,4,3
+Bahrain,BHR,2002,710,735140,TRUE,64.3190455225366,24.2829686457252,41.3685039913088,79.8293176368541,,,,,,47.4038692693761,52.4499589491062,50.5053851839851,4,3
+Bahrain,BHR,2003,720,778708,TRUE,72.5082421396674,70.8572304009653,44.0415976833942,75.5656609752725,66.8021158918087,,60.2130257617295,,,46.7878603473323,64.6371513922058,63.3559443713249,6,4
+Bahrain,BHR,2004,730,829846,TRUE,67.736164705171,100,53.9258952961828,82.9566945871743,63.9791490534243,,30.4244173992296,,,61.6700691684235,67.0086343975515,68.7627952887068,6,4
+Bahrain,BHR,2005,740,889157,TRUE,62.7613624610395,100,64.4139200667065,86.2488591957024,63.9952443898408,,36.5078109666523,,,81.2821746739628,69.9863905380202,76.0097112090794,6,4
+Bahrain,BHR,2006,740,958423,TRUE,77.1939631183814,100,68.686739443616,92.3862269817142,72.3442754333544,,48.9224119880938,0.620887460013598,,94.7401206455279,77.4378683063611,67.3339294150699,6,5
+Bahrain,BHR,2007,750,1035924,TRUE,83.2175798621585,100,69.8971008609097,91.853709563541,81.0956296753093,,38.2989198727612,1.35653894246056,,100,76.6534620318741,66.3018336757526,6,5
+Bahrain,BHR,2008,760,1114645,TRUE,100,100,81.3846808168567,94.0635086504199,95.4718918562364,,19.4149561374104,2.92318858293194,,99.9592958394766,78.9726291209374,63.2721898420478,6,5
+Bahrain,BHR,2009,760,1185075,TRUE,100,75.8191316732468,55.2108674681815,90.8308317689666,96.4289534116661,100,42.6092544034446,4.57692465425579,100,58.6334943730777,80.6385836162628,62.0782728121653,7,6
+Bahrain,BHR,2010,762,1240864,TRUE,100,17.3127414796293,60.365132738036,100,94.0154624003629,100,29.0668219667691,5.91418077177849,100,61.9123218611102,72.3920994549192,52.3676776798812,7,6
+Bahrain,BHR,2011,767,1278153,TRUE,100,57.458363656054,69.6862594265037,63.9815473279666,92.3656909034847,100,8.46564682936385,8.6125102197804,100,89.8696769939525,71.3702596056983,54.7312908378529,7,6
+Bahrain,BHR,2012,770,1299942,TRUE,100,69.5243623544472,100,75.3379468395194,92.6295212336237,100,11.098332994233,11.8554538921203,100,100,79.4229488840285,61.3026826800533,7,6
+Bahrain,BHR,2013,770,1315029,TRUE,100,100,100,84.6444016869452,74.8228212045376,100,21.9420091711881,17.3001755715856,84.1861997968597,100,84.3960872364276,68.0121310377631,7,6
+Bahrain,BHR,2014,771,1336073,TRUE,100,62.798786353656,100,95.0311339820848,73.040696043566,100,16.1973064224663,27.464076207569,87.1168846129864,100,80.1634444815991,64.7680312631271,7,6
+Bahrain,BHR,2015,778,1371853,TRUE,100,100,84.5455298176782,100,74.7752439418397,,15.7748561863288,60.8053090065886,88.5427067877959,83.6087375369607,81.4771821319672,74.788601586279,6,6
+Bahrain,BHR,2016,779,1425793,TRUE,100,34.5572209163623,76.1107871671344,100,73.7239055042027,100,12.6483903950198,78.5337015542244,87.0766135209065,76.0343916684317,72.913287428489,64.8083863424908,7,6
+Bahrain,BHR,2017,780,1494077,TRUE,100,21.9540027436621,81.9238908501211,100,66.8730689643052,100,24.1406386504665,76.4534113636672,88.9658429846938,80.5415657258705,73.8549107469919,65.3425769113934,7,6
+Bahrain,BHR,2018,780,1569440,TRUE,100,45.4488733923419,88.2806455229254,100,62.9605335156511,,16.0869998732548,,,86.6267370705734,69.9633037577044,62.0406525840425,6,4
+Bahrain,BHR,2019,780,1641164,TRUE,100,30.4344921417645,,100,,,,,,,76.8114973805882,65.2172460708822,3,2
+Bahrain,BHR,2020,780,1701583,TRUE,100,,,,,,,,,,100,,1,0
+"Bahamas, The",BHS,1990,10010,256227,TRUE,0,2.94416928837509,32.4157163055944,,,,,,,33.6405035241642,11.7866285313232,18.2923364062696,3,2
+"Bahamas, The",BHS,1991,10010,261007,TRUE,0,0.436898361510677,29.4313946369557,,,,,,,30.4256964837117,9.95609766615546,15.4312974226112,3,2
+"Bahamas, The",BHS,1992,10010,266028,TRUE,0,0.0989197759196117,28.213023377615,,,,,,,26.9958638417103,9.43731438451155,13.547391808815,3,2
+"Bahamas, The",BHS,1993,10010,271065,TRUE,0,4.46575465967113,28.073148927381,,,,,,,27.3277376531764,10.8463011956841,15.8967461564238,3,2
+"Bahamas, The",BHS,1994,10010,275849,TRUE,0,3.76821917374914,29.348408860243,,,,,,,27.6838110086198,11.0388760113307,15.7260150911845,3,2
+"Bahamas, The",BHS,1995,10010,280179,TRUE,8.97562384731869,16.7653688587622,30.7372386047162,100,,,,,,29.0650220077902,39.1195578276993,48.6101302888508,4,3
+"Bahamas, The",BHS,1996,10010,283980,TRUE,16.1141717331241,13.6065297794972,32.8065405544827,100,,,,,,31.0876882476558,40.631810516776,48.231406009051,4,3
+"Bahamas, The",BHS,1997,10010,287363,TRUE,12.4241135701448,32.1124994241387,34.7767363633229,100,,,,,,33.1242490741661,44.8283373394016,55.0789161661016,4,3
+"Bahamas, The",BHS,1998,10010,290600,TRUE,21.0531082328541,22.3219323178473,38.4631266120727,100,,,,,,37.2653311778789,45.4595417906935,53.1957544985754,4,3
+"Bahamas, The",BHS,1999,10010,294063,TRUE,33.5342565499458,22.2976981529876,39.6085221951289,100,,,,,,41.245915845753,48.8601192245156,54.5145379995802,4,3
+"Bahamas, The",BHS,2000,10010,298045,TRUE,70.3109944491468,57.4469753011023,44.1821684634257,100,,,,,,44.1792773300378,67.9850345534187,67.2087508770467,4,3
+"Bahamas, The",BHS,2001,10010,302618,TRUE,100,28.5143683547979,39.9309726125515,100,,,,,,38.9302294603667,67.1113352418374,55.8148659383882,4,3
+"Bahamas, The",BHS,2002,10010,307657,TRUE,100,27.463138283475,41.2452510547028,100,,,,,,38.8584296729084,67.1770973345444,55.4405226521278,4,3
+"Bahamas, The",BHS,2003,10010,313123,TRUE,100,36.6610075191233,41.1669820106471,100,100,,80.6315124761869,,,38.1385627290171,71.6919004011915,63.8577706810818,6,4
+"Bahamas, The",BHS,2004,10010,318893,TRUE,100,60.9109540762741,44.4239230342757,100,100,,90.4829468767843,,,40.8869802396417,79.1635647974668,73.070220298175,6,4
+"Bahamas, The",BHS,2005,10010,324848,TRUE,100,95.3495952195764,50.0461794287491,100,100,,,,,46.2645624304757,86.3489436620814,80.5380525500174,5,3
+"Bahamas, The",BHS,2006,10010,331032,TRUE,100,100,54.9078692486698,100,100,,87.1649217549312,,,50.9929205790497,88.4145582007202,84.5394605834952,6,4
+"Bahamas, The",BHS,2007,10010,337387,TRUE,100,100,56.8903854437893,100,100,,,,,52.7829674137881,89.2225963609473,84.2609891379294,5,3
+"Bahamas, The",BHS,2008,10010,343680,TRUE,100,100,56.9319767211075,100,100,,52.4731915924304,,,51.7653052355955,81.8810336627076,76.0596242070065,6,4
+"Bahamas, The",BHS,2009,10010,349600,TRUE,100,100,46.9813039689184,100,100,,41.2677036304039,,,42.7494385710147,77.6498015198644,71.0042855503546,6,4
+"Bahamas, The",BHS,2010,10010,354936,TRUE,100,100,47.4688998183231,100,100,,40.6472975105067,,,43.4197798472311,77.623239465766,71.0167693394345,6,4
+"Bahamas, The",BHS,2011,10010,359583,TRUE,100,100,51.0042729082099,100,100,,0,,,46.6946257074528,70.200854581642,61.6736564268632,6,4
+"Bahamas, The",BHS,2012,10010,363581,TRUE,100,82.5807956962392,57.1867166558614,100,100,,29.7606087553857,,,52.2034234575137,73.9056242214973,66.1362069772847,6,4
+"Bahamas, The",BHS,2013,10010,367162,TRUE,100,78.767395805467,55.4545019532349,100,100,,29.4703479442096,,,51.0010902929729,72.7384491405823,64.8097085106624,6,4
+"Bahamas, The",BHS,2014,10010,370625,TRUE,100,100,56.3099151955147,100,100,45.9461344151112,9.73166218495055,,,52.4318973461195,68.6646186325961,65.5408898827675,7,4
+"Bahamas, The",BHS,2015,10010,374200,TRUE,100,28.8309339670739,49.4159598173006,100,100,,57.8321319716296,,,46.0420923449274,67.2158051512008,58.1762895709077,6,4
+"Bahamas, The",BHS,2016,10010,377923,TRUE,100,86.922145429787,53.4134041631744,100,100,63.3730907257475,57.2624153168338,,,49.7402286249181,76.8285092725904,73.4811973428847,7,4
+"Bahamas, The",BHS,2017,10010,381749,TRUE,100,52.349928771749,55.0060793481751,100,100,19.2812147711005,28.3442573311047,,,50.6892106405527,59.1635800370216,57.8458491858516,7,4
+"Bahamas, The",BHS,2018,10010,385635,TRUE,,69.2324026710748,61.8807443683328,100,100,,28.0586354762713,,,58.3795081439926,64.7929456289197,63.9176365728347,5,4
+"Bahamas, The",BHS,2019,10010,389486,TRUE,,46.5054677795669,62.3902534590383,100,,,,,,57.9514757487755,69.6319070795351,68.1523145094475,3,3
+"Bahamas, The",BHS,2020,10010,393248,TRUE,,,32.7337601797423,,,,,,,31.6212212723643,32.7337601797423,31.6212212723643,1,1
+Bosnia and Herzegovina,BIH,1990,51200,4463422,FALSE,0,,,,,,,,,,0,,1,0
+Bosnia and Herzegovina,BIH,1991,51200,4369320,FALSE,0,,,,,,,,,,0,,1,0
+Bosnia and Herzegovina,BIH,1992,51200,4233673,FALSE,0,,,,,,,,,,0,,1,0
+Bosnia and Herzegovina,BIH,1993,51200,4078940,FALSE,0,,,,,,,,,,0,,1,0
+Bosnia and Herzegovina,BIH,1994,51200,3936527,FALSE,0,,,,,,,,,,0,,1,0
+Bosnia and Herzegovina,BIH,1995,51200,3829049,FALSE,0,,,,,,,,,,0,,1,0
+Bosnia and Herzegovina,BIH,1996,51200,3764419,FALSE,0.0105251595030211,,,,,,,,,,0.0105251595030211,,1,0
+Bosnia and Herzegovina,BIH,1997,51200,3736070,FALSE,0.0416651926482248,,,0.372473174793447,,,,,,,0.207069183720836,0.372473174793447,2,1
+Bosnia and Herzegovina,BIH,1998,51200,3734338,FALSE,0.100779167382685,0.783806425434252,3.31403596229298,0.479997000444596,,,,,,3.40852540437545,1.16965463888863,1.5574429434181,4,3
+Bosnia and Herzegovina,BIH,1999,51200,3743353,FALSE,0.136016917905253,2.07125242752624,3.65205186903028,0.475592330682503,,,,,,3.67038496887659,1.58372838628607,2.07240990902844,4,3
+Bosnia and Herzegovina,BIH,2000,51200,3751176,FALSE,0.756241261811365,1.70792774248253,3.66259608940014,0.552320029720179,,,,,,3.61335360912543,1.66977128085355,1.95786712710938,4,3
+Bosnia and Herzegovina,BIH,2001,51200,3755514,FALSE,0.837370434171543,1.38385525918338,3.82256513352072,0.448169978255729,,,,,,3.73901288146231,1.62299020128284,1.85701270630048,4,3
+Bosnia and Herzegovina,BIH,2002,51200,3759389,FALSE,1.84526925734831,3.12394353964131,4.07370685432648,0.515565201771318,,,,,,3.94971387044975,2.38962121327185,2.52974087062079,4,3
+Bosnia and Herzegovina,BIH,2003,51200,3762179,FALSE,2.76072320182952,4.45080140922933,5.24799606041422,0.531326630606284,2.57333041389888,,4.79349506934319,,,5.01811057781906,3.55686847428451,3.69843342174947,6,4
+Bosnia and Herzegovina,BIH,2004,51200,3764194,FALSE,10.764764631616,12.4775396825435,6.41501893394547,0.611722444157261,1.80877044018373,,,,,6.07931709298196,7.56726142306558,6.38952640656092,5,3
+Bosnia and Herzegovina,BIH,2005,51200,3765332,FALSE,14.8366379494434,7.45773157059067,7.30971002617237,0.698646284011393,2.20792593128881,,,,,6.8910198163804,7.57568145755445,5.01579922366082,5,3
+Bosnia and Herzegovina,BIH,2006,51200,3765422,FALSE,17.4768161275985,10.8067978734932,8.10202270983704,0.824450886044447,2.66680428806626,,5.74723995976647,,,7.68478376443299,8.59146551134792,6.26581812093427,6,4
+Bosnia and Herzegovina,BIH,2007,51200,3762791,FALSE,19.4366051127155,22.222972640435,8.47419261456486,0.986450565216694,2.28368043028011,,10.5439739465387,0.389962792154854,,8.37286387945763,12.3328389758942,8.50324476476058,6,5
+Bosnia and Herzegovina,BIH,2008,51200,3754261,FALSE,24.1835019663343,12.2000092284806,10.6392985667995,1.04046763371224,3.4040297498493,,,0.390849073081856,,10.3067170693768,12.0158193488317,5.98451075116287,5,4
+Bosnia and Herzegovina,BIH,2009,51200,3735945,FALSE,26.4616253201697,2.7236050747611,8.41765531811514,1.0098077250088,3.43122670273801,30.8102764824823,2.89629314454359,0.88386189290644,,7.99050353263694,12.0532105108468,3.10081427397137,7,5
+Bosnia and Herzegovina,BIH,2010,51200,3705478,FALSE,30.2208707810597,6.21428058079413,9.03115881256194,1.19515490776044,3.42042818207352,34.0273817169431,3.89347587252959,6.06032847503213,,8.41732303790119,14.0970537786082,5.1561125748035,7,5
+Bosnia and Herzegovina,BIH,2011,51200,3661173,FALSE,31.4005699758248,5.70747475393891,10.798381019589,1.29922282119826,3.22015575026909,32.5475689149575,2.95544403170566,11.0446998000624,,10.1258399842511,14.118110252869,6.22653627823126,7,5
+Bosnia and Herzegovina,BIH,2012,51200,3604972,FALSE,32.7452084246354,5.49401254044778,10.1428040496336,1.47787979796985,2.7461578709122,36.6930248118382,4.00202531092868,12.214405696153,,9.46321926757166,15.0924924892423,6.5303085226142,7,5
+Bosnia and Herzegovina,BIH,2013,51200,3542598,FALSE,35.8777976241736,4.94670728304947,10.8845250852946,1.81254613218355,3.1578003208788,28.5524964091137,6.10873256965193,16.5726568709787,,10.0715447027123,14.6971341839112,7.9024375117152,7,5
+Bosnia and Herzegovina,BIH,2014,51200,3482106,FALSE,37.5515575548127,6.98836232489656,11.6449405217499,1.86848014708934,3.89269326545715,31.7636461790818,6.21485497103873,21.0757315921321,,10.8848063614844,16.0053069497782,9.40644707932821,7,5
+Bosnia and Herzegovina,BIH,2015,51200,3429362,FALSE,40.1779252932232,6.11101473034719,10.1785572344318,2.40025195591919,3.78105471313064,25.6686166767008,8.41392025058258,27.8198780794273,,9.48340741373211,15.4917143568675,10.8456944860017,7,5
+Bosnia and Herzegovina,BIH,2016,51200,3386263,FALSE,46.6120888996419,4.10696397984878,10.7591207465261,2.78956225322375,4.1173001045028,21.9993170593674,2.13025231489539,32.5084321992037,,10.0519737930398,14.7328842089172,10.3174369080423,7,5
+Bosnia and Herzegovina,BIH,2017,51200,3351534,FALSE,50.7180749615787,7.98513763919814,12.8169045849875,3.34404963803457,5.14146537236115,19.6660825093922,2.15232624660666,33.9401363399291,,12.0141775654937,16.113762596633,11.8871654858524,7,5
+Bosnia and Herzegovina,BIH,2018,51200,3323929,FALSE,55.2593916175432,8.19099238917882,14.6291659103657,3.8469446632217,5.41499816009621,,1.08510058346532,,,13.6617582569148,16.6023190327549,6.69619897319517,6,4
+Bosnia and Herzegovina,BIH,2019,51200,3300998,FALSE,55.5053537347684,7.44448524053903,14.1445351395536,4.40729088509669,,,,,,13.2469610520599,20.3754162499894,8.36624572589853,4,3
+Bosnia and Herzegovina,BIH,2020,51200,3280815,FALSE,58.4539895447395,1.06127826473629,12.2154790136042,,,,,,,11.3838202884972,23.9102489410267,6.22254927661675,3,2
+Belarus,BLR,1990,202840,10189348,FALSE,0,,,,,,,,,,0,,1,0
+Belarus,BLR,1991,202840,10194050,FALSE,0,,,,,,,,,,0,,1,0
+Belarus,BLR,1992,202840,10216470,FALSE,0,0.0300508249650478,,,,,,,,,0.0150254124825239,0.0300508249650478,2,1
+Belarus,BLR,1993,202840,10239050,FALSE,0,0.083377808776634,1.09380055223638,,,,,,,0.945594654190762,0.392392787004337,0.514486231483698,3,2
+Belarus,BLR,1994,202840,10226955,FALSE,0.000124469008240392,0.0708633800824583,1.37212749554196,,,,,,,1.19392742055942,0.481038448210885,0.632395400320941,3,2
+Belarus,BLR,1995,202840,10193831,FALSE,0.000750666413077764,0.0643655355576007,2.57803632220605,,,,,,,2.255159988809,0.881050841392242,1.1597627621833,3,2
+Belarus,BLR,1996,202840,10159569,FALSE,0.00755408978613956,0.455594904609592,3.28972211541117,,,,,,,2.90432640880247,1.2509570366023,1.67996065670603,3,2
+Belarus,BLR,1997,202840,10117433,FALSE,0.0126918800098523,1.53328873761238,3.91473556404124,,,,,,,3.44510506384595,1.82023872722116,2.48919690072917,3,2
+Belarus,BLR,1998,202840,10071963,FALSE,0.019211558010935,0.894863774401008,3.61690354462503,,,,,,,3.18432698431474,1.51032629234566,2.03959537935787,3,2
+Belarus,BLR,1999,202840,10026738,FALSE,0.129287465646546,1.94564828062439,3.11234442697413,,,,,,,2.72933036703562,1.72909339108169,2.33748932383,3,2
+Belarus,BLR,2000,202840,9979610,FALSE,0.488323267372171,0.522989072661282,3.51705705717025,8.24803968456358,,,,,,3.08689989849325,3.19410227044182,3.95264288523937,4,3
+Belarus,BLR,2001,202840,9928549,FALSE,1.13464493556965,0.42451870144968,3.93439430060843,7.1684809684364,,,,,,3.45349418286317,3.16550972651604,3.68216461758308,4,3
+Belarus,BLR,2002,202830,9865548,FALSE,2.37664351957938,2.0152258624734,4.29864946260198,9.93186115843293,,,,,,3.78101108709078,4.65559500077192,5.24269936933237,4,3
+Belarus,BLR,2003,202830,9796749,FALSE,,0.775846498450277,5.50813853195436,10.2248190397208,1.04143377936808,,,,,4.8612267211716,5.50293469004183,5.2872974197809,4,3
+Belarus,BLR,2004,202810,9730146,FALSE,,0.744195328191263,7.78231759860266,10.9103220636949,1.38135591016169,,,,,6.87000192195739,6.47894499682959,6.17483977128117,4,3
+Belarus,BLR,2005,202830,9663915,FALSE,,1.40283026407218,8.65800486087785,14.2458755163605,1.18082319651242,,1.86611600852103,,,7.6523117151558,6.5432066624579,6.29178337602738,5,4
+Belarus,BLR,2006,202900,9604924,FALSE,4.41810645141042,1.64432784622036,11.2053783240649,15.2857460833295,1.20314547455219,,,0.142464358716134,,9.92954268862187,8.1383896762563,6.75052024422196,5,4
+Belarus,BLR,2007,202900,9560953,FALSE,5.39734447379017,8.3603715106214,14.275214319927,16.255623129383,1.57709552807929,11.2620084606642,,0.196390375443668,,12.6916724221732,11.1101123788771,9.37601435940533,6,4
+Belarus,BLR,2008,202900,9527985,FALSE,6.32327202228104,10.2121595461681,19.5507281618914,14.7691527114652,1.80354565338936,15.0663795115212,,0.346496786300274,,17.4959608400299,13.1843383906654,10.7059424709909,6,4
+Belarus,BLR,2009,202820,9504583,FALSE,7.55975696859277,9.1312042442297,13.7806229229152,14.4565949427534,1.88690678403005,14.5420688608464,2.27687882611828,1.69858840261209,,12.4467281596747,10.2911877942426,8.00199891507765,7,5
+Belarus,BLR,2010,202900,9483836,FALSE,8.78330934380023,6.67793797330646,16.8419127369061,16.8271689795856,2.33584359449711,10.813832699796,0.380309960789843,5.18451815505628,,15.1919276592059,10.0540786156974,8.85237254558882,7,5
+Belarus,BLR,2011,202910,9461643,FALSE,10.9768980811777,19.1347077368668,24.0903555040664,17.227422325282,2.78173481162843,13.6125324116145,0.381202006596243,15.5126953648125,1.51411409109927,21.6882106956997,12.4196045938147,12.5763920367261,7,6
+Belarus,BLR,2012,202910,9446836,FALSE,13.0075094769476,7.51703409007017,25.8353922142261,18.7178140297355,2.9690240433172,13.7448725407436,1.1453985114055,27.189851116377,1.57861235884487,23.3349823858736,11.6495190317105,13.2472820820511,7,6
+Belarus,BLR,2013,202908,9443211,FALSE,15.0263754464726,11.6498144259559,23.1573948631364,19.4016581272297,3.29047244318722,5.23605802877135,1.52778426630403,37.3405976282553,2.32020194170024,21.2325854384388,11.1884695856529,15.5787736379807,7,6
+Belarus,BLR,2014,202973,9448515,FALSE,16.3625407921506,8.98393089797744,22.2920179329581,16.2125146182291,3.74443038442534,8.6709486038771,0,60.8169095049748,2.72164470351151,20.4300511861067,10.7490853641006,18.1941751517999,7,6
+Belarus,BLR,2015,202978,9461076,FALSE,17.2296669476023,8.15379598259922,16.7331089623867,14.5821443460024,4.13506927809697,7.8695128722811,0.76244970388089,62.2968476234386,2.82035575120272,15.4457427845491,9.73586208085076,17.3435560319455,7,6
+Belarus,BLR,2016,202988,9469379,FALSE,19.6717444866244,6.34446324607621,15.2875420356513,24.7258199445494,5.13474987865486,2.4506784599657,1.1426717519588,85.5668245268722,3.39978280595078,14.1446460437533,10.4318146758252,22.5540347198601,7,6
+Belarus,BLR,2017,202990,9458989,FALSE,20.6137022880226,6.23226746931536,18.6591951892295,26.0295521119429,5.42570088670147,1.94233886913995,1.1439268923869,100,4.11444336941125,17.1704774575245,11.2479180270641,25.7817778834302,7,6
+Belarus,BLR,2018,202980,9438785,FALSE,21.9603644913658,6.88499152712258,21.3950213216146,26.8047196636864,5.80140541640731,,0.764250334613469,,,19.73493914684,15.5618694676806,13.5472251680656,6,4
+Belarus,BLR,2019,202980,9419758,FALSE,23.0223039319502,5.94626667380913,21.6300202459541,27.1490312656074,,,,,,19.8745257695808,19.4369055293302,17.6566079029991,4,3
+Belarus,BLR,2020,202980,9379952,FALSE,23.7619647229646,0.360038822057648,18.6548943960714,,,,,,,17.2946381019166,14.2589659803645,8.82733846198711,3,2
+Belize,BLZ,1990,22810,187554,TRUE,0,4.44310414439314,6.32159913244217,,,,,,,5.8767608693197,3.58823442561177,5.15993250685642,3,2
+Belize,BLZ,1991,22810,191136,TRUE,0,3.45345045528275,6.80564349360529,,,,,,,6.24964685365928,3.41969798296268,4.85154865447101,3,2
+Belize,BLZ,1992,22810,194324,TRUE,0,4.01747130771714,7.54881290771228,,,,,,,6.91835664574023,3.85542807180981,5.46791397672869,3,2
+Belize,BLZ,1993,22810,197625,TRUE,0,2.49672012792623,7.62043690071277,,,,,,,6.97356046002526,3.372385676213,4.73514029397575,3,2
+Belize,BLZ,1994,22810,201679,TRUE,0,3.34457362083999,7.12963406760276,,,,,,,6.55610840551017,3.49140256281425,4.95034101317508,3,2
+Belize,BLZ,1995,22810,206962,TRUE,0.574583773828829,4.99682330949455,7.24405251338772,20.0727738380495,,,,,,6.61533074898779,8.22205835869015,10.5616426321773,4,3
+Belize,BLZ,1996,22810,213660,TRUE,10.8232527123235,4.5663417239998,7.09663058730795,19.8414649556912,,,,,,6.58411177706274,10.5819224948306,10.3306394855846,4,3
+Belize,BLZ,1997,22810,221575,TRUE,15.2337385684473,3.1383741020871,7.669482968721,16.7203234867774,,,,,,7.06819050866671,10.6904797815082,8.97562936584375,4,3
+Belize,BLZ,1998,22810,230248,TRUE,23.7947145901026,4.21926775900902,7.49183599203103,15.8266446367095,,,,,,6.97472198793756,12.833115744463,9.00687812788535,4,3
+Belize,BLZ,1999,22810,238979,TRUE,44.6856859646743,11.7024026377416,8.76653838004989,17.2816815311233,,,,,,8.10448014896354,20.6090771283973,12.3628547726095,4,3
+Belize,BLZ,2000,22810,247310,TRUE,63.1682809162982,6.34689836978015,9.88261359074782,18.3695664976326,,,,,,9.211993722198,24.4418398436147,11.3094861965369,4,3
+Belize,BLZ,2001,22810,255068,TRUE,,10.5210969197402,9.57692741023851,18.3346941674693,,,,,,9.07267026057039,12.810906165816,12.64282044926,3,3
+Belize,BLZ,2002,22810,262387,TRUE,56.7474097880339,4.268384709572,10.1009929872079,32.1292695821311,,,,,,9.44510594288552,25.8115142667362,15.2809200781962,4,3
+Belize,BLZ,2003,22810,269428,TRUE,,1.83667760643798,10.4442116044414,45.0414214904,38.4718181990805,,,,,9.92217541605469,19.1074369004265,18.9334248376309,4,3
+Belize,BLZ,2004,22810,276516,TRUE,92.8369585023292,17.694938605292,9.93941435719718,58.3844568956787,38.7354932699724,15.9789968771889,,100,,9.65130773151599,38.9669530475372,46.4326758081217,6,4
+Belize,BLZ,2005,22810,283798,TRUE,100,19.764445409066,11.1993876084152,44.3872814164482,39.1838987132512,20.2681008354249,,100,,10.7491023168562,39.1238430538709,43.7252072855926,6,4
+Belize,BLZ,2006,22810,291338,TRUE,100,16.4694900708704,12.6360077981727,37.6510587180696,38.3969039722763,22.2526520808834,,0.453310649493815,,12.1096658575701,37.8018417335992,16.670881324001,6,4
+Belize,BLZ,2007,22810,299031,TRUE,100,20.733302641001,13.0643371070707,35.7480324567912,36.9827882855808,22.1209804261376,,0.441645727878909,,12.6517087552496,38.3333305262001,17.3936723952302,6,4
+Belize,BLZ,2008,22810,306822,TRUE,100,24.6476762413471,14.3495562159251,33.494103891296,30.6751215768386,38.1030683515837,,1.1719129809743,,13.7747000031884,42.1188809400304,18.2720982792015,6,4
+Belize,BLZ,2009,22810,314655,TRUE,100,15.235266643158,11.5780969488692,36.327955139906,22.6122133324514,38.7587940415798,22.9254090816755,1.86576282270839,,10.9143996520259,37.4709203091981,17.4537586678947,7,5
+Belize,BLZ,2010,22810,322465,TRUE,100,13.2708026961957,12.2619775095098,39.7050247671314,22.3533509488124,38.2087163153035,22.3701629466596,1.82057194931841,,11.8194752838657,37.6361140391333,17.7972075286342,7,5
+Belize,BLZ,2011,22810,330236,TRUE,100,12.7474269683519,13.8324332248335,40.6835215373668,30.0959059064634,33.8293155122722,0,3.37778364932509,,12.7904056801458,33.5154495404707,13.9198275670379,7,5
+Belize,BLZ,2012,22810,338001,TRUE,100,25.313232445749,14.7053058418356,36.9454862071248,22.0437362248808,30.6967221672935,10.6709663500916,6.07937660255014,,13.6690207130469,36.3886188353491,18.5356164637125,7,5
+Belize,BLZ,2013,22810,345707,TRUE,100,11.7901010602089,14.9391250134175,35.9110817163472,23.1334555084798,,31.2993138463841,8.491278258469,,13.8657570644253,38.7879243272715,20.2715063891669,6,5
+Belize,BLZ,2014,22810,353366,TRUE,100,17.8520834153059,15.2533747821892,44.3115818010996,31.1224166729696,,10.2069732155819,8.9302831532779,,14.3004242692462,37.5248026428353,19.1202691709023,6,5
+Belize,BLZ,2015,22810,360926,TRUE,100,7.24115654603649,14.8200601035793,43.7199731364134,32.3652547090685,17.876719276917,19.9863534203537,11.3621604838072,,13.6100135866509,33.9407104138833,19.1839314346523,7,5
+Belize,BLZ,2016,22810,368399,TRUE,100,4.10164435239931,13.7572214752178,45.8667815302498,33.9908483473406,,9.79046440760506,14.0859423148453,,12.7411282874975,34.7032223530944,17.3171921785194,6,5
+Belize,BLZ,2017,22810,375775,TRUE,100,3.74528385496189,13.6052830980793,46.5828320421648,36.4220100317119,8.73322088322171,19.1965793216542,15.6237741180315,,12.9444126990422,31.9771998666803,19.6185764071709,7,5
+Belize,BLZ,2018,22810,383071,TRUE,,14.0551956771024,14.0250786223852,53.8138641927497,35.9202339931615,,0,,,13.1767122569766,20.4735346230593,20.2614430317072,5,4
+Belize,BLZ,2019,22810,390351,TRUE,,10.789601938524,14.2542200837284,52.0944409497126,,,,,,13.4642769321916,25.7127543239883,25.4494399401428,3,3
+Belize,BLZ,2020,22810,397621,TRUE,,0.488445751139041,9.79864982398083,,,,,,,8.9602343123985,5.14354778755994,4.72434003176877,2,2
+Bermuda,BMU,1990,54,59326,TRUE,0,,,,,,,,,,0,,1,0
+Bermuda,BMU,1991,54,59021,TRUE,0,,,,,,,,,,0,,1,0
+Bermuda,BMU,1992,54,58595,TRUE,0,,,,,,,,,,0,,1,0
+Bermuda,BMU,1993,54,58910,TRUE,0,,,,,,,,,,0,,1,0
+Bermuda,BMU,1994,54,59320,TRUE,0,,,,,,,,,,0,,1,0
+Bermuda,BMU,1995,54,59746,TRUE,100,,,100,,,,,,,100,100,2,1
+Bermuda,BMU,1996,54,60129,TRUE,100,,,100,,,,,,,100,100,2,1
+Bermuda,BMU,1997,54,60497,TRUE,100,38.2063895404634,,100,,,,,,,79.4021298468211,69.1031947702317,3,2
+Bermuda,BMU,1998,54,60943,TRUE,100,100,,100,,,,,,,100,100,3,2
+Bermuda,BMU,1999,54,61285,TRUE,100,63.8366204136996,,100,,,,,,,87.9455401378999,81.9183102068498,3,2
+Bermuda,BMU,2000,54,61833,TRUE,100,57.3126204450178,,100,,,,,,,85.7708734816726,78.6563102225089,3,2
+Bermuda,BMU,2001,54,62504,TRUE,100,45.3298132274981,,100,,,,,,,81.776604409166,72.664906613749,3,2
+Bermuda,BMU,2002,54,62912,TRUE,100,19.3807476613874,,100,,,,,,,73.1269158871291,59.6903738306937,3,2
+Bermuda,BMU,2003,54,63325,TRUE,100,26.9422353670357,,100,100,,,,,,75.6474117890119,63.4711176835179,4,2
+Bermuda,BMU,2004,54,63740,TRUE,100,100,,100,100,,,,,,100,100,4,2
+Bermuda,BMU,2005,54,64154,TRUE,100,51.2739465745364,,100,100,,,,,,83.7579821915121,75.6369732872682,4,2
+Bermuda,BMU,2006,54,64523,TRUE,100,100,100,100,100,,,6.31244672504943,,100,100,76.5781116812624,5,4
+Bermuda,BMU,2007,54,64888,TRUE,100,100,100,100,100,,,,,100,100,100,5,3
+Bermuda,BMU,2008,54,65273,TRUE,100,100,100,100,100,,,,,100,100,100,5,3
+Bermuda,BMU,2009,54,65636,TRUE,100,54.6094189504786,100,100,100,,100,,,100,90.9218837900957,88.6523547376197,6,4
+Bermuda,BMU,2010,54,65124,TRUE,100,100,100,100,100,,100,,,100,100,100,6,4
+Bermuda,BMU,2011,54,64564,TRUE,100,100,100,100,100,,0,,,100,80,75,6,4
+Bermuda,BMU,2012,54,64798,TRUE,100,100,100,100,100,,0,,,100,80,75,6,4
+Bermuda,BMU,2013,54,65001,TRUE,100,71.1716925627335,100,100,100,,100,,,100,94.2343385125467,92.7929231406834,6,4
+Bermuda,BMU,2014,54,65138,TRUE,100,82.9157744733811,100,100,100,,55.3716309573106,,,100,87.6574810861383,84.5718513576729,6,4
+Bermuda,BMU,2015,54,65237,TRUE,100,100,100,100,100,,100,,,100,100,100,6,4
+Bermuda,BMU,2016,54,64554,TRUE,100,100,100,100,100,,55.8725609148511,,,100,91.1745121829702,88.9681402287128,6,4
+Bermuda,BMU,2017,54,63873,TRUE,100,100,100,100,100,,56.4682619776321,,,100,91.2936523955264,89.117065494408,6,4
+Bermuda,BMU,2018,54,63919,TRUE,,89.5067116269927,100,100,100,,100,,,100,97.3766779067482,97.3766779067482,5,4
+Bermuda,BMU,2019,54,63913,TRUE,,28.9324315956668,100,100,,,,,,100,76.3108105318889,76.3108105318889,3,3
+Bermuda,BMU,2020,54,63903,TRUE,,,100,,,,,,,100,100,100,1,1
+Bolivia,BOL,1990,1083300,6864839,FALSE,0,0.180807025772465,0.688996340542416,,,,,,,0.677874285515947,0.289934455438293,0.429340655644206,3,2
+Bolivia,BOL,1991,1083300,7011456,FALSE,0,0.337788429871174,0.663369120997057,,,,,,,0.656607320857927,0.333719183622744,0.497197875364551,3,2
+Bolivia,BOL,1992,1083300,7160917,FALSE,0,0.582466697842229,0.67984855928981,,,,,,1.47544511267258,0.650498571931416,0.684440092451154,0.902803460815407,3,3
+Bolivia,BOL,1993,1083300,7312857,FALSE,0,0.754488775194493,0.732927584293531,,,,,,1.6065296367538,0.692996996431489,0.773486499060456,1.01800513612659,3,3
+Bolivia,BOL,1994,1083300,7466792,FALSE,0,0.777701890280891,0.783010511022279,,,,,,1.55827021219283,0.734266167693633,0.779745653373999,1.02341275672245,3,3
+Bolivia,BOL,1995,1083300,7622334,FALSE,0.0229589901293932,2.27111107078024,0.853171811530908,0.848006030855923,,,,,1.54026732839221,0.806470087815775,1.10710304633773,1.36646362946104,4,4
+Bolivia,BOL,1996,1083300,7779268,FALSE,0.0660255851858526,2.68478727403844,0.908800075636645,0.907387064664878,,,,,2.15391026120324,0.854307044000378,1.34418205214581,1.65009791097674,4,4
+Bolivia,BOL,1997,1083300,7937453,FALSE,0.14779368357681,4.05025186684256,1.02157053879869,0.978041561803749,,,,,2.5933472005432,0.985656283222184,1.758200970313,2.15182422810292,4,4
+Bolivia,BOL,1998,1083300,8096761,FALSE,0.202681355840935,5.15739586982928,1.02433536778603,1.02778550021625,,,,,2.71870196032123,0.992242257293469,2.02618001079874,2.47403139691506,4,4
+Bolivia,BOL,1999,1083300,8257066,FALSE,0.311472051675867,5.38234472335884,0.92871780320623,0.87392256079914,,,,,2.28384028806243,0.930489403150744,1.9560594854205,2.36764924384279,4,4
+Bolivia,BOL,2000,1083300,8418270,FALSE,0.448939083334311,3.85095951902773,0.981649293292975,0.748931196044197,,,,,2.24771942316685,0.97285088220637,1.65563970297321,1.95511525511129,4,4
+Bolivia,BOL,2001,1083300,8580244,FALSE,0.647360295213043,3.62075300142131,0.948940331603889,0.760250279785358,,,,,1.88369445725939,0.929212700368821,1.5721996730566,1.79847760970872,4,4
+Bolivia,BOL,2002,1083300,8742822,FALSE,0.933957561245154,3.40697396813747,0.96577994439482,0.764149162325498,,,,,1.50652920154888,0.931564046013684,1.51547796753036,1.65230409450638,4,4
+Bolivia,BOL,2003,1083300,8905820,FALSE,1.03198787420678,0.985838999496059,1.05119793595295,0.995665301989124,1.49757943978766,,3.23994627989095,,1.97624335600798,1.01253767010553,1.54681329125731,1.64204632149793,6,5
+Bolivia,BOL,2004,1083300,9069044,FALSE,1.28241674457143,0.329968957959517,1.2673584554726,1.10497147392547,1.47058728800439,4.91539788293598,,100,1.99135176105568,1.2213698049938,1.81524421265344,20.9295323995869,6,5
+Bolivia,BOL,2005,1083300,9232301,FALSE,1.48322198834766,1.14784209491626,1.57214076286702,1.19593439035601,1.4838381780338,7.35306719724778,,100,2.09308470513544,1.50494305463079,2.4742151898117,21.1883608490077,6,5
+Bolivia,BOL,2006,1083300,9395449,FALSE,1.72876619340256,1.32464086803013,1.97229103393941,1.28245811552465,1.33672144752288,10.7886354879576,2.68721389271349,,1.47560210024824,1.90910543826515,3.03708681311658,1.73580408295633,7,5
+Bolivia,BOL,2007,1083300,9558438,FALSE,2.87730704099913,1.69451271176775,2.26423943813131,1.39528201913249,1.20669932270696,,,,,2.24144827145304,2.05783530250767,1.77708100078443,5,3
+Bolivia,BOL,2008,1083300,9721457,FALSE,3.36816801557433,2.32497353064322,3.14812834218735,1.47682681418158,1.11708968191153,1.34763726476255,1.85507033426023,,,3.01092899080449,2.25346738360154,2.16694991747238,7,4
+Bolivia,BOL,2009,1083300,9884790,FALSE,4.45201817289508,1.89034969557604,2.55316144282667,1.37128918969453,1.0775178991079,1.3220621288325,2.18930131887312,,2.04017040236573,2.46616523480187,2.25976462158052,1.99145516826226,7,5
+Bolivia,BOL,2010,1083300,10048597,FALSE,5.83925825203943,2.84055742834253,3.09048505231873,1.54959233723247,1.07943206311683,10.692642144101,1.07680623393414,,1.39975053331603,2.9144136619023,3.78415599732634,1.95622403894549,7,5
+Bolivia,BOL,2011,1083300,10212951,FALSE,7.69458320883307,3.68986305464811,4.20282065402312,1.76609344976341,1.16738869973767,10.01741554954,0.706318339781968,,1.72538807443059,3.92786771560641,4.25749747586004,2.3631061268461,7,5
+Bolivia,BOL,2012,1083300,10377677,FALSE,8.92034168191809,4.47971885565177,5.13273130194916,1.85509555126459,1.29928102016607,8.96688690580191,2.08532061498771,,0.611958030037863,4.87134143486397,4.57886470594444,2.78068689736118,7,5
+Bolivia,BOL,2013,1083300,10542375,FALSE,9.19096188238709,7.27884822614244,5.42754633316118,1.88255427326099,1.39403966516699,7.85121935979756,0.342123790635156,,1.54388495452304,5.19115827028025,4.78816268855821,3.24771390296838,7,5
+Bolivia,BOL,2014,1083300,10706517,FALSE,8.46531224609063,2.8252590193821,6.0458967406652,2.04428870572019,1.76916062349116,6.66546895155622,1.34751471362621,,0.871377359182006,5.65580197074388,4.03787396231751,2.54884835373088,7,5
+Bolivia,BOL,2015,1083300,10869732,FALSE,9.03465759745666,2.24517973312664,4.82244616580193,2.06274495168843,1.98903862808908,4.6305663987403,2.65456207921027,,1.0110001323802,4.47223468258138,3.78016529405778,2.48914431579738,7,5
+Bolivia,BOL,2016,1083300,11031822,FALSE,9.42608095331031,1.68661113157179,4.14320455532795,2.09187920806091,1.74603513670083,2.76449180176538,0.980834525057773,,1.87114006368596,3.786745495149,3.28060603411144,2.08344208470509,7,5
+Bolivia,BOL,2017,1083300,11192853,FALSE,10.2581327911642,3.10409716317854,4.57754712724155,2.28425556647504,1.6584708245851,1.71453506019213,2.90016992769187,,1.66959221363336,4.27337760203059,3.78690426422524,2.84629849460188,7,5
+Bolivia,BOL,2018,1083300,11353140,FALSE,10.2180247627983,1.49440380203418,4.81920961556513,2.35470609486552,1.66007018544275,,1.90614964527732,,,4.45610903273553,4.1584987841081,2.55284214372814,6,4
+Bolivia,BOL,2019,1083300,11513102,FALSE,10.8015495027734,1.00932885464697,4.62963992609526,2.52983284015075,,,,,,4.24886793592813,4.74258778091659,2.59600987690862,4,3
+Bolivia,BOL,2020,1083300,11673029,FALSE,12.3734501499004,0.382636754501721,3.26144203748574,,,,,,,2.95925302082195,5.33917631396262,1.67094488766184,3,2
+Brazil,BRA,1990,8358140,149003225,FALSE,0,0.486854355729084,0.990692460267348,,,,,,,1.0517112043158,0.492515605332144,0.769282780022441,3,2
+Brazil,BRA,1991,8358140,151648007,FALSE,0.0000567979657726212,0.612270554755142,0.970116771188586,,,,,,,0.995825360575368,0.5274813746365,0.804047957665255,3,2
+Brazil,BRA,1992,8358140,154259382,FALSE,0.000219840598965582,0.62493568425827,1.02639614354341,,,,,,1.21832006110483,1.02555822525778,0.717467932376367,0.956271323540291,3,3
+Brazil,BRA,1993,8358140,156849086,FALSE,0.000425837131457784,0.498572791114794,1.17212966311863,,,,,,1.37718370576547,1.18739938153157,0.762077999282586,1.02105195947061,3,3
+Brazil,BRA,1994,8358140,159432717,FALSE,0.000618962727551188,1.130362957221,1.36581414344103,,,,,,1.46070811136804,1.36157951221007,0.989376043689407,1.3175501935997,3,3
+Brazil,BRA,1995,8358140,162019889,FALSE,0.00169983657246454,1.68999036095811,1.69329849905301,0.342771649957281,,,,,1.77489635558739,1.70466001054535,1.10053134042565,1.37807959426203,4,4
+Brazil,BRA,1996,8358140,164614682,FALSE,0.00717331676283311,3.58008198911522,1.70407719974685,0.47549242395316,,,,,1.84984157099938,1.77291698541047,1.52333330011549,1.91958324236956,4,4
+Brazil,BRA,1997,8358140,167209046,FALSE,0.0123146367236993,5.27447323515707,1.934330409485,0.497225465121241,,,,,2.0576318961555,2.00315164093827,1.9551951285285,2.45812055934302,4,4
+Brazil,BRA,1998,8358140,169785253,FALSE,0.0228009434984386,8.19125289292479,1.87653647196329,0.641700406972101,,,,,2.02473860283996,1.97559842244417,2.55140586363972,3.20832258129525,4,4
+Brazil,BRA,1999,8358140,172318674,FALSE,0.0309915236937252,7.60599301370445,1.62376942765804,0.560408289598218,,,,,1.67006481423327,1.74117041975441,2.29824541377754,2.89440913432259,4,4
+Brazil,BRA,2000,8358140,174790339,FALSE,0.0430212706579583,8.90573230429211,1.85716511478164,0.592147752050968,,,,,1.75455660263137,1.92201649635853,2.63052460888281,3.29361328883324,4,4
+Brazil,BRA,2001,8358140,177196051,FALSE,0.0669445050569807,6.11736978147997,1.87172333108574,0.509087769438685,,,,,1.62962905035883,1.94499064425879,2.03895088748404,2.55026931138407,4,4
+Brazil,BRA,2002,8358140,179537523,FALSE,0.133491517613326,4.6573961186632,1.73418079762959,0.41284428904656,,,,,1.55174868427685,1.80285114421999,1.6979322814459,2.10621005905165,4,4
+Brazil,BRA,2003,8358140,181809244,FALSE,0.190292899515793,2.49723404326153,1.91639140309934,0.490453948504996,0.417997616824531,,2.18221963841785,,1.49250427715931,1.96326883741604,1.46151603499314,1.72513614895195,6,5
+Brazil,BRA,2004,8358140,184006479,FALSE,0.271529046810746,6.67012229201018,2.43942047860215,0.510987726014697,0.448481158804323,,2.11695865398364,,1.55235858245226,2.43712118312952,2.26022946331228,2.65750968751806,6,5
+Brazil,BRA,2005,8358140,186127108,FALSE,0.295865913639312,4.32880034521993,2.97251708866033,0.567805586242573,0.486384086491154,0.446801953812787,2.0734610608725,100,1.64042004284849,2.96229050068984,1.76081028447085,18.5954629226456,7,6
+Brazil,BRA,2006,8358140,188167353,FALSE,0.392271578128575,11.2385483224449,3.5162945306538,0.573318514751981,0.478260221523325,0.393444759677515,2.10848320060443,0.448875607276749,1.2665176975534,3.52595614254001,2.78412551483066,3.19361658086192,7,6
+Brazil,BRA,2007,8358140,190130445,FALSE,0.42544235203731,14.2192086764325,4.30365098902127,0.617539830372137,0.544566923509435,0.391062130103547,2.14362352433664,0.769937606154516,,4.34754247384442,3.6834212503839,4.41957042222804,7,5
+Brazil,BRA,2008,8358140,192030362,FALSE,0.461473950876035,17.5480898969328,5.60131137286574,0.649371985464754,0.576710744869982,0.362522375888231,2.14119729614368,1.5461121213395,,5.64136838877196,4.46066114636188,5.50522793773054,7,5
+Brazil,BRA,2009,8358140,193886505,FALSE,0.529877039507065,8.15097801742906,4.37988361580855,0.607678676904716,0.570119733498728,0.358068749351079,2.00908313917004,2.64947111625898,1.427142491927,4.40907608163522,2.49467310429964,3.20890492055417,7,6
+Brazil,BRA,2010,8358140,195713637,FALSE,0.544069720244651,24.4609649477703,5.84202500270788,0.719676835591767,0.608874915905748,0.398454720551215,1.67703466700204,3.74966945369652,1.56188603830602,6.24575845702148,5.02915884745342,6.40249839989803,7,6
+Brazil,BRA,2011,8358140,197514541,FALSE,0.605950541865314,26.3122371466174,7.24469490097117,0.81286138962848,0.714820209919773,0.388457857502126,1.46087362643231,9.21455375162156,1.75119904518487,7.56939323745581,5.51089635831452,7.85351969949007,7,6
+Brazil,BRA,2012,8358140,199287292,FALSE,0.638284305992865,20.8308897272486,7.06425005207888,0.862551548322097,0.754393835706952,0.423917489632125,2.06322685087161,16.3503611329133,1.7584596703505,7.04943963318529,4.80593994921381,8.15248809381524,7,6
+Brazil,BRA,2013,8358140,201035904,FALSE,0.665046684262938,19.821302769705,7.24458415510496,0.885551969292049,0.750020219967462,,1.90175240296138,7.6659558025077,1.82700544462105,7.00079356220873,5.39087390432456,6.51706032521598,6,6
+Brazil,BRA,2014,8358140,202763744,FALSE,0.704737730267517,23.4304661311587,6.91660897173948,0.959952872217918,0.805746815074748,,1.81439401870743,8.68644996666138,1.87640313038428,6.72244070012644,5.95042714241255,7.24835113654269,6,6
+Brazil,BRA,2015,8358140,204471759,FALSE,0.747237203945526,14.5585248642212,5.48804738192772,0.936296747244619,0.807881091491039,0.0956742065106381,1.869796178129,10.0495550594654,2.11126788118836,5.23226114824441,3.68669206616672,5.79295031308216,7,6
+Brazil,BRA,2016,8358140,206163056,FALSE,0.77343830144903,18.9312966704252,4.9041999245453,0.907096466838511,0.739434502146913,0.185794193433785,1.25963114072875,12.1029439977643,2.07554461457642,4.97118016739369,4.14814304457099,6.70794884295447,7,6
+Brazil,BRA,2017,8358140,207833825,FALSE,0.850389407244011,19.0403407904521,5.61913945467013,1.00383428800191,0.731137688134247,0.123454978354666,0.937128756852038,14.477421866211,2.30515309236577,5.82068014707677,4.26849153827723,7.2640931568266,7,6
+Brazil,BRA,2018,8358140,209469320,FALSE,0.880802961629814,16.7897549677616,6.22771822295849,0.99888490072869,0.814661692168727,,0.75762446300528,,,6.30237484118002,5.13095710321677,6.2121597931689,6,4
+Brazil,BRA,2019,8358140,211049519,FALSE,0.917377886129931,19.117646893999,6.02796404807729,0.364223888386226,,,,,,6.34446861605637,6.60680317914811,8.60877979948052,4,3
+Brazil,BRA,2020,8358140,212559409,FALSE,,0.715425613292094,5.27959945388854,,,,,,,5.40594461722499,2.99751253359032,3.06068511525854,2,2
+Barbados,BRB,1990,430,260933,TRUE,0,2.12010977487907,15.5245782220306,,,,,,,14.7469531182356,5.88156266563656,8.43353144655736,3,2
+Barbados,BRB,1991,430,261912,TRUE,0,1.46105088543839,15.0119415299586,,,,,,,14.3118214753404,5.490997471799,7.88643618038938,3,2
+Barbados,BRB,1992,430,262890,TRUE,0,2.55256369121204,13.3019846327152,,,,,,,12.7273686608768,5.28484944130907,7.6399661760444,3,2
+Barbados,BRB,1993,430,263869,TRUE,0,1.99493428670058,14.6959252194859,,,,,,,14.0821301442652,5.5636198353955,8.03853221548291,3,2
+Barbados,BRB,1994,430,264893,TRUE,0,2.32629648942662,16.0681018811537,,,,,,,15.3933533918038,6.13146612352676,8.8598249406152,3,2
+Barbados,BRB,1995,430,265955,TRUE,0.0763543935112618,11.0661831874073,18.2844844615157,42.3408924965177,,,,,,17.4414106271986,17.941978634738,23.6161621037079,4,3
+Barbados,BRB,1996,430,267047,TRUE,3.82027783824556,3.18398176540013,20.7805314876948,43.5324465937712,,,,,,19.8195539609823,17.8293094212779,22.1786607733845,4,3
+Barbados,BRB,1997,430,268183,TRUE,7.65214946420858,4.80869235663166,21.6299933541115,44.8428508968008,,,,,,20.5182797638472,19.7334215179381,23.3899410057599,4,3
+Barbados,BRB,1998,430,269334,TRUE,19.1621873035678,4.90326937220745,22.2192301678011,45.959215837251,,,,,,21.2192700800535,23.0609756702068,24.0272517631706,4,3
+Barbados,BRB,1999,430,270455,TRUE,23.0150364548976,7.92018749554747,23.3640543169819,42.5347089778475,,,,,,22.3817352610114,24.2084968113186,24.2788772448021,4,3
+Barbados,BRB,2000,430,271511,TRUE,38.3371986642631,15.593068901692,25.442059231674,48.2304801355914,,,,,,24.3767743378314,31.9007017333051,29.4001077917049,4,3
+Barbados,BRB,2001,430,272494,TRUE,100,18.8457090421675,23.5670486619175,46.1395194018985,,,,,,22.9346419062604,47.1380692764959,29.3066234501088,4,3
+Barbados,BRB,2002,430,273423,TRUE,100,40.6343424310757,23.7346400995217,45.3607392763074,,,,,,23.2167022614685,52.4324304517262,36.4039279896172,4,3
+Barbados,BRB,2003,430,274331,TRUE,100,33.531481212592,26.6520467927929,48.2660629287908,100,,100,,,25.9188832270694,61.6899181868351,51.9291068421131,6,4
+Barbados,BRB,2004,430,275283,TRUE,100,44.9127814972327,28.2552178788167,56.1747457567539,100,,65.5107161956477,,,27.8411447028789,58.9706922656902,48.6098470381283,6,4
+Barbados,BRB,2005,430,276320,TRUE,100,86.8131082167756,33.100295345175,48.8418557135924,100,,,,,32.464485949714,67.1888148188858,56.039816626694,5,3
+Barbados,BRB,2006,430,277475,TRUE,100,61.1261219253819,36.2036939564837,48.2445202475308,100,,,,,36.4276834279432,61.3935840323491,48.599441866952,5,3
+Barbados,BRB,2007,430,278701,TRUE,100,87.9134493984332,38.3789319965123,51.91160017404,100,,90.5902062822921,1.36653409889527,,38.4895004306081,73.7588375702555,54.0542580768537,6,5
+Barbados,BRB,2008,430,279946,TRUE,100,100,40.5717263039637,50.5524855532333,100,,,2.62140588497603,,40.7943395243604,72.7810529642993,48.4920577406425,5,4
+Barbados,BRB,2009,430,281107,TRUE,100,75.4897727316175,33.2955337709535,49.8683308406794,100,,100,9.34615847665686,,35.0922118601338,71.7307274686501,53.9592947818175,6,5
+Barbados,BRB,2010,430,282131,TRUE,100,100,36.0579431305037,51.5388158448393,100,,38.3523678429237,10.3006974281481,,36.1590165718597,65.1898253636533,47.2701795375542,6,5
+Barbados,BRB,2011,430,282987,TRUE,100,100,37.2766273560123,50.9536367851921,100,,50.9818090201641,19.4629500613999,,39.5425624882143,67.8424146322737,52.1881916709941,6,5
+Barbados,BRB,2012,430,283698,TRUE,100,87.8038300687602,37.1027797191057,45.0880485257628,100,,12.7135097790513,21.4060438202832,,37.9736471766085,56.541633618536,40.9970158740932,6,5
+Barbados,BRB,2013,430,284294,TRUE,100,20.1150534063192,40.3862090802938,46.1045089752845,86.7861738837273,,63.4342845311068,28.6795028130972,,41.2794576855377,54.0080111986009,39.9225614822691,6,5
+Barbados,BRB,2014,430,284825,TRUE,100,100,39.5140364956891,46.0185535080681,81.8395190687429,56.0709275862317,25.3264095307455,69.8518087100408,,40.8448644531978,61.1549878534557,56.4083272404104,7,5
+Barbados,BRB,2015,430,285327,TRUE,100,100,38.9837931787078,50.1951435908082,84.0407928455664,,100,100,,39.9412210471121,77.8357873539032,78.0272729275841,6,5
+Barbados,BRB,2016,430,285798,TRUE,100,100,39.0417821087665,52.1526781593183,88.4307101095523,41.2129022021672,12.6200928533345,100,,42.239861929722,57.5045758872644,61.402526588475,7,5
+Barbados,BRB,2017,430,286229,TRUE,100,35.8267771916244,,57.082230386532,93.0332426990094,24.0222936245733,12.6010896774865,100,,,45.9064781760433,51.3775243139108,6,4
+Barbados,BRB,2018,430,286640,TRUE,,38.3752918680484,,57.4665667032784,99.1850948245617,,12.5830215507162,,,,36.1416267073477,36.1416267073477,4,3
+Barbados,BRB,2019,430,287021,TRUE,,37.1627064259336,,40.8838094584501,,,,,,,39.0232579421919,39.0232579421919,2,2
+Barbados,BRB,2020,430,287371,TRUE,,,,,,,,,,,,,0,0
+Brunei Darussalam,BRN,1990,5270,258714,TRUE,0,1.18669013555765,,,,,,,,,0.593345067778826,1.18669013555765,2,1
+Brunei Darussalam,BRN,1991,5270,266208,TRUE,0,0.823774083559424,,,,,,,,,0.411887041779712,0.823774083559424,2,1
+Brunei Darussalam,BRN,1992,5270,273888,TRUE,0,1.12094488159635,,,,,,,,,0.560472440798177,1.12094488159635,2,1
+Brunei Darussalam,BRN,1993,5270,281684,TRUE,0,1.2456241816287,,,,,,,60.9862668915016,,20.7439636910434,31.1159455365651,2,2
+Brunei Darussalam,BRN,1994,5270,289452,TRUE,0,0.892478911723631,,,,,,,96.3400879594144,,32.4108556237127,48.616283435569,2,2
+Brunei Darussalam,BRN,1995,5270,297112,TRUE,8.96706022151699,86.0258920252463,,,,,,,100,,64.9976507489211,93.0129460126232,2,2
+Brunei Darussalam,BRN,1996,5270,304620,TRUE,28.4060771039867,94.1050332926085,,,,,,,100,,74.1703701321984,97.0525166463042,2,2
+Brunei Darussalam,BRN,1997,5270,311962,TRUE,40.5653886264008,98.6583299263898,,,,,,,100,,79.7412395175969,99.3291649631949,2,2
+Brunei Darussalam,BRN,1998,5270,319135,TRUE,51.585562387613,78.7823352318889,,,,,,,100,,76.7892992065006,89.3911676159445,2,2
+Brunei Darussalam,BRN,1999,5270,326214,TRUE,61.5980287323156,100,,,,,,,100,,87.1993429107719,100,2,2
+Brunei Darussalam,BRN,2000,5270,333166,TRUE,70.732270982437,72.3520768239338,,,,,,,100,,81.0281159354569,86.1760384119669,2,2
+Brunei Darussalam,BRN,2001,5270,340037,TRUE,99.5122245509927,7.82858755335771,44.5251250450504,,,,,,100,41.6473240654903,62.9664842873502,49.8253038729494,3,3
+Brunei Darussalam,BRN,2002,5270,346777,TRUE,100,29.048044836735,45.2621050908743,,,,,,100,42.0881132889707,68.5775374819023,57.0453860419019,3,3
+Brunei Darussalam,BRN,2003,5270,353295,TRUE,100,15.3714815200606,48.945842318779,,31.2674317308785,,,,100,45.3366406412407,66.0793309597099,53.5693740537671,4,3
+Brunei Darussalam,BRN,2004,5270,359434,TRUE,100,18.8867493280637,53.9951687397104,4.02044559399621,36.1071298370364,,50.1732904691445,,100,49.8424238197956,54.5126090218191,44.5845818422,6,5
+Brunei Darussalam,BRN,2005,5270,365112,TRUE,100,21.0300917653692,62.1192354882623,4.19080256832407,32.4708183491905,,59.2716311262949,,100,57.0149170955627,57.7686268247084,48.3014885111102,6,5
+Brunei Darussalam,BRN,2006,5270,370262,TRUE,100,12.4727198080651,72.9809945652079,5.18238309853101,34.7069002419779,,,1.09993476534506,100,66.3600066433633,58.1272194943608,37.0230088630609,5,5
+Brunei Darussalam,BRN,2007,5270,374967,TRUE,100,30.1350728965557,76.1960913193857,5.79768311670258,36.9777005061446,,,1.08613164243982,,69.3911231798516,53.032211833161,26.6025027088874,5,4
+Brunei Darussalam,BRN,2008,5270,379418,TRUE,100,25.6835556568356,100,7.23446826151209,42.0545399597999,,,1.19911400105676,,91.4181111818867,58.2295059795869,31.3838122753228,5,4
+Brunei Darussalam,BRN,2009,5270,383902,TRUE,100,37.196808143048,74.3578107801276,4.96655851927281,38.6773559826782,,100,3.82317291491969,100,68.3055834688562,69.4201962404081,52.3820205076828,6,6
+Brunei Darussalam,BRN,2010,5270,388634,TRUE,100,54.2516463868914,81.5178057430644,6.68777968504518,42.5330814813075,,92.8070446048801,9.44171829280505,100,82.1314730647633,72.5440460699802,57.5532770057308,6,6
+Brunei Darussalam,BRN,2011,5270,393687,TRUE,100,77.0004389243729,100,7.46591606049838,41.3458431441509,,27.4847579216278,9.32053175706404,100,100,68.6585188177499,53.5452741105939,6,6
+Brunei Darussalam,BRN,2012,5270,398997,TRUE,100,95.0732336077757,100,6.36181152196464,36.1880856622157,,54.2379611470357,18.2459438254501,100,100,75.9455010461293,62.3198250170377,6,6
+Brunei Darussalam,BRN,2013,5270,404414,TRUE,100,84.1190498150602,100,6.75719236574306,39.1520506113004,,26.75573024646,25.4054499274551,100,100,69.6053287378772,57.1729037257864,6,6
+Brunei Darussalam,BRN,2014,5270,409778,TRUE,100,60.7819455457213,100,5.95723627724676,39.2975066999721,,44.0091622451339,27.5801909453197,100,100,68.4580573446837,56.3880891689036,6,6
+Brunei Darussalam,BRN,2015,5270,414914,TRUE,100,18.106355096237,67.8616670283304,6.3812072303536,38.2616265250358,,52.1572754445109,37.7275343333493,100,67.2959834612211,57.4177507999053,46.944725927612,6,6
+Brunei Darussalam,BRN,2016,5270,419791,TRUE,100,15.7292945769828,55.556196093573,6.335993598762,40.7716273476687,,0,61.7117319871851,100,55.2969457028447,46.2702473782196,39.8456609776291,6,6
+Brunei Darussalam,BRN,2017,5270,424481,TRUE,100,48.3481190946145,58.9394535637658,7.41070780029614,41.2970157965784,,0,76.0712796091662,100,58.5892534209991,52.4497134097794,48.4032266541793,6,6
+Brunei Darussalam,BRN,2018,5270,428960,TRUE,100,52.7791791214931,71.7284691784513,7.87138516730952,41.5914923038618,,100,,,72.2398448131156,66.4758066934508,58.2226022754796,6,4
+Brunei Darussalam,BRN,2019,5270,433296,TRUE,100,37.7817642207107,81.6813199542035,9.33459080876695,,,,,,79.800897172967,57.1994187459203,42.3057507341482,4,3
+Brunei Darussalam,BRN,2020,5270,437483,TRUE,,,73.349091947095,,,,,,,71.3826669295624,73.349091947095,71.3826669295624,1,1
+Bhutan,BTN,1990,46723,530801,TRUE,0,0.132204876018658,,,,,,,,,0.0661024380093292,0.132204876018658,2,1
+Bhutan,BTN,1991,46723,534637,TRUE,0,0.0492211166611036,,,,,,,,,0.0246105583305518,0.0492211166611036,2,1
+Bhutan,BTN,1992,46723,534525,TRUE,0,,,,,,,,,,0,,1,0
+Bhutan,BTN,1993,46723,532590,TRUE,0,,,,,,,,,,0,,1,0
+Bhutan,BTN,1994,39800,531905,TRUE,0,,,,,,,,,,0,,1,0
+Bhutan,BTN,1995,39800,534629,TRUE,0,0.00410182109904602,,0.107613411442012,,,,,,,0.0372384108470192,0.0558576162705288,3,2
+Bhutan,BTN,1996,39800,541471,TRUE,,0.113399739498759,,0.115209284552904,,,,,,,0.114304512025831,0.114304512025831,2,2
+Bhutan,BTN,1997,39800,551713,TRUE,,0.0556472933809176,,0.117447291561226,,,,,,,0.0865472924710719,0.0865472924710719,2,2
+Bhutan,BTN,1998,39800,564378,TRUE,,,,0.131998689140985,,,,,,,0.131998689140985,0.131998689140985,1,1
+Bhutan,BTN,1999,39800,577886,TRUE,0.623593295822633,0.0797113160262077,,0.149900646645571,,,,,,,0.284401752831471,0.11480598133589,3,2
+Bhutan,BTN,2000,39800,591014,TRUE,1.77705769592187,,,0.154760448352592,,,,,,,0.96590907213723,0.154760448352592,2,1
+Bhutan,BTN,2001,39800,603643,TRUE,3.75201446490367,,,0.127342964475599,,,,,,,1.93967871468963,0.127342964475599,2,1
+Bhutan,BTN,2002,39800,616025,TRUE,7.12589817634474,0.172681729341808,,0.108978247242419,,,,,,,2.46918605097632,0.140829988292114,3,2
+Bhutan,BTN,2003,39800,627840,TRUE,10.167309178585,0.235439671383152,,0.120444268656599,2.02798504629855,,,,,,3.5077310395416,0.177941970019875,4,2
+Bhutan,BTN,2004,38117,638809,TRUE,12.9454298485856,0.608299397703618,,0.173499225942224,1.52500143762179,,,,,,4.57574282407713,0.390899311822921,4,2
+Bhutan,BTN,2005,38117,648744,TRUE,15.53373802329,0.419893654428726,,0.253211525821303,1.4978358938883,,,,,,5.40228106784667,0.336552590125014,4,2
+Bhutan,BTN,2006,38117,657404,TRUE,18.0036049116691,0.408479262258874,3.13883421056502,0.318227923037652,1.80618868833372,,,0.0166339716277284,,2.87455387130251,5.46728657688266,0.904473757056692,5,4
+Bhutan,BTN,2007,38117,664873,TRUE,23.3237352878535,4.87197392158557,4.41308345529249,0.382239788554536,2.12873386276466,,,0.0495596985482176,,4.01982789987075,8.24775811332152,2.33090032713977,5,4
+Bhutan,BTN,2008,38117,671611,TRUE,25.5469226663395,0.205316617344844,5.07528775811534,0.505004891473742,2.096406471677,,,0.0490613720767606,,4.75985219622943,7.83313298331836,1.3798087692812,5,4
+Bhutan,BTN,2009,38117,678329,TRUE,27.688145288288,1.18321312976907,4.44376882370025,0.410445785204861,2.06839576343018,,10.6343597201278,0.167583224428881,,4.10817414198048,8.87198654941801,3.30075520030223,6,5
+Bhutan,BTN,2010,38117,685502,TRUE,51.969109614579,4.81610052820235,5.3474230256924,0.725118421108703,2.73684353964064,,15.7846248324467,0.165828494218155,,4.99309885009826,15.7284752844058,5.29695422521484,6,5
+Bhutan,BTN,2011,38117,693297,TRUE,54.4074366585644,1.97006715870809,7.11713160115594,1.15499964688432,4.63997506999651,,10.4047682228462,0.492110430298199,,6.63883901643246,15.0108806576318,4.13215689503385,6,5
+Bhutan,BTN,2012,38117,701582,TRUE,58.2453493164906,1.5241456983172,6.64208612219229,1.81663180502961,3.43221362072777,3.85447394355047,10.2818980455522,0.648434050495201,,6.25050275839287,13.7274308218554,4.10432247155741,7,5
+Bhutan,BTN,2013,38117,710235,TRUE,82.6154061031471,1.26183538070499,5.98742669955542,1.98262709630209,3.46284686464532,,0,0.640532636454848,,5.82877951626888,18.3694590559419,1.94275492594616,6,5
+Bhutan,BTN,2014,38117,719053,TRUE,100,1.43552666392494,5.94339700581357,2.24550019869942,6.76105277026035,4.52651741119554,5.01603817423375,3.06176274829247,,5.68269809952417,19.8611632423112,3.48830517693495,7,5
+Bhutan,BTN,2015,38117,727885,TRUE,100,0.38870523370937,6.31335382272443,2.58540281879682,4.88410478175566,4.76041400978149,0,3.76183612910173,,6.14244833236549,19.0079793141687,2.57567850279468,7,5
+Bhutan,BTN,2016,38144,736706,TRUE,100,0.70751164452266,6.13555381095694,3.46135485603486,5.44445654951091,5.87929404707071,0,5.91712878983127,,5.99354597829745,19.3639523930975,3.21590825373725,7,5
+Bhutan,BTN,2017,38144,745563,TRUE,,0.973803943515929,6.29464547273582,4.1534333139771,6.54687449682853,4.75888424066089,0,6.96380753698043,,6.23546148885874,3.23615339417795,3.66530125666644,6,5
+Bhutan,BTN,2018,38140,754396,TRUE,,0.154033889047665,6.48619692789234,4.41073997998637,7.62040077553382,,4.78103979514379,,,6.4725212540374,3.95800264801754,3.95458372955381,5,4
+Bhutan,BTN,2019,38140,763094,TRUE,,0.74783270496224,6.32669462282104,6.17525410243982,,,,,,6.34796758058452,4.41659381007437,4.42368479599553,3,3
+Bhutan,BTN,2020,38140,771612,TRUE,,,6.15577726018339,,,,,,,5.94675019313502,6.15577726018339,5.94675019313502,1,1
+Botswana,BWA,1990,566730,1286756,FALSE,0,3.5194004644735,7.46821228151086,,,,,,,8.07116067335477,3.66253758199479,5.79528056891414,3,2
+Botswana,BWA,1991,566730,1326321,FALSE,0,0.552893338756617,7.38252018761551,,,,,,,7.89420024899714,2.64513784212404,4.22354679387688,3,2
+Botswana,BWA,1992,566730,1363541,FALSE,0,0.367436431910018,6.79368914390453,,,,,,,7.44564571760679,2.38704185860485,3.90654107475841,3,2
+Botswana,BWA,1993,566730,1399110,FALSE,0,9.29279532566223,6.35131939664759,,,,,,,6.78303023536527,5.21470490743661,8.03791278051375,3,2
+Botswana,BWA,1994,566730,1434061,FALSE,0,0.722260574963228,6.26682575621677,,,,,,,6.48746325850957,2.32969544372667,3.6048619167364,3,2
+Botswana,BWA,1995,566730,1469173,FALSE,0.115038582403591,3.32320094479697,7.32426239357386,5.2573571793927,,,,,,7.84059006582483,4.00496477504178,5.47371606333817,4,3
+Botswana,BWA,1996,566730,1504724,FALSE,0.274102236093752,2.10548932191366,6.70266898206748,5.29457544816298,,,,,,7.6250301652315,3.59420899705947,5.00836497843605,4,3
+Botswana,BWA,1997,566730,1540424,FALSE,0.523321326946456,2.96715917977487,8.43660453580491,6.03142411673141,,,,,,9.2846886334512,4.48962728981441,6.09442397665249,4,3
+Botswana,BWA,1998,566730,1575827,FALSE,1.00136449695546,2.75027635547524,7.36467322721828,7.24495261663962,,,,,,7.94922923698142,4.59031667407215,5.98148606969876,4,3
+Botswana,BWA,1999,566730,1610260,FALSE,1.82584307260863,1.04015717906872,8.04760340134282,7.83686479763847,,,,,,8.51487219447787,4.68761711266466,5.79729805706169,4,3
+Botswana,BWA,2000,566730,1643333,FALSE,4.62686338470421,1.58597409329753,7.79580684070894,9.65285006968584,,,,,,8.2410325095073,5.91537359709913,6.49328555749689,4,3
+Botswana,BWA,2001,566730,1674674,FALSE,5.3665008633794,10.7464276144114,6.80708891114147,10.5239919301189,,,,,,7.13955221046175,8.36100232976281,9.46999058499737,4,3
+Botswana,BWA,2002,566730,1704637,FALSE,5.20307609429539,11.6008246141219,6.94211697699595,10.5812807914185,,,,,,7.61730694827802,8.58182461920793,9.9331374512728,4,3
+Botswana,BWA,2003,566730,1734387,FALSE,5.05230891341396,15.7824043054488,8.8618596400414,11.1492021037192,5.96326859815227,,16.6366435970625,,,9.6073934003888,11.4964837119372,13.2939108516548,6,4
+Botswana,BWA,2004,566730,1765533,FALSE,4.9033869325311,10.6730941656659,10.9986431292377,11.8813754680706,6.86041420706299,,14.3002600807128,,,11.4159593293882,10.5513519552436,12.0676722609594,6,4
+Botswana,BWA,2005,566730,1799077,FALSE,4.75032207355376,11.6554430782081,11.68256114392,11.3694686010069,7.03083853797127,,16.0384343629419,,,12.3145110578911,11.0992458519261,12.844464275012,6,4
+Botswana,BWA,2006,566730,1835911,FALSE,6.12088157432181,12.8220173738481,11.3774548874059,10.8634250945137,6.18078608120048,,,0.0118810812112169,,12.0638927415575,10.2959447325224,8.94030407278263,5,4
+Botswana,BWA,2007,566730,1875458,FALSE,7.37465441763737,12.307433346205,13.8218765494561,12.7264994009247,5.41260883538991,,15.3852436996074,0.0315849557983351,,14.1078374985238,12.3231414827661,10.9117197802118,6,5
+Botswana,BWA,2008,566730,1915636,FALSE,8.54637846965217,14.0191790355579,14.0808687422913,14.862966356813,5.54215662360712,,16.9453777626207,0.161940913660532,,14.1953519377004,13.690954073387,12.0369632012705,6,5
+Botswana,BWA,2009,566730,1953495,FALSE,8.24665651144904,4.86121648183555,11.8761970307287,,6.4284750061636,3.39013149560497,18.4633044737627,0.187727454947347,,11.2881528080606,9.36750119867619,8.70010030465154,6,4
+Botswana,BWA,2010,566730,1987106,FALSE,7.90943223735773,4.83982524109536,14.534160885957,,6.67372798242613,3.92383162249528,19.9661066245436,0.286113970165606,,14.1614996891369,10.2346713222898,9.81338638123537,6,4
+Botswana,BWA,2011,566730,2015406,FALSE,11.6975539336344,6.59204166399485,18.5947144332545,,7.19538995924782,3.92537329920517,5.36883977317319,0.436852919967122,,17.1584240310556,9.23570462065242,7.38903959704769,6,4
+Botswana,BWA,2012,566730,2039551,FALSE,20.5494644072112,3.31251506629851,18.1626395725941,,6.74723453038118,,1.76842711817321,0.53962772639727,,16.5609551371139,10.9482615410692,5.54538126199573,5,4
+Botswana,BWA,2013,566730,2062551,FALSE,38.1005857684173,3.22730465324212,21.0217733333501,,6.98927672944427,,8.74353481998093,0.71151564514887,,19.5756470440155,17.7732996437476,8.06450054059685,5,4
+Botswana,BWA,2014,566730,2088619,FALSE,46.0841027437366,13.1569969093445,21.3787049625505,,7.28929838385131,23.0525304633622,5.18064419211541,2.17804678068907,,19.6936744444304,21.7705958542218,10.0523405816449,6,4
+Botswana,BWA,2015,566730,2120716,FALSE,46.0873456378644,11.6187138336697,17.392052493992,9.50741683682693,7.28527761963105,60.336279756188,0,2.22674924662123,,16.1639039733071,24.1569680930902,7.903356778085,7,5
+Botswana,BWA,2016,566730,2159925,FALSE,47.7380400026955,6.33980857508885,16.9225789894472,9.62726387427554,7.41854104084075,21.8894612532433,16.6987154521444,5.43624942107548,,16.5079074719098,19.8693113578158,10.9219889588988,7,5
+Botswana,BWA,2017,566730,2205076,FALSE,49.1967662551126,5.20007078719604,14.431820148936,9.77717945470807,6.75081287673287,1.01513139305595,8.17839679289353,8.36720012259883,,14.444101876573,14.6332274719837,9.1933898067939,7,5
+Botswana,BWA,2018,566730,2254067,FALSE,67.4025405940998,7.16110721012059,15.9511080554174,9.86106018383662,6.74975745967551,,22.4018017930089,,,15.8989233277723,24.5555235672967,13.8307231286846,6,4
+Botswana,BWA,2019,566730,2303703,FALSE,69.3614943406525,2.15900429027543,14.5681924453885,,,,,,,14.088266807484,28.6962303587722,8.12363554887971,3,2
+Botswana,BWA,2020,566730,2351625,FALSE,,0.315766279796431,12.3460226744544,,,,,,,11.2862370403132,6.33089447712541,5.8010016600548,2,2
+Central African Republic,CAF,1990,622980,2806740,FALSE,0,0.0701353174823331,0.504784208456977,,,,,,,0.445673127001201,0.19163984197977,0.257904222241767,3,2
+Central African Republic,CAF,1991,622980,2878507,FALSE,0,0.127626815346982,0.374965802235742,,,,,,,0.332523801949938,0.167530872527575,0.23007530864846,3,2
+Central African Republic,CAF,1992,622980,2959236,FALSE,0,0.245028412358832,0.37293362848264,,,,,,,0.333225256932743,0.205987346947157,0.289126834645787,3,2
+Central African Republic,CAF,1993,622980,3046148,FALSE,0,0.220272768795887,0.336604015606231,,,,,,,0.300183839380708,0.185625594800706,0.260228304088297,3,2
+Central African Republic,CAF,1994,622980,3135017,FALSE,0,0.151188041998759,0.288699784210285,,,,,,,0.254333043823369,0.146629275403015,0.202760542911064,3,2
+Central African Republic,CAF,1995,622980,3222662,FALSE,0,0.1037728904241,,0.096554825240733,,,,,,,0.066775905221611,0.100163857832416,3,2
+Central African Republic,CAF,1996,622980,3308235,FALSE,0.00463167107762285,0.164594453663821,,0.0756595005567246,,,,,,,0.0816285417660562,0.120126977110273,3,2
+Central African Republic,CAF,1997,622980,3392432,FALSE,0.0110193182853645,0.0215966335835413,,0.0594220337331671,,,,,,,0.0306793285340243,0.0405093336583542,3,2
+Central African Republic,CAF,1998,622980,3475485,FALSE,0.0210118562279453,0.0959377599899434,,0.0247616934867885,,,,,,,0.0472371032348924,0.060349726738366,3,2
+Central African Republic,CAF,1999,622980,3558019,FALSE,0.0301071378910044,0.0737568113966528,,0.0326892154066208,,,,,,,0.0455177215647593,0.0532230134016368,3,2
+Central African Republic,CAF,2000,622980,3640421,FALSE,0.0384199995502581,0.0107113933430451,,0.0359207483817367,,,,,,,0.0283507137583466,0.0233160708623909,3,2
+Central African Republic,CAF,2001,622980,3722016,FALSE,0.0552772857831312,0.0610854113463086,,0.0308584696342591,,,,,,,0.0490737222545663,0.0459719404902838,3,2
+Central African Republic,CAF,2002,622980,3802129,FALSE,0.0885557572380009,0.0651239685714791,,0.0237875618632555,,,,,,,0.0591557625575784,0.0444557652173673,3,2
+Central African Republic,CAF,2003,622980,3881185,FALSE,0.102292763441313,0.127694832324093,,0.035167283319645,0.219516867706847,,,,,,0.0883849596950169,0.0814310578218688,4,2
+Central African Republic,CAF,2004,622980,3959883,FALSE,0.14778100658171,0.167245259199144,,0.0451766433708194,0.289391203790523,,,,,,0.120067636383891,0.106210951284982,4,2
+Central African Republic,CAF,2005,622980,4038380,FALSE,0.173964076011077,0.109691610867996,,0.0587092729213229,0.434251922002541,,,,,,0.114121653266799,0.0842004418946595,4,2
+Central African Republic,CAF,2006,622980,4118075,FALSE,0.197926274712696,0.369248562027579,,0.0717045571211412,0.491875790883148,,,,,,0.212959797953805,0.22047655957436,4,2
+Central African Republic,CAF,2007,622980,4198004,FALSE,0.234502494404592,0.592901079067749,,0.048029801602576,0.497650597862663,,,,,,0.291811125024972,0.320465440335162,4,2
+Central African Republic,CAF,2008,622980,4273368,FALSE,0.612977876600961,1.2019403370957,,0.0855337593669547,0.506043827943969,,,,,,0.633483991021205,0.643737048231327,4,2
+Central African Republic,CAF,2009,622980,4337623,FALSE,1.08701564811743,0.427506181254848,,0.14529833141814,0.41092614593427,,,,,,0.553273386930141,0.286402256336494,4,2
+Central African Republic,CAF,2010,622980,4386765,FALSE,1.19426504158508,0.615079397052281,,0.2527620123351,0.515257457825693,,,,,,0.687368816990821,0.43392070469369,4,2
+Central African Republic,CAF,2011,622980,4418639,FALSE,1.30421518790376,0.366350322216844,,0.178347930551829,0.748395832762206,,,,,,0.616304480224145,0.272349126384337,4,2
+Central African Republic,CAF,2012,622980,4436411,FALSE,1.77135078957371,0.692378475385036,,0.192414159677727,0.564718313218494,,,,,,0.885381141545491,0.442396317531382,4,2
+Central African Republic,CAF,2013,622980,4447945,FALSE,2.00232515122226,0.0182694984454692,,0.226596907713096,0.334551172553813,,,,,,0.749063852460274,0.122433203079283,4,2
+Central African Republic,CAF,2014,622980,4464171,FALSE,2.11240298663922,0.0341408405024854,,0.258966798600201,0.348701419095228,,,,,,0.801836875247301,0.146553819551343,4,2
+Central African Republic,CAF,2015,622980,4493171,FALSE,2.21536731225744,0.0292838066349383,,0.324336501594147,0.447360064411453,,,,,,0.856329206828842,0.176810154114543,4,2
+Central African Republic,CAF,2016,622980,4537683,FALSE,2.30909038165469,0.0701338628396632,,0.218071255770576,0.637955298333129,,,,,,0.865765166754975,0.14410255930512,4,2
+Central African Republic,CAF,2017,622980,4596023,FALSE,,0.0657381596725692,,0.281363351982186,0.542898408628623,,,,,,0.173550755827377,0.173550755827377,3,2
+Central African Republic,CAF,2018,622980,4666375,FALSE,,0.169214425182521,,0.282306097594644,0.536256794061318,,,,,,0.225760261388583,0.225760261388583,3,2
+Central African Republic,CAF,2019,622980,4745179,FALSE,,0.236628049139534,,,,,,,,,0.236628049139534,0.236628049139534,1,1
+Central African Republic,CAF,2020,622980,4829764,FALSE,,,,,,,,,,,,,0,0
+Canada,CAN,1990,8965590,27691138,FALSE,0.0341492470314821,22.8901783077899,25.89572887303,,,,,,,26.5934036707218,16.2733521426171,24.7417909892559,3,2
+Canada,CAN,1991,8965590,28037420,FALSE,0.0532900156192108,15.6285933579001,25.8827702953368,,,,,,,26.0711264641384,13.8548845562854,20.8498599110193,3,2
+Canada,CAN,1992,8965590,28371264,FALSE,0.0845712779542227,19.7975322987462,26.5935984237683,,,,,,11.589619854659,26.4162413807994,14.5163304637819,19.2677978447349,3,3
+Canada,CAN,1993,8965590,28684764,FALSE,0.108173271152144,14.2494927266967,28.3165615810102,,,,,,11.8193043591493,28.0175197937308,13.6233829845021,18.0287722931923,3,3
+Canada,CAN,1994,8965590,29000663,FALSE,0.214855125047594,30.4914774166102,31.0104810283601,,,,,,12.8425752298285,30.904013840782,18.6398471999616,24.7460221624069,3,3
+Canada,CAN,1995,8965590,29302311,FALSE,0.372198332991157,44.1341158121963,34.4319630072635,17.2684321664445,,,,,14.4002737203051,34.6357335906177,22.1213966078401,27.6096388223909,4,4
+Canada,CAN,1996,8965590,29610218,FALSE,0.598047364804805,31.264128717117,36.0733195222624,17.7448578657644,,,,,16.9095514379678,35.996145382695,20.5179809815833,25.478670850886,4,4
+Canada,CAN,1997,8965590,29905948,FALSE,1.32019688187349,61.4653849492915,39.2425329693589,18.3086644341566,,,,,18.6412323136622,39.3597951530322,27.7956023096686,34.4437692125356,4,4
+Canada,CAN,1998,8965590,30155173,FALSE,2.16275473524354,89.1980801703979,39.5953706990675,19.3610465332078,,,,,19.003955343083,39.2314169969644,33.8642414961999,41.6986247609133,4,4
+Canada,CAN,1999,8965590,30401286,FALSE,3.11794894125856,68.3618556704103,43.1327058566221,19.6002885530954,,,,,19.5933253926088,42.5420102803855,30.761224882799,37.524369974125,4,4
+Canada,CAN,2000,8965590,30685730,FALSE,4.37921229783589,100,48.4455744691957,19.2535053085331,,,,,21.3112467848462,47.4863333086891,38.6779077720822,47.0127713505171,4,4
+Canada,CAN,2001,8965590,31020902,FALSE,5.08343369780107,92.2157952629798,45.0223591444397,18.4615769897589,,,,,20.3921482361519,43.557397825716,36.2350626662263,43.6567295786517,4,4
+Canada,CAN,2002,8965590,31360079,FALSE,5.14483455842325,75.1337204060322,44.2384290762519,17.3899185823882,,,,,20.746308836071,42.7650666668063,32.5306422918333,39.0087536228244,4,4
+Canada,CAN,2003,8965590,31644028,FALSE,5.31445044648812,42.1918498235108,47.6932057977109,14.933183787316,16.4138934997942,,24.8477156830607,,18.4612050600869,46.1545858182461,25.5736017663623,29.3177080344441,6,5
+Canada,CAN,2004,8965590,31940655,FALSE,5.40910416433986,63.5427061499644,54.4007262274017,14.7724294683133,16.8306297390888,,22.2456010237601,,21.8176685720376,52.9476558582493,30.3647059343028,35.0652122144649,6,5
+Canada,CAN,2005,8965590,32243753,FALSE,5.82165295246147,71.8636712814117,61.2000270724685,13.6219676753907,17.0044523637956,,23.9381135819277,,23.5154995812281,60.4116826817808,33.326822024148,38.6701869603478,6,5
+Canada,CAN,2006,8965590,32571174,FALSE,5.82264412951137,100,66.4181668195525,29.9485096480846,16.6537082261448,,25.4692501528615,8.27969452346431,24.9250247887723,66.8231139437227,42.0972659231304,42.5742655094842,6,6
+Canada,CAN,2007,8965590,32889025,FALSE,5.8300888857743,100,71.5249478756519,29.7015394108747,17.7802907256578,,30.1580620513,11.9151446520458,,73.0965873783157,47.4429276447202,48.9742666985073,6,5
+Canada,CAN,2008,8965590,33247118,FALSE,6.04305369462291,100,75.892199132661,28.9029661072309,18.1313086624969,,28.9653641069995,25.3106788706717,,76.3815713961677,47.9607166083029,51.912116096214,6,5
+Canada,CAN,2009,8965590,33628895,FALSE,6.25486645989207,76.5441569936751,57.8537378876324,26.0714605618587,17.5360750009027,,24.6681723671973,29.5807612097089,24.7072843664419,57.9792545824396,36.0166131061162,39.9251816802202,6,6
+Canada,CAN,2010,8965590,34004889,FALSE,6.185706044173,85.1983447356339,68.9455866313795,28.306725249524,18.3854059570431,,23.4408117815854,33.991945201084,27.3169935394389,69.4349845974733,39.8990279969558,44.6149675174566,6,6
+Canada,CAN,2011,8965590,34339328,FALSE,6.33142394439644,100,78.5464425085309,30.7670226898784,18.1957607117016,,19.7463937527226,38.9939555392626,29.8084844461543,78.9411766376647,44.1999612236138,49.7095055109471,6,6
+Canada,CAN,2012,8965590,34714222,FALSE,6.26304814014507,100,79.7334426337827,31.6658360038029,18.8358177795964,,24.1047307058465,44.5265931237628,30.7962703510895,80.3071666541028,45.4272213057778,51.9000994731008,6,6
+Canada,CAN,2013,8965590,35082954,FALSE,6.40628459202414,100,79.2195880336808,31.4902074281792,18.7200593997019,,22.3092677290947,33.4695075578894,40.5927761104717,79.7591697446765,46.6696873155751,51.2701547617186,6,6
+Canada,CAN,2014,8965590,35437435,FALSE,6.43977481183641,100,79.368017690252,30.6088901244404,18.6892405644988,,24.0199145948955,37.2765633563725,43.2975820261753,80.1473251040079,47.2890298745999,52.558379200982,6,6
+Canada,CAN,2015,8965590,35702908,FALSE,6.60319332620482,100,69.8265156190122,28.4183739139677,18.415146665743,,28.8924371938282,41.1104439380232,47.6301461645726,70.4804024222022,46.8951110362643,52.7553006054323,6,6
+Canada,CAN,2016,8965590,36109487,FALSE,6.61299344078444,100,66.9367600705627,27.9621273724231,18.3298935123097,,16.6808004956883,44.7123214151834,53.5490031200361,67.8378334645179,45.2902807499158,51.7903476446415,6,6
+Canada,CAN,2017,8965590,36545295,FALSE,6.6446144062463,100,71.0703124400951,28.5976277874506,18.4856764868366,,24.2786967552221,50.2035595798643,59.368075998259,73.044594877943,48.3265545645455,55.9154258331232,6,6
+Canada,CAN,2018,8965590,37065178,FALSE,6.68842305921882,100,74.8039996992893,22.7254297372621,18.9520858728766,,25.7870415132981,,,77.7877269720089,46.0009788018137,56.5750495556423,6,4
+Canada,CAN,2019,8965590,37593384,FALSE,6.72405080927109,100,73.3010362993959,22.7075632047977,,,,,,77.1977754686306,50.6831625783662,66.6351128911428,4,3
+Canada,CAN,2020,8965590,38005238,FALSE,,57.9837336290171,62.8551737605438,,,,,,,65.5432281945678,60.4194536947805,61.7634809117924,2,2
+Switzerland,CHE,1990,39529,6715519,FALSE,0.232366481016028,72.3292732314736,69.6545399789929,,,,,,,76.5993522282796,47.4053932304942,74.4643127298766,3,2
+Switzerland,CHE,1991,39529,6799978,FALSE,0.454541340358988,53.4965430921836,65.476410545095,,,,,,,72.0200092664803,39.8091649925459,62.7582761793319,3,2
+Switzerland,CHE,1992,39529,6875364,FALSE,0.667394204480064,43.9073043009933,67.9386869214866,,,,,,,73.3924758017087,37.5044618089866,58.649890051351,3,2
+Switzerland,CHE,1993,39529,6938265,FALSE,0.818233527203829,62.297920483899,63.5756748334426,,,,,,,68.5058792047028,42.2306096148485,65.4018998443009,3,2
+Switzerland,CHE,1994,39529,6993795,FALSE,1.01875977999523,90.5016721128016,68.2663092569781,,,,,,,73.8957849726857,53.262247049925,82.1987285427437,3,2
+Switzerland,CHE,1995,39529,7040687,FALSE,1.32152047098461,96.2271920964414,79.7753223937081,11.983133965179,,,,,,85.627998756698,47.3267922315783,64.6127749394395,4,3
+Switzerland,CHE,1996,39528,7071850,FALSE,1.68523583672595,100,79.1089751706809,11.5592795325114,,,,,,85.5593148991766,48.0883726349796,65.706198143896,4,3
+Switzerland,CHE,1997,39527,7088906,FALSE,5.57972536846657,100,77.399102251969,12.0609845436633,,,,,2.01981750594775,84.1528031599763,39.4119259340093,49.5584013023968,4,4
+Switzerland,CHE,1998,39526,7110001,FALSE,9.1368629984507,100,77.7480018240182,12.2746476611289,,,,,2.02909624850753,90.3564690372179,40.2377217464211,51.1650532367136,4,4
+Switzerland,CHE,1999,39525,7143991,FALSE,12.4667460313896,100,76.9770695575887,12.163526101947,,,,,,91.2887700240991,50.4018354227313,67.8174320420154,4,3
+Switzerland,CHE,2000,39524,7184250,FALSE,17.1733319421316,100,91.1592701567997,13.2231967929405,,,,,2.15594961655253,100,44.7423497016849,53.8447866023733,4,4
+Switzerland,CHE,2001,39523,7229854,FALSE,19.963522132792,100,90.977140640168,12.524807840416,,,,,1.66488444047674,100,45.0260710107706,53.5474230702232,4,4
+Switzerland,CHE,2002,39522,7284753,FALSE,22.0784527099373,100,93.4390088749889,11.4515344562617,,,,,,100,56.742249010297,70.4838448187539,4,3
+Switzerland,CHE,2003,39521,7339001,FALSE,23.2358805744269,100,100,39.8539128415025,59.9005189715263,42.8634369842521,100,100,2.70467924353371,100,58.3797013776736,73.759765347506,7,6
+Switzerland,CHE,2004,39520,7389625,FALSE,24.0337969635199,100,100,,58.4240503583602,46.2380774433638,100,100,3.03852198522517,100,62.2183993986848,80.607704397045,6,5
+Switzerland,CHE,2005,39518,7437115,FALSE,24.6904278049314,100,100,11.8065663883102,58.0720608844613,48.9545355012893,100,100,3.1748470808628,100,55.5180538250562,69.1635689115288,7,6
+Switzerland,CHE,2006,39517,7483934,FALSE,26.4960432872456,100,100,12.7618082071867,55.3718738834245,47.3388682108456,100,14.9751995448,3.02724870184096,100,55.6605669153027,55.127376075638,7,6
+Switzerland,CHE,2007,39516,7551117,FALSE,26.7806550059748,100,100,13.589378774801,60.1781274792809,51.1311050608529,100,21.585497349893,,100,65.2501898069381,67.0349752249388,7,5
+Switzerland,CHE,2008,39516,7647675,FALSE,27.1275674465638,100,100,41.3221084048596,61.750019500165,48.4885748623588,100,48.1207962967746,,100,69.489708452297,77.8885809403268,7,5
+Switzerland,CHE,2009,39516,7743831,FALSE,27.5010815010434,100,100,38.9280850875083,59.3328433487908,51.1075793738913,100,52.9995605245351,3.05513415858379,100,60.0845543030038,65.8304632951045,7,6
+Switzerland,CHE,2010,39516,7824909,FALSE,28.0865088107734,100,100,38.0807083880811,61.6550858811222,51.7002137207148,100,56.6919688970162,1.92853831761324,100,59.9708527481689,66.1168692671184,7,6
+Switzerland,CHE,2011,39516,7912398,FALSE,28.2040207133156,100,100,42.1933875676572,64.9788823680803,52.1900771957508,100,72.6178354546181,,100,70.4312475794539,82.9622446044551,7,5
+Switzerland,CHE,2012,39516,7996861,FALSE,27.9084130169759,100,100,43.8379940695048,65.3895706453917,57.3998046946106,74.8704212004375,86.8795123717092,1.76542192732101,100,57.9688649869785,67.8922249281621,7,6
+Switzerland,CHE,2013,39516,8089346,FALSE,27.958490943011,100,100,43.9539886278755,63.4632374039569,54.4623208028866,96.3079359216698,38.1032085676501,1.71122385111338,100,60.6277085923652,63.3460594947181,7,6
+Switzerland,CHE,2014,39516,8188649,FALSE,27.9585259694256,100,100,43.0070451235004,62.4050378479131,49.4657108414788,100,43.0184536751404,1.78344121698855,100,60.3163890216276,64.6348233359382,7,6
+Switzerland,CHE,2015,39516.03,8282396,FALSE,27.6670712541956,100,100,46.0403684985282,62.630307475015,54.2223135822852,100,46.9619137175183,1.8617761026973,100,61.3987899196723,65.8106763864573,7,6
+Switzerland,CHE,2016,39516.03,8373338,FALSE,27.8845229508279,100,100,46.3338952326607,62.7626926143105,60.7312230022275,100,51.7105779211888,1.84616549613252,100,62.3994009545498,66.648439774997,7,6
+Switzerland,CHE,2017,39516.03,8451840,FALSE,27.7964412384705,100,100,48.3124659100843,62.7701940133677,44.8233675028423,97.2983141876543,55.5718396775524,1.79327729860951,100,60.0034094482373,67.1626495123168,7,6
+Switzerland,CHE,2018,39516.03,8514329,FALSE,28.2427737885556,100,100,51.7716237095119,64.3791083280568,,88.9591455101667,,,100,73.7947086016469,85.1826923049197,6,4
+Switzerland,CHE,2019,39516.03,8575280,FALSE,28.4532185315737,100,100,44.785159342579,,,,,,100,68.3095944685382,81.595053114193,4,3
+Switzerland,CHE,2020,39516.03,8636896,FALSE,,100,100,,,,,,,100,100,100,2,2
+Channel Islands,CHI,1990,198,140677,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,1991,198,141469,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,1992,198,142006,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,1993,198,142407,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,1994,198,142867,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,1995,198,143480,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,1996,198,144348,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,1997,198,145387,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,1998,198,146500,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,1999,198,147553,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2000,198,148439,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2001,198,149097,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2002,198,149591,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2003,198,150070,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2004,198,150722,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2005,198,151674,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2006,198,152999,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2007,198,154644,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2008,198,156441,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2009,198,158187,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2010,198,159718,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2011,198,160990,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2012,198,162051,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2013,198,163039,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2014,198,164107,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2015,198,165387,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2016,198,166922,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2017,198,168666,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2018,198,170496,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2019,198,172264,TRUE,,,,,,,,,,,,,0,0
+Channel Islands,CHI,2020,198,173859,TRUE,,,,,,,,,,,,,0,0
+Chile,CHL,1990,743532,13274617,FALSE,0,2.20937047753074,3.49561518874072,,,,,,,3.47917056102838,1.90166188875715,2.84427051927956,3,2
+Chile,CHL,1991,743532,13495255,FALSE,0,3.08096287431257,3.65862950196598,,,,,,,3.67369447576867,2.24653079209285,3.37732867504062,3,2
+Chile,CHL,1992,743532,13719818,FALSE,0.00697816936553332,4.26416641421847,4.22794072330021,,,,,,2.49868251528465,4.15132063347471,2.74944195554222,3.63805652099261,3,3
+Chile,CHL,1993,743532,13944934,FALSE,0.0134840733632193,4.61866763141856,4.23779795980132,,,,,,2.61541030196843,4.10141220860136,2.87133999163788,3.77849671399612,3,3
+Chile,CHL,1994,743532,14166346,FALSE,0.0260877470028589,10.8137194096171,4.79688780941501,,,,,,3.37327919213234,4.72710142355433,4.75249353954182,6.30470000843457,3,3
+Chile,CHL,1995,743532,14380864,FALSE,0.0632026859433767,11.311783309195,6.29830129195767,,,,,,4.17904174798679,6.15736517598993,5.46308225877072,7.21606341105725,3,3
+Chile,CHL,1996,743532,14587367,FALSE,0.122732959277807,17.8837361867407,6.84609348229876,,,,,,4.16440285743481,6.59154655290295,7.25424137143802,9.54656186569282,3,3
+Chile,CHL,1997,743532,14786227,FALSE,0.187271079797927,19.9747315861828,7.3402329992709,,,,,,5.24636929664031,7.12437974105545,8.18715124047297,10.7818268746262,3,3
+Chile,CHL,1998,743532,14977736,FALSE,0.290726139181588,17.8956138973734,6.91540145596729,,,,,,5.86378263754308,6.64764210394241,7.74138103251635,10.1356795462863,3,3
+Chile,CHL,1999,743532,15162801,FALSE,0.708894415669411,32.74051853648,6.40458444428987,,,,,,6.6653667994913,6.16172848086569,11.6298410489826,15.1892046056123,3,3
+Chile,CHL,2000,743532,15342350,FALSE,2.83420523627323,25.2898767976317,7.08837374485016,1.20840586928727,,,,,6.80043043702588,7.02916241660501,8.64425841701366,10.0819688801375,4,4
+Chile,CHL,2001,743532,15516112,FALSE,3.22452356706196,16.4215711285967,6.79566534094693,1.0476668934766,,,,,7.27780081053737,6.68044124882916,6.9534455481239,7.85687002035995,4,4
+Chile,CHL,2002,743532,15684413,FALSE,3.69095795557643,8.09004413268371,6.66456670682319,1.11695988063016,,,,,7.02724540081461,6.50784953506604,5.31795481530562,5.68552473729863,4,4
+Chile,CHL,2003,743532,15849649,FALSE,4.21006518259871,15.8715689589764,7.53211879485083,1.15511941719948,2.64113601598725,,10.4679085117706,,7.83924426048454,7.62185339883126,7.84600418764675,8.59113890945244,6,5
+Chile,CHL,2004,743532,16014972,FALSE,4.60890429285783,24.4883952497329,10.2728163537518,1.30854129838567,2.5806364142877,,11.9363466109561,,8.19156402932074,10.5706861222123,10.1344279725009,11.2991066621216,6,5
+Chile,CHL,2005,743532,16182713,FALSE,5.04632315764477,26.0111422308784,12.9951135273459,1.52316785242097,2.65231878590385,,10.0295839380194,,8.84894753011841,13.4050854381779,10.7423797060713,11.963585397923,6,5
+Chile,CHL,2006,743532,16354507,FALSE,5.52545978325828,26.2762857881176,16.5117115765856,1.68022265272549,2.7041696553529,1.80495178303601,4.85184546012549,1.1480210820861,8.4046116546641,17.7461057763635,9.29358409978751,10.0178487356804,7,6
+Chile,CHL,2007,743532,16530201,FALSE,5.68894071695948,48.624626600458,19.2130458438022,1.79977401692411,3.09104475249886,6.00518509375057,8.29138721890298,,,20.8298764455434,14.9371599151329,19.8864160704571,7,4
+Chile,CHL,2008,743532,16708255,FALSE,5.847804309189,72.5139823561425,20.9914102858413,4.38273865058628,2.9537752697378,5.47515113976302,7.55542128160035,2.85490921992624,,21.726824485217,19.4610846705204,21.8067751986945,7,5
+Chile,CHL,2009,743532,16886184,FALSE,6.44702145667701,54.7725805063196,16.315458777093,4.32647097530039,2.79750265135337,5.00435691135407,8.75737758093772,3.84180333062071,9.52365506217026,17.1554491969894,15.020988752836,16.3962227753897,7,6
+Chile,CHL,2010,743532,17062531,FALSE,6.90850624188476,65.4970742226643,21.2021208665802,4.49889036769879,2.98836337541974,4.89328280316721,9.08964114314481,6.33976788377675,10.069274226681,22.1786336453134,17.4512556959744,19.6122135815465,7,6
+Chile,CHL,2011,743532,17233584,FALSE,7.94186534434798,100,25.2884187680729,5.06184604264134,3.42463193441594,4.56796688168155,4.813643977819,12.3493876095659,11.2005914828551,26.0870933259698,22.6963332139168,26.5854270731418,7,6
+Chile,CHL,2012,743532,17400359,FALSE,8.28732190776788,100,25.0760148831512,5.47548794082845,3.65239435478582,4.75811381176929,4.56022433448302,18.3044136224606,12.674070735065,25.6173770453741,22.9758905161521,27.7719289463685,7,6
+Chile,CHL,2013,743532,17571511,FALSE,8.6463732384381,80.1195769023229,24.6364460411602,5.61986522345246,3.62433068791286,3.88994132124734,7.59476518553242,27.8992520193967,11.0654257009167,25.2769540024463,20.22462765901,26.2626398390113,7,6
+Chile,CHL,2014,743532,17758969,FALSE,9.01383551048078,89.7936052331559,22.9552763028266,5.77395087335272,3.73925719167144,3.61661000956879,7.51459727194749,38.8450601083557,12.115015934418,23.4221474131644,21.5404130193929,29.5773961390657,7,6
+Chile,CHL,2015,743532,17969356,FALSE,11.1706667052315,89.8452289923942,19.2527375831904,6.48174695312584,3.95162641847677,3.07015323580133,6.22229957580095,61.0977512911116,13.4401250361106,19.5460683149931,21.3547082973793,32.7722033605894,7,6
+Chile,CHL,2016,743532,18209072,FALSE,12.0203845898975,50.1504291955561,18.4246671959885,7.32438654546347,4.03701526901068,2.62306332389378,4.75384660652312,67.5882918666731,15.5894393996572,18.8465388628462,15.8408881224257,27.3754887461198,7,6
+Chile,CHL,2017,743532,18470435,FALSE,11.6756973492204,22.9176862484141,20.0968628676353,7.88302481609304,4.42323485201237,2.50322417421619,3.12438536270298,77.1857743714496,15.9703291489042,20.8538704063015,12.0244585667409,24.6558450589776,7,6
+Chile,CHL,2018,743532,18729166,FALSE,,21.2371308735654,21.8933455936727,7.26818871491914,4.68287338558861,,2.88864754893301,,,22.788472070799,13.3218281827726,13.5456098020541,5,4
+Chile,CHL,2019,743532,18952035,FALSE,,50.7415630018454,20.1593320357926,6.10200061127531,,,,,,21.2232606775831,25.6676318829711,26.0222747635679,3,3
+Chile,CHL,2020,743532,19116209,FALSE,,26.9007459883678,18.4721482950881,,,,,,,19.4027758514523,22.6864471417279,23.15176091991,2,2
+China,CHN,1990,9424670,1135185000,FALSE,0,0.166791773955192,0.183721639986355,,,,,,,0.156358406492069,0.116837804647182,0.16157509022363,3,2
+China,CHN,1991,9424670,1150780000,FALSE,0,0.20119564665285,0.214599599784772,,,,,,,0.186253401356732,0.138598415479207,0.193724524004791,3,2
+China,CHN,1992,9424670,1164970000,FALSE,0,0.570596466473069,0.27890284777809,,,,,,0.105194098545036,0.250317057734502,0.238673353199049,0.308702540917535,3,3
+China,CHN,1993,9424670,1178440000,FALSE,0.000000374948146347261,1.18780895814856,0.342145099050693,,,,,,0.113399627963919,0.303892168564895,0.410838515027828,0.535033584892456,3,3
+China,CHN,1994,9424670,1191835000,FALSE,0.00000256734693135535,1.31694725460981,0.430348324251432,,,,,,0.108954656101237,0.3852807100072,0.464063200577353,0.603727540239417,3,3
+China,CHN,1995,9424720,1204855000,FALSE,0.000010772054696826,1.37778401933655,0.529257989552939,0.511816945605428,,,,,0.131863762810719,0.488616850219478,0.510146697872067,0.627520394493044,4,4
+China,CHN,1996,9424710,1217550000,FALSE,0.0000281444138779569,1.52353059106949,0.609359894803789,0.559165766908948,,,,,0.155182422574951,0.566912477420066,0.569453363954212,0.701197814493364,4,4
+China,CHN,1997,9424710,1230075000,FALSE,0.0000689857869410197,1.7543976654798,0.430520170125002,0.619852293453032,,,,,0.149495014392792,0.401815872845999,0.590866825847514,0.731390211542907,4,4
+China,CHN,1998,9424710,1241935000,FALSE,0.000355483937855909,1.77179353988264,0.427309209668382,0.701874113408919,,,,,0.156434328373482,0.40782620605096,0.611553335054256,0.759482046929001,4,4
+China,CHN,1999,9424710,1252735000,FALSE,0.00148082732561404,1.5772291934352,0.481698525175305,0.793984581698819,,,,,0.190926787136081,0.460658138395407,0.609063982954204,0.755699675166377,4,4
+China,CHN,2000,9424700,1262645000,FALSE,0.00368430493375491,1.62241787486807,0.634911389052231,0.902126064734781,,,,,0.214668061495501,0.608906666291491,0.675561539016867,0.837029666847461,4,4
+China,CHN,2001,9424700.2,1271850000,FALSE,0.00543657747184808,1.95695816525571,0.702059204001121,0.964633555675243,,,,,0.228662459399081,0.664200873797135,0.771549992360601,0.953613763531793,4,4
+China,CHN,2002,9424700.2,1280400000,FALSE,0.00940202731695382,2.03324818056012,0.827153494959769,1.08497508178535,,,,,0.28152841849673,0.762868973998027,0.847261440623786,1.04065516371006,4,4
+China,CHN,2003,9424699.7,1288400000,FALSE,0.0126053836261735,2.25889159164146,1.56974292212055,1.05346936249031,0.187775558868761,,0.232353442778388,,0.232247232592079,1.43055031979743,0.893218322541495,1.04150238985993,6,5
+China,CHN,2004,9424700.5,1296075000,FALSE,0.0147539334612533,2.57487383250486,2.12449456819114,1.29098297447309,0.246333938995791,,0.172537416764024,,0.38682137815255,1.9222098071729,1.09407735059115,1.26948508181349,6,5
+China,CHN,2005,9424699.8,1303720000,FALSE,0.0171252275159481,3.96425165974352,2.60119568581431,1.4085158640153,0.291819864477251,0.426552927245279,0.500744263193639,100,0.441150262118645,2.41789979703419,1.33707655566381,18.1220936410176,7,6
+China,CHN,2006,9424700,1311020000,FALSE,0.0210257572524107,4.95168931830649,3.23708259213309,1.47616456528028,0.330410564832093,0.412510908930499,0.448435538328522,0.143582310972724,0.50852849023287,3.00558524191708,1.57934816720917,1.755664244173,7,6
+China,CHN,2007,9424700,1317885000,FALSE,0.0318022290876609,5.77086822133035,4.01601135611928,1.59162611318884,0.386012121706362,1.4038314323217,0.539151039405993,0.205331240787893,,3.75850283204447,2.22554839857564,2.37309588935151,7,5
+China,CHN,2008,9424700,1324655000,FALSE,0.0446910697216887,7.55820134978689,4.79688309492586,1.61139974608713,0.39631689083275,1.64403057681913,0.588129147752597,0.354619510996058,,4.49873186959729,2.70722249751555,2.92221632484399,7,5
+China,CHN,2009,9424700.5,1331260000,FALSE,0.05686565601791,5.76372079567724,4.15180623429802,1.58752898010571,0.374507933388375,1.53844400308949,0.474129416512948,0.477490853343487,0.495307053571724,3.98010348193783,2.00968601989615,2.12971343019149,7,6
+China,CHN,2010,9424700.7,1337705000,FALSE,0.0671659038878566,9.89036522127733,5.55084309718505,1.73439894793101,0.411982727706884,,0.63631679792044,0.602791622929987,0.723816619367608,5.33928782922316,3.10048443126155,3.15449617310826,6,6
+China,CHN,2011,9424700.9,1345035000,FALSE,0.0745899442249482,10.7115315674245,6.8624338629275,1.85612464038231,0.45842703675186,0.16350974017999,0.552402162949844,0.758049113810689,0.844160567113178,6.56094969271662,3.0092503550289,3.54720295739953,7,6
+China,CHN,2012,9424700.9,1354190000,FALSE,0.0818233139837182,9.91636594407657,7.32062908572441,1.93250147519658,0.501272441451066,0.604011978762906,0.420822759710951,1.02945303603073,0.95295360079187,6.95071555948493,3.03272973689243,3.53380206254861,7,6
+China,CHN,2013,9424701.3,1363240000,FALSE,0.0880051832031865,11.7076070043988,7.90627530502331,2.02370866256751,0.545490379069255,,0.558254034307774,1.69120209784003,1.09428733299627,7.60355360979797,3.89635625374948,4.1131021236514,6,6
+China,CHN,2014,9424701.3,1371860000,FALSE,0.0914620253082081,12.5077143765834,8.2597319159566,2.16886128472505,0.607878274460682,1.33787446849182,0.510051080777686,1.8361482671979,1.262010500145,7.93814801764841,3.73395795028396,4.37048892117957,7,6
+China,CHN,2015,9424701.4,1379860000,FALSE,0.0954878365497203,13.2505916967865,7.61177316112983,2.30231528568427,0.683946615947427,0.15986919168378,0.389469074614307,2.44849076966942,1.65474406324815,7.41936795256788,3.63775004424236,4.57749647376175,7,6
+China,CHN,2016,9424700.5,1387790000,FALSE,0.100416012700022,12.3624771110024,7.18042018467655,2.42241389760226,0.752803826255537,0.145551992894772,0.340462495007131,5.8259501844674,2.08655467276675,7.05000392337591,3.51975662380713,5.01464371403698,7,6
+China,CHN,2017,9424700.8,1396215000,FALSE,0.101873827678255,9.56132489574261,8.00587492404762,2.57650191709019,0.808975415652603,0.720308283591485,0.278992925952026,11.2434713719293,2.38715289505708,7.90125004871405,3.37600423845132,5.65811567574754,7,6
+China,CHN,2018,9424702.9,1402760000,FALSE,0.110548645898379,11.8308886548342,8.956001505286,2.66866264701547,0.881334903005444,,0.339400355900684,,,8.73280884633413,4.78110036178695,5.89294012602113,6,4
+China,CHN,2019,9424702.9,1407745000,FALSE,0.120147844839713,10.0968806234166,8.77983769267677,2.73552562791709,,,,,,8.5570619260824,5.43309794721254,7.12982272580536,4,3
+China,CHN,2020,9424702.9,1410929362,FALSE,0.13115162840198,3.41694381322313,8.69974618397276,,,,,,,8.48842042775034,4.08261387519929,5.95268212048674,3,2
+Cote d'Ivoire,CIV,1990,318000,11924873,FALSE,0,0.17813926282859,,,,,,,,,0.0890696314142951,0.17813926282859,2,1
+Cote d'Ivoire,CIV,1991,318000,12362404,FALSE,0,0.0657221608026841,,,,,,,,,0.0328610804013421,0.0657221608026841,2,1
+Cote d'Ivoire,CIV,1992,318000,12812428,FALSE,0,0.236382674787339,,,,,,,,,0.118191337393669,0.236382674787339,2,1
+Cote d'Ivoire,CIV,1993,318000,13271638,FALSE,0,0.578833420995788,,,,,,,,,0.289416710497894,0.578833420995788,2,1
+Cote d'Ivoire,CIV,1994,318000,13735438,FALSE,0,0.380017439215753,,,,,,,,,0.190008719607877,0.380017439215753,2,1
+Cote d'Ivoire,CIV,1995,318000,14199759,FALSE,0.0000369419365079223,0.675716910032859,,0.159381605483671,,,,,,,0.278378485817679,0.417549257758265,3,2
+Cote d'Ivoire,CIV,1996,318000,14665125,FALSE,0.00150215227435444,0.80625046433611,,0.194867354205524,,,,,,,0.334206656938663,0.500558909270817,3,2
+Cote d'Ivoire,CIV,1997,318000,15130674,FALSE,0.00325963773153053,1.34751880117172,,0.218533030809146,,,,,,,0.523103823237464,0.783025915990431,3,2
+Cote d'Ivoire,CIV,1998,318000,15589407,FALSE,0.0102455036338249,2.21969496657349,,0.23309932803933,,,,,,,0.821013266082214,1.22639714730641,3,2
+Cote d'Ivoire,CIV,1999,318000,16032573,FALSE,0.0193914845057093,0.661193264221568,,,,,,,,,0.340292374363639,0.661193264221568,2,1
+Cote d'Ivoire,CIV,2000,318000,16454660,FALSE,0.0368472656259955,0.646568491278908,,,,,,,,,0.341707878452452,0.646568491278908,2,1
+Cote d'Ivoire,CIV,2001,318000,16853027,FALSE,0.0615113953881234,0.723112697430411,,,,,,,,,0.392312046409267,0.723112697430411,2,1
+Cote d'Ivoire,CIV,2002,318000,17231539,FALSE,0.0756935305518196,0.551774383479574,,,,,,,,,0.313733957015697,0.551774383479574,2,1
+Cote d'Ivoire,CIV,2003,318000,17599613,FALSE,0.112918389289179,0.4698858232982,,,0.868581725558717,,1.02468085443052,,,,0.535828355672633,0.74728333886436,4,2
+Cote d'Ivoire,CIV,2004,318000,17970493,FALSE,0.123796177244663,0.752914469009149,,,1.18219785196499,,,,,,0.438355323126906,0.752914469009149,3,1
+Cote d'Ivoire,CIV,2005,318000,18354513,FALSE,0.148315770485354,0.922543365091594,2.05772036100492,,1.27413709364697,,,,,1.90835366391471,1.04285983219396,1.41544851450315,4,2
+Cote d'Ivoire,CIV,2006,318000,18754914,FALSE,0.212981365253424,0.895147273533487,2.14551000636634,,1.02353257297851,,,0.0120193007834875,,1.98969009751872,1.08454621505109,0.965618890611898,4,3
+Cote d'Ivoire,CIV,2007,318000,19171250,FALSE,0.245944530306271,1.05296498203942,2.25890917854207,0.113871955779767,0.899740196111448,,,0.0308577908951604,,2.10215777238904,0.917922661666882,0.824963125275847,5,4
+Cote d'Ivoire,CIV,2008,318000,19605568,FALSE,0.253857071669209,1.09348460970752,2.57992405710442,0.125568390779185,0.926519553245671,,1.10380805002863,0.0373213302466483,,2.39465942558945,1.03132843585779,0.950968361270287,6,5
+Cote d'Ivoire,CIV,2009,318000,20059147,FALSE,0.261175616547852,0.890125626619369,2.62953179784113,0.138441948872999,0.849554132026447,6.08687015427873,0.899040546763354,0.109646829368189,,2.43532245613484,1.81753094848724,0.89451548155175,7,5
+Cote d'Ivoire,CIV,2010,318000,20532944,FALSE,0.344451147139501,0.859885365128078,2.71843557654032,0.14763815663876,0.765079177435061,3.09730991785278,1.22961330246072,0.142855911556749,,2.50602261168258,1.39955557762669,0.977203069493379,7,5
+Cote d'Ivoire,CIV,2011,318000,21028652,FALSE,0.361244844579959,0.661711722335491,2.6256342279398,0.154521976980867,0.638706113875204,3.43071956996424,1.37214588830413,0.279082563473371,,2.42706058362069,1.43432970501741,0.978904546942909,7,5
+Cote d'Ivoire,CIV,2012,318000,21547188,FALSE,0.607847307633482,0.701340481496157,2.77991649925013,0.161480307430849,0.712469832356052,,0.836953132189986,0.272363731190733,,2.55192019186319,1.01750754560012,0.904811568834183,6,5
+Cote d'Ivoire,CIV,2013,318000,22087506,FALSE,1.42314666539961,0.82206495147441,2.70700613734428,0.207543832350375,0.921488307848616,,1.30636652134371,0.398602958643425,,2.48294267779282,1.29322562158248,1.04350418832095,6,5
+Cote d'Ivoire,CIV,2014,318000,22647672,FALSE,2.22930022551963,0.882259532827832,2.74641915001076,0.251185901035545,0.96910079474428,7.11686826882868,1.11479807200851,0.508086428849587,,2.52058923805977,2.39013852503849,1.05538383455625,7,5
+Cote d'Ivoire,CIV,2015,318000,23226148,FALSE,4.33532126299528,0.960823814460434,2.44681130349091,0.752232184570513,0.968655698478401,6.6457607690377,0.931742266680802,0.733799046906064,,2.26195066931141,2.67878193353927,1.12810959638584,7,5
+Cote d'Ivoire,CIV,2016,318000,23822726,FALSE,4.5310955936461,1.11664470507854,2.24890172869695,0.805768379691498,1.12759447029003,6.19226796256851,1.21121228436991,1.21490886120219,,2.10138396920686,2.68431510900858,1.2899836399098,7,5
+Cote d'Ivoire,CIV,2017,318000,24437475,FALSE,4.69924972750337,2.9632075613234,2.40803754680423,0.893333422240851,1.23307951902969,5.59012314619842,3.54222910243939,1.88899252529543,,2.27987826194021,3.34936341775161,2.31352817464786,7,5
+Cote d'Ivoire,CIV,2018,318000,25069226,FALSE,3.92323249470635,1.33835084080847,2.49723096849751,0.950739700055596,1.10026444785771,,1.72648200497166,,,2.3698761986836,2.08720720180792,1.59636218612983,6,4
+Cote d'Ivoire,CIV,2019,318000,25716554,FALSE,3.69638141494415,1.63401873735705,2.47140871898653,0.976371228756974,,,,,,2.35195048310726,2.19454502501118,1.65411348307376,4,3
+Cote d'Ivoire,CIV,2020,318000,26378275,FALSE,,,,,,,,,,,,,0,0
+Cameroon,CMR,1990,472710,11780086,FALSE,0,0.476291420732827,0.985344767628438,,,,,,,0.952367634788927,0.487212062787088,0.714329527760877,3,2
+Cameroon,CMR,1991,472710,12137912,FALSE,0,0.130135331943325,0.877476389740368,,,,,,,0.835063318208799,0.335870573894564,0.482599325076062,3,2
+Cameroon,CMR,1992,472710,12499499,FALSE,0,0.218465737705701,0.792390822932762,,,,,,,0.826842410075225,0.336952186879488,0.522654073890463,3,2
+Cameroon,CMR,1993,472710,12864091,FALSE,0,0.0928321988660519,0.64750015433503,,,,,,,0.666279565243064,0.246777451067027,0.379555882054558,3,2
+Cameroon,CMR,1994,472710,13230978,FALSE,0,0.0555260901263216,0.570944374585839,,,,,,,0.543217541150054,0.208823488237387,0.299371815638188,3,2
+Cameroon,CMR,1995,472710,13599984,FALSE,0,0.0758506342348144,0.610915700690297,,,,,,,0.589239921279305,0.228922111641704,0.33254527775706,3,2
+Cameroon,CMR,1996,472710,13970812,FALSE,,0.362949023304716,0.790017014657041,,,,,,,0.779602124398499,0.576483018980879,0.571275573851608,2,2
+Cameroon,CMR,1997,472710,14344444,FALSE,0.00123605974698607,0.663476881571734,0.786272379275458,,,,,,0.533619049602373,0.785930328038816,0.496151092549138,0.661008753070974,3,3
+Cameroon,CMR,1998,472710,14723772,FALSE,0.00235129567921583,0.569217894084799,0.739291138768243,,,,,,,0.706997410704247,0.436953442844086,0.638107652394523,3,2
+Cameroon,CMR,1999,472710,15112598,FALSE,0.0223713985227998,0.214332821406057,0.638743033968173,,,,,,0.455560450151716,0.663937967556743,0.332751926012187,0.444610413038172,3,3
+Cameroon,CMR,2000,472710,15513944,FALSE,0.0425696723317633,0.480370890828126,0.769801308708433,,,,,,0.41849825818062,0.734990445272625,0.427810032512236,0.544619864760457,3,3
+Cameroon,CMR,2001,472710,15928910,FALSE,0.0455605819072291,0.169185006431093,0.83565884407795,,,,,,,0.774841759531198,0.350134810805424,0.472013382981145,3,2
+Cameroon,CMR,2002,472710,16357605,FALSE,0.0577893837282564,1.71030626235016,0.865757017534948,,,,,,,0.804472580466695,0.87795088787112,1.25738942140843,3,2
+Cameroon,CMR,2003,472710,16800869,FALSE,0.0916182193956763,0.890867903465836,0.909453557058464,,0.6463460088705,,2.14679210777567,,,0.861802911475703,1.00968294692391,1.29982097423907,5,3
+Cameroon,CMR,2004,472710,17259322,FALSE,0.148140817445791,0.194947918658259,1.05479624196318,,0.690330517764977,,1.88079089524349,,,0.990253600484876,0.819668968327681,1.02199747146221,5,3
+Cameroon,CMR,2005,472710,17733408,FALSE,0.207192252704036,0.636311454661124,1.13330272381182,,0.849848563030443,,1.62711974925397,,,1.0635084361172,0.900981545107738,1.10897988001077,5,3
+Cameroon,CMR,2006,472710,18223677,FALSE,0.29161274596238,0.155073881869323,1.22685854558018,0.2991847334168,0.830424284115535,2.51589243971337,1.1875091829044,,,1.10985716921547,0.946021921574409,0.6879062418515,7,4
+Cameroon,CMR,2007,472710,18730283,FALSE,0.409768316087017,0.461992983984893,1.55446758507466,0.307916151728248,0.802408711837623,,0.962825093805923,,,1.41912447551152,0.739394026136148,0.787964676257646,6,4
+Cameroon,CMR,2008,472710,19252674,FALSE,0.462597151167328,0.052875870480008,1.90130743468352,0.305831651512681,0.858113180685175,3.36935595109803,1.68606063114535,0.00751264596635535,,1.70202308419433,1.29633811501448,0.750860776659744,7,5
+Cameroon,CMR,2009,472710,19789922,FALSE,0.508279080811236,1.80034695327068,1.37933435179147,0.304241920570559,0.724400459052312,,1.8225424523135,0.0118298903617087,,1.27360874610565,1.16294895175149,1.04251399252442,6,5
+Cameroon,CMR,2010,472710,20341236,FALSE,0.55374040117672,2.23647135780815,1.38825477207221,0.340747221210858,0.71579456829752,3.5098356207921,1.241201915217,0.0115062516925223,,1.24616078021402,1.54504188137951,1.01521750522851,7,5
+Cameroon,CMR,2011,472710,20906392,FALSE,0.62647826621028,1.76297461828396,1.78427561206589,0.349509617413248,0.741642834320158,3.57804477882704,1.03512761952343,0.0111922046401386,,1.61251380780108,1.52273508538731,0.954263573532373,7,5
+Cameroon,CMR,2012,472710,21485267,FALSE,0.914398704903631,1.65283503311903,1.71249023785291,0.460485746311896,0.748755123673993,,0.335746099622341,0.120806523282093,,1.57024301992016,1.01519116436196,0.828023284451102,6,5
+Cameroon,CMR,2013,472710,22077300,FALSE,1.18650380371445,1.40049683374123,1.81119818618325,0.429389834850389,0.689426073625466,,1.63371304339629,0.149774993426581,,1.6634984503481,1.29226034037712,1.05537463115252,6,5
+Cameroon,CMR,2014,472710,22681853,FALSE,1.87262187967537,1.42635016295164,1.91219540206051,0.438793957883826,0.739291310196641,4.05901365357768,0.636067484838615,0.145779990881992,,1.7549175696785,1.72417375683127,0.880381833246915,7,5
+Cameroon,CMR,2015,472710,23298376,FALSE,2.05750326885931,1.41216088734716,1.47040397057289,0.466249709841756,0.785320499042756,2.71701733529569,0.4644268721516,0.151085717782445,,1.34671538977915,1.4312936740114,0.768127715380424,7,5
+Cameroon,CMR,2016,472710,23926549,FALSE,2.25528925533869,1.2883142091085,1.30936719624469,0.503219257847887,0.875799033816677,2.26954558266445,0.452233704571934,0.468562258602264,,1.21795739695698,1.34632820096269,0.786057365417512,7,5
+Cameroon,CMR,2017,472710,24566070,FALSE,2.47413289972024,1.49316422478212,1.32308953368129,0.533102906718332,0.714750420164136,2.93850079490824,0.44046084261308,0.456361429311404,,1.23455341086357,1.53374186707055,0.8315285628577,7,5
+Cameroon,CMR,2018,472710,25216261,FALSE,3.08525349037522,1.51847462255328,1.47067447773917,0.478852507728729,0.70822154224441,,0.572138319364207,,,1.37172280368859,1.42507868355212,0.985297063333702,6,4
+Cameroon,CMR,2019,472710,25876387,FALSE,3.39122233046853,1.95035231524765,1.53435471859982,,,,,,,1.43680301193053,2.291976454772,1.69357766358909,3,2
+Cameroon,CMR,2020,472710,26545864,FALSE,,,1.17755252628264,,,,,,,1.11022136152609,1.17755252628264,1.11022136152609,1,1
+"Congo, Dem. Rep.",COD,1990,2267050,34612023,FALSE,0,0.0183231666804062,,,,,,,,,0.00916158334020311,0.0183231666804062,2,1
+"Congo, Dem. Rep.",COD,1991,2267050,35908240,FALSE,0,0.0151333964728784,,,,,,,,,0.00756669823643921,0.0151333964728784,2,1
+"Congo, Dem. Rep.",COD,1992,2267050,37333917,FALSE,0,0.000857587664334373,,,,,,,,,0.000428793832167186,0.000857587664334373,2,1
+"Congo, Dem. Rep.",COD,1993,2267050,38815835,FALSE,0,0.00876020240076832,,,,,,,,,0.00438010120038416,0.00876020240076832,2,1
+"Congo, Dem. Rep.",COD,1994,2267050,40252973,FALSE,0,0.00163438894218717,,,,,,,,,0.000817194471093584,0.00163438894218717,2,1
+"Congo, Dem. Rep.",COD,1995,2267050,41576239,FALSE,0,0.0237885060357745,,0.00877321462389001,,,,,,,0.0108539068865548,0.0162808603298322,3,2
+"Congo, Dem. Rep.",COD,1996,2267050,42757239,FALSE,0.00000662919504617355,0.0452754892849558,,0.0090589778386928,,,,,,,0.0181136987728983,0.0271672335618243,3,2
+"Congo, Dem. Rep.",COD,1997,2267050,43827191,FALSE,0.0000126238580572569,0.0615836932310928,,0.00686209250221314,,,,,,,0.0228194698637877,0.034222892866653,3,2
+"Congo, Dem. Rep.",COD,1998,2267050,44849968,FALSE,0.0000241252239864705,0.0611706274893225,,0.0264450784963746,,,,,,,0.0292132770698945,0.0438078529928486,3,2
+"Congo, Dem. Rep.",COD,1999,2267050,45919615,FALSE,0.0000575626438383881,0.0116767924771222,,0.0329380233879232,,,,,,,0.0148907928362946,0.0223074079325227,3,2
+"Congo, Dem. Rep.",COD,2000,2267050,47105830,FALSE,0.000328207141918517,0.0893742404465099,,0.0251090482353382,,,,,,,0.0382704986079222,0.0572416443409241,3,2
+"Congo, Dem. Rep.",COD,2001,2267050,48428534,FALSE,0.000620720460419794,0.0933918130515905,,0.0123431003643186,,,,,,,0.0354518779587763,0.0528674567079546,3,2
+"Congo, Dem. Rep.",COD,2002,2267050,49871670,FALSE,0.0048737768762401,0.184320879532356,,0.00536709691101392,,,,,,,0.0648539177732032,0.0948439882216848,3,2
+"Congo, Dem. Rep.",COD,2003,2267050,51425583,FALSE,0.00687219672295579,0.35367118106262,,0.00681457621983692,0.0945059319591365,,,,,,0.122452651335138,0.180242878641229,4,2
+"Congo, Dem. Rep.",COD,2004,2267050,53068869,FALSE,0.0096848478624723,0.344299930833142,,0.00678747051454188,0.103891215667269,,,,,,0.120257416403385,0.175543700673842,4,2
+"Congo, Dem. Rep.",COD,2005,2267050,54785894,FALSE,0.0113813103763326,0.154827085924996,0.253616423742896,0.0120725798626907,0.122893229612731,,,,,0.209888238242214,0.107974349976729,0.125595968009967,5,3
+"Congo, Dem. Rep.",COD,2006,2267050,56578046,FALSE,0.0137068452828352,0.212791182163956,0.258462759270762,0.0103558693077385,0.139640826605554,,,,,0.214358112355432,0.123829164006323,0.145835054609042,5,3
+"Congo, Dem. Rep.",COD,2007,2267050,58453687,FALSE,0.0165807781424047,1.36731062431598,0.517190946436685,0.00831436635520627,0.132952258483974,,,,,0.440983588301251,0.477349178812569,0.605536192990812,5,3
+"Congo, Dem. Rep.",COD,2008,2267050,60411195,FALSE,0.0190787687403432,1.29294880833437,0.623696336462607,0.00860112878605936,0.163671361723875,,,,,0.534287154754802,0.486081260580845,0.611945697291743,5,3
+"Congo, Dem. Rep.",COD,2009,2267050,62448572,FALSE,0.0234898697738311,0.195245713044199,0.41858241297457,0.00885668766336665,0.158221974567642,,0.57756281397392,,,0.380929067490963,0.244747499485977,0.290648570543112,6,4
+"Congo, Dem. Rep.",COD,2010,2267050,64563853,FALSE,0.0292117886869861,1.86777047916857,0.695371773434668,0.0137872239660116,0.158054834134316,,0.335184205685243,,,0.636932276029475,0.588265094188296,0.713418546212326,6,4
+"Congo, Dem. Rep.",COD,2011,2267050,66755151,FALSE,0.0470881423231204,1.10831644827188,0.759900856760189,0.032394616610366,0.148352766973361,,0.0540302470036701,,,0.697155397302844,0.400346062193844,0.472974177297189,6,4
+"Congo, Dem. Rep.",COD,2012,2267050,69020749,FALSE,0.0637579918336686,2.1046922423616,0.664420390909116,0.0279394791117884,0.142773053693283,,0.156770131426593,,,0.601293781477462,0.603516047128553,0.722673908594361,6,4
+"Congo, Dem. Rep.",COD,2013,2267050,71358804,FALSE,0.0807588660491548,1.28964062869005,0.820200615014626,0.0310621376289531,0.138196196214217,,0.101089062459547,,,0.798544681490604,0.464550261968467,0.555084127567289,6,4
+"Congo, Dem. Rep.",COD,2014,2267050,73767445,FALSE,0.106529921535489,1.09587403450956,0.894243909472948,0.0535495681232451,0.126203505302885,,0.0488941605242976,,,0.792877122602062,0.439818318833109,0.497798721439792,6,4
+"Congo, Dem. Rep.",COD,2015,2267050,76244532,FALSE,0.130553924449027,0.962667394684503,0.698920713450199,0.111670273913189,0.137818242126713,,0.141916955984357,,,0.636176603345111,0.409145852496255,0.46310780698179,6,4
+"Congo, Dem. Rep.",COD,2016,2267050,78789130,FALSE,0.206461260773857,0.670617581001738,0.768080955105346,0.118038708782507,0.143004001754739,,0,,,0.67618698893532,0.352639701132689,0.366210819679891,6,4
+"Congo, Dem. Rep.",COD,2017,2267050,81398765,FALSE,0.277395718428305,0.722124948551822,0.696679358132873,,0.130038957545164,,0.0886204427621794,,,0.625034081377859,0.446205116968795,0.478593157563953,5,3
+"Congo, Dem. Rep.",COD,2018,2267050,84068092,FALSE,0.364560628997285,0.843495865992296,0.936337843463808,,0.127590882430412,,0,,,0.852863814904579,0.536098584613347,0.565453226965625,5,3
+"Congo, Dem. Rep.",COD,2019,2267050,86790568,FALSE,0.377270264346941,0.747070606803241,0.855832555206815,,,,,,,0.774324075288054,0.660057808785666,0.760697341045647,3,2
+"Congo, Dem. Rep.",COD,2020,2267050,89561404,FALSE,,,0.731564330724346,,,,,,,0.666093200901798,0.731564330724346,0.666093200901798,1,1
+"Congo, Rep.",COG,1990,341500,2356740,FALSE,0,0.490273557078684,2.80559676622082,,,,,,,2.88323892902361,1.09862344109983,1.68675624305115,3,2
+"Congo, Rep.",COG,1991,341500,2422312,FALSE,0,0.616745572487051,2.44725409198679,,,,,,,2.49699814655566,1.02133322149128,1.55687185952136,3,2
+"Congo, Rep.",COG,1992,341500,2489945,FALSE,0,0.0695248683483045,2.31413667332172,,,,,,,2.34639400523682,0.794553847223342,1.20795943679256,3,2
+"Congo, Rep.",COG,1993,341500,2559880,FALSE,0,4.92038210884434,2.34464563607222,,,,,,,2.36737459485856,2.42167591497219,3.64387835185145,3,2
+"Congo, Rep.",COG,1994,341500,2632345,FALSE,0,0.0650135199089483,2.38357588552189,,,,,,,2.30936983350413,0.816196468476948,1.18719167670654,3,2
+"Congo, Rep.",COG,1995,341500,2707532,FALSE,0,1.99894745577173,2.39260870986003,,,,,,,2.6389053381595,1.46385205521059,2.31892639696561,3,2
+"Congo, Rep.",COG,1996,341500,2785815,FALSE,0.0033162788566198,1.14881876202234,2.80203740493944,,,,,,,3.14276285964972,1.31805748193947,2.14579081083603,3,2
+"Congo, Rep.",COG,1997,341500,2867283,FALSE,0.00316928907736535,2.66273710361827,2.62732602549044,,,,,,,2.68126653746291,1.76441080606203,2.67200182054059,3,2
+"Congo, Rep.",COG,1998,341500,2951651,FALSE,0.00303081188495455,5.65009020995857,2.34027677454063,,,,,,,2.26177725511832,2.66446593212805,3.95593373253844,3,2
+"Congo, Rep.",COG,1999,341500,3038432,FALSE,0.0144758275812625,9.46121956873495,2.42850794764209,,,,,,,2.53078104206229,3.96806778131943,5.99600030539862,3,2
+"Congo, Rep.",COG,2000,341500,3127420,FALSE,0.0220743278809368,5.01856604263042,2.9189015925549,,,,,,,3.10686299791657,2.65318065435542,4.0627145202735,3,2
+"Congo, Rep.",COG,2001,341500,3217930,FALSE,0.0262308748206407,4.66218878127625,2.7686032256729,,,,,,,2.87769457645107,2.48567429392326,3.76994167886366,3,2
+"Congo, Rep.",COG,2002,341500,3310376,FALSE,0.124430569665192,4.33218019353034,2.93800785932565,,,,,,,3.11754611028131,2.46487287417373,3.72486315190583,3,2
+"Congo, Rep.",COG,2003,341500,3406915,FALSE,0.353691824465134,4.13760431679605,3.1844338907988,,1.89723537119387,,,,,3.15211508372815,2.55857667735333,3.6448597002621,4,2
+"Congo, Rep.",COG,2004,341500,3510468,FALSE,0.804024608659196,2.37206734354525,3.83229492873458,,2.12050395093066,,5.13720292749756,,,3.93066551485277,3.03639745210915,3.81331192863186,5,3
+"Congo, Rep.",COG,2005,341500,3622775,FALSE,1.05813903460004,13.1767762908942,5.09707964082683,,2.24820792699426,,,,,5.39323554801163,6.44399832210701,9.28500591945289,4,2
+"Congo, Rep.",COG,2006,341500,3745143,FALSE,1.40445636858942,17.4222468257557,6.91455324492978,,2.04443626382652,,5.77835980729809,,,7.05555712583134,7.87990406164324,10.0853879196284,5,3
+"Congo, Rep.",COG,2007,341500,3876123,FALSE,1.86500545289676,16.6064982242855,7.71272673122681,,2.15740274889703,,4.65258364775485,,,7.55216924298654,7.70920351404097,9.60375037167562,5,3
+"Congo, Rep.",COG,2008,341500,4011487,FALSE,2.79972155543543,22.2152717598627,8.56469516634059,,2.13463529472711,,,,,8.28141314973003,11.1932294938796,15.2483424547964,4,2
+"Congo, Rep.",COG,2009,341500,4145400,FALSE,2.84355193505699,13.4773182956122,7.62439581818775,,2.27078840359186,,2.6102165995783,,,7.08646258668683,6.63887066210881,7.72466582729244,5,3
+"Congo, Rep.",COG,2010,341500,4273738,FALSE,3.0646240393942,21.6851228256609,9.18868607015425,0.564197685436107,2.34477118160311,,4.21972205279933,,,8.52876576742302,7.74447053468897,8.74945208282985,6,4
+"Congo, Rep.",COG,2011,341500,4394842,FALSE,3.33779649835356,3.97307588783371,10.687493190896,0.617714148077563,2.28400351888641,,3.28275491796729,,,10.1696420233249,4.37976692862563,4.51079674430087,6,4
+"Congo, Rep.",COG,2012,341500,4510197,FALSE,3.54671109520426,2.81715094746822,9.21199924561321,1.12979289505743,2.36194284621758,,0.79969839394982,,,8.57170447283687,3.50107051545859,3.32958667732808,6,4
+"Congo, Rep.",COG,2013,341500,4622757,FALSE,3.73988255947515,29.9878432364714,8.70183728246226,1.37817339444116,2.52336751442883,,3.12090581209205,,,7.88720959577406,9.3857284569884,10.5935330096947,6,4
+"Congo, Rep.",COG,2014,341500,4736965,FALSE,3.93173753715822,38.2997940861595,9.486831170234,0.585817856891339,2.20271521822133,,1.52283046097968,,,8.21555167283778,10.7654022222845,12.1559985192171,6,4
+"Congo, Rep.",COG,2015,341500,4856093,FALSE,4.10821902131241,43.5992705782532,7.22817701494747,0.558903167988295,2.41968227911163,,2.97094581779822,,,6.39585458286675,11.6931031200599,13.3812435367266,6,4
+"Congo, Rep.",COG,2016,341500,4980996,FALSE,4.2712911551023,10.9846620474782,5.73421712520843,0.518024244287093,2.20492425073981,,0,,,5.1854814735933,4.3016389144152,4.17204194133964,6,4
+"Congo, Rep.",COG,2017,341500,5110701,FALSE,4.43354098943949,38.2910565328264,,0.357468514882442,1.54843408287244,,0,,,,10.7705165092871,12.8828416825696,5,3
+"Congo, Rep.",COG,2018,341500,5244363,FALSE,,36.2026697240452,,0.36453543879873,1.41730605407196,,0,,,,12.1890683876147,12.1890683876147,4,3
+"Congo, Rep.",COG,2019,341500,5380504,FALSE,,27.6231589616794,,,,,,,,,27.6231589616794,27.6231589616794,1,1
+"Congo, Rep.",COG,2020,341500,5518092,FALSE,,,,,,,,,,,,,0,0
+Colombia,COL,1990,1109500,33102569,FALSE,0,0.683671105030384,1.0975802166941,,,,,,,1.13930147872603,0.593750440574828,0.911486291878204,3,2
+Colombia,COL,1991,1109500,33758328,FALSE,0,0.625178325744411,1.06999978199135,,,,,,,1.10332317426738,0.565059369245253,0.864250750005898,3,2
+Colombia,COL,1992,1109500,34422568,FALSE,0,0.99217009107292,1.17820375211924,,,,,,0.887055370118989,1.19764225715616,0.764357303327788,1.02562257278269,3,3
+Colombia,COL,1993,1109500,35091272,FALSE,0,1.49870278716207,1.43438072722726,,,,,,0.821856559007079,1.41767061116008,0.938735018349104,1.24607665244308,3,3
+Colombia,COL,1994,1109500,35758978,FALSE,0.00785089579493789,1.95686087554945,1.61831415677821,,,,,,0.940299489103051,1.57300014160371,1.13083135430641,1.4900535020854,3,3
+Colombia,COL,1995,1109500,36421438,FALSE,0.0135245844350022,1.47463751515794,1.83920805264577,0.829058134076176,,,,,1.06279474251812,1.76847477432096,1.0438446057666,1.2837412915183,4,4
+Colombia,COL,1996,1109500,37076387,FALSE,0.0233160520756346,4.06883655683386,1.89142609129359,0.548993361248676,,,,,1.07410445130568,1.84220342843109,1.52133530255149,1.88353444945483,4,4
+Colombia,COL,1997,1109500,37723803,FALSE,0.0382272920035712,7.40788898769886,2.05036255751541,0.587528130129441,,,,,1.33400191366301,2.01565529853486,2.28360177620206,2.83626858250654,4,4
+Colombia,COL,1998,1109500,38364307,FALSE,0.0768976369811938,4.1439914347134,1.89891095633219,0.6052432304435,,,,,1.3529018867532,1.84763702089173,1.6155890290447,1.98744339320046,4,4
+Colombia,COL,1999,1109500,38999468,FALSE,0.11403160506054,1.82573452095499,1.65625806521828,0.566393721067172,,,,,1.59450722335209,1.61050561603971,1.15138502713061,1.39928527035349,4,4
+Colombia,COL,2000,1109500,39629965,FALSE,0.145914552750381,3.05653078230467,1.81097312174841,0.593837130950135,,,,,1.81172243211902,1.79746345649937,1.48379560397452,1.8148884504683,4,4
+Colombia,COL,2001,1109500,40255956,FALSE,0.185724563628577,2.78702044887321,1.83102906956242,0.653081541962554,,,,,1.69844706573432,1.81193511141726,1.43106053795222,1.73762104199684,4,4
+Colombia,COL,2002,1109500,40875363,FALSE,0.294789019875926,3.20881642910331,1.72761589787496,0.574510934194815,,,,,1.40103304677122,1.70834670518938,1.44135306556405,1.72317677881468,4,4
+Colombia,COL,2003,1109500,41483872,FALSE,0.466570193762771,2.81037596385339,1.85688452496626,0.53882864195684,1.09721775439746,,1.30416850817251,,1.45540212912113,1.83249617495368,1.40537166030548,1.58825428361151,6,5
+Colombia,COL,2004,1109500,42075953,FALSE,0.567693077875766,3.44827518232403,2.24767098680626,0.646711954680251,1.14111017856373,,1.88586436867017,,1.34023026635804,2.22816222137473,1.68940763945242,1.90984879868145,6,5
+Colombia,COL,2005,1109500,42647731,FALSE,0.676080705986584,15.4578507286189,2.79986775513831,0.720341984767199,1.19210811797983,,3.12915826635654,,1.50389912361177,2.80362654669445,4.04786642741322,4.72297533000978,6,5
+Colombia,COL,2006,1109500,43200901,FALSE,0.930240095622155,8.14053900508196,3.30429541749184,0.587935445562244,1.30368374515071,,1.83675661163966,0.433482547736127,1.59450476935512,3.31033201691373,2.73237855745883,2.65059173271481,6,6
+Colombia,COL,2007,1109500,43737512,FALSE,1.305622160861,10.1928061741937,4.0390269030197,1.22313294225432,1.37727458490621,,2.2265447341181,0.871672290976549,,4.08297345047659,3.79742658288936,3.71942591840385,6,5
+Colombia,COL,2008,1109500,44254972,FALSE,1.51528034160562,13.5271685304577,4.89283642683127,1.25767510472873,1.58396833216844,,2.11901003416587,1.66686862416213,,4.91030312861122,4.66239408755784,4.69620508442513,6,5
+Colombia,COL,2009,1109500,44750054,FALSE,1.75607388713397,11.3096467631142,4.26081421944959,1.29369411775872,1.72844361030527,,2.49856047584247,2.20130623758105,2.60460604682698,4.27366630413122,3.95389925168765,4.03024665754244,6,6
+Colombia,COL,2010,1109500,45222699,FALSE,2.11422634358841,11.5534334764177,5.08869404660652,1.08459869119146,1.96478060980561,10.8072922376121,3.3497665958966,2.80929937981105,2.86877643479944,5.13689473706869,5.26668397515889,4.46712821919749,7,6
+Colombia,COL,2011,1109500,45662747,FALSE,2.31476258987945,22.1557233588792,6.800230797841,1.29627301929737,2.20493730416369,9.99913752438316,1.89570581759208,2.96541186814164,3.04788748698409,6.92593938664785,6.78710294212234,6.38115682292371,7,6
+Colombia,COL,2012,1109500,46075721,FALSE,2.78459305032468,14.8934543817057,7.30191799752519,1.47578933135392,2.18462325920257,10.4326877465262,2.27011361627139,6.62214326716248,3.55822414960249,7.42488739875906,6.10239718190136,6.04076869080917,7,6
+Colombia,COL,2013,1109500,46495492,FALSE,2.9126935187846,22.5094202642307,7.26769233468728,1.61843172538641,2.35825121131243,16.1045684002083,3.33564130870545,16.141265234153,4.57080214400441,7.33917859823499,8.33132138514389,9.25245654578583,7,6
+Colombia,COL,2014,1109500,46967706,FALSE,2.93193084282509,18.7394243523995,7.33855064829737,1.75138350994328,2.60459383829244,15.8093084447668,2.84134592394187,42.197639130275,4.51413630439818,7.35689908524991,7.70372571808173,12.9001380510346,7,6
+Colombia,COL,2015,1109500,47520667,FALSE,3.0816478180035,14.6178806682973,5.71660146474007,1.84755680671514,2.79023066362537,10.3983870582223,3.64317845686531,44.9210633802195,5.07928117173507,5.64497114361134,6.34064763493982,12.6256552712406,7,6
+Colombia,COL,2016,1109500,48175048,FALSE,3.16112574816481,16.7290492718272,4.93381124357526,1.88220356762029,2.82124339118573,8.19889170592075,2.24605731412907,66.9675346500285,5.49295757793832,4.97968856281037,6.09201377559653,16.3829151573923,7,6
+Colombia,COL,2017,1109500,48909844,FALSE,3.33447217601668,15.5945780569907,5.28379962201099,2.00367433215702,2.77206044154844,6.62348785407686,2.06482613856475,72.0091835195392,5.93377769043522,5.44499313353735,5.8340879814646,17.175172145204,7,6
+Colombia,COL,2018,1109500,49661056,FALSE,3.38248474383231,14.5060419295907,5.71871284683255,2.14286307802769,2.82264140629398,,2.46936166859014,,,6.0094163875333,5.64389285337468,6.28192076593546,6,4
+Colombia,COL,2019,1109500,50339443,FALSE,3.38272076362986,14.9364073228985,5.58503521207077,2.17236538889899,,,,,,5.87358294764402,6.51913217187452,7.66078521981382,4,3
+Colombia,COL,2020,1109500,50882884,FALSE,,1.48319507587422,4.21715863650246,,,,,,,4.27472657677926,2.85017685618834,2.87896082632674,2,2
+Comoros,COM,1990,1861,411598,TRUE,0,0.159291491583696,0.6905488700523,,,,,,,0.629788628222043,0.283280120545332,0.394540059902869,3,2
+Comoros,COM,1991,1861,423873,TRUE,0,0.259318106117027,0.80890018928185,,,,,,,0.727299175264695,0.356072765132959,0.493308640690861,3,2
+Comoros,COM,1992,1861,436454,TRUE,0,0.145406128229049,0.844840454120177,,,,,,,0.740717337328841,0.330082194116409,0.443061732778945,3,2
+Comoros,COM,1993,1861,449270,TRUE,0,0.0186171579553002,0.780741569125439,,,,,,,0.691462272198358,0.266452909026913,0.355039715076829,3,2
+Comoros,COM,1994,1861,462280,TRUE,0,0.0168607289555295,0.643157971268423,,,,,,,0.573765013741745,0.220006233407984,0.295312871348637,3,2
+Comoros,COM,1995,1861,475394,TRUE,0,0.0820660808663951,0.721158096685089,0.586276220336141,,,,,,0.643511334807996,0.347375099471906,0.437284545336844,4,3
+Comoros,COM,1996,1861,488625,TRUE,,0.0457776733202171,,0.595223185372151,,,,,,,0.320500429346184,0.320500429346184,2,2
+Comoros,COM,1997,1861,501955,TRUE,0,0.00174752917083155,,0.627780331225992,,,,,,,0.209842620132275,0.314763930198412,3,2
+Comoros,COM,1998,1861,515382,TRUE,0.192482954600544,0.0326968461947129,,0.63495799772299,,,,,,,0.286712599506082,0.333827421958851,3,2
+Comoros,COM,1999,1861,528853,TRUE,0.733871089407989,0.022474681276274,,0.549836092417315,,,,,,,0.435393954367193,0.286155386846794,3,2
+Comoros,COM,2000,1861,542358,TRUE,1.31245247012781,0.00757210380805116,,0.536108696895775,,,,,,,0.618711090277212,0.271840400351913,3,2
+Comoros,COM,2001,1861,555895,TRUE,2.08782011093723,0.090410497198899,,0.42249444389872,,,,,,,0.866908350678284,0.25645247054881,3,2
+Comoros,COM,2002,1861,569480,TRUE,2.55227583039316,0.0331494784824919,,0.40171529547651,,,,,,,0.995713534784053,0.217432386979501,3,2
+Comoros,COM,2003,1861,583213,TRUE,3.809611800558,0.0596538774212264,0.632253427504276,0.427631773284094,2.62042735887662,,,,,0.580293030102344,1.2322877196919,0.355859560269221,5,3
+Comoros,COM,2004,1861,597230,TRUE,5.82172203797151,0.0493911214119422,0.678090353224686,0.472480478271795,4.79977863249049,,,,,0.613624017046487,1.75542099771998,0.378498538910075,5,3
+Comoros,COM,2005,1861,611625,TRUE,8.56564085043775,0.04007573791971,0.735552127565802,0.512966762189522,9.34361998444709,,,,,0.659205426812922,2.4635588695282,0.404082642307385,5,3
+Comoros,COM,2006,1861,626427,TRUE,9.19956530236387,0.0545007978167854,0.796153243682401,0.551231802478119,8.04281870080649,,,0.00808971228053195,,0.71190682823739,2.65036278658529,0.331432285203207,5,4
+Comoros,COM,2007,1861,641624,TRUE,10.2064450619619,0.525793147784736,0.95439404865434,0.286330520364752,6.26686901835411,,,0.00789547536637913,,0.851980734437037,2.99324069469143,0.417999969488226,5,4
+Comoros,COM,2008,1861,657227,TRUE,11.9569648351688,0.310349035609124,1.17973088495792,0.272104888084935,6.27467942376116,,,0.0110553024051956,,1.06094702946796,3.42978741095519,0.413614063891803,5,4
+Comoros,COM,2009,1861,673251,TRUE,13.6177742758804,0.901582963029751,1.15733945602011,0.202440892750677,5.0002821416126,,0,0.0162398267357838,,1.02374494202751,3.17582751753618,0.428801724908743,6,5
+Comoros,COM,2010,1861,689696,TRUE,19.369908216272,0.531017880356516,1.22175148889863,0.268033268294623,4.03160470397835,1.03082583876041,0,0.176524169594326,,1.07856966144334,3.73692278209703,0.410828995937761,7,5
+Comoros,COM,2011,1861,706578,TRUE,20.3900209660642,1.43501898628364,1.3561898708944,0.321768843725966,4.81636917219439,1.21883078557175,0,0.172303891199515,,1.1989220391148,4.12030490875666,0.625602752064784,7,5
+Comoros,COM,2012,1861,723865,TRUE,21.623050468354,0.628634216031323,1.33634764027988,0.381178122905511,4.69790919998279,1.37128916060715,0,0.314179297438808,,1.18338628285807,4.22341660136298,0.501475583846742,7,5
+Comoros,COM,2013,1861,741511,TRUE,22.962060275214,0.250294203458192,,0.357328075495213,3.75304078490832,,0,0.395774201302186,,,5.89242063854185,0.250849120063898,5,4
+Comoros,COM,2014,1861,759390,TRUE,24.0771812865194,0.270559652248545,1.4290225191405,0.363278255805195,4.18430532483169,,0,0.600996858648564,,1.26425614095764,5.22800834274273,0.499818181531988,6,5
+Comoros,COM,2015,1861,777435,TRUE,25.1328077395143,0.278504250367056,1.09568126623227,0.367313064237613,5.10236228278642,14.3804104656237,0,0.660675025748443,,0.965402560340313,6.87578613099582,0.454378980138685,7,5
+Comoros,COM,2016,1861,795597,TRUE,26.136697436201,0.196794455417285,1.10572082860784,0.407755553081774,6.60023227341079,12.3306558322164,4.53344758376075,0.734143865635103,,0.980678049414728,7.4518452815475,1.37056390146193,7,5
+Comoros,COM,2017,1861,813890,TRUE,27.2867314812818,0.21121326511756,1.25065996181296,0.416469143236388,11.4240927318237,15.0423021467888,0,1.08192683385846,,1.10883570957234,7.36789599970624,0.56368899035695,7,5
+Comoros,COM,2018,1861,832322,TRUE,,0.298903310967651,1.43010134897198,0.522516747035685,8.32916017225567,,0,,,1.26733849240468,0.56288035174383,0.522189637602005,5,4
+Comoros,COM,2019,1861,850891,TRUE,,0.189549048406938,1.37085065735672,0.642428218964203,,,,,,1.21670744622816,0.734275974909287,0.682894904533101,3,3
+Comoros,COM,2020,1861,869595,TRUE,,,1.10946707282286,,,,,,,0.98834326652928,1.10946707282286,0.98834326652928,1,1
+Cabo Verde,CPV,1990,4030,337953,TRUE,0,0.0738850816488883,1.43526618633588,,,,,,,1.30903463874182,0.503050422661588,0.691459860195353,3,2
+Cabo Verde,CPV,1991,4030,346229,TRUE,0,0.289973545934988,1.34211931883695,,,,,,,1.22573560585732,0.54403095492398,0.757854575896154,3,2
+Cabo Verde,CPV,1992,4030,355763,TRUE,0,0.203942139185458,1.62510676787768,,,,,,,1.46935423923349,0.609682969021046,0.836648189209476,3,2
+Cabo Verde,CPV,1993,4030,366057,TRUE,0,0.516195305423874,1.48545831864821,,,,,,,1.33710179123653,0.667217874690695,0.926648548330204,3,2
+Cabo Verde,CPV,1994,4030,376409,TRUE,0,0.296382941115121,1.83229596271505,,,,,,,1.64019622657791,0.709559634610057,0.968289583846517,3,2
+Cabo Verde,CPV,1995,4030,386288,TRUE,0,3.03769604368363,2.32724375331916,0.879088892933728,,,,,,2.08209230917319,1.56100717248413,1.99962574859685,4,3
+Cabo Verde,CPV,1996,4030,395533,TRUE,,3.19256969774524,2.28008780373789,1.13492348655459,,,,,,2.03830948313708,2.20252699601257,2.12193422247897,3,3
+Cabo Verde,CPV,1997,4030,404248,TRUE,1.56144410693606,1.26141190461428,2.48514621550957,1.35083093336913,,,,,,2.23232666267737,1.66470829010726,1.61485650022026,4,3
+Cabo Verde,CPV,1998,4030,412513,TRUE,3.00189307702374,0.9611279068327,2.4042160183864,1.52987762627592,,,,,,2.14586361592614,1.97427865712969,1.54562304967825,4,3
+Cabo Verde,CPV,1999,4030,420456,TRUE,7.22679877639027,5.66953936690747,2.6883224133682,1.93433381911522,,,,,,2.40273654286147,4.37974859394529,3.33553657629472,4,3
+Cabo Verde,CPV,2000,4030,428178,TRUE,11.1492306915035,3.64640269148318,2.60300051890327,3.26124438869636,,,,,,2.38186951953118,5.16496957264658,3.09650553323691,4,3
+Cabo Verde,CPV,2001,4030,435701,TRUE,16.1445015030398,0.949327402798909,2.76105447842903,3.73465610525172,,,,,,2.50222123589659,5.89738487237986,2.39540158131574,4,3
+Cabo Verde,CPV,2002,4030,442955,TRUE,20.808692067091,1.46432133610419,3.23132772961396,3.45407362095566,,,,,,2.93375219815014,7.23960368844121,2.61738238507,4,3
+Cabo Verde,CPV,2003,4030,449925,TRUE,25.1796432030816,3.90549496531578,4.18837178294413,4.04854160665504,13.4923797402526,,,,,3.86840042517468,9.33051288949914,3.94081233238183,5,3
+Cabo Verde,CPV,2004,4030,456619,TRUE,30.5124720109549,6.49677400497851,4.82231464998811,4.17539802669163,12.5269169173539,,,,,4.4598254122536,11.5017396731533,5.04399914797458,5,3
+Cabo Verde,CPV,2005,4030,463034,TRUE,34.362379336389,7.62710020159825,5.16587098129396,5.19318903848465,12.52273404915,,,,,4.83916409848653,13.0871348894415,5.88648444618981,5,3
+Cabo Verde,CPV,2006,4030,469171,TRUE,38.0155774698815,12.3197833268069,6.54130872905531,6.26450568728139,10.4780983831268,3.2927519126509,,0.106255400227806,,6.06864614402202,13.2867854251352,6.18979763958454,6,4
+Cabo Verde,CPV,2007,4030,475067,TRUE,45.6729871928539,17.7364431832035,8.10398582503231,6.82601574059661,10.2138792054969,24.3119341797823,,0.104935298806037,,7.4645928111914,20.5302732242937,8.03299675844938,6,4
+Cabo Verde,CPV,2008,4030,480846,TRUE,76.2670805123531,19.4953273468705,9.48474417455932,7.19870747508539,14.3832813769241,24.4096132364785,,0.236455107433418,,8.74756997414082,27.3710945490694,8.91951497588254,6,4
+Cabo Verde,CPV,2009,4030,486667,TRUE,100,11.5265150475854,8.09565077499604,7.16250979487928,12.7405213583649,26.6330377175861,14.822444494068,0.467362157798672,,7.46011042756044,28.0400263048525,8.28778838437837,7,5
+Cabo Verde,CPV,2010,4030,492644,TRUE,100,10.3488110243039,8.52341299769403,8.28386926365839,12.1182215529114,25.6406887753943,0,0.692591340978976,,7.90993722544912,25.4661303435084,5.44704177087807,7,5
+Cabo Verde,CPV,2011,4030,498858,TRUE,100,9.11325294057024,10.4219323982879,10.4210050633978,13.7606895127646,25.8732168612238,14.4602163232715,1.36803651104804,,9.53895307654213,28.3816039311252,8.98029278296595,7,5
+Cabo Verde,CPV,2012,4030,505241,TRUE,100,12.0722829009536,9.39353572614188,11.5877022790486,16.3570060052043,33.826360679517,0,1.57589574495294,,8.63038089148577,27.8133135976102,6.77325236328818,7,5
+Cabo Verde,CPV,2013,4030,511740,TRUE,100,10.4620742412338,9.4179812465201,11.9390315285156,16.4845379039455,,0,3.11187257615784,,8.61637483053643,26.3638174032539,6.82587063528874,6,5
+Cabo Verde,CPV,2014,4030,518276,TRUE,100,16.33590967544,9.90098367562701,11.5774970465236,16.4658016729105,32.6361221528708,20.8776634300872,3.53991000185268,,9.1487725650605,31.8880293300914,12.2959505437928,7,5
+Cabo Verde,CPV,2015,4030,524740,TRUE,100,9.36032684920569,7.18128539040308,12.0367732886364,17.3653432850135,27.3976953022595,6.87349410621888,5.24450900442483,,6.61366082011804,27.1415958227873,8.02575281372077,7,5
+Cabo Verde,CPV,2016,4030,531140,TRUE,100,11.07667471512,7.77896540117595,13.6756937246132,20.9726019930849,23.777562987264,0,7.97237445986521,,7.23055368188562,26.0514828046955,7.99105931629681,7,5
+Cabo Verde,CPV,2017,4030,537499,TRUE,100,10.4115935522579,8.85319682542516,15.0959460332612,20.4827590230796,20.122933304868,0,5.32345331256805,,8.215700750948,25.7472782859687,7.80933872980703,7,5
+Cabo Verde,CPV,2018,4030,543764,TRUE,100,10.7221549894008,10.2002654889216,15.8603017048515,22.1174653300407,,6.63301965061552,,,9.37068548783745,28.6831483667579,10.6465404581763,6,4
+Cabo Verde,CPV,2019,4030,549936,TRUE,100,9.28337791713997,10.047095159618,16.7425922078422,,,,,,9.22178572785112,34.0182663211501,11.7492519509444,4,3
+Cabo Verde,CPV,2020,4030,555988,TRUE,,0.888310935599987,6.16823451979954,,,,,,,5.73277325717393,3.52827272769976,3.31054209638696,2,2
+Costa Rica,CRI,1990,51060,3119436,FALSE,0,2.31426439609445,3.304766720232,,,,,,,3.21525127845885,1.87301037210882,2.76475783727665,3,2
+Costa Rica,CRI,1991,51060,3202083,FALSE,0,2.52025486081769,3.30334647911604,,,,,,,3.14143513316389,1.94120044664458,2.83084499699079,3,2
+Costa Rica,CRI,1992,51060,3286525,FALSE,0.000887360545986795,3.07471422763055,4.01264228310813,,,,,,6.25789858715913,3.77613071238835,3.33653561461095,4.36958117572601,3,3
+Costa Rica,CRI,1993,51060,3372298,FALSE,0.0633138512308689,3.23841591447794,4.51821601308204,,,,,,4.86851435985521,4.22415579513839,3.17211503466151,4.11036202315718,3,3
+Costa Rica,CRI,1994,51060,3458829,FALSE,0.211986528506628,3.83326001075505,4.79235101711176,,,,,,6.56795176812297,4.45092834602504,3.8513873311241,4.95071337496769,3,3
+Costa Rica,CRI,1995,51060,3545524,FALSE,0.307958932524268,4.23557668898986,5.1858422243731,4.09980445098508,,,,,7.46850742646182,4.8371833095695,4.25953794466683,5.16026796900157,4,4
+Costa Rica,CRI,1996,51060,3632361,FALSE,0.606528957597216,5.22392446647368,5.53065088814832,4.0887113998724,,,,,7.32690272557525,5.10309672202695,4.55534368753337,5.43565882848707,4,4
+Costa Rica,CRI,1997,51060,3718952,FALSE,1.15530583060008,4.89567193624258,5.8075056773177,4.24826425287035,,,,,6.97233055870709,5.424983953223,4.61581565114756,5.38531267526076,4,4
+Costa Rica,CRI,1998,51060,3803893,FALSE,1.83615201199318,7.15715895543596,6.74969067079548,4.77930569637607,,,,,7.47584230328121,6.3614168591849,5.59962992757638,6.44343095356954,4,4
+Costa Rica,CRI,1999,51060,3885428,FALSE,2.63221885760615,7.0491033806517,7.05340955863188,5.0635471882318,,,,,7.38863771816174,7.3724951604583,5.83738334065665,6.71844586187588,4,4
+Costa Rica,CRI,2000,51060,3962369,FALSE,3.83448564119871,9.19621575538343,7.90794613666633,5.08476283605165,,,,,8.00886398637915,7.64864416912395,6.80645487113585,7.48462168673454,4,4
+Costa Rica,CRI,2001,51060,4034074,FALSE,6.20734093375083,7.50472811613052,7.72085846399319,5.06060561584602,,,,,7.22025959585393,7.38676658136377,6.7427585451149,6.79308997729856,4,4
+Costa Rica,CRI,2002,51060,4100922,FALSE,12.7079143385379,9.14960996005147,7.83234277448591,5.03141090330108,,,,,5.84824244497557,7.42037454906355,8.11390408427039,6.86240946434792,4,4
+Costa Rica,CRI,2003,51060,4164053,FALSE,12.7912632687894,9.76045165549409,8.33534325236758,5.50356787647028,8.90879999939017,,11.2602709103042,,5.39232546191788,7.85425061929932,8.84053707089057,7.95417330469715,6,5
+Costa Rica,CRI,2004,51060,4225156,FALSE,12.8906559819171,13.3925895546468,9.05592549150896,6.31237735369304,9.9628283321613,,17.0729662871492,,6.64077084235768,8.5123433057163,10.8942142518788,10.3862094687126,6,5
+Costa Rica,CRI,2005,51060,4285504,FALSE,13.4901109740229,17.1770659561351,10.0645588903084,6.93213242908948,10.605523923056,,10.9411553144892,,7.24392070372399,9.48839569147486,10.9748240446282,10.3565340189825,6,5
+Costa Rica,CRI,2006,51060,4345421,FALSE,15.1306280953261,20.3876402007419,11.3265410344885,7.14404190899084,9.1364933024812,18.7158248271498,12.4503378290526,0.303040310314957,6.85804895337414,10.6669656462765,13.1447232641605,9.63501247479182,7,6
+Costa Rica,CRI,2007,51060,4404626,FALSE,16.8897956850629,26.5976075076943,12.7394982285245,7.93882946081664,11.0292889218268,16.7276711035188,13.9207174579758,0.85213212550494,,11.9915843930908,15.8023532405988,12.2601741890165,7,5
+Costa Rica,CRI,2008,51060,4463123,FALSE,18.951530256892,25.8716826941591,14.4068348626797,7.99262563432026,12.6300711417581,5.62686765170941,9.69759685484078,1.26865133983431,,13.3093609227141,13.7578563257669,11.6279834891737,7,5
+Costa Rica,CRI,2009,51060,4520739,FALSE,19.8920463803777,18.3257294178836,11.4466583964475,7.75907159122052,11.9241607171016,5.56909610978417,11.1696698619766,1.75897261512592,6.88074513510501,10.7520228499809,11.5775738418279,9.44103524521542,7,6
+Costa Rica,CRI,2010,51060,4577371,FALSE,20.8877588366705,21.3158373557878,13.4120270231464,8.37696057027023,11.8424722877528,3.44795438076779,11.8194394685201,3.45865640567676,7.58793037272226,12.5317287969738,12.4068440011264,10.8484254949918,7,6
+Costa Rica,CRI,2011,51060,4633086,FALSE,22.1700104093728,29.7088746779549,15.2965220262687,8.50169842326939,11.9888997871079,14.2725713551178,9.34184419792069,8.87031745756249,7.97624414534219,14.300098549568,15.3239664621781,13.1165129086029,7,6
+Costa Rica,CRI,2012,51060,4688003,FALSE,26.5412163819623,33.5852289961156,16.2855866767663,8.58866200057448,12.2421446104503,16.3218477366673,5.38557272277366,10.6801679567435,9.91915388531143,15.1798215984182,16.6610383428816,13.8897678599895,7,6
+Costa Rica,CRI,2013,51060,4742111,FALSE,25.3877023875493,37.0815693511695,16.6096729438663,8.78780735145838,11.8822395154494,8.63024778685119,8.3664786147499,12.3805891244363,6.80858469289085,15.567695953682,15.9531518755051,14.8321208480645,7,6
+Costa Rica,CRI,2014,51060,4795390,FALSE,28.9512307145922,33.5346758939073,17.0739091304878,9.01187835616176,11.9434129873457,20.284563226056,5.26496928948033,20.1687866965938,5.87935343410988,16.1764209368996,17.1429400063993,15.0060141011921,7,6
+Costa Rica,CRI,2015,51060,4847805,FALSE,32.2925231475079,30.4866532961861,17.0773833245241,9.56595091561582,12.5762302803256,19.2304939583245,8.92807519435447,27.9403451416965,6.15876695984733,16.2595371235832,17.6771209709086,16.5565547718806,7,6
+Costa Rica,CRI,2016,51060,4899336,FALSE,35.223655174711,27.875183024894,18.0335748997224,10.5116752044821,14.1389648404216,17.7022297167766,8.09798925206809,27.6815200715548,6.12991308129688,17.1600638027183,17.6534600505645,16.2427240728357,7,6
+Costa Rica,CRI,2017,51060,4949955,FALSE,37.88049424416,28.333386538866,18.744514700299,10.7502022731736,13.4635131113268,15.3504591131669,4.37191525655966,27.418606898941,7.1609093203335,18.0828439761831,17.513125920937,16.0196440440095,7,6
+Costa Rica,CRI,2018,51060,4999443,FALSE,38.5000253392975,31.5407709556962,20.3105269337556,10.6705033200121,12.5423290432753,,5.77151862285026,,,19.6520734923398,21.3586690343223,16.9087165977246,6,4
+Costa Rica,CRI,2019,51060,5047561,FALSE,42.1408638310286,23.8336606859995,20.3977523858283,10.8744191646497,,,,,,19.9332016146452,24.3116740168765,18.2137604884315,4,3
+Costa Rica,CRI,2020,51060,5094114,FALSE,41.4099910723181,3.94961977863746,18.0010909896371,,,,,,,17.4956660592811,21.1202339468642,10.7226429189593,3,2
+Cuba,CUB,1990,107400,10596986,FALSE,0,,,,,,,,,,0,,1,0
+Cuba,CUB,1991,107400,10673534,FALSE,0,,,,,,,,,,0,,1,0
+Cuba,CUB,1992,107400,10736386,FALSE,0,,,,,,,,1.19665040368432,,0.598325201842159,1.19665040368432,1,1
+Cuba,CUB,1993,107400,10789312,FALSE,0,,,,,,,,1.29558283800679,,0.647791419003396,1.29558283800679,1,1
+Cuba,CUB,1994,107400,10838461,FALSE,0,,,,,,,,1.55890146958018,,0.77945073479009,1.55890146958018,1,1
+Cuba,CUB,1995,107400,10888246,FALSE,0.0000220610665762035,,,0.910069399192593,,,,,2.10660338055406,,1.00556494693774,1.50833638987333,2,2
+Cuba,CUB,1996,107400,10939285,FALSE,0.00765038761671285,,,1.19343328779511,,,,,2.89214977641197,,1.36441115060793,2.04279153210354,2,2
+Cuba,CUB,1997,107400,10989730,FALSE,0.0162607715633743,,,1.38360290983714,,,,,4.05535087984942,,1.81840485374998,2.71947689484328,2,2
+Cuba,CUB,1998,107400,11038706,FALSE,0.0537956194728009,,,1.66028308511607,,,,,5.49775505700921,,2.40394458719936,3.57901907106264,2,2
+Cuba,CUB,1999,107400,11084673,FALSE,0.0743662525485841,,,1.86161760286402,,,,,4.23573526898211,,2.05723970813157,3.04867643592307,2,2
+Cuba,CUB,2000,107400,11126423,FALSE,0.127409939968586,,,2.08718265554714,,,,,3.36898176769277,,1.86119145440283,2.72808221161995,2,2
+Cuba,CUB,2001,107400,11164676,FALSE,0.253333646826334,,,2.0615292551778,,,,,3.66277256349277,,1.99254515516564,2.86215090933529,2,2
+Cuba,CUB,2002,106390,11199664,FALSE,0.881898979815019,,,1.94770194439807,,,,,2.1605800004938,,1.66339364156896,2.05414097244593,2,2
+Cuba,CUB,2003,106400,11229185,FALSE,1.22265326332377,,,2.18274180032246,2.05823480352017,,15.0963291612858,,2.32974485121681,,5.20786726903721,6.53627193760835,4,3
+Cuba,CUB,2004,106410,11250369,FALSE,1.95767341270949,,,2.3449156626294,2.06001988995808,,8.65602959574277,,2.63931620253663,,3.89948371840457,4.54675382030293,4,3
+Cuba,CUB,2005,106440,11261586,FALSE,2.26510365477873,,,2.67482055724212,1.91518291540453,,12.8109745724884,,2.77352431861123,,5.13110577578013,6.08643981611393,4,3
+Cuba,CUB,2006,106430,11261241,FALSE,2.59583760925045,,,2.6090993616551,1.96247466116774,,4.80426264382935,0.0100552998680728,2.66217888149974,,3.16784462405866,2.52139904671307,4,4
+Cuba,CUB,2007,106440,11251117,FALSE,2.72166058691736,,,2.53154974795578,2.02045022569986,4.5002417325346,10.5788883726665,0.0137171924906031,,,5.08308511001857,4.37471843770431,5,3
+Cuba,CUB,2008,106440,11236975,FALSE,3.01647656517114,,,2.75527592790832,2.22542376355921,4.69299612715042,8.02439557197844,0.0196124663881754,,,4.62228604805208,3.59976132209165,5,3
+Cuba,CUB,2009,106440,11226711,FALSE,3.34355707651979,,,2.85085330544208,2.28706525903754,4.57252678223874,8.67427040983125,0.0255791125174538,2.78829394117219,,4.44590030304081,3.58474919224074,5,4
+Cuba,CUB,2010,106440,11225833,FALSE,3.71016856182828,,,3.01015145188866,2.49052830995798,4.48632832236484,6.74718243565918,0.025581121808648,1.75087933167192,,3.94094202068258,2.8834485852571,5,4
+Cuba,CUB,2011,106863,11236671,FALSE,3.73393272675796,,,3.20833120791044,2.63733152501034,4.4727363947996,0.962953519943041,0.0268625700072686,1.98708195263568,,2.87300716040935,1.54630731262411,5,4
+Cuba,CUB,2012,106649,11257112,FALSE,4.93314598829427,,,3.30070420028544,3.15490522111785,4.68442139432105,1.28160661359585,0.0297472686125548,1.84893399559391,,3.2097624384181,1.61524801952194,5,4
+Cuba,CUB,2013,104220,11282722,FALSE,6.48443501391824,,,3.38795727572273,3.44232912388027,5.76027256587409,5.43446466677581,0.0761865766987562,2.57243868525276,,4.72791364150873,2.86776180111251,5,4
+Cuba,CUB,2014,104020,11306909,FALSE,6.73471129830231,,,3.61814568558085,3.74908163086968,6.12884366198364,2.5519245249412,0.116719258433257,2.35698227878851,,4.2781214899193,2.16094293693595,5,4
+Cuba,CUB,2015,104100,11324777,FALSE,8.62886378936974,,,4.41802392425145,4.7595767600391,6.69862855827115,1.91092361322292,0.142456255153342,2.85546358654673,,4.9023806943324,2.33171684479361,5,4
+Cuba,CUB,2016,104040,11335108,FALSE,9.93213138476463,,,5.25314563311642,5.76488559975893,7.11742645772057,1.90918196666355,0.207070577177792,2.73130296733074,,5.38863768191918,2.52517528607213,5,4
+Cuba,CUB,2017,103800,11339255,FALSE,13.2018465570461,,,4.98446548024398,7.50702071730325,7.04569437746025,1.59040311612063,0.226281539963334,2.12163976843691,,5.78880985986158,2.23069747619121,5,4
+Cuba,CUB,2018,103800,11338146,FALSE,14.4808674639259,,,5.0470957411185,6.68732461922392,,0.954335205411175,,,,6.82743280348518,3.00071547326484,4,2
+Cuba,CUB,2019,103800,11333484,FALSE,15.7099243941686,,,4.58183950935588,,,,,,,10.1458819517622,4.58183950935588,2,1
+Cuba,CUB,2020,103800,11326616,FALSE,,,,,,,,,,,,,0,0
+Curacao,CUW,1990,444,145400,TRUE,,,,,,,,,,,,,0,0
+Curacao,CUW,1991,444,144403,TRUE,,,,,,,,,,,,,0,0
+Curacao,CUW,1992,444,143912,TRUE,,,,,,,,,,,,,0,0
+Curacao,CUW,1993,444,144299,TRUE,,,,,,,,,,,,,0,0
+Curacao,CUW,1994,444,144630,TRUE,,,,,,,,,,,,,0,0
+Curacao,CUW,1995,444,145139,TRUE,,,,33.1432701324761,,,,,,,33.1432701324761,33.1432701324761,1,1
+Curacao,CUW,1996,444,146306,TRUE,,,,32.1316128608671,,,,,,,32.1316128608671,32.1316128608671,1,1
+Curacao,CUW,1997,444,146956,TRUE,,,,34.8827226739827,,,,,,,34.8827226739827,34.8827226739827,1,1
+Curacao,CUW,1998,444,144472,TRUE,,,,36.7437870139567,,,,,,,36.7437870139567,36.7437870139567,1,1
+Curacao,CUW,1999,444,139428,TRUE,,,,37.7245882410606,,,,,,,37.7245882410606,37.7245882410606,1,1
+Curacao,CUW,2000,444,133860,TRUE,,,,46.6446788452686,,,,,,,46.6446788452686,46.6446788452686,1,1
+Curacao,CUW,2001,444,129047,TRUE,,,,48.8550954527575,,,,,,,48.8550954527575,48.8550954527575,1,1
+Curacao,CUW,2002,444,129205,TRUE,,,,51.239891826013,,,,,,,51.239891826013,51.239891826013,1,1
+Curacao,CUW,2003,444,131897,TRUE,,,,46.7862938904733,,,,,,,46.7862938904733,46.7862938904733,1,1
+Curacao,CUW,2004,444,134192,TRUE,,,,40.916617468565,,,,,,,40.916617468565,40.916617468565,1,1
+Curacao,CUW,2005,444,137658,TRUE,,,,45.0047171413743,,,,,,,45.0047171413743,45.0047171413743,1,1
+Curacao,CUW,2006,444,141239,TRUE,,,,49.196239314247,,,,,,,49.196239314247,49.196239314247,1,1
+Curacao,CUW,2007,444,144056,TRUE,,,,55.9923629396832,,,,,,,55.9923629396832,55.9923629396832,1,1
+Curacao,CUW,2008,444,145880,TRUE,,,,64.3690758390139,,,,,,,64.3690758390139,64.3690758390139,1,1
+Curacao,CUW,2009,444,146833,TRUE,,,,66.8469484728341,,,,,,,66.8469484728341,66.8469484728341,1,1
+Curacao,CUW,2010,444,148703,TRUE,,,,62.248435640258,,,,,,,62.248435640258,62.248435640258,1,1
+Curacao,CUW,2011,444,150831,TRUE,,28.8344380690913,80.583929191704,67.4106980920225,,,,18.4891656134931,,74.1011288153501,58.9430217842726,47.2088576474892,3,4
+Curacao,CUW,2012,444,152088,TRUE,,23.4299423369572,87.0097222532379,72.5246325163012,,,,27.9871229933316,,79.7234796151543,60.9880990354988,50.9162943654361,3,4
+Curacao,CUW,2013,444,153822,TRUE,,4.97939652488354,77.9293680915411,84.5798468888469,,,,,,71.9578100010858,55.8295371684239,53.8390178049388,3,3
+Curacao,CUW,2014,444,155909,TRUE,,31.827529158771,77.0669049288744,87.966825732287,,,,,,71.5463916082785,65.6204199399775,63.7802488331121,3,3
+Curacao,CUW,2015,444,157980,TRUE,,45.8265828732696,67.4193976346205,82.4305806119582,,,,75.2092110520166,,63.2343191130486,65.2255203732828,66.6751734125732,3,4
+Curacao,CUW,2016,444,159664,TRUE,100,46.9192917647675,62.009787724012,71.8223384513523,,,,87.3319139859632,,58.2751575607032,70.187854485033,66.0871754406966,4,4
+Curacao,CUW,2017,444,160175,TRUE,100,87.0623867495232,63.3930273984054,80.2391665396457,,,,,,60.1599725235241,82.6736451718936,75.820508604231,4,3
+Curacao,CUW,2018,444,159336,TRUE,,43.4251667977252,71.0310599510846,92.2503362825975,,,,,,66.3289004135897,68.9021876771358,67.3348011646375,3,3
+Curacao,CUW,2019,444,157441,TRUE,,24.8994512309789,63.0614994860828,99.7648832532261,,,,,,59.716478297115,62.5752779900959,61.4602709271067,3,3
+Curacao,CUW,2020,444,155014,TRUE,,2.64700467539155,42.4647670075921,,,,,,,40.2872859926949,22.5558858414918,21.4671453340432,2,2
+Cayman Islands,CYM,1990,240,25307,TRUE,0,100,,,,,,,,,50,100,2,1
+Cayman Islands,CYM,1991,240,26540,TRUE,0,100,,,,,,,,,50,100,2,1
+Cayman Islands,CYM,1992,240,27784,TRUE,0,100,,,,,,,,,50,100,2,1
+Cayman Islands,CYM,1993,240,29068,TRUE,0,100,,,,,,,,,50,100,2,1
+Cayman Islands,CYM,1994,240,30521,TRUE,0,100,,,,,,,,,50,100,2,1
+Cayman Islands,CYM,1995,240,32161,TRUE,100,100,,100,,,,,,,100,100,3,2
+Cayman Islands,CYM,1996,240,34065,TRUE,,100,,100,,,,,,,100,100,2,2
+Cayman Islands,CYM,1997,240,36155,TRUE,,100,,100,,,,,,,100,100,2,2
+Cayman Islands,CYM,1998,240,38330,TRUE,,100,,100,,,,,,,100,100,2,2
+Cayman Islands,CYM,1999,240,40423,TRUE,,100,,100,,,,,,,100,100,2,2
+Cayman Islands,CYM,2000,240,42305,TRUE,,100,,100,,,,,,,100,100,2,2
+Cayman Islands,CYM,2001,240,43934,TRUE,,100,,100,,,,,,,100,100,2,2
+Cayman Islands,CYM,2002,240,45347,TRUE,,100,,100,,,,,,,100,100,2,2
+Cayman Islands,CYM,2003,240,46624,TRUE,,100,,100,100,,,,,,100,100,3,2
+Cayman Islands,CYM,2004,240,47899,TRUE,,100,,100,100,,,,,,100,100,3,2
+Cayman Islands,CYM,2005,240,49261,TRUE,100,100,,100,100,,,,,,100,100,4,2
+Cayman Islands,CYM,2006,240,50729,TRUE,100,100,,100,100,,,,,,100,100,4,2
+Cayman Islands,CYM,2007,240,52280,TRUE,100,100,,100,100,,100,,,,100,100,5,3
+Cayman Islands,CYM,2008,240,53835,TRUE,100,100,,100,100,,,,,,100,100,4,2
+Cayman Islands,CYM,2009,240,55321,TRUE,100,100,,100,100,,100,,,,100,100,5,3
+Cayman Islands,CYM,2010,240,56672,TRUE,100,100,,100,100,,63.6433741053306,,,,90.9108435263327,87.8811247017769,5,3
+Cayman Islands,CYM,2011,240,57877,TRUE,100,100,,100,100,,0,,,,75,66.6666666666667,5,3
+Cayman Islands,CYM,2012,240,58963,TRUE,100,100,,100,100,,100,,,,100,100,5,3
+Cayman Islands,CYM,2013,240,59933,TRUE,100,100,,100,100,,0,,,,75,66.6666666666667,5,3
+Cayman Islands,CYM,2014,240,60848,TRUE,100,100,,100,100,,59.2755274996269,,,,89.8188818749067,86.425175833209,5,3
+Cayman Islands,CYM,2015,240,61721,TRUE,100,100,,100,100,,0,100,,,75,75,5,4
+Cayman Islands,CYM,2016,240,62564,TRUE,100,100,100,100,100,,57.6497234399542,100,,100,91.5299446879908,91.5299446879908,6,5
+Cayman Islands,CYM,2017,240,63382,TRUE,100,100,100,100,100,,56.9057034693966,,,100,91.3811406938793,89.2264258673492,6,4
+Cayman Islands,CYM,2018,240,64172,TRUE,,100,100,100,100,,56.2051564124119,,,100,89.051289103103,89.051289103103,5,4
+Cayman Islands,CYM,2019,240,64948,TRUE,,100,100,100,,,,,,100,100,100,3,3
+Cayman Islands,CYM,2020,240,65720,TRUE,,,,,,,,,,,,,0,0
+Cyprus,CYP,1990,9240,766616,TRUE,0,7.50610376993765,19.3210716751997,,,,,,,17.9441024570646,8.94239181504577,12.7251031135011,3,2
+Cyprus,CYP,1991,9240,783121,TRUE,0,5.40243442606361,18.7830693813368,,,,,,,17.5333202259763,8.0618346024668,11.46787732602,3,2
+Cyprus,CYP,1992,9240,800610,TRUE,0.16379048139256,6.69012024502765,23.2107472766704,,,,,,36.535155811926,21.3486238370048,16.6499534537542,21.5246332979861,3,3
+Cyprus,CYP,1993,9240,818750,TRUE,0.180340145525712,5.12630651951723,18.7057088344918,,,,,,35.6251729876713,17.2216503588694,14.9093821218015,19.3243766220193,3,3
+Cyprus,CYP,1994,9240,837104,TRUE,0.347451420306584,4.25800462672071,20.7141769152624,,,,,,45.7604422203083,18.9674970406527,17.7700187956495,22.9953146292272,3,3
+Cyprus,CYP,1995,9240,855391,TRUE,1.25592033281211,13.2711783638818,26.08054341384,37.1074460394365,,,,,42.5013874167262,25.6069666852717,24.0432951133393,29.621744626329,4,4
+Cyprus,CYP,1996,9240,873426,TRUE,2.01941545986259,13.5037612371068,26.7932404048412,34.1297643830069,,,,,39.9679367166811,26.0243149354222,23.2828236402997,28.4064443180543,4,4
+Cyprus,CYP,1997,9240,891190,TRUE,12.8690810868763,28.2702383962946,25.1302496968856,35.657679314761,,,,,40.6400369697986,24.7677116275921,28.5134570929232,32.3339165771116,4,4
+Cyprus,CYP,1998,9240,908710,TRUE,25.6281870945929,20.0847461079827,25.6507561628437,37.9780487522638,,,,,40.6665408488291,23.3012454821196,30.0016557933024,30.5076452977988,4,4
+Cyprus,CYP,1999,9240,926049,TRUE,32.083817297782,47.1546493789013,25.6114931417716,40.900635169485,,,,,39.5511438765751,25.475755641642,37.060347772903,38.2705460166508,4,4
+Cyprus,CYP,2000,9240,943288,TRUE,42.3637331269117,47.7497482598112,26.0263667886473,45.0726478231729,,,,,39.5942304739864,26.5674617528119,40.1613452945059,39.7460220774456,4,4
+Cyprus,CYP,2001,9240,960274,TRUE,51.3346854452983,54.5287661854839,26.3754377840897,44.5916083588016,,,,,42.7568912559141,26.7069966430246,43.9174778059175,42.1460656108061,4,4
+Cyprus,CYP,2002,9240,976968,TRUE,75.9325533750437,74.1409924382691,26.8580930793782,40.2733983233636,,,,,45.6976580117364,27.6590462064113,52.5805390455582,46.9427737449451,4,4
+Cyprus,CYP,2003,9240,993562,TRUE,79.3308867298332,66.1190073143031,30.7484808435003,38.549252860338,44.9844146711203,,76.2335347398987,,53.9945530779141,31.6045662933694,57.4959525942979,53.3001828571647,6,5
+Cyprus,CYP,2004,9240,1010410,FALSE,87.7040110849013,79.4594861398858,36.5414593746363,40.118637835899,50.9225202608816,,78.5320221895474,,57.0760597652298,37.9779291391513,63.2386127316833,58.6328270139426,6,5
+Cyprus,CYP,2005,9240,1027657,FALSE,83.6321264749515,72.9632244076947,38.9173584379346,42.211428854408,52.5794702040931,,87.7432182454189,,55.5071927108705,42.0691889843662,63.4957581885464,60.0988506405517,6,5
+Cyprus,CYP,2006,9240,1045508,FALSE,89.7706855666759,100,41.2362774406353,41.3744943164433,52.5819682930686,30.6166534126783,72.4458763043834,0.553719073256644,55.9810433055883,46.3174221460458,61.6321471923435,52.7787591909529,7,6
+Cyprus,CYP,2007,9240,1063708,FALSE,100,100,50.012669942267,42.8478479447969,56.0674466075281,100,54.2524421709311,0.94509191245716,,61.1266435763328,74.5188266763325,51.8344051209036,7,5
+Cyprus,CYP,2008,9240,1081568,FALSE,100,100,70.6319808425578,43.1399052971845,58.2622671349654,100,50.0217826890768,3.39257059470361,,100,77.2989448048032,59.310851716193,7,5
+Cyprus,CYP,2009,9240,1098089,FALSE,100,100,59.0071296750507,39.1830508791803,63.6068278696638,100,95.2537741673231,3.34152692379836,51.684449693552,100,77.8754863450152,64.9104669439756,7,6
+Cyprus,CYP,2010,9240,1112617,FALSE,100,100,60.941986990083,40.3528274556388,67.092048764333,100,61.592757120059,19.919836309854,49.8691482732035,100,73.2509599769978,61.9557615264592,7,6
+Cyprus,CYP,2011,9240,1124837,FALSE,100,100,65.7125671400506,41.4155921732651,68.1565723765869,89.6033848310639,41.684586179922,22.5089011460267,25.2692282592676,100,66.2407655119385,55.1463846264136,7,6
+Cyprus,CYP,2012,9240,1135046,FALSE,100,100,59.7994447983008,40.9788571205871,71.1952891590883,80.2134014956227,92.1523194845157,31.0351004745562,25.0777693457876,100,71.1745417492591,64.8740077375745,7,6
+Cyprus,CYP,2013,9240,1143866,FALSE,100,100,61.2417118234958,39.7283026114819,63.8748206786399,67.1553939861049,34.6848059740129,30.3723537320148,19.9475780869179,100,60.3939703545733,54.1221734007379,7,6
+Cyprus,CYP,2014,9240,1152297,FALSE,100,100,63.6433294010374,39.7117143345917,66.7024804945221,60.0096247902289,50.0814952714073,17.1958426763864,,100,68.9076939662109,61.3978104564771,7,5
+Cyprus,CYP,2015,9240,1160987,FALSE,100,100,56.8316825098374,40.7956396871691,69.6783537687008,54.9583437056534,59.0266287638437,21.4919712563988,,100,68.6020491110839,64.2628479414823,7,5
+Cyprus,CYP,2016,9240,1170189,FALSE,100,100,60.3304538843631,47.2745065209412,79.46133192224,46.8712572461584,40.0690528323757,24.5904119643108,,100,65.7575450806397,62.3867942635255,7,5
+Cyprus,CYP,2017,9240,1179685,FALSE,100,100,69.8931327978885,53.1034245256249,89.7800574880709,45.7669301528394,27.5168165024355,25.1949781810414,,100,66.0467173297981,61.1630438418204,7,5
+Cyprus,CYP,2018,9240,1189262,FALSE,100,100,77.1236781382851,55.8729790445286,95.6834187237876,,27.2952265149947,,,100,72.0583767395617,70.7920513898808,6,4
+Cyprus,CYP,2019,9240,1198574,FALSE,100,100,78.4429973767576,57.7193299587728,,,,,,100,84.0405818338826,85.9064433195909,4,3
+Cyprus,CYP,2020,9240,1207361,FALSE,100,25.9040261957347,76.2476700809776,,,,,,,100,67.3838987589041,62.9520130978674,3,2
+Czech Republic,CZE,1990,77270,10333355,FALSE,0,,,,,,,,,,0,,1,0
+Czech Republic,CZE,1991,77270,10308578,FALSE,0,,,,,,,,,,0,,1,0
+Czech Republic,CZE,1992,77270,10319123,FALSE,0,,,,,,,,,,0,,1,0
+Czech Republic,CZE,1993,77270,10329855,FALSE,0.147412998979589,3.15975957318029,8.11850790624798,,,,,,2.47933728044845,7.3441685114896,3.47625443971408,4.32775512170611,3,3
+Czech Republic,CZE,1994,77270,10333587,FALSE,0.319201454044448,4.22120631748248,8.96374744731109,,,,,,2.58270788990401,8.16428580714725,4.02171577718551,4.98940000484458,3,3
+Czech Republic,CZE,1995,77270,10327253,FALSE,0.36869561569262,11.0597480955355,11.6583473157034,,,,,,3.03072081720693,10.7079061787145,6.5293779610346,8.26612503048564,3,3
+Czech Republic,CZE,1996,77270,10315241,FALSE,0.49274485701403,6.7603666566197,12.7696686606096,,,,,,3.10039411101632,11.797681538984,5.78079357131491,7.21948076887334,3,3
+Czech Republic,CZE,1997,77270,10304131,FALSE,0.741218695852469,5.5936211186015,12.2712958216004,,,,,,3.20171922611671,11.4728109260042,5.45196371554277,6.75605042357413,3,3
+Czech Republic,CZE,1998,77270,10294373,FALSE,0.991342375588337,16.2985844852298,13.2604835206223,,,,,,3.45652214908006,12.5286011067774,8.50173313263012,10.7612359136958,3,3
+Czech Republic,CZE,1999,77270,10283860,FALSE,1.74043486794003,27.3059913330754,13.1805495039748,,,,,,3.78105171476135,12.5727125310738,11.5020068549379,14.5532518596369,3,3
+Czech Republic,CZE,2000,77270,10255063,FALSE,2.49826818308764,21.5113634614794,14.2406887859044,,,,,,4.39691198015082,13.5466791628859,10.6618081026556,13.1516515348387,3,3
+Czech Republic,CZE,2001,77270,10216605,FALSE,3.7682722441185,24.9220348941326,15.9095513186724,,,,,,4.71928627107446,15.2984407705575,12.3297861819995,14.9799206452549,3,3
+Czech Republic,CZE,2002,77270,10196916,FALSE,6.14736430297236,37.4549379161932,17.9878311735354,,,,,,5.09495877068141,17.3347525165751,16.6712730408456,19.9615497344832,3,3
+Czech Republic,CZE,2003,77270,10193998,FALSE,8.81383000666718,9.59123480977145,22.6410594092312,32.5563719135889,10.4649387480905,,35.7353932212884,,6.56154976120738,21.8182412313869,19.3165731869591,21.2525581874486,6,5
+Czech Republic,CZE,2004,77260,10197101,FALSE,9.11940967451382,38.3086308881973,32.4677280983936,36.2752805207646,13.3679280693279,,38.2004756163647,,7.96001962027717,30.8787114492347,27.0552574030852,30.3246236189677,6,5
+Czech Republic,CZE,2005,77260,10211216,FALSE,9.04780205429035,67.999129115536,39.2758539911156,37.7229274085995,15.4248850744284,,36.3815750858293,,8.76780075721535,37.4059314521009,33.1991814020977,37.6554727638562,6,5
+Czech Republic,CZE,2006,77250,10238905,FALSE,12.262217340682,43.7838062048956,46.9451988708552,37.3658226503606,15.9708853138356,9.89465968070754,36.9877165786982,3.44011922870428,8.79863908072548,45.2028188446379,28.0054372009892,29.2631537646703,7,6
+Czech Republic,CZE,2007,77250,10298828,FALSE,13.2082600671546,79.4985702335507,58.2032720813731,37.3583633100878,16.9794299226121,17.037421279999,33.970791417998,5.21019738518048,,57.0450507408834,39.8794463983605,42.6165946175401,7,5
+Czech Republic,CZE,2008,77250,10384603,FALSE,15.8839638145932,64.9280291765542,68.6907828267169,36.8649485992275,17.3947988015721,25.1396642084847,35.7741284497464,22.9894376144175,,66.461903028755,41.2135861792205,45.4036893737401,7,5
+Czech Republic,CZE,2009,77250,10443936,FALSE,16.159913192026,36.0806483988566,54.5389064392315,37.4394763023481,16.065917018969,21.4676410515814,69.0696935963089,30.6944389454432,8.21140748814917,52.6939089970852,34.7096694955002,39.0315956213652,7,6
+Czech Republic,CZE,2010,77240,10474410,FALSE,17.2107657166348,64.5557958125918,61.8421170896087,35.5039008104412,15.3728212419471,21.7453761671463,28.2361849859208,33.0025302938356,7.77985659239472,59.2258576751328,33.839142453534,38.0506876950528,7,6
+Czech Republic,CZE,2011,77240,10496088,FALSE,17.5919969612561,24.1729276427361,72.9830298963213,32.5081863018924,15.1222480711097,22.124832074406,22.6797471230826,41.943939698995,7.69616166078211,69.3792211019297,28.5366973800681,33.0633639215696,7,6
+Czech Republic,CZE,2012,77230,10510785,FALSE,18.3001022293367,52.9347678366334,70.5015210597659,36.0224739079065,13.437885353778,22.0212427126533,22.9911865687405,48.8190257649804,6.13592607923627,67.311056811922,32.7010314848961,39.0357394949032,7,6
+Czech Republic,CZE,2013,77220,10514272,FALSE,18.4635430534052,62.9675891515094,71.2653271146292,37.1012036998164,12.9580817325596,23.1032991923245,33.274708685284,25.8254313226745,7.14833754845483,67.7327433442464,36.1891440636319,39.0083356253309,7,6
+Czech Republic,CZE,2014,77220,10525347,FALSE,18.4743065636814,50.6826806296292,75.8185239732324,37.8746937943619,12.2590733384307,25.1103197669394,27.0715052422012,28.5872698989529,8.6466154339727,71.9089899756252,34.8112350577169,37.4619591624572,7,6
+Czech Republic,CZE,2015,77210,10546059,FALSE,18.7949842514098,22.5659639816356,66.8990764876338,40.8447669293714,12.3600371981986,22.9956943469065,30.4383807694855,31.3146608059094,10.3911221185536,63.6037858693981,30.4185698407137,33.1931134123923,7,6
+Czech Republic,CZE,2016,77220,10566332,FALSE,18.9603141020767,58.0693450101178,67.6567986923189,44.3143274129343,13.4867002734432,24.6476822795257,19.115493309187,34.4495028659054,12.3113069491505,64.6526092002233,35.010752536473,38.8187641245864,7,6
+Czech Republic,CZE,2017,77210,10594438,FALSE,19.4633544741634,85.4252074847626,75.3808699614896,47.5564042794036,14.9260870834366,28.2318965616927,20.4265519169434,34.3581114349611,11.4584788563377,72.889472493018,41.1346805049704,45.3523710775711,7,6
+Czech Republic,CZE,2018,77200,10629928,FALSE,19.8835819530421,59.4333027885049,83.8368509105574,49.8912290802134,15.7767030236712,,46.8242143340037,,,80.5418919980716,51.9738358132643,59.1726595501984,6,4
+Czech Republic,CZE,2019,77200,10671870,FALSE,19.8493185342378,63.8184067364016,81.1276551978201,8.36061555306053,,,,,,78.8329716258852,43.28899900538,50.3373313051158,4,3
+Czech Republic,CZE,2020,77200,10698896,FALSE,19.9147292867878,13.4371243481062,75.244824042086,,,,,,,72.1177815517932,36.1988925589933,42.7774529499497,3,2
+Germany,DEU,1990,349130,79433029,FALSE,0.00415157485262003,14.6836898945759,26.4293690038413,,,,,,,26.3579444711315,13.7057368244233,20.5208171828537,3,2
+Germany,DEU,1991,349130,80013896,FALSE,0.00819342866338787,15.3690413446729,27.0536152189302,,,,,,,27.5768418646528,14.1436166640888,21.4729416046628,3,2
+Germany,DEU,1992,349130,80624598,FALSE,0.0141423480955682,11.5495148523741,28.7265022690405,,,,,,7.43125825224408,29.3400275008571,11.9303544304386,16.1069335351584,3,3
+Germany,DEU,1993,349120,81156363,FALSE,0.0149647277935448,9.79285325876827,25.0205062555561,,,,,,8.00979334410713,25.9613747009907,10.7095293965563,14.5880071012887,3,3
+Germany,DEU,1994,349110,81438348,FALSE,0.0296737091301798,14.7421948066734,27.6146075597715,,,,,,8.63164548310786,28.2933888502282,12.7545303896707,17.2224097133365,3,3
+Germany,DEU,1995,349100,81678051,FALSE,0.0589377110637554,27.8478379932268,33.3651792166248,2.20673797132725,,,,,9.65095106623505,34.0617240238209,14.6259287916955,18.4418127636525,4,4
+Germany,DEU,1996,349090,81914831,FALSE,0.0976868443324397,40.7774968000166,33.156769964643,2.25344641198381,,,,,10.0131157119932,33.7867049825454,17.2597031465938,21.7076909766348,4,4
+Germany,DEU,1997,349050,82034771,FALSE,0.214294006013293,36.445044531142,32.3375914075075,10.606772644512,,,,,13.6513343401963,33.0374229250422,18.6510073858742,23.4351436102231,4,4
+Germany,DEU,1998,349020,82047195,FALSE,0.315365288217861,67.6382181132546,34.0748487202155,12.6889716408884,,,,,13.7746099939959,34.8525736105327,25.6984027513145,32.2385933396679,4,4
+Germany,DEU,1999,348980,82100243,FALSE,0.665109304162893,100,34.4428244106831,14.0871788851934,,,,,16.0917472713909,35.6003877304245,33.0573719742861,41.4448284717522,4,4
+Germany,DEU,2000,348950,82211508,FALSE,0.962774176070505,100,35.1198722132045,14.6996577094109,,,,,17.6973454299139,36.7510847572148,33.69592990572,42.2870219741349,4,4
+Germany,DEU,2001,348900,82349925,FALSE,1.00678906677115,67.7409263070759,35.4349345451292,14.6634412279977,,,,,17.0537271981168,36.280201669318,27.1799636690182,33.9345741006271,4,4
+Germany,DEU,2002,348860,82488495,FALSE,1.55031335798388,36.4059278130087,37.1405648354075,14.4841741431717,,,,,18.7048563900651,38.3306699447419,21.6571673079274,26.9814070727469,4,4
+Germany,DEU,2003,348810,82534176,FALSE,1.77416121995226,55.6393254719324,45.3583720286896,15.268317195934,16.1926051585421,16.9676172575788,21.2822174875022,100,23.3280879992945,46.8114108588284,25.6597283801263,43.7215598355819,7,6
+Germany,DEU,2004,348770,82516260,FALSE,2.05485492381559,15.6682012896234,54.624703900586,15.4559507441712,17.3095319127188,17.816482465751,21.4616788615113,100,26.7113386178209,56.4382885903788,21.9704586861828,39.2892430172509,7,6
+Germany,DEU,2005,348760,82469422,FALSE,2.18243888898959,79.1141205579294,59.1029175877452,15.9251975840387,18.2250848308571,,17.931335712428,,28.5539303195191,61.7975946150219,33.8016567751083,40.6644357577874,6,5
+Germany,DEU,2006,348720,82376451,FALSE,2.29460819903707,100,68.1753190102246,15.5373383375121,19.061138869945,,19.0023970203211,11.2143796862994,30.438669811015,71.8658511629536,39.241388729685,41.3431060030169,6,6
+Germany,DEU,2007,348670,82266372,FALSE,2.39320289947755,100,80.4991086692119,15.7279465753856,20.1311559288195,22.9199696430687,22.9298429069716,18.8271108914505,,86.5170263893644,40.7450117823526,48.8003853526344,7,5
+Germany,DEU,2008,348630,82110097,FALSE,2.48835954146797,68.8942573381283,90.0251862301299,16.4332623616116,20.3285564812484,23.3293812751862,19.3275963467783,19.0554904716887,,92.9521809429013,36.7496738488837,43.3325574922216,7,5
+Germany,DEU,2009,348610,81902307,FALSE,2.52665560889982,83.7741842726498,71.7504541996024,16.2794688766714,19.1910718122259,,25.3657719707852,22.1223759063314,32.6792492445833,74.077150994275,38.7292973621987,42.383033544216,6,6
+Germany,DEU,2010,348570,81776930,FALSE,2.62662542469017,100,80.0432903910551,16.7471089903465,19.7514533540801,,23.3317118931986,24.0231887075316,31.8378892697008,82.0973481394652,42.4311043281652,46.3395411667071,6,6
+Germany,DEU,2011,348560,80274983,FALSE,2.65194876285515,100,96.0382484699433,17.1087490788065,20.3346638045809,26.3495719272918,19.7694319139353,29.3855742405149,36.1340654518505,97.7594706229095,42.5788593720975,50.0262152180028,7,6
+Germany,DEU,2012,348540,80425823,FALSE,2.6821507005058,89.7215007333164,91.4801836846914,17.087835970963,20.2216999616879,26.4398872821382,16.8621934249126,33.6376472378998,35.2852686733744,91.7425397292954,39.9370029242717,47.3894976282936,7,6
+Germany,DEU,2013,348880,80645605,FALSE,2.73395723404264,87.2840002409712,95.4063007629122,17.9245798585074,19.8372321819651,26.4305663355914,19.4102335400302,21.3851271884397,35.1171560128808,94.7412408017233,40.6152562835623,45.9770562737588,7,6
+Germany,DEU,2014,348900,80982500,FALSE,2.78792312992925,68.7775381066744,98.2498024709141,17.4004341985359,19.837813803434,,20.5765486537382,23.5617235581067,36.0886466821725,97.3343048652773,40.6468155403274,43.9565326774175,6,6
+Germany,DEU,2015,348860,81686611,FALSE,2.80878014795386,100,85.730442442209,17.6519641657672,20.2013129810201,,21.7679622865927,27.401487270289,39.1507730993544,84.7653525023484,44.5183203569795,48.4562565540586,6,6
+Germany,DEU,2016,349360,82348669,FALSE,2.67726341846082,94.0093822232666,86.3528574250368,18.6627463828796,20.6637835598072,,17.6948349718695,31.191542264817,41.1770397584421,85.5749913470494,43.4290206966592,48.051756158054,6,6
+Germany,DEU,2017,349370,82657002,FALSE,2.67453205388594,100,94.294540146695,19.0829692303183,21.1457726747009,,16.7561141663735,33.2948532378128,40.4411674018027,92.4108406337504,45.5415538331792,50.3309907783429,6,6
+Germany,DEU,2018,349380,82905782,FALSE,2.75001299768301,100,100,21.6000395104637,22.0275264148121,,13.2689560261994,,,100,47.5238017068692,58.7172488841658,6,4
+Germany,DEU,2019,349380,83092962,FALSE,2.77841350880824,100,99.1726676657553,5.78254714613359,,,,,,96.9268832692017,51.9334070801743,67.5698101384451,4,3
+Germany,DEU,2020,349380,83240525,FALSE,2.82630614570066,58.7401445344539,90.7188089193248,,,,,,,88.1521608595449,50.7617531998265,73.4461526969994,3,2
+Djibouti,DJI,1990,23180,590393,TRUE,0,0.00445727340065727,,,,,,,,,0.00222863670032863,0.00445727340065727,2,1
+Djibouti,DJI,1991,23180,606843,TRUE,0,0.165515449282531,1.93272256646286,,,,,,,1.80048021663753,0.69941267191513,0.98299783296003,3,2
+Djibouti,DJI,1992,23180,615050,TRUE,0,0.163306872268855,1.90208544380996,,,,,,,1.78524648187219,0.688464105359604,0.974276677070521,3,2
+Djibouti,DJI,1993,23180,618504,TRUE,0,0.100948177623098,1.93448411207542,,,,,,,1.80872849484991,0.678477429899505,0.954838336236505,3,2
+Djibouti,DJI,1994,23180,622364,TRUE,0,0.100322081053204,1.83450279757153,,,,,,,1.69708232967144,0.644941626208245,0.898702205362323,3,2
+Djibouti,DJI,1995,23180,630385,TRUE,0.06661395694838,0.223929150676726,1.68823530418751,0.403231414390038,,,,,,1.58047146438893,0.595502456550663,0.7358773431519,4,3
+Djibouti,DJI,1996,23180,643649,TRUE,0.126838302089442,0.222381865657586,1.61293368050014,0.376018294793776,,,,,,1.50623218501634,0.584543035760235,0.7015441151559,4,3
+Djibouti,DJI,1997,23180,660858,TRUE,0.328759882928303,0.205761407407049,1.60282056848176,0.366188788177935,,,,,,1.4897209024617,0.625882661748761,0.687223699348893,4,3
+Djibouti,DJI,1998,23180,680465,TRUE,0.364536445797439,0.204547316687936,1.67901133033357,0.373447944593916,,,,,,1.55727586755075,0.655385759353215,0.7117570429442,4,3
+Djibouti,DJI,1999,23180,699973,TRUE,0.39578842311072,0.201314610241304,1.54949988862763,0.362999580430127,,,,,,1.43684649648041,0.627400625602446,0.667053562383946,4,3
+Djibouti,DJI,2000,23180,717577,TRUE,0.71001474596622,0.200846751426377,1.54997886616577,0.338822402336064,,,,,,1.44564926728688,0.699915691473607,0.661772807016441,4,3
+Djibouti,DJI,2001,23180,733019,TRUE,1.22760827485877,0.20301239513792,1.5314754451258,0.356512806765587,,,,,,1.41553397791942,0.829652230472018,0.658353059940976,4,3
+Djibouti,DJI,2002,23180,746947,TRUE,1.70776864027297,0.201539660372132,1.53824398736724,0.364475095344568,,,,,,1.42870671131878,0.953006845839227,0.664907155678495,4,3
+Djibouti,DJI,2003,23180,759639,TRUE,2.15844359980202,0.821278192109856,1.74003279804341,0.369555427244834,8.66811073177272,,,,,1.62574452579809,1.27232750430003,0.938859381717593,5,3
+Djibouti,DJI,2004,23180,771599,TRUE,2.65247200532036,2.19088403191738,1.80996165048118,0.412610683041083,8.48606819155839,,,,,1.69193869604037,1.76648209269,1.43181113699961,5,3
+Djibouti,DJI,2005,23180,783248,TRUE,3.18924039260368,1.2433066627691,1.96675245638758,0.466940384634934,6.82637807307403,,,,,1.82511536475676,1.71655997409882,1.17845413738693,5,3
+Djibouti,DJI,2006,23180,794554,TRUE,4.18706276634273,5.97743650799164,2.18989515318311,0.602463403312518,6.49475584192306,,,0.0830166947054375,,2.02837548014112,3.2392144577075,2.17282302153768,5,4
+Djibouti,DJI,2007,23180,805456,TRUE,5.26851580840007,10.6373476353465,2.62810584365841,0.601830321288184,8.15970123696263,,,0.0818915448137064,,2.40995829424821,4.78394990217329,3.43275694892415,5,4
+Djibouti,DJI,2008,23180,816361,TRUE,7.25172429380918,12.2307579109515,3.13141941392865,0.802100333153228,8.18578926252138,,,0.417909500916683,,2.88009953786149,5.85400048796063,4.08271682072072,5,4
+Djibouti,DJI,2009,23180,827820,TRUE,12.6572445341958,5.13176025238055,2.81968901225242,0.849675793747575,8.72386526104521,33.5485173506221,0,0.686945871955168,,2.58908467826687,9.16781449053308,1.85149331927003,7,5
+Djibouti,DJI,2010,23180,840194,TRUE,20.2651057693035,1.90539401525191,2.59385407438663,0.735931124877908,7.60927895216328,,4.29281487049098,0.730982266915036,,2.37904931023796,5.95861997086219,2.00883431755476,6,5
+Djibouti,DJI,2011,23180,853671,TRUE,21.4794227495387,4.05879441583084,3.06294101067028,0.795441250753336,8.95061816963447,,4.2250437197671,0.730616243767532,,2.82879238547092,6.72432862931205,2.52773760311795,6,5
+Djibouti,DJI,2012,23180,868136,TRUE,28.3631970108373,5.55721571682766,3.25607011194785,0.83813589686664,8.81273972018068,,0,0.718440766213492,,2.99281242843642,7.60292374729589,2.02132096166884,6,5
+Djibouti,DJI,2013,23180,883296,TRUE,37.6627954170472,14.2012239597756,19.4361030567851,0.864985001985287,8.60039933557609,,0,0.706108268823005,,17.2640568036842,14.4330214871186,6.60727480685362,6,5
+Djibouti,DJI,2014,23180,898707,TRUE,49.5502546700609,7.46667984539699,17.9732237751239,,7.1655349115147,,8.02663670650679,1.63308681976417,,15.95974135435,20.7541987492722,8.27153618150448,5,4
+Djibouti,DJI,2015,23180,913998,TRUE,65.6304422711603,6.90192220408189,17.1862162441866,,8.49111266035542,,3.94617635629104,4.49633840702722,,15.282913787299,23.41618926893,7.65683768867478,5,4
+Djibouti,DJI,2016,23180,929117,TRUE,86.8351190552906,7.55271854524998,14.4168841432696,,7.66698394596536,,3.88196244100291,6.71379800208012,,12.9770054685242,28.1716710462033,7.7813711142143,5,4
+Djibouti,DJI,2017,23180,944100,TRUE,100,7.66197129924468,21.6256835504353,,9.27959893692956,4.75335026617384,3.82035515019309,7.77325173861293,,19.3935982688921,27.5722720532094,9.6622941142357,6,4
+Djibouti,DJI,2018,23180,958923,TRUE,100,7.77542987500599,22.0463237770771,,10.230159181983,,0,,,19.8708680451164,32.4554384130208,9.2154326400408,5,3
+Djibouti,DJI,2019,23180,973557,TRUE,100,7.88376089506927,24.6007357647352,,,,,,,22.0792160917031,44.1614988866015,14.9814884933862,3,2
+Djibouti,DJI,2020,23180,988002,TRUE,,,17.3983678977388,,,,,,,15.7081057381153,17.3983678977388,15.7081057381153,1,1
+Dominica,DMA,1990,750,70422,TRUE,0,8.02724184784355,7.63777680172844,,,,,,,7.06430018357417,5.22167288319066,7.54577101570886,3,2
+Dominica,DMA,1991,750,70377,TRUE,0,9.4865113505699,7.52782347986935,,,,,,,6.96580983100803,5.67144494347975,8.22616059078897,3,2
+Dominica,DMA,1992,750,70546,TRUE,0,12.6897619684202,7.5998938571071,,,,,,,7.010416875816,6.76321860850908,9.85008942211807,3,2
+Dominica,DMA,1993,750,70818,TRUE,0,8.17503266490912,7.29569563500414,,,,,,,6.74349938143593,5.15690943330442,7.45926602317253,3,2
+Dominica,DMA,1994,750,71044,TRUE,0,13.9521217215749,7.53500021933327,,,,,,,7.09670690567465,7.16237398030272,10.5244143136248,3,2
+Dominica,DMA,1995,750,71105,TRUE,20.2162019222285,33.3654417624902,8.46004305827493,34.6801556611088,,,,,,7.98700980220053,24.1804606010256,25.3442024085998,4,3
+Dominica,DMA,1996,750,70933,TRUE,43.0413421497107,11.0060351937861,9.72537743694588,44.6973112115531,,,,,,9.23468847874464,27.1175164979989,21.6460116280279,4,3
+Dominica,DMA,1997,750,70592,TRUE,,13.1187064245818,10.5880866136276,51.452534809458,,,,,,9.98213792395217,25.0531092825558,24.8511263859973,3,3
+Dominica,DMA,1998,750,70183,TRUE,100,4.06895044936193,11.1250293813583,54.002556270135,,,,,,10.4687467995625,42.2991340252138,22.8467511730198,4,3
+Dominica,DMA,1999,750,69828,TRUE,100,11.2779059020476,11.6536954340439,48.7100763990934,,,,,,11.2472320119964,42.9104194337962,23.7450714377125,4,3
+Dominica,DMA,2000,750,69650,TRUE,100,11.0805002645303,11.3426000580326,54.4158245699564,,,,,,11.3994772083794,44.2097312231298,25.6319340142887,4,3
+Dominica,DMA,2001,750,69671,TRUE,100,10.7747593003284,9.9294105089722,48.1223981926636,,,,,,9.66218868261425,42.206642000491,22.8531153918687,4,3
+Dominica,DMA,2002,750,69840,TRUE,100,12.6293447925452,9.6421422723691,36.1780370097518,,,,,,9.44320163230723,39.6123810186665,19.4168611448681,4,3
+Dominica,DMA,2003,750,70102,TRUE,100,19.6904254106342,9.4798093869317,44.0141489044126,100,,,,,9.23883055420523,43.2960959254946,24.3144682897507,5,3
+Dominica,DMA,2004,750,70387,TRUE,100,16.3093256851154,10.4327911713671,80.4246081183432,100,,,,,10.3549199165133,51.7916812437064,35.6962845733239,5,3
+Dominica,DMA,2005,750,70580,TRUE,100,11.9531504687669,11.1204334582953,65.5748093439774,100,,,,,10.9501822282841,47.1620983177599,29.4927140136761,5,3
+Dominica,DMA,2006,750,70718,TRUE,100,16.0677547635226,11.707728060108,79.8763886277258,100,79.179598823408,,,,11.057881803095,57.3662940549529,35.6673417314478,6,3
+Dominica,DMA,2007,750,70797,TRUE,100,25.0817335614722,13.0922556317504,74.9827742252466,100,77.2936391792066,,,,12.5492107387054,58.0900805195352,37.5379061751414,6,3
+Dominica,DMA,2008,750,70829,TRUE,100,35.0160683715228,15.1319740363774,80.2657409891596,100,100,,10.3612265518199,,14.2893483796419,66.082756679412,34.9830960730361,6,4
+Dominica,DMA,2009,750,70848,TRUE,100,26.2608821604473,14.0472644096315,100,87.2872935335855,77.2379969377756,50.9089501086452,15.53772730378,,13.0884979608125,61.4091822694166,41.159211506737,7,5
+Dominica,DMA,2010,750,70877,TRUE,100,15.0627717146674,14.9348711028971,100,100,38.1258362578754,0,22.3134498441064,,13.7111016524842,44.6872465125733,30.2174646422516,7,5
+Dominica,DMA,2011,750,70912,TRUE,100,8.7783491947228,15.5136817618173,71.6062735070361,100,,50.863003402771,24.837993007553,,14.1814535827572,49.3522615732694,34.053414538968,6,5
+Dominica,DMA,2012,750,70954,TRUE,100,14.3112748220491,13.9844612793945,59.5792602606888,100,,0,26.891907316896,,13.0632361743732,37.5749992724265,22.7691357148014,6,5
+Dominica,DMA,2013,750,71019,TRUE,100,11.064195558214,14.2280950045938,53.195795944148,100,,0,26.8672944499985,,13.1397154287649,35.6976173013912,20.8534002762251,6,5
+Dominica,DMA,2014,750,71091,TRUE,100,9.91688789896232,21.0180007052734,63.2237800152758,100,,50.7349354671801,28.9047138572283,,19.52999493478,48.9787208173383,34.4620624346853,6,5
+Dominica,DMA,2015,750,71175,TRUE,100,13.9029330367438,20.1802926508358,61.1010341771556,100,51.4872152719247,0,36.0882786155355,,18.9664539162382,41.1119125227767,26.0117399491347,7,5
+Dominica,DMA,2016,750,71307,TRUE,100,25.8530206784458,20.2905551270136,60.6472014877813,100,36.9475716106161,0,42.1966023620223,,19.0505409569213,40.6230581506428,29.5494730970342,7,5
+Dominica,DMA,2017,750,71460,TRUE,100,14.8183819560642,18.1608337339779,39.0977730492193,100,47.1062635104578,0,42.1062567539498,,16.6149040840815,36.5305420416199,22.527463168663,7,5
+Dominica,DMA,2018,750,71626,TRUE,,8.15694770253303,19.4281299719487,33.7494746691735,100,,0,,,17.538822788891,15.3336380859138,14.8613112901494,5,4
+Dominica,DMA,2019,750,71808,TRUE,,19.9077303807674,21.2178212236182,54.4721847335129,,,,,,19.7365178201287,31.8659121126328,31.3721443114697,3,3
+Dominica,DMA,2020,750,71991,TRUE,,,12.5265945333517,,,,,,,11.2818829669803,12.5265945333517,11.2818829669803,1,1
+Denmark,DNK,1990,42390,5140939,FALSE,0.0495660154929227,22.3041427475358,42.4716157617397,,,,,,,44.4864029156683,21.6084415082561,33.3952728316021,3,2
+Denmark,DNK,1991,42390,5154298,FALSE,0.0986219982185854,28.9696635701018,43.8567873221245,,,,,,,48.0335503907484,24.3083576301483,38.5016069804251,3,2
+Denmark,DNK,1992,42430,5171370,FALSE,0.195985468616275,27.5928163500646,46.1759002457392,,,,,,,55.6803160169535,24.65490068814,41.636566183509,3,2
+Denmark,DNK,1993,42430,5188628,FALSE,0.291970021777354,26.0836955564937,41.5632074742117,,,,,,,57.0350816727771,22.6462910174942,41.5593886146354,3,2
+Denmark,DNK,1994,42430,5206180,FALSE,0.676386010895364,77.2347441904664,47.261280009797,,,,,,,61.7751284680335,41.7241367370529,69.50493632925,3,2
+Denmark,DNK,1995,42430,5233373,FALSE,1.91487032205367,59.5704188050881,57.0704879186517,,,,,,,74.8289217133966,39.5185923485978,67.1996702592424,3,2
+Denmark,DNK,1996,42430,5263074,FALSE,2.8444016924435,27.3659522042268,57.5271705678683,11.6200775514665,,,,,,82.5154742072587,24.8394005040013,40.500501320984,4,3
+Denmark,DNK,1997,42430,5284991,FALSE,5.64143529947626,59.3070983292836,54.2655990160387,10.7857693604502,,,,,,63.9358408622899,32.4999755013122,44.6762361840079,4,3
+Denmark,DNK,1998,42430,5304219,FALSE,11.1949239143618,90.0401343434028,56.0360164228738,10.964238508724,,,,,,58.9036325248048,42.0588282973406,53.3026684589772,4,3
+Denmark,DNK,1999,42430,5321799,FALSE,15.0579230715596,100,59.6601368754614,10.8275766234018,,,,,,60.4471297790264,46.3864091426057,57.0915688008094,4,3
+Denmark,DNK,2000,42430,5339616,FALSE,19.2170000346278,100,62.6388268854648,11.3988844464443,,,,,,65.8671356500818,48.3136778416342,59.0886733655087,4,3
+Denmark,DNK,2001,42430,5358783,FALSE,20.9984951214559,100,63.5251598792212,11.2107582155095,,,,,,65.2971266188534,48.9336033040467,58.8359616114543,4,3
+Denmark,DNK,2002,42430,5375931,FALSE,31.3065016525345,57.7645641393442,69.3917704207527,11.1501371699099,,,,,,69.4517685807894,42.4032433456353,46.1221566300145,4,3
+Denmark,DNK,2003,42430,5390574,FALSE,37.05756530691,16.6070468364437,80.4470422226907,60.1301777117174,53.0964646955385,,100,,,80.2512062284168,58.8483664155524,64.2471076941445,6,4
+Denmark,DNK,2004,42430,5404523,FALSE,39.2253895201397,100,94.107683036714,59.9772265334389,55.7491368931877,,100,,,93.3342467939389,78.6620598180585,88.3278683318445,6,4
+Denmark,DNK,2005,42430,5419432,FALSE,39.99234213523,100,100,72.6159907450383,55.8626155447475,,91.8432092195321,,,100,80.8903084199601,91.1147999911426,6,4
+Denmark,DNK,2006,42430,5437272,FALSE,41.7448208750785,83.7670693037236,100,73.8724093652982,51.8736038805348,,70.3147669481154,25.4361656191847,,100,73.9398132984432,70.6780822472644,6,5
+Denmark,DNK,2007,42430,5461438,FALSE,40.7831029154061,100,100,74.962417988157,52.4254446745766,19.7160918233017,70.6640468702219,25.3236141149623,,100,67.6876099328478,74.1900157946682,7,5
+Denmark,DNK,2008,42430,5493621,FALSE,40.5394171202716,100,100,73.450787920491,53.0191550143808,45.7495414849573,92.5725343846834,49.2578820733654,,100,75.3853801517339,83.056240875708,7,5
+Denmark,DNK,2009,42430,5523095,FALSE,41.1862636614379,78.8732447005701,100,73.9188082703962,47.0151507317506,45.4504093161952,100,57.2447157435466,,100,73.2381209914332,82.0073537429026,7,5
+Denmark,DNK,2010,42430,5547683,FALSE,41.8914111309549,97.5713175845077,100,75.4480806470965,50.4435111891927,46.7918881522136,93.6208523109216,60.0510494778863,,100,75.8872583042824,85.3382600040824,7,5
+Denmark,DNK,2011,42430,5570572,FALSE,42.2318457958093,100,100,73.3956551300013,50.9974687062047,48.5514386745946,86.7614381140461,67.0098493477898,,100,75.1567296190752,85.4333885183674,7,5
+Denmark,DNK,2012,40000,5591572,FALSE,43.2209867686992,100,100,74.3974594490533,51.5480877414986,45.9451867642501,100,77.9385523381632,,100,77.2606054970004,90.4672023574433,7,5
+Denmark,DNK,2013,40000,5614932,FALSE,44.1466807763321,60.0573712281799,100,72.4609757597065,52.3542603219724,44.8445136058443,86.0759912743089,39.8640173651711,,100,67.9309221073953,71.6916711254733,7,5
+Denmark,DNK,2014,40000,5643475,FALSE,44.5547981140567,100,100,78.7782039757466,51.9039959696697,43.4572626880663,94.5881748390841,45.5142419775845,,100,76.8964066028256,83.776124158483,7,5
+Denmark,DNK,2015,40000,5683483,FALSE,44.3980964638726,70.2867464446179,100,79.5103703539968,53.6048646438896,43.1592569642483,99.6338294098312,51.0045029541555,,100,72.8313832727611,80.0870898325203,7,5
+Denmark,DNK,2016,40000,5728010,FALSE,44.3444020235692,100,100,81.3163544347937,56.4938733057138,40.381436207824,86.8954535741081,57.6547169949539,,100,75.4896077067158,85.1733050007711,7,5
+Denmark,DNK,2017,40000,5764980,FALSE,44.1198133080831,99.2911257891764,100,81.8063303352512,54.2654509190549,37.5825732880433,96.974071216393,61.7404922023681,,100,76.6289856561579,87.9624039086377,7,5
+Denmark,DNK,2018,40000,5793636,FALSE,44.0009889482949,100,100,80.2547627603001,55.8357359140449,,92.759158030863,,,100,83.4029819478916,93.2534801977908,6,4
+Denmark,DNK,2019,40000,5814422,FALSE,44.1713172991585,74.7640549623009,100,91.3439878666358,,,,,,100,77.5698400320238,88.7026809429789,4,3
+Denmark,DNK,2020,40000,5831404,FALSE,43.3700975558119,100,100,,,,,,,100,81.1233658519373,100,3,2
+Dominican Republic,DOM,1990,48310,7133491,FALSE,0,0.816498103499834,1.34069712183954,,,,,,,1.28537274089574,0.719065075113126,1.05093542219779,3,2
+Dominican Republic,DOM,1991,48310,7270413,FALSE,0,0.874718160556963,1.31479655305482,,,,,,,1.24453838114949,0.729838237870593,1.05962827085323,3,2
+Dominican Republic,DOM,1992,48310,7408339,FALSE,0,1.0638648325122,1.47754469577011,,,,,,2.60916340434285,1.40328473903095,1.28764323315629,1.69210432529533,3,3
+Dominican Republic,DOM,1993,48310,7546467,FALSE,0,1.11645933819022,2.04875878556593,,,,,,2.36031479860142,2.03416607345446,1.38138323058939,1.83698007008203,3,3
+Dominican Republic,DOM,1994,48310,7683707,FALSE,0,1.19526748244975,2.2423790906523,,,,,,,2.19380739969338,1.14588219103402,1.69453744107157,3,2
+Dominican Republic,DOM,1995,48310,7819239,FALSE,0.00577333342556633,2.35863498084191,2.39270137788496,3.06535058686194,,,,,,2.35929010514441,1.9556150697536,2.59442522428275,4,3
+Dominican Republic,DOM,1996,48310,7952766,FALSE,0.0246992164468282,0.948018681487688,2.62371296888287,3.65694222702217,,,,,,2.54631834038918,1.81334327345989,2.38375974963301,4,3
+Dominican Republic,DOM,1997,48310,8084407,FALSE,0.0462331039049681,2.28181442794605,2.95698475250055,4.26153861989563,,,,,,2.85768851136224,2.3866427260618,3.13368051973464,4,3
+Dominican Republic,DOM,1998,48310,8214427,FALSE,0.0745923665473561,3.73642170817475,3.20134642244002,4.51793251708293,,,,,,3.10598195389693,2.88257325356126,3.78677872638487,4,3
+Dominican Republic,DOM,1999,48310,8343288,FALSE,0.346848212611075,7.1072023324935,3.32825306732779,4.79611897998438,,,,,,3.25921210105228,3.89460564810418,5.05417780451005,4,3
+Dominican Republic,DOM,2000,48310,8471317,FALSE,1.14555596141902,5.30731082409537,3.87252484052125,5.04769857462692,,,,,,3.78774380455645,3.84327255016564,4.71425106775958,4,3
+Dominican Republic,DOM,2001,48310,8598599,FALSE,1.34937104655731,5.59396017957638,3.56303110557175,4.83167941773072,,,,,,3.50901847172419,3.83451043735904,4.64488602301043,4,3
+Dominican Republic,DOM,2002,48310,8724974,FALSE,2.04867239416364,4.70110097648617,3.61880797188358,4.71851301848883,,,,,,3.58080846560991,3.77177359025556,4.3334741535283,4,3
+Dominican Republic,DOM,2003,48310,8850317,FALSE,2.3377335147298,3.07284827049749,3.44064956739862,5.49032589180113,6.68110651995649,,8.15066239389459,,,3.4958431279529,4.49844392766432,5.05241992103653,6,4
+Dominican Republic,DOM,2004,48310,8974444,FALSE,2.58769683753854,4.69122984257612,3.6020676556967,5.78525924524767,7.0314079925471,,4.42086108847192,,,3.72479186192441,4.21742293390619,4.65553550955503,6,4
+Dominican Republic,DOM,2005,48310,9097262,FALSE,3.30649017359792,5.41267864029567,4.32957824902371,5.87405326868719,7.29992502689497,,3.17176512871437,,,4.42404119019148,4.41891309206377,4.72063455697218,6,4
+Dominican Republic,DOM,2006,48310,9218681,FALSE,4.21817325045339,9.38584753369273,5.13350746752616,6.17618046481142,7.33057941169773,,5.08623357993024,,,5.24250211867877,5.99998845928279,6.47269092427829,6,4
+Dominican Republic,DOM,2007,48310,9338856,FALSE,4.95349939562893,13.3302760232901,5.75408957068629,6.25278064161806,6.94277909608268,,6.56563866645487,,,5.89640933109934,7.37125685953565,8.01127616561559,6,4
+Dominican Republic,DOM,2008,48310,9458079,FALSE,5.76624222385973,13.3087780520306,6.31250142499618,6.251007453642,7.01176837128303,,3.43211086264723,,,6.23238942008536,7.01412800343515,7.3060714471013,6,4
+Dominican Republic,DOM,2009,48310,9576736,FALSE,7.58212263344891,9.91698919186745,4.96089153242504,6.2192041664607,7.53504895988014,,2.63634510558515,,,4.91555722262598,6.26311052595745,5.92202392163482,6,4
+Dominican Republic,DOM,2010,48310,9695117,FALSE,8.48382472711151,9.15487249770523,7.46620342662253,6.11192267228672,8.04827856196599,,3.72022049584064,,,7.15802772208364,6.98740876391332,6.53626084697906,6,4
+Dominican Republic,DOM,2011,48310,9813219,FALSE,10.1434851925582,10.175448005174,8.4403569138044,6.26488722808934,7.9498929518421,,1.83772383827228,,,8.15155138495043,7.37238023557964,6.60740261412151,6,4
+Dominican Republic,DOM,2012,48310,9930916,FALSE,11.1627563259776,16.2939229354229,8.65720789147846,6.50499560732583,8.48701774948573,,2.17913269871418,,,8.35688950895952,8.9596030917838,8.3337351876056,6,4
+Dominican Republic,DOM,2013,48310,10048226,FALSE,11.9657075740702,8.68824402607248,8.49031281114534,6.65511135228815,8.90920860833738,,2.87158931122552,,,8.28185041556681,7.73419301496034,6.62419877628824,6,4
+Dominican Republic,DOM,2014,48310,10165182,FALSE,12.7763399131313,11.0545263860939,8.81582523702089,7.17246664994853,9.91878460840029,,1.77409381223932,,,8.6133851649491,8.31865039968679,7.15361800330772,6,4
+Dominican Republic,DOM,2015,48310,10281675,FALSE,13.812644138286,9.59665670634504,8.68458467554271,7.80482044029725,10.1458619218378,,4.91118053840081,,,8.42128279259865,8.96197729977437,7.68348511941044,6,4
+Dominican Republic,DOM,2016,48310,10397738,FALSE,16.0908512494165,11.074710328739,9.01841530712571,8.49111679849578,10.4524392641762,,2.08129727675229,,,8.74166757939902,9.35127819210585,7.59719799584652,6,4
+Dominican Republic,DOM,2017,48310,10513111,FALSE,16.8362655539203,15.1233486502007,9.17581704548193,9.0322902480137,10.1488545509815,,1.71538058396668,,,8.97128725080824,10.3766204163167,8.71057668324734,6,4
+Dominican Republic,DOM,2018,48310,10627147,FALSE,18.4428485296725,12.1901463031673,10.0180825322256,9.2176997516808,10.4456429622556,,3.39394693354416,,,9.74207489773863,10.6525448100581,8.63596697153272,6,4
+Dominican Republic,DOM,2019,48310,10738957,FALSE,18.4893735236249,12.3380874694725,10.1092067298637,9.1409438632519,,,,,,9.90445343574855,12.5194028965533,10.461161589491,4,3
+Dominican Republic,DOM,2020,48310,10847904,FALSE,,0.400265892330584,7.68705461754484,,,,,,,7.62163920392022,4.04366025493771,4.0109525481254,2,2
+Algeria,DZA,1990,2381740,25758872,FALSE,0,0.00855377209503306,2.17578494528955,,,,,,,2.09012658437736,0.72811290579486,1.0493401782362,3,2
+Algeria,DZA,1991,2381740,26400468,FALSE,0,0.102881936510654,1.86350683341272,,,,,,,1.83380977469003,0.655462923307792,0.968345855600343,3,2
+Algeria,DZA,1992,2381740,27028330,FALSE,0,0.0486828215604653,,,,,,,1.1094536776496,,0.386045499736687,0.579068249605031,2,2
+Algeria,DZA,1993,2381740,27635517,FALSE,0,0.0000031741074536248,,,,,,,0.996170716838183,,0.332057963648546,0.498086945472818,2,2
+Algeria,DZA,1994,2381740,28213777,FALSE,0.0000334864185279239,0.00000310905202428143,,,,,,,0.702570022027374,,0.234202205832642,0.351286565539699,2,2
+Algeria,DZA,1995,2381740,28757788,FALSE,0.000161129906765858,0.00000305023809531091,,0.678648242439546,,,,,0.714883551984071,,0.34842399364212,0.464511614887238,3,3
+Algeria,DZA,1996,2381740,29266415,FALSE,0.000155606776465692,0.404627195568858,,0.612452888485936,,,,,0.73277592098575,,0.437502902954252,0.583285335013515,3,3
+Algeria,DZA,1997,2381740,29742980,FALSE,0.000904348989119941,0.383397928631629,,0.595673080280429,,,,,0.877921318970408,,0.464474169217897,0.618997442627489,3,3
+Algeria,DZA,1998,2381740,30192750,FALSE,0.00175586824363618,0.882621123621448,,0.62500087080122,,,,,0.780888910180224,,0.572566693211632,0.762836968200964,3,3
+Algeria,DZA,1999,2381740,30623406,FALSE,0.0170669691266957,0.428516273923725,,0.653876493952596,,,,,0.965970857566211,,0.516357648642307,0.68278787514751,3,3
+Algeria,DZA,2000,2381740,31042238,FALSE,0.041492279421382,0.415105024407015,,0.731128592928316,,,,,1.00619953085147,,0.548481356902046,0.717477716062267,3,3
+Algeria,DZA,2001,2381740,31451513,FALSE,0.053812443705304,1.56519150670102,,0.806183033599847,,,,,1.16190719346172,,0.896773544366973,1.17776057792086,3,3
+Algeria,DZA,2002,2381740,31855110,FALSE,0.130882376972113,1.60198224819089,,0.85467843022317,,,,,1.10019151632442,,0.92193364292765,1.18561739824616,3,3
+Algeria,DZA,2003,2381740,32264159,FALSE,0.178238056712596,0.905614780621109,,0.909714519009489,1.10376261754402,1.75992237978804,0.782527171437541,100,1.10409825079406,,0.940019193060472,20.7403909443724,6,5
+Algeria,DZA,2004,2381740,32692153,FALSE,0.371340333590898,1.52310612079269,,0.983622295204703,1.14814132593033,6.48219352632756,1.10326086424999,100,1.08096571265504,,1.92408147547015,20.9381909985805,6,5
+Algeria,DZA,2005,2381740,33149720,FALSE,0.461786394574526,1.60222499162594,5.32548098898859,1.08179475683554,1.16413278522524,6.07013517819705,0.870426005962596,100,1.00520891722595,5.15736409713863,2.34529389048717,18.2861697947981,7,6
+Algeria,DZA,2006,2381740,33641007,FALSE,0.57433611861178,2.50317644994098,5.90744341728699,1.07716948140884,1.25420814416542,4.43007796906552,0.857714466703639,,0.938664720672822,5.75575638392524,2.32694037481294,2.2264963005303,7,5
+Algeria,DZA,2007,2381740,34166976,FALSE,0.724594568257201,2.3538977043725,6.79833789896856,1.15122952041586,1.29563192785919,5.47031452060938,1.05563843206297,,,6.53321871028457,2.92566877411441,2.77349609178398,7,4
+Algeria,DZA,2008,2381740,34730604,FALSE,0.767804292531404,3.7335227901787,9.06172666353268,1.15665772778048,1.37556555817472,5.74243616338311,0.519253465516652,0.0675072958922102,,8.62020920590954,3.49690018382051,2.81943009705552,7,5
+Algeria,DZA,2009,2381740,35333882,FALSE,0.832536908288526,3.67585338134949,6.61333235175475,1.2324623022768,1.48225302035627,6.62041847600452,0.612465502199384,0.415288068564131,1.22367937422399,6.42608641036421,2.97296404229964,2.26430583982967,7,6
+Algeria,DZA,2010,2381740,35977451,FALSE,0.91011174005021,3.07157278114707,7.44292698699388,1.29075171753578,1.61798661345879,6.67526358615704,0.701761252654644,0.73423209000905,1.40075027644516,7.06631390674975,3.07044833442626,2.37756367075691,7,6
+Algeria,DZA,2011,2381740,36661438,FALSE,1.0646132493319,3.71477888123456,8.92317362933758,1.36041677438579,1.66224122591847,10.9210985224312,0.196762456360675,1.37327362497094,1.28857067606998,8.43599558698703,3.92420202702167,2.72829966666816,7,6
+Algeria,DZA,2012,2381740,37383899,FALSE,1.27526924826262,1.80890282344063,8.86621135586612,1.47545197827024,1.71111718485381,10.2469998578787,0.38591986323281,2.05030724179837,1.49923713624499,8.41266898930389,3.65114175188515,2.60541467204849,7,6
+Algeria,DZA,2013,2381740,38140135,FALSE,1.54530918566298,2.25807193163115,8.47941346024686,1.54936493119143,1.91834175619127,11.0190973374353,0.567401866400939,2.40510847709366,1.82269217803709,8.05702657518867,3.89162155580082,2.77661099325716,7,6
+Algeria,DZA,2014,2381740,38923688,FALSE,1.98528621583719,1.71360535227783,8.34496737173351,1.60272443829385,2.06828692570126,8.92439059492069,0.18532659584042,4.64278746480599,1.72556516232598,7.9098133489967,3.49740939017564,2.96330372709013,7,6
+Algeria,DZA,2015,2381741,39728020,FALSE,2.5187295421807,0.705351400184733,6.12535896639833,1.63384816758841,2.13242865464893,7.76499773703128,0.453936201363332,8.63605370005649,2.07429649026326,5.81938001026386,3.03950264357286,3.22047766162001,7,6
+Algeria,DZA,2016,2381741,40551398,FALSE,2.77413248687521,1.82222916055886,5.50779309627419,1.96641839048915,2.23717910285488,8.02083980414736,0.80049461366722,9.90868960962822,2.00138915307337,5.14496362823374,3.27047095786934,3.60736409260843,7,6
+Algeria,DZA,2017,2381741,41389174,FALSE,3.0183198914466,1.31273517534131,5.67738946256544,2.20248124107066,2.33765706570161,4.6189979161621,0.261430486433286,8.85739562225249,2.04505595128847,5.32278643822861,2.73377287490112,3.33364748576914,7,6
+Algeria,DZA,2018,2381741,42228415,FALSE,3.04191593395079,2.40161730500264,5.94838353819589,2.37673644795362,2.14447539611864,,0.427058095514276,,,5.54144650373424,2.83914226412344,2.68671458805119,6,4
+Algeria,DZA,2019,2381741,43053054,FALSE,3.49847661092831,1.43878906179097,5.1780727267666,2.28490989913808,,,,,,4.8325677625376,3.10006207465599,2.85208890782221,4,3
+Algeria,DZA,2020,2381741,43851043,FALSE,,0.0154705455731758,3.67541157018202,,,,,,,3.43063356799044,1.8454410578776,1.72305205678181,2,2
+Ecuador,ECU,1990,276840,10230931,FALSE,0,0.540150288488107,1.32912614100782,,,,,,,1.41105647952242,0.623092143165308,0.975603384005266,3,2
+Ecuador,ECU,1991,276840,10472476,FALSE,0,0.67008490060593,1.46718405436294,,,,,,,1.50954595289202,0.712422984989622,1.08981542674898,3,2
+Ecuador,ECU,1992,276840,10716131,FALSE,0.00125106631672362,0.72851955094691,1.48240761538444,,,,,,1.26260145360598,1.48482723110494,0.868694921563514,1.15864941188594,3,3
+Ecuador,ECU,1993,276840,10961460,FALSE,0.00391931731062593,1.89545090554737,1.67999457000289,,,,,,1.23750554750915,1.63669799734685,1.20421758509251,1.58988481680113,3,3
+Ecuador,ECU,1994,276840,11207999,FALSE,0.00814113949673821,2.25528985405783,2.01416395643307,,,,,,5.47639335529973,1.95048837567118,2.43849707632184,3.22739052834292,3,3
+Ecuador,ECU,1995,276840,11455205,FALSE,0.0100235087711547,1.73243019709119,2.26513895018851,0.75254452747068,,,,,1.16758838493485,2.17823779111876,1.18554511369128,1.45770022515387,4,4
+Ecuador,ECU,1996,276840,11703169,FALSE,0.0192851818960106,1.87261161720724,2.18057106675444,0.796773346960405,,,,,1.18659758024322,2.11316812958122,1.21116775861226,1.49228766849802,4,4
+Ecuador,ECU,1997,276840,11951457,FALSE,0.0241572005767827,2.65672707741722,2.42078428011066,0.862522204190628,,,,,1.57911766376971,2.33341958613035,1.508661685213,1.85794663287698,4,4
+Ecuador,ECU,1998,248360,12198449,FALSE,0.0269009218723221,3.1279793467261,2.28345769518485,0.836065835367551,,,,,2.16608361492834,2.23061095711775,1.68809748281583,2.09018493853494,4,4
+Ecuador,ECU,1999,248360,12442109,FALSE,0.173347264751093,2.28567735347852,1.81981888064976,0.881174872097174,,,,,1.4105997941165,1.82813216894885,1.31412363301861,1.60139604716026,4,4
+Ecuador,ECU,2000,248360,12681123,FALSE,0.302037421175807,0.0810676164172154,2.02886952447085,1.09732242510193,,,,,,2.05249699995412,0.87732424679145,1.07696234715776,4,3
+Ecuador,ECU,2001,248360,12914660,FALSE,0.541645998335404,1.82901494890025,2.26549146769557,1.1301286283006,,,,,,2.22635443837219,1.44157026080796,1.72849933852435,4,3
+Ecuador,ECU,2002,248360,13143465,FALSE,0.849172762609059,2.61370072310121,2.52106194423618,1.20932540662626,,,,,,2.42251195249529,1.79831520914317,2.08184602740758,4,3
+Ecuador,ECU,2003,248360,13369678,FALSE,0.873878872404599,2.85898812348385,2.73414986144642,1.24699090162592,1.85486771297756,,4.04661648990046,,,2.63684196475317,2.35212484977225,2.69735936994085,6,4
+Ecuador,ECU,2004,248360,13596390,FALSE,0.931403556915637,2.69978837783938,3.27792443011411,1.26906034709535,1.94955832106085,,5.57079807531582,,,3.17463063280085,2.74979495745606,3.17856935826285,6,4
+Ecuador,ECU,2005,248360,13825839,FALSE,1.13568744467071,1.56523319893126,4.0451213966183,1.33759678841032,1.92142322756986,,2.3478629886892,,,3.8720797402604,2.08630036346396,2.28069317907279,6,4
+Ecuador,ECU,2006,248360,14059379,FALSE,1.34147150500291,0.846738087198821,4.77422458606342,1.35855619432372,1.91440181268648,,3.33502389151504,0.156485444681803,,4.52879766865225,2.33120285282078,2.04512025727433,6,5
+Ecuador,ECU,2007,248360,14296554,FALSE,1.97882541903486,0.594763248554985,5.32524798278862,1.47534693521954,1.98822073590962,,3.02741258960499,0.22190361751072,,5.04123306559045,2.4803192350406,2.07213189129614,6,5
+Ecuador,ECU,2008,248360,14535740,FALSE,3.38794067590646,3.19053147975962,6.924717802424,1.51957603920406,1.99745789403794,1.41035659065834,2.97759643248762,0.301353918286924,,6.35568372149722,3.23511983674002,2.86894831824709,7,5
+Ecuador,ECU,2009,248360,14774412,FALSE,4.36154136268385,0.916193067994178,5.30676980012774,1.46375997208903,2.09688458516055,8.86299389270732,3.66186887569261,0.844322826913348,,4.87262175381145,4.09552116188245,2.35175329930012,7,5
+Ecuador,ECU,2010,248360,15011114,FALSE,5.06581361223009,0.484702432711513,6.77152445149727,1.57337518610893,2.28814619955941,9.12610733959722,2.64302637834009,1.69257757415089,1.31293506449994,6.08431267782512,3.85392635214072,2.29848821893941,7,6
+Ecuador,ECU,2011,248360,15243885,FALSE,5.39001235566123,1.85888612723377,8.08976251463019,1.72225671098722,2.50948326849456,9.18081253594542,0.94642469352066,4.11609764130203,3.71015554892733,7.26863241674009,4.41404435527226,3.27040885645185,7,6
+Ecuador,ECU,2012,248360,15474099,FALSE,5.94773336519995,1.60826061080596,8.42002017145281,1.79945413240639,2.50601514923613,8.16399181024821,1.86468875366368,5.49501397218864,3.66780071429412,7.56391884763027,4.49599279401016,3.66652283849818,7,6
+Ecuador,ECU,2013,248360,15707473,FALSE,6.71720753900099,2.03018596048704,8.77408836682015,1.93356167712255,2.59811599232169,6.89988788955184,3.21472220020128,7.29803858743261,3.21521953851026,7.88360447014645,4.68355331024202,4.26255540565003,7,6
+Ecuador,ECU,2014,248360,15951832,FALSE,7.48648296278694,2.12366137356959,8.9296263197667,2.124005132997,2.74359782964765,9.23676078997511,3.39158282631484,11.6644850449211,2.85604619482749,8.04290165708493,5.16402365717681,5.03378037161916,7,6
+Ecuador,ECU,2015,248360,16212022,FALSE,7.90761877746301,3.57835835746195,6.72830727363625,2.16932093005914,2.72311693909012,7.18407731716192,4.2270574669001,15.7148904240837,4.33345413025066,6.14077686810264,5.16117060756186,6.02730969614303,7,6
+Ecuador,ECU,2016,248360,16491116,FALSE,8.58745717230066,2.01069862441603,5.77058017345074,2.16057515519273,2.69780361840935,5.11840847330584,1.74969228149134,18.0230893428696,3.79402953514233,5.31435431847472,4.17020591647138,5.50873987626446,7,6
+Ecuador,ECU,2017,248360,16785356,FALSE,,1.6317870492498,6.52806703453882,2.28044749835223,2.5136445372299,3.59012280149599,1.07438808485721,19.8057888710183,3.64093979951271,6.04213951592771,3.12429204466779,5.74591513648633,6,6
+Ecuador,ECU,2018,248360,17084359,FALSE,,3.56423993662935,7.28436372257381,2.79797965554159,2.48367453138361,,1.90005230372856,,,6.77446813069955,3.88665890461833,3.75918500664976,5,4
+Ecuador,ECU,2019,248360,17373657,FALSE,,2.45962516029502,7.20580506560881,2.5318106120459,,,,,,6.71323049053701,4.06574694598324,3.90155542095931,3,3
+Ecuador,ECU,2020,248360,17643060,FALSE,,,5.7393210249802,,,,,,,5.37196744466401,5.7393210249802,5.37196744466401,1,1
+"Egypt, Arab Rep.",EGY,1990,995450,56134478,FALSE,0,0.582865515992491,0.995776230878097,,,,,,,0.961421291964,0.526213915623529,0.772143403978246,3,2
+"Egypt, Arab Rep.",EGY,1991,995450,57424552,FALSE,0,0.240587002365814,0.979143413918587,,,,,,,0.954425647343196,0.406576805428134,0.597506324854505,3,2
+"Egypt, Arab Rep.",EGY,1992,995450,58666812,FALSE,0,0.346136760669234,0.999342592642932,,,,,,1.4038833069907,0.995375500321656,0.687340665075716,0.915131855993862,3,3
+"Egypt, Arab Rep.",EGY,1993,995450,59880656,FALSE,0.0000426859894491438,0.379404461234843,1.04199613608516,,,,,,1.03824714176818,1.00753939820449,0.614922606269407,0.808397000402502,3,3
+"Egypt, Arab Rep.",EGY,1994,995450,61095804,FALSE,0.000273682434416683,0.932517497783668,1.06114806053604,,,,,,1.15974769631944,1.03487353844432,0.788421734268391,1.04237957751581,3,3
+"Egypt, Arab Rep.",EGY,1995,995450,62334025,FALSE,0.00131615384505746,0.486196803765537,1.14194736362289,0.609121095455435,,,,,1.48959234097262,1.10723410283766,0.745634751532308,0.923036085757814,4,4
+"Egypt, Arab Rep.",EGY,1996,995450,63601632,FALSE,0.00253155949220678,0.442027198429109,1.19082693687064,0.742685669010282,,,,,1.7173858715913,1.14416059021568,0.819091447078706,1.01156483231159,4,4
+"Egypt, Arab Rep.",EGY,1997,995450,64892269,FALSE,0.00365237954654892,0.689223341683743,1.29796621671736,0.740053678026698,,,,,1.72118668419271,1.2307841664278,0.890416460033411,1.09531196758274,4,4
+"Egypt, Arab Rep.",EGY,1998,995450,66200259,FALSE,0.00585571697845545,0.742685845491227,1.19192962755972,0.632366800332672,,,,,1.46312536012691,1.12933841729687,0.807192670097795,0.991879105811918,4,4
+"Egypt, Arab Rep.",EGY,1999,995450,67515591,FALSE,0.0112687395298221,0.716393945402233,1.26449854676746,0.861662370800908,,,,,1.66241039320768,1.18240493191816,0.903246799141621,1.10571791033225,4,4
+"Egypt, Arab Rep.",EGY,2000,995450,68831561,FALSE,0.024404225977699,0.819431345134645,1.35955692706061,0.970290868795957,,,,,1.57267326699056,1.26460368085969,0.949271326791894,1.15674979044521,4,4
+"Egypt, Arab Rep.",EGY,2001,995450,70152662,FALSE,0.0313259856742138,0.326539026332773,1.24025597583993,0.803415925388247,,,,,1.57679642171756,1.14335971961586,0.795666666990544,0.962527773263609,4,4
+"Egypt, Arab Rep.",EGY,2002,995450,71485044,FALSE,0.0996709880915904,0.413956536164559,1.17861921048363,0.880860052169412,,,,,1.56486765243509,1.06760364327949,0.827594887868858,0.981821971012139,4,4
+"Egypt, Arab Rep.",EGY,2003,995450,72826102,FALSE,0.145238577399011,0.155439060418365,1.28168713915388,1.00673289186073,0.929085347357712,1.94889449516418,2.08009878774627,100,1.37563495896491,1.14958243517005,1.14196084438676,17.6279146890267,7,6
+"Egypt, Arab Rep.",EGY,2004,995450,74172073,FALSE,0.420969791520968,0.835054869764106,1.70495682807427,1.32582613717642,1.02081186155268,2.88908957238959,2.52862636668466,100,1.47654361682086,1.5189300754322,1.59729531177584,17.947496844313,7,6
+"Egypt, Arab Rep.",EGY,2005,995450,75523576,FALSE,0.442224432577515,3.17521700947788,2.04575660335583,1.38314267040644,1.12184493222951,3.69028207615595,2.29234736276617,100,1.5493568253008,1.85861119460622,2.0826181400058,18.3764458437596,7,6
+"Egypt, Arab Rep.",EGY,2006,995450,76873670,FALSE,0.465466230265416,5.81442713584048,2.39287716853157,1.43388756333995,1.23535453299594,4.71505164260316,2.29900650726793,,1.73479220744607,2.20242363090479,2.69364406504208,2.69690740895984,7,5
+"Egypt, Arab Rep.",EGY,2007,995450,78232124,FALSE,0.536739422829287,6.86370174829848,2.9959183530094,1.72076790453152,1.42006123613911,5.13678092562106,1.98246290467307,,,2.75135930057215,3.2060618764938,3.3295729645188,7,4
+"Egypt, Arab Rep.",EGY,2008,995450,79636081,FALSE,0.592405288838443,6.28662636929818,3.66828461340268,1.95644144437869,1.71152487185397,5.73358604486382,2.71745966301177,,,3.32732756965321,3.49246723729893,3.57196376158546,7,4
+"Egypt, Arab Rep.",EGY,2009,995450,81134789,FALSE,0.645710693245162,3.93686475404011,2.89800472040734,2.58161377549535,1.86207252483724,7.92168012579247,2.6672632110726,,2.38590205088975,2.62999513398475,3.29100561870611,2.84032778509651,7,5
+"Egypt, Arab Rep.",EGY,2010,995450,82761244,FALSE,0.683662620146322,4.00698018536777,3.13975546150795,2.83865472835359,2.09667098607895,8.2973173818933,1.78681085544327,,2.79651372537557,2.91435570650901,3.36424213686968,2.86866304020984,7,5
+"Egypt, Arab Rep.",EGY,2011,995450,84529251,FALSE,0.793319333799694,0.575003314343677,3.06586443854911,2.11227882082711,2.07452041677516,9.16118802066314,1.10939974766522,,2.31762793754084,2.84674655670777,2.73352594476983,1.79221127541692,7,5
+"Egypt, Arab Rep.",EGY,2012,995450,86422240,FALSE,0.800190704660822,1.52695776438898,3.2489662655096,2.417673860103,2.18304207208855,0.855301682833855,1.16856869625601,,2.74246658703009,3.00362849612852,1.82287508011177,2.17185908078132,7,5
+"Egypt, Arab Rep.",EGY,2013,995450,88404652,FALSE,0.871138695865124,2.22915287954402,2.97596615877373,2.09354725943468,2.12932699302217,13.008107547562,0.61198091090794,,2.93095955690278,2.77335311204563,3.53155042985576,2.12779874376701,7,5
+"Egypt, Arab Rep.",EGY,2014,995450,90424668,FALSE,0.981880724109625,2.35964254298158,3.20409135727222,2.15583345583326,2.13611552766899,10.7812436620869,0.757859002021978,,2.78934358989547,2.96023295850348,3.28998490488587,2.20458230984715,7,5
+"Egypt, Arab Rep.",EGY,2015,995450,92442549,FALSE,1.07166149342504,3.37184432465284,2.72356921895825,1.22434771623922,2.28029900133099,8.83460048528859,1.09246581165048,,2.88754688345846,2.5005363786022,3.02943370481041,2.21534822292064,7,5
+"Egypt, Arab Rep.",EGY,2016,995450,94447071,FALSE,1.14401100418486,3.86055199451748,2.57317309611919,0.692976252318289,2.15760584138801,6.56962643826367,0.45826267674905,,3.39515532223703,2.35396110229977,2.67053668348422,2.15218146962432,7,5
+"Egypt, Arab Rep.",EGY,2017,995450,96442590,FALSE,1.22089382857223,3.45974217994258,2.79947020956202,1.04301143782787,2.16756151780689,4.50706945706845,0.934959673235989,,3.22580226445651,2.58782414468421,2.45584986438081,2.25026794002943,7,5
+"Egypt, Arab Rep.",EGY,2018,995450,98423602,FALSE,1.24886065112776,3.77203839870911,3.10740838322172,1.39892984413142,2.21810334781238,,0.769558741034932,,,2.92904443379842,2.05935920364499,2.21739285441847,6,4
+"Egypt, Arab Rep.",EGY,2019,995450,100388076,FALSE,1.4947126321682,4.11342426238325,3.1549415569879,1.57482280527775,,,,,,3.03790052841191,2.58447531420427,2.90871586535764,4,3
+"Egypt, Arab Rep.",EGY,2020,995450,102334403,FALSE,1.84080628999715,0.139933194369864,2.62392793090602,,,,,,,2.5345938085791,1.53488913842434,1.33726350147448,3,2
+Eritrea,ERI,1990,101000,2258649,FALSE,0,,,,,,,,,,0,,1,0
+Eritrea,ERI,1991,101000,2266356,FALSE,0,,,,,,,,,,0,,1,0
+Eritrea,ERI,1992,101000,2257593,FALSE,0,,0.432942355940209,,,,,,,,0.216471177970105,,2,0
+Eritrea,ERI,1993,101000,2238631,FALSE,0,,0.501296515965197,,,,,,,,0.250648257982598,,2,0
+Eritrea,ERI,1994,101000,2218436,FALSE,0,,0.686018108953813,,,,,,,0.116452571274892,0.343009054476906,0.116452571274892,2,1
+Eritrea,ERI,1995,101000,2204227,FALSE,0,,0.655880376171973,1.73457813228487,,,,,,0.568025783689991,0.796819502818947,1.15130195798743,3,2
+Eritrea,ERI,1996,101000,2196467,FALSE,0,0.732217472059667,0.852792778518944,2.30484096110264,,,,,,0.756008303218815,0.972462802920313,1.26435557879371,4,3
+Eritrea,ERI,1997,101000,2195192,FALSE,0.0107606680101626,0.815108327731895,0.882705545023693,2.26744323361611,,,,,,0.783311009687835,0.994004443595464,1.28862085701195,4,3
+Eritrea,ERI,1998,101000,2206439,FALSE,0.0104167557275949,2.95220924948184,0.844857415796291,1.0336156433541,,,,,,0.744102653227533,1.21027476608996,1.57664251535449,4,3
+Eritrea,ERI,1999,101000,2237412,FALSE,0.0298486452342608,3.26273550537057,0.700514294779256,0.308026480760491,,,,,,0.609663383866789,1.07528123153614,1.39347512333262,4,3
+Eritrea,ERI,2000,101000,2292413,FALSE,0.156217139333585,1.06654035986503,0.592508130186651,0.369490876365214,,,,,,0.523234885714903,0.54618912643762,0.653088707315049,4,3
+Eritrea,ERI,2001,101000,2374721,FALSE,0.174081081503312,0.224060685968675,,0.576601772001007,,,,,,,0.324914513157665,0.400331228984841,3,2
+Eritrea,ERI,2002,101000,2481059,FALSE,0.239759749508773,0.402450087801492,,0.493071016777947,,,,,,,0.378426951362738,0.44776055228972,3,2
+Eritrea,ERI,2003,101000,2600972,FALSE,,0.421560437753752,,0.372190422030275,1.19657878279562,,,,,,0.396875429892013,0.396875429892013,3,2
+Eritrea,ERI,2004,101000,2719809,FALSE,,0.388690473250192,,0.387130082288253,1.00451221644634,,,,,,0.387910277769223,0.387910277769223,3,2
+Eritrea,ERI,2005,101000,2826653,FALSE,,0.0222123449356229,,0.355251518594279,0.804302294958199,,,,,,0.188731931764951,0.188731931764951,3,2
+Eritrea,ERI,2006,101000,2918209,FALSE,,0.231086821076131,,0.323246181992175,0.690805191725821,1.38416174844878,,0.00190081748946777,,,0.646164917172363,0.185411273519258,4,3
+Eritrea,ERI,2007,101000,2996540,FALSE,0.35840897083154,0.105478459788208,,0.326920368362915,0.729950652462896,4.025424739477,,0.00282786692430983,,,1.20405813461492,0.145075565025144,5,3
+Eritrea,ERI,2008,101000,3062782,FALSE,0.401972984041963,0.558480152894414,,0.276188817088483,0.791746260268514,5.85919069393361,,0.00563966289500095,,,1.77395816198962,0.280102877625966,5,3
+Eritrea,ERI,2009,101000,3119920,FALSE,0.453383171039715,1.27925510029059,,0.306147188858514,0.898196736739476,7.37674929362046,0,0.00694569463578897,,,1.88310695076185,0.398086995946222,6,4
+Eritrea,ERI,2010,101000,3170437,FALSE,0.503994504849156,1.25887174938301,,0.320404133859507,1.03924999987772,8.8886697377212,0,0.00683325403550318,,,2.19438802516257,0.396527284319504,6,4
+Eritrea,ERI,2011,101000,3213969,FALSE,0.570520757917126,0.532208916651735,,0.402978662404045,1.18377761153873,11.5448186607023,0,0.00673919597939613,,,2.61010539953505,0.235481693758794,6,4
+Eritrea,ERI,2012,101000,,FALSE,,,,,,,,,,,,,0,0
+Eritrea,ERI,2013,101000,,FALSE,,,,,,,,,,,,,0,0
+Eritrea,ERI,2014,101000,,FALSE,,,,,,,,,,,,,0,0
+Eritrea,ERI,2015,101000,,FALSE,,,,,,,,,,,,,0,0
+Eritrea,ERI,2016,101000,,FALSE,,,,,,,,,,,,,0,0
+Eritrea,ERI,2017,101000,,FALSE,,,,,,,,,,,,,0,0
+Eritrea,ERI,2018,101000,,FALSE,,,,,,,,,,,,,0,0
+Eritrea,ERI,2019,101000,,FALSE,,,,,,,,,,,,,0,0
+Eritrea,ERI,2020,101000,,FALSE,,,,,,,,,,,,,0,0
+Spain,ESP,1990,499440,38867322,FALSE,0.000867619435545508,19.7541173770528,11.4457856173652,,,,,,,11.0541650733115,10.4002568712845,15.4041412251822,3,2
+Spain,ESP,1991,499440,38966376,FALSE,0.00172673159425184,19.0612132950599,12.2013252372337,,,,,,,12.0910411140737,10.4214217546293,15.5761272045668,3,2
+Spain,ESP,1992,499440,39157685,FALSE,0.0051406289849897,17.3243158973905,13.3394251701296,,,,,,2.30656191612559,13.505089168537,8.24386090315765,11.045322327351,3,3
+Spain,ESP,1993,499440,39361262,FALSE,0.00849770866007709,16.8509104204827,11.5429991333602,,,,,,2.19747313838624,11.5641214480266,7.6499701002223,10.2041683356319,3,3
+Spain,ESP,1994,499440,39549108,FALSE,0.0185500287192335,13.7291960087296,13.1445862540935,,,,,,2.79942230063258,12.844041962516,7.42293864804371,9.79088675729271,3,3
+Spain,ESP,1995,499440,39724050,FALSE,0.025110730330715,14.569042650482,16.3419751485466,16.0412705158914,,,,,3.40262883391021,16.1004186355386,10.0760055758322,12.5283401589555,4,4
+Spain,ESP,1996,499440,39889852,FALSE,0.087459529670169,18.738070128588,17.6595685448145,16.7715638906451,,,,,3.64790804983869,17.5021537224335,11.3809140287113,14.1649239478763,4,4
+Spain,ESP,1997,499440,40057389,FALSE,0.183317984370996,26.5373712663967,17.9568199575802,18.9267624411979,,,,,4.04012792580945,17.6950085452486,13.528879915071,16.7998175446632,4,4
+Spain,ESP,1998,499440,40223509,FALSE,0.284060002670092,40.909277950794,19.2945477182487,20.5558609998333,,,,,4.33768107241424,19.0125850322174,17.0762855487921,21.2038512638147,4,4
+Spain,ESP,1999,499440,40386875,FALSE,0.459533450839398,70.3300518187502,20.7171168070708,21.6674431513591,,,,,4.78609426740942,20.6115798580166,23.5920478990858,29.3487922738839,4,4
+Spain,ESP,2000,499000,40567864,FALSE,0.879768107156311,100,21.3472691967451,22.3313673239412,,,,,5.3056052657767,21.3898586636645,29.9728019787239,37.2567078133456,4,4
+Spain,ESP,2001,498520,40850412,FALSE,1.16376346179015,67.1622555166809,21.5183325680299,22.4695176680194,,,,,5.71481444335542,21.9175736741211,23.6057367315752,29.3160403255442,4,4
+Spain,ESP,2002,499040,41431558,FALSE,1.28914288157095,76.5937687338702,22.7736351644928,23.2535525271205,,,,,5.88482648643812,23.1394189436282,25.9589851586985,32.2178916727642,4,4
+Spain,ESP,2003,499210,42187645,FALSE,2.47930023351623,67.1372081049475,27.8141982261689,23.7043715943709,15.3641023291721,,32.1458043885546,,6.06794138780278,28.1285536564572,26.5581373225602,31.4367758264266,6,5
+Spain,ESP,2004,499180,42921895,FALSE,2.68588599533417,89.3398954301518,32.8189262282737,24.3332998023496,17.3218625359222,,30.3354226164601,,6.23127371460393,33.3757901982699,30.9574506311955,36.7231363523671,6,5
+Spain,ESP,2005,499090,43653155,FALSE,2.87311889457857,72.4242397151112,34.9533448512093,25.757316890835,18.8145598966115,,30.4056237265189,,6.62639327254951,36.0377451949425,28.8400062251337,34.2502637599914,6,5
+Spain,ESP,2006,498980,44397319,FALSE,2.97187336344515,100,38.590210092791,26.307581595766,19.3273096450406,,29.4085465300646,4.41806636322994,6.75883002465578,41.2236372174936,34.0061736011204,34.686110288535,6,6
+Spain,ESP,2007,499110,45226803,FALSE,3.19190249079247,100,45.5359453953555,29.9787038743226,21.7505076176339,19.5276666154108,31.3414003160435,8.01638102560043,,49.84448461266,38.2626031153208,43.8361939657253,7,5
+Spain,ESP,2008,498800,45954106,FALSE,3.39732450757371,100,48.2185283382157,29.2652439340015,21.379937869398,17.3131443469265,36.6534023714407,13.1827027023117,,52.3960849897711,39.1412739163597,46.299486799505,7,5
+Spain,ESP,2009,498660,46362946,FALSE,3.5255644595287,23.887226085116,36.5841375981714,27.6816102236338,19.6654802069883,16.1854094151846,30.1843923238043,14.2978140023131,5.52477556191156,39.927701317626,20.5104450953358,23.5839199190675,7,6
+Spain,ESP,2010,500010,46576897,FALSE,3.700585438343,70.1044003870823,39.0305608607518,28.1660595460278,21.0303024232657,14.9714989828058,47.4691721787143,15.3925464250203,6.4466270405184,41.6061786064821,29.9841292048919,34.8641640306409,7,6
+Spain,ESP,2011,499880,46742697,FALSE,3.75975127105824,67.3848802964748,45.0406996241486,29.9199425609701,22.1445015510704,15.4243085105176,33.1800032385345,20.8180460066601,6.01193431224559,47.3525256861045,28.6745028305642,34.1112220168316,7,6
+Spain,ESP,2012,500210,46773055,FALSE,3.90964202819244,21.9127385177173,41.6475573211015,29.358483715484,21.3862844773704,14.5515520641763,37.0141035838412,24.9987860720287,6.36407730537155,42.7319646907062,22.1083077908406,27.0633589808582,7,6
+Spain,ESP,2013,500210,46620045,FALSE,4.02501655349805,75.7166207802203,43.5620722022776,30.3983824487278,21.5210478183017,14.1425392708795,42.5511925935188,9.44496581720357,5.90347506723635,45.0860932100804,30.8998998451941,34.8501216528312,7,6
+Spain,ESP,2014,500210,46480882,FALSE,4.29376930592132,74.411702921709,45.5398512355682,31.6474581743348,22.5909833952435,30.5631242882416,41.7474209277256,11.0521367691381,5.99136031934372,46.412588581121,33.4563838818349,35.210444615562,7,6
+Spain,ESP,2015,499661,46444832,FALSE,4.43808086637064,74.9554871152188,39.951406984904,33.3363093755955,23.6971788684453,28.659980724606,41.003248175663,13.1148688964353,5.52761803772018,40.5432453417393,32.5531616114397,34.746796157062,7,6
+Spain,ESP,2016,499564,46484062,FALSE,4.53980987805088,95.1945523530926,40.8832065321687,34.9752365843157,26.4213119682828,28.0523163199071,35.7699710936203,15.945612732563,5.52029066716986,41.4662095599708,34.9907690611893,38.145312165122,7,6
+Spain,ESP,2017,499547.35,46593236,FALSE,4.75635335069094,73.1466762911391,45.4610770987313,37.0189617644933,28.1309623046541,25.7948565982271,36.6924915650615,16.6957924500679,5.24324454839456,45.9496560634784,32.5876658881054,35.7911371137725,7,6
+Spain,ESP,2018,499603.479,46797754,FALSE,4.81980791198006,88.4473604664777,49.6121704195672,38.090717534443,29.2114453643052,,35.7614159420118,,,50.3118592860296,43.3462944548959,53.1528383072405,6,4
+Spain,ESP,2019,499603.479,47133521,FALSE,5.04175644592582,37.8962391817388,47.8578349755559,38.3974584527218,,,,,,48.5051273893874,32.2983222639856,41.5996083412827,4,3
+Spain,ESP,2020,499603.479,47351567,FALSE,5.15611932732905,40.8745530451768,39.1382098752695,,,,,,,39.6882807041211,28.3896274159251,40.2814168746489,3,2
+Estonia,EST,1990,42390,1569174,FALSE,0,,,,,,,,,,0,,1,0
+Estonia,EST,1991,42390,1561314,FALSE,0,,,,,,,,,,0,,1,0
+Estonia,EST,1992,42390,1533091,FALSE,0.111889065185004,2.40722447175912,2.13250301473536,,,,,,,1.87309449826498,1.55053885055983,2.14015948501205,3,2
+Estonia,EST,1993,42390,1494128,FALSE,0.527201954434956,5.30395796140404,3.78749073016043,,,,,,,3.39887265568874,3.20621688199981,4.35141530854639,3,2
+Estonia,EST,1994,42390,1462514,FALSE,2.0772070359402,6.74249837785487,5.52536093404628,,,,,,,4.97567336993097,4.78168878261378,5.85908587389292,3,2
+Estonia,EST,1995,42390,1436634,FALSE,5.06701950244732,6.55224692582115,7.90094687960584,32.7649601181055,,,,,,7.08863133570094,13.0712933564949,15.4686127932092,4,3
+Estonia,EST,1996,42390,1415594,FALSE,6.52302725942096,6.86267338880248,9.52426851345157,34.2474251846726,,,,,,8.65957387858913,14.2893485865869,16.5898908173547,4,3
+Estonia,EST,1997,42390,1399535,FALSE,10.6803170588066,13.1138666127059,11.5933845908861,36.7496540868033,,,,,,10.7075475451646,18.0343055873005,20.1903560815579,4,3
+Estonia,EST,1998,42390,1386156,FALSE,20.4017424994908,19.5205559357318,13.0111492071459,40.0314719905185,,,,,,11.9121430453852,23.2412299082217,23.8213903238785,4,3
+Estonia,EST,1999,42390,1390244,FALSE,27.3224059370899,13.5502018112566,11.7131154305265,43.3477916667558,,,,,,10.8063409669995,23.9833787114072,22.5681114816706,4,3
+Estonia,EST,2000,42390,1396985,FALSE,53.5845124914499,15.9659873316669,12.4134663779834,44.4342949027956,,,,,,11.5251928848069,31.599565275974,23.9751583730898,4,3
+Estonia,EST,2001,42390,1388115,FALSE,59.4948042813359,26.6464528127695,13.8983629762139,42.7754251771249,,,,,,13.1131736162053,35.703761311861,27.5116838686999,4,3
+Estonia,EST,2002,42390,1379350,FALSE,78.8493213235894,16.6580986165043,15.942491351561,44.931950133154,,,,,,15.0764109221757,39.0954653562022,25.555486557278,4,3
+Estonia,EST,2003,42390,1370720,FALSE,86.6076481918088,42.0158057515684,21.4557406289552,48.3255747229573,13.2343206262304,9.83834299840645,94.7273715293442,100,,20.3522020067257,50.4950806371734,61.0841908021191,7,5
+Estonia,EST,2004,42390,1362550,FALSE,100,47.4861369926565,28.0403475870595,,15.8394170876977,19.6111580594926,74.1186190043113,100,,26.9936146079773,53.851252328704,62.1495926512363,6,4
+Estonia,EST,2005,42390,1354775,FALSE,100,100,34.0897728907767,,19.1707453820783,14.7450109501132,63.8948424167372,100,,33.1655952369381,62.5459252515254,74.2651094134188,6,4
+Estonia,EST,2006,42390,1346810,FALSE,100,100,41.8948387629636,3.94922003892364,19.6790683326241,5.00490403558231,74.9848340332521,8.17346036205199,,41.6444193661222,54.305632811787,45.75038676007,7,5
+Estonia,EST,2007,42390,1340680,FALSE,100,100,54.3875507584859,6.13287309288849,23.0215989979397,23.4422763846916,51.1152166427848,8.75822866930469,,55.3094358850803,55.8463194798085,44.2631508580117,7,5
+Estonia,EST,2008,42390,1337090,FALSE,100,100,60.4882620056612,41.0644267272133,24.1283441786678,22.6642538392488,62.0424487789437,9.33061020008448,,60.5159270639074,64.3765652251778,54.5906825540298,7,5
+Estonia,EST,2009,42390,1334515,FALSE,100,100,41.7302130284338,41.7444565326939,17.1199709882243,23.0488741558541,100,11.5483142594229,,40.7776393797077,67.7539239528303,58.8140820343649,7,5
+Estonia,EST,2010,42390,1331475,FALSE,100,100,50.9326035710137,48.5730502087991,19.7032398098739,23.5434657353792,37.9242285151146,12.6770426063424,,49.8034723074286,60.1622246717178,49.7955587275369,7,5
+Estonia,EST,2011,42390,1327439,FALSE,100,82.2836105690048,70.826653207578,54.5501964080371,24.5438318919607,26.3061829868212,65.2106312494474,13.8212995966344,,68.4703260605591,66.5295457368147,56.8672127767366,7,5
+Estonia,EST,2012,42390,1322696,FALSE,100,100,71.8160898420316,56.5183695037017,28.8348089509689,26.2350090896609,57.2639088976176,14.9805389936539,,68.5270864564712,68.6388962221686,59.4579807702889,7,5
+Estonia,EST,2013,43470,1317997,FALSE,100,64.8630411307007,76.7014136247792,63.6233996381493,24.1226928940752,27.2229004489191,46.5217705761501,16.7043999878115,,73.1925805477448,63.1554209031164,52.9810383761113,7,5
+Estonia,EST,2014,43470,1314545,FALSE,100,97.3423353691298,78.4866134546609,66.8123477439672,24.8517238496454,23.8276899802857,60.3627418920924,22.1077467833625,,74.7798061849531,71.1386214066893,64.280995594701,7,5
+Estonia,EST,2015,43470,1315407,FALSE,100,43.0313750037034,63.5048125644724,64.1457859662244,27.522495929765,19.5283237791586,65.8071115138776,69.1811495666192,,60.0597160006857,59.3362348045727,60.445027610222,7,5
+Estonia,EST,2016,43470,1315790,FALSE,100,43.0259025702502,66.539786347611,67.219983277245,28.7030032579113,17.3193095453412,32.8939781937601,78.0850282092923,,63.3641411891062,54.4998266557013,56.9178066879308,7,5
+Estonia,EST,2017,43470,1317384,FALSE,100,79.4476964835302,73.0381452633713,68.4572893745732,32.2071865958755,17.0501845955878,38.3298735692571,79.1046995054139,,69.4775123688434,62.7205315477199,66.9634142603236,7,5
+Estonia,EST,2018,43470,1321977,FALSE,100,48.4208051834512,81.5597319230304,74.4497428113545,34.3536523948025,,60.0233896206519,,,77.8213158322339,72.8907339076976,65.1788133619229,6,4
+Estonia,EST,2019,43470,1326898,FALSE,100,100,81.4368609801607,71.454547745229,,,,,,78.1236656926965,88.2228521813474,83.1927378126419,4,3
+Estonia,EST,2020,43470,1331057,FALSE,100,10.6828528068307,79.2710846742655,,,,,,,75.2561094549526,63.3179791603654,42.9694811308917,3,2
+Ethiopia,ETH,1990,1101000,47887864,FALSE,0,0,0.0562338102802572,,,,,,,0.0392688528633531,0.0187446034267524,0.0196344264316765,3,2
+Ethiopia,ETH,1991,1101000,49609976,FALSE,0,0,0.019963484795437,,,,,,,0.00840920925555751,0.00665449493181234,0.00420460462777875,3,2
+Ethiopia,ETH,1992,1101000,51423591,FALSE,0,0.000144992568528137,0.0464967986673226,,,,,,0.422501320927498,0.032105198146701,0.117285778040837,0.151583837214242,3,3
+Ethiopia,ETH,1993,1000000,53295556,FALSE,0,0.00288029035414005,0.0291133505397746,,,,,,0.430055125316167,0.0158223005067745,0.11551219155252,0.14958590539236,3,3
+Ethiopia,ETH,1994,1000000,55180993,FALSE,0,0.0136788813270351,0.045301050947186,,,,,,0.340335452971507,0.0303609589376098,0.099828846311432,0.128125097745384,3,3
+Ethiopia,ETH,1995,1000000,57047906,FALSE,0.00000080355097950578,0.0108709857027169,0.0557428211125558,0.0460330521989062,,,,,0.395548508348045,0.0407693561608596,0.101639234182641,0.123305475602632,4,4
+Ethiopia,ETH,1996,1000000,58883531,FALSE,0.0000757792198223208,0.0163344309620617,0.0501053597937482,0.0484725146120055,,,,,0.391225310748898,0.0342463514034397,0.101242679067307,0.122569651931601,4,4
+Ethiopia,ETH,1997,1000000,60697443,FALSE,0.000214345502446546,0.208458491502278,0.0565437377754792,0.026366133414602,,,,,0.38663697410549,0.0388287112266008,0.135643936460059,0.165072577562243,4,4
+Ethiopia,ETH,1998,1000000,62507724,FALSE,0.000404964191666607,0.18290121438348,0.0689911231382594,0.0203131880342189,,,,,0.354844348373346,0.0494843174849049,0.125490967624194,0.151885767068987,4,4
+Ethiopia,ETH,1999,1000000,64343008,FALSE,0.000510583345473563,0.0477014742037189,0.0669589883218751,0.0202587338615593,,,,,0.474366203686811,0.0470245002345073,0.121959196683887,0.147337727996649,4,4
+Ethiopia,ETH,2000,1000000,66224809,FALSE,0.000603748559410827,0.0891687362252423,0.0573520958273413,0.0234939185741924,,,,,0.518243465017135,0.0385851385774494,0.137772392840664,0.167372814598505,4,4
+Ethiopia,ETH,2001,1000000,68159422,FALSE,0.00142821216066136,0.224831016853176,0.0727391293016528,0.0249245699165761,,,,,0.541832636091206,0.0518847718794342,0.173151112864654,0.210868248685098,4,4
+Ethiopia,ETH,2002,1000000,70142090,FALSE,0.00270388692932089,0.159448596599354,0.0687321125143361,0.025564487924876,,,,,0.590939885902807,0.047913898630702,0.169477793974139,0.205966717264435,4,4
+Ethiopia,ETH,2003,1000000,72170581,FALSE,0.0038405057182815,0.282586866869832,0.0913477399807801,0.0288448517196838,0.233515242890852,,0.699664066195645,,0.628421750470685,0.0679912001711009,0.289117630159151,0.341501747085389,6,5
+Ethiopia,ETH,2004,1129264.328,74239508,FALSE,0.00548085094640402,0.322032957031034,0.138216647628741,0.0286550234878991,0.249465022132946,,0.582999116421509,,0.759016158903755,0.109843495375046,0.306066792403224,0.360509350243849,6,5
+Ethiopia,ETH,2005,1129317.777,76346310,FALSE,0.00753663814303567,0.15230004300288,0.178153770463979,0.0346661857815053,0.254368478221881,,0.755881414003594,,0.918881666870856,0.144726578609905,0.341236619710975,0.401291177653748,6,5
+Ethiopia,ETH,2006,1129314.344,78489205,FALSE,0.0103656453952067,0.304684684245449,0.192300937734867,0.0496216137156924,0.293490538946143,,1.14881954062896,0.00099225834461709,0.9426253422362,0.157104467678038,0.441402960659396,0.433974651141493,6,6
+Ethiopia,ETH,2007,1129287.296,80674343,FALSE,0.0120138271935176,0.12069183241932,0.248432630161617,0.0524544500446428,0.361319669247825,0.532257525732283,0.760037848142799,0.00211767527347985,,0.206710635371479,0.28764801894903,0.228402488250344,7,5
+Ethiopia,ETH,2008,1129272.056,82916236,FALSE,0.0142163474371717,0.0574115978261737,0.343962721204463,0.0546596111676566,0.432668976645679,0.63523482993631,1.04398293158333,0.00431439384678152,,0.289262876703684,0.358244673192517,0.289926282225525,7,5
+Ethiopia,ETH,2009,1129270.983,85233923,FALSE,0.0165957305871071,0.113957055651274,0.315959055757287,0.0594048830495276,0.441522199105957,1.18174142105727,0.677063248124303,0.00761231569552427,1.50468329300993,0.26410299530962,0.552772098176671,0.43780396514003,7,6
+Ethiopia,ETH,2010,1129253.379,87639962,FALSE,0.0224168288882972,0.144264293459636,0.363833945603189,0.0634171995454217,0.483264930488467,0.72744222281603,0.288082976132293,0.0277989595221382,1.63682818792766,0.30670497147931,0.46375509348179,0.411182764677744,7,6
+Ethiopia,ETH,2011,1129208.088,90139928,FALSE,0.0319661676103396,0.30586763895524,0.433948794121626,0.0690302927991971,0.598614678612747,1.06429230924332,0.60019971903527,0.0528093405728783,1.96235968052295,0.368811967918345,0.638237800326849,0.559846439967313,7,6
+Ethiopia,ETH,2012,1129209.376,92726982,FALSE,0.0819232111260349,0.131757774821715,0.487026723246695,0.0767584019713059,0.617090103034749,1.08146032747247,0.466763466620402,0.0513328779616486,2.51352059717017,0.415277137747321,0.691315786061256,0.609235042715428,7,6
+Ethiopia,ETH,2013,1129212.38,95385793,FALSE,0.126324977932958,0.617923531346978,0.47854890383728,0.0852762172597172,0.646829486785463,,0.529378228916776,0.0922150437343787,2.84871080740688,0.408495804792355,0.781027111116765,0.763666605576181,6,6
+Ethiopia,ETH,2014,1129225.045,98094264,FALSE,0.205618509231321,0.829414710913059,0.568422367232018,0.0939032672257074,0.590129272256577,3.67645349334559,0.220612122476231,0.104628652350904,2.97291623754276,0.488199503103564,1.22390581542381,0.784945748935371,7,6
+Ethiopia,ETH,2015,1129272.914,100835453,FALSE,0.359926541568529,1.14242141952354,0.582612489788979,0.102635492837982,0.703738460815838,0.107181099347011,0.643844495361679,0.163542666874597,3.30721599113665,0.503313964996989,0.892262504223482,0.97716233845524,7,6
+Ethiopia,ETH,2016,1129304.039,103603461,FALSE,0.388532873115425,1.75385360754066,0.566830814023572,0.100675299647319,0.770666634507763,0.64193064835998,0.591829205918652,0.247410405405704,3.72003632623122,0.49149572955382,1.10909839640526,1.15088342904956,7,6
+Ethiopia,ETH,2017,1129279.999,106399926,FALSE,0.458361354545492,1.65591095615372,0.55197548283496,0.105069800242519,0.771410880759565,0.441815031129804,0.576274405059775,0.275785069373585,4.36306168083257,0.480064638303112,1.16463838725698,1.24269442499421,7,6
+Ethiopia,ETH,2018,1129300.39,109224410,FALSE,0.52761613394514,1.34937604095586,0.572270118954036,0.0929726755871134,0.805647999839793,,0.561372261512368,,,0.496372730397868,0.620721446190903,0.625023427113302,6,4
+Ethiopia,ETH,2019,1129300.39,112078727,FALSE,0.584294654456259,0.997383437873902,0.540796172937907,0.0865575770721129,,,,,,0.473601423074052,0.552257960585045,0.519180812673356,4,3
+Ethiopia,ETH,2020,1129300.39,114963583,FALSE,,,0.485623236927496,,,,,,,0.424092646621261,0.485623236927496,0.424092646621261,1,1
+Finland,FIN,1990,304590,4986431,FALSE,0.210700027111115,31.6147819051922,31.0024704112696,,,,,,,31.7006381977206,20.942650781191,31.6577100514564,3,2
+Finland,FIN,1991,304590,5013740,FALSE,0.730106555362391,3.08699722674779,26.370357358048,,,,,,,27.2531413368445,10.0624870467194,15.1700692817961,3,2
+Finland,FIN,1992,304590,5041992,FALSE,0.980295863272404,10.0332462612873,26.6192883764511,,,,,,9.82692839342399,26.8613593286723,11.8649397236087,15.5738446611278,3,3
+Finland,FIN,1993,304590,5066447,FALSE,1.3279588721306,19.6075672321982,24.4653753008906,,,,,,12.9776642753834,24.4383105388725,14.5946414201507,19.007847348818,3,3
+Finland,FIN,1994,304590,5088333,FALSE,2.5302987382095,29.424634656342,30.3964244356248,,,,,,15.712224419951,29.8909320756515,19.5158955625318,25.0092637173148,3,3
+Finland,FIN,1995,304590,5107790,FALSE,7.12863461997765,28.7781245006173,39.7905381002245,4.22957819082057,,,,,20.4269044446432,39.0609907290402,20.0707559712566,23.1238994662803,4,4
+Finland,FIN,1996,304590,5124573,FALSE,8.57731410138328,33.982641771912,39.8671005549173,4.08534233351119,,,,,20.5968077210394,38.772481171384,21.4218412965526,24.3593182494616,4,4
+Finland,FIN,1997,304590,5139835,FALSE,9.91697812271942,68.6052933844754,39.593578815924,4.32846433343133,,,,,22.4648312555905,39.0840608650657,28.9818291824281,33.6206624596408,4,4
+Finland,FIN,1998,304590,5153498,FALSE,12.9373060952512,100,39.7905517348952,6.23105235166359,,,,,25.0307211729599,39.5824961451213,36.797926270954,42.7110674174362,4,4
+Finland,FIN,1999,304590,5165474,FALSE,16.3772675511979,100,39.5099255306324,5.76976790517223,,,,,17.3810371510283,40.0718061032214,35.8075996276062,40.8056527898555,4,4
+Finland,FIN,2000,304590,5176209,FALSE,18.850012073417,100,43.2433528893879,6.36798861878162,,,,,16.2513804093468,44.5081121846423,36.9425467981867,41.7818703031927,4,4
+Finland,FIN,2001,304590,5188008,FALSE,21.764353297691,94.4393110414025,41.6473524556797,6.61575586057789,,,,,18.175659243752,43.867800263319,36.5284863798206,40.7746316022629,4,4
+Finland,FIN,2002,304590,5200598,FALSE,31.4452566912355,100,44.459385511801,6.71419441676912,,,,,20.0042184864053,46.1853723449815,40.5246110212422,43.225946312039,4,4
+Finland,FIN,2003,304590,5213014,FALSE,34.7822600413133,51.9451580998775,52.9931626353205,6.05969350475628,23.477781849416,,100,,20.8565798796416,55.070195198707,44.4394756934849,46.7863253365965,6,5
+Finland,FIN,2004,304590,5228172,FALSE,36.2696866671502,79.9995945569889,63.4688718932094,6.59745077178717,25.6193372495346,,100,,26.0868600926671,66.1163754655475,52.0704106636338,55.7600561773981,6,5
+Finland,FIN,2005,304590,5246096,FALSE,37.1893449092332,100,71.4106714459688,22.7101379723074,25.4159235170905,,81.8149111984185,,28.2362210323555,74.2929414026508,56.8935477597139,61.4108423211464,6,5
+Finland,FIN,2006,304110,5266268,FALSE,39.6234639390711,53.6297043744189,81.9034945097746,22.6116093716839,26.0074215164765,,100,8.69706298702852,32.1398996707265,87.1871646361065,54.9846953109458,50.7109068399941,6,6
+Finland,FIN,2007,304090,5288720,FALSE,40.0099831035048,100,97.3614848442512,22.8119183894742,27.6758015102306,,100,12.6378071449012,,100,72.036677267446,67.0899451068751,6,5
+Finland,FIN,2008,303900,5313399,FALSE,41.2489058627459,100,100,23.2020822070852,29.0465274438215,,100,34.1186816415428,,100,72.8901976139662,71.4641527697256,6,5
+Finland,FIN,2009,303900,5338871,FALSE,40.4731466094555,100,80.682312726588,23.0162895323792,26.5852656493632,,100,36.7479943356669,40.0668774180842,82.8307972398323,64.0397710477512,63.7769930876604,6,6
+Finland,FIN,2010,303900,5363352,FALSE,42.4373826105946,100,85.0322648615095,25.2645538050023,28.0790183624107,,100,43.3058700378498,45.4533348003432,88.659520808124,66.3645893462416,67.1138799085532,6,6
+Finland,FIN,2011,303890,5388272,FALSE,43.1258966220766,77.806280698712,97.3262398035044,28.0222133326792,30.980646946048,,100,53.5195817588919,48.7261671118137,100,65.8344662614643,68.0123738170162,6,6
+Finland,FIN,2012,303890,5413971,FALSE,43.4872778057088,100,92.2192389327742,31.8697219648602,28.6495234477501,,100,64.2731637707338,50.9007365023918,95.4933750291921,69.7461625342892,73.7561662111963,6,6
+Finland,FIN,2013,303890,5438972,FALSE,44.0745318064111,97.4157338275358,93.0423908901276,27.5220027090894,28.2492247291947,,100,34.4071650349762,56.4044334073059,95.8467141100655,69.743182106745,68.5993415148288,6,6
+Finland,FIN,2014,303890,5461512,FALSE,41.5021768486012,100,90.1907388598207,27.8332501419674,27.7421677952183,,100,40.9838454608116,56.1715435886072,95.5578200179287,69.2829515731661,70.0910765348858,6,6
+Finland,FIN,2015,303910,5479531,FALSE,41.3139470320812,100,73.879371214817,28.0299241328287,28.503545136878,,100,46.2063430327183,61.5675562933488,77.2091182923171,67.4651331121793,68.8354902918688,6,6
+Finland,FIN,2016,303910,5495303,FALSE,41.8062408444374,100,75.0890628791352,28.8845587243465,28.7665254822274,,100,51.4156206760577,68.4646704911472,79.0774843372137,69.0407554898444,71.3070557047942,6,6
+Finland,FIN,2017,303920,5508214,FALSE,41.5966253388538,100,84.3201864218209,30.1246689948429,30.8195243097415,,100,53.9597910941264,77.5752104120263,87.9026323628672,72.269448527924,74.9270504773105,6,6
+Finland,FIN,2018,303920,5515525,FALSE,42.2163758128637,100,94.4828159206963,30.1816460085282,33.8491079753395,,100,,,98.0292124337713,73.3761675484177,82.0527146105749,6,4
+Finland,FIN,2019,303920,5521606,FALSE,42.5102328856735,100,93.6314211313419,30.205607066854,,,,,,99.504137978239,66.5868152709673,76.569915015031,4,3
+Finland,FIN,2020,303920,5530719,FALSE,43.6540322443342,35.4859449776299,84.99861712131,,,,,,,89.5409854599937,54.7128647810914,62.5134652188118,3,2
+Fiji,FJI,1990,18270,728575,TRUE,0,8.40106259269016,5.71267271391648,,,,,,,5.35032493739996,4.70457843553555,6.87569376504506,3,2
+Fiji,FJI,1991,18270,735398,TRUE,0,5.50500538592354,5.32096532997424,,,,,,,5.00368858466918,3.60865690529926,5.25434698529636,3,2
+Fiji,FJI,1992,18270,744470,TRUE,0,4.58255145352336,5.30997865898222,,,,,,,5.01203672360241,3.29751003750186,4.79729408856288,3,2
+Fiji,FJI,1993,18270,754962,TRUE,0.0231721048634123,3.99786859250936,5.81415194143345,,,,,,,5.44973372427296,3.27839754626874,4.72380115839116,3,2
+Fiji,FJI,1994,18270,765607,TRUE,0.0270547080540976,7.46932057831472,6.63203391543981,,,,,,17.1486994926023,6.22258311327134,7.81927717360274,10.2802010613961,3,3
+Fiji,FJI,1995,18270,775428,TRUE,0.0307926191338475,6.66023887524576,6.96352188142011,8.52092409623197,,,,,20.8713244729535,6.49413191524658,8.60936038899704,10.6366548399195,4,4
+Fiji,FJI,1996,18270,784389,TRUE,0.215188901768815,7.65826845976451,7.78989192239984,9.38376698778484,,,,,24.0756102368001,7.22706768960972,9.82454530170362,12.0861783434898,4,4
+Fiji,FJI,1997,18270,792736,TRUE,0.738373807970922,5.86344204506513,7.37329374777661,9.51480804159796,,,,,33.6291863010514,6.8730818291559,11.4238207886924,13.9701295542176,4,4
+Fiji,FJI,1998,18270,800148,TRUE,2.07282975895335,2.43332259899874,5.70356585593784,8.75864199223962,,,,,33.3174333723259,5.41824928206753,10.4571587156911,12.4819118114079,4,4
+Fiji,FJI,1999,18270,806302,TRUE,3.06183113140249,11.3119606533388,6.28175348261075,9.53549249300564,,,,,,5.82895332842922,7.54775944008941,8.89213549159121,4,3
+Fiji,FJI,2000,18270,811011,TRUE,4.83468300965851,0.156700122965853,6.13659961926758,7.74257871819137,,,,,41.1453591017826,5.5865956048631,12.0031841143732,13.6578083869507,4,4
+Fiji,FJI,2001,18270,813923,TRUE,5.97960476176938,2.36817574754127,5.83800205019572,7.923825363801,,,,,39.4395678965228,5.4930547920756,12.309835163966,13.8061559499852,4,4
+Fiji,FJI,2002,18270,815257,TRUE,19.7689110281812,1.74266695849382,6.07287979533812,8.34297970074074,,,,,41.3491983218392,5.67037018103272,15.4553271609186,14.2763037905266,4,4
+Fiji,FJI,2003,18270,816078,TRUE,21.5875713765452,2.37340190482038,8.08729348501708,8.26015602755962,11.2883320293175,,61.8754116177157,,53.0907573646739,7.58071549639518,25.8790986293886,26.636088482233,6,5
+Fiji,FJI,2004,18270,817864,TRUE,23.7424040130023,13.6123227951889,9.28723773526336,9.01448518987799,12.0878596716465,,83.7903962622742,,39.8164256479029,8.90641328108357,29.8772119405849,31.0280086352655,6,5
+Fiji,FJI,2005,18270,821606,TRUE,26.9522526003214,9.78469655642605,10.2863526411407,9.69791785669072,14.0704439628437,,43.8993544021988,,39.1535287189406,9.57463072874443,23.295683795953,22.4220256526001,6,5
+Fiji,FJI,2006,18270,827869,TRUE,30.375710404362,30.9686017513924,10.5835706714919,1.77407295162796,14.168277692505,,30.4970727024216,,40.4223217098735,9.87404110924737,24.1035583651949,22.7072220449126,6,5
+Fiji,FJI,2007,18270,836185,TRUE,34.1391569363522,24.6861795606093,10.7898199545946,9.61597501643906,13.6198907626052,,,0.110473660767657,,10.0120234246649,19.8077828669988,11.1061629156202,5,4
+Fiji,FJI,2008,18270,845356,TRUE,40.2827217804906,35.6949383700541,13.1938077671298,10.7905889913211,13.4837077204614,,34.1328131324299,0.542473356844149,,12.116860235673,26.8189740082851,18.6555348172644,6,5
+Fiji,FJI,2009,18270,853636,TRUE,52.1664511850091,16.0184326636769,8.83396144074211,10.3870618885578,12.9882265084809,,4.22521695113292,0.537210459153523,55.9147791983454,8.05553913721573,24.5909838879107,15.8563733830137,6,6
+Fiji,FJI,2010,18270,859816,TRUE,60.9311769628501,9.38331122477574,10.6955250497057,11.5839637164974,14.0437289869569,,12.5845435440744,1.10948464394541,60.2876244286573,9.99151357511005,27.5776908210934,17.4900735221767,6,6
+Fiji,FJI,2011,18270,863451,TRUE,84.9445321067274,11.0916526023406,13.1628102342015,12.182368434034,14.8192043535785,,25.0631289833283,1.65727564485833,55.5316440973457,12.2888175758902,33.6626894096629,19.6358145562995,6,6
+Fiji,FJI,2012,18270,865065,TRUE,100,14.1587831598609,13.8824882986904,12.257936199592,15.2534119693067,,25.016367306253,2.31165935409918,61.592989772551,12.8723414725875,37.8180941228246,21.3683462108239,6,6
+Fiji,FJI,2013,18270,865602,TRUE,100,12.5796184132753,14.7339675576672,10.7907825971757,16.9005174819303,,37.5012715724729,3.48446947410789,59.3802299603336,13.5216389166518,39.1643116834875,22.8763351556695,6,6
+Fiji,FJI,2014,18270,866447,TRUE,100,21.0687860977428,14.9978134853737,10.9485026609863,24.5901787178624,,20.8137214237991,6.20842070654611,62.8170450546777,13.9615318267415,38.44097812043,22.6363346284156,6,6
+Fiji,FJI,2015,18270,868632,TRUE,100,12.0834794355995,13.1349435507279,12.151652893543,29.6754002601844,,37.3704580025554,9.57398270515803,70.8399808566808,12.5057961293142,40.9300857898511,25.7542250038085,6,6
+Fiji,FJI,2016,18270,872406,TRUE,100,20.5142862931563,13.276396323655,15.580244721432,34.253193280118,,41.3431051287737,10.4494925455887,75.2394312022916,12.6288128672501,44.3255772782181,29.2925621264154,6,6
+Fiji,FJI,2017,18270,877460,TRUE,100,19.4560905879733,14.2858794168923,16.5565205506048,38.3801882650743,,20.5524884171204,14.8956784511227,83.9771980377018,13.8938295124392,42.4713628350488,28.221967592827,6,6
+Fiji,FJI,2018,18270,883490,TRUE,,23.4558945438851,15.7492281750033,16.9385078557084,39.3583816770009,,24.4946561746978,,,14.9705209114954,20.1595716873237,19.9648948714467,5,4
+Fiji,FJI,2019,18270,889955,TRUE,,17.6653700353217,15.8721004946872,15.6005916073874,,,,,,15.2539359743664,16.3793540457988,16.1732992056918,3,3
+Fiji,FJI,2020,18270,896444,TRUE,,0.65874270652507,8.60882993386261,,,,,,,8.46518638240354,4.63378632019384,4.5619645444643,2,2
+France,FRA,1990,547566,58235716,FALSE,0.00237398225169501,36.1553062882696,23.5838974974274,,,,,,,24.8363379920739,19.9138592559829,30.4958221401717,3,2
+France,FRA,1991,547566,58559309,FALSE,0.00626758679204835,29.2730278029819,23.590928564184,,,,,,,25.9014205895731,17.6234079846527,27.5872241962775,3,2
+France,FRA,1992,547566,58851216,FALSE,0.0124205504813975,39.5792819772419,25.3271349715174,,,,,,8.45946072296659,28.7831060323899,18.3445745555518,25.6072829108661,3,3
+France,FRA,1993,547566,59106758,FALSE,0.0261749373316358,30.6893341372514,22.3337872463298,,,,,,9.24429671565957,26.9700921425653,15.5733982591431,22.3012409984921,3,3
+France,FRA,1994,547566,59327200,FALSE,0.0397319401682601,29.7448876203002,23.9262390163525,,,,,,10.0766006432373,24.1484521385374,15.9468648050146,21.3233134673583,3,3
+France,FRA,1995,547566,59541904,FALSE,0.07205967278217,29.1381999286167,28.265187168987,,,,,,10.1870118790912,28.2728640314168,16.9156146623693,22.5326919463749,3,3
+France,FRA,1996,547566,59753095,FALSE,0.113279913573094,38.4126601588689,28.2906333066141,30.1408002368775,,,,,11.8492297913689,28.2285863026753,21.7613206814605,27.1578191224476,4,4
+France,FRA,1997,547566,59964841,FALSE,0.185873881059423,42.8135657449338,27.8127406624797,31.9159695787707,,,,,12.2076309299674,28.1287481827971,22.9871561594422,28.7664786091172,4,4
+France,FRA,1998,547566,60186284,FALSE,0.275054931714441,54.8141634145055,29.4630539243356,,,,,,12.781760947804,30.1761771823501,24.3335083045899,32.5907005148865,3,3
+France,FRA,1999,547566,60496708,FALSE,0.395122129494774,100,30.6972281091804,,,,,,15.2960058597721,31.7450764044545,36.5970890246118,49.0136940880755,3,3
+France,FRA,2000,547567,60912500,FALSE,0.615297700989187,100,30.4524883409457,,,,,,16.7803783043408,31.7007237723517,36.9620410865689,49.4937006922308,3,3
+France,FRA,2001,547567,61357432,FALSE,1.12390914521921,98.2974194285936,30.1592762395968,,,,,,16.903706998106,31.5297169692236,36.6210779528789,48.9102811319744,3,3
+France,FRA,2002,547567,61805266,FALSE,1.27911281354081,74.1941863482316,31.66600843204,,,,,,17.5739737077082,32.6647485718131,31.1783203253802,41.477636209251,3,3
+France,FRA,2003,547867,62244880,FALSE,1.52089631691221,66.8998970928223,36.7824285941654,,15.2327656799619,24.210746148626,37.4905992485061,100,18.1329216675435,38.6887135283629,30.8395815114293,52.242426307447,6,5
+France,FRA,2004,547567,62704901,FALSE,1.63548051318654,67.6584410369737,42.4811299875755,36.8623008497993,15.4369269292767,25.0093350750285,31.7511402834064,100,20.2438834887373,45.4756322971217,32.2345301763867,50.3318996593397,7,6
+France,FRA,2005,547557,63179356,FALSE,1.77743358804051,100,45.3866821358382,35.7292557987554,16.0457882683813,26.8942573001837,33.6820528117666,100,23.188159713428,50.1616343096724,38.0939773354303,57.1268504389371,7,6
+France,FRA,2006,547557,63621376,FALSE,1.9297763945795,100,49.7559516768645,42.1945132021303,16.3219546356764,28.3136611893623,35.9424713870773,11.8481431962914,26.4290151742247,56.6140470624817,40.6521984320341,45.5046983370342,7,6
+France,FRA,2007,547557,64016227,FALSE,2.70433676157997,100,56.686424361483,42.9730159933172,17.0456834499014,41.3135390176885,33.6924696262369,20.8446722080212,,66.0929115355372,46.2282976267176,52.7206138726225,7,5
+France,FRA,2008,547557,64374979,FALSE,2.87603743387886,100,63.734602871473,42.3689453530731,17.5995751182377,42.2476986796104,44.6542661543384,22.8001505611564,,72.4564188414265,49.313591748729,56.4559561819989,7,5
+France,FRA,2009,547557,64707035,FALSE,2.89771245811962,72.6214545477085,50.9385803338291,41.8669033128727,16.1740595509178,44.0252003874341,40.133102282527,34.0247757925163,28.1061466144046,56.5071089566396,40.0841571338423,45.5432485844448,7,6
+France,FRA,2010,547557,65027505,FALSE,3.1130429760477,75.169575255644,54.371797915671,41.0597773072133,16.1630938562127,44.9942164094985,42.9304662405256,39.4999610268455,28.6043176228125,59.7444999594126,41.4633133896304,47.8347662354089,7,6
+France,FRA,2011,547557,65342789,FALSE,3.11966993431322,72.9537941544469,63.0657028564702,42.3394622315063,16.2950894877762,,34.5540057696054,44.3409837222702,28.0042330006767,68.0764414366394,40.6728113245031,48.3781533858575,6,6
+France,FRA,2012,547557,65659814,FALSE,3.24902618011173,56.7506980477407,59.9696918050508,42.0269798179375,16.191762940375,,30.926479297952,49.7746563790163,29.2409738010726,64.3448375595854,37.0273081583109,45.5107708172174,6,6
+France,FRA,2013,547557,65998685,FALSE,3.25138722372566,32.6987168930767,62.426451863511,43.2290267344883,15.8359363805616,,23.3900000165646,21.6832331459496,30.7322561196296,66.0889553670793,32.621306475166,36.3036980461314,6,6
+France,FRA,2014,547557,66312067,FALSE,3.30831873429031,38.9556827913612,63.571872498387,43.6975960734384,15.7850773269101,,32.471586000878,23.7941832766893,28.2866707759609,67.0587564790138,35.0486211457193,39.0440792328903,6,6
+France,FRA,2015,547557,66548272,FALSE,3.0704818147894,61.9883051585867,56.8626534853358,42.6973148492035,15.9957491229135,,35.1204408229961,26.466686389197,29.3849892751044,59.51459545661,38.187364234336,42.5287219919496,6,6
+France,FRA,2016,547557,66724104,FALSE,3.11200415267301,70.6280138029963,57.0418816062153,42.360493600225,16.8791861888093,27.6682803208493,31.8386232373852,29.6965723159585,28.9381003565947,59.5233090357155,37.3696281538484,43.8308520581459,7,6
+France,FRA,2017,547557,66918020,FALSE,3.15123768776627,55.3423109530867,61.1756273642191,45.6616672914485,17.3226020680141,22.550219247815,25.0629164348145,31.2555517232122,30.3779812643989,63.7124404018417,34.7602800347927,41.9021446781337,7,6
+France,FRA,2018,547557,67101930,FALSE,3.20274678238646,100,67.1620169764131,47.0804028648136,17.5457255366821,,25.2629802112954,,,70.4864965666296,48.5416293669817,60.7074699106846,6,4
+France,FRA,2019,547557,67248926,FALSE,3.24624955939104,78.5931831251261,65.1841004359523,8.89984663327912,,,,,,68.8281958834364,38.9808449384371,52.1070752139472,4,3
+France,FRA,2020,547557,67391582,FALSE,,34.8552078113892,56.2532557631486,,,,,,,58.1125471076933,45.5542317872689,46.4838774595413,2,2
+Faroe Islands,FRO,1990,1396,47276,TRUE,0,,,,,,,,,,0,,1,0
+Faroe Islands,FRO,1991,1396,47123,TRUE,0,,,,,,,,,,0,,1,0
+Faroe Islands,FRO,1992,1396,46746,TRUE,0,,,,,,,,,,0,,1,0
+Faroe Islands,FRO,1993,1396,46277,TRUE,0,,,,,,,,,,0,,1,0
+Faroe Islands,FRO,1994,1396,45848,TRUE,0,,,,,,,,,,0,,1,0
+Faroe Islands,FRO,1995,1396,45625,TRUE,0,,,,,,,,,,0,,1,0
+Faroe Islands,FRO,1996,1396,45624,TRUE,100,,,,,,,,,,100,,1,0
+Faroe Islands,FRO,1997,1396,45789,TRUE,100,,,,,,,,,,100,,1,0
+Faroe Islands,FRO,1998,1396,46094,TRUE,100,,50.1901062612709,,,,,,,52.9326515331041,75.0950531306355,52.9326515331041,2,1
+Faroe Islands,FRO,1999,1396,46428,TRUE,100,,56.1026510348205,,,,,,,57.8867410959863,78.0513255174103,57.8867410959863,2,1
+Faroe Islands,FRO,2000,1396,46738,TRUE,100,,59.1114911134566,,,,,,,59.3998137882093,79.5557455567283,59.3998137882093,2,1
+Faroe Islands,FRO,2001,1396,46999,TRUE,100,,59.5336537155697,,,,,,,59.6300892058644,79.7668268577848,59.6300892058644,2,1
+Faroe Islands,FRO,2002,1396,47235,TRUE,100,,62.0627164088624,,,,,,,61.7489520585976,81.0313582044312,61.7489520585976,2,1
+Faroe Islands,FRO,2003,1396,47439,TRUE,100,,76.5590231137595,,75.694064748973,,,,,75.18423403953,88.2795115568797,75.18423403953,3,1
+Faroe Islands,FRO,2004,1396,47600,TRUE,100,,74.9237440460912,,79.0941791662479,,,,,71.9638679990915,87.4618720230456,71.9638679990915,3,1
+Faroe Islands,FRO,2005,1396,47731,TRUE,100,,83.3275415214371,,84.1665245634734,,,,,82.7069905676494,91.6637707607185,82.7069905676494,3,1
+Faroe Islands,FRO,2006,1396,47793,TRUE,100,,93.6556068422755,,93.0325714835472,,,2.45676147870765,,94.3949696590053,96.8278034211377,48.4258655688565,3,2
+Faroe Islands,FRO,2007,1396,47825,TRUE,100,,100,,83.7448273628465,,,,,100,100,100,3,1
+Faroe Islands,FRO,2008,1396,47822,TRUE,100,,100,,80.8797472859629,,,,,100,100,100,3,1
+Faroe Islands,FRO,2009,1396,47814,TRUE,100,,100,,73.3573933040964,,0,,,100,66.6666666666667,50,4,2
+Faroe Islands,FRO,2010,1396,47803,TRUE,100,,100,,70.0413125581668,,100,,,100,100,100,4,2
+Faroe Islands,FRO,2011,1396,47815,TRUE,100,,100,,68.8959377429334,,75.4323391675687,,,100,91.8107797225229,87.7161695837844,4,2
+Faroe Islands,FRO,2012,1396,47843,TRUE,100,,,,63.0662341301587,,100,,,,100,100,3,1
+Faroe Islands,FRO,2013,1396,47901,TRUE,100,,,,62.0687833082084,,100,,,,100,100,3,1
+Faroe Islands,FRO,2014,1396,47965,TRUE,100,,,,63.5190561116496,,0,,,,50,0,3,1
+Faroe Islands,FRO,2015,1396,48055,TRUE,100,,,,72.173369752304,,75.0556091415523,100,,,87.5278045707762,87.5278045707762,3,2
+Faroe Islands,FRO,2016,1396,48173,TRUE,100,,,,73.6756978313211,,0,100,,,50,50,3,2
+Faroe Islands,FRO,2017,1396,48326,TRUE,100,,,,85.5648491649183,,0,,,,50,0,3,1
+Faroe Islands,FRO,2018,1396,48497,TRUE,,,,,88.1946090947513,,0,,,,0,0,2,1
+Faroe Islands,FRO,2019,1396,48677,TRUE,,,,,,,,,,,,,0,0
+Faroe Islands,FRO,2020,1396,48865,TRUE,,,,,,,,,,,,,0,0
+"Micronesia, Fed. Sts.",FSM,1990,,96304,TRUE,0,,,,,,,,,,0,,1,0
+"Micronesia, Fed. Sts.",FSM,1991,700,98779,TRUE,0,,,,,,,,,,0,,1,0
+"Micronesia, Fed. Sts.",FSM,1992,700,101386,TRUE,0,,,,,,,,,,0,,1,0
+"Micronesia, Fed. Sts.",FSM,1993,700,103901,TRUE,0,,,,,,,,,,0,,1,0
+"Micronesia, Fed. Sts.",FSM,1994,700,106030,TRUE,0,,,,,,,,,,0,,1,0
+"Micronesia, Fed. Sts.",FSM,1995,700,107535,TRUE,0,,,,,,,,,,0,,1,0
+"Micronesia, Fed. Sts.",FSM,1996,700,108311,TRUE,6.72428890033255,,,1.97252993031964,,,,,,,4.34840941532609,1.97252993031964,2,1
+"Micronesia, Fed. Sts.",FSM,1997,700,108473,TRUE,13.781093970268,,,1.92478565763044,,,,,,,7.85293981394921,1.92478565763044,2,1
+"Micronesia, Fed. Sts.",FSM,1998,700,108206,TRUE,44.9963658398408,,,1.50292407265929,,,,,,,23.2496449562501,1.50292407265929,2,1
+"Micronesia, Fed. Sts.",FSM,1999,700,107769,TRUE,67.9995344762434,,,1.81337432400542,,,,,,,34.9064544001244,1.81337432400542,2,1
+"Micronesia, Fed. Sts.",FSM,2000,700,107405,TRUE,91.0888397154567,,,2.3171834104896,,,,,,,46.7030115629732,2.3171834104896,2,1
+"Micronesia, Fed. Sts.",FSM,2001,700,107170,TRUE,100,,,1.73283603636558,,,,,,,50.8664180181828,1.73283603636558,2,1
+"Micronesia, Fed. Sts.",FSM,2002,700,107027,TRUE,100,,,2.16646729054332,,,,,,,51.0832336452717,2.16646729054332,2,1
+"Micronesia, Fed. Sts.",FSM,2003,700,106902,TRUE,100,,,2.06672950309458,15.5437463420968,,,,,,51.0333647515473,2.06672950309458,3,1
+"Micronesia, Fed. Sts.",FSM,2004,700,106624,TRUE,100,,,2.19744765149183,19.0785833604272,,,,,,51.0987238257459,2.19744765149183,3,1
+"Micronesia, Fed. Sts.",FSM,2005,700,106135,TRUE,100,,,2.1732415359862,22.2380980875003,,,,,,51.0866207679931,2.1732415359862,3,1
+"Micronesia, Fed. Sts.",FSM,2006,700,105374,TRUE,100,,,2.20047542043623,13.9780339990623,,,,,,51.1002377102181,2.20047542043623,3,1
+"Micronesia, Fed. Sts.",FSM,2007,700,104442,TRUE,100,,,2.45275052790421,13.868096551689,,,,,,51.2263752639521,2.45275052790421,3,1
+"Micronesia, Fed. Sts.",FSM,2008,700,103549,TRUE,100,,,3.01356929844628,16.0708067392103,,,,,,51.5067846492232,3.01356929844628,3,1
+"Micronesia, Fed. Sts.",FSM,2009,700,102971,TRUE,100,0,7.41300976456743,5.6023388886847,16.1134192042633,,70.0546230938283,,,7.23150259877333,36.6139943494161,20.7221161453216,6,4
+"Micronesia, Fed. Sts.",FSM,2010,700,102916,TRUE,100,0,7.7817623245972,5.27482840345762,15.3122496238757,,35.0460307172577,,,7.53950840005974,29.6205242890625,11.9650918801938,6,4
+"Micronesia, Fed. Sts.",FSM,2011,700,103448,TRUE,100,0,8.01408416697047,4.15558978076736,12.2479686295108,,100,,,7.76324765179444,42.4339347895476,27.9797093581405,6,4
+"Micronesia, Fed. Sts.",FSM,2012,700,104506,TRUE,100,0,8.80733584960185,4.45060541191451,12.3350433375883,,0,,,8.64207721329969,22.6515882523033,3.27317065630355,6,4
+"Micronesia, Fed. Sts.",FSM,2013,700,105922,TRUE,100,0,8.77708946611745,4.82690233038391,12.1932568017924,,68.1028926435924,,,8.73475695054783,36.3413768880188,20.416137981131,6,4
+"Micronesia, Fed. Sts.",FSM,2014,700,107444,TRUE,100,8.45847280427997,8.01187338854364,4.00098325072979,12.1117560193155,,0,,,8.63191910275979,24.0942658887107,5.27284378944239,6,4
+"Micronesia, Fed. Sts.",FSM,2015,700,108886,TRUE,100,,,3.47940147597322,12.4465769540636,,33.1245274626426,,,,45.5346429795386,18.3019644693079,4,2
+"Micronesia, Fed. Sts.",FSM,2016,700,110215,TRUE,100,,,3.2610755132942,13.1193405985428,,98.1753109095122,,,,67.1454621409355,50.7181932114032,4,2
+"Micronesia, Fed. Sts.",FSM,2017,700,111461,TRUE,100,,,,14.9298759146801,,64.7185526291223,,,,82.3592763145611,64.7185526291223,3,1
+"Micronesia, Fed. Sts.",FSM,2018,700,112640,TRUE,,,,2.06922175178518,15.0347150752759,,64.0411451934889,,,,33.0551834726371,33.0551834726371,3,2
+"Micronesia, Fed. Sts.",FSM,2019,700,113811,TRUE,,,,1.9198309085732,,,,,,,1.9198309085732,1.9198309085732,1,1
+"Micronesia, Fed. Sts.",FSM,2020,700,115021,TRUE,,,,,,,,,,,,,0,0
+Gabon,GAB,1990,257670,949493,TRUE,0,4.72329650169053,11.5368999966526,,,,,,,11.5546949599727,5.4200654994477,8.13899573083162,3,2
+Gabon,GAB,1991,257670,975785,TRUE,0,3.12282346766013,10.611086062404,,,,,,,10.7346895400951,4.57796984335473,6.92875650387761,3,2
+Gabon,GAB,1992,257670,1002573,FALSE,0,6.67704179836188,10.6246064857123,,,,,,,11.2264636693399,5.76721609469138,8.95175273385088,3,2
+Gabon,GAB,1993,257670,1029769,FALSE,0,4.94856691497432,10.5479448849609,,,,,,,10.6436847594791,5.16550393331175,7.79612583722672,3,2
+Gabon,GAB,1994,257670,1057252,FALSE,0,4.41585780390618,9.54725200700319,,,,,,,9.39248696528161,4.65436993696979,6.9041723845939,3,2
+Gabon,GAB,1995,257670,1084951,FALSE,0,14.130906517005,10.3648367045822,2.27149344140803,,,,,,10.4991433474068,6.69180916574882,8.96718110193995,4,3
+Gabon,GAB,1996,257670,1112944,FALSE,0,19.3645529642778,11.7971259397476,2.3671360231566,,,,,,11.9325282939074,8.38220373179548,11.2214057604472,4,3
+Gabon,GAB,1997,257670,1141332,FALSE,0.110162902765237,12.7678744500991,11.0851217546298,2.62753288914457,,,,,8.13683231381793,11.168641804335,6.94550486209132,8.67522036434914,4,4
+Gabon,GAB,1998,257670,1170061,FALSE,0.380867944410916,5.68951894736957,8.81226531363583,4.95091822479639,,,,,8.69414155576225,8.84399291098122,5.70554239719499,7.04464290972736,4,4
+Gabon,GAB,1999,257670,1199058,FALSE,0.543990018254477,14.9752256421244,9.140392905725,4.54747920395645,,,,,8.07376050933544,9.29330586157034,7.45616965587916,9.22244280424667,4,4
+Gabon,GAB,2000,257670,1228359,FALSE,2.59342429844631,22.2830187525397,10.0930560794139,3.93460120096254,,,,,8.4357632728682,10.3348510217811,9.46797272084614,11.2470585620379,4,4
+Gabon,GAB,2001,257670,1258008,FALSE,2.80607458497785,3.77870451489934,8.29482458399356,4.10256104767553,,,,,6.10041170107178,8.41021412503028,5.01651528652361,5.59797284716923,4,4
+Gabon,GAB,2002,257670,1288310,FALSE,3.94358532079965,2.11046221724485,8.07249272714164,4.60008230754292,,,,,6.01984965261624,7.90106287625354,4.94929444506906,5.15786426341439,4,4
+Gabon,GAB,2003,257670,1319946,FALSE,5.27804471128491,5.94357389922766,9.53143228105197,4.32413355468376,7.17335750738852,,,,5.87495701477765,9.32535613727062,6.19042829220519,6.36700515148992,5,4
+Gabon,GAB,2004,257670,1353788,FALSE,5.76428058642594,11.1537423933147,11.3541909026601,3.14817860170785,7.49189772263713,,,,6.58385121006526,11.4808261274403,7.60084873883478,8.09164958313203,5,4
+Gabon,GAB,2005,257670,1390550,FALSE,9.21779824936772,15.3097793332682,13.8743636328505,4.59372616683355,7.37662548576173,,,,7.11535782434379,13.7064016573906,10.0222050413327,10.181316245459,5,4
+Gabon,GAB,2006,257670,1430144,FALSE,10.0541287822362,8.25524942787121,,,5.3572927358623,,,0.102519614193754,7.48036172386366,,8.59657997799035,5.27937692197621,3,3
+Gabon,GAB,2007,257670,1472565,FALSE,10.2586666070888,21.2558872765829,16.2269315845526,,6.21661286183725,,,0.099563075342793,,16.1240298152736,15.9138284894081,12.4931600557331,4,3
+Gabon,GAB,2008,257670,1518538,FALSE,12.9375098412478,23.7300661817415,20.7157468708105,,7.11790026884785,,16.6262425313565,0.144873761889434,,20.0328588506458,18.5023913562891,15.1335103314083,5,4
+Gabon,GAB,2009,257670,1568925,FALSE,15.8612173331789,24.5771754563292,16.6860666586743,,6.95172799480058,,4.59779440992692,0.217398181438391,7.17286337924319,16.9315358239327,13.7790234474705,10.6993534501741,5,5
+Gabon,GAB,2010,257670,1624146,FALSE,20.9668592315398,24.3330372295978,21.2122936769011,,6.49193402000001,,6.66220394711553,0.350078807849001,,21.0943904247635,18.2935985212886,13.1099276023315,5,4
+Gabon,GAB,2011,257670,1684629,FALSE,27.9887386281139,29.9126452691371,23.9358408171835,,6.27914779600155,3.44480872120693,6.42301176810556,0.337505990037861,,23.0035945406514,18.3410090407494,14.919189391983,6,4
+Gabon,GAB,2012,257670,1749677,FALSE,35.9309295497328,39.8079182119658,22.2195579414652,,6.72367345784589,,2.0614075039549,0.838767413500664,,21.6254513367737,25.0049533017797,16.0833861165488,5,4
+Gabon,GAB,2013,257670,1817070,FALSE,44.0234933907624,13.5246495597042,21.7755377631284,,7.02055079898289,,15.8796184948177,1.12147126931224,,20.1311342233143,23.8008248021032,12.6642183867871,5,4
+Gabon,GAB,2014,257670,1883801,FALSE,52.9391230452854,40.586671559205,18.8015175837843,,5.53566109532158,,0,1.90881010391294,,17.3261278133278,28.0818280470687,14.9554023691114,5,4
+Gabon,GAB,2015,257670,1947690,FALSE,61.5763698015895,1.30972511808356,12.9309867404865,,6.35702940620424,19.188354928365,3.70366669983139,3.35337965120774,,11.6652493514154,19.7418206576712,5.00800520513453,6,4
+Gabon,GAB,2016,257670,2007882,FALSE,62.6889289751346,28.155324073006,,,6.39956172585364,15.8374082627732,0,4.02040160184323,,,26.6704153277285,10.7252418916164,5,3
+Gabon,GAB,2017,257670,2064812,FALSE,63.8375554156387,29.6896161179265,,,6.06042231678645,14.8858437603528,0,4.3716008152428,,,27.1032538234795,11.3537389777231,5,3
+Gabon,GAB,2018,257670,2119275,FALSE,73.6671788877989,29.8426173682546,,,5.27195826225654,,3.40380299611641,,,,35.63786641739,16.6232101821855,4,2
+Gabon,GAB,2019,257670,2172578,FALSE,73.5477771555471,32.0359629618931,,,,,,,,,52.7918700587201,32.0359629618931,2,1
+Gabon,GAB,2020,257670,2225728,FALSE,,,,,,,,,,,,,0,0
+United Kingdom,GBR,1990,241930,57247586,FALSE,0.00399712076476428,53.1286868706589,21.2356826612068,,,,,,,29.1247936677487,24.7894555508768,41.1267402692038,3,2
+United Kingdom,GBR,1991,241930,57424897,FALSE,0.00794767508208772,35.7371065026427,20.6281398571662,,,,,,,28.135733112225,18.791064678297,31.9364198074339,3,2
+United Kingdom,GBR,1992,241930,57580402,FALSE,0.0118560514355714,37.4467750354352,21.8480765492311,,,,,,,27.7394120900606,19.7689025453673,32.5930935627479,3,2
+United Kingdom,GBR,1993,241930,57718614,FALSE,0.0235886847266999,38.0759658856305,20.9631958862999,,,,,,,26.3852708421136,19.6875834855524,32.2306183638721,3,2
+United Kingdom,GBR,1994,241930,57865745,FALSE,0.0469254655286438,47.9734340008744,23.429207834756,,,,,,,28.6631075941648,23.8165224337197,38.3182707975196,3,2
+United Kingdom,GBR,1995,241930,58019030,FALSE,0.0855642622301364,64.7375059405402,27.0334021767921,13.5834673375849,,,,,,33.6868326490303,26.3599849292868,37.3359353090518,4,3
+United Kingdom,GBR,1996,241930,58166950,FALSE,0.185703733094268,55.8931508693068,29.3860429174502,14.0357415657705,,,,,,36.1962030910303,24.8751597714055,35.3750318420359,4,3
+United Kingdom,GBR,1997,241930,58316954,FALSE,0.331737236727282,94.7700454261768,31.6395598341882,14.8868238195773,,,,,,38.9721846294101,35.4070415791674,49.5430179583881,4,3
+United Kingdom,GBR,1998,241930,58487141,FALSE,0.612241379909143,100,32.2510395790652,15.9121339989453,,,,,,39.99773315817,37.1938537394799,51.9699557190385,4,3
+United Kingdom,GBR,1999,241930,58682466,FALSE,0.950509824894978,100,34.2394087044047,16.4094027271523,,,,,,42.682748886018,37.899830314113,53.0307172043901,4,3
+United Kingdom,GBR,2000,241930,58892514,FALSE,1.19300477182313,100,35.5650008693289,16.9224548380835,,,,,,45.9186898381309,38.4201151198089,54.2803815587381,4,3
+United Kingdom,GBR,2001,241930,59119673,FALSE,1.48348350667481,99.0416337966908,35.4062083676645,16.6663299355158,,,,,,45.4013354570409,38.1494139016365,53.7030997297492,4,3
+United Kingdom,GBR,2002,241930,59370479,FALSE,2.49194945529423,100,37.2814768452402,17.0953780049675,,,,,,45.5598553916261,39.2172010763755,54.2184111321979,4,3
+United Kingdom,GBR,2003,241930,59647577,FALSE,2.84663191531952,86.8335034965852,41.7910598901371,17.5418091145805,22.184374086451,,25.3967544208018,,,50.65275051765,34.8819517674848,45.1062043874044,6,4
+United Kingdom,GBR,2004,241930,59987905,FALSE,2.86497895856361,100,49.0095754031966,18.6188459270728,24.1399603048361,,22.6672790303492,,,60.7953231504394,38.6321358638364,50.5203620269654,6,4
+United Kingdom,GBR,2005,241930,60401206,FALSE,3.03576062670362,100,53.4044347256628,19.3994967207818,25.6714312484779,,23.049601969152,,,70.5346920314448,39.77785880846,53.2459476803446,6,4
+United Kingdom,GBR,2006,241930,60846820,FALSE,2.96272864432318,100,61.1283914906189,20.412378108353,26.0260372661641,,20.7468369596645,17.645328635782,,85.7563486583664,41.0500670405919,48.9121784724332,6,5
+United Kingdom,GBR,2007,241930,61322463,FALSE,3.20758082396199,100,64.6419306102014,20.249879691611,27.4643099371646,,19.233126957347,28.9462528857585,,100,41.4665036166243,53.6858519069433,6,5
+United Kingdom,GBR,2008,241930,61806995,FALSE,3.32229451597533,100,65.2757225253414,19.8299101202932,26.8848851450663,,20.3661779181589,41.5581484074399,,95.4936845440823,41.7588210159538,55.4495841979949,6,5
+United Kingdom,GBR,2009,241930,62276270,FALSE,3.51472161639618,44.3300294158169,51.2344347871902,18.4488290104304,24.8283309493968,,20.3285433015072,58.9214638381621,31.4802293460686,64.6159995575388,28.2227979129016,39.6875157449207,6,6
+United Kingdom,GBR,2010,241930,62766365,FALSE,3.54737451529704,84.6500074606926,55.9493174311268,18.3937942849503,24.7089600088791,,22.0086564653675,81.8459902705944,40.572438011162,67.596602553197,37.520264694766,52.5112481743273,6,6
+United Kingdom,GBR,2011,241930,63258810,FALSE,3.53549493322376,74.7723196929638,63.8545021422438,19.0828778973415,25.2498638477494,,16.7628573064433,100,44.4745257825663,77.6042660165731,37.0804296257971,55.4494744493147,6,6
+United Kingdom,GBR,2012,241930,63700215,FALSE,3.5973522222121,40.4674663123699,63.0775617579571,18.8934231665717,24.919231985859,,15.4010290995857,100,52.6728643543137,74.5364828106586,32.3516161521684,50.3285442905833,6,6
+United Kingdom,GBR,2013,241930,64128273,FALSE,3.6699074508535,68.887909121007,64.3589679818815,19.4202721243193,25.4059176544784,,19.7977052749986,100,61.7121882513554,74.8797951657581,39.6411583674025,57.4496449895731,6,6
+United Kingdom,GBR,2014,241930,64602298,FALSE,3.71458251686727,100,67.012251055213,20.2207952591658,26.1053235544142,,19.8757610423988,100,66.9965253087542,76.5188496699089,46.3033191970665,63.9353218800379,6,6
+United Kingdom,GBR,2015,241930,65116219,FALSE,3.70096656595393,71.066630903189,61.3970155642726,21.3428481904188,26.6428713740969,,19.7742844242098,100,74.7949312634968,69.5180149445735,42.0127794852568,59.416118287648,6,6
+United Kingdom,GBR,2016,241930,65611593,FALSE,3.78383311420749,100,58.3057492614034,22.3805402114924,28.606895796352,,15.1172866166617,100,80.1643347021162,65.3320247935482,46.6252906509802,63.8323643873031,6,6
+United Kingdom,GBR,2017,241930,66058859,FALSE,3.58567055127799,100,60.6978242754244,23.5964486339374,29.4438408168409,,17.0897222741019,100,83.826319573112,69.777486772485,48.1326642179756,65.7149962089394,6,6
+United Kingdom,GBR,2018,241930,66460344,FALSE,3.57455127783106,90.7765334096182,65.7684918470055,23.9167062316431,29.4137428933994,,18.1261519997143,,,77.4921096481076,40.4324869531624,52.5778753222708,6,4
+United Kingdom,GBR,2019,241930,66836327,FALSE,3.62595422236477,33.118254486637,65.554420463396,24.343603207924,,,,,,75.5365624117875,31.6605580950804,44.3328067021162,4,3
+United Kingdom,GBR,2020,241930,67215293,FALSE,3.69520647675449,23.0572371561488,55.3566507010818,,,,,,,60.7345600194175,27.3696981113283,41.8958985877831,3,2
+Georgia,GEO,1990,69490,4802000,FALSE,0,,,,,,,,,,0,,1,0
+Georgia,GEO,1991,69490,4835900,FALSE,0,,,,,,,,,,0,,1,0
+Georgia,GEO,1992,69490,4873500,FALSE,0,,,,,,,,,,0,,1,0
+Georgia,GEO,1993,69490,4911100,FALSE,0,,,,,,,,,,0,,1,0
+Georgia,GEO,1994,69490,4836076,FALSE,0,0.0725531199215851,,,,,,,,,0.0362765599607925,0.0725531199215851,2,1
+Georgia,GEO,1995,69490,4657722,FALSE,0.00665700615531571,,,0.814892441761213,,,,,,,0.410774723958264,0.814892441761213,2,1
+Georgia,GEO,1996,69490,4491699,FALSE,0.0233654493473149,,,0.9072706787317,,,,,,,0.465318064039507,0.9072706787317,2,1
+Georgia,GEO,1997,69490,4349913,FALSE,0.0366917203357672,2.44506492082832,1.0672235703332,1.86406382075754,,,,,,1.04048288027608,1.35326100806371,1.78320387395398,4,3
+Georgia,GEO,1998,69490,4243607,FALSE,0.0634751614888787,2.74196126799491,1.10506318086443,2.14553388812565,,,,,,1.10173455165325,1.51400837461847,1.99640990259127,4,3
+Georgia,GEO,1999,69490,4157192,FALSE,0.262341422914981,0.878828518287074,0.912826983987031,2.21061811137693,,,,,,0.926170389176701,1.06615375914151,1.33853900628024,4,3
+Georgia,GEO,2000,69490,4077131,FALSE,0.311440386865752,1.45079249244822,1.24120432578936,2.09018118341153,,,,,,1.20705932647834,1.27340459712872,1.58267766744603,4,3
+Georgia,GEO,2001,69490,4014373,FALSE,0.647529874643399,1.24511239666165,1.27451716633513,1.83842545232479,,,,,,1.2494461233745,1.25139622249124,1.44432799078698,4,3
+Georgia,GEO,2002,69490,3978515,FALSE,1.0454675985576,1.81540463125631,1.43863560312586,1.87638184771445,,,,,,1.4115291704679,1.54397242016356,1.70110521647956,4,3
+Georgia,GEO,2003,69490,3951736,FALSE,1.69615801880242,3.76219412009213,1.84613329001652,0.960734330128765,2.03978765662956,,,,,1.79003744474453,2.06630493975996,2.17098863165514,5,3
+Georgia,GEO,2004,69490,3927340,FALSE,2.59205448925477,5.61404129551645,2.48638530839846,2.57825674740989,2.33769834229506,,,,,2.39552648507269,3.31768446014489,3.52927484266634,5,3
+Georgia,GEO,2005,69490,3902469,FALSE,4.08075449897046,6.09400776363061,3.32188755846528,4.40951291519363,2.64782019727943,,,,,3.14816241901345,4.476540684065,4.55056103261256,5,3
+Georgia,GEO,2006,69490,3880347,FALSE,5.08111869335232,13.3889358544748,4.24970286208879,7.2898013447413,2.73809849923568,,,0.312896174454442,,3.99231882864284,7.50238968866431,6.24598805057835,5,4
+Georgia,GEO,2007,69490,3860158,FALSE,5.60518640730906,23.7847346063826,5.62958881739506,7.94474946467002,3.02293612768086,,,0.622903646469611,,5.4260306103655,10.7410648239392,9.44460458197193,5,4
+Georgia,GEO,2008,69490,3848449,FALSE,6.81339293470453,20.238382595089,6.95926104325886,9.97967116047955,4.62062395206946,38.142246423906,,0.953368101282292,,6.75818174991939,16.4265908314876,9.48240090169256,6,4
+Georgia,GEO,2009,69490,3814419,FALSE,13.7826925816147,7.87974330433441,5.31019822773237,11.0814664334121,4.44530799373425,23.4880597164308,3.78227698351681,1.44286724889757,,5.20411773880753,10.8874062078402,5.87809434179369,7,5
+Georgia,GEO,2010,69490,3786695,FALSE,18.6083149409324,12.8720178350759,6.44642538849205,13.209353971992,5.33231791506245,5.31573879081939,5.71495295601673,4.84503214589522,,6.37595580818427,10.3611339805547,8.60346254343283,7,5
+Georgia,GEO,2011,69490,3756441,FALSE,21.9798503269313,15.7951108038145,8.48371778570772,16.0031245132769,6.21312021406718,18.0738402178609,3.84065374358048,4.88405444450465,,8.51079253157172,14.0293828985286,9.80674720734964,7,5
+Georgia,GEO,2012,69490,3728874,FALSE,25.9498156206678,13.9393653505412,9.79942651734155,22.281960922307,5.5234980136346,17.8185038322369,0.967261778568355,9.84043573408568,,9.89007316929238,15.1260556702771,11.3838193909589,7,5
+Georgia,GEO,2013,69490,3717668,FALSE,30.5093100953274,13.8485029722036,10.6577630461092,26.7081458510441,6.81463472036127,23.1425511782689,2.91053205716376,21.939388861913,,10.5510464802072,17.9628008666862,15.1915232445063,7,5
+Georgia,GEO,2014,69490,3719414,FALSE,30.987978717421,26.4543549892938,11.0584909856938,26.4865775137473,7.42498091342001,20.4515489067202,9.69721923210833,36.941141213759,,10.9714142956329,20.8560283908308,22.1101414489083,7,5
+Georgia,GEO,2015,69490,3725276,FALSE,33.4493433525585,24.1470046646004,9.55170668550927,27.3644860972288,7.6955677993071,13.8170968688559,5.80917596005874,38.8561736365617,,9.50400978316758,19.0231356048019,21.1361700283235,7,5
+Georgia,GEO,2016,69490,3727505,FALSE,41.08188786775,24.3728136962783,9.48240768150031,28.6549828580737,8.1762645927753,9.42235137240955,7.74093619683364,42.8855822481996,,9.72750283251629,20.1258966121409,22.6763635663803,7,5
+Georgia,GEO,2017,69490,3728004,FALSE,41.9520412884588,25.0285600947256,10.9342149108539,33.672602531187,10.9162872588166,6.3567793919984,5.80492504401384,49.3174551315151,,11.2967533961965,20.6248538768729,25.0240592395276,7,5
+Georgia,GEO,2018,69490,3726549,FALSE,44.0859113463742,18.2814943892702,12.7307811961841,35.5340804978996,13.8081021101126,,7.74292203815873,,,12.9807265568624,23.6750378935774,18.6348058705477,6,4
+Georgia,GEO,2019,69490,3720161,FALSE,48.4770878053869,19.4882152389614,13.3933263012569,37.570690354142,,,,,,13.7195267093235,29.7323299249368,23.5928107674756,4,3
+Georgia,GEO,2020,69490,3714000,FALSE,51.1564451025963,0.185966657276838,9.66547478609615,,,,,,,9.96679948403793,20.3359621819898,5.07638307065738,3,2
+Ghana,GHA,1990,227540,14773274,FALSE,0,0.0878767893507038,0.369492205325503,,,,,,,0.315854257910476,0.152456331558736,0.20186552363059,3,2
+Ghana,GHA,1991,227540,15207360,FALSE,0,0.11536269345169,0.400316720747849,,,,,,,0.345264569511948,0.171893138066513,0.230313631481819,3,2
+Ghana,GHA,1992,227540,15653345,FALSE,0,0.126085335826029,0.429089754610339,,,,,,,0.372140398122552,0.185058363478789,0.24911286697429,3,2
+Ghana,GHA,1993,227540,16106756,FALSE,0,0.680755489299606,0.469884610538782,,,,,,,0.410668746130442,0.383546699946129,0.545712117715024,3,2
+Ghana,GHA,1994,227540,16561677,FALSE,0,1.23407293930516,0.456558556095051,,,,,,,0.399409370097915,0.56354383180007,0.816741154701537,3,2
+Ghana,GHA,1995,227540,17014058,FALSE,0.0000535653667956482,0.274537024108581,0.488260965793514,0.202749426716688,,,,,,0.433253097624469,0.241400245496395,0.303513182816579,4,3
+Ghana,GHA,1996,227540,17462504,FALSE,0.000847348235037383,0.304658025078864,0.530300871336829,0.210722931100792,,,,,,0.473243314622883,0.261632293937881,0.329541423600847,4,3
+Ghana,GHA,1997,227540,17908977,FALSE,0.00402781474846704,0.204450954565471,0.538414246969624,0.218999688020515,,,,,,0.464685567874649,0.241473176076019,0.296045403486879,4,3
+Ghana,GHA,1998,227540,18357159,FALSE,0.00460055921519559,0.463686303037298,0.776831086455537,0.228837813058168,,,,,,0.688348059604171,0.36848894044155,0.460290725233212,4,3
+Ghana,GHA,1999,227540,18812369,FALSE,0.0146058999663228,0.948877488562214,0.784954182312218,0.239408953171371,,,,,0.769875462344518,0.691789095455119,0.551544397271329,0.662487749883305,4,4
+Ghana,GHA,2000,227540,19278850,FALSE,0.0208722100822992,0.377419630113658,0.688679213141478,0.249964007099419,,,,,0.673513241624003,0.604507141630959,0.402089660412172,0.47635100511701,4,4
+Ghana,GHA,2001,227540,19756929,FALSE,0.0265181456857006,0.219492764568059,0.693442169323342,0.268475035126687,,,,,0.82574080497658,0.608481171662737,0.406733783936074,0.480547444083515,4,4
+Ghana,GHA,2002,227540,20246376,FALSE,0.107422308897713,0.132082775580616,0.66675963444455,0.288349931564358,,,,,0.588909225732829,0.591379930774235,0.356704775244013,0.40018046591301,4,4
+Ghana,GHA,2003,227540,20750308,FALSE,0.150609397580996,0.311765889838419,0.818650694933701,0.309412797569421,0.518190304481686,,2.60728464654402,,0.570044196198588,0.725922241940278,0.794627937110857,0.904885954418144,6,5
+Ghana,GHA,2004,227540,21272328,FALSE,0.211406919015432,0.289163133481853,0.961249647391622,0.332050825599173,0.584006374496811,,1.86508830957619,,,0.856519003099121,0.731791767012854,0.835705317939084,6,4
+Ghana,GHA,2005,227540,21814648,FALSE,0.219888269712286,0.291466839819832,1.12976693986875,0.237444683902384,0.729439259039006,,1.65338322089694,,,1.00209859436645,0.706389990840037,0.796098334746402,6,4
+Ghana,GHA,2006,227540,22379057,FALSE,0.318749137360519,1.24646872063222,1.41029469028266,0.268331825452946,0.755895110412277,4.3070587848412,0.967010530594912,,,1.24710977963426,1.41965228152741,0.932230214078583,7,4
+Ghana,GHA,2007,227540,22963946,FALSE,0.439166603331667,2.64174416393254,1.65502425868939,0.309070557098325,0.793693295769549,7.7710642290857,2.82714265881619,,,1.48432025593568,2.6072020784923,1.81556940894568,7,4
+Ghana,GHA,2008,227540,23563832,FALSE,0.474675756548981,5.06805388764199,1.97835760701563,0.358389556819483,0.846248168358807,2.64831880416996,2.90823447767955,0.00300339216192266,,1.73788403370205,2.2393383483126,2.015113069601,7,5
+Ghana,GHA,2009,227540,24170943,FALSE,0.589549668443025,4.31757993555678,1.82375635397216,0.402122696410366,0.84826261807072,9.65664069956932,2.68596683842047,0.00310733861282698,,1.65737540010379,3.24593603206202,1.81323044182085,7,5
+Ghana,GHA,2010,227540,24779614,FALSE,0.824546513601102,4.47332111962501,2.24321388702728,0.454960236450222,0.988610607730221,8.74217763719586,0.873330140807834,0.00492373416004908,,2.0093672774995,2.93525825578455,1.56318050170852,7,5
+Ghana,GHA,2011,227540,25387713,FALSE,0.928611426447528,5.65422072097796,3.21191077743304,0.391393260081512,1.03960830379835,9.70639631401418,0.710343089449865,0.0227833061642837,,2.91076349107549,3.43381259806735,1.93790077354982,7,5
+Ghana,GHA,2012,227540,25996454,FALSE,1.06808753421869,5.56007848552338,3.57433923201132,0.420512266153973,1.02228562654535,9.87281692842056,1.24867705709693,0.322926280599882,,3.29885323113492,3.62408525057081,2.17020946410182,7,5
+Ghana,GHA,2013,227540,26607641,FALSE,1.47672620201909,5.3203717199695,3.48161837625373,0.452366442099019,1.011006102734,,1.08443955547876,0.807480250867361,,3.18797501488178,2.36310445916402,2.17052659665928,6,5
+Ghana,GHA,2014,227540,27224480,FALSE,1.82813852859322,5.42878191122472,3.02897971431449,0.366673754107751,1.19098976657016,7.2667245978743,1.32483606566491,0.908331023699514,,2.78956995490669,3.20735576196323,2.16363854192072,7,5
+Ghana,GHA,2015,227540,27849203,FALSE,2.16336679291014,5.37622990830097,3.19725963492014,0.389822555761116,0.875621739395871,7.25579766027693,2.07218701220127,1.66823630140788,,2.93056759158552,3.40911059406176,2.48740867385135,7,5
+Ghana,GHA,2016,227540,28481947,FALSE,2.57515545521119,5.38961062567258,3.19072321494425,,0.975142618155909,5.79265352271675,0.886441544220312,2.42246548806544,,2.90662279433051,3.56691687255302,2.90128511307221,6,4
+Ghana,GHA,2017,227540,29121464,FALSE,3.40768519460204,4.92621413036408,3.49814892018588,,0.966558847097207,4.6920564665442,1.85780355889592,2.77197313490328,,3.29395902577483,3.67638165411842,3.21248746248453,6,4
+Ghana,GHA,2018,227540,29767108,FALSE,3.78396321976268,4.52318905122395,3.67959366849691,,1.01726974734565,,0.848170439704155,,,3.57274869731309,3.20872909479692,2.9813693960804,5,3
+Ghana,GHA,2019,227540,30417858,FALSE,4.56417550034089,6.44176141617836,4.13822774933289,,,,,,,3.95262378518196,5.04805488861738,5.19719260068016,3,2
+Ghana,GHA,2020,227540,31072945,FALSE,,0.765610170463136,3.59243905586697,,,,,,,3.46455097016761,2.17902461316505,2.11508057031537,2,2
+Gibraltar,GIB,1990,10,29149,TRUE,0,,,,,,,,,,0,,1,0
+Gibraltar,GIB,1991,10,29021,TRUE,0,,,,,,,,,,0,,1,0
+Gibraltar,GIB,1992,10,28844,TRUE,0,,,,,,,,,,0,,1,0
+Gibraltar,GIB,1993,10,28680,TRUE,0,,,,,,,,,,0,,1,0
+Gibraltar,GIB,1994,10,28605,TRUE,0,,,,,,,,,,0,,1,0
+Gibraltar,GIB,1995,10,28688,TRUE,0,,,,,,,,,,0,,1,0
+Gibraltar,GIB,1996,10,28970,TRUE,,,,,,,,,,,,,0,0
+Gibraltar,GIB,1997,10,29404,TRUE,100,,,,,,,,,,100,,1,0
+Gibraltar,GIB,1998,10,29945,TRUE,100,,,,,,,,,,100,,1,0
+Gibraltar,GIB,1999,10,30526,TRUE,100,,,,,,,,,,100,,1,0
+Gibraltar,GIB,2000,10,31081,TRUE,100,,,,,,,,,,100,,1,0
+Gibraltar,GIB,2001,10,31604,TRUE,100,,,,,,,,,,100,,1,0
+Gibraltar,GIB,2002,10,32097,TRUE,100,,,,,,,,,,100,,1,0
+Gibraltar,GIB,2003,10,32556,TRUE,100,,,,77.2460530339097,,,,,,100,,2,0
+Gibraltar,GIB,2004,10,32930,TRUE,100,,,,88.0550929054428,,,,,,100,,2,0
+Gibraltar,GIB,2005,10,33222,TRUE,100,,,,98.2745407565639,,,,,,100,,2,0
+Gibraltar,GIB,2006,10,33420,TRUE,100,,,,90.0644962646707,,,,,,100,,2,0
+Gibraltar,GIB,2007,10,33524,TRUE,100,,,,100,,,,,,100,,2,0
+Gibraltar,GIB,2008,10,33570,TRUE,100,,,,100,,,,,,100,,2,0
+Gibraltar,GIB,2009,10,33562,TRUE,100,,,,100,83.8704340110952,0,,,,61.2901446703651,0,4,1
+Gibraltar,GIB,2010,10,33585,TRUE,100,,,,100,63.5561004442963,0,,,,54.5187001480988,0,4,1
+Gibraltar,GIB,2011,10,33608,TRUE,100,,,,100,100,100,,,,100,100,4,1
+Gibraltar,GIB,2012,10,33653,TRUE,100,,,,100,,0,45.7953508914376,,,50,22.8976754457188,3,2
+Gibraltar,GIB,2013,10,33694,TRUE,,,,,100,,0,,,,0,0,2,1
+Gibraltar,GIB,2014,10,33726,TRUE,,,,,100,,0,,,,0,0,2,1
+Gibraltar,GIB,2015,10,33742,TRUE,,,,,100,3.33845381119957,100,,,,51.6692269055998,100,3,1
+Gibraltar,GIB,2016,10,33738,TRUE,100,,,,100,,0,100,,,50,50,3,2
+Gibraltar,GIB,2017,10,33723,TRUE,,,,,100,9.19918364946528,100,,,,54.5995918247327,100,3,1
+Gibraltar,GIB,2018,10,33715,TRUE,,,,,100,,0,,,,0,0,2,1
+Gibraltar,GIB,2019,10,33706,TRUE,,,,,,,,,,,,,0,0
+Gibraltar,GIB,2020,10,33691,TRUE,,,,,,,,,,,,,0,0
+Guinea,GIN,1990,245720,6352282,FALSE,0,0.124140018466605,0.640537600063591,,,,,,,0.605176964804067,0.254892539510065,0.364658491635336,3,2
+Guinea,GIN,1991,245720,6534936,FALSE,0,0.26765173407389,0.65593350998627,,,,,,,0.624428723122167,0.307861748020053,0.446040228598028,3,2
+Guinea,GIN,1992,245720,6716032,FALSE,0,0.131865303754653,0.541143979152749,,,,,,,0.509515098993447,0.2243364276358,0.32069020137405,3,2
+Guinea,GIN,1993,245720,6897171,FALSE,0,0.0228907356885351,0.546085545313453,,,,,,,0.495683460487335,0.189658760333996,0.259287098087935,3,2
+Guinea,GIN,1994,245720,7081119,FALSE,0.0000511672294348985,0.00260276502308784,0.549576955658821,,,,,,,0.493265778576343,0.184076962637115,0.247934271799715,3,2
+Guinea,GIN,1995,245720,7269631,FALSE,0.000240913953154547,0.00826563655731076,0.5314723522705,,,,,,,0.483766591578419,0.179992967593655,0.246016114067865,3,2
+Guinea,GIN,1996,245720,7463782,FALSE,0.000683998363448346,0.142640096629489,0.515648675767535,0.0180777865255784,,,,,,0.471383140804563,0.169262639321513,0.210700341319877,4,3
+Guinea,GIN,1997,245720,7662071,FALSE,0.00130019261440353,0.107700331882796,0.459206554813689,0.025499670934945,,,,,,0.424001253803309,0.148426687561458,0.185733752207017,4,3
+Guinea,GIN,1998,245720,7860772,FALSE,0.00206717626363229,0.104950090799038,0.503170366437381,0.0340907078293156,,,,,,0.46521563233927,0.161069585332342,0.201418810322541,4,3
+Guinea,GIN,1999,245720,8054745,FALSE,0.0197756415294375,0.367286535463397,0.471042097213553,0.039267441210196,,,,,,0.433281817460334,0.224342928854146,0.279945264711309,4,3
+Guinea,GIN,2000,245720,8240735,FALSE,0.0303326928947707,0.0529135662726729,0.433389536568506,0.0471932043191019,,,,,,0.397735832517832,0.140957250013763,0.165947534369869,4,3
+Guinea,GIN,2001,245720,8417082,FALSE,0.0546303837674679,0.0347919716715133,0.440602622183603,0.0533902615727757,,,,,,0.403450679479634,0.14585380979884,0.163877637574641,4,3
+Guinea,GIN,2002,245720,8586077,FALSE,0.122650957785079,0.306489566170237,0.454843269212234,0.0593850268444198,,,,,,0.398721392978932,0.235842205002992,0.25486532866453,4,3
+Guinea,GIN,2003,245720,8753097,FALSE,0.134955855262028,0.395674098187573,0.415305539528269,0.0596120034233677,0.464098987259224,,,,,0.38300737993742,0.251386874100309,0.27943116051612,5,3
+Guinea,GIN,2004,245720,8925729,FALSE,0.149325851753967,0.481058860201172,0.44293542238094,0.0597919483997591,0.533347177244352,,,,,0.385185215112771,0.28327802068396,0.308678674571234,5,3
+Guinea,GIN,2005,245720,9109585,FALSE,0.155926313342713,0.505533487635269,0.480698126955977,0.0585558547611898,0.688020441752157,,,,,0.419874054511569,0.300178445673787,0.327987798969342,5,3
+Guinea,GIN,2006,245720,9307421,FALSE,0.179415747229758,0.589033340267372,0.573358757311736,0.0587160250925425,0.76236444582963,,,0.0000466431452204589,,0.498210000361925,0.350130967475352,0.286501502216765,5,4
+Guinea,GIN,2007,245720,9518159,FALSE,0.21466973298556,1.77820180251338,0.664698331432811,0.0368355241131421,0.470143389098912,,,0.0000431516016118867,,0.609465776717578,0.673601347761223,0.606136563736427,5,4
+Guinea,GIN,2008,245720,9738796,FALSE,0.24745580862034,2.00641681642672,0.770684901201797,0.0284838057471057,0.490401129869784,,,0.00629426111180612,,0.685198352781872,0.76326033299899,0.681598309016875,5,4
+Guinea,GIN,2009,245720,9964470,FALSE,0.247109102643696,0.619957431486411,0.572051251551359,,0.503106788693942,,0.72393158839302,0.00725394429933356,,0.532330312898876,0.540762343518621,0.47086831926941,5,4
+Guinea,GIN,2010,245720,10192168,FALSE,0.257009111562378,0.872260885526517,0.753405139826615,0.0133261900035257,0.500476754741355,,0.353879301959828,0.0106896376058912,,0.668176074474768,0.449976125775773,0.383666417914106,6,5
+Guinea,GIN,2011,245720,10420459,FALSE,0.502757132401652,4.02744715953266,0.932239624540671,0.151263875741711,0.678116292883528,,0,0.0160871880893038,,0.838711535037553,1.12274155844334,1.00670195168025,6,5
+Guinea,GIN,2012,245720,10652032,FALSE,0.762332307298827,2.50163003253408,1.14818195158403,0.108028580048401,0.54228826958696,,0,0.017112963058596,,1.02845646109858,0.904034574293067,0.731045607347932,6,5
+Guinea,GIN,2013,245720,10892821,FALSE,1.08214944426106,0.00426800305100686,1.03969402833408,0.0609994028580664,0.528677964590714,,0,0.0314195581426437,,0.977590764558531,0.437422175700844,0.21485554572205,6,5
+Guinea,GIN,2014,245720,11150970,FALSE,1.50342725991342,0.303082508303603,1.057143524117,0.0344972093125419,0.459236757507188,,0.646902878816336,0.0525396597905836,,0.960416998624911,0.70901067609258,0.399487850969595,6,5
+Guinea,GIN,2015,245720,11432096,FALSE,1.87889747856481,0.223619652904733,0.925939847473557,0.0357383908092121,0.403936474015346,,0,0.128278905918997,,0.83672243133384,0.612839073950463,0.244871876193356,6,5
+Guinea,GIN,2016,245720,11738434,FALSE,2.1869104871425,6.12595724609289,1.52961704278939,0.0637446522658984,0.448883466521973,6.79073676110732,0,0.262471616384095,,1.36592938146083,2.782827698233,1.56362057924074,7,5
+Guinea,GIN,2017,245720,12067516,FALSE,2.4745877189597,2.10326900565753,1.74389797611642,0.0982066811610454,0.560690314707486,5.59299514733899,0.597769631678516,0.328288689829224,,1.53882098109709,2.10178769348537,0.933270997884681,7,5
+Guinea,GIN,2018,245720,12414292,FALSE,4.60624815996123,1.24744867059652,1.57238482676185,,0.36608113049414,,0,,,1.41754342873949,1.8565204143299,0.88833069977867,5,3
+Guinea,GIN,2019,245720,12771246,FALSE,4.71747556810145,0.155981496420124,1.54595394889643,,,,,,,1.38769851777353,2.13980367113933,0.771840007096828,3,2
+Guinea,GIN,2020,245720,13132792,FALSE,,0.00788159582391013,2.782638434855,,,,,,,2.45679801149215,1.39526001533946,1.23233980365803,2,2
+"Gambia, The",GMB,1990,10120,955595,TRUE,0,0.648067214134642,0.903774065889516,,,,,,,0.811094578728461,0.517280426674719,0.729580896431551,3,2
+"Gambia, The",GMB,1991,10120,992671,TRUE,0,0.409594318407737,1.02715347099419,,,,,,,0.914916372082635,0.478915929800643,0.662255345245186,3,2
+"Gambia, The",GMB,1992,10120,1027476,FALSE,0,0.269916359087324,1.10464144257295,,,,,,,0.979271309895417,0.458185933886757,0.624593834491371,3,2
+"Gambia, The",GMB,1993,10120,1060861,FALSE,0,0.444073051268837,1.12561387837144,,,,,,,0.993072102327486,0.523228976546761,0.718572576798162,3,2
+"Gambia, The",GMB,1994,10120,1094219,FALSE,0,0.389456419616641,0.97869143334516,,,,,,,0.862420233829223,0.456049284320601,0.625938326722932,3,2
+"Gambia, The",GMB,1995,10120,1128577,FALSE,0.0213943441086538,0.30037606954015,0.831593310383268,0.482925011514997,,,,,,0.740410814781212,0.409072183886767,0.507903965278787,4,3
+"Gambia, The",GMB,1996,10120,1164091,FALSE,0.0798999570347232,0.40144900994966,1.01657548288584,0.80208605449718,,,,,,0.903872757484698,0.575002626091851,0.702469273977179,4,3
+"Gambia, The",GMB,1997,10120,1200522,FALSE,0.111958839091757,0.426215062079377,0.964635365717394,0.858653061169231,,,,,,0.856749727508741,0.59036558201444,0.713872616919117,4,3
+"Gambia, The",GMB,1998,10120,1238124,FALSE,0.436030904396206,0.839543931673667,,0.891401024714432,,,,,,,0.722325286928102,0.86547247819405,3,2
+"Gambia, The",GMB,1999,10120,1277118,FALSE,1.46822343724556,1.69925238406577,,0.911699726870133,,,,,,,1.35972518272715,1.30547605546795,3,2
+"Gambia, The",GMB,2000,10120,1317708,FALSE,1.83244193225439,1.44853477914665,,0.726848307971081,,,,,,,1.33594167312404,1.08769154355887,3,2
+"Gambia, The",GMB,2001,10120,1360070,FALSE,2.57464526121956,1.14414633274169,,0.507662955094509,,,,,,,1.40881818301859,0.825904643918097,3,2
+"Gambia, The",GMB,2002,10120,1404263,FALSE,3.35167204748529,1.3376066626682,,0.699259299741667,,,,,,,1.79617933663172,1.01843298120493,3,2
+"Gambia, The",GMB,2003,10120,1449925,FALSE,4.40236543489103,0.552734906735669,0.454867514321406,0.744218687155225,3.85228390957758,,,,,0.429180297371553,1.53854663577583,0.575377963754149,5,3
+"Gambia, The",GMB,2004,10120,1496524,FALSE,5.79025066847442,1.62732547850717,0.650442607743649,0.729117287038749,2.9509835517002,,,,,0.599207882211124,2.199284010441,0.985216882585681,5,3
+"Gambia, The",GMB,2005,10120,1543745,FALSE,6.44627685617008,1.52424806372514,0.676655560260346,3.89377555235035,3.0623020526651,,,,,0.631967018124625,3.13523900812648,2.01666354473337,5,3
+"Gambia, The",GMB,2006,10120,1591444,FALSE,8.62111859264284,2.26559608891474,0.748296946187888,3.29612965629025,2.76098466888346,,11.3318385607577,,,0.703928989086417,5.25259596895869,4.39937332376228,6,4
+"Gambia, The",GMB,2007,10120,1639846,FALSE,9.91188909354809,2.08871118170325,0.895633721480553,1.05788902967765,1.92308292632079,,,,,0.817606963760669,3.48853075660238,1.32140239171386,5,3
+"Gambia, The",GMB,2008,10120,1689288,FALSE,10.6684133746954,1.83798538397587,0.945854104876073,1.05564893604857,2.06697355004772,,,,,0.848870442151265,3.62697544989899,1.2475015873919,5,3
+"Gambia, The",GMB,2009,10120,1740277,FALSE,11.4847422133622,0.994165313813136,0.829557242464116,0.989774145852689,1.71338345553072,,8.29016828308895,,,0.740896242162082,4.51768143971623,2.75375099622921,6,4
+"Gambia, The",GMB,2010,10120,1793199,FALSE,13.4392314470872,0.908770529367315,0.762303567882317,0.6150228340025,2.4979424752208,,10.0568796248975,,,0.685835944358502,5.15644160064736,3.06662723315644,6,4
+"Gambia, The",GMB,2011,10120,1848142,FALSE,15.4071136886654,2.23887337136454,0.771928130166583,0.695291746212326,3.23265125472606,,9.75790090073516,,,0.728050275960629,5.77422156742881,3.35502907356816,6,4
+"Gambia, The",GMB,2012,10120,1905020,FALSE,17.1181962275909,1.17810882591668,0.818231893042062,0.999706648840999,2.34218464455895,,5.67993611190008,,,0.755234552589703,5.15883594145815,2.15324653481187,6,4
+"Gambia, The",GMB,2013,10120,1963708,FALSE,18.6752412252957,1.63449955690008,0.732871386186734,1.0563929594389,2.76267594543841,,3.67345582672912,,,0.669550546194512,5.1544921909101,1.75847472231565,6,4
+"Gambia, The",GMB,2014,10120,2024037,FALSE,20.1375318052284,0.763509840062392,0.818531469451403,0.934834806498894,1.87856700966603,11.8587744375551,0,,,0.738058296263885,5.75219705979937,0.609100735706293,7,4
+"Gambia, The",GMB,2015,10120,2085860,FALSE,24.7397988545337,1.56082253835465,0.673677746800345,2.61350357189877,1.39742597435431,10.2057367925997,5.18749671209568,,,0.610447993326839,7.49683936938046,2.49306770391899,7,4
+"Gambia, The",GMB,2016,10120,2149134,FALSE,30.471343836337,1.45241844519476,0.592431841888518,2.5421674805626,1.64135371520305,,3.35651224846594,,,0.537139266823982,7.68297477048977,1.97205936026182,6,4
+"Gambia, The",GMB,2017,10120,2213900,FALSE,37.8623069526103,1.40656423847232,0.878616313422253,2.86282918675912,1.76931397136505,,0,,,0.789722071104788,8.60206333825279,1.26477887408406,6,4
+"Gambia, The",GMB,2018,10120,2280092,FALSE,45.9539359389796,1.64445566478735,1.08065550359809,2.93951302429452,1.42332979781732,,3.16372961906563,,,0.97213130439995,10.956457950145,2.17995740313686,6,4
+"Gambia, The",GMB,2019,10120,2347696,FALSE,56.9040804990507,1.35834943854598,0.993320856803281,3.20151125977111,,,,,,0.892248189403823,15.6143155135428,1.8173696292403,4,3
+"Gambia, The",GMB,2020,10120,2416664,FALSE,,0.0632262337701055,0.831096006346847,,,,,,,0.750524597689211,0.447161120058476,0.406875415729658,2,2
+Guinea-Bissau,GNB,1990,28120,975265,TRUE,0,0.090842264922272,0.245387069036051,,,,,,,0.249472368176663,0.112076444652774,0.170157316549467,3,2
+Guinea-Bissau,GNB,1991,28120,997522,TRUE,0,0.0918931261834087,0.273275849426614,,,,,,,0.295394786465791,0.121722991870008,0.1936439563246,3,2
+Guinea-Bissau,GNB,1992,28120,1020353,FALSE,0,0.250597845002067,0.268029622481162,,,,,,,0.278583118281836,0.17287582249441,0.264590481641951,3,2
+Guinea-Bissau,GNB,1993,28120,1043421,FALSE,0,0.138711858220108,0.195345507325927,,,,,,,0.216095046607526,0.111352455182012,0.177403452413817,3,2
+Guinea-Bissau,GNB,1994,28120,1066345,FALSE,0,0.0176860130692338,0.233556002423369,,,,,,,0.24290580531081,0.0837473384975344,0.130295909190022,3,2
+Guinea-Bissau,GNB,1995,28120,1088850,FALSE,0,0.00161120632767553,0.225962826006042,,,,,,,0.225097079437811,0.0758580107779059,0.113354142882743,3,2
+Guinea-Bissau,GNB,1996,28120,1110835,FALSE,,0.0792588770135163,0.211543736984567,,,,,,,0.207003646692321,0.145401306999042,0.143131261852919,2,2
+Guinea-Bissau,GNB,1997,28120,1132505,FALSE,0.0379078445084093,0.444556812637155,0.272744350767606,,,,,,,0.251777457878572,0.251736335971057,0.348167135257864,3,2
+Guinea-Bissau,GNB,1998,28120,1154372,FALSE,0.054597471720936,0.167444200055793,,,,,,,,,0.111020835888365,0.167444200055793,2,1
+Guinea-Bissau,GNB,1999,28120,1177133,FALSE,0.261923855246741,0.0272318880803115,,,,,,,,,0.144577871663526,0.0272318880803115,2,1
+Guinea-Bissau,GNB,2000,28120,1201305,FALSE,0.501746570743988,0.0256395612037523,,,,,,,,,0.26369306597387,0.0256395612037523,2,1
+Guinea-Bissau,GNB,2001,28120,1227105,FALSE,0.63948512694399,0.0282799541980722,0.276062891218157,0.0757643215875405,,,,,,0.250622221052543,0.25489807348694,0.118222165612719,4,3
+Guinea-Bissau,GNB,2002,28120,1254454,FALSE,2.13615673444522,0.159617031535873,0.245144764112021,,,,,,,0.220003180183472,0.84697284336437,0.189810105859673,3,2
+Guinea-Bissau,GNB,2003,28120,1283297,FALSE,2.76420288314062,0.154536675323758,0.287157242067645,,1.47813220430274,,,,,0.259084011005493,1.06863226684401,0.206810343164625,4,2
+Guinea-Bissau,GNB,2004,28120,1313492,FALSE,3.6059545203893,0.308133053825546,0.349876942433557,,0.986898034193938,,,,,0.312318166786262,1.42132150554947,0.310225610305904,4,2
+Guinea-Bissau,GNB,2005,28120,1344931,FALSE,3.70322975595428,0.306156595637225,0.398069407486393,0.0437087524308844,1.1168695667801,,,,,0.350053221044165,1.1127911278772,0.233306189704091,5,3
+Guinea-Bissau,GNB,2006,28120,1377582,FALSE,3.91177128649874,0.590734868947226,0.390784406885009,0.10083925578436,1.14372643081445,,,0.000954410336550162,,0.342883211419637,1.24853245452883,0.258852936621943,5,4
+Guinea-Bissau,GNB,2007,28120,1411545,FALSE,4.09435383052539,0.589743851191166,0.607399009288872,0.132802585025112,1.70135946364594,,,0.000928774305540106,,0.534261881550252,1.35607481900764,0.314434273018017,5,4
+Guinea-Bissau,GNB,2008,28120,1446936,FALSE,4.26320444093483,0.220974560242527,0.724227362690825,0.14966832728484,2.15265733136605,,,0.000903340829815699,,0.642440716978784,1.33951867278826,0.253496736333992,5,4
+Guinea-Bissau,GNB,2009,28120,1483920,FALSE,4.06585095099006,0.598223589421354,0.685804195462493,0.129529101295098,2.02462079759806,,4.86117485753585,0.000878058854629047,,0.627278269679967,2.06811653894097,1.24341677535738,6,5
+Guinea-Bissau,GNB,2010,28120,1522603,FALSE,4.21497009023857,0.798200879783502,0.708348081314552,0.176465397515878,1.30826074287868,,0,0.0480881916798158,,0.64644919676086,1.1795968897705,0.333840733148011,6,5
+Guinea-Bissau,GNB,2011,28120,1562996,FALSE,4.47809890348987,0.726281401225789,0.925662781092923,0.283787469034593,1.43592455425595,,2.30761774009486,0.0726670535516484,,0.863253437800517,1.74428965898761,0.85072142034148,6,5
+Guinea-Bissau,GNB,2012,28120,1604981,FALSE,4.72326505741019,0.185106045505709,0.575944727967291,0.266486223423932,1.33568939573923,,0,0.0707632373054863,,0.54266923229421,1.15016041086143,0.213004947705868,6,5
+Guinea-Bissau,GNB,2013,28120,1648259,FALSE,4.92664571040166,0.52264816522999,0.638617353770212,0.260187997367744,1.00759876280594,,0,0.0689023054750515,,0.582046856612094,1.26961984535392,0.286757064936976,6,5
+Guinea-Bissau,GNB,2014,28120,1692433,FALSE,5.13856308719301,0.818909412346297,0.738977429131799,0.257665602734792,0.998622921803416,,0,0.0671009956439091,,0.744142691529256,1.39082310628118,0.377563740450851,6,5
+Guinea-Bissau,GNB,2015,28120,1737207,FALSE,,0.528188825789779,0.834226892067589,0.304831835731649,1.28747756617625,,0,0.549074007672514,,0.816613601020553,0.416811888397254,0.439741654042899,5,5
+Guinea-Bissau,GNB,2016,28120,1782434,FALSE,24.9833434078156,0.356510387151572,0.510126879111632,0.306601778251091,1.16674338375664,,0,0.782177682749178,,0.489617418952822,5.23131649046598,0.386981453420933,6,5
+Guinea-Bissau,GNB,2017,28120,1828146,FALSE,25.7915072244454,0.384463025918784,1.04932226898849,0.32747232411003,0.98734688919162,5.45444647675274,0,1.05245351091561,,0.996369452688386,5.50120188670257,0.552151662726561,7,5
+Guinea-Bissau,GNB,2018,28120,1874304,FALSE,30.7466456544077,0.490680186819943,1.04573157603476,0.355019205798342,0.535337146261396,,0,,,1.08524041510575,6.52761532461214,0.482734951931008,6,4
+Guinea-Bissau,GNB,2019,28120,1920917,FALSE,38.1825144928625,1.64503662011471,0.962052122656962,0.329926540272332,,,,,,0.97327124941932,10.2798824439766,0.982744803268786,4,3
+Guinea-Bissau,GNB,2020,28120,1967998,FALSE,,,,,,,,,,,,,0,0
+Equatorial Guinea,GNQ,1990,28050,419188,TRUE,0,1.15863387044027,0.719539546407143,,,,,,,0.668080089950935,0.626057805615806,0.913356980195605,3,2
+Equatorial Guinea,GNQ,1991,28050,432844,TRUE,0,4.18733926892703,0.810888364942766,,,,,,,0.741323517268647,1.6660758779566,2.46433139309784,3,2
+Equatorial Guinea,GNQ,1992,28050,447269,TRUE,0,0.590154484649521,0.767194737720687,,,,,,,0.687580520281055,0.452449740790069,0.638867502465288,3,2
+Equatorial Guinea,GNQ,1993,28050,462637,TRUE,0,2.11425007571003,0.796713472280906,,,,,,,0.726434686537513,0.970321182663646,1.42034238112377,3,2
+Equatorial Guinea,GNQ,1994,28050,479099,TRUE,0,1.55585371167463,0.598875202161636,,,,,,,0.54932184005955,0.718242971278755,1.05258777586709,3,2
+Equatorial Guinea,GNQ,1995,28050,496768,TRUE,0,11.2059826299469,1.37549178062783,,,,,,,1.2979018477403,4.19382480352491,6.2519422388436,3,2
+Equatorial Guinea,GNQ,1996,28050,515844,TRUE,,31.9843116344129,3.04281375363268,,,,,,,2.83705255010209,17.5135626940228,17.4106820922575,2,2
+Equatorial Guinea,GNQ,1997,28050,536459,TRUE,0.202456565018755,4.37001385034412,,,,,,,,,2.28623520768144,4.37001385034412,2,1
+Equatorial Guinea,GNQ,1998,28050,558496,TRUE,0.442870121787022,21.5777170076716,,,,,,,,,11.0102935647293,21.5777170076716,2,1
+Equatorial Guinea,GNQ,1999,28050,581765,TRUE,0.438629212407131,11.6323320342115,,,,,,,,,6.03548062330931,11.6323320342115,2,1
+Equatorial Guinea,GNQ,2000,28050,606180,TRUE,0.571942993020445,11.1785365327998,,,,,,,,,5.87523976291011,11.1785365327998,2,1
+Equatorial Guinea,GNQ,2001,28050,631662,TRUE,0.685329147353995,65.319769509807,,,,,,,,,33.0025493285805,65.319769509807,2,1
+Equatorial Guinea,GNQ,2002,28050,658388,TRUE,1.27792691066119,21.5429873799667,,,,,,,,,11.4104571453139,21.5429873799667,2,1
+Equatorial Guinea,GNQ,2003,28050,686670,TRUE,1.98567425718266,44.0576775111525,,,5.84133826158303,,,,,,23.0216758841676,44.0576775111525,3,1
+Equatorial Guinea,GNQ,2004,28050,716949,TRUE,3.08342509562285,20.8552976636462,,,7.57066172832214,,,,,,11.9693613796345,20.8552976636462,3,1
+Equatorial Guinea,GNQ,2005,28050,749527,TRUE,4.01833569216692,45.0070793752639,,,7.12378103546491,,,,,,24.5127075337154,45.0070793752639,3,1
+Equatorial Guinea,GNQ,2006,28050,784494,TRUE,4.27131640944494,26.2488787522763,,,5.63759062527972,,,,,,15.2600975808606,26.2488787522763,3,1
+Equatorial Guinea,GNQ,2007,28050,821686,TRUE,4.96400422653307,66.3331311475889,,,4.38298370645788,,,,,,35.648567687061,66.3331311475889,3,1
+Equatorial Guinea,GNQ,2008,28050,860839,TRUE,5.53814787374362,40.4471527604966,,,5.67273308991181,,,0.0271696112985029,,,22.9926503171201,20.2371611858975,3,2
+Equatorial Guinea,GNQ,2009,28050,901589,TRUE,6.18850994264978,79.5961782611575,,,5.40808338083559,,0,0.046286295694839,,,28.5948960679358,26.5474881856174,4,3
+Equatorial Guinea,GNQ,2010,28050,943640,TRUE,16.6555892665073,100,,,3.48117217168616,,3.82221747413982,0.132878245663103,,,40.1592689135491,34.6516985732676,4,3
+Equatorial Guinea,GNQ,2011,28050,986861,TRUE,30.5250896424184,87.7748986314121,,,4.90334211349318,,14.6192718013876,0.152338025295124,,,44.3064200250727,34.1821694860316,4,3
+Equatorial Guinea,GNQ,2012,28050,1031191,FALSE,35.4191294112198,41.905340968761,,,7.78734013113743,,0,0.151477852645893,,,25.7748234599936,14.0189396071356,4,3
+Equatorial Guinea,GNQ,2013,28050,1076412,FALSE,39.9098790223648,23.7525932521949,,,5.89341042457653,,0,0.145109471385879,,,21.2208240915199,7.96590090786027,4,3
+Equatorial Guinea,GNQ,2014,28050,1122273,FALSE,44.0208341490484,6.56065508829351,,,4.87713424534731,,0,0.143752603398001,,,16.8604964124473,2.23480256389717,4,3
+Equatorial Guinea,GNQ,2015,28050,1168575,FALSE,,8.75717527200664,,,6.80234501902901,,0,0.227858561346305,,,4.37858763600332,2.99501127778432,3,3
+Equatorial Guinea,GNQ,2016,28050,1215181,FALSE,,1.94895793172389,,,6.20451245847568,,0,0.295814209170767,,,0.974478965861944,0.748257380298218,3,3
+Equatorial Guinea,GNQ,2017,28050,1262008,FALSE,,10.5937788445772,,,5.18565069404329,,0,0.284833856936788,,,5.29688942228859,3.62620423383799,3,3
+Equatorial Guinea,GNQ,2018,28050,1308966,FALSE,,13.2712348470439,,,4.31979086819741,,2.7554552962394,,,,8.01334507164163,8.01334507164163,3,2
+Equatorial Guinea,GNQ,2019,28050,1355982,FALSE,,14.6291641600275,,,,,,,,,14.6291641600275,14.6291641600275,1,1
+Equatorial Guinea,GNQ,2020,28050,1402985,FALSE,,,,,,,,,,,,,0,0
+Greece,GRC,1990,128900,10196792,FALSE,0,4.36881525978176,7.69359249979928,,,,,,,7.20952226414835,4.02080258652701,5.78916876196505,3,2
+Greece,GRC,1991,128900,10319927,FALSE,0.012383934087867,4.93307732147995,7.99463768470219,,,,,,,7.52217015198804,4.31336631342334,6.227623736734,3,2
+Greece,GRC,1992,128900,10399061,FALSE,0.0121644528927132,5.02104099603182,8.36434964489108,,,,,,8.18924044805049,7.95473993982048,5.39669888546653,7.0550071279676,3,3
+Greece,GRC,1993,128900,10460415,FALSE,0.0478454946394133,4.19047794056899,7.47005422947691,,,,,,9.03686218035248,7.19497168146735,5.18630996125945,6.80743726746294,3,3
+Greece,GRC,1994,128900,10512922,FALSE,0.0942288036473913,4.15850961889975,8.00290247666465,,,,,,9.64420406205928,7.68889137552428,5.47496124031777,7.1638683521611,3,3
+Greece,GRC,1995,128900,10562153,FALSE,0.185909577439988,4.5452756748908,9.17915119921931,12.3188514528269,,,,,8.87854502486594,8.888627483553,7.02154658584859,8.65782490903416,4,4
+Greece,GRC,1996,128900,10608800,FALSE,0.344536584041711,4.47887523077531,9.28391256330889,11.1997514886247,,,,,9.54909910420398,9.01351778320602,6.97123499419092,8.5603109017025,4,4
+Greece,GRC,1997,128900,10661259,FALSE,0.454456753303667,4.68842720938656,9.14566958503766,12.0630314683176,,,,,10.2427432098111,8.79959828536303,7.31886564517131,8.94845004321956,4,4
+Greece,GRC,1998,128900,10720509,FALSE,0.787229213571736,1.41880563933503,,12.8756790715383,,,,,9.45950910353766,,6.13530575699568,7.917997938137,3,3
+Greece,GRC,1999,128900,10761698,FALSE,1.67398578906064,0.572519436609529,13.606034231038,14.2283810004941,,,,,9.14183677038109,13.0476990353849,7.84455144551667,9.2476090607174,4,4
+Greece,GRC,2000,128900,10805808,FALSE,2.21538287008627,4.12648029912569,15.8823995179397,15.2506563550765,,,,,10.7087443506398,15.1688380175576,9.6367326785736,11.3136797555999,4,4
+Greece,GRC,2001,128900,10862132,FALSE,2.63705890099034,3.93445859636514,15.8495534901483,16.4140857181942,,,,,10.1821914592618,14.9460943431129,9.80346963299195,11.3692075292335,4,4
+Greece,GRC,2002,128900,10902022,FALSE,3.5248298182271,2.75098094478763,15.7561608233821,16.6214504124305,,,,,8.9750470572063,14.7603748833179,9.52569381120671,10.7769633244356,4,4
+Greece,GRC,2003,128900,10928070,FALSE,4.26669528634297,7.46336099876994,19.0762366154451,16.4339816256837,11.5427711790288,27.3641017879995,53.467919052693,100,7.31479164803448,18.6947985672365,19.3410124307098,33.8958086487363,7,6
+Greece,GRC,2004,128900,10955141,FALSE,5.121728922699,12.8883385564226,24.3141219902539,15.8200763568091,13.3561149782026,15.5982509281102,48.7265293983893,100,9.21403209978908,23.6811732764842,18.8118683217819,35.0550249479824,7,6
+Greece,GRC,2005,128900,10987314,FALSE,5.72182801199528,8.76559996168842,25.969351798131,17.6201583870332,12.9259221608051,32.0466007614173,44.6446176410752,100,9.47870724927901,25.6526591188776,20.6066948300885,34.3602903929922,7,6
+Greece,GRC,2006,128900,11020362,FALSE,7.6656494018098,38.3906805193408,30.0441935630142,19.0510364857557,13.3971651618967,,44.5107368008812,1.65193757640592,9.18039110276705,29.7756371822177,24.8071146455948,23.7600699445614,6,6
+Greece,GRC,2007,128900,11048473,FALSE,8.50678133779871,28.6519879738288,36.818222603746,,15.456721466878,33.1230408147203,37.8684444887983,3.37296338068354,,37.052080104915,28.9936954437784,26.7363689870564,6,4
+Greece,GRC,2008,128900,11077841,FALSE,9.03281944797237,35.4008948217317,43.3644228831197,4.12724545527689,15.3805576018165,34.6181380420851,54.0473862507461,4.13196627560734,,44.2481346541321,30.0984844834886,28.3911254914988,7,5
+Greece,GRC,2009,128900,11107017,FALSE,9.99962040259402,20.5646741412202,31.161829018079,4.19296051265692,15.995587412147,29.4179678493678,35.7204551593558,6.79042886338537,6.63286692384732,32.7176622599613,19.6700534295887,17.7698413100712,7,6
+Greece,GRC,2010,128900,11121341,FALSE,10.4578138454983,8.79278386866922,30.4352862462068,4.14823503132712,16.3937459678031,31.9653547764026,29.8368111679474,10.3165011853403,8.0163060488324,31.2912185608257,17.6646558549834,15.4003093104904,7,6
+Greece,GRC,2011,128900,11104899,FALSE,12.1834634918232,11.4960852500383,33.2315617298549,5.40364483382193,17.0334116243038,32.6327329677783,23.3851208737158,19.8258193212841,6.80977813732791,33.8774075463608,17.8774838977658,16.7996426604248,7,6
+Greece,GRC,2012,128900,11045011,FALSE,13.0606251782627,9.29354640619333,28.9729582892321,5.14698877561968,16.0143817935891,36.2112573221032,20.8994836697788,26.5777957073899,6.05278624182617,28.4298373727067,17.0910922690023,16.0667396955858,7,6
+Greece,GRC,2013,128900,10965211,FALSE,14.3014647025741,14.5705186093619,33.6240671047998,27.3694281844968,15.6885576220201,33.9066203208419,27.6302000000705,32.1254838886727,7.27624589307195,32.8578195585826,22.668363545031,23.6382826890427,7,6
+Greece,GRC,2014,128900,10892413,FALSE,15.2011618996758,23.0062384910584,35.2718049194172,33.5391164495909,19.079819953785,33.9386014099125,26.1592161889644,37.0564851055062,8.97046488364991,34.9011032222756,25.155229177467,27.2721040568409,7,6
+Greece,GRC,2015,128900,10820883,FALSE,16.1791641708288,11.5578273074415,28.2423631416886,36.3777065003763,21.9935322299562,30.242302577517,27.3320928041065,37.4935796916165,11.8534490848286,27.9674168349018,23.112129369541,25.4303453705452,7,6
+Greece,GRC,2016,128900,10775971,FALSE,16.7942560124502,18.1602362577069,27.4293257991977,39.7996804161601,24.6507899675189,25.4990763941265,19.747736936239,35.9436443118484,14.039548150821,26.887653821789,23.0671228523859,25.7630833157607,7,6
+Greece,GRC,2017,128900,10754679,FALSE,17.0235896147082,14.6600844758946,31.8802819465745,42.7475381041104,25.9150731879315,26.9002610910447,14.7562824591121,45.4824880612993,14.1853419981892,30.874461776964,23.1647685270905,27.1176994792616,7,6
+Greece,GRC,2018,128900,10732882,FALSE,17.6305839757811,18.5728183220703,37.7628336581742,46.4415456476446,30.0495214524067,,22.5154267902059,,,36.2960480669185,28.5846416787752,30.9564597067098,6,4
+Greece,GRC,2019,128900,10721582,FALSE,18.4878701409908,23.0161091074014,37.0591638638806,47.4195853413778,,,,,,35.5386579371275,31.4956821134127,35.3247841286356,4,3
+Greece,GRC,2020,128900,10715549,FALSE,19.0958854562914,3.28424924756118,29.4935710698673,,,,,,,28.7194684613509,17.2912352579066,16.001858854456,3,2
+Grenada,GRD,1990,340,96328,TRUE,0,5.86168779276506,5.7868764600399,,,,,,,5.4252610382566,3.88285475093499,5.64347441551083,3,2
+Grenada,GRD,1991,340,96462,TRUE,0,6.94476977768285,6.1722400271432,,,,,,,5.66937932366924,4.37233660160868,6.30707455067604,3,2
+Grenada,GRD,1992,340,97161,TRUE,0,10.1934143427235,5.89383191687404,,,,,,,5.41242925186502,5.36241541986585,7.80292179729427,3,2
+Grenada,GRD,1993,340,98234,TRUE,0,9.04029711752688,6.60622394698978,,,,,,,6.06972709099162,5.21550702150555,7.55501210425925,3,2
+Grenada,GRD,1994,340,99345,TRUE,0,8.52551202931408,6.99315967623224,,,,,,,6.45231130643446,5.17289056851544,7.48891166787427,3,2
+Grenada,GRD,1995,340,100286,TRUE,0,8.73707555774186,7.03066634849765,44.6966810657206,,,,,,6.63469932962842,15.11610574299,20.0228186510303,4,3
+Grenada,GRD,1996,340,101003,TRUE,7.72938871496851,7.36591432863006,7.76475922818438,46.4240233349003,,,,,,7.30528984292647,17.3210214016708,20.3650758354856,4,3
+Grenada,GRD,1997,340,101567,TRUE,25.5555497034964,14.466098075974,8.33696407003265,44.0133265342505,,,,,,7.83663369228211,23.0929845959384,22.1053527675022,4,3
+Grenada,GRD,1998,340,102023,TRUE,38.1242140200273,20.9294569198426,9.89675468932122,46.6742979943769,,,,,,9.30724083749054,28.906180905892,25.6369985839033,4,3
+Grenada,GRD,1999,340,102429,TRUE,63.2478044698021,17.7920780075578,11.4027718243565,44.9475035312507,,,,,,10.6947993012898,34.3475394582418,24.4781269466995,4,3
+Grenada,GRD,2000,340,102837,TRUE,100,15.9539208757584,12.8058220705124,37.3270884044548,,,,,,12.1050341601653,41.5217078376814,21.7953478134595,4,3
+Grenada,GRD,2001,340,103242,TRUE,100,24.9572652753896,11.1493785648255,32.5917240708275,,,,,,10.7535551054656,42.1745919777606,22.7675148172276,4,3
+Grenada,GRD,2002,340,103636,TRUE,100,23.0598529053024,10.3454745241509,31.7645069880873,,,,,,10.1863884655508,41.2924586043852,21.6702494529801,4,3
+Grenada,GRD,2003,340,104003,TRUE,100,37.6024279464247,11.3852850393751,34.3389035327324,100,,,,,11.1371386575308,45.8316541296331,27.6928233788959,5,3
+Grenada,GRD,2004,340,104346,TRUE,100,27.3270361341816,11.9474049633214,43.0739407041749,100,,,,,12.0034184833566,45.5870954504195,27.4681317739044,5,3
+Grenada,GRD,2005,340,104658,TRUE,100,29.400763187027,12.5630430188122,44.1062561819718,100,100,,100,,12.0232401264461,57.2140124775622,46.3825648738612,6,4
+Grenada,GRD,2006,340,104938,TRUE,100,37.526720941754,12.9830000036754,39.5895641906825,100,83.6773383218348,,3.0070909876852,,12.4739847789275,54.7553246915893,23.1493402247623,6,4
+Grenada,GRD,2007,340,105183,TRUE,100,65.2799852965725,14.8213204503808,46.8889340162605,100,100,,,,14.3434025253234,65.3980479526428,42.1707739460521,6,3
+Grenada,GRD,2008,340,105457,TRUE,100,56.0762116064508,15.0948286027001,49.3013594172411,100,100,100,17.8707937663303,,14.3877449221252,70.0787332710653,47.5272219424295,7,5
+Grenada,GRD,2009,340,105787,TRUE,100,42.5196354596171,12.501428386914,52.8222530963788,95.3454159130511,98.645132970656,68.1898020985054,30.5381759215818,,12.5219432804307,62.4463753353452,41.3183619713028,7,5
+Grenada,GRD,2010,340,106227,TRUE,100,24.9465915770339,12.7937749914452,50.8880760501473,100,100,33.9536774765107,35.2270001484844,,12.2704588456794,53.7636866825228,31.4571608195711,7,5
+Grenada,GRD,2011,340,106786,TRUE,100,17.5164238010053,13.3689058927292,50.849200845076,99.9853306832175,,67.5518756634259,41.7363765039994,,12.5528021053025,49.8572812404473,38.0413357837618,6,5
+Grenada,GRD,2012,340,107452,TRUE,100,12.8533250378887,13.5222069951635,41.8288063774971,87.8000660258806,,0,50.2130925099274,,12.779598587614,33.6408676821099,23.5349645025854,6,5
+Grenada,GRD,2013,340,108172,TRUE,100,30.2829093783336,14.1208371743289,36.7213843960551,78.9447992677336,,66.686338374021,62.7828176182318,,13.1289490036099,49.5622938645477,41.9204797540503,6,5
+Grenada,GRD,2014,340,108900,TRUE,100,44.6282058783066,21.5480297558702,43.1689817454154,80.757907774818,85.7142766212046,33.1202690293599,78.2066320107684,,20.9769390064525,54.6966271716928,44.0202055340606,7,5
+Grenada,GRD,2015,340,109603,TRUE,100,68.9831026163409,22.4330718327581,48.4338847604463,83.1248652278696,,32.90783370252,3.74955438785169,,22.3833828476459,54.5515785824131,35.2915516629609,6,5
+Grenada,GRD,2016,340,110263,TRUE,100,51.778812727019,23.0970193274093,52.220351506499,75.980479310723,,0,3.79366757741909,,22.5471940655604,45.4192367121854,26.0680051752995,6,5
+Grenada,GRD,2017,340,110874,TRUE,100,55.1121062803265,26.0163920330972,51.2751769801712,70.3885694171936,,0,3.83895171138342,,25.6915420849416,46.480735058719,27.1835554113645,6,5
+Grenada,GRD,2018,340,111449,TRUE,,61.3564571218771,28.3200560456091,57.6596351125105,77.8551163102197,,64.7255210418631,,,27.5841634434732,53.0154173304649,52.831444179931,5,4
+Grenada,GRD,2019,340,112002,TRUE,,55.1271634056623,28.9488431172616,57.0495526074548,,,,,,28.2593506391346,47.0418530434595,46.8120222174172,3,3
+Grenada,GRD,2020,340,112519,TRUE,,,20.87460913242,,,,,,,20.4335176081828,20.87460913242,20.4335176081828,1,1
+Greenland,GRL,1990,341700,55600,TRUE,0,,,,,,,,,,0,,1,0
+Greenland,GRL,1991,341700,55500,TRUE,0,,,,,,,,,,0,,1,0
+Greenland,GRL,1992,341700,55300,TRUE,0,,,,,,,,,,0,,1,0
+Greenland,GRL,1993,341700,55200,TRUE,0,,,,,,,,,,0,,1,0
+Greenland,GRL,1994,341700,55500,TRUE,3.05427224274173,,,,,,,,,,3.05427224274173,,1,0
+Greenland,GRL,1995,341700,55800,TRUE,2.53218009603303,,,,,,,,,,2.53218009603303,,1,0
+Greenland,GRL,1996,341700,55900,TRUE,84.1944555086779,,,,,,,,,,84.1944555086779,,1,0
+Greenland,GRL,1997,410450,56000,TRUE,100,,,,,,,,,,100,,1,0
+Greenland,GRL,1998,410450,56100,TRUE,100,,,,,,,,,,100,,1,0
+Greenland,GRL,1999,410450,56100,TRUE,100,,,,,,,,,,100,,1,0
+Greenland,GRL,2000,410450,56200,TRUE,100,,,,,,,,,,100,,1,0
+Greenland,GRL,2001,410450,56350,TRUE,100,,,,,,,,,,100,,1,0
+Greenland,GRL,2002,410450,56609,TRUE,100,,,,,,,,,,100,,1,0
+Greenland,GRL,2003,410450,56765,TRUE,100,,,,30.0949143713385,,,,,,100,,2,0
+Greenland,GRL,2004,410450,56911,TRUE,100,,,,24.849290971908,,,,,,100,,2,0
+Greenland,GRL,2005,410450,56935,TRUE,100,,,,24.6666074769779,,100,,,,100,100,3,1
+Greenland,GRL,2006,410450,56774,TRUE,100,,,,28.57905215645,,,0.775472678088923,,,100,0.775472678088923,2,1
+Greenland,GRL,2007,410450,56555,TRUE,100,,,,33.283897184945,,,1.29753403593134,,,100,1.29753403593134,2,1
+Greenland,GRL,2008,410450,56328,TRUE,100,,,,35.4197693917429,,,1.3027635032606,,,100,1.3027635032606,2,1
+Greenland,GRL,2009,410450,56323,TRUE,100,,,,33.3774859871883,,64.0377340925963,1.95437427402448,,,82.0188670462981,32.9960541833104,3,2
+Greenland,GRL,2010,410450,56905,TRUE,100,,,,35.1898253777094,28.9072567887495,100,5.80337601292167,,,76.3024189295832,52.9016880064608,4,2
+Greenland,GRL,2011,410450,56890,TRUE,100,,,,39.0337582808386,26.6979792637581,100,7.73991195092215,,,75.5659930879194,53.8699559754611,4,2
+Greenland,GRL,2012,410450,56810,TRUE,100,,,,41.4186491207325,24.3587450407392,0,9.04263189421354,,,41.4529150135797,4.52131594710677,4,2
+Greenland,GRL,2013,410450,56483,TRUE,100,,,,43.7414790695538,,63.8563337162916,,,,81.9281668581458,63.8563337162916,3,1
+Greenland,GRL,2014,410450,56295,TRUE,100,,,,49.1996126421251,,0,,,,50,0,3,1
+Greenland,GRL,2015,410450,56114,TRUE,100,,,,44.6843603360027,,0,,,,50,0,3,1
+Greenland,GRL,2016,410450,56186,TRUE,100,,,,42.5330552137885,,0,,,,50,0,3,1
+Greenland,GRL,2017,410450,56172,TRUE,100,,,,47.8237010216152,,64.2098785390817,,,,82.1049392695409,64.2098785390817,3,1
+Greenland,GRL,2018,410450,56023,TRUE,,,,,49.4822473439828,,0,,,,0,0,2,1
+Greenland,GRL,2019,410450,56225,TRUE,,,,,,,,,,,,,0,0
+Greenland,GRL,2020,410450,56367,TRUE,,,,,,,,,,,,,0,0
+Guatemala,GTM,1990,107160,9050115,FALSE,0,0.23116575831282,0.865356902598859,,,,,,,0.799580224036433,0.365507553637226,0.515372991174626,3,2
+Guatemala,GTM,1991,107160,9296814,FALSE,0,0.427890227493466,0.929614402759107,,,,,,,0.852802371651035,0.452501543417524,0.64034629957225,3,2
+Guatemala,GTM,1992,107160,9544055,FALSE,0,0.432430096878637,1.16633970679129,,,,,,,1.06953147830127,0.532923267889977,0.750980787589954,3,2
+Guatemala,GTM,1993,107160,9790619,FALSE,0,0.653976833408427,1.1960382381503,,,,,,,1.08562344391809,0.616671690519577,0.869800138663258,3,2
+Guatemala,GTM,1994,107160,10037522,FALSE,0,0.308662168756876,1.27305086260508,,,,,,,1.15528691851588,0.527237677120652,0.731974543636377,3,2
+Guatemala,GTM,1995,107160,10286786,FALSE,0.000763427397540743,0.401865895297444,1.50282502967683,1.05665874516601,,,,,,1.35417545911911,0.740528274384456,0.937566699860854,4,3
+Guatemala,GTM,1996,107160,10536942,FALSE,0.00485636199940811,0.354206764065875,1.41700662981583,0.981963892351666,,,,,,1.28945392615994,0.689508412058194,0.875208194192492,4,3
+Guatemala,GTM,1997,107160,10788362,FALSE,0.0231821597712353,4.79067209751996,1.6182164429976,1.01985093003078,,,,,,1.47857657403435,1.86298040757989,2.42969986719503,4,3
+Guatemala,GTM,1998,107160,11046215,FALSE,0.110646439175226,8.01962569888149,1.83133132789052,1.12797926209433,,,,,,1.66018225461937,2.77239568201039,3.60259573853173,4,3
+Guatemala,GTM,1999,107160,11311078,FALSE,0.137249744153519,6.57086323239647,1.77946925748882,1.40332275857268,,,,,,1.6113219277004,2.47272624815287,3.19516930622318,4,3
+Guatemala,GTM,2000,107160,11589761,FALSE,0.160999163685654,6.83859569682091,1.9302210673146,1.37583302526124,,,,,,1.79319399521557,2.5764122382706,3.33587423909924,4,3
+Guatemala,GTM,2001,107160,11871565,FALSE,0.383537038117251,8.6026184203842,1.99422880811081,1.44649086486729,,,,,,1.86092212353287,3.10671878286989,3.97001046959478,4,3
+Guatemala,GTM,2002,107160,12147518,FALSE,0.731393167208436,7.74319324716834,2.1174119182493,1.51160173904419,,,,,,1.95213720663921,3.02590001791757,3.73564406428391,4,3
+Guatemala,GTM,2003,107160,12415334,FALSE,0.959751437059449,0.462809554006138,2.18768549177735,1.50342464540788,2.57292556968467,14.0691431970469,4.64818399221131,100,,2.0173192299201,3.97183305291816,21.7263474843091,7,5
+Guatemala,GTM,2004,107160,12682108,FALSE,1.05340123401645,1.34183619126474,3.06933604677333,1.94879394762618,2.30421980628044,18.9857298235881,4.55040729480909,100,,2.81600279205127,5.15825075634632,22.1314080451503,7,5
+Guatemala,GTM,2005,107160,12948292,FALSE,1.15312785985014,2.06554260907658,3.3007532168767,2.15450762909616,2.31586937727827,21.8144136739416,1.39276952407982,100,,3.05470002997236,5.31351908548683,21.733503958445,7,5
+Guatemala,GTM,2006,107160,13213330,FALSE,1.28859419061919,2.38591523239897,3.68185310725451,2.34937977546707,2.19108965073551,24.4259950419035,2.72966564620523,0.100918246636647,,3.45888218914222,6.14356716564141,2.20495221797003,7,5
+Guatemala,GTM,2007,107160,13477017,FALSE,1.4188751346677,3.25012823549277,4.13189811669809,2.51881476519277,2.41680995236227,27.5843538254584,2.67625788206492,0.135480457335799,,3.91181735527868,6.93005465992911,2.49849973907299,7,5
+Guatemala,GTM,2008,107160,13739299,FALSE,1.58244495249491,2.36927370900717,4.18225356420874,2.64400158482178,2.63360136176478,26.1152278652876,1.3125841781656,0.160133622637084,,3.92587543029721,6.3676309756643,2.08237370498577,7,5
+Guatemala,GTM,2009,107160,14000190,FALSE,1.7400595560448,1.59245454457501,3.53474197207529,1.70097339953632,2.27371630770276,30.799876743599,1.03049952816277,0.261986523809908,,3.31452527473694,6.7331009573322,1.58008785416419,7,5
+Guatemala,GTM,2010,107160,14259687,FALSE,1.92883198958239,4.9117734773895,4.02544690857099,1.76881420863128,2.03101156660162,7.06728240823329,1.01174655440819,0.308682474841472,,3.77481600125954,3.45231592446927,2.355166543306,7,5
+Guatemala,GTM,2011,107160,14521515,FALSE,2.21874952604231,3.44183024067359,4.71993340904604,1.79880029614258,2.0979930949923,6.27162785967745,1.49025661467029,,,4.42975708216362,3.32353299104204,2.79016105841252,7,4
+Guatemala,GTM,2012,107160,14781942,FALSE,2.83532980180763,4.66840081599989,4.75067874375099,1.81639222978934,2.21106120402121,35.6266054508029,0.732000700036023,1.91960023659344,,4.4286222072036,8.40490129036447,2.71300323792446,7,5
+Guatemala,GTM,2013,107160,15043981,FALSE,3.43019290164735,4.65129334182176,4.79281537568039,1.90585309304997,2.09414011103168,38.5770251790855,0.959000758455437,2.77317474322033,,4.54438388425836,9.05269677495674,2.96674116416117,7,5
+Guatemala,GTM,2014,107160,15306316,FALSE,4.00461044945388,4.09001143481174,4.99717348318753,2.16602307032938,2.27247977689453,41.9528956596499,1.41384666197822,4.88802730148547,,4.70296048819068,9.77076012656843,3.4521737913591,7,5
+Guatemala,GTM,2015,107160,15567419,FALSE,4.8470840942861,3.8277187008635,4.78239798257342,2.33568040182231,2.207246452861,24.0056069575435,1.62182190131075,5.12439310717646,,4.52489773740042,6.90338500639992,3.48690236971469,7,5
+Guatemala,GTM,2016,107160,15827690,FALSE,5.71128768477588,2.67411153962381,4.64423438109707,2.37860489698846,2.33909884485352,35.2966914240093,0.455757889786482,5.70303522243686,,4.43153391908094,8.5267813027135,3.12860869358331,7,5
+Guatemala,GTM,2017,107160,16087418,FALSE,6.62759087486818,2.89715802127917,4.9255892456998,2.60220661116463,2.30571834615942,29.9196972818355,0,5.8390514016929,,4.70078289879345,7.82870700580788,3.20783978658603,7,5
+Guatemala,GTM,2018,107160,16346950,FALSE,,2.86259441632894,5.07174467667061,2.92946367845077,2.36774198819142,,0.661921146873998,,,4.8569790993286,2.88143097958108,2.82773958524558,5,4
+Guatemala,GTM,2019,107160,16604026,FALSE,7.00478690681618,4.06579074901334,5.07937076653107,3.11747414737379,,,,,,4.87116993269591,4.8168556424336,4.01814494302768,4,3
+Guatemala,GTM,2020,107160,16858333,FALSE,,0.26670289633351,4.5624716507419,,,,,,,4.41217060086236,2.41458727353771,2.33943674859794,2,2
+Guam,GUM,1990,540,130480,TRUE,0,,,,,,,,,,0,,1,0
+Guam,GUM,1991,540,133553,TRUE,0,,,,,,,,,,0,,1,0
+Guam,GUM,1992,540,136693,TRUE,0,,,,,,,,,,0,,1,0
+Guam,GUM,1993,540,139813,TRUE,0,,,,,,,,,,0,,1,0
+Guam,GUM,1994,540,142806,TRUE,6.39166465696154,,,,,,,,,,6.39166465696154,,1,0
+Guam,GUM,1995,540,145559,TRUE,11.8689195005909,,,100,,,,,,,55.9344597502955,100,2,1
+Guam,GUM,1996,540,148061,TRUE,23.9921041240692,,,100,,,,,,,61.9960520620346,100,2,1
+Guam,GUM,1997,540,150303,TRUE,40.8611846583403,,,100,,,,,,,70.4305923291701,100,2,1
+Guam,GUM,1998,540,152274,TRUE,77.4329439146611,,,90.7049712536003,,,,,,,84.0689575841307,90.7049712536003,2,1
+Guam,GUM,1999,540,153955,TRUE,100,,,91.6872160060785,,,,,,,95.8436080030393,91.6872160060785,2,1
+Guam,GUM,2000,540,155323,TRUE,100,,,100,,,,,,,100,100,2,1
+Guam,GUM,2001,540,156395,TRUE,100,,,90.0237086568596,,,,,,,95.0118543284298,90.0237086568596,2,1
+Guam,GUM,2002,540,157173,TRUE,100,,,81.8490505545515,,,,,,,90.9245252772757,81.8490505545515,2,1
+Guam,GUM,2003,540,157723,TRUE,100,,,70.0875207815362,100,,,,,,85.0437603907681,70.0875207815362,3,1
+Guam,GUM,2004,540,158094,TRUE,100,,,89.1330689710594,100,,,,,,94.5665344855297,89.1330689710594,3,1
+Guam,GUM,2005,540,158406,TRUE,100,,,94.17234326105,100,,,,,,97.086171630525,94.17234326105,3,1
+Guam,GUM,2006,540,158649,TRUE,100,,,92.8029580996804,100,,,,,,96.4014790498402,92.8029580996804,3,1
+Guam,GUM,2007,540,158848,TRUE,100,,,93.6808753362229,100,,,,,,96.8404376681115,93.6808753362229,3,1
+Guam,GUM,2008,540,159037,TRUE,100,,,87.2296306037732,100,,,,,,93.6148153018866,87.2296306037732,3,1
+Guam,GUM,2009,540,159232,TRUE,100,,,80.3329109275793,100,,0,,,,60.1109703091931,40.1664554637897,4,2
+Guam,GUM,2010,540,159439,TRUE,100,,,91.2002455935223,100,,0,,,,63.7334151978408,45.6001227967612,4,2
+Guam,GUM,2011,540,159690,TRUE,100,,,88.242226103693,100,,45.1724879115448,,,,77.8049046717459,66.7073570076189,4,2
+Guam,GUM,2012,540,159990,TRUE,100,,,99.3143238589153,100,,90.1755684054578,,,,96.496630754791,94.7449461321866,4,2
+Guam,GUM,2013,540,160415,TRUE,100,,,100,100,,44.9683296112869,,,,81.656109870429,72.4841648056435,4,2
+Guam,GUM,2014,540,161007,TRUE,100,,,100,100,,22.4014937070891,,,,74.1338312356964,61.2007468535446,4,2
+Guam,GUM,2015,540,161851,TRUE,100,,,100,100,,0,,,,66.6666666666667,50,4,2
+Guam,GUM,2016,540,162948,TRUE,100,,,100,100,,66.403956427154,,,,88.8013188090513,83.201978213577,4,2
+Guam,GUM,2017,540,164281,TRUE,100,,,100,100,,0,,,,66.6666666666667,50,4,2
+Guam,GUM,2018,540,165770,TRUE,,,,100,100,,21.7578409681927,,,,60.8789204840963,60.8789204840963,3,2
+Guam,GUM,2019,540,167295,TRUE,,,,100,,,,,,,100,100,1,1
+Guam,GUM,2020,540,168783,TRUE,,,,,,,,,,,,,0,0
+Guyana,GUY,1990,196850,743306,TRUE,0,0.466142472888926,,,,,,,,,0.233071236444463,0.466142472888926,2,1
+Guyana,GUY,1991,196850,744477,TRUE,0,0.747864329352687,,,,,,,,,0.373932164676344,0.747864329352687,2,1
+Guyana,GUY,1992,196850,748596,TRUE,0,8.70682378377918,3.42068691892511,,,,,,,3.28304767194449,4.04250356756809,5.99493572786183,3,2
+Guyana,GUY,1993,196850,754141,TRUE,0,4.16059656574482,3.69253742389402,,,,,,,3.53409229254557,2.61771132987961,3.8473444291452,3,2
+Guyana,GUY,1994,196850,758896,TRUE,0,6.16595959245768,3.94419808091358,,,,,,,3.78514222385282,3.37005255779042,4.97555090815525,3,2
+Guyana,GUY,1995,196850,761298,TRUE,0,4.28740193642885,4.21298450440161,1.68997863050475,,,,,,4.0708660197838,2.5475912678338,3.3494155289058,4,3
+Guyana,GUY,1996,196850,760801,TRUE,0.22673937069471,3.45891108822708,4.46541240484384,1.46754097201192,,,,,,4.19093590338471,2.40465095894439,3.0391293212079,4,3
+Guyana,GUY,1997,196850,757975,TRUE,0.455583497470698,3.00889951892391,4.73248154869353,1.21658813557985,,,,,,4.44100210716256,2.353388175167,2.88882992055544,4,3
+Guyana,GUY,1998,196850,753778,TRUE,0.917741740441109,2.56016786225977,4.49998897970944,1.06220915870203,,,,,,4.16155132155005,2.26002693527809,2.59464278083728,4,3
+Guyana,GUY,1999,196850,749676,TRUE,13.8590365305857,2.80819235492052,4.37118333095314,1.2138677149837,,,,,,4.04975775371755,5.56306998286076,2.69060594120726,4,3
+Guyana,GUY,2000,196850,746718,TRUE,23.1930530786543,4.05864110960779,4.54872837780194,1.70673611783744,,,,,,4.20077640512316,8.37678967097537,3.32205121085613,4,3
+Guyana,GUY,2001,196850,745206,TRUE,46.4239922374495,3.30794158815949,4.47783343500253,1.61239311017443,,,,,,4.13233863415523,13.9555400926965,3.01755777749638,4,3
+Guyana,GUY,2002,196850,744789,TRUE,,2.57562943692703,4.41960849978249,1.69484971471025,,,,,,4.05729427094232,2.89669588380659,2.7759244741932,3,3
+Guyana,GUY,2003,196850,745142,TRUE,,1.53624572424168,4.38534839575535,1.64513748024996,10.6328739620217,,24.2020802564967,,,4.01013548783217,7.94220296418593,7.84839973720514,5,4
+Guyana,GUY,2004,196850,745737,TRUE,,1.77426268554908,4.97256006513798,1.98591101101653,10.7821597783314,,,,,4.47533884314452,2.9109112539012,2.74517084657005,4,3
+Guyana,GUY,2005,196850,746156,TRUE,,4.51430405838435,5.18768617259804,1.90339139885925,9.81358317591353,,,,,4.6584241780999,3.86846054328055,3.69203987844783,4,3
+Guyana,GUY,2006,196850,746335,TRUE,,6.01762847155381,5.7406786812559,1.83782726790937,11.4632146731374,,,0.0352883223068018,,5.22508333332566,4.53204480690636,3.27895684877391,4,4
+Guyana,GUY,2007,196850,746477,TRUE,48.4259054030172,8.95421996615969,6.77929286428237,2.17922556172325,9.72727118594899,29.5933398839678,,0.0352815883931937,,6.06644983829239,19.1863967358301,4.30879423864213,6,4
+Guyana,GUY,2008,196850,746815,TRUE,63.8371441051074,10.4536075788626,8.58749856992599,2.11317318205602,10.1725229774408,25.7286759128128,,0.225906273855996,,7.78240092371387,22.144019869753,5.14377198962212,6,4
+Guyana,GUY,2009,196850,747718,TRUE,83.7288563569828,9.61978211109929,7.69719327084409,2.28933324257479,8.83912425425433,21.6467371139906,14.4712202887879,0.269800695969368,,7.00003011251705,23.2421870640466,6.73003329018968,7,5
+Guyana,GUY,2010,196850,749430,TRUE,100,11.5875958381076,9.31208809602628,2.46240575009544,8.81565650363725,20.2438501793904,19.2508829232739,1.41001634971695,,8.46654163720897,27.1428037978156,8.63548849968059,7,5
+Guyana,GUY,2011,196850,752029,TRUE,100,14.3936119498293,11.644689911715,2.53465858677471,9.5804756181967,20.9236911916299,19.1843521848083,1.07334688245626,,10.5021480072097,28.1135006374595,9.53762352221565,7,5
+Guyana,GUY,2012,196850,755388,TRUE,100,16.1359045341067,13.5318344337803,2.84501616814414,9.76176278369002,,9.54952235750978,2.13725808345969,,12.0538966806986,28.4124554987082,8.54431956478378,6,5
+Guyana,GUY,2013,196850,759281,TRUE,100,11.5850396684693,12.4459827288728,3.19840544792355,8.77873159367652,21.6480790284854,4.75027993232716,2.60957440986848,,11.10533828882,25.6046311343464,6.6497275494817,7,5
+Guyana,GUY,2014,196850,763371,TRUE,100,13.6597949432682,11.2636904442638,3.27674263335229,8.91149962554074,,0,2.88400367278372,,10.0811848592362,25.6400456041769,5.98034522172809,6,5
+Guyana,GUY,2015,196850,767433,TRUE,100,7.86960062838658,9.64852946222361,3.27522058240812,9.93110785626689,,9.3996408736588,7.55452515769575,,8.75350928933047,26.0385983093354,7.37049930629595,6,5
+Guyana,GUY,2016,196850,771363,TRUE,100,10.7267095514675,11.274873320727,3.69948975414698,9.0956064504875,13.1987847087136,9.35175085477861,39.1980188430259,,10.25149552543,24.7086013649723,14.6454929057698,7,5
+Guyana,GUY,2017,196850,775218,TRUE,100,18.5204938964,12.0118303178776,3.86913026828805,8.74049884910379,12.3406242507419,18.6104930344615,42.7898135830307,,11.0413282545146,27.5587619612949,18.966251807339,7,5
+Guyana,GUY,2018,196850,779007,TRUE,,66.4588468917457,14.8588100420078,4.47407058816372,8.73258732049432,,4.62999343689761,,,13.4829840124807,22.6054302397037,22.2614737323219,5,4
+Guyana,GUY,2019,196850,782775,TRUE,,95.5527988943964,21.0723458397103,4.88706167175952,,,,,,18.9967922873596,40.5040688019554,39.8122176178385,3,3
+Guyana,GUY,2020,196850,786559,TRUE,,,19.9106449136657,,,,,,,18.4283343028649,19.9106449136657,18.4283343028649,1,1
+"Hong Kong SAR, China",HKG,1990,990,5704500,TRUE,0,44.0018433681123,,,,,,,,,22.0009216840562,44.0018433681123,2,1
+"Hong Kong SAR, China",HKG,1991,990,5752000,TRUE,0.0550835138384452,29.3247165738287,,,,,,,,,14.6899000438336,29.3247165738287,2,1
+"Hong Kong SAR, China",HKG,1992,990,5800500,TRUE,0.383643019589529,91.804709150328,,,,,,,,,46.0941760849588,91.804709150328,2,1
+"Hong Kong SAR, China",HKG,1993,990,5901000,TRUE,0.592420661356116,100,,,,,,,,,50.2962103306781,100,2,1
+"Hong Kong SAR, China",HKG,1994,990,6035400,TRUE,1.2083957637203,100,,,,,,,,,50.6041978818602,100,2,1
+"Hong Kong SAR, China",HKG,1995,1050,6156100,TRUE,1.36956057100395,100,,20.1264179706702,,,,,,,40.4986595138914,60.0632089853351,3,2
+"Hong Kong SAR, China",HKG,1996,1050,6435500,TRUE,1.93294819776396,100,,24.4888937318002,,,,,,,42.1406139765214,62.2444468659001,3,2
+"Hong Kong SAR, China",HKG,1997,1050,6489300,TRUE,4.24601639085337,100,,21.1015853963814,,,,,40.6269135099513,,41.4936288242965,53.9094996354442,3,3
+"Hong Kong SAR, China",HKG,1998,1050,6543700,TRUE,5.82283772323092,100,100,100,,,,,89.68515172061,100,79.1015978887682,97.4212879301525,4,4
+"Hong Kong SAR, China",HKG,1999,1050,6606500,TRUE,8.41797437533659,100,100,100,,,,,90.6244450137154,100,79.8084838778104,97.6561112534289,4,4
+"Hong Kong SAR, China",HKG,2000,1050,6665000,TRUE,10.9368737780644,100,100,100,,,,,100,100,82.1873747556129,100,4,4
+"Hong Kong SAR, China",HKG,2001,1050,6714300,TRUE,15.0870483861811,100,100,100,,,,,98.3450582954195,100,82.6864213363201,99.5862645738549,4,4
+"Hong Kong SAR, China",HKG,2002,1050,6744100,TRUE,16.7336549774818,100,100,100,,,,,100,100,83.3467309954964,100,4,4
+"Hong Kong SAR, China",HKG,2003,1050,6730800,TRUE,20.3151143663232,100,100,100,34.023800742944,,18.7552602076136,,94.0064045176712,100,72.1794631819347,82.552332945057,6,5
+"Hong Kong SAR, China",HKG,2004,1050,6783500,TRUE,21.7790758583613,100,100,100,40.8565736206904,,30.8386884710317,,100,100,75.4362940548988,86.1677376942063,6,5
+"Hong Kong SAR, China",HKG,2005,1050,6813200,TRUE,21.8764184850714,100,100,100,45.0963979734816,,18.5284308996368,,100,100,73.4008082307847,83.7056861799274,6,5
+"Hong Kong SAR, China",HKG,2006,1050,6857100,TRUE,23.2262015412535,100,100,100,47.9236802067076,,21.5657769595294,,100,100,74.1319964167972,84.3131553919059,6,5
+"Hong Kong SAR, China",HKG,2007,1050,6916300,TRUE,24.5423574395019,100,100,100,50.4482767606682,,26.5961080580892,,,100,70.2276930995182,81.6490270145223,6,4
+"Hong Kong SAR, China",HKG,2008,1050,6957800,TRUE,25.1112878840609,100,100,100,51.6960299831757,,28.5110022350961,,,100,70.7244580238314,82.127750558774,6,4
+"Hong Kong SAR, China",HKG,2009,1050,6972800,TRUE,26.0715802768859,100,100,100,49.0935085435027,,22.2424684178212,,100,100,74.7190081157845,84.4484936835642,6,5
+"Hong Kong SAR, China",HKG,2010,1050,7024200,TRUE,26.8503976346579,100,100,100,50.2735091982942,,27.7280051897802,,100,100,75.7630671374063,85.545601037956,6,5
+"Hong Kong SAR, China",HKG,2011,1050,7071600,TRUE,26.7445074769329,100,100,100,55.6665038269198,,23.9718695872183,,100,100,75.1193961773585,84.7943739174437,6,5
+"Hong Kong SAR, China",HKG,2012,1050,7150100,TRUE,26.7073320797864,100,100,100,58.2544758308051,,35.3108083538427,,100,100,77.0030234056049,87.0621616707686,6,5
+"Hong Kong SAR, China",HKG,2013,1050,7178900,TRUE,27.0745405506453,100,100,100,61.6673419444666,,65.816552110483,,100,100,82.1485154435214,93.1633104220966,6,5
+"Hong Kong SAR, China",HKG,2014,1050,7229500,TRUE,28.9381148718781,100,100,100,63.6243186655745,,20.4548985668704,,100,100,74.8988355731247,84.0909797133741,6,5
+"Hong Kong SAR, China",HKG,2015,1050,7291300,TRUE,30.5186338826127,100,100,100,65.9163069839324,,24.7335680694615,,100,100,75.8753669920124,84.9467136138923,6,5
+"Hong Kong SAR, China",HKG,2016,1050,7336600,TRUE,31.2338932017779,100,100,100,66.7437936993097,,35.8880411502198,,100,100,77.8536557253329,87.177608230044,6,5
+"Hong Kong SAR, China",HKG,2017,1050,7391700,TRUE,31.6873361335851,100,100,100,67.8837396610302,,19.5180935227203,,100,100,75.2009049427176,83.9036187045441,6,5
+"Hong Kong SAR, China",HKG,2018,1050,7451000,TRUE,31.8188586461327,100,100,100,67.9615950720012,,18.8786866990464,,,100,70.1395090690358,79.7196716747616,6,4
+"Hong Kong SAR, China",HKG,2019,1050,7507400,TRUE,32.011083245801,100,100,100,,,,,,100,83.0027708114502,100,4,3
+"Hong Kong SAR, China",HKG,2020,1050,7481800,TRUE,32.3550970991088,100,100,,,,,,,100,77.4516990330363,100,3,2
+Honduras,HND,1990,111890,4955302,FALSE,0,0.393866556670424,1.01626884706178,,,,,,,0.995088370957752,0.470045134577402,0.694477463814088,3,2
+Honduras,HND,1991,111890,5098594,FALSE,0,0.456776038281987,0.984500169410835,,,,,,,0.983665830713831,0.480425402564274,0.720220934497909,3,2
+Honduras,HND,1992,111890,5244677,FALSE,0,0.406421566478878,1.01133375960799,,,,,,,1.03535154364079,0.472585108695624,0.720886555059836,3,2
+Honduras,HND,1993,111890,5394416,FALSE,0,0.22098573519727,1.18252814773729,,,,,,,1.11281149781205,0.467837960978188,0.666898616504657,3,2
+Honduras,HND,1994,111890,5548969,FALSE,0,0.290709115169574,1.27267698239167,,,,,,,1.20075004971529,0.521128699187082,0.745729582442429,3,2
+Honduras,HND,1995,111890,5709010,FALSE,0.0168736853981072,0.399486182868194,1.43984016773336,,,,,,,1.35487019933832,0.61873334533322,0.877178191103257,3,2
+Honduras,HND,1996,111890,5874814,FALSE,0.0194901041178605,0.693554854327024,1.68158166013711,0.558921421453152,,,,,,1.58613524841024,0.738387010008788,0.946203841396806,4,3
+Honduras,HND,1997,111890,6045704,FALSE,0.0740892764972828,0.884078411156601,1.84405568875378,0.621446479723013,,,,,,1.72432235267885,0.855917464032668,1.07661574785282,4,3
+Honduras,HND,1998,111890,6220405,FALSE,0.12685847062276,0.728109053596716,2.00109563486856,0.631293141839145,,,,,,1.84860304992473,0.871839075231796,1.06933508178686,4,3
+Honduras,HND,1999,111890,6397140,FALSE,0.234865816957604,1.68992482864074,1.9447953851796,0.811304735159587,,,,,,1.79397465304568,1.17022269148438,1.43173473894867,4,3
+Honduras,HND,2000,111890,6574510,FALSE,0.479651983724123,2.50271487091001,2.13944099772444,1.27163692327113,,,,,,2.02629686731669,1.59836119390743,1.93354955383261,4,3
+Honduras,HND,2001,111890,6751912,FALSE,0.549074509986326,2.06703068499509,2.11622484007325,1.20760112730417,,,,,,1.99764701253918,1.48498279058971,1.75742627494615,4,3
+Honduras,HND,2002,111890,6929267,FALSE,0.981899566775629,1.93659750643684,2.12115018634948,1.38001928841584,,,,,,1.98772181804222,1.60491663699444,1.76811287096497,4,3
+Honduras,HND,2003,111890,7106323,FALSE,1.76934037537522,2.41059324121107,2.23903466082819,1.51483584513468,2.64239793625228,,,,,2.09531324441394,1.98345103063729,2.00691411025323,5,3
+Honduras,HND,2004,111890,7282953,FALSE,2.01416763755268,3.80211979863884,2.61081793213784,1.7099138912874,2.41671121606401,,,,,2.45465894807954,2.53425481490419,2.65556421266859,5,3
+Honduras,HND,2005,111890,7458982,FALSE,2.28270027689224,3.53573705681212,2.90404993248876,1.81936073480041,2.21207699750195,,,,,2.74621611837073,2.63546200024838,2.70043796999442,5,3
+Honduras,HND,2006,111890,7634295,FALSE,2.67633675828365,4.40455937025971,3.19226744321667,1.80619002398736,2.04082739570077,14.9549993092891,,0.0937116204783293,,3.04067930017113,5.40687058100731,2.33628507872413,6,4
+Honduras,HND,2007,111890,7808520,FALSE,3.1533648374084,5.66047421282687,3.73020904676045,2.0349991148294,2.29000426968597,21.8692015583391,,0.16257685310159,,3.49956295613536,7.28964975403284,2.83940328422331,6,4
+Honduras,HND,2008,111890,7980955,FALSE,3.1508771079044,7.66206494325309,4.30133006258346,2.37457378451019,2.45331890502527,26.2404033691557,,0.229774710624285,,3.96975630662807,8.74584985348137,3.55904243625391,6,4
+Honduras,HND,2009,111890,8150780,FALSE,3.14950279816534,2.71880232627483,3.24405376028664,2.36679956849094,2.56334786855532,28.6941841452037,1.77003786008078,0.31502334096038,,3.02851392938921,6.99056340975037,2.03983540503923,7,5
+Honduras,HND,2010,111890,8317467,FALSE,3.49265391400425,5.11796826294042,3.66075229090466,4.46048408107844,2.61537352705494,26.0837903848355,0.433641311386904,0.441058823271168,,3.43569898873903,7.20821504085836,2.77777029348319,7,5
+Honduras,HND,2011,111890,8480670,FALSE,4.91113705366846,5.54837454385069,4.53707135977208,4.21561839493047,3.21242719728192,32.6018958302157,1.27588880264082,0.519104889640555,,4.23196552821514,8.84833099751304,3.15819043185553,7,5
+Honduras,HND,2012,111890,8640692,FALSE,5.49319179198262,6.65820082484473,4.70477022031483,4.18110293099963,3.21218285812816,34.8672459293622,0.834839917288407,0.594422608108962,,4.44695586435123,9.4565586024654,3.34310442911859,7,5
+Honduras,HND,2013,111890,8798524,FALSE,5.29938257346642,5.71485973001295,4.45351631415523,4.01909136341787,3.05060924259036,33.1198824875794,0.819864172058245,1.19665284349835,,4.23518199588729,8.90443277344835,3.19713002097494,7,5
+Honduras,HND,2014,111890,8955579,FALSE,5.58084287038519,10.2588720382289,4.53685092943788,4.26735268452753,3.20317035954124,39.1097261956983,1.61097224302183,2.8110821167639,,4.3633665694429,10.8941028268833,4.662329130397,7,5
+Honduras,HND,2015,111890,9112904,FALSE,7.78982299756135,8.0941535490125,4.5439312257297,4.32162893141372,3.0657956300526,25.3521051858409,0.395790112273464,3.27835915720317,,4.3235351967636,8.41623866697194,4.08269338933329,7,5
+Honduras,HND,2016,111890,9270794,FALSE,8.33527972425529,6.59479611436504,4.30408007098094,4.38689974549559,3.15208921854083,21.045193805408,0.778098897957887,6.81958918561197,,4.13988156284251,7.5740580597438,4.5438531012546,7,5
+Honduras,HND,2017,111890,9429016,FALSE,8.92782059081209,4.8143798066284,4.62686346748356,3.6974260307209,3.03546983959811,18.1808416187312,0,8.06955477672391,,4.41516418292562,6.70788858572936,4.19930495939977,7,5
+Honduras,HND,2018,111890,9587523,FALSE,,9.10338150574754,4.8208897360076,3.83266799888929,2.81037725803656,,0,,,4.69862707510937,4.43923481016111,4.40866914493655,5,4
+Honduras,HND,2019,111890,9746115,FALSE,,6.34868007568288,4.69211679126372,2.88405819396058,,,,,,4.59693445552258,4.64161835363573,4.60989090838868,3,3
+Honduras,HND,2020,111890,9904608,FALSE,,0.576671549575361,3.9191966338563,,,,,,,3.82443448936096,2.24793409171583,2.20055301946816,2,2
+Croatia,HRV,1990,55910,4777368,FALSE,0,,,,,,,,,,0,,1,0
+Croatia,HRV,1991,55910,4689022,FALSE,0,,,,,,,,,,0,,1,0
+Croatia,HRV,1992,55910,4575818,FALSE,0,0.124604530428021,,,,,,,,,0.0623022652140106,0.124604530428021,2,1
+Croatia,HRV,1993,55910,4600463,FALSE,0.0553528052190684,1.57019399568011,6.25413958765973,,,,,,,5.62055792493784,2.62656212951964,3.59537596030898,3,2
+Croatia,HRV,1994,55910,4652024,FALSE,0.151086120296264,1.14415712320629,7.33243252756731,,,,,,,6.61148386938744,2.87589192368995,3.87782049629686,3,2
+Croatia,HRV,1995,55910,4620030,FALSE,0.291445647066731,1.09518544066626,8.40672985094491,42.3320705149807,,,,,,7.5508155954343,13.0313578634146,16.9926905170271,4,3
+Croatia,HRV,1996,55980,4557097,FALSE,0.493754504216035,4.99571305936541,9.44322306698413,50.8738757730091,,,,,,8.5235181082191,16.4516416008937,21.4643689801979,4,3
+Croatia,HRV,1997,55980,4534920,FALSE,0.999064387957231,8.17417362215669,10.3181985268743,63.3779943529997,,,,,,9.36359082424649,20.717357722497,26.9719195998009,4,3
+Croatia,HRV,1998,55910,4532135,FALSE,1.89185344121272,11.2840732050576,10.1508954013166,68.3462067962885,,,,,,9.31286238330193,22.9182572109689,29.647714128216,4,3
+Croatia,HRV,1999,55910,4512597,FALSE,2.55723041357207,14.7450107562086,9.54525456937596,78.645640698301,,,,,,8.81673122226748,26.3732841093644,34.0691275589257,4,3
+Croatia,HRV,2000,55910,4468302,FALSE,3.89547018291504,10.4358975743135,8.74023523802374,100,,,,,,8.1572170817021,30.7679007488131,39.5310382186719,4,3
+Croatia,HRV,2001,55910,4299642,FALSE,7.04185412777315,11.8776120187351,10.3607792603073,100,,,,,,9.72166125089005,32.3200613517039,40.5330910898751,4,3
+Croatia,HRV,2002,55910,4302174,FALSE,10.8135946049888,15.7994604801878,12.4474697324358,100,,,,,,11.5573688604251,34.7651312044031,42.4522764468709,4,3
+Croatia,HRV,2003,55910,4303399,FALSE,13.8479306633128,20.2598597166869,16.0609395528853,100,6.37323629010919,,34.3632299001764,,,15.1431969248098,36.9063919666123,42.4415716354183,6,4
+Croatia,HRV,2004,55960,4304600,FALSE,18.8096752580908,17.2929614839017,19.2348510781823,100,7.00978703181377,,39.3810047328377,,,18.0843705442702,38.9436985106025,43.6895841902524,6,4
+Croatia,HRV,2005,55960,4310145,FALSE,20.1407536430721,20.9183986007703,20.8737555884274,100,8.72903351376706,,38.4935253165904,,,19.7068214518847,40.0852866297721,44.7796863423114,6,4
+Croatia,HRV,2006,55960,4311159,FALSE,23.0768227330468,36.7793440986005,23.9394997793523,100,10.0903923187521,36.3028352726449,42.6675662303715,1.95888132959148,,22.7396865625647,43.7943446856693,40.8290956442256,7,5
+Croatia,HRV,2007,55960,4310217,FALSE,25.1846375633262,51.1375152489912,28.4677858411945,100,11.1173712432941,35.4096031265314,38.4928823016743,2.74713000734168,,27.3964742224101,46.4487373469529,43.9548003560835,7,5
+Croatia,HRV,2008,55960,4309705,FALSE,26.8894964002166,67.617134106891,33.0149809176537,100,11.4889511984414,39.5563192161692,53.5616769655991,9.38265720696433,,32.0268350985505,53.4399346010883,52.517660675601,7,5
+Croatia,HRV,2009,55960,4305181,FALSE,30.775314801728,45.2758292338147,25.0425549285714,100,11.3609658239934,41.0750936842468,41.0512514032668,9.39251687224176,,24.1615800016901,47.2033406752713,43.9762355022027,7,5
+Croatia,HRV,2010,55960,4295427,FALSE,34.485883803307,20.331882107153,24.8274775035913,100,12.7095233930242,28.0257623873724,27.7095410562933,9.39676030942925,,23.9186224348269,39.2300911429528,36.2713611815405,7,5
+Croatia,HRV,2011,55960,4280622,FALSE,35.3639486563178,13.4157954018173,28.0679742437846,100,13.2425041635832,19.5108647490568,26.120203142491,10.629362242094,3.38393948062095,26.9206358816777,32.2661036677269,30.0783226914502,7,6
+Croatia,HRV,2012,55960,4267558,FALSE,38.0195239300849,15.9531940698057,26.4092020180555,100,13.7253150325468,19.8652959469227,35.4969953510852,17.1966834903473,3.66285229095633,25.2956141011274,34.2010090867015,32.9342232172203,7,6
+Croatia,HRV,2013,55960,4255689,FALSE,41.084770548258,11.3032926852979,28.1111481320056,100,14.7012848294931,18.4283582210502,38.1385666054024,20.0038058285924,3.30135276165908,26.3220841313061,34.3382127076676,33.1781836687096,7,6
+Croatia,HRV,2014,56590,4238389,FALSE,42.3787780025225,56.1574268496906,28.6276922245588,100,15.3095516977774,18.4543517631125,38.2942383010097,25.9726057497351,3.41147615449251,26.7697312619079,41.0462804707695,41.7675797194727,7,6
+Croatia,HRV,2015,56590,4203604,FALSE,43.524004084433,2.60062355188421,26.3603291432317,100,16.4252108810866,20.590338502907,47.1913746754812,29.5788307300969,3.53401543371748,24.0932423956502,34.8286693416649,34.4996811311383,7,6
+Croatia,HRV,2016,56590,4174349,FALSE,45.6188610607836,23.0995081045635,28.1919808687055,100,18.5908281132242,22.7913591533763,37.153645702308,39.4770066291165,3.80075692361809,25.4058608290927,37.2365874019079,38.1561296981165,7,6
+Croatia,HRV,2017,56590,4124531,FALSE,42.6126354684995,13.9897380928043,32.4763924292534,100,20.7700186266238,26.2847313628297,22.7363377144528,62.8601719320249,4.39923659162958,29.2758811000854,34.6427245227813,38.8768942384995,7,6
+Croatia,HRV,2018,56590,4087843,FALSE,48.2486167139775,16.4415294536024,36.6813072253702,100,23.3417450943988,,29.9989769930274,,,34.8299647607175,46.2740860771955,45.3176178018368,6,4
+Croatia,HRV,2019,56590,4065253,FALSE,50.9557252945557,15.0699567410042,37.1410228112679,100,,,,,,35.5032686176482,50.7916762117069,50.1910751195508,4,3
+Croatia,HRV,2020,56590,4047200,FALSE,50.6918660378161,2.70809784135725,30.6032200204235,,,,,,,29.1701043071864,28.0010612998656,15.9391010742718,3,2
+Haiti,HTI,1990,27560,7037915,FALSE,0,0.0997091900024083,0.248125876155595,,,,,,,0.2130978586202,0.115945022052668,0.156403524311304,3,2
+Haiti,HTI,1991,27560,7178611,FALSE,0,0.0940891453524166,0.216722761559869,,,,,,,0.182457546914974,0.103603968970762,0.138273346133695,3,2
+Haiti,HTI,1992,27560,7319491,FALSE,0,0.0131825984271205,0.0807610176028971,,,,,,,0.0609257986230949,0.0313145386766725,0.0370541985251077,3,2
+Haiti,HTI,1993,27560,7460684,FALSE,0,0.0164603326842773,0.0937965545903337,,,,,,,0.072463691636453,0.0367522957582037,0.0444620121603651,3,2
+Haiti,HTI,1994,27560,7602318,FALSE,0,0.0161536705899786,0.0581097686216527,,,,,,,0.0401878186791301,0.0247544797372104,0.0281707446345543,3,2
+Haiti,HTI,1995,27560,7744509,FALSE,0,0.0487058458383016,0.272442687255133,0.578925046185841,,,,,,0.233140995349764,0.225018394819819,0.286923962457969,4,3
+Haiti,HTI,1996,27560,7887312,FALSE,0.0024856188479774,0.0272725909032488,0.260527496401635,0.61462276227986,,,,,,0.216991295646644,0.22622711710818,0.286295549609918,4,3
+Haiti,HTI,1997,27560,8030721,FALSE,,0.0273070439424041,0.344588633048052,0.583956235309636,,,,,,0.291524444734343,0.318617304100031,0.300929241328794,3,3
+Haiti,HTI,1998,27560,8174680,FALSE,0.00769035008510738,0.0577298904251023,0.41009643717353,0.582563250064002,,,,,,0.348165539959729,0.264519981936935,0.329486226816278,4,3
+Haiti,HTI,1999,27560,8319070,FALSE,0.0222486976260194,0.163435402955422,0.480587812328115,0.562204981407162,,,,,,0.410242558495254,0.30711922357918,0.378627647619279,4,3
+Haiti,HTI,2000,27560,8463802,FALSE,0.0715764643802435,0.0686609180810109,0.497173182853087,0.637248115938801,,,,,,0.423855258302074,0.318664670313286,0.376588097440629,4,3
+Haiti,HTI,2001,27560,8608810,FALSE,0.103708117128993,0.0224165501489573,0.456589164234288,0.702689565977761,,,,,,0.388345945730859,0.3213508493725,0.371150687285859,4,3
+Haiti,HTI,2002,27560,8754148,FALSE,0.267339537947462,0.0285575005596494,0.423783860412422,0.667408688342606,,,,,,0.36059620927691,0.346772396815535,0.352187466059722,4,3
+Haiti,HTI,2003,27560,8900108,FALSE,0.484850555781518,0.0680053425657168,0.474848949695925,0.705576703325985,1.7252028842318,,,,,0.405404937561904,0.433320387842286,0.392995661151202,5,3
+Haiti,HTI,2004,27560,9047082,FALSE,1.56387416105257,0.0286024152824857,0.516615368024236,0.515505070059736,1.52293053697133,,,,,0.44147024037432,0.656149253604758,0.328525908572181,5,3
+Haiti,HTI,2005,27560,9195289,FALSE,1.81640108650347,0.124012992569149,0.608672191440106,0.632678039803878,1.35200421877212,,,,,0.527268859847035,0.79544107757915,0.42798663074002,5,3
+Haiti,HTI,2006,27560,9344784,FALSE,1.90501863171007,0.753764182211845,0.694832967801942,0.723931234185669,1.20469774265486,,,,,0.602594642042845,1.01938675397738,0.69343001948012,5,3
+Haiti,HTI,2007,27560,9495336,FALSE,1.98626528924689,0.344116231739371,0.768062550815722,1.10903181354321,1.27771997069304,,,,,0.668008194869156,1.0518689713363,0.707052080050579,5,3
+Haiti,HTI,2008,27560,9646570,FALSE,2.06374372689631,0.135488541250172,0.907763348722061,0.953098807449423,1.33058048966526,,,,,0.792202831868821,1.01502360607949,0.626930060189472,5,3
+Haiti,HTI,2009,27560,9798046,FALSE,2.16551221997258,0.248300683341787,0.909749224665512,1.02265038174272,1.31673115832345,,0.368113937952251,,,0.793542771955777,0.942865289534968,0.608151943748133,6,4
+Haiti,HTI,2010,27560,9949318,FALSE,2.20367345343153,0.784667948497401,1.25174660354237,0.966787168366355,1.47751025910308,,0,,,1.09151847625257,1.04137503476753,0.710743398279082,6,4
+Haiti,HTI,2011,27560,10100320,FALSE,2.33411618475162,0.516738774555782,1.33821336418896,1.13632947789251,1.4944606546346,,0,,,1.16801542195756,1.06507956027777,0.705270918601462,6,4
+Haiti,HTI,2012,27560,10250922,FALSE,2.50425321909874,0.667453311864927,1.26560409866427,1.13501946093147,1.45310458888958,,0,,,1.11025617433557,1.11446601811188,0.728182236782992,6,4
+Haiti,HTI,2013,27560,10400672,FALSE,2.66968215623852,0.682801593041334,1.35996582722438,1.24129614855651,1.33505410092736,,0,,,1.18965443797997,1.19074914501215,0.778438044894453,6,4
+Haiti,HTI,2014,27560,10549007,FALSE,2.830794641178,0.411607080597871,1.43342251966426,1.29706127420864,1.43405717806299,0.567872614309606,0,,,1.25709295455543,1.09012635499306,0.741440327340485,7,4
+Haiti,HTI,2015,27560,10695540,FALSE,2.98737901174797,0.433360487654485,1.3732920476401,1.35014487220987,1.42515176864639,0.622428187467783,0.337224422263607,0.210676724706698,,1.20629230489635,1.18397150483064,0.707539762346203,7,5
+Haiti,HTI,2016,27560,10839976,FALSE,2.95600800095495,0.424430309710576,1.25968103696889,1.29067113033512,1.70416321544111,0.430839746663004,0,0.207868107436562,,1.10751068136314,1.06027170410542,0.606096045769078,7,5
+Haiti,HTI,2017,27560,10982367,FALSE,7.3940236489829,1.49701647016788,1.3286680298539,1.39448670248351,1.79452818268467,0.299824032467213,0.328417116027656,0.534479115506617,,1.1674109926793,2.04040599999718,0.984362079372992,7,5
+Haiti,HTI,2018,27560,11123183,FALSE,7.64745290777295,0.414018206475604,1.582383379819,1.45435575709028,1.95733021363068,,0,,,1.38854369179618,2.21964205023157,0.814229413840514,6,4
+Haiti,HTI,2019,27560,11263079,FALSE,7.55859933004741,0.292054132670366,1.45380059009558,1.01024043936077,,,,,,1.27661605284359,2.57867362304353,0.859636874958244,4,3
+Haiti,HTI,2020,27560,11402533,FALSE,,,,,,,,,,,,,0,0
+Hungary,HUN,1990,89870,10373988,FALSE,0,2.3413885535989,5.33872742921733,,,,,,,5.06718724739803,2.56003866093874,3.70428790049846,3,2
+Hungary,HUN,1991,89870,10373400,FALSE,0.000854178164961707,6.18197744320484,5.45144357292608,,,,,,,5.16843491436749,3.87809173143196,5.67520617878617,3,2
+Hungary,HUN,1992,89870,10369341,FALSE,0.012214934517025,6.25706195926832,6.0874807916589,,,,,,1.53981935056165,5.7477204840288,3.47414425900148,4.51486726461959,3,3
+Hungary,HUN,1993,89860,10357523,FALSE,0.0489156671579798,9.99522426047986,5.96912184183167,,,,,,1.93008773494498,5.6470345136087,4.48583737610362,5.85744883634452,3,3
+Hungary,HUN,1994,89860,10343355,FALSE,0.122468068917795,5.0590405160246,5.83076657153142,,,,,,2.22551631016627,5.65702250876776,3.30944786666002,4.31385977831954,3,3
+Hungary,HUN,1995,89860,10328965,FALSE,0.17181403921647,21.0591998239393,8.47981061948053,61.5359506431977,,,,,2.31052522818619,8.20310175092206,18.711460070804,23.2771943615613,4,4
+Hungary,HUN,1996,89860,10311238,FALSE,0.246226846963106,14.0625966475593,9.08565964031142,61.1398626818136,,,,,2.64127303425863,8.93334419510889,17.4351237701812,21.6942691396851,4,4
+Hungary,HUN,1997,89800,10290486,FALSE,0.494457567252449,19.7740808918646,10.4798127718529,58.419327409276,,,,,3.08405538082048,10.3994588930985,18.4503468042133,22.9192306437649,4,4
+Hungary,HUN,1998,89800,10266570,FALSE,0.993704843941834,14.9317841057362,12.3553887328193,54.3584169611581,,,,,3.30918223928373,11.9802964488413,17.1896953765878,21.1449199387548,4,4
+Hungary,HUN,1999,89800,10237530,FALSE,1.49884756719493,16.6210912197538,13.3353877647955,46.7806619510609,,,,,3.78628733401314,12.6898530508186,16.4044551673637,19.9694733889116,4,4
+Hungary,HUN,2000,89620,10210971,FALSE,1.79566786605556,14.4053485751744,15.5022207226672,50.2108902711244,,,,,4.20628936099168,14.630521330756,17.2240833592026,20.8632623845116,4,4
+Hungary,HUN,2001,89620,10187576,FALSE,3.73565390199885,19.7137503299732,16.8972334849184,49.8969247423336,,,,,4.18655246700155,15.9722879762895,18.8860229852451,22.4423788788995,4,4
+Hungary,HUN,2002,89620,10158608,FALSE,4.29849565114796,20.7941994303607,19.2247311837786,53.4580891032335,,,,,4.15828315927818,18.1833848562252,20.3867597055598,24.1484891372744,4,4
+Hungary,HUN,2003,89620,10129552,FALSE,5.59347079919096,35.9664661149941,24.2826565541765,54.7987012533325,8.57075751194511,,35.9627481084087,,4.54865804882379,22.8129463528474,26.8587834798211,30.8179039756813,6,5
+Hungary,HUN,2004,89620,10107146,FALSE,7.18940602827114,26.8505251459023,31.4120453579137,61.8877028543502,11.1294084406927,4.37221257493852,45.6775883176175,100,4.7112930628754,29.8439036080409,26.0143961916955,44.8285021647977,7,6
+Hungary,HUN,2005,89610,10087065,FALSE,10.1200039118543,100,35.3683410098279,64.9494277084423,12.7692235681259,13.0909578315025,41.8352894309478,100,5.12097358123346,35.3747265688666,38.6407133534012,57.8800695482484,7,6
+Hungary,HUN,2006,89610,10071370,FALSE,12.2399167941954,100,41.3099702389798,66.2363279397655,13.2276956189602,13.7217221357943,38.6773704181366,2.91461924003879,4.85948693081119,41.0645910461252,39.577827779669,42.2920659291462,7,6
+Hungary,HUN,2007,89610,10055780,FALSE,13.8843815466548,100,52.4270234542623,68.1752671001743,13.2201745432246,18.7543304803971,34.7918647621406,3.50298792912464,,53.4375902103698,48.0054778906048,51.9815420003619,7,5
+Hungary,HUN,2008,89610,10038188,FALSE,15.918040446846,100,60.8109647879954,68.6348063634081,12.5972365454963,20.7018895066847,52.0996028474569,19.7061622290169,,62.5546705164073,53.0275506587319,60.5990483912578,7,5
+Hungary,HUN,2009,90530,10022650,FALSE,16.2040740362697,28.6909650811356,46.0479237447016,69.4054161396188,12.1557692742926,6.11387992950843,49.6613198133255,24.4226577815715,5.20440251142956,49.3888500462243,31.6182830365699,37.7956018955509,7,6
+Hungary,HUN,2010,90530,10000023,FALSE,17.0265811155977,100,50.1716034829504,68.0099570332207,11.6756443636041,5.97818031658203,67.8076332316328,29.0078025718466,21.132378968056,53.2789756553867,47.1609048782914,56.5394579100238,7,6
+Hungary,HUN,2011,90530,9971727,FALSE,17.8682188926766,85.8569528659027,57.2368415733332,70.5809528138767,12.1792642592544,6.40355553147519,83.5532476646899,36.4412186303525,23.2564852407755,58.3462860612089,49.2508935118186,59.6725238794677,7,6
+Hungary,HUN,2012,90530,9920362,FALSE,18.6367086764444,82.9150059641267,51.8205038818783,73.1138597596698,9.55653358290653,6.77027315426762,49.8097982442304,37.4802730589365,20.8155557860401,53.379165931979,43.4116722095225,52.9189431241638,7,6
+Hungary,HUN,2013,90530,9893082,FALSE,19.2345768755154,33.0344752647477,54.3605082230001,73.2430263956874,8.95406315373975,6.84040712894664,19.6871969780554,20.77069533097,25.7178188211709,55.4324538493191,33.1597156695891,37.9809444399918,7,6
+Hungary,HUN,2014,91260,9866468,FALSE,20.0854085653775,99.1323024752991,58.0847180959308,76.7341562066348,9.28752170947539,7.0781456443188,40.9428477644986,23.4300771471807,34.5974922971089,58.1604726666654,48.0935815784526,55.4995580928979,7,6
+Hungary,HUN,2015,91260,9843028,FALSE,19.383175589488,59.8130667926429,51.3660474650845,80.9859479876942,10.0001909922723,7.94835219125687,25.6502176780164,27.2138073855188,40.9960688341345,50.8310506604471,40.8775537911882,47.5816932230757,7,6
+Hungary,HUN,2016,91260,9814023,FALSE,21.1552844598715,100,52.0213337133015,88.8552043229642,10.8447234912654,9.9688713625607,14.3330716256315,31.7809793380511,41.6662849586184,52.4668467021735,46.8571500632783,54.8503978245731,7,6
+Hungary,HUN,2017,91260,9787966,FALSE,20.540174172807,100,58.4826048468214,93.4033759905533,11.6767160962511,13.1445972351794,18.7931447822931,34.1149285276728,51.6419919351151,59.0408568019915,50.8579841375385,59.4990496729376,7,6
+Hungary,HUN,2018,91260,9775564,FALSE,20.3850406429844,100,64.867734900744,100,13.2509087481933,,19.5549082136598,,,64.3037288648646,60.9615367514776,70.9646592696311,6,4
+Hungary,HUN,2019,91260,9771141,FALSE,21.5463114695927,100,65.2479941643619,100,,,,,,66.0008904941804,71.6985764084887,88.6669634980601,4,3
+Hungary,HUN,2020,91260,9749763,FALSE,22.7755629447032,100,60.9345930193415,,,,,,,61.8561428638571,61.2367186546816,80.9280714319286,3,2
+Indonesia,IDN,1990,1811570,181413398,FALSE,0,0.266906369688032,0.719551895788052,,,,,,,0.686466223282062,0.328819421825361,0.476686296485047,3,2
+Indonesia,IDN,1991,1811570,184591897,FALSE,0,0.355212125695962,0.798906386122487,,,,,,,0.770899718140938,0.384706170606149,0.56305592191845,3,2
+Indonesia,IDN,1992,1811570,187739786,FALSE,0,0.581937885909109,0.890635402552503,,,,,,0.886946261372155,0.848501796312545,0.589879887458442,0.772461981197936,3,3
+Indonesia,IDN,1993,1811570,190851184,FALSE,0,0.542345907497647,0.960782118758154,,,,,,0.854990198077364,0.90573279195972,0.589529556083291,0.767689632511577,3,3
+Indonesia,IDN,1994,1811570,193917458,FALSE,0.0000143152570525036,0.614740414821194,1.06939277086288,,,,,,0.977804291213674,0.996831373057575,0.665487948038701,0.863125359697481,3,3
+Indonesia,IDN,1995,1811570,196934257,FALSE,0.000347289775610537,1.10218731357429,1.28128183955497,0.265274210821791,,,,,1.04395425748667,1.19950556626271,0.738608982242665,0.902730337036364,4,4
+Indonesia,IDN,1996,1811570,199901231,FALSE,0.000741993475350123,1.49062807612091,1.36800052473873,0.304461952702576,,,,,0.997103865533702,1.27347525005909,0.832187282514254,1.01641728610407,4,4
+Indonesia,IDN,1997,1811570,202826444,FALSE,0.00251724349434892,1.04984184877953,1.46586295352971,0.309093867114075,,,,,1.06271731128075,1.37474660678361,0.778006644839682,0.94909990848949,4,4
+Indonesia,IDN,1998,1811570,205724597,FALSE,0.0032508055608617,0.0607173750371387,1.12488616210897,0.270529291756113,,,,,0.805654282181984,1.09493061413951,0.453007583329014,0.557957890778687,4,4
+Indonesia,IDN,1999,1811570,208615171,FALSE,0.00558031647158616,0.40736354307543,1.10801347252079,0.273864932982152,,,,,0.584457294349923,1.08625282399136,0.475855911879977,0.587984648599717,4,4
+Indonesia,IDN,2000,1811570,211513822,FALSE,0.0114625892858961,0.943551864515621,1.41043934846712,0.416030176543223,,,,,0.66225184065621,1.35512661499875,0.688747163893614,0.844240124178451,4,4
+Indonesia,IDN,2001,1811570,214427419,FALSE,0.024659713491747,0.608996646404368,1.24168460940849,0.432395517336272,,,,,0.674725105463412,1.18167391882394,0.596492318420858,0.724447797006997,4,4
+Indonesia,IDN,2002,1811570,217357790,FALSE,0.0257194644863595,0.0292757594358866,1.28132932843111,0.460415334971477,,,,,0.620730749861215,1.20263845431577,0.48349412743721,0.578265074646088,4,4
+Indonesia,IDN,2003,1811570,220309473,FALSE,0.0283816696113678,0.118835163100999,1.34958319228998,0.436637470389239,0.335238661909242,,0.523888110401469,,0.554680662049423,1.24809480821931,0.502001044640413,0.576427242832089,6,5
+Indonesia,IDN,2004,1811570,223285666,FALSE,0.0305053032699839,1.04185833731457,1.54713968395441,0.502450115240603,0.443614170951446,,0.371525585694506,,0.511944988715584,1.48247877797538,0.667570669031609,0.782051560988128,6,5
+Indonesia,IDN,2005,1811570,226289468,FALSE,0.0416962930839434,2.2097728063583,1.89673723912312,0.487493998217004,0.451366887788982,,0.589738007603606,,0.431937869961874,1.81197666147451,0.942896035724641,1.10618386872306,6,5
+Indonesia,IDN,2006,1811570,229318262,FALSE,0.0544279936637137,1.46120566744439,2.01960512819097,0.519707263391364,0.433191465400694,,0.456122075535448,0.0110003248847679,0.452186099740459,1.92998070288266,0.827209037994391,0.805033688979849,6,6
+Indonesia,IDN,2007,1811570,232374239,FALSE,0.06522681360333,2.19010589732518,2.290409007521,0.556034698359961,0.444607204071577,,0.620860094099725,0.0247856597818482,,2.19672591052667,1.14452730218184,1.11770245201868,6,5
+Indonesia,IDN,2008,1811570,235469755,FALSE,0.0880778902432819,2.83456825435287,2.86169959106119,0.603185265301211,0.515474070440531,,0.474841094628974,0.078104853721296,,2.6931969785931,1.3724744191175,1.33677928931949,6,5
+Indonesia,IDN,2009,1811570,238620554,FALSE,0.0759649644205231,1.30986671558185,2.28861133564406,0.577739659186193,0.585732152848142,,0.906911974723845,0.153665132207486,0.477921126756155,2.15888162448955,0.939502629385438,0.93083103882418,6,6
+Indonesia,IDN,2010,1811570,241834226,FALSE,0.118282356215838,3.53247267499405,3.08423095993757,0.663525766098252,0.659350169392359,,0.715888206288345,0.197141449296017,0.688544750229809,2.90228934860015,1.46715745229398,1.44997703258444,6,6
+Indonesia,IDN,2011,1811570,245115988,FALSE,0.131232626583358,5.29664704246739,3.9300030571137,0.712211395534386,0.751933615012214,,0.77987673638309,0.2543809952264,1.11441432331668,3.70180401767653,1.99406419689977,1.97655575176741,6,6
+Indonesia,IDN,2012,1811570,248451714,FALSE,0.15308749376622,5.0638064169998,4.09026344769624,0.756316021419943,0.79525191944969,,0.682303495692418,0.339578957239397,1.12776706350796,3.84032048414095,1.9789239898471,1.96834873983341,6,6
+Indonesia,IDN,2013,1811570,251805314,FALSE,0.155417815511483,5.99059301249758,3.96230404964803,0.810339437514925,0.871180001926203,,1.21751906423337,1.79229812528349,1.23233494675943,3.72738908841906,2.22808472102747,2.46174561245131,6,6
+Indonesia,IDN,2014,1811570,255128076,FALSE,0.17598176035211,6.10422357244557,3.76197504904684,0.832240259259732,0.916980435250325,3.22268076274413,0.86236935810677,2.41617288337302,1.30689234942801,3.56261180855371,2.32376615876902,2.5140850385278,7,6
+Indonesia,IDN,2015,1811570,258383257,FALSE,0.223671280392437,4.89776039635744,3.12097483959014,0.872231570729315,0.885564544605051,,1.00505508143434,4.30742330188935,1.27722616697972,2.99823124356672,1.8994865559139,2.55965462682615,6,6
+Indonesia,IDN,2016,1877519,261556386,FALSE,0.254854550381669,2.70574908253045,2.99026265286839,0.920895959995111,0.894371910856904,,0.744646525487831,4.59064475760284,1.43757877977022,2.91052962273074,1.50899792517228,2.21834078801953,6,6
+Indonesia,IDN,2017,1877519,264650969,FALSE,0.320055503490073,3.7318724297176,3.4086480107779,1.04951467338596,0.980017665418805,1.72763907477543,0.545140236731542,5.01643423045515,1.76345963281742,3.31766292872056,1.79233279452799,2.57068068863804,7,6
+Indonesia,IDN,2018,1877519,267670549,FALSE,0.390515149739642,4.14700283682956,3.85422420442464,1.14576343194518,1.06126255738412,,0.943233432867547,,,3.75253825589791,2.09614781116131,2.49713448938505,6,4
+Indonesia,IDN,2019,1877519,270625567,FALSE,0.46161456437904,4.77380479124579,3.57701456478139,1.24622093369626,,,,,,3.49847347349798,2.51466371352562,3.17283306614668,4,3
+Indonesia,IDN,2020,1877519,273523621,FALSE,0.51452770170092,0.807350950889624,2.95187501516796,,,,,,,2.87601165649186,1.4245845559195,1.84168130369074,3,2
+Isle of Man,IMN,1990,570,70292,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,1991,570,70928,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,1992,570,71262,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,1993,570,71431,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,1994,570,71662,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,1995,570,72133,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,1996,570,72884,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,1997,570,73851,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,1998,570,74936,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,1999,570,75996,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2000,570,76942,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2001,570,77707,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2002,570,78318,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2003,570,78878,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2004,570,79515,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2005,570,80293,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2006,570,81283,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2007,570,82406,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2008,570,83515,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2009,570,84379,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2010,570,84856,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2011,570,84889,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2012,570,84534,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2013,570,83985,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2014,570,83488,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2015,570,83232,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2016,570,83296,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2017,570,83610,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2018,570,84073,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2019,570,84589,TRUE,,,,,,,,,,,,,0,0
+Isle of Man,IMN,2020,570,85032,TRUE,,,,,,,,,,,,,0,0
+India,IND,1990,2973190,873277799,FALSE,0,0.0121887364097551,0.107165721321545,,,,,,,0.0900451431479513,0.0397848192437668,0.0511169397788532,3,2
+India,IND,1991,2973190,891273202,FALSE,0,0.00416004937828867,0.097755982343233,,,,,,,0.0824033694657691,0.0339720105738406,0.0432817094220289,3,2
+India,IND,1992,2973190,909307018,FALSE,0.000000320649768237995,0.0144947634846868,0.107213637485117,,,,,,0.108968123999991,0.0909380900224434,0.0576692114048906,0.0714669925023737,3,3
+India,IND,1993,2973190,927403866,FALSE,0.000000616244657501496,0.0260448400373314,0.11248853198321,,,,,,0.071723075327025,0.0949601653889411,0.0525642658980559,0.0642426935844325,3,3
+India,IND,1994,2973190,945601828,FALSE,0.00000296287108414522,0.0489728193226165,0.139542413560159,,,,,,0.118462298491981,0.120008481722203,0.07674512356146,0.0958145331789335,3,3
+India,IND,1995,2973190,963922586,FALSE,0.0000712775341894534,0.102868525079881,0.178351250221314,0.0638283573484639,,,,,0.136328931639526,0.157100542969502,0.0962896683646748,0.115031589259343,4,4
+India,IND,1996,2973190,982365248,FALSE,0.000123549696298505,0.118999640300665,0.198172919719572,0.0696761476757333,,,,,0.143482200252165,0.172828879945189,0.106090891528887,0.126246717043438,4,4
+India,IND,1997,2973190,1000900028,FALSE,0.000185208275477664,0.161705278472408,0.21084009420864,0.0725826536595771,,,,,0.149987704433402,0.184542182415177,0.119060187809901,0.142204454745141,4,4
+India,IND,1998,2973190,1019483586,FALSE,0.000357219398810349,0.115392445785008,0.211402930814383,0.0720672028628764,,,,,0.147859295956055,0.186370995228172,0.109415818963426,0.130422484958028,4,4
+India,IND,1999,2973190,1038058154,FALSE,0.000689465747165015,0.094978192067345,0.228101088415875,0.0757486611718887,,,,,0.146715212104241,0.201336618716671,0.109246523901303,0.129694671015036,4,4
+India,IND,2000,2973190,1056575548,FALSE,0.00130786740919867,0.169933896022159,0.26647400468353,0.0797764532346465,,,,,0.154179514956949,0.239454168180524,0.134334347261297,0.16083600809857,4,4
+India,IND,2001,2973190,1075000094,FALSE,0.00160859544978734,0.252229327826057,0.262231357027459,0.078791063418229,,,,,0.150719445996689,0.237871084115621,0.149115957943644,0.179902730339149,4,4
+India,IND,2002,2973190,1093317187,FALSE,0.00368459806807339,0.259549319091621,0.285792076446254,0.0799244510317887,,,,,0.167927696011761,0.256382189114739,0.1593756281299,0.190945913812478,4,4
+India,IND,2003,2973190,1111523146,FALSE,0.00397448027684755,0.194129211038388,0.34882751126923,0.0868211623131845,0.104150256570266,,0.327736339398754,,0.185829236729999,0.314288468541337,0.191219656837734,0.221760883604333,6,5
+India,IND,2004,2973190,1129623466,FALSE,0.00458245624139431,0.282123766571947,0.490954327406423,0.102537819070651,0.122127791289458,,0.316099074762344,,0.232661268108395,0.441304313202004,0.238159785360192,0.274945248343068,6,5
+India,IND,2005,2973190,1147609924,FALSE,0.00545090685593539,0.378743937447034,0.671245038218783,0.116087495220945,0.14748075478577,,0.333145004690212,,0.279151606734931,0.607117129008868,0.29730399819464,0.342849034620398,6,5
+India,IND,2006,2973190,1165486291,FALSE,0.00630548034975809,1.28195444106683,0.830527827697735,0.131826688725712,0.166658489002014,,0.287804456593689,0.0168902993983476,0.322800710073283,0.754642336590415,0.476869934084501,0.465986488741379,6,6
+India,IND,2007,2973190,1183209471,FALSE,0.00874481351085235,1.56626015866727,1.02297202031013,0.151165035847385,0.181933332811166,1.97645237093197,0.33836316376139,0.0220609460732386,,0.938973416518232,0.8439929271715,0.603364544173503,7,5
+India,IND,2008,2973190,1200669762,FALSE,0.00955576874640763,2.28899833273855,1.34153795274614,0.16195694260235,0.224171218503819,2.8558714107845,0.393522399663752,0.0903507137989544,,1.22547093626396,1.17524046788028,0.832059865013513,7,5
+India,IND,2009,2973190,1217726217,FALSE,0.0110137546771578,1.86125765205981,1.13245951052733,0.160506066181721,0.231840553039615,3.48549436590849,0.414667611300695,0.152966315784721,0.464807018351911,1.03878615343092,1.07574371128673,0.682165136184963,7,6
+India,IND,2010,2973190,1234281163,FALSE,0.0159170381176017,1.5409349857669,1.50490151135371,0.18322452185119,0.247754782007991,,0.488004813412719,0.317991103053838,0.525772890779442,1.36500909378978,0.70979262688026,0.736822901442312,6,6
+India,IND,2011,2973190,1250287939,FALSE,0.0210976713490677,1.72261998847348,1.89609820099213,0.195813313110442,0.260495940937034,6.49198026026212,0.300016425991388,0.360876316005962,0.525119059206632,1.70817878923532,1.59324927419789,0.80210398200387,7,6
+India,IND,2012,2973190,1265780243,FALSE,0.0229709925031409,1.12781412370134,1.91890805268263,0.20486756877752,0.260683643601847,7.86658366222808,0.256451906681211,0.412245196168626,0.464005581468659,1.73460299177762,1.69451455543465,0.699997894762495,7,6
+India,IND,2013,2973190,1280842119,FALSE,0.0251550164112508,1.02446208766615,1.9052045528903,0.22232057427034,0.266470513559325,8.2301103585121,0.244988324642114,0.692608799122899,0.5356890584839,1.72779323861773,1.74113285326802,0.741310347133855,7,6
+India,IND,2014,2973190,1295600768,FALSE,0.0272946585462009,1.566112615658,1.9025915360617,0.293309917599078,0.274852762995392,8.80070024913039,0.219926534102276,0.733431825565378,0.57820818421861,1.73441174137516,1.91259195647375,0.854233469753083,7,6
+India,IND,2015,2973190,1310152392,FALSE,0.0297906204443735,1.7248249388981,1.66194949587729,0.3106480771608,0.290462600841889,9.509733021261,0.242260491298757,1.0690693366677,0.640047577714123,1.52634216849998,2.01703631752206,0.918865431706577,7,6
+India,IND,2016,2973190,1324517250,FALSE,0.032631829221159,1.63929928685084,1.61050974062303,0.332778655067955,0.310947211140635,,0.196063437758478,3.38818872837841,0.690497649148433,1.48982187605529,0.750296766444981,1.28944160554323,6,6
+India,IND,2017,2973190,1338676779,FALSE,0.0356131797628319,1.67275499486617,1.86161194467951,0.356866487929155,0.341086582779844,8.07987254484269,0.191295323953706,6.5586394620635,0.781879520562971,1.71693473893342,1.85427057094243,1.87972842138482,7,6
+India,IND,2018,2973190,1352642283,FALSE,0.0388887478565761,1.73586529318446,2.0727427808718,0.391183171431356,0.359522039097097,,0.213318618980199,,,1.91488397394674,0.890399722464879,1.06381276438569,6,4
+India,IND,2019,2973190,1366417756,FALSE,0.0785987164422901,2.04628022706493,2.02581219004836,0.397093137475534,,,,,,1.87815401682536,1.13694606775778,1.44050912712194,4,3
+India,IND,2020,2973190,1380004385,FALSE,,0.353498613924671,1.67621263759231,,,,,,,1.57264257056837,1.01485562575849,0.963070592246522,2,2
+Ireland,IRL,1990,68890,3513974,FALSE,0,12.3040274169574,,,,,,,,,6.1520137084787,12.3040274169574,2,1
+Ireland,IRL,1991,68890,3534235,FALSE,0.0420957021123901,19.2948622921248,,,,,,,,,9.6684789971186,19.2948622921248,2,1
+Ireland,IRL,1992,68890,3558430,FALSE,0.124911851026512,20.6149849230194,,,,,,,16.6368626948303,,12.4589198229587,18.6259238089249,2,2
+Ireland,IRL,1993,68890,3576261,FALSE,0.205925476844905,15.9173431686862,,,,,,,15.7642958565361,,10.6291881673558,15.8408195126112,2,2
+Ireland,IRL,1994,68890,3590386,FALSE,0.407381821691926,15.8033677021216,,,,,,,17.9777504687567,,11.3961666641901,16.8905590854392,2,2
+Ireland,IRL,1995,68890,3608841,FALSE,0.804523076981898,27.512333045469,,24.7903628872026,,,,,20.0097790435127,,18.2792495132915,24.1041583253948,3,3
+Ireland,IRL,1996,68890,3637510,FALSE,1.58378320788713,40.3375549894352,,26.7891073284962,,,,,23.8228443872236,,23.1333224782606,30.3165022350517,3,3
+Ireland,IRL,1997,68890,3674171,FALSE,2.91469900688318,33.2879277379592,,28.5650917077857,,,,,29.2201920439555,,23.4969776241459,30.3577371632335,3,3
+Ireland,IRL,1998,68890,3712696,FALSE,5.7121123658175,100,,30.7357610563979,,,,,30.9887471048271,,41.8591551317606,53.908169387075,3,3
+Ireland,IRL,1999,68890,3754786,FALSE,7.62783641753074,100,,32.2838724604902,,,,,39.7625963566436,,44.9185763086661,57.3488229390446,3,3
+Ireland,IRL,2000,68890,3805174,FALSE,12.2882534900664,100,,33.2929692418819,,,,,48.774123868744,,48.5888366501731,60.6890310368753,3,3
+Ireland,IRL,2001,68890,3866243,FALSE,15.6771461960835,100,,33.2069573845318,,,,,56.7877789750588,,51.4179706389185,63.3315787865302,3,3
+Ireland,IRL,2002,68890,3931947,FALSE,17.2213814429723,100,,34.323483304319,,,,,64.3303919999053,,53.9688141867991,66.2179584347414,3,3
+Ireland,IRL,2003,68890,3996521,FALSE,22.4881491328911,100,,35.5409827254489,53.4907411384164,,56.8565083805965,,93.6004900061313,,61.6972260490135,71.4994952780442,5,4
+Ireland,IRL,2004,68890,4070262,FALSE,23.8054864219627,100,,36.8937335343527,53.0100037748964,,69.1184472127812,,100,,65.9635334338193,76.5030451867835,5,4
+Ireland,IRL,2005,68890,4159914,FALSE,26.2016389212673,100,100,39.2641337254195,56.0493103703855,,60.6925553775417,,100,100,71.0263880040381,79.9913378205922,6,5
+Ireland,IRL,2006,68890,4273591,FALSE,33.6016937357678,100,100,42.2077923987963,57.7616829215289,58.2054508431614,32.9149641588525,6.70232269864753,100,100,66.7042715909397,63.6375132093827,7,6
+Ireland,IRL,2007,68890,4398942,FALSE,36.41853213705,100,100,44.3078402174544,60.0540662894062,63.202862840476,50.015352585948,11.0926986732217,,100,65.6574312968214,61.0831782953248,7,5
+Ireland,IRL,2008,68890,4489544,FALSE,38.1234321307058,100,100,43.0294206554441,61.4076110280903,68.7494358736769,49.8093865284386,25.0742712964443,,100,66.6186125313776,63.5826156960654,7,5
+Ireland,IRL,2009,68890,4535375,FALSE,38.9164215238364,100,100,38.1295399028736,52.327862022448,59.4836633961481,40.558203491919,35.1900355118335,100,100,68.1554040449682,68.979629817771,7,6
+Ireland,IRL,2010,68890,4560155,FALSE,40.1237854796226,100,100,37.4295070004172,49.3865510038264,55.1154101855931,78.302806030153,35.1438127221448,100,100,72.9959298136837,75.1460209587858,7,6
+Ireland,IRL,2011,68890,4580084,FALSE,42.8317012491165,100,100,37.5133042926636,49.4552939707757,54.1015012219628,41.7372818395376,45.137203139069,100,100,68.0262555147543,70.7312982118784,7,6
+Ireland,IRL,2012,68890,4599533,FALSE,43.8067050140762,100,100,37.370520935737,49.7311176062744,54.7697372136489,53.3232865632698,47.4039826184228,100,100,69.8957499609617,73.0162983529049,7,6
+Ireland,IRL,2013,68890,4623816,FALSE,44.3288159665861,100,100,38.9844347524252,51.1567638658203,50.1077900575831,64.7439637900115,34.1242753813957,100,100,71.1664292238008,72.9754456539721,7,6
+Ireland,IRL,2014,68890,4657740,FALSE,46.9551543001115,100,100,40.3957665329615,54.4937318532211,50.6417754074081,45.6876168572184,40.9660285656796,100,100,69.0971875853856,71.1749019926433,7,6
+Ireland,IRL,2015,68890,4701957,FALSE,46.5152999992302,100,100,42.9430876549812,57.2336884617206,49.006965824786,42.1896353691349,46.0435976614062,100,100,68.664998406876,71.8627201142537,7,6
+Ireland,IRL,2016,68890,4755335,FALSE,45.996040984488,100,100,45.33240678958,61.8421666213353,53.155233972962,43.2330100709931,46.2984051193478,100,100,69.6738131168605,72.4773036633201,7,6
+Ireland,IRL,2017,68890,4807388,FALSE,45.8325732798435,100,100,46.7695967505602,62.939757800089,,30.0104530551501,48.0869587077497,100,100,70.4354371809256,70.8111680855767,6,6
+Ireland,IRL,2018,68890,4867316,FALSE,46.821519440967,100,100,48.8393086228072,65.7997545403056,,44.4614316879853,,,100,68.0244519503519,73.3251850776981,6,4
+Ireland,IRL,2019,68890,4934340,FALSE,46.1854895293106,100,100,49.9780228615056,,,,,,100,74.0408780977041,83.3260076205019,4,3
+Ireland,IRL,2020,68890,4994724,FALSE,48.2492883120158,,100,,,,,,,100,74.1246441560079,100,2,1
+"Iran, Islamic Rep.",IRN,1990,1628760,56366212,FALSE,0,0.325207495132579,1.76627328921202,,,,,,,1.55298139112506,0.697160261448201,0.939094443128818,3,2
+"Iran, Islamic Rep.",IRN,1991,1628760,57679025,FALSE,0,0.0308432882859661,2.06924548766996,,,,,,,1.80916776378129,0.70002959198531,0.92000552603363,3,2
+"Iran, Islamic Rep.",IRN,1992,1628760,58780376,FALSE,0,0.0292386823620905,1.99888633459849,,,,,,0.420962284753703,1.75261210618917,0.612271825428571,0.734271024434988,3,3
+"Iran, Islamic Rep.",IRN,1993,1628760,59723761,FALSE,0,0.249746580817838,1.74659248363235,,,,,,0.402947925256394,1.52610339703304,0.599821747426647,0.726265967702424,3,3
+"Iran, Islamic Rep.",IRN,1994,1628760,60590608,FALSE,0.0000176531901568726,0.00818032931513132,1.38815860818802,,,,,,0.363051487891795,1.22120069764642,0.439852019646276,0.53081083828445,3,3
+"Iran, Islamic Rep.",IRN,1995,1628760,61442658,FALSE,0.000178195040763224,0.0137453342523171,1.3034396225423,0.0879126232721347,,,,,0.380750441202034,1.16588298146647,0.357205243261909,0.412072845048238,4,4
+"Iran, Islamic Rep.",IRN,1996,1628760,62294919,FALSE,0.000665481252366463,0.0740144877030996,1.56696702073106,0.110285877375151,,,,,0.392489951385121,1.40551857918625,0.42888456368936,0.495577223912406,4,4
+"Iran, Islamic Rep.",IRN,1997,1628760,63136309,FALSE,0.00193987670552197,0.0924845130813033,1.38246511982403,0.145546793400176,,,,,0.447625774006737,1.2367773048458,0.414012415403553,0.480608596333505,4,4
+"Iran, Islamic Rep.",IRN,1998,1628760,63971836,FALSE,0.00408717328911214,0.0599117862570818,1.17062770321735,0.189961332773692,,,,,0.526518952278546,1.04313066549587,0.390221389563157,0.454880684201299,4,4
+"Iran, Islamic Rep.",IRN,1999,1628760,64800875,FALSE,0.0153030987480954,0.154859612847333,1.38589081763856,0.246189295646583,,,,,0.492303948800906,1.22119095548053,0.458909354736295,0.528635953193838,4,4
+"Iran, Islamic Rep.",IRN,2000,1628760,65623397,FALSE,0.0372899335485828,0.033412557094692,1.70336130068847,0.246972792075919,,,,,0.679736360385518,1.51036264885528,0.540154588758635,0.617621089602853,4,4
+"Iran, Islamic Rep.",IRN,2001,1628760,66449111,FALSE,0.0585092576774629,0.302376561727697,,0.254854744076151,,,,,0.669330873012247,,0.321267859123389,0.408854059605365,3,3
+"Iran, Islamic Rep.",IRN,2002,1628760,67284801,FALSE,0.18010268600181,2.30398810975437,,0.284711153545589,,,,,0.675296587807958,,0.861024634277432,1.08799861703597,3,3
+"Iran, Islamic Rep.",IRN,2003,1628760,68122947,FALSE,0.266617154373021,2.06228250098785,,0.274235711424442,0.42411506161655,,0.423563272715997,,0.711524196414908,,0.747644567183244,0.867901420385799,5,4
+"Iran, Islamic Rep.",IRN,2004,1628760,68951279,FALSE,0.284547376110064,1.99850620261867,,0.290832320680357,0.516114530106434,,0.941568485645514,,0.910773316716852,,0.885245540354292,1.03542008141535,5,4
+"Iran, Islamic Rep.",IRN,2005,1628760,69762345,FALSE,0.304143852172019,2.07704580365132,,0.327484870291775,0.553587275756302,1.83377909006963,1.08572530414858,100,1.00097035863536,,1.10485821316145,20.8982452673454,6,5
+"Iran, Islamic Rep.",IRN,2006,1628760,70554756,FALSE,0.325231727439502,1.53293272299543,,0.469452899219324,0.657649189446024,,0.408964328051512,,0.980549233129969,,0.743426182167148,0.84797479584906,5,4
+"Iran, Islamic Rep.",IRN,2007,1628760,71336476,FALSE,0.347739016477075,1.46103394927881,,0.376422456689769,0.680243874535824,,0.505603514434509,,,,0.672699734220042,0.781019973467697,5,3
+"Iran, Islamic Rep.",IRN,2008,1628760,72120608,FALSE,0.436576326585398,1.32703523998435,,0.341152690585317,0.591527578207673,,0.850180770162865,,,,0.738736256829482,0.83945623357751,5,3
+"Iran, Islamic Rep.",IRN,2009,1628760,72924833,FALSE,0.49569979251825,1.85179192707205,,0.351034103870989,0.670523336003712,,0.890263970180794,,0.999662101336864,,0.917690378995789,1.02318802561517,5,4
+"Iran, Islamic Rep.",IRN,2010,1628760,73762519,FALSE,0.564646289763159,2.3117546662398,,0.482406367236012,0.72007364505349,4.67550467890847,0.586769109221549,,1.41128770923454,,1.67206147010059,1.19805446298297,6,4
+"Iran, Islamic Rep.",IRN,2011,1628760,74634959,FALSE,0.666847298849798,2.66459768960421,,0.544460567648667,0.72828208151205,4.4377743469429,0.483258428171348,,1.24390465738871,,1.67347383143427,1.23405533570323,6,4
+"Iran, Islamic Rep.",IRN,2012,1628760,75539881,FALSE,0.788203271960652,3.49396143734508,,0.615112137505875,0.721641019867186,4.12328252320051,0.286481571023176,,1.30038157568157,,1.76790375278614,1.42398418038893,6,4
+"Iran, Islamic Rep.",IRN,2013,1628760,76481963,FALSE,1.02577685244698,1.85750983861762,,0.756027546228032,0.677535801218642,3.90609993315863,0.471587960849972,,1.10053908884464,,1.51959020335765,1.04641610863507,6,4
+"Iran, Islamic Rep.",IRN,2014,1628760,77465769,FALSE,1.33060758327083,1.19402325938581,,1.98479251139213,0.79809757437978,3.57159385857752,0.465598850157584,,1.13219394357358,,1.61313500105958,1.19415214112728,6,4
+"Iran, Islamic Rep.",IRN,2015,1628760,78492208,FALSE,1.51294081643767,1.21235711180375,,1.83361241640499,0.88590750968055,2.30780112060057,0.689265353058478,,1.24078025920573,,1.4661261795852,1.24400378511824,6,4
+"Iran, Islamic Rep.",IRN,2016,1628760,79563991,FALSE,1.75238150283631,1.91618071913017,,2.12830275341782,1.0363922590925,1.88109755043519,0.498652339728286,,1.38623898157786,,1.59380897452094,1.48234369846353,6,4
+"Iran, Islamic Rep.",IRN,2017,1628760,80673888,FALSE,2.07950694956908,2.76980363239014,,2.31900087853681,1.21437145135236,1.70684279938668,0.447083608676118,,1.58914656526226,,1.81856407230351,1.78125867121633,6,4
+"Iran, Islamic Rep.",IRN,2018,1628760,81800204,FALSE,2.24802592173185,1.31233731540485,,2.15755158168749,1.08318369427901,,0.440927665326763,,,,1.53971062103774,1.30360552080637,5,3
+"Iran, Islamic Rep.",IRN,2019,1628760,82913893,FALSE,2.45699667292495,0.842556024102615,,1.33284023153698,,,,,,,1.54413097618818,1.0876981278198,3,2
+"Iran, Islamic Rep.",IRN,2020,1628760,83992953,FALSE,2.6231575091897,,,,,,,,,,2.6231575091897,,1,0
+Iraq,IRQ,1990,437370,17419113,FALSE,0,0.0171466900859812,,,,,,,,,0.00857334504299062,0.0171466900859812,2,1
+Iraq,IRQ,1991,437370,17889457,FALSE,0,0.0188435378558593,,,,,,,,,0.00942176892792964,0.0188435378558593,2,1
+Iraq,IRQ,1992,437370,18402740,FALSE,0,0.000221645889307412,,,,,,,,,0.000110822944653706,0.000221645889307412,2,1
+Iraq,IRQ,1993,437370,18955087,FALSE,0,0.00185801401747888,,,,,,,,,0.000929007008739439,0.00185801401747888,2,1
+Iraq,IRQ,1994,437370,19539348,FALSE,0,0.0000673395810042957,,,,,,,,,0.0000336697905021479,0.0000673395810042957,2,1
+Iraq,IRQ,1995,437370,20149342,FALSE,0,,,0.0353233962092793,,,,,,,0.0176616981046396,0.0353233962092793,2,1
+Iraq,IRQ,1996,437370,20783073,FALSE,,0.00420798917431467,,0.0283568563299025,,,,,,,0.0162824227521086,0.0162824227521086,2,2
+Iraq,IRQ,1997,437370,21439579,FALSE,,0.00235869766542826,,0.00704594018656069,,,,,,,0.00470231892599448,0.00470231892599448,2,2
+Iraq,IRQ,1998,437370,22114330,FALSE,,0.0146525200278096,,0.0232663701505467,,,,,,,0.0189594450891782,0.0189594450891782,2,2
+Iraq,IRQ,1999,437370,22802061,FALSE,,,,0.0145294470225142,,,,,,,0.0145294470225142,0.0145294470225142,1,1
+Iraq,IRQ,2000,437370,23497589,FALSE,,0.000059729089989258,,0.0388717588049179,,,,,,,0.0194657439474536,0.0194657439474536,2,2
+Iraq,IRQ,2001,437370,24208178,FALSE,0.0108206410353332,0.0120589760388251,,0.062276886715409,,,,,,,0.0283855012631891,0.037167931377117,3,2
+Iraq,IRQ,2002,437370,24931922,FALSE,0.0525326535710824,0.000573483680102938,,,,,,,,,0.0265530686255927,0.000573483680102938,2,1
+Iraq,IRQ,2003,437370,25644503,FALSE,0.061287521366458,1.71027101781764,,,0.000997025215306311,,,,,,0.885779269592048,1.71027101781764,3,1
+Iraq,IRQ,2004,437370,26313838,FALSE,0.0895928613042706,0.500030253061953,,,0.00194145448543966,,,,,,0.294811557183112,0.500030253061953,3,1
+Iraq,IRQ,2005,437370,26922279,FALSE,0.0875680709763481,0.983975626629953,4.46915617022762,,0.0216057807758473,,,,,4.36321279288808,1.84689995594464,2.67359420975902,4,2
+Iraq,IRQ,2006,437370,27448124,FALSE,0.0908858740516727,1.09934750258704,4.81782753992429,,0.0236509809929184,,,0.000477160797821867,,4.66498620951523,2.00268697218767,1.92160362430003,4,3
+Iraq,IRQ,2007,437370,27911242,FALSE,0.0872808325618144,1.53947687197935,5.33188070275366,,0.135456591574832,,,0.000730335426311207,,5.18019108682807,2.31954613576494,2.24013276474458,4,3
+Iraq,IRQ,2008,437370,28385739,FALSE,0.0922815517529593,2.91917373129182,8.70428497891184,0.368304136545774,0.125384563728547,,,0.00118164162135945,,7.95134594764212,3.0210110996256,2.81000136427527,5,4
+Iraq,IRQ,2009,434320,28973157,FALSE,0.0958352189624681,2.52831908248507,7.09997631602279,0.527682204142977,0.417379927765791,,0,0.00191532562987131,,6.47637805055504,2.05036256432266,1.90685893256259,6,5
+Iraq,IRQ,2010,434320,29741977,FALSE,0.220183752628019,2.24309235835509,8.24277369207578,0.618566133301432,0.842176721957933,,0.121269588006786,0.00186294436983341,,7.38724152845967,2.28917710487342,2.07440651049856,6,5
+Iraq,IRQ,2011,434320,30725305,FALSE,0.426274050424316,3.49441462030197,10.5354541074117,0.595560141580405,1.05376680636103,,0,0.00227747481706482,,9.39008569871764,3.01034058394368,2.69646758708342,6,5
+Iraq,IRQ,2012,434320,31890012,FALSE,0.583201671491341,5.35000442965508,12.1389890018912,0.421763355847231,1.17684461136293,,0,0.00219023942139026,,10.8223538494356,3.69879169177697,3.31926237487185,6,5
+Iraq,IRQ,2013,434128,33157061,FALSE,0.726820039679794,3.38945693508605,11.985830514576,0.325354348014589,1.18642193895617,,0,,,10.6095255262431,3.28549236747128,3.58108420233595,6,4
+Iraq,IRQ,2014,434128,34411949,FALSE,1.0055615089517,13.2779227230255,11.041963687898,,1.65329881789977,,0,,,9.7723513659863,6.33136197996881,7.68342469633727,5,3
+Iraq,IRQ,2015,434128,35572269,FALSE,1.23712279121839,9.52076461875802,7.75246392297187,,1.85756181718636,,0,,,6.9017567922268,4.62758783323707,5.47417380366161,5,3
+Iraq,IRQ,2016,434128,36610632,FALSE,2.62587429691145,7.85903235518926,5.97272641952149,,2.29042018063438,,0,,,5.34562845140622,4.11440826790555,4.40155360219849,5,3
+Iraq,IRQ,2017,434128,37552789,FALSE,3.44308732951511,5.96835879682419,7.18233706759182,,2.07925066238161,0.505826269536198,0,18.3741616684066,0.93194008195725,6.41557789988734,3.00525825757076,6.33800768941508,6,5
+Iraq,IRQ,2018,434128,38433604,FALSE,,5.78969621036214,9.33044319890964,,2.09041505210813,,0.0938448888971562,,,8.38216436578982,5.07132809938964,4.75523515501637,4,3
+Iraq,IRQ,2019,434128,39309789,FALSE,,3.648208910468,9.88359232600189,,,,,,,8.88867094870978,6.76590061823495,6.26843992958889,2,2
+Iraq,IRQ,2020,434128,40222503,FALSE,,0.161925998531587,6.29869728360205,,,,,,,5.69837535761666,3.23031164106682,2.93015067807412,2,2
+Iceland,ISL,1990,100250,254826,TRUE,0,3.45600395477466,39.9724263462307,,,,,,,38.1489634089169,14.4761434336685,20.8024836818458,3,2
+Iceland,ISL,1991,100250,257797,TRUE,5.13262504864127,4.53856314630102,40.6048299154989,,,,,,,38.4060489702966,16.7586727034804,21.4723060582988,3,2
+Iceland,ISL,1992,100250,261057,TRUE,15.4441333191118,6.18096503681734,39.222260737343,,,,,,96.5810974154524,37.1938894817854,39.3571141271811,46.6519839780184,3,3
+Iceland,ISL,1993,100250,263725,TRUE,26.4984928950366,2.38368054115389,34.9088524361623,,,,,,98.2414591785618,33.1253143125353,40.5081212627286,44.583484677417,3,3
+Iceland,ISL,1994,100250,266021,TRUE,66.9077774357589,4.80281564692708,36.7518564493221,,,,,,,34.8302952554541,36.1541498440027,19.8165554511906,3,2
+Iceland,ISL,1995,100250,267468,TRUE,100,5.6078461780323,42.8800545238402,17.1212708602873,,,,,100,40.2333349131052,53.121834312432,40.7406129878562,4,4
+Iceland,ISL,1996,100250,268916,TRUE,100,23.9796679871175,47.4629209899199,18.6553292345139,,,,,100,44.2585831659135,58.0195836423103,46.7233950968862,4,4
+Iceland,ISL,1997,100250,271128,TRUE,100,33.0787777965058,47.6280721269956,19.0855860584557,,,,,100,44.3765411580715,59.9584871963914,49.1352262532583,4,4
+Iceland,ISL,1998,100250,274047,TRUE,100,36.6967137554524,53.9762062485549,21.3646501273874,,,,,100,50.2228240164246,62.407514026279,52.0710469748161,4,4
+Iceland,ISL,1999,100250,277381,TRUE,100,30.1935878185219,54.3156515706965,23.5603706344633,,,,,100,50.6108063538519,61.6139220047364,51.0911912017093,4,4
+Iceland,ISL,2000,100250,281205,TRUE,100,82.6188622791275,55.1680396060658,26.3935373193413,,,,,100,52.0714535345097,72.8360878409069,65.2709632832446,4,4
+Iceland,ISL,2001,100250,284968,TRUE,100,76.2671725656113,52.3105613855461,14.0235555591525,,,,,100,50.1970812163746,68.520257902062,60.1219523352846,4,4
+Iceland,ISL,2002,100250,287523,TRUE,100,66.2212986209233,54.6747853507695,13.3074203900751,,,,,100,52.3424179106685,66.8407008723536,57.9677842304167,4,4
+Iceland,ISL,2003,100250,289521,TRUE,100,100,65.1142805309654,14.6002162075653,42.4731116041775,,100,,100,63.7762418654888,79.9524161230885,75.6752916146108,6,5
+Iceland,ISL,2004,100250,292074,TRUE,100,100,80.6990911981838,16.8433314322681,52.5082470404194,18.4678977380859,100,100,100,81.5259598894816,73.7157600526483,83.061548553625,7,6
+Iceland,ISL,2005,100250,296734,TRUE,100,100,99.4272976707378,32.4630839231482,63.9751882289753,18.4460443521728,100,100,100,100,78.6194894208655,88.7438473205247,7,6
+Iceland,ISL,2006,100250,303782,TRUE,100,100,100,36.6685237935064,63.3945674885942,,100,5.31469692876656,100,100,89.4447539655844,73.6638701203788,6,6
+Iceland,ISL,2007,100250,311566,TRUE,100,100,100,38.9495608365768,60.2057816251014,47.0435518146527,100,5.18191457976691,,100,80.9988521085383,68.8262950832687,7,5
+Iceland,ISL,2008,100250,317414,TRUE,100,100,100,37.3134119542501,52.385848525845,51.5109763447196,100,11.5602357059506,,100,81.4707313831616,69.7747295320401,7,5
+Iceland,ISL,2009,100250,318499,TRUE,100,100,89.136717494578,31.3506791025636,48.3440004675944,51.6608028830783,100,46.0837498910698,100,100,81.7354570686028,79.5724048322722,7,6
+Iceland,ISL,2010,100250,318041,TRUE,100,100,98.284585159485,32.7708916629644,56.4289692214937,48.8184899683781,100,100,100,100,82.8391381129754,88.7951486104941,7,6
+Iceland,ISL,2011,100250,319014,TRUE,100,100,100,36.8977827277331,64.0940819472969,43.7815098859313,100,100,100,100,82.9541846590949,89.4829637879555,7,6
+Iceland,ISL,2012,100250,320716,TRUE,100,100,100,42.5351169478045,80.4916239821511,35.3370683153992,100,100,100,100,82.5531693233148,90.4225194913007,7,6
+Iceland,ISL,2013,100250,323764,TRUE,100,100,100,47.4626530541721,91.7033179274304,37.3911410521335,100,100,100,100,83.5505420151865,91.2437755090287,7,6
+Iceland,ISL,2014,100250,327386,TRUE,100,100,100,55.7316426771362,100,37.6066445464635,100,100,100,100,84.7626124605142,92.6219404461894,7,6
+Iceland,ISL,2015,100250,330815,TRUE,100,100,100,67.5290327765714,100,36.3391595889892,100,100,100,100,86.2668846236515,94.5881721294286,7,6
+Iceland,ISL,2016,100250,335439,TRUE,100,100,100,87.8926139008254,100,35.2530517828036,100,100,100,100,89.0208093833756,97.9821023168042,7,6
+Iceland,ISL,2017,100250,343400,TRUE,100,100,100,100,100,40.2015402193976,100,100,100,100,91.4573628884854,100,7,6
+Iceland,ISL,2018,100830,352721,TRUE,100,96.2977550598266,100,100,100,,100,,,100,99.2595510119653,99.0744387649566,6,4
+Iceland,ISL,2019,100830,360563,TRUE,100,93.0406508719605,100,94.7731364990744,,,,,,100,96.9534468427587,95.9379291236783,4,3
+Iceland,ISL,2020,100830,366425,TRUE,,43.2435605449887,99.5383384039105,,,,,,,90.0617850924045,71.3909494744496,66.6526728186966,2,2
+Israel,ISR,1990,21640,4660000,FALSE,0.0622682255849402,3.29789940056481,19.4544996872153,,,,,,,19.369300402317,7.60488910445502,11.3335999014409,3,2
+Israel,ISR,1991,21640,4949000,FALSE,0.113599423440193,5.99616758886257,19.1156119491063,,,,,,,18.8725120867042,8.40845965380302,12.4343398377834,3,2
+Israel,ISR,1992,21640,5123000,FALSE,0.158804608272558,9.99948676337563,20.4445174015535,,,,,,22.8928434054208,20.0608109383125,13.3739130446556,17.651047035703,3,3
+Israel,ISR,1993,21640,5261000,FALSE,0.198581249972813,10.1731988246919,21.9570677622126,,,,,,22.5301981001731,21.0822284200304,13.7147614842626,17.9285417816318,3,3
+Israel,ISR,1994,21640,5399000,FALSE,0.279931862790305,9.61178519217102,24.2251414380776,,,,,,24.0858993756116,23.1119194065741,14.5506894671626,18.9365346581189,3,3
+Israel,ISR,1995,21640,5545000,FALSE,0.439535509660575,17.1679113727013,27.3509890456304,10.4902651504736,,,,,27.7385150571754,26.2049479777305,16.6374432271282,20.4004098895202,4,4
+Israel,ISR,1996,21640,5692000,FALSE,0.997891014259514,17.045852241205,28.5239739831705,10.3815094097687,,,,,27.5606559435675,27.4940941314937,16.9019765183942,20.6205279315087,4,4
+Israel,ISR,1997,21640,5836000,FALSE,1.97466669967303,19.2127590742054,28.5400313627398,10.4104888207693,,,,,26.8332399620959,27.8081337544523,17.3942371838967,21.0661554028807,4,4
+Israel,ISR,1998,21640,5971000,FALSE,4.52171563078953,21.0201715110567,27.820510340886,10.5433256168581,,,,,27.733638669646,27.5924439382822,18.3278723538473,21.7223949339608,4,4
+Israel,ISR,1999,21640,6125000,FALSE,5.74622909270905,35.6543645699665,31.0109471169852,11.4404371905818,,,,,29.4251495638077,30.8283139399856,22.6554255068101,26.8370663160854,4,4
+Israel,ISR,2000,21640,6289000,FALSE,8.6943037554287,79.3828585075933,35.8920948334181,11.9784553938536,,,,,30.6134329871309,36.6670040684908,33.3122290954849,39.6604377392672,4,4
+Israel,ISR,2001,21640,6439000,FALSE,7.06988016286363,16.7466782012514,31.5752778626318,9.01660031112575,,,,,27.8216336524158,31.2510920540007,18.4460140380577,21.2090010546984,4,4
+Israel,ISR,2002,21640,6570000,FALSE,7.0828025421625,17.1117052509503,30.2139410047596,7.64436523141873,,,,,24.600726010036,29.5012534712106,17.3307080078654,19.7145124909039,4,4
+Israel,ISR,2003,21640,6689700,FALSE,7.67216820764394,35.4539943528089,31.7948715574937,5.9892666148468,7.51727670791631,,8.08735211735346,,24.7615637905937,31.1159907355909,18.9598694401234,21.0816335222388,6,5
+Israel,ISR,2004,21640,6809000,FALSE,8.75999888464772,48.2314284683896,37.5838644297708,9.13279908457758,8.08462714471164,,8.47536448182652,,28.7823631178139,36.0516157835025,23.4943030778377,26.134714187222,6,5
+Israel,ISR,2005,21640,6930100,FALSE,9.5229926423811,49.1347178835049,40.5683364715881,9.82019689057106,8.12440804545657,,6.76590018396053,,31.5776366621434,39.3628597935174,24.5649634556915,27.3322622827395,6,5
+Israel,ISR,2006,21640,7053700,FALSE,10.353987001645,100,43.0431645748375,9.55165106384318,8.97168923920749,,6.64734321914242,0.968730855270163,31.0548030525448,42.9636036670943,33.4418248186688,31.8643553096491,6,6
+Israel,ISR,2007,21640,7180100,FALSE,17.5583206911449,100,49.3943004777143,10.8960283723048,9.08920765177472,,8.53965182296264,1.46957686891107,,49.8010336638575,37.2776602728253,34.1412581456072,6,5
+Israel,ISR,2008,21640,7308800,FALSE,21.285425750944,100,55.669534996453,12.0338159446431,10.1887736161794,,13.3241471961234,2.00810693221515,,53.8370734117404,40.4625847776327,36.2406286969444,6,5
+Israel,ISR,2009,21640,7485600,FALSE,22.0879529078901,37.2523032852324,42.9353587650554,10.9478739161685,11.0617359864794,,12.527616988582,2.45087210356963,30.8249340610052,42.2765867740819,26.0960066539889,22.7133645214399,6,6
+Israel,ISR,2010,21640,7623600,FALSE,23.1930981260531,85.8822981263164,50.2933830741906,12.2889623574873,11.6781292270634,,15.6126122580947,3.85047492175923,31.2433615207203,49.0155655555253,36.4189525771437,32.9822124566505,6,6
+Israel,ISR,2011,21640,7765800,FALSE,23.2318304423905,90.6679037271273,57.7827972116093,12.120226289689,11.5491568076628,,10.2178192253909,18.9002773496694,31.2205433452395,56.0784545710084,37.5401867069078,36.5342040846874,6,6
+Israel,ISR,2012,21640,7910500,FALSE,23.4446857991624,62.6124604686212,56.6864034834946,12.0827758279828,11.1857163264236,,8.6630615825357,29.2234781152792,30.5058732856117,55.4479129255998,32.3325434079014,33.0892603676051,6,6
+Israel,ISR,2013,21640,8059500,FALSE,22.8325938504445,85.4401181837244,57.6777110282228,12.5044864281627,11.9372046203684,,17.0058064764932,24.130299400053,30.6183754326961,56.2864379680326,37.6798485666239,37.664253981527,6,6
+Israel,ISR,2014,21640,8215700,FALSE,23.9185349077254,56.4508369261764,57.4165431104197,12.4663334732652,12.9224091617405,,11.4143322820611,28.5845035290621,31.1945827460057,55.8706038641454,32.1435272409423,32.663532136786,6,6
+Israel,ISR,2015,21640,8380100,FALSE,24.1789781883036,100,51.7271619310167,13.0451257220376,13.5109580034994,,10.7600067341001,29.7752235669969,32.3350690049062,51.7818010949718,38.674390263394,39.6162043538354,6,6
+Israel,ISR,2016,21640,8546000,FALSE,24.4149039454971,100,52.7800587578347,14.001536461804,14.8393363620925,31.3970716074391,6.75272136166122,32.2028134727317,33.934930940139,52.5683568777701,37.6116032963393,39.910059852351,7,6
+Israel,ISR,2017,21640,8713300,FALSE,24.5257574355997,100,56.1690018231283,15.9759166445351,16.881953592176,27.2955315438723,6.62306551556319,32.4267564725411,35.1691675099998,55.9980215585167,37.9654914960998,41.0321546168593,7,6
+Israel,ISR,2018,21640,8882800,FALSE,24.6923642948707,100,59.9880388114402,17.5883896470349,18.7179383254705,,7.30877103518613,,,59.7071817515217,41.9155127577064,46.1510856084357,6,4
+Israel,ISR,2019,21640,9054000,FALSE,25.1092460087241,100,60.3381393241559,18.8953728089789,,,,,,60.1593878997491,51.0856895354647,59.6849202362427,4,3
+Israel,ISR,2020,21640,9216900,FALSE,,30.3328808922729,54.9260866238566,,,,,,,54.7976457809519,42.6294837580648,42.5652633366124,2,2
+Italy,ITA,1990,294110,56719240,FALSE,0.000810265264744571,10.7380151428805,18.3837011847456,,,,,,,18.0545649077289,9.70750886429697,14.3962900253047,3,2
+Italy,ITA,1991,294110,56758521,FALSE,0.00161821516314142,7.73962314728111,18.0955200972811,,,,,,,18.1232468380009,8.61225381990846,12.931434992641,3,2
+Italy,ITA,1992,294110,56797087,FALSE,0.00323086234435456,5.7199177266166,19.7740285883509,,,,,,5.19700743193684,20.2672551368114,7.67354615231217,10.3947267651216,3,3
+Italy,ITA,1993,294110,56831821,FALSE,0.00564449454833059,8.46269219874485,17.1216738001797,,,,,,5.44413695499563,17.9971458697022,7.75853686211713,10.6346583411476,3,3
+Italy,ITA,1994,294110,56843400,FALSE,0.00886185751671069,5.75239524395006,18.9568325195208,,,,,,5.92508720880961,19.3398645857921,7.66079420744929,10.3391156795172,3,3
+Italy,ITA,1995,294110,56844303,FALSE,0.0241658135841224,9.13942829849672,22.7344800557982,11.9032443530225,,,,,6.26451996547527,23.0251425738604,10.0131676972754,12.5830837977137,4,4
+Italy,ITA,1996,294110,56860281,FALSE,0.0471416502263943,9.4535875633705,23.8790299447886,12.7756331690628,,,,,6.7741791280215,24.4466775719247,10.5859142910939,13.3625193580949,4,4
+Italy,ITA,1997,294110,56890372,FALSE,0.104830907386882,10.8619330426516,23.5817787037447,20.9661851049971,,,,,6.99571187195992,24.4582354071637,12.502087926148,15.8205163566931,4,4
+Italy,ITA,1998,294110,56906744,FALSE,0.209833671457339,11.634006490459,24.2560729487168,21.5442103623063,,,,,6.89350341328563,25.5046212910955,12.907525377245,16.3940853892866,4,4
+Italy,ITA,1999,294110,56916317,FALSE,0.661742721979969,5.55149561857484,23.7344726245348,21.749966679053,,,,,7.27649063400078,25.0713170958546,11.7948336556287,14.9123175068708,4,4
+Italy,ITA,2000,294110,56942108,FALSE,1.06315828416695,15.1467722480752,24.4843949721751,22.8961975545528,,,,,8.18485912463864,25.1734553677568,14.3550764367217,17.8503210737559,4,4
+Italy,ITA,2001,294110,56974100,FALSE,1.25158259886051,24.054592384342,24.8034618915643,22.2950689323382,,,,,7.32558384318983,25.3435751773541,15.946057930059,19.754705084306,4,4
+Italy,ITA,2002,294110,57059007,FALSE,1.28726776464562,22.0943983116138,26.0060580141495,23.0389816646521,,,,,5.88730302042075,26.9124396173384,15.6628017550963,19.4832806535063,4,4
+Italy,ITA,2003,294140,57313203,FALSE,1.32726311660445,16.6192104037871,30.733698336194,23.1830870757594,11.5613287336272,,27.501000405071,,6.18283494063964,31.8210108834307,17.5911823796759,21.0614287417376,6,5
+Italy,ITA,2004,294140,57685327,FALSE,1.50942225941055,26.1653425015463,35.9214566002953,20.8216972586854,11.9170920498962,,21.0085294635132,,7.57425542993805,36.799911890873,18.8334505855648,22.4739473089112,6,5
+Italy,ITA,2005,294140,57969484,FALSE,1.58155283028062,67.3809519451549,38.22356527861,21.5069343449167,13.1488251511526,,23.7676182794307,,9.18404135023937,39.5170633401158,26.9407773381054,32.2713218519715,6,5
+Italy,ITA,2006,294140,58143979,FALSE,1.7115107794292,87.4680546966551,43.2063697871028,23.549434165326,13.8054505714896,,20.0984236789905,2.30430619061415,9.45807920666006,45.0010170600195,30.9153120523606,31.3132191663776,6,6
+Italy,ITA,2007,294140,58438310,FALSE,1.82839974216595,100,50.4883304812678,24.8267091685855,15.1894498438096,18.4558661613808,25.5519723462414,7.68120822485813,,52.9763422195529,36.8585463166069,42.2072463918476,7,5
+Italy,ITA,2008,294140,58826731,FALSE,1.98286466565416,57.5614094092461,54.1374554036319,25.8404665712956,14.4995476857149,20.7565845312887,25.3219456267897,9.69510808390908,,56.2058917005424,30.9334543679844,34.9249642783566,7,5
+Italy,ITA,2009,294140,59095365,FALSE,2.16445419160898,25.9585595382237,40.9363597982906,26.0089365272236,13.5056370844875,21.2522983953457,24.1692682620664,12.4185140158097,7.21404595463356,42.4896002818009,21.1005603810561,23.0431540966263,7,6
+Italy,ITA,2010,294140,59277417,FALSE,2.37212914802612,30.0829255867589,45.3119164436706,26.3385119511487,14.5115652837164,20.7393262307511,21.9045817571138,24.7608592608355,8.56665725302425,45.6037212560744,22.1880069100705,26.2095428441593,7,6
+Italy,ITA,2011,294140,59379449,FALSE,2.39937415152692,63.771394364555,51.6129996234469,26.283841092322,14.6796086178391,21.2320270963865,16.4002072547064,25.9542335343923,7.00001143433156,51.9909654748209,26.957122145325,31.900108859188,7,6
+Italy,ITA,2012,294140,59539717,FALSE,2.45626907349558,5.03243227828639,47.2002079956852,26.4473145950075,14.5349440692017,22.4585242266431,15.8714374119698,30.814747427208,7.5893234498764,46.8508973097942,18.1507870044234,22.1010254120237,7,6
+Italy,ITA,2013,294140,60233948,FALSE,2.54230338102485,28.9853280778526,47.175901914195,26.0948808971395,14.051569169667,21.6686861956205,17.6046638252137,9.74699277225496,6.62747834277616,46.8867332786004,21.5284632334032,22.6576795323062,7,6
+Italy,ITA,2014,294140,60789140,FALSE,2.39753081135652,27.0625531709633,47.5624927491141,26.5495780355352,14.2763184197257,16.9783487264845,19.6391971560283,10.8652320510081,6.51645568625619,47.4508470277011,20.9580223336769,23.0139771879153,7,6
+Italy,ITA,2015,294140,60730582,FALSE,2.50781582116858,20.9749937868574,41.2401234796866,27.6999498898792,14.9482570811421,16.9537605990469,22.8652009206739,12.0841331130711,7.00047459276863,40.6764653800621,19.8917598700116,21.883536280552,7,6
+Italy,ITA,2016,294140,60627498,FALSE,2.6495841252893,28.7345915266314,41.435371489922,28.5323019884475,16.0228728722056,17.6274600682982,10.8868735669317,14.5256379315879,8.39242145287591,41.031038144346,19.7512291740566,22.0171441018034,7,6
+Italy,ITA,2017,294140,60536709,FALSE,2.7294158261072,16.629228922287,45.9348917346617,30.0937728887777,16.532468417583,15.5624081748487,9.71159432303232,15.7597171803072,8.97959441066554,45.5814870847574,18.5201294686257,21.1258991349712,7,6
+Italy,ITA,2018,297730,60421760,FALSE,3.22492660065312,61.1254881403293,50.4808149361138,31.0457528379182,17.4558426714545,,14.0877088347337,,,49.9598771214244,31.9929382699496,39.0547067336014,6,4
+Italy,ITA,2019,297730,59729081,FALSE,3.33744346811429,47.0350396734117,48.7895746406204,32.0531387642276,,,,,,48.2225013967465,32.8037991365935,42.4368932781286,4,3
+Italy,ITA,2020,297730,59554023,FALSE,,3.50929461436582,42.3096728580478,,,,,,,41.3443651409579,22.9094837362068,22.4268298776619,2,2
+Jamaica,JAM,1990,10830,2419901,FALSE,0,3.16994285643992,4.56869319027369,,,,,,,4.55194656300638,2.57954534890454,3.86094470972315,3,2
+Jamaica,JAM,1991,10830,2439329,FALSE,0,3.07817002230001,4.37348790318555,,,,,,,4.30093185352019,2.48388597516185,3.6895509379101,3,2
+Jamaica,JAM,1992,10830,2461047,FALSE,0,3.39317500522095,4.36267624062575,,,,,,7.86111368489703,4.18877394743586,3.90424123268593,5.14768754585128,3,3
+Jamaica,JAM,1993,10830,2484583,FALSE,0,2.45722513372081,4.9385202211489,,,,,,8.236563880717,4.67748112532099,3.90807730889668,5.12375671325293,3,3
+Jamaica,JAM,1994,10830,2509042,FALSE,0.0384376463819217,1.41591215692134,5.82798462522895,,,,,,7.98749961419635,5.56369768921566,3.81745851068214,4.98903648677778,3,3
+Jamaica,JAM,1995,10830,2533705,FALSE,0.113194548784754,2.12050481618286,6.76437664924395,8.39858748622951,,,,,8.45321540648096,6.46497200249357,5.16997578138441,6.35931992784673,4,4
+Jamaica,JAM,1996,10830,2558631,FALSE,0.605204398512289,3.10263109246702,6.75891577108807,8.644355554371,,,,,11.2812676820674,6.32592044187978,6.07847489970115,7.3385436926963,4,4
+Jamaica,JAM,1997,10830,2583914,FALSE,0.808778649257097,2.79559829611977,6.95105540426287,8.94997279395911,,,,,14.2797890237169,6.55418632577822,6.75703883346316,8.14488660989351,4,4
+Jamaica,JAM,1998,10830,2608874,FALSE,1.98677057601015,6.00338185872085,6.84504739480146,8.84104940687949,,,,,15.4552033064307,6.48453084270208,7.82629050856853,9.19604135368328,4,4
+Jamaica,JAM,1999,10830,2632677,FALSE,2.34388007300673,8.67292932582,6.84237197684112,9.28713121087455,,,,,18.0818525136141,6.51256084260851,9.04563302003129,10.6386184732293,4,4
+Jamaica,JAM,2000,10830,2654698,FALSE,3.07444325449397,7.35528077772693,7.26765249755544,10.2030784555892,,,,,21.4254576993904,6.93801497374799,9.86518253695117,11.4804579766136,4,4
+Jamaica,JAM,2001,10830,2674706,FALSE,3.7832587236896,10.299400928659,7.14298118143189,9.61352143224968,,,,,22.4735807518136,6.93384968433556,10.6625486035688,12.3300881992645,4,4
+Jamaica,JAM,2002,10830,2692843,FALSE,5.93381354193483,7.82440258818389,7.14893746515851,9.61191890234955,,,,,24.8546293592763,7.07060955039175,11.0747403713806,12.3403901000504,4,4
+Jamaica,JAM,2003,10830,2709438,FALSE,7.54102671184248,12.3445938672681,7.4972955670841,11.1312553385019,13.7977647394795,,29.2863466669252,,25.1704171886248,7.33878993217566,15.4951558900411,17.0542805986991,6,5
+Jamaica,JAM,2004,10830,2725017,FALSE,9.61271082923334,9.28819396696893,8.09804597793959,11.210263374223,15.8165125059957,,9.26510956852052,,25.3016666639701,7.94983346724132,12.1293317301426,12.6030134081848,6,5
+Jamaica,JAM,2005,10830,2740000,FALSE,12.236987060202,11.1141393778309,8.75893246750795,11.592311115655,15.1333239949546,,17.1125419214835,,19.1646851863454,8.68652569980681,13.3299328548375,13.5340406602243,6,5
+Jamaica,JAM,2006,10830,2754414,FALSE,15.5965924869035,14.1384707702691,10.3985709883876,13.300195002239,16.3845248391548,,11.7851476487106,0.532766849981205,18.2967101770044,10.1480093999691,13.919281178919,11.3668833080289,6,6
+Jamaica,JAM,2007,10830,2768229,FALSE,19.9662054325426,13.8206154026333,11.8100140436223,12.6369966978152,15.8440767075559,69.6561011787829,13.0292591302862,0.530107493308667,,11.6318326590245,23.4865319809471,10.3297622766136,7,5
+Jamaica,JAM,2008,10830,2781869,FALSE,22.2223724426844,21.953889158731,13.4030910047367,12.4833246127859,15.3839733890922,100,12.9653743483151,0.527507737172121,,12.8994566640354,30.5046752612089,12.1659105042079,7,5
+Jamaica,JAM,2009,10830,2795839,FALSE,22.7671783083934,7.69560522120032,8.95801921131384,11.9603702986727,14.5899379761314,100,15.4807081407647,0.524871378450589,13.8247828209701,8.6930906174263,25.8123805716164,9.69657141291412,7,6
+Jamaica,JAM,2010,10830,2810464,FALSE,25.7896962131649,3.15390063593935,8.96594183391492,12.2395936369911,15.8885216687658,100,11.5501126062016,2.08889113468246,10.5884303137905,8.57730191841373,24.612525034286,8.03303837433645,7,6
+Jamaica,JAM,2011,10830,2825932,FALSE,34.7034892025558,3.13255455023705,10.3342713926915,13.225783535849,14.4813871884433,100,12.7632133303183,2.07745678811094,,9.75679145520884,29.0265520019419,8.19115993194483,7,5
+Jamaica,JAM,2012,10830,2842128,FALSE,31.1429431181819,7.76557087704713,10.430155367232,14.1292102729989,16.066809380434,100,7.61428893553837,2.19472571544165,,9.79117689246901,28.5136947618331,8.29899453869902,7,5
+Jamaica,JAM,2013,10830,2858710,FALSE,33.9953019297214,9.50478285552921,9.99404906873238,13.9112625376156,15.6529197654221,100,6.30843509362142,3.08050858655921,,9.38943905020888,28.9523052475367,8.43888562470687,7,5
+Jamaica,JAM,2014,10830,2875137,FALSE,36.8101270512932,9.78778654755609,9.9374186538524,14.8035631584064,16.5311052210069,100,8.78134888218582,4.11122569223627,,9.33740685734019,30.020040715549,9.36426622754495,7,5
+Jamaica,JAM,2015,10830,2891024,FALSE,38.2555268584171,14.5516612754682,9.10473623327138,15.5121733645187,16.5191005379515,100,6.23792347849291,11.047391854893,,8.73944015475305,30.6103368683614,11.2177180256252,7,5
+Jamaica,JAM,2016,10830,2906242,FALSE,39.9891319487449,18.0803567746625,8.82678090246673,16.0370325382397,17.01285821699,92.2426993912953,12.4105194863239,15.4035869381701,,8.60018504879968,31.2644201736222,14.1063361572392,7,5
+Jamaica,JAM,2017,10830,2920848,FALSE,49.3898280707519,13.8621453294166,9.98258060865511,17.7826544087576,17.268486261568,65.1707192816091,8.64392158752564,21.3567244996585,,9.49595157241704,27.4719748811193,14.2282794795551,7,5
+Jamaica,JAM,2018,10830,2934853,FALSE,60.8843325819426,11.7654447190111,11.2409355094976,17.8757752007202,18.2534454136366,,7.37371983666091,,,10.7763757258485,21.8280415695665,11.9478288705602,6,4
+Jamaica,JAM,2019,10830,2948277,FALSE,,16.5334631533752,11.6933957683648,17.4400263066376,,,,,,11.0898107348992,15.2222950761259,15.0211000649707,3,3
+Jamaica,JAM,2020,10830,2961161,FALSE,,0.0991279578537791,7.45664002361833,,,,,,,7.33558103834789,3.77788399073605,3.71735449810083,2,2
+Jordan,JOR,1990,88240,3565888,FALSE,0,0.85027119043147,4.08726632649885,,,,,,,3.7728171390519,1.64584583897677,2.31154416474169,3,2
+Jordan,JOR,1991,88240,3760493,FALSE,0,0.298196710509981,3.76170224924336,,,,,,,3.5969402335248,1.35329965325111,1.94756847201739,3,2
+Jordan,JOR,1992,88240,3977667,FALSE,0,0.486500583284901,4.21496943361152,,,,,,12.8335318033246,3.98215833413818,4.38375045505525,5.76739690691589,3,3
+Jordan,JOR,1993,88240,4201559,FALSE,0,0.903819770336484,4.17305643843562,,,,,,12.8300346874002,3.89691860841768,4.47672772404307,5.87692435538478,3,3
+Jordan,JOR,1994,88240,4410357,FALSE,0,0.258511807310999,4.01248282087769,,,,,,12.9420084656639,3.72099959466435,4.30325077346316,5.64050662254643,3,3
+Jordan,JOR,1995,88240,4588842,FALSE,0.0132627773522759,0.388094156615033,4.38146304794943,11.6598247045942,,,,,13.029132431313,4.05864727232049,5.89435542356479,7.28392464121069,4,4
+Jordan,JOR,1996,88240,4732848,FALSE,0.0248720500315573,0.545037627927935,4.60356708231878,11.0483345495508,,,,,13.7385794399546,4.25230754069074,5.99207814995675,7.39606478953103,4,4
+Jordan,JOR,1997,88240,4848536,FALSE,0.323801259980647,3.35384468019263,4.33267920804689,10.7746602504967,,,,,13.7589951341917,4.08851099271323,6.50879610658171,7.99400276439856,4,4
+Jordan,JOR,1998,88240,4943975,FALSE,0.691902415643334,2.76842230598401,4.27626191834698,11.7558850661394,,,,,11.189253802732,4.05316571139005,6.13634510176915,7.44168172156138,4,4
+Jordan,JOR,1999,88240,5031754,FALSE,1.31551250527365,1.41627003420801,4.06073306087242,11.5676779947906,,,,,11.3460069445738,3.94106757222769,5.9412401079437,7.06775563645003,4,4
+Jordan,JOR,2000,88240,5122495,FALSE,1.34145911593963,7.89302517719776,4.37124874387904,10.2552527641261,,,,,11.1765222050164,4.32519473818862,7.00750160123178,8.41249872113221,4,4
+Jordan,JOR,2001,88240,5217328,FALSE,2.3626152176711,2.56582424728694,4.5111589466097,11.1491929305245,,,,,10.0343710604446,4.40064334112914,6.12463248050738,7.03750789484631,4,4
+Jordan,JOR,2002,88240,5317514,FALSE,2.96825958504665,2.07887769422153,4.93823064280003,13.5982859384895,,,,,10.6092217347441,4.66852783303911,6.83857511906038,7.73872830012358,4,4
+Jordan,JOR,2003,88240,5434036,FALSE,4.08104237435077,4.44426846507707,5.21500909888889,13.0294608875799,5.50412593094332,,4.64619319435519,,11.264719829315,4.93158420130335,7.1134489749278,7.6632453155261,6,5
+Jordan,JOR,2004,88240,5580241,FALSE,5.47285329437432,7.50607407248176,6.64202824032892,15.2525031590277,6.08814753724997,,9.04892139285062,,12.9952248950633,6.17521924905802,9.4862675090211,10.1955885536963,6,5
+Jordan,JOR,2005,88240,5765639,FALSE,5.87573169921732,16.3372851317168,7.75657472216511,15.4636189677071,6.44540752268441,13.6932328622744,10.634650219005,100,12.7232077038857,7.20753078712562,11.7834716151388,27.0610488015734,7,6
+Jordan,JOR,2006,88240,5991547,FALSE,6.06264370848036,26.953449310747,8.61735309924196,17.6622693429288,7.47420822880353,11.8566324638384,6.621790711192,0.0765654476456006,12.6682290144575,8.07045496067444,12.9203382358409,12.0087931312742,7,6
+Jordan,JOR,2007,88240,6255290,FALSE,8.3752473269009,18.7224289835192,9.66663143564448,16.7446697435383,7.86196746810663,20.0758735560047,7.49579393838893,0.109702343823986,,9.13430808952431,13.5134408306661,10.4413806197589,7,5
+Jordan,JOR,2008,88240,6556473,FALSE,9.18909312662668,18.9950481821047,11.7448759469502,16.8073232926091,8.88322665622871,21.4268729833329,6.60134916556014,0.516457972236819,,10.8179270063819,14.1274271161973,10.7476211237785,7,5
+Jordan,JOR,2009,88780,6893258,FALSE,9.88015842536822,15.8141999795971,9.62201987216603,16.1041680474893,9.43658100364198,27.2527576161727,4.185884001205,1.14746340247901,12.5313574785562,8.8875116939579,13.6272207743649,9.77843076721409,7,6
+Jordan,JOR,2010,88780,7261541,FALSE,9.8119472379246,10.3695887980779,10.2894901817228,18.0426357858206,10.1261518009828,25.4213604764814,5.46368467385508,1.31372596049344,14.6049709482818,9.57707528640948,13.4290968717377,9.89528024215638,7,6
+Jordan,JOR,2011,88780,7662858,FALSE,11.930255458975,8.68212031246628,11.0280185018623,13.8604451164074,10.1708515209737,28.1054662992585,4.70685649831603,1.34068953618391,15.2039909077274,10.1094370741237,13.3595932992875,8.98392324087079,7,6
+Jordan,JOR,2012,88780,8089963,FALSE,11.9803714275648,8.42413127226992,11.1131382399242,11.8327256744293,9.53681711450198,28.533452148403,3.56668854707721,1.36061800121251,14.4707711381482,10.1811194224556,12.8458969211167,8.30600900926545,7,6
+Jordan,JOR,2013,88780,8518992,FALSE,12.7299654422242,10.1024946244768,10.8688244912418,9.81930931975528,9.32228205544772,26.2074042076912,4.23383106510406,2.58429041389594,14.0465269589863,9.98303301889339,12.5726223013542,8.4615809001853,7,6
+Jordan,JOR,2014,88780,8918822,FALSE,13.5690540709235,11.1227423152997,10.9523542133018,8.9295660129703,9.42644583609865,22.0804220890087,3.23522303487819,5.21649625554817,12.268691346674,10.0943253977266,11.7368647261509,8.47784072718284,7,6
+Jordan,JOR,2015,88780,9266573,FALSE,16.993167347642,7.57886182677963,9.59641404317498,6.30287712811162,8.85253643746445,16.2499095656265,7.39530661968007,8.9508727577296,10.7313437191795,8.82537731535324,10.6925543214563,8.29743989447228,7,6
+Jordan,JOR,2016,88780,9554286,FALSE,17.0812711746067,7.14373951628938,8.91915555431902,7.30566774087022,8.60154022951923,,3.39755118024263,18.2507884165138,11.1669016251343,8.20189420754844,9.16904779857705,9.2444237810998,6,6
+Jordan,JOR,2017,88780,9785840,FALSE,17.8784749890311,9.12664134073569,9.1937284219824,7.64173192610224,8.49213894660523,,1.84286545523803,24.2592268531691,11.2979107518485,8.45760544749277,9.49689214748967,10.4376636290977,6,6
+Jordan,JOR,2018,88780,9965322,FALSE,,4.23627858645423,9.19079062640896,7.82833333187475,8.62595120308528,,6.15289240568986,,,8.51845475740414,6.85207373760695,6.68398977035575,5,4
+Jordan,JOR,2019,88780,10101697,FALSE,,3.77181950081357,9.09618461045524,8.29384854896889,,,,,,8.48306377364416,7.0539508867459,6.84957727447554,3,3
+Jordan,JOR,2020,88780,10203140,FALSE,,,6.78600825755025,,,,,,,6.33384588858949,6.78600825755025,6.33384588858949,1,1
+Japan,JPN,1990,364600,123478000,FALSE,0.000430513108479513,18.6766083976233,,,,,,,,,9.3385194553659,18.6766083976233,2,1
+Japan,JPN,1991,364600,123964000,FALSE,0.000854495186992265,11.6481595019649,,,,,,,,,5.82450699857593,11.6481595019649,2,1
+Japan,JPN,1992,364600,124425000,FALSE,0.00203533178254385,7.07097406076216,,,,,,,5.9196344738353,,4.33088128879333,6.49530426729873,2,2
+Japan,JPN,1993,364600,124829000,FALSE,0.00842062718511458,4.96231919337392,,,,,,,5.91208508761207,,3.6276083027237,5.437202140493,2,2
+Japan,JPN,1994,364600,125178000,FALSE,0.0167342267861352,6.66034571821055,,,,,,,6.81975112024546,,4.49894368841405,6.740048419228,2,2
+Japan,JPN,1995,364600,125472000,FALSE,0.0332855334002984,7.92498255039732,,1.80352642056007,,,,,7.65325854825172,,4.35376326315235,5.79392250640304,3,3
+Japan,JPN,1996,364500,125757000,FALSE,0.0910878837099656,9.22146476232852,17.3863645069661,1.98191073722201,,,,,8.55169982905964,18.1237178390479,7.44650554385724,9.46969829191453,4,4
+Japan,JPN,1997,364500,126057000,FALSE,0.190409875665775,9.21115109736585,17.2348994856215,2.02431491194477,,,,,9.07414027279294,17.8078589909829,7.54698312867816,9.52936631827162,4,4
+Japan,JPN,1998,364500,126400000,FALSE,0.277989021957582,7.7437296684161,15.1160609539066,1.91223480353653,,,,,9.21239019567781,15.5667727106389,6.85248092869892,8.60878184456733,4,4
+Japan,JPN,1999,364500,126631000,FALSE,0.44249874084515,13.5224521136577,16.2230034240798,1.99354770764027,,,,,9.82619376762333,16.3782315899828,8.40153915076925,10.430106294726,4,4
+Japan,JPN,2000,364500,126843000,FALSE,0.619349477977133,19.2650441037344,18.6253265532945,2.16068683172416,,,,,10.9652694968901,18.7853460020403,10.3271352927241,12.7940866085972,4,4
+Japan,JPN,2001,364500,127149000,FALSE,0.793824288213323,13.9999677311126,16.3497139588303,2.00376405022082,,,,,9.65379022496023,16.5544066815059,8.56021205066746,10.5529821719499,4,4
+Japan,JPN,2002,364500,127445000,FALSE,0.957688257158321,14.6119263096831,16.3316568140101,2.0728838777536,,,,,9.76348441422663,16.1779734523366,8.74752793456636,10.6565670135,4,4
+Japan,JPN,2003,364500,127718000,FALSE,0.993401183510893,14.8475137572482,18.3568794816102,1.75894414614477,2.42008298572365,,6.18463026439584,,7.49227164184519,18.1059736647676,8.27227341245917,9.67786669488031,6,5
+Japan,JPN,2004,364500,127761000,FALSE,1.27926091251307,16.5265489588547,22.0915152574056,2.18251903029068,2.68372108865335,,5.81554811909145,,8.9661197420895,21.8253389307368,9.47691867004083,11.0632149562126,6,5
+Japan,JPN,2005,364500,127773000,FALSE,1.37195179792882,19.608462717477,24.1256337509911,2.29288561297867,2.86749834511594,,4.74233168154419,,8.75220315874351,24.1857932208433,10.1489114532772,11.9163352783173,6,5
+Japan,JPN,2006,364500,127854000,FALSE,1.40722773493261,20.7708682392412,26.3456399418789,2.36145761534324,2.94585584277384,,4.68290668537043,1.73982360036057,8.38552384502498,26.7372649185031,10.6589373436319,10.7796408173072,6,6
+Japan,JPN,2007,364500,128001000,FALSE,1.5205144269442,32.4214851817844,28.7126718820663,2.4321056953292,3.10169883094725,44.7237244880244,12.6236919179474,1.11699375587785,,29.4190772751379,20.405698932016,15.6026707652154,7,5
+Japan,JPN,2008,364500,128063000,FALSE,1.5422783724426,47.3542253631603,33.272630332674,2.30723106331796,3.1566791256817,5.52567113885724,16.1944390334909,1.5936033529734,,33.2244105489343,17.6994125506572,20.1347818723754,7,5
+Japan,JPN,2009,364500,128047000,FALSE,1.59565974463135,29.4239599657373,24.8088973818517,2.10810049274089,2.99388250420029,5.48034481897994,15.8302817018835,2.42464878800205,7.0661515222966,25.286929036075,12.3304850897316,13.6900119177892,7,6
+Japan,JPN,2010,364500,128070000,FALSE,1.59966841672329,29.8275421815666,31.35891533811,2.39342207185498,3.05453259884969,5.24017327488779,21.0657014006276,4.07600346192079,7.66522973092987,31.5599321840779,14.1643789163857,16.0979718384963,7,6
+Japan,JPN,2011,364500,127833000,FALSE,1.61993125913542,40.3776213144255,35.9426379369556,2.20447624119729,3.20498798651053,4.49426790505498,17.1828835594413,5.46285304600912,6.84264435461899,36.1710918479783,15.5234946529756,18.0402617272784,7,6
+Japan,JPN,2012,364500,127629000,FALSE,1.6315980949198,40.6117147507135,36.5226845049124,2.55408323330308,3.49953919819998,3.73395283010392,21.9297706845835,7.30617502974286,6.53215729968065,36.6850020701271,16.216565914031,19.2698171780251,7,6
+Japan,JPN,2013,364500,127445000,FALSE,1.81324519123594,57.2420207207202,33.8676167628001,2.65194821678421,3.5872779070821,2.89863859635513,17.8578139165491,8.37539373496166,6.99626418736877,34.6562898873382,17.6182210845448,21.296621777287,7,6
+Japan,JPN,2014,364500,127276000,FALSE,1.83391661234567,54.3350656056784,35.2196226705756,2.89208160208057,3.86750035176259,2.28174623108572,19.8652134369827,11.1027060897072,7.68502285493112,36.3158203340928,17.7303812876685,22.0326516539121,7,6
+Japan,JPN,2015,364500,127141000,FALSE,1.87606427575516,49.5600016788192,30.2735325051025,3.43356216037701,4.32052276580208,1.80030162614357,19.5742532710545,14.5368956215583,8.55606460872431,31.8518207925907,16.439111446568,21.252099688854,7,6
+Japan,JPN,2016,364500,126994511,FALSE,1.92205377054243,75.8292106409431,30.116191825318,3.93542103043189,4.86737444260584,1.64053825947382,15.2514477468136,15.6028041739686,9.67802394411714,32.2777010768881,19.7675553168057,25.4291014355271,7,6
+Japan,JPN,2017,364500,126785797,FALSE,1.89513230625862,66.6097421885749,32.6618840002675,4.46160152805785,5.17951963362433,,15.845513788856,16.7861637195566,10.4656745573857,34.8236143301266,21.9899247282334,24.8320516854263,6,6
+Japan,JPN,2018,364500,126529100,FALSE,1.88973238793447,64.3029183898742,35.498466135407,4.81302485106493,5.45132588839447,,17.1319101746213,,,37.9881745545702,24.7272103877804,31.0590069925327,6,4
+Japan,JPN,2019,364500,126264931,FALSE,1.92377586143288,100,34.7991746317761,4.99781511985625,,,,,,37.6611928989873,35.4301914032663,47.5530026729479,4,3
+Japan,JPN,2020,364500,125836021,FALSE,,59.6491074632391,30.5907296434896,,,,,,,33.4461345214448,45.1199185533644,46.5476209923419,2,2
+Kazakhstan,KAZ,1990,2699700,16348000,FALSE,0,,,,,,,,,,0,,1,0
+Kazakhstan,KAZ,1991,2699700,16451711,FALSE,0,,,,,,,,,,0,,1,0
+Kazakhstan,KAZ,1992,2699700,16439095,FALSE,0,0.266797230913487,,,,,,,,,0.133398615456743,0.266797230913487,2,1
+Kazakhstan,KAZ,1993,2699700,16380672,FALSE,0,3.40415805190029,,,,,,,,,1.70207902595015,3.40415805190029,2,1
+Kazakhstan,KAZ,1994,2699700,16145766,FALSE,0.0000845395654256773,1.79214599109837,,,,,,,,,0.8961152653319,1.79214599109837,2,1
+Kazakhstan,KAZ,1995,2699700,15816243,FALSE,0.00187189165951687,2.67459560171531,1.8094813334031,,,,,,,1.60218770598765,1.49531627559264,2.13839165385148,3,2
+Kazakhstan,KAZ,1996,2699700,15578227,FALSE,0.00535129408813163,3.20112064037578,2.21735826289084,0.156067089112403,,,,,,1.97332596187125,1.39497432161679,1.77683789711981,4,3
+Kazakhstan,KAZ,1997,2699700,15334405,FALSE,0.0110346575506578,3.78343676634638,2.49311805259799,0.223532348880919,,,,,,2.23332891246216,1.62778045634399,2.08009934256315,4,3
+Kazakhstan,KAZ,1998,2699700,15071640,FALSE,0.0227801494639032,3.37418945527307,2.30594911430857,0.20569244793255,,,,,0.555511851786272,2.07401189185574,1.29282460375287,1.55235141171191,4,4
+Kazakhstan,KAZ,1999,2699700,14928374,FALSE,0.0814666692282099,4.67312818685115,2.17767117972964,0.319164109725935,,,,,0.579361231574469,1.99492570539285,1.56615827542188,1.8916448083861,4,4
+Kazakhstan,KAZ,2000,2699700,14883626,FALSE,0.117670901918357,4.31081549251603,3.0826368423696,1.37220501089463,,,,,0.813951428022285,2.92006221592065,1.93945593514418,2.3542585368384,4,4
+Kazakhstan,KAZ,2001,2699700,14858335,FALSE,0.177376690663221,8.4439873050606,3.32061174249354,2.20030455280487,,,,,0.842001813346186,3.1565925966326,2.99685642087369,3.66072156696107,4,4
+Kazakhstan,KAZ,2002,2699700,14858948,FALSE,0.29524493909563,8.89390375352834,3.70776862092926,3.0055022389096,,,,,0.954873380448899,3.48300956295727,3.37145858658234,4.08432223396103,4,4
+Kazakhstan,KAZ,2003,2699700,14909019,FALSE,0.351468230227293,8.09913971968441,4.52386152506263,2.63607407859835,1.00434879275339,,,,1.25897488835235,4.29353900573075,3.373903688385,4.07193192309146,5,4
+Kazakhstan,KAZ,2004,2699700,15012984,FALSE,0.462443436225442,16.927724842483,6.63374535025774,3.47066758169468,1.16799536860793,,2.16220677219637,,1.09472170784101,6.34946744453435,5.12525161511637,6.00095766974988,6,5
+Kazakhstan,KAZ,2005,2699700,15147029,FALSE,0.512188473874141,8.60863630812818,8.88305905087497,3.49928894188725,1.30716596478879,5.89354352418627,1.19059562680487,100,1.33874576606014,8.82020149827564,4.27515109883083,20.5762446901927,7,6
+Kazakhstan,KAZ,2006,2699700,15308085,FALSE,0.559274886497079,24.4476386863747,11.7092593429479,6.66052444124233,1.77487772023929,6.60782287162231,1.8849110374275,0.0466313099895079,1.37785345761813,12.0260022782229,7.60675496053286,7.74059353514586,7,6
+Kazakhstan,KAZ,2007,2699700,15484192,FALSE,0.680068405968453,45.0797853756337,15.0829358028955,7.73018310578734,2.20519143679264,3.66271441471954,1.39760497569287,0.0946802235640097,,16.0100439177587,12.2722153467829,14.0624595196873,7,5
+Kazakhstan,KAZ,2008,2699700,15776938,FALSE,1.82635442113796,57.0529515569116,19.2600225059759,6.50258540810506,2.51193722032657,,1.1430599832798,0.511567129291217,,20.4590998228039,17.1569947750821,17.1338527800783,6,5
+Kazakhstan,KAZ,2009,2699700,16092822,FALSE,2.96247213663681,50.3336079314784,13.0473672363563,6.94106959454094,2.05408215653423,4.68173879952099,5.60311500571077,0.816185113621997,1.23144586721841,13.8837120410079,12.1144023673518,13.1348559255964,7,6
+Kazakhstan,KAZ,2010,2699700,16321872,FALSE,5.07145071014857,30.2221826071659,16.2352761692143,7.52763160342658,2.06622449788787,4.86230235192908,2.20979388718236,2.10501981866007,2.47065570415933,17.4201878471954,9.79989900474659,10.3259119112983,7,6
+Kazakhstan,KAZ,2011,2699700,16557202,FALSE,8.00531938634737,50.1654797379601,20.5466178769293,10.053855993981,2.43831638005195,7.79764713388034,1.74270860368668,7.09174595167779,3.16093943797537,22.1008913058336,14.4960811672514,15.7192701718524,7,6
+Kazakhstan,KAZ,2012,2699700,16792090,FALSE,9.65711684255855,40.3286361659825,21.9983951489964,11.015714760732,2.63919272597185,11.0967397691072,0.644374338863828,12.1428546225412,3.39822527809089,23.325548828164,14.0198860434759,15.1425589990624,7,6
+Kazakhstan,KAZ,2013,2699700,17035551,FALSE,9.73400581554667,30.8643629708207,21.8849547656724,12.1104587080675,2.91655271260241,11.6399037752687,0.635165360480086,12.7514237607525,4.4950424793393,22.8560456932684,13.0519848393136,13.9520831621214,7,6
+Kazakhstan,KAZ,2014,2699700,17288285,FALSE,10.0001638571967,25.2212137765162,19.888946889798,11.7914577311706,3.14383703744719,11.012246760985,3.12940002200678,19.9235040196722,4.33980554290552,20.7284249007372,12.1976049400827,14.1889676655014,7,6
+Kazakhstan,KAZ,2015,2699700,17542806,FALSE,10.5762782465973,24.7366493553688,13.0792622568749,12.2782109984985,3.20703867094647,10.463584733018,1.23359876315019,35.5877391997865,4.19405522478549,13.3885711554745,10.9373770826133,15.236470782844,7,6
+Kazakhstan,KAZ,2016,2699700,17794055,FALSE,10.9801313365149,51.0106813384899,10.5209747646627,11.1026240910763,3.05152396352091,8.90325526156683,0.405393520172586,37.3249550494633,4.33990649041223,11.3384506503925,13.8947095432708,19.2536685233345,7,6
+Kazakhstan,KAZ,2017,2699700,18037776,FALSE,11.0988373348993,13.7845598976944,12.6335749457545,12.0954732447992,3.32389883062765,6.36077316004979,2.19953780722581,39.4862075273232,5.28512265378587,13.7565878879345,9.06541129202984,14.4345815031272,7,6
+Kazakhstan,KAZ,2018,2699700,18276452,FALSE,11.3089368362406,11.3333018171315,14.972055464121,12.9165679784791,3.37997715658708,,1.18408013676745,,,16.252609209934,10.3429884465479,10.421639785578,6,4
+Kazakhstan,KAZ,2019,2699700,18513673,FALSE,11.5847780586086,13.0251245624816,15.3066604845693,12.6112832672024,,,,,,16.5692948065927,13.1319615932155,14.0685675454256,4,3
+Kazakhstan,KAZ,2020,2699700,18754440,FALSE,12.0038200466179,3.17875039544602,12.5408295795756,,,,,,,13.1253175921873,9.24113334054652,8.15203399381668,3,2
+Kenya,KEN,1990,569140,23724574,FALSE,0,0.106342769254777,0.465044648285785,,,,,,,0.43164778793388,0.190462472513521,0.268995278594329,3,2
+Kenya,KEN,1991,569140,24521714,FALSE,0,0.0340384268934764,0.40885101969525,,,,,,,0.382286462472015,0.147629815529576,0.208162444682746,3,2
+Kenya,KEN,1992,569140,25326080,FALSE,0,0.0111839972501005,0.374908579682298,,,,,,0.618090895863805,0.344715999271019,0.251045868199051,0.324663630794975,3,3
+Kenya,KEN,1993,569140,26136217,FALSE,0,0.249102607214817,0.756853066103118,,,,,,0.665985028229671,0.672707098000894,0.417985175386901,0.529264911148461,3,3
+Kenya,KEN,1994,569140,26950508,FALSE,0,0.0136649100661944,0.850325957826217,,,,,,0.812612329272479,0.754368453143277,0.419150799291223,0.526881897493983,3,3
+Kenya,KEN,1995,569140,27768297,FALSE,0.0000686259074631829,0.0847294295709251,0.785104843271158,0.424648222322414,,,,,0.849820603098261,0.69869342411573,0.428874344834044,0.514472919776833,4,4
+Kenya,KEN,1996,569140,28589456,FALSE,0.000809874988055766,0.170947863820426,0.751090892278724,0.424731950995888,,,,,0.838037949486978,0.664387995313032,0.437123706314014,0.524526439904081,4,4
+Kenya,KEN,1997,569140,29415660,FALSE,0.00306387699403312,0.101463200423246,0.890580159300359,0.411935642840766,,,,,0.757677428628769,0.787089812618675,0.432944061637435,0.514541521127864,4,4
+Kenya,KEN,1998,569140,30250488,FALSE,0.0043522835987999,0.0560700214189571,0.986113502840413,0.357558327838603,,,,,0.823537242249471,0.872074671715358,0.445526275589249,0.527310065805597,4,4
+Kenya,KEN,1999,569140,31098763,FALSE,0.00962389999530955,0.107911241364082,0.949563157074042,0.377062525224658,,,,,0.977131540847041,0.83649863398911,0.484258472901026,0.574650985356223,4,4
+Kenya,KEN,2000,569140,31964557,FALSE,0.0260648402907618,0.152187525675169,0.45681202203388,0.392653060500996,,,,,1.27171645445344,0.40099687565375,0.459886780590849,0.554388479070838,4,4
+Kenya,KEN,2001,569140,32848569,FALSE,0.0494239878920935,0.00709335607417234,0.481922665099344,0.366144843805197,,,,,1.43694716236742,0.421988928685294,0.468306403047646,0.558043572733022,4,4
+Kenya,KEN,2002,569140,33751746,FALSE,0.0937355829739938,0.0455256937228654,0.469657630932172,0.358827579674947,,,,,1.49156865749713,0.410890054665424,0.491863028960222,0.576702996390092,4,4
+Kenya,KEN,2003,569140,34678781,FALSE,0.222218186722951,0.106000926188163,0.510931834394113,0.399989960538168,1.41989217119239,,3.43219419421954,,1.5674359561656,0.446300571492754,1.03979517637142,1.19038432172085,6,5
+Kenya,KEN,2004,569140,35635267,FALSE,0.22225373993082,0.0621296417469126,0.611846945937117,0.462507704338265,1.44321650808919,,2.53035658277606,,1.92849068073501,0.534850880596939,0.96959754924403,1.10366709803864,6,5
+Kenya,KEN,2005,569140,36624897,FALSE,0.221853432775434,0.037002071628481,0.760030008176238,0.489110087421804,1.38040273782937,,4.0376547458738,,2.31775093761014,0.666490887824565,1.31056688058098,1.50960174607176,6,5
+Kenya,KEN,2006,569140,37649039,FALSE,0.250474604498356,0.0869426489122156,0.869157022656897,0.515130526882573,1.30132161680023,,2.49081337055455,0.0127703364549917,2.43623896739892,0.762436579033002,1.10812619015058,1.05072207153937,6,6
+Kenya,KEN,2007,569140,38705934,FALSE,0.297776361302321,0.866947959873447,1.0322587595138,0.568816983600339,1.40296052611445,1.75038462935959,3.07509207272484,0.00628204010607274,,0.915608492054148,1.26521279439572,1.08654950967177,7,5
+Kenya,KEN,2008,569140,39791984,FALSE,0.342312567812336,0.153594105993651,1.22970839465497,0.365806517711892,1.47696770086834,0.5717709406442,1.99410867627361,0.0151654580713987,,1.0842109616365,0.776216867181777,0.722577143937411,7,5
+Kenya,KEN,2009,569140,40901798,FALSE,0.390663223648614,0.173978626675948,1.0673745802125,0.44108131031603,1.62950216756258,2.29337048202824,4.23273006898793,0.300875477498574,2.54059427788572,0.941303179005432,1.59139893853643,1.43842715672827,7,6
+Kenya,KEN,2010,569140,42030684,FALSE,0.448725895265858,0.187456634478081,1.25801903866556,0.463589535673925,1.82023468559498,3.07389814392297,2.40277613194028,0.352761055575434,2.57908816977853,1.10981288203072,1.4876505071036,1.18258073491283,7,6
+Kenya,KEN,2011,569140,43178270,FALSE,0.533866326155623,1.56067347850951,1.43546619719592,0.511437370948113,2.03497784171819,3.69316530254497,2.17185009333931,0.899654216752754,2.97991270457858,1.27649969540916,1.84091021046743,1.5666712599229,7,6
+Kenya,KEN,2012,569140,44343469,FALSE,0.620261361307394,1.60085755295876,1.55091477115853,0.467277742070013,2.07475584389155,4.09542837750786,1.22006601376765,5.43888837455818,2.8997102630676,1.39251617513715,1.77921658311969,2.16988602025989,7,6
+Kenya,KEN,2013,569140,45519986,FALSE,0.748094266845083,1.26935939588999,1.51800714363561,0.404190501966846,2.02425264497343,3.32844136144311,1.82241571510672,5.89115734171856,2.71473555782296,1.37446658555419,1.68646342038719,2.24605418300988,7,6
+Kenya,KEN,2014,569140,46700063,FALSE,0.92551097206184,0.84154134020789,1.59512583147817,0.349718540855876,1.87006654716797,2.86572178511676,1.15849863970118,7.82777183618301,2.9165333950488,1.46747310647249,1.52180721492436,2.42692280974487,7,6
+Kenya,KEN,2015,569140,47878339,FALSE,0.907540980665548,0.789371925530201,1.39097616443449,0.29819665144528,1.8202542267599,3.11722603052047,2.18464390800236,13.0985165545539,2.74214272252962,1.24730848809227,1.63287119758971,3.3933633750256,7,6
+Kenya,KEN,2016,569140,49051531,FALSE,0.886483414895585,0.747689263695495,1.24860699893146,0.330407240223485,1.87071237330695,3.10094959674706,2.13239259793179,12.8752884319301,2.81053309327375,1.1318261934369,1.60815174367123,3.33802280341526,7,6
+Kenya,KEN,2017,569140,50221146,FALSE,0.929842047353332,1.32982475072645,1.38460382620836,0.349044381099814,2.19700569011709,2.67456924544702,0.64636469418033,13.389619609411,2.56523267356185,1.27421353795921,1.41135451693959,3.25904994115644,7,6
+Kenya,KEN,2018,569140,51392570,FALSE,0.993915284450703,1.52786896956427,1.45587263727443,0.47720772038127,2.37514645204004,,2.4563454484842,,,1.33723133615991,1.38224201203097,1.44966336864741,6,4
+Kenya,KEN,2019,569140,52573967,FALSE,1.12429940559795,1.28171207378974,1.43001330702397,0.471997201988931,,,,,,1.33363327158884,1.07700549710015,1.02911418245584,4,3
+Kenya,KEN,2020,569140,53771300,FALSE,,,,,,,,,,,,,0,0
+Kyrgyz Republic,KGZ,1990,191800,4391200,FALSE,0,,,,,,,,,,0,,1,0
+Kyrgyz Republic,KGZ,1991,191800,4463600,FALSE,0,,,,,,,,,,0,,1,0
+Kyrgyz Republic,KGZ,1992,191800,4515400,FALSE,0,,,,,,,,,,0,,1,0
+Kyrgyz Republic,KGZ,1993,191800,4516700,FALSE,0,0.0971041916603659,0.414944326038508,,,,,,,0.188814290749991,0.170682839232958,0.142959241205179,3,2
+Kyrgyz Republic,KGZ,1994,191800,4515100,FALSE,0,0.370855755207865,0.428031114339108,,,,,,,0.196458824876838,0.266295623182324,0.283657290042351,3,2
+Kyrgyz Republic,KGZ,1995,191800,4560400,FALSE,0,0.924133001108904,0.584859676306993,,,,,,,0.518274677495272,0.502997559138632,0.721203839302088,3,2
+Kyrgyz Republic,KGZ,1996,191800,4628400,FALSE,,0.447630674872311,0.795506926862511,,,,,,,0.704886026475383,0.621568800867411,0.576258350673847,2,2
+Kyrgyz Republic,KGZ,1997,191800,4696400,FALSE,,0.782783747492429,0.731128323810469,,,,,,,0.661717274570264,0.756956035651449,0.722250511031346,2,2
+Kyrgyz Republic,KGZ,1998,191800,4769000,FALSE,0.0399916078519812,1.21259152017883,0.737784752746521,0.737256797208558,,,,,,0.678580747155758,0.681906169496474,0.876143021514383,4,3
+Kyrgyz Republic,KGZ,1999,191800,4840400,FALSE,0.110783674037989,0.457325766913713,0.578341046538154,0.412647498202521,,,,,,0.534410153286972,0.389774496423094,0.468127806134402,4,3
+Kyrgyz Republic,KGZ,2000,191800,4898400,FALSE,0.556902154916244,0.0614238456159039,0.568155068421369,0.427584178068081,,,,,,0.533863139809664,0.4035163117554,0.340957054497883,4,3
+Kyrgyz Republic,KGZ,2001,191800,4945100,FALSE,1.5906948039673,0.0985077663418094,0.518193309408429,0.487403170906209,,,,,,0.475891795945636,0.673699762655936,0.353934244397885,4,3
+Kyrgyz Republic,KGZ,2002,191800,4990700,FALSE,1.5742311261744,0.0409700629888308,0.620473839866515,0.443990582007726,,,,,,0.559417304844234,0.669916402759369,0.348125983280264,4,3
+Kyrgyz Republic,KGZ,2003,191800,5043300,FALSE,2.03020546668142,0.396078781585852,0.744510386151932,0.822333181713655,1.0933398604925,,,,,0.668594114031142,0.998281954033214,0.629002025776883,5,3
+Kyrgyz Republic,KGZ,2004,191800,5104700,FALSE,2.61213444878268,1.88498532498304,0.94280700122805,0.945691116718516,1.46286461198849,,,,,0.860639692764729,1.59640447292807,1.23043871148876,5,3
+Kyrgyz Republic,KGZ,2005,191800,5162600,FALSE,5.34480346774387,0.361614567073924,1.0595877532901,0.749176091407892,1.70851930949165,,,,,0.963834859314858,1.87879546987894,0.691541839265558,5,3
+Kyrgyz Republic,KGZ,2006,191800,5218400,FALSE,6.17769762232109,1.52984662480751,1.60186466770243,1.78172492471744,1.28016567285316,,,,,1.44231425445217,2.77278345988712,1.58462860132571,5,3
+Kyrgyz Republic,KGZ,2007,191800,5268400,FALSE,6.9758000526384,1.73942981644961,2.36885845627203,3.81697759189056,1.53551877782006,,,,,2.11523780121361,3.72526647931265,2.55721506985126,5,3
+Kyrgyz Republic,KGZ,2008,191800,5318700,FALSE,7.73230990061849,3.10980672682336,3.30306376922874,10.6237574342471,1.63204331630494,3.67108984236558,,,,2.99425680494536,5.68800553465664,5.57594032200525,6,3
+Kyrgyz Republic,KGZ,2009,191800,5383300,FALSE,7.7854997271547,1.54508053434088,2.61022665928576,10.8415140538957,1.8546668187657,4.06022754381307,4.01998472754329,,,2.3604434161326,5.14375554100556,4.69175568297811,7,4
+Kyrgyz Republic,KGZ,2010,191800,5447900,FALSE,7.83742812716171,3.94790382867735,2.59933403386266,5.72032290195802,2.04411514694826,11.146518678635,0.662052772131885,,,2.44640251325426,5.31892672373778,3.19417050400538,7,4
+Kyrgyz Republic,KGZ,2011,191800,5514600,FALSE,8.31264293784747,5.48443242678267,3.50038396126095,13.4052275894882,2.69542835334908,10.3510303018197,0,,,3.32904041736277,6.8422862028665,5.55467510840841,7,4
+Kyrgyz Republic,KGZ,2012,191800,5607200,FALSE,9.24984035578809,2.16713705911676,4.24349342021706,15.1943287236738,2.9870440521388,29.3656184910865,0,,,3.78918369221168,10.036736341647,5.28766236875056,7,4
+Kyrgyz Republic,KGZ,2013,191800,5719600,FALSE,10.5336109132131,4.74709959390526,4.38513984068575,17.2596258005284,4.01468772218571,30.6669717670004,1.26120613235097,,,4.01314455625271,11.4756090079473,6.82026902075934,7,4
+Kyrgyz Republic,KGZ,2014,191800,5835500,FALSE,12.7035018772784,3.42413929912311,3.99693784086186,15.7801733087197,4.86614431583945,,1.23615707216084,,2.42640621346254,3.62243881195619,6.59455260193441,5.29786294108447,6,5
+Kyrgyz Republic,KGZ,2015,191800,5956900,FALSE,13.3007982187223,9.41703558779233,2.9158212440594,16.3293329876386,4.29207838620521,22.18834041211,0.60548226381126,,,2.65229760836998,10.792801785689,7.25103711190305,7,4
+Kyrgyz Republic,KGZ,2016,191800,6079500,FALSE,15.942225771076,4.75760208900014,2.81441097991164,16.0599497149899,4.11113500127846,15.8106312657388,0,,2.06999035399908,2.58904532584455,8.20783002495936,5.09531749676674,7,5
+Kyrgyz Republic,KGZ,2017,191800,6198200,FALSE,16.143657361471,0.964342216785347,2.9476602424228,17.6652415827452,3.92519185280475,10.5444758400655,1.16382088261021,,4.23485388003432,2.72551115067868,7.66629314373348,5.35075394257074,7,5
+Kyrgyz Republic,KGZ,2018,191800,6322800,FALSE,,1.03479070925021,3.25138375725624,26.4855099963584,3.45198621436202,,1.14088609391323,,,2.94714874390227,7.97814263919452,7.90208388585603,5,4
+Kyrgyz Republic,KGZ,2019,191800,6456200,FALSE,,2.35092715659058,3.25171497611644,26.0059656277128,,,,,,3.11259341770432,10.5362025868066,10.4898287340026,3,3
+Kyrgyz Republic,KGZ,2020,191800,6591600,FALSE,,1.20357947667515,2.34290668289036,,,,,,,2.13355350121578,1.77324307978276,1.66856648894547,2,2
+Cambodia,KHM,1990,176520,8975597,FALSE,0,,,,,,,,,,0,,1,0
+Cambodia,KHM,1991,176520,9289298,FALSE,0,,,,,,,,,,0,,1,0
+Cambodia,KHM,1992,176520,9623899,FALSE,0,0.150391089740118,0.16834139027802,,,,,,,0.0689528666127142,0.106244160006046,0.109671978176416,3,2
+Cambodia,KHM,1993,176520,9970727,FALSE,0,0.238079654129682,0.189781607261746,,,,,,,0.156010443453127,0.142620420463809,0.197045048791404,3,2
+Cambodia,KHM,1994,176520,10317901,FALSE,0,0.292878228046059,0.296851262529768,,,,,,,0.256647050382812,0.196576496858609,0.274762639214436,3,2
+Cambodia,KHM,1995,176520,10656145,FALSE,0,0.620669555198752,0.494102029686793,0.284685658398337,,,,,,0.434096744226449,0.34986431082097,0.446483985941179,4,3
+Cambodia,KHM,1996,176520,10982919,FALSE,,1.1724585378977,0.422989503856537,0.328157830172929,,,,,,0.377987736070498,0.641201957309057,0.626201368047044,3,3
+Cambodia,KHM,1997,176520,11298594,FALSE,0.00135509141359749,0.790725689883384,0.421970584160452,0.282392789874733,,,,,,0.369671226221587,0.374111038833042,0.480929901993235,4,3
+Cambodia,KHM,1998,176520,11600510,FALSE,0.00368630129384898,0.843228720576042,0.455306630997268,0.342025663769961,,,,,,0.413351566427043,0.41106182915928,0.532868650257682,4,3
+Cambodia,KHM,1999,176520,11886464,FALSE,0.00704529720028838,0.8233738494145,0.63523823777984,0.424720503240377,,,,,,0.578344573862777,0.472594471908751,0.608812975505884,4,3
+Cambodia,KHM,2000,176520,12155241,FALSE,0.0101334779811577,0.512047588798572,0.775816424197591,0.5052430250622,,,,,,0.710413927145105,0.45081012900988,0.575901513668626,4,3
+Cambodia,KHM,2001,176520,12405411,FALSE,0.0162497520515237,0.533342722166374,0.846839487451535,0.627223210771265,,,,,,0.770959463550071,0.505913793110175,0.643841798829237,4,3
+Cambodia,KHM,2002,176520,12637719,FALSE,0.0470478938438129,0.482676713060051,0.940275510828643,0.798303589501464,,,,,,0.857370866623509,0.567075926808493,0.712783723061675,4,3
+Cambodia,KHM,2003,176520,12856171,FALSE,0.0530918913065706,0.30308483108024,1.04160412149834,0.71762532087149,2.0714651494294,,1.68329931079664,,,0.942261042245575,0.759741095110657,0.911567626248487,6,4
+Cambodia,KHM,2004,176520,13066475,FALSE,0.0602295410978139,0.475494672821453,1.29106643351087,1.20158425961193,2.54327484241369,,1.38017227190091,,,1.16836273084676,0.881709435788596,1.05640348379526,6,4
+Cambodia,KHM,2005,176520,13273355,FALSE,0.0626230574262268,1.26705810620243,1.52710855079665,1.81982248889696,2.66887921781228,,1.63039290245637,,,1.39192641668886,1.26140102115573,1.52729997856115,6,4
+Cambodia,KHM,2006,176520,13477705,FALSE,0.0910281892091904,1.59973254401683,1.86353383447275,2.24017285495695,3.00321059220315,,,,,1.69449569301059,1.44861685566393,1.84480036399479,5,3
+Cambodia,KHM,2007,176520,13679953,FALSE,0.093826727391644,2.78410894234232,1.73303695791259,2.67235024920114,3.01342809373777,,2.10924543223053,0.0143735308806388,,1.59493930566098,1.87851366181565,1.83500349206312,6,5
+Cambodia,KHM,2008,176520,13883835,FALSE,0.096222320541334,2.6398794381621,1.87851795123524,2.54558870455971,2.9894476970273,,1.8184875490872,0.0501048268032741,,1.7366964641442,1.79573919271712,1.7581513965513,6,5
+Cambodia,KHM,2009,176520,14093605,FALSE,0.0985074026527977,2.94787771952962,1.81441533069509,2.15514151390748,2.90561451989546,,4.09467675280787,0.208177223298307,,1.65944029511301,2.22212374391857,2.21306270093126,6,5
+Cambodia,KHM,2010,176520,14312205,FALSE,0.230610507161116,4.36652244792247,2.25056007180251,2.5559306129108,2.79903339654614,,1.00803399540387,0.256272633031782,,2.06584665716332,2.08233152704015,2.05052126928645,6,5
+Cambodia,KHM,2011,176520,14541421,FALSE,0.558431540630103,4.72946321068093,2.84167392922755,2.99931749487525,2.94990705039019,,1.48821657689326,0.302699728283396,,2.60535537512686,2.52342055046142,2.42501047717194,6,5
+Cambodia,KHM,2012,176520,14780454,FALSE,0.875496206700958,6.00679348810931,3.18356081183459,3.59515285313988,3.15622954822079,,2.19622317932018,0.34745487662543,,2.938521800239,3.17144530782098,3.01682923948676,6,5
+Cambodia,KHM,2013,176520,15026330,FALSE,1.04595601557047,6.2192296308722,3.66683572601215,4.10706363675965,3.61414975717092,,0.960127269212721,0.412390024408112,,3.38838586688846,3.19984245568544,3.01743928562823,6,5
+Cambodia,KHM,2014,176520,15274506,FALSE,2.40091041870964,5.55767300241827,4.09412572137534,4.34014125548874,4.0106579937431,16.3008536882752,1.88905476736062,1.08650359719179,,3.79279274600488,5.76379314227131,3.33323307369286,7,5
+Cambodia,KHM,2015,176520,15521435,FALSE,3.03777587358005,5.39870022564101,4.45452119757736,4.67022631607646,4.05594200588689,12.8482723128788,3.25325346285071,2.50568863156074,1.01760248652676,4.11983831285375,4.9543359821616,3.49421823925157,7,6
+Cambodia,KHM,2016,176520,15766290,FALSE,5.38281977971092,7.10753445240815,4.69740027858412,4.96520329762825,4.25488309759983,11.5706152600673,0.915065572762469,4.47223024687953,0.954686508809725,4.34220006615295,5.08476073571013,3.79282002410685,7,6
+Cambodia,KHM,2017,176520,16009413,FALSE,5.38318444471836,7.95283974838876,5.11258694104613,5.57876975948256,5.05697662503606,9.24079605442027,0.675876866434259,7.95105527263385,1.50466448694298,4.73119936733751,5.06410261449048,4.73240091686999,7,6
+Cambodia,KHM,2018,176520,16249795,FALSE,10.4780527063762,9.00565071711166,5.95933420670214,6.12568107918237,5.91917191967328,,3.32939335292903,,,5.52913183503348,6.97962241246028,5.99746424606414,6,4
+Cambodia,KHM,2019,176520,16486542,FALSE,12.4364621901429,10.0156628668615,6.7995099376157,6.37148429448686,,,,,,6.32974868930675,8.90577982227675,7.57229861688505,4,3
+Cambodia,KHM,2020,176520,16718971,FALSE,12.3461562620954,0.333194236513308,6.24029598552896,,,,,,,5.75336627214475,6.30654882804589,3.04328025432903,3,2
+Kiribati,KIR,1990,810,72394,TRUE,0,0.181601542470965,1.88107369362038,,,,,,,2.26915917199811,0.687558412030447,1.22538035723454,3,2
+Kiribati,KIR,1991,810,73692,TRUE,0,0.254524031716714,1.93604924246506,,,,,,,2.31697541659893,0.730191091393925,1.28574972415782,3,2
+Kiribati,KIR,1992,810,74767,TRUE,0,0.238667934036926,2.42296782007252,,,,,,,2.68946024637584,0.887211918036482,1.46406409020638,3,2
+Kiribati,KIR,1993,810,75711,TRUE,0,0.445927153793448,2.11415747170518,,,,,,,2.34354405523702,0.853361541832875,1.39473560451524,3,2
+Kiribati,KIR,1994,810,76668,TRUE,0,0.26266230097308,2.11467144091392,,,,,,,2.37065029808399,0.792444580629,1.31665629952853,3,2
+Kiribati,KIR,1995,810,77716,TRUE,0,0.260624489895694,,,,,,,,,0.130312244947847,0.260624489895694,2,1
+Kiribati,KIR,1996,810,78904,TRUE,,0.342770268275998,,,,,,,,,0.342770268275998,0.342770268275998,1,1
+Kiribati,KIR,1997,810,80188,TRUE,,0.340987949060514,,,,,,,,,0.340987949060514,0.340987949060514,1,1
+Kiribati,KIR,1998,810,81558,TRUE,19.8022136600672,0.287154017068808,,,,,,,,,10.044683838568,0.287154017068808,2,1
+Kiribati,KIR,1999,810,82969,TRUE,38.2516839622818,0.289897589726479,,2.97078420868336,,,,,,,13.8374552535639,1.63034089920492,3,2
+Kiribati,KIR,2000,810,84405,TRUE,55.4038564141768,0.435323987504922,,1.92713691583618,,,,,,,19.2554391058393,1.18123045167055,3,2
+Kiribati,KIR,2001,810,85844,TRUE,71.3262087580166,0.192573775764337,,2.050471324115,,,,,,,24.5230846192986,1.12152254993967,3,2
+Kiribati,KIR,2002,810,87308,TRUE,75.0068734415659,0.180067196362394,,16.6256733953563,,,,,,,30.6042046777616,8.40287029585937,3,2
+Kiribati,KIR,2003,810,88840,TRUE,88.4561022931505,0.395179842589057,,17.7883893798917,7.11625711118637,,,,,,35.5465571718771,9.09178461124039,4,2
+Kiribati,KIR,2004,810,90498,TRUE,100,1.01811163930194,,8.5761356116491,6.9587564656076,,,,,,36.531415750317,4.79712362547552,4,2
+Kiribati,KIR,2005,810,92319,TRUE,100,1.31063099393821,,6.60420301490065,6.31698270933769,,,,,,35.9716113362796,3.95741700441943,4,2
+Kiribati,KIR,2006,810,94341,TRUE,100,0.267764770471536,2.67164710934035,1.38922487226857,10.6244575909825,,,,,3.45900251913059,26.0821591880201,1.70533072062356,5,3
+Kiribati,KIR,2007,810,96531,TRUE,100,0.527690006948269,3.28951652809683,4.06334546678829,8.8598220148922,,,,,4.27203045970982,26.9701380004584,2.9543553111488,5,3
+Kiribati,KIR,2008,810,98760,TRUE,100,0.574884673472852,3.3997464353521,,5.35883006388007,,,0.148508462944479,,4.62795569405822,34.6582103696083,1.78378294349185,4,3
+Kiribati,KIR,2009,810,100928,TRUE,100,2.19292231090337,3.24311416107238,,2.54789891843876,,0,0.145316017679733,,4.04491435116876,26.3590091179939,1.59578816993797,5,4
+Kiribati,KIR,2010,810,102930,TRUE,100,2.83879969595383,3.29517992550995,,5.66554587357103,,35.0412639395443,0.142487444861099,,4.5167419427105,35.293810890252,10.6348232557674,5,4
+Kiribati,KIR,2011,810,104735,TRUE,100,0.174163166098208,4.19199188898971,,7.29972567478767,,0,0.315206108551122,,5.1686525356868,26.091538763772,1.41450545258403,5,4
+Kiribati,KIR,2012,810,106359,TRUE,100,1.0116875829282,4.4889119433173,,4.81448233858095,,0,0.344891803534201,,6.02286512064606,26.3751498815614,1.84486112677712,5,4
+Kiribati,KIR,2013,810,107887,TRUE,100,0.404533954859815,4.36924735208383,,4.74626443276738,,0,0.680122134348416,,6.30438217982445,26.1934453267359,1.84725956725817,5,4
+Kiribati,KIR,2014,810,109387,TRUE,100,1.1140459196268,4.56667003239403,0.920302218652452,6.87715103944183,,32.9728148436039,1.00624689583178,,7.24874472536215,27.9147666028554,8.65243092061541,6,5
+Kiribati,KIR,2015,810,110927,TRUE,100,0.372393269808822,4.53556885644274,0.896554131696218,6.95842219414317,,0,0.264525392532291,,7.45422555629655,21.1609032515896,1.79753967006678,6,5
+Kiribati,KIR,2016,810,112529,TRUE,100,0.75128076959578,4.91071587142734,0.81899739109061,6.94645907218721,0.0802809509566565,0,0.652061434736598,,7.12087585282212,17.7602124971784,1.86864308964902,7,5
+Kiribati,KIR,2017,810,114153,TRUE,100,0.349299728828346,4.72371635389127,0.796683420630666,7.36294700813616,0.101319551268631,31.5961674007455,2.0571508478876,,7.46363740100435,22.9278644092274,8.45258775981929,7,5
+Kiribati,KIR,2018,810,115842,TRUE,,0.479198805404372,3.92372002175132,0.942346362965927,8.29237935431113,,0,,,6.61350850132585,1.3363162975304,2.00876341742404,5,4
+Kiribati,KIR,2019,810,117608,TRUE,,0.250250280028801,4.27558059718559,1.23805013068642,,,,,,7.30889038619447,1.92129366930027,2.93239693230323,3,3
+Kiribati,KIR,2020,810,119446,TRUE,,,3.4813096810868,,,,,,,5.93765284493042,3.4813096810868,5.93765284493042,1,1
+St. Kitts and Nevis,KNA,1990,260,40260,TRUE,0,53.1463459602042,12.8688675393741,,,,,,,11.8383061302397,22.0050711665261,32.492326045222,3,2
+St. Kitts and Nevis,KNA,1991,260,40381,TRUE,0,23.2954955880196,13.6799724663032,,,,,,,12.5942658790232,12.3251560181076,17.9448807335214,3,2
+St. Kitts and Nevis,KNA,1992,260,40691,TRUE,0,13.5051400925315,14.1099896831306,,,,,,,13.1477240905893,9.20504325855405,13.3264320915604,3,2
+St. Kitts and Nevis,KNA,1993,260,41141,TRUE,0,14.6682881606334,15.0300251680773,,,,,,,13.9711059343865,9.89943777623691,14.31969704751,3,2
+St. Kitts and Nevis,KNA,1994,260,41618,TRUE,0,16.1746167723502,15.3155587153757,,,,,,,14.3563473431623,10.4967251625753,15.2654820577562,3,2
+St. Kitts and Nevis,KNA,1995,260,42077,TRUE,0,21.3373339984703,16.678811056252,58.606237461737,,,,,,15.825246991269,24.1555956291148,31.9229394838254,4,3
+St. Kitts and Nevis,KNA,1996,260,42472,TRUE,100,36.3227887129136,18.2438855055535,49.1944653286092,,,,,,17.0531208620171,50.9402848867691,34.1901249678466,4,3
+St. Kitts and Nevis,KNA,1997,260,42857,TRUE,100,20.1302882249305,18.954989502377,54.9884939112834,,,,,,17.9619566550476,48.5184429096477,31.0269129304205,4,3
+St. Kitts and Nevis,KNA,1998,260,43225,TRUE,100,32.3942345720015,18.8826493083156,70.2585792351561,,,,,,18.2389302819681,55.3838657788683,40.2972480297086,4,3
+St. Kitts and Nevis,KNA,1999,260,43622,TRUE,100,58.0507910809687,19.4469684753227,62.935571033606,,,,,,19.0245790040643,60.1083326474743,46.670313706213,4,3
+St. Kitts and Nevis,KNA,2000,260,44083,TRUE,100,95.7260258487764,21.847820568091,68.064377689349,,,,,,21.0967451775214,71.4095560265541,61.6290495718822,4,3
+St. Kitts and Nevis,KNA,2001,260,44602,TRUE,100,86.8830604580136,21.3751616309971,90.9679766450185,,,,,,20.7908667576305,74.8065496835073,66.2139679535542,4,3
+St. Kitts and Nevis,KNA,2002,260,45168,TRUE,100,77.4599387018414,21.9039195168521,64.5466849882812,,,,,,21.4700449108954,65.9776358017437,54.492222867006,4,3
+St. Kitts and Nevis,KNA,2003,260,45749,TRUE,100,72.488527720713,22.2283006640315,65.5856858191228,100,,100,,,22.0042201272082,72.0605028407735,65.019608416761,6,4
+St. Kitts and Nevis,KNA,2004,260,46323,TRUE,100,52.8049539921274,22.7156149542067,100,100,,,,,22.3500419984512,68.8801422365835,58.3849986635262,5,3
+St. Kitts and Nevis,KNA,2005,260,46852,TRUE,100,87.0539136193533,26.1352260157106,94.6370949516429,100,,,,,25.4279738408057,76.9565586466767,69.039660803934,5,3
+St. Kitts and Nevis,KNA,2006,260,47333,TRUE,100,100,28.405440614218,89.8256412938722,100,100,,,,27.497793485608,83.6462163816181,72.4411449264934,6,3
+St. Kitts and Nevis,KNA,2007,260,47769,TRUE,100,100,29.307936276777,96.3806501015549,100,100,,,,28.3313226544602,85.1377172756664,74.9039909186717,6,3
+St. Kitts and Nevis,KNA,2008,260,48178,TRUE,100,100,33.6969904363603,100,100,100,,,,31.8773242620835,86.7393980872721,77.2924414206945,6,3
+St. Kitts and Nevis,KNA,2009,260,48599,TRUE,100,100,26.8938407419443,100,100,100,0,,,25.9300094223554,71.1489734569907,56.4825023555889,7,4
+St. Kitts and Nevis,KNA,2010,260,49011,TRUE,100,100,28.2107373929572,100,100,100,0,,,26.6186548479473,71.3684562321595,56.6546637119868,7,4
+St. Kitts and Nevis,KNA,2011,260,49442,TRUE,100,97.2530724217885,29.5343133705862,100,100,,72.9500687127806,,,27.6669666730492,79.9474909010311,74.4675269519046,6,4
+St. Kitts and Nevis,KNA,2012,260,49881,TRUE,100,81.2617892835959,29.2891893939851,100,100,,72.3080390789539,,,27.0959890501986,76.571803551307,70.1664543531871,6,4
+St. Kitts and Nevis,KNA,2013,260,50328,TRUE,100,96.5494928740265,32.2480832829045,100,100,,100,,,29.2847043280453,85.7595152313862,81.458549300518,6,4
+St. Kitts and Nevis,KNA,2014,260,50776,TRUE,100,100,51.9238935101694,100,100,47.6182991669833,100,,,50.4538489957249,83.2570321128588,87.6134622489312,7,4
+St. Kitts and Nevis,KNA,2015,260,51204,TRUE,100,100,49.906752024096,100,100,84.7807423235387,100,,,48.4663585187007,89.1145823912725,87.1165896296752,7,4
+St. Kitts and Nevis,KNA,2016,260,51629,TRUE,100,100,49.5786238149686,100,100,68.0747368606531,0,,,47.923789555341,69.608893445937,61.9809473888352,7,4
+St. Kitts and Nevis,KNA,2017,260,52036,TRUE,100,35.3892559584296,48.6697712360311,100,100,42.1744363536816,0,,,46.9479629599834,54.3722439246904,45.5843047296033,7,4
+St. Kitts and Nevis,KNA,2018,260,52438,TRUE,,78.644023131509,54.3764164892859,100,100,,68.7821293202887,,,52.1927018287066,75.4506422352709,74.9047135701261,5,4
+St. Kitts and Nevis,KNA,2019,260,52834,TRUE,,76.593261337016,57.6039589988525,100,,,,,,55.1244285078715,78.0657401119562,77.2392299482959,3,3
+St. Kitts and Nevis,KNA,2020,260,53192,TRUE,,,35.6596484658466,,,,,,,33.9567686501284,35.6596484658466,33.9567686501284,1,1
+"Korea, Rep.",KOR,1990,96460,42869283,FALSE,0.00142158767112246,2.22910419748987,8.11773223363837,,,,,,,7.38912687282274,3.44941933959979,4.8091155351563,3,2
+"Korea, Rep.",KOR,1991,96460,43295704,FALSE,0.00279062414500812,3.08603852874604,9.20363303427179,,,,,,,8.34541975207269,4.09748739572095,5.71572914040937,3,2
+"Korea, Rep.",KOR,1992,96460,43747962,FALSE,0.00589211897171976,2.38333662612118,9.57448462274855,,,,,,5.59027689024117,8.64914700059142,4.38849756452065,5.54092017231792,3,3
+"Korea, Rep.",KOR,1993,96460,44194628,FALSE,0.0148146948699147,2.25851944160867,10.259084087877,,,,,,9.21483745713172,9.23933945049007,5.43681392037182,6.90423211641016,3,3
+"Korea, Rep.",KOR,1994,96460,44641540,FALSE,0.0182699709747174,3.66137733053967,12.1288221237852,,,,,,10.186216604952,10.9040167257185,6.4986715075629,8.25053688707006,3,3
+"Korea, Rep.",KOR,1995,96460,45092991,FALSE,0.0476161111874204,6.18168308576697,15.8669578501479,2.03842805957422,,,,,12.1998265650253,14.3064158905567,7.26690233434035,8.68158840023079,4,4
+"Korea, Rep.",KOR,1996,96460,45524681,FALSE,0.0934582476009275,7.45286335576089,17.0114487076722,2.22215259574568,,,,,14.0361669950315,15.346265898152,8.16321798036223,9.76436221117252,4,4
+"Korea, Rep.",KOR,1997,96460,45953580,FALSE,0.20525556081091,7.36087458532706,17.2975893757977,2.23232827618527,,,,,15.3952332486341,15.6262421536747,8.498256209351,10.1536695659553,4,4
+"Korea, Rep.",KOR,1998,96460,46286503,FALSE,0.383801521381924,9.674072234387,13.9429503400157,1.9189039610884,,,,,12.0510871260483,12.7832148623058,7.59416303658425,9.10681954595737,4,4
+"Korea, Rep.",KOR,1999,96460,46616677,FALSE,1.32344275248553,13.8243005782627,15.6389420893174,2.34440104085004,,,,,14.1763842106769,14.3353835304511,9.46149413431851,11.1701173400602,4,4
+"Korea, Rep.",KOR,2000,96460,47008111,FALSE,2.49086286200864,15.2561173989251,20.0168827948584,2.79726380424922,,,,,15.9116460211553,18.3365214144844,11.2945545762393,13.0753871597035,4,4
+"Korea, Rep.",KOR,2001,96740,47370164,FALSE,3.1298724321435,8.57901162809681,17.6997698383915,2.87870848525299,,,,,14.8736160258308,16.3030984029328,9.43219568194312,10.6586086355284,4,4
+"Korea, Rep.",KOR,2002,96790,47644736,FALSE,3.26577766175313,8.20415950081987,19.0255946898034,3.17801773520153,,,,,15.9030988642404,17.4032762804012,9.91532969036367,11.1721380951658,4,4
+"Korea, Rep.",KOR,2003,96800,47892330,FALSE,3.58253488165285,11.0157877809238,22.3970548190351,3.00152641680445,3.63320723512975,,12.0496866109368,,15.795119198299,20.4047044766722,11.306951617942,12.4533648967272,6,5
+"Korea, Rep.",KOR,2004,96820,48082519,FALSE,3.96061194495999,18.6902008932996,28.5737627490794,3.69832628765879,4.18703119301037,,12.3020750380561,,16.7792945327292,26.0375472423804,14.0007119076305,15.5014887988248,6,5
+"Korea, Rep.",KOR,2005,96850,48184561,FALSE,3.9957152069773,20.0006737197958,32.5073163410011,4.05832417535368,4.5576010935683,,13.8479522517596,,17.7786185963365,29.8150254085741,15.364766715204,17.1001188303639,6,5
+"Korea, Rep.",KOR,2006,96880,48438292,FALSE,4.22354676182777,19.6711697972594,37.9657112198912,4.45387523024102,4.99547586104076,,13.7754134683362,,18.686688584607,34.7384409238795,16.4627341770271,18.2651176008646,6,5
+"Korea, Rep.",KOR,2007,96920,48683638,FALSE,4.23992609909042,27.6196774073207,44.1492158021564,4.93247557417131,5.94166909679857,,19.8551652133244,,,40.5964098734425,20.1592920192127,23.2509320170647,6,4
+"Korea, Rep.",KOR,2008,96990,49054708,FALSE,4.325331698,27.4698497807004,51.3836218858593,4.67574333152184,6.17492901585465,,21.5431229986754,,,46.8848614578077,21.8795339389514,25.1433943921764,6,4
+"Korea, Rep.",KOR,2009,97060,49307835,FALSE,4.33500216495165,23.5025806599013,40.9002202132807,4.2637000701705,5.76516293777907,,30.9418423412173,,21.3508735231973,37.2145861632004,20.8823698287865,23.4547165515374,6,5
+"Korea, Rep.",KOR,2010,97200,49554112,FALSE,4.4244659164407,33.3841017325777,51.701977278301,5.21671043506925,6.04965903634193,,37.2659329707334,,23.9544607451986,47.1706852658034,25.9912748463868,29.3983782298765,6,5
+"Korea, Rep.",KOR,2011,97190,49936638,FALSE,4.39367471267337,34.6229648475989,64.8722124211511,5.46938888199132,6.67037205700489,,39.9417939470696,,24.3083090873989,58.8288605818505,28.9347239829805,32.6342634691818,6,5
+"Korea, Rep.",KOR,2012,97310,50199853,FALSE,4.38685920413428,35.0302036948771,66.0009860687199,6.01858012873074,7.43001390001724,,47.5638805318974,,25.4955146054994,59.7913461075311,30.7493373723098,34.7799050137071,6,5
+"Korea, Rep.",KOR,2013,97426,50428893,FALSE,4.40329561089195,35.7319516011903,65.6740999636304,6.50795325327933,7.96271612271053,,50.2802728586566,,25.9586873914259,59.6167530702058,31.4260434465124,35.6191236349516,6,5
+"Korea, Rep.",KOR,2014,97430,50746659,FALSE,4.51957555632801,32.2133306691197,65.1786018990389,7.24782517759512,8.49623252277754,,49.6811289746348,,28.5025988291579,59.2054645165798,31.2238435176457,35.3700696334175,6,5
+"Korea, Rep.",KOR,2015,97445,51014947,FALSE,4.61593046387506,23.8929119583526,55.7179301400824,7.74762666450474,9.11560984034568,,65.9638415066545,,30.0150571628247,50.678629251878,31.3255496493823,35.6596133088429,6,5
+"Korea, Rep.",KOR,2016,97489,51217803,FALSE,4.74835777046101,35.9603121647455,52.6074146531416,9.39689792719031,10.2169775955449,,76.6882221940827,,32.8060246369269,48.0560310494616,35.367871557758,40.5814975944814,6,5
+"Korea, Rep.",KOR,2017,97510,51361911,FALSE,4.84858231372573,44.3888138754606,59.4706046668027,9.4194876249825,10.8166787564531,,98.5933604652172,,36.8779018059106,54.2762421884786,42.2664584586832,48.7111611920099,6,5
+"Korea, Rep.",KOR,2018,97520,51606633,FALSE,4.87398517746242,42.8361158460291,64.6276539476573,10.3660625829069,11.7996707602241,,64.0194124721201,,,59.238985687068,37.3446460052352,44.115144147031,6,4
+"Korea, Rep.",KOR,2019,97520,51709098,FALSE,4.87115168019923,38.0610065845542,59.2995280663074,10.8562540130711,,,,,,54.7787075937552,28.271985086033,34.5653227304602,4,3
+"Korea, Rep.",KOR,2020,97520,51780579,FALSE,4.88200565687518,27.5108703267918,53.5921857767347,,,,,,,49.3210071822687,28.6616872534672,38.4159387545303,3,2
+Kuwait,KWT,1990,17820,2095350,FALSE,0,5.12417176311189,17.7889464970072,,,,,,,25.0996765744461,7.63770608670636,15.111924168779,3,2
+Kuwait,KWT,1991,17820,2031297,FALSE,0,4.04289362366192,14.5362260656202,,,,,,,19.7831725379605,6.19303989642737,11.9130330808112,3,2
+Kuwait,KWT,1992,17820,,FALSE,,,,,,,,,,,,,0,0
+Kuwait,KWT,1993,17820,,FALSE,,,,,,,,,,,,,0,0
+Kuwait,KWT,1994,17820,,FALSE,,,,,,,,,,,,,0,0
+Kuwait,KWT,1995,17820,1605907,FALSE,0.330958390438013,28.0937000092242,40.3877538058591,17.5558612467352,,,,,42.8664947957813,45.0775329598334,25.8469536496076,33.3983972528935,4,4
+Kuwait,KWT,1996,17820,1626858,FALSE,1.3777418573499,56.2762792046119,43.778250280118,19.5325579168624,,,,,51.9558180475227,48.2716408433224,34.584129461293,44.0090740030799,4,4
+Kuwait,KWT,1997,17820,1710257,FALSE,3.33058323077356,25.3616070659502,40.8744621174771,19.4252583683729,,,,,47.8020266593607,47.1914456164549,27.3587874883869,34.9450844275347,4,4
+Kuwait,KWT,1998,17820,1831121,FALSE,4.36655699725888,46.1347879909743,32.5272652777426,20.0801654629502,,,,,42.6339643384503,38.2592081713168,29.1485480134753,36.7770314909229,4,4
+Kuwait,KWT,1999,17820,1951642,FALSE,6.38376769639364,2.14087589490094,31.7812667498354,19.2508681656454,,,,,43.011777087378,35.5030612418168,20.5137111188307,24.9766455974353,4,4
+Kuwait,KWT,2000,17820,2045123,FALSE,8.62185642279042,6.85139572937803,38.6199754508744,18.8876363341959,,,,,40.9045194894557,42.0235097104095,22.7770766853389,27.1667653158598,4,4
+Kuwait,KWT,2001,17820,2103273,FALSE,10.6506619012856,42.2315761846306,34.8235712263292,21.5882657376956,,,,,38.9493174835568,36.4769961254472,29.6486785066995,34.8115388828325,4,4
+Kuwait,KWT,2002,17820,2136991,FALSE,12.5629761424456,1.64776506110594,35.0289390644503,22.9700542521627,,,,,42.7767021477026,34.7119142380202,22.9972873335734,25.5266089247479,4,4
+Kuwait,KWT,2003,17820,2161626,FALSE,27.1481051677932,100,46.3422754651612,24.590900496977,19.1580920267716,,,,42.3456957332522,44.5919783770701,48.0853953726367,52.8821436518248,5,4
+Kuwait,KWT,2004,17820,2200498,FALSE,27.2925094331599,51.9217891875713,57.8777226536152,27.5129688074803,20.5461890294175,,9.83449372995739,,41.3864569436053,57.0142989481511,35.9709901258982,37.5340015233531,6,5
+Kuwait,KWT,2005,17820,2270196,FALSE,29.9150044563723,100,78.6706253217048,30.2159940255675,21.3653837649562,,12.710082467936,,43.725962677524,77.1509530022589,49.2062781581841,52.7605984346573,6,5
+Kuwait,KWT,2006,17820,2373661,FALSE,31.7728472734046,100,93.5180103680684,32.8958662898699,24.4954135015894,,9.11704905788307,0.303810678745907,45.1632225759503,94.4060457166418,52.077832594196,46.9809990531818,6,6
+Kuwait,KWT,2007,17820,2504026,FALSE,36.4045363273354,100,100,34.5936747585422,27.6465513303911,,,0.679544466436456,,100,67.7495527714694,58.8183048062447,5,4
+Kuwait,KWT,2008,17820,2656010,FALSE,41.4223447156181,100,100,21.6598871500436,27.4773382935158,,,16.5785128514528,,100,65.7705579664154,59.5596000003741,5,4
+Kuwait,KWT,2009,17820,2821041,FALSE,47.1703836146956,100,84.1573758936728,21.9084794661021,33.3256959929109,,2.55706832853354,18.2101250583733,37.0588981153172,81.223866941388,48.8087009030535,43.4930729849524,6,6
+Kuwait,KWT,2010,17820,2991884,FALSE,53.7574567109133,100,90.1329724626443,21.1446117882913,32.6941119438471,,3.61658135539075,19.6231946979081,35.9260230026164,86.7018134878643,50.7629408866427,44.5020373886785,6,6
+Kuwait,KWT,2011,17820,3168054,FALSE,54.3806286417865,100,100,21.3721492419292,27.4158873728506,,5.692449209037,18.5319766269557,38.8349672962308,100,53.3800323981639,47.4052570623588,6,6
+Kuwait,KWT,2012,17820,3348852,FALSE,55.1061584684463,100,100,20.7804925054848,28.7206765118092,,6.46214994982871,24.105806420741,36.4070576357513,100,53.1259764265852,47.959251085301,6,6
+Kuwait,KWT,2013,17820,3526382,FALSE,56.0534746413382,100,100,21.4153600443718,27.2461730886321,,6.13682345922359,23.7090734398501,31.3625584049474,100,52.4947027583135,47.1039692247322,6,6
+Kuwait,KWT,2014,17820,3690939,FALSE,55.8538299740561,100,100,21.4841037688756,27.9001171956563,,0.977203171685389,27.274906333344,32.1102133641601,100,51.7375583797962,46.9744044396775,6,6
+Kuwait,KWT,2015,17820,3835588,FALSE,53.2693926774228,65.4556833011423,70.9521996590152,21.9818743801412,29.9274767642613,8.30486447686239,5.64210331865252,36.3535860732112,31.801548553086,72.6891979026878,36.7725237666175,38.9873322548202,7,6
+Kuwait,KWT,2016,17820,3956862,FALSE,51.8799487442566,74.2055457074202,64.2058725350972,21.6580979430802,30.6437082381744,,4.55764858276242,66.2130385951067,31.3396988329669,67.0562220679685,41.3078020575972,44.1717086215508,6,6
+Kuwait,KWT,2017,17820,4056102,FALSE,63.2895859676232,77.3264820692166,70.463693821086,22.1823914455789,32.0047723710401,6.85357220158731,4.44613732260345,62.421814620005,44.5950152746028,74.8811391473197,41.3081254431855,47.6421633132211,7,6
+Kuwait,KWT,2018,17820,4137314,FALSE,63.0595595993884,31.729912787744,89.6798277321603,24.9796916128507,33.6017552474706,,4.35886338007859,,,92.6958664429187,42.7615710224444,38.441083555898,6,4
+Kuwait,KWT,2019,17820,4207077,FALSE,61.9789118062791,54.1561292765994,76.1619586949652,24.7300346867113,,,,,,89.6027009500839,54.2567586161388,56.1629549711316,4,3
+Kuwait,KWT,2020,17820,4270563,FALSE,60.4793137206915,37.7194503557984,51.7670767063697,,,,,,,72.3805278432,49.9886135942865,55.0499890994992,3,2
+Lao PDR,LAO,1990,230800,4258471,FALSE,0,0.0635257635721743,0.140458163755313,,,,,,,0.111865661732823,0.0679946424424958,0.0876957126524988,3,2
+Lao PDR,LAO,1991,230800,4379234,FALSE,0,0.0704671815983258,0.171780005978712,,,,,,,0.140333021332721,0.0807490625256794,0.105400101465524,3,2
+Lao PDR,LAO,1992,230800,4500346,FALSE,0,0.0907909996483079,0.184089161367457,,,,,,,0.152188995492561,0.0916267203385882,0.121489997570435,3,2
+Lao PDR,LAO,1993,230800,4619946,FALSE,0,0.284375152903518,0.323363164368532,,,,,,,0.27586168825915,0.202579439090684,0.280118420581334,3,2
+Lao PDR,LAO,1994,230800,4735837,FALSE,0,0.557721839664062,0.424674544030247,,,,,,,0.365405153527926,0.327465461231437,0.461563496595994,3,2
+Lao PDR,LAO,1995,230800,4846477,FALSE,0,0.898433808815195,0.459592744123292,0.865814654627022,,,,,,0.397520677754884,0.555960301891377,0.720589713732367,4,3
+Lao PDR,LAO,1996,230800,4951189,FALSE,,1.44571663404495,0.466660089684388,0.987324930207322,,,,,,0.404548973353956,0.966567217978887,0.94586351253541,3,3
+Lao PDR,LAO,1997,230800,5050308,FALSE,,0.801407956874179,0.503035896271832,1.1122422364728,,,,,,0.443471137498674,0.805562029872937,0.785707110281884,3,3
+Lao PDR,LAO,1998,230800,5144601,FALSE,0.00491747582133125,0.416970363220079,0.468800625142342,1.17919802486893,,,,,,0.416766986180877,0.517471622263171,0.670978458089963,4,3
+Lao PDR,LAO,1999,230800,5235339,FALSE,0.0189034197404093,0.66565098372708,0.368917626832385,1.42325814395836,,,,,,0.333687096520605,0.619182543564559,0.807532074735349,4,3
+Lao PDR,LAO,2000,230800,5323701,FALSE,0.0546382348803969,0.360838315634172,0.454696262606084,1.6802802200688,,,,,,0.41101279181225,0.637613258297363,0.81737710917174,4,3
+Lao PDR,LAO,2001,230800,5409584,FALSE,0.0879672873245989,0.1964062422435,0.420779514026443,1.51210577763987,,,,,,0.37734648084955,0.554314705308603,0.695286166910973,4,3
+Lao PDR,LAO,2002,230800,5493247,FALSE,0.127748982563565,0.0371367736062368,0.38142501312421,1.62616302031723,,,,,,0.339606994474724,0.543118447402811,0.667635596132731,4,3
+Lao PDR,LAO,2003,230800,5576640,FALSE,0.156846603089644,0.153445641566451,0.375535242375195,1.38398712822604,1.35602482083244,,,,,0.333659710869938,0.517453653814333,0.623697493554143,5,3
+Lao PDR,LAO,2004,230800,5662199,FALSE,0.167208964794966,0.13960551701609,0.511528033592779,1.91872365846164,1.30693056957144,,,,,0.457624281768748,0.68426654346637,0.838651152415494,5,3
+Lao PDR,LAO,2005,230800,5751675,FALSE,0.387277527695626,0.212039947755066,0.667903294631735,2.31126707814683,1.24863704641878,,,,,0.603254510601558,0.894621962057315,1.04218717883449,5,3
+Lao PDR,LAO,2006,230800,5846075,FALSE,0.524199995139485,1.40526636247776,0.873734080836156,2.52327844541028,1.36638399434141,,,,,0.784517126015179,1.33161972096592,1.5710206446344,5,3
+Lao PDR,LAO,2007,230800,5944950,FALSE,0.722621261713248,2.54519002005796,0.901798297524581,3.31704166232548,1.82190237518096,,,,,0.824935562717485,1.87166281040532,2.22905574836698,5,3
+Lao PDR,LAO,2008,230800,6046630,FALSE,1.53790692520287,1.77493848081417,1.16423715373922,3.4882601547282,2.30403046874868,,,,,1.0441740256888,1.99133567862112,2.10245755374372,5,3
+Lao PDR,LAO,2009,230800,6148621,FALSE,2.55616344794174,2.29053009150926,1.16083595590464,3.96579449867272,2.3781962761939,,4.10621846444611,,,1.04769406289541,2.81590849169489,2.85255927938088,6,4
+Lao PDR,LAO,2010,230800,6249168,FALSE,2.93420824948561,2.19156620246251,1.7356306123174,8.16111852662555,2.48149518970255,,1.15432879938491,,,1.5683784306887,3.2353704780552,3.26884798979042,6,4
+Lao PDR,LAO,2011,230800,6347564,FALSE,3.7140736797881,2.0804924396879,1.92780268030865,8.63360638918157,2.56656570531549,,1.13643511031863,,,1.73304748108351,3.49848205985697,3.3958953550679,6,4
+Lao PDR,LAO,2012,230800,6444527,FALSE,4.36856316743775,4.31894767063755,2.44828171848224,10.1436386350788,2.92271839174708,,1.67900481942149,,,2.24447631727943,4.59168720221157,4.59651686060433,6,4
+Lao PDR,LAO,2013,230800,6541302,FALSE,5.00565491888025,4.76029883076243,2.60861969559112,12.3223715683722,3.33623121553479,,1.65416485768306,,1.74689960865063,2.3924028305744,4.68300157998994,4.57522753920854,6,5
+Lao PDR,LAO,2014,230800,6639763,FALSE,5.62577089078515,5.77786776973356,3.66694250150163,13.6819553128765,3.22839833999232,,4.88890577505186,,,3.32303229291469,6.72828844998973,6.91794028764414,6,4
+Lao PDR,LAO,2015,230800,6741160,FALSE,7.07215624237606,7.2703507330594,4.00042470510788,13.9662963516352,3.19144157896417,,0.535041045947181,,,3.64225425593651,6.56885381562514,6.35348559664457,6,4
+Lao PDR,LAO,2016,230800,6845848,FALSE,8.36828812604431,6.08940947145839,4.01757028761706,12.9488502325405,3.35958335058515,,0,,,3.68496449179162,6.28482362353206,5.68080604894763,6,4
+Lao PDR,LAO,2017,230800,6953031,FALSE,9.61078349419876,10.7409827334759,4.29016695854468,12.0853020856663,3.79425462170701,,0,,,3.95506766170356,7.34544705437714,6.69533812021145,6,4
+Lao PDR,LAO,2018,230800,7061498,FALSE,,8.43467572467651,4.74446182127873,12.7167922774811,4.18302650957774,,6.64000256954896,,,4.41949743633045,8.13398309824632,8.05274200200925,5,4
+Lao PDR,LAO,2019,230800,7169456,FALSE,,4.62190862576646,4.85677479395713,12.6743879575667,,,,,,4.61550376934641,7.38435712576342,7.30393345089318,3,3
+Lao PDR,LAO,2020,230800,7275556,FALSE,,,4.0449537149365,,,,,,,3.87149618644302,4.0449537149365,3.87149618644302,1,1
+Lebanon,LBN,1990,10230,2803032,FALSE,0,0.350873141173618,,,,,,,,,0.175436570586809,0.350873141173618,2,1
+Lebanon,LBN,1991,10230,2921700,FALSE,0,0.0839509124315541,,,,,,,,,0.041975456215777,0.0839509124315541,2,1
+Lebanon,LBN,1992,10230,3076133,FALSE,0,0.508467230555962,,,,,,,5.82744621928054,,2.1119711499455,3.16795672491825,2,2
+Lebanon,LBN,1993,10230,3246129,FALSE,0,0.754044622877787,,,,,,,5.64698977528838,,2.13367813272205,3.20051719908308,2,2
+Lebanon,LBN,1994,10230,3403359,FALSE,0,2.32363682166714,,,,,,,6.40689843912365,,2.9101784202636,4.36526763039539,2,2
+Lebanon,LBN,1995,10230,3528379,FALSE,0.0531694293934353,0.569358512008727,,1.54786494218271,,,,,6.97145323875593,,2.2854615305852,3.02955889764912,3,3
+Lebanon,LBN,1996,10230,3610663,FALSE,0.101688941709392,1.22377075632396,,1.42508110732615,,,,,7.38241923748599,,2.53324001071137,3.34375703371203,3,3
+Lebanon,LBN,1997,10230,3658425,FALSE,0.8886292892581,21.6494702814457,,1.85141004786118,,,,,8.0761063153277,,8.11640398347316,10.5256622148782,3,3
+Lebanon,LBN,1998,10230,3693514,FALSE,1.93072159849382,13.9258535769025,,2.07390438019845,,,,,5.52860167827904,,5.86477030846846,7.17611987846,3,3
+Lebanon,LBN,1999,10230,3747762,FALSE,3.75809487708558,11.7426463857941,,2.18000244684298,,,,,4.66209088635564,,5.58570864901959,6.19491323966426,3,3
+Lebanon,LBN,2000,10230,3842774,FALSE,5.42109775390417,12.9130897603331,,2.34419236370646,,,,,5.24188213888566,,6.48006550420734,6.8330547543084,3,3
+Lebanon,LBN,2001,10230,3990999,FALSE,4.45214564699444,16.0203270969798,,2.54624023203086,,,,,5.64091835535176,,7.16490783283921,8.06916189478747,3,3
+Lebanon,LBN,2002,10230,4182205,FALSE,4.3843762555928,14.0126047765123,8.76280559479291,2.77541907711262,,,,,5.67864054160018,8.50013912499934,7.12276924912217,7.74170088005612,4,4
+Lebanon,LBN,2003,10230,4388378,FALSE,4.77530430163399,34.6901532255974,13.5024010821389,2.81104989005653,8.25165056120669,,8.21897588880743,,5.89552174297058,14.8208053836905,11.6489010218675,13.2873012262245,6,5
+Lebanon,LBN,2004,10230,4569377,FALSE,5.15941678333183,26.1638399323614,15.3026231660715,3.39618549204441,8.28250694325096,38.5156241694327,13.4187995549621,100,6.53261035235108,14.7492276248645,15.4984427786507,27.3767771594306,7,6
+Lebanon,LBN,2005,10230,4698761,FALSE,5.65287905294723,31.1668202519707,15.4492063487002,2.94585006947314,8.39085398034658,46.8263060810661,5.37324224004606,100,6.26784581778733,15.1617226411414,16.2403071231415,26.8192468367365,7,6
+Lebanon,LBN,2006,10230,4759760,FALSE,8.25508022224176,32.7041580741648,16.352732688297,2.71155770035583,8.05876325694611,,8.33545604615995,0.138655366318682,5.53382948018361,16.3966816325859,12.3154690352338,10.9700563832948,6,6
+Lebanon,LBN,2007,10230,4767347,FALSE,10.2969337029266,38.8609706020676,19.1368927078301,2.5900247478163,8.14413858946891,6.71076438457434,5.29593945670015,0.143052712389799,,19.1824742371975,13.8152542669858,13.2144923512343,7,5
+Lebanon,LBN,2008,10230,4764745,FALSE,12.3861582013735,48.9666751950101,25.9013711062589,3.39709800473063,9.31172994847947,41.083139591132,3.78487967068258,0.193034539935747,,24.8957808412033,22.586553628198,16.2474936503125,7,5
+Lebanon,LBN,2009,10230,4813026,FALSE,16.4036363990544,54.0318629937519,25.3674217628115,4.65275752363234,11.6149560213745,45.0187504557384,10.4913545370755,0.277399888922854,7.65725344197854,24.0972676911125,23.3747195877204,16.8679826794123,7,6
+Lebanon,LBN,2010,10230,4953064,FALSE,23.1006278658329,42.207316974779,24.8525793785583,5.31581629819599,13.9613210289421,,9.46653725145988,0.370307730558327,8.73707548829953,23.2062946188266,18.9466588761876,14.8838913936866,6,6
+Lebanon,LBN,2011,10230,5202022,FALSE,26.1846186374978,34.3459548803162,25.2588208622921,3.86336567787719,13.3547843163318,,9.70683364317993,1.76334549427481,9.93811428255859,23.54748864331,18.2162846639536,13.8608504369195,6,6
+Lebanon,LBN,2012,10230,5537620,FALSE,28.9732035252517,32.8015542379645,22.7606229977346,2.99516131611146,12.9910464267359,,3.25663127597894,6.95754711230006,9.62246958321659,21.2812074511842,16.7349404893763,12.8190951627926,6,6
+Lebanon,LBN,2013,10230,5913016,FALSE,31.2316663782919,34.3927632289759,21.769848107683,2.6159082559969,11.3822659047858,,6.7097349762406,6.51583055927429,7.77816331033757,20.5624433870181,17.4163473762543,13.0958072863072,6,6
+Lebanon,LBN,2014,10230,6261046,FALSE,30.5415489852555,28.7433071276326,20.0972751210828,2.6275779352809,10.9706391647265,,6.33676390019659,10.4319482431543,8.74734126533839,19.4414755957405,16.1823023891311,12.7214023445572,6,6
+Lebanon,LBN,2015,10230,6532681,FALSE,29.6725836070233,18.9295468002709,18.6110711520832,2.82136981455731,10.909857036175,24.3101996084871,2.7605796894853,18.5360343537785,9.46201293779743,17.9893935230872,15.2239090871006,11.7498228531628,7,6
+Lebanon,LBN,2016,10230,6714281,FALSE,29.6932204714615,23.3410513433756,17.9346257783245,3.05259762047359,11.577403382066,3.96896016500966,1.61154886009267,23.2552735971014,9.47558856437205,17.5066893383927,12.7253704004442,13.0404582206347,7,6
+Lebanon,LBN,2017,10230,6819373,FALSE,30.0310570396082,24.6960965909079,18.0616495385997,3.30658707961517,11.2709920694051,3.41685799286235,4.23123627031083,18.2948466826038,10.1552277649272,17.8114923827373,13.4141017538331,13.082581128517,7,6
+Lebanon,LBN,2018,10230,6859408,FALSE,,20.8778060869937,18.284910633806,3.47677586034562,11.5139407138503,,2.10327030979775,,,18.08205700022,11.1856907227358,11.1349773143393,5,4
+Lebanon,LBN,2019,10230,6855709,FALSE,,16.487452170937,17.3816114820004,3.42903799693779,,,,,,17.5380503517697,12.4327005499584,12.4848468398815,3,3
+Lebanon,LBN,2020,10230,6825442,FALSE,,,8.46074707085869,,,,,,,8.55087150958716,8.46074707085869,8.55087150958716,1,1
+Liberia,LBR,1990,96320,2075917,FALSE,0,4.88428925395697,,,,,,,,,2.44214462697849,4.88428925395697,2,1
+Liberia,LBR,1991,96320,2040141,FALSE,0,8.0566516670932,,,,,,,,,4.0283258335466,8.0566516670932,2,1
+Liberia,LBR,1992,96320,2001612,FALSE,0,1.52055190159571,,,,,,,,,0.760275950797856,1.52055190159571,2,1
+Liberia,LBR,1993,96320,1976701,FALSE,0,2.3200221034702,,,,,,,,,1.1600110517351,2.3200221034702,2,1
+Liberia,LBR,1994,96320,1986491,FALSE,0,2.3995303476935,,,,,,,,,1.19976517384675,2.3995303476935,2,1
+Liberia,LBR,1995,96320,2044657,FALSE,0,0.306807447746119,,,,,,,,,0.15340372387306,0.306807447746119,2,1
+Liberia,LBR,1996,96320,2160480,FALSE,,3.17864836918749,,,,,,,,,3.17864836918749,3.17864836918749,1,1
+Liberia,LBR,1997,96320,2326210,FALSE,0.00505543624211734,13.3666960831689,,,,,,,,,6.68587575970549,13.3666960831689,2,1
+Liberia,LBR,1998,96320,2517472,FALSE,0.00426549428684384,16.0222709686038,,,,,,,,,8.01326823144534,16.0222709686038,2,1
+Liberia,LBR,1999,96320,2699708,FALSE,0.0109920729877731,9.20917467425947,,,,,,,,,4.61008337362362,9.20917467425947,2,1
+Liberia,LBR,2000,96320,2848447,FALSE,0.01627970787821,12.3287499533953,,,,,,,,,6.17251483063676,12.3287499533953,2,1
+Liberia,LBR,2001,96320,2953928,FALSE,0.0299839582486433,4.45918229730312,,,,,,,,,2.24458312777588,4.45918229730312,2,1
+Liberia,LBR,2002,96320,3024727,FALSE,0.0283304426525477,5.8832569203197,,,,,,,,,2.95579368148613,5.8832569203197,2,1
+Liberia,LBR,2003,96320,3077055,FALSE,0.0271298495511467,7.77103944802252,,,0.277447181779656,,,,,,3.89908464878683,7.77103944802252,3,1
+Liberia,LBR,2004,96320,3135654,FALSE,0.0259062958489953,5.31300668438685,1.02358840142218,,0.506734027625533,,,,,0.999167899407544,2.12083379388601,3.1560872918972,4,2
+Liberia,LBR,2005,96320,3218114,FALSE,,7.08215474516196,1.09526066735919,,0.894336302933532,,,,,1.05396832951601,4.08870770626058,4.06806153733899,3,2
+Liberia,LBR,2006,96320,3329211,FALSE,,5.98428097718656,1.56584318516412,,0.79962916705371,,,,,1.47512827198506,3.77506208117534,3.72970462458581,3,2
+Liberia,LBR,2007,96320,3461911,FALSE,0.417203085195564,6.2612245057513,1.56224358585377,,0.544447689334892,0,,,,1.47464720990967,2.06016779420016,3.86793585783048,5,2
+Liberia,LBR,2008,96320,3607863,FALSE,0.384805194256124,4.79618478955162,1.90582430636393,,0.656855533138727,5.89814051283713,,0.00110941756112534,,1.76855155680493,3.2462387007522,2.18861525463923,5,3
+Liberia,LBR,2009,96320,3754129,FALSE,1.39551946274329,2.54457184470782,1.35295075227255,,0.675578356741336,6.35200844818188,0.960754757574206,0.0026257617674664,,1.26351934563352,2.52116105309595,1.19286792742075,6,4
+Liberia,LBR,2010,96320,3891357,FALSE,1.54825272981156,40.385304733324,0.703730439536547,,0.781437362325632,6.84219669135414,0.926873915011472,0.0102615665769468,,1.24198523315585,10.0812717018075,10.6411063620171,6,4
+Liberia,LBR,2011,96320,4017446,FALSE,1.63006549594848,25.2002468298422,1.05373209515739,,1.26569200492863,8.56412288606048,0,0.0137721733857925,,1.56996921386354,7.28963346140171,6.69599705427288,6,4
+Liberia,LBR,2012,96320,4135662,FALSE,1.6468096548252,39.2213683354334,1.26986414682842,,1.16899681162874,8.77033217902877,0,0.0564962628558334,,1.57892904986422,10.1816748632232,10.2141984120384,6,4
+Liberia,LBR,2013,96320,4248337,FALSE,1.97308644211568,24.0111979828901,1.36950897183457,,1.16505288258956,7.78915178667662,0,0.119083677816504,,1.50382505714252,7.0285890367034,6.40852667946229,6,4
+Liberia,LBR,2014,96320,4359508,FALSE,3.25068494663343,5.40655060984261,1.72650697706388,,1.0650059908983,,0,0.146345464001188,,1.4791598584935,2.59593563338498,1.75801398308432,5,4
+Liberia,LBR,2015,96320,4472229,FALSE,5.85721357867519,2.57991697957324,1.22186871357101,,0.467551819605168,,0,0.163986798615433,,1.03968116314449,2.41474981795486,0.945896235333291,5,4
+Liberia,LBR,2016,96320,4586788,FALSE,8.96615162253402,4.58368875085186,0.906304475464365,,0.79836845472645,6.90262208960032,0,0.177968241281289,,0.886127781103341,4.27175338769011,1.41194619330912,6,4
+Liberia,LBR,2017,96320,4702224,FALSE,9.08028300947898,2.81700509994514,0.817004626481827,,0.613471267055255,,0,0.174689031397365,,0.825779413099456,3.17857318397649,0.95436838611049,5,4
+Liberia,LBR,2018,96320,4818976,FALSE,10.2735877507292,1.94045183999846,0.852044126858715,,0.872717367735128,,0,,,0.808017740643543,3.26652092939659,0.916156526880667,5,3
+Liberia,LBR,2019,96320,4937374,FALSE,11.671905133506,1.67581646033754,0.842938354806566,,,,,,,0.793200036357169,4.73021998288336,1.23450824834735,3,2
+Liberia,LBR,2020,96320,5057677,FALSE,,,,,,,,,,,,,0,0
+Libya,LBY,1990,1759540,4436663,FALSE,0,2.61123592183353,11.1033587675972,,,,,,,10.2629356601159,4.57153156314357,6.43708579097472,3,2
+Libya,LBY,1991,1759540,4544245,FALSE,0,2.56477983149689,11.4283990939077,,,,,,,10.5317091907636,4.66439297513487,6.54824451113023,3,2
+Libya,LBY,1992,1759540,4650896,FALSE,0,2.35460040475457,9.8687033114669,,,,,,,9.18745048686523,4.07443457207382,5.7710254458099,3,2
+Libya,LBY,1993,1759540,4755134,FALSE,0,4.95766989346641,9.22508617730474,,,,,,,8.58696871043059,4.72758535692372,6.7723193019485,3,2
+Libya,LBY,1994,1759540,4854871,FALSE,0,0.889481932981098,7.54725100376436,,,,,,,6.9670395732776,2.81224431224849,3.92826075312935,3,2
+Libya,LBY,1995,1759540,4948796,FALSE,0,1.39250961018149,6.44952572588041,5.683702169864,,,,,,5.94983276156444,3.38143437648147,4.34201484720331,4,3
+Libya,LBY,1996,1759540,5036173,FALSE,,1.42754301934415,6.96369998215526,4.26562424873438,,,,,,6.40785293297553,4.21895575007793,4.03367340035135,3,3
+Libya,LBY,1997,1759540,5118008,FALSE,,2.58276998089834,6.99667650960811,3.70843950615872,,,,,,6.45391942812217,4.42929533222172,4.24837630505974,3,3
+Libya,LBY,1998,1759540,5196774,FALSE,,3.23815080956748,5.09807069886763,1.98550358039353,,,,,,4.75665027701861,3.44057502960955,3.32676822232654,3,3
+Libya,LBY,1999,1759540,5275921,FALSE,0.0663406108390191,2.94302034298368,5.75237737038426,2.2204869477976,,,,,,5.33718056357477,2.74555631800114,3.50022928478535,4,3
+Libya,LBY,2000,1759540,5357893,FALSE,0.0914453527608344,1.95642447676535,7.74499726344665,2.18195821972989,,,,,,7.51000740073021,2.99370632817568,3.88279669907515,4,3
+Libya,LBY,2001,1759540,5443249,FALSE,0.176388465207813,2.48171404176975,7.37534464548387,2.12540249961912,,,,,,7.32727121351554,3.03971241302014,3.9781292516348,4,3
+Libya,LBY,2002,1759540,5531097,FALSE,1.06293719667537,2.22820050334929,8.36309279379831,1.88297388390219,,,,,,8.56668586512453,3.38430109443129,4.22595341745867,4,3
+Libya,LBY,2003,1759540,5620545,FALSE,1.31171864942162,1.60748901591054,9.4834685869307,2.0691191282278,2.75491518488201,,3.2085832399681,,,9.36078656487861,3.53607572409175,4.06149448724626,6,4
+Libya,LBY,2004,1759540,5710163,FALSE,1.62065409674024,4.93880285185794,12.0574975987626,,3.11472247613977,,,,,11.5591115972083,6.20565151578692,8.24895722453314,4,2
+Libya,LBY,2005,1759540,5798615,FALSE,1.76983079869759,8.81928746576189,17.8661076763628,,3.74309918473965,,4.35407094298916,,,17.0767934840683,8.20232422095285,10.0833839642731,5,3
+Libya,LBY,2006,1759540,5886874,FALSE,1.9138373478632,18.9088928228273,22.0528716242057,0.256492624241571,4.15370769914941,16.8289149890543,3.676107860264,0.015397186836775,,21.081422856675,10.6061862114093,8.78766267016894,7,5
+Libya,LBY,2007,1759540,5974786,FALSE,2.0702303202725,63.2899587402179,27.242924076842,0.214066373018906,4.49337432066486,,3.0183485210159,0.0379662559006814,,26.3313971487576,19.1671056062735,18.5783474077822,6,5
+Libya,LBY,2008,1759540,6058740,FALSE,3.89112594090033,72.386102217169,35.170799798441,1.52237005585311,5.70667898991437,,,0.330810695950934,,33.707586481779,28.2425995030909,26.986717362688,5,4
+Libya,LBY,2009,1759540,6133987,FALSE,4.61207114716816,18.1328312934139,25.4074649263874,,6.86263086511724,,5.88002109769274,1.10538209223733,2.0513765882131,23.7361979714398,11.2167530105751,10.1811618085994,5,5
+Libya,LBY,2010,1759540,6197667,FALSE,5.91718151298592,31.8876248778858,31.2078967273022,,7.43161594776549,,4.65568388530368,0.447134138045634,6.8211386602532,28.910245397981,16.0979051327462,14.5443653918939,5,5
+Libya,LBY,2011,1759540,6247438,FALSE,5.87004154279609,0.919662681308419,13.3963808254106,,5.64214433096174,,1.1546484486272,0.782940379017134,6.00464027624698,12.519066775341,5.46907475487786,4.27619171210815,5,5
+Libya,LBY,2012,1759540,6285751,FALSE,,27.448228837347,36.0564473294259,,4.8095024117918,,0,0.646703116065137,1.74951917065154,33.8247295905079,16.3135488343561,12.7338361429143,4,5
+Libya,LBY,2013,1759540,6320350,FALSE,6.83845367779936,9.7823859649435,33.9272604451876,,7.57547129635076,,0.570664171651459,0.668591349027692,5.69337321582042,31.439992289199,11.3624274950805,9.63100139812841,5,5
+Libya,LBY,2014,1759540,6362039,FALSE,7.31243011181212,0.534964073496818,21.737543061556,,6.9895079025703,,0,0.658787881293331,6.82004810112628,20.0659146720656,7.28099706959825,5.61594294559641,5,5
+Libya,LBY,2015,1759540,6418315,FALSE,7.76095306505125,2.69851806005689,12.1883109184313,,2.39847405020944,,0,1.71501942992992,6.4497581491883,11.3705853823165,5.81950803854554,4.44677620429832,5,5
+Libya,LBY,2016,1759540,6492160,FALSE,8.17948377540076,2.96912777621945,6.8196136440203,,2.51199697646716,,0,0.77444896146323,3.02298731363576,6.52028742988108,4.19824250185525,2.6573702962399,5,5
+Libya,LBY,2017,1759540,6580723,FALSE,8.66121523608465,1.96277677966561,12.4952168199667,,2.42154525303421,,0,2.78789256285673,2.79749280746616,12.0855585107913,5.18334032863662,3.92674413215597,5,5
+Libya,LBY,2018,1759540,6678565,FALSE,,1.80990291299682,17.6472148883571,,2.15004420651843,,0,,,16.6049942269263,6.48570593378465,6.13829904664106,4,3
+Libya,LBY,2019,1759540,6777453,FALSE,,2.23306874029507,18.6700266241224,,,,,,,17.6657561863178,10.4515476822088,9.94941246330642,2,2
+Libya,LBY,2020,1759540,6871287,FALSE,,,,,,,,,,,,,0,0
+St. Lucia,LCA,1990,610,138019,TRUE,0,14.2316325097912,10.5080115881047,,,,,,,9.77247701053927,8.24654803263198,12.0020547601652,3,2
+St. Lucia,LCA,1991,610,140001,TRUE,0,18.0899885742795,10.8162092770161,,,,,,,10.0469293342419,9.63539928376519,14.0684589542607,3,2
+St. Lucia,LCA,1992,610,141758,TRUE,0,12.6668124924679,11.6370490514411,,,,,,,10.7699548739487,8.101287181303,11.7183836832083,3,2
+St. Lucia,LCA,1993,610,143402,TRUE,0,10.448634671672,11.4675796121405,,,,,,,10.6555758000145,7.30540476127083,10.5521052358432,3,2
+St. Lucia,LCA,1994,610,145080,TRUE,0,9.83177404601782,11.7599270899818,,,,,,,10.9167178408885,7.19723371199988,10.3742459434531,3,2
+St. Lucia,LCA,1995,610,146871,TRUE,5.45146141073772,9.78045438555228,12.738494376759,33.6622350396921,,,,,,11.869815105585,15.4081613031853,18.4375015102765,4,3
+St. Lucia,LCA,1996,610,148837,TRUE,11.7999706935659,5.42644831766654,12.0404581194025,34.4418569286211,,,,,,11.1139891872636,15.927183514814,16.9940981445171,4,3
+St. Lucia,LCA,1997,610,150920,TRUE,17.2208159295648,13.8987522416236,12.3547991997805,45.3159418159689,,,,,,11.403922388607,22.1975772967344,23.5395388153998,4,3
+St. Lucia,LCA,1998,610,153023,TRUE,22.3390769397626,23.9028273507431,12.8825831337208,49.9326520688247,,,,,,11.9469087024991,27.2642848732628,28.5941293740223,4,3
+St. Lucia,LCA,1999,610,154988,TRUE,32.6548673992915,23.5306039727025,12.8711904478402,52.1996275052135,,,,,,11.895759253505,30.3140723312619,29.2086635771403,4,3
+St. Lucia,LCA,2000,610,156737,TRUE,85.0751227776941,15.0401164391662,12.6645852427127,56.3449527731096,,,,,,11.7790631612193,42.2811943081707,27.7213774578317,4,3
+St. Lucia,LCA,2001,610,158184,TRUE,100,16.3052965937847,11.1364156925031,57.3654475314267,,,,,,10.4379842073025,46.2017899544286,28.0362427775047,4,3
+St. Lucia,LCA,2002,610,159392,TRUE,100,14.2907923106184,10.8944091013707,49.3854534383616,,,,,,10.1048244102493,43.6426637125877,24.5936900530764,4,3
+St. Lucia,LCA,2003,610,160530,TRUE,100,29.077057452152,13.3743721709883,51.6839414895004,100,,,,,12.4972018755704,48.5338427781602,31.0860669390742,5,3
+St. Lucia,LCA,2004,610,161821,TRUE,100,20.7396260860455,14.3844688462492,59.3791960872633,100,,,,,13.6483690563011,48.6258227548895,31.25573040987,5,3
+St. Lucia,LCA,2005,610,163408,TRUE,100,20.9980167503405,16.5430363828816,53.5242671761985,100,,,,,15.6234386598741,47.7663300773552,30.048574195471,5,3
+St. Lucia,LCA,2006,610,165378,TRUE,100,62.0406294902632,16.7424752974831,49.2138773405519,100,71.5638842204587,,,,15.6437828545329,59.9121732697514,42.299429895116,6,3
+St. Lucia,LCA,2007,610,167644,TRUE,100,71.1321865356957,17.3473042682387,65.5774129958788,100,100,,,,16.350183174727,70.8113807599627,51.0199275687672,6,3
+St. Lucia,LCA,2008,610,170011,TRUE,100,41.5887705374469,19.2661342347285,66.0934620512147,100,76.3507098253584,,,,17.9585125887182,60.6598153297497,41.8802483924599,6,3
+St. Lucia,LCA,2009,610,172223,TRUE,100,37.2822404941079,16.7080346900389,69.2651159280143,93.3629917458985,79.4268901427905,41.8851988096514,,,15.5791221240211,57.4279133441005,41.0029193389487,7,4
+St. Lucia,LCA,2010,610,174092,TRUE,100,30.5583830145918,19.3689321699513,68.6610485464911,100,62.13349825233,20.7177658783706,,,17.8601103653158,50.2399379769558,34.4493269511923,7,4
+St. Lucia,LCA,2011,610,175538,TRUE,100,27.976761973473,19.109450226049,65.7424975508129,100,63.0716423370318,20.5471026062579,,,17.3520910075365,49.4079091156041,32.9046132845201,7,4
+St. Lucia,LCA,2012,610,176654,TRUE,100,18.8092657610343,18.5973194917396,61.1323795467283,96.3354365545134,,20.4172976400042,,,17.1458910758505,43.7912524879013,29.3762085059043,6,4
+St. Lucia,LCA,2013,610,177505,TRUE,100,20.6354211612326,17.6616907935341,63.0292828232387,82.3269651783931,,40.6388247913839,,,16.3180653025333,48.3930439138779,35.1553985195971,6,4
+St. Lucia,LCA,2014,610,178307,TRUE,100,17.1137762006668,24.0982562843657,67.2423237276119,80.1695676446548,,20.2280185146814,,,22.9042562235156,45.7364749454652,31.872093666619,6,4
+St. Lucia,LCA,2015,610,179131,TRUE,100,43.3342944876449,24.5147758777867,69.9169102090723,70.3590734751552,,0,,,23.7612546837753,47.5531961149008,34.2531148451231,6,4
+St. Lucia,LCA,2016,610,180028,TRUE,100,37.1381201700031,24.7563453387849,63.9678499493034,74.5969017070963,13.4095062276338,0,,,23.5521588955682,39.8786369476209,31.1645322537187,7,4
+St. Lucia,LCA,2017,610,180955,TRUE,100,11.7046509368027,26.6546144398044,71.4275154560222,74.9597577225857,,39.8640247276649,,,25.5133898987049,49.9301611120589,37.1273952547987,6,4
+St. Lucia,LCA,2018,610,181890,TRUE,,15.493067244348,27.9142546370975,77.8058641052225,77.3370127859916,,19.8295524619127,,,26.6693250783155,35.2606846121452,34.9494522224497,5,4
+St. Lucia,LCA,2019,610,182795,TRUE,,9.28924476303174,28.9763776582113,81.0757684070114,,,,,,27.9835503436609,39.7804636094182,39.4495211712347,3,3
+St. Lucia,LCA,2020,610,183629,TRUE,,,14.8033960737797,,,,,,,13.9945351525672,14.8033960737797,13.9945351525672,1,1
+Liechtenstein,LIE,1990,160,28790,TRUE,0,,,,,,,,,,0,,1,0
+Liechtenstein,LIE,1991,160,29166,TRUE,0,,,,,,,,,,0,,1,0
+Liechtenstein,LIE,1992,160,29552,TRUE,0,,,,,,,,,,0,,1,0
+Liechtenstein,LIE,1993,160,29987,TRUE,0,,,,,,,,,,0,,1,0
+Liechtenstein,LIE,1994,160,30415,TRUE,0,,,,,,,,,,0,,1,0
+Liechtenstein,LIE,1995,160,30884,TRUE,0,,,23.2056966354194,,,,,,,11.6028483177097,23.2056966354194,2,1
+Liechtenstein,LIE,1996,160,31354,TRUE,,,,21.6954829685304,,,,,,,21.6954829685304,21.6954829685304,1,1
+Liechtenstein,LIE,1997,160,31830,TRUE,,,,21.7526685787072,,,,,,,21.7526685787072,21.7526685787072,1,1
+Liechtenstein,LIE,1998,160,32306,TRUE,,,,22.1841970019372,,,,,,,22.1841970019372,22.1841970019372,1,1
+Liechtenstein,LIE,1999,160,32765,TRUE,,,,22.2441617859011,,,,,,,22.2441617859011,22.2441617859011,1,1
+Liechtenstein,LIE,2000,160,33184,TRUE,100,100,,22.5490015926789,,,,,,,74.183000530893,61.2745007963394,3,2
+Liechtenstein,LIE,2001,160,33543,TRUE,100,100,,20.4606317743361,,,,,,,73.486877258112,60.2303158871681,3,2
+Liechtenstein,LIE,2002,160,33885,TRUE,100,100,,17.4577659385179,,,,,,,72.485921979506,58.7288829692589,3,2
+Liechtenstein,LIE,2003,160,34172,TRUE,100,100,,17.4177794790209,,,,,,,72.4725931596736,58.7088897395105,3,2
+Liechtenstein,LIE,2004,160,34444,TRUE,100,100,,17.1038783317606,,,,,,,72.3679594439202,58.5519391658803,3,2
+Liechtenstein,LIE,2005,160,34718,TRUE,100,100,,17.4237549772862,,,,,,,72.4745849924288,58.7118774886431,3,2
+Liechtenstein,LIE,2006,160,34975,TRUE,100,100,,19.0671100407574,,,,3.14735076613777,,,73.0223700135858,40.7381536022984,3,3
+Liechtenstein,LIE,2007,160,35217,TRUE,100,100,,25.1106090157736,,,,3.1257224116271,,,75.0368696719245,42.7454438091336,3,3
+Liechtenstein,LIE,2008,160,35469,TRUE,100,100,,24.966441932707,,,,3.10351400333591,,,74.988813977569,42.6899853120143,3,3
+Liechtenstein,LIE,2009,160,35723,TRUE,100,100,,22.6125297338226,,,,,,,74.2041765779409,61.3062648669113,3,2
+Liechtenstein,LIE,2010,160,35996,TRUE,100,100,,21.6985645307762,,,,,,,73.8995215102587,60.8492822653881,3,2
+Liechtenstein,LIE,2011,160,36299,TRUE,100,100,,22.4210182762622,,,,,,,74.1403394254207,61.2105091381311,3,2
+Liechtenstein,LIE,2012,160,36615,TRUE,100,100,,20.7013379070123,,,,,,,73.5671126356708,60.3506689535062,3,2
+Liechtenstein,LIE,2013,160,36940,TRUE,100,100,,19.5983944544403,,,,,,,73.1994648181468,59.7991972272202,3,2
+Liechtenstein,LIE,2014,160,37219,TRUE,100,100,,20.0063361806343,,,,,,,73.3354453935448,60.0031680903171,3,2
+Liechtenstein,LIE,2015,160,37465,TRUE,100,100,,18.3834211421549,,,,100,,,72.7944737140517,72.7944737140517,3,3
+Liechtenstein,LIE,2016,160,37655,TRUE,100,100,,22.2910441759728,,,,100,,,74.0970147253243,74.0970147253243,3,3
+Liechtenstein,LIE,2017,160,37805,TRUE,100,100,,25.4801823616737,,,,100,,,75.1600607872246,75.1600607872246,3,3
+Liechtenstein,LIE,2018,160,37918,TRUE,,100,,27.3264910512253,,,,,,,63.6632455256127,63.6632455256127,2,2
+Liechtenstein,LIE,2019,160,38020,TRUE,,,,31.3429659907006,,,,,,,31.3429659907006,31.3429659907006,1,1
+Liechtenstein,LIE,2020,160,38137,TRUE,,,,,,,,,,,,,0,0
+Sri Lanka,LKA,1990,62710,17325769,FALSE,0,0.111832572373004,0.696112600620428,,,,,,,0.638912725565311,0.269315057664477,0.375372648969158,3,2
+Sri Lanka,LKA,1991,62710,17535732,FALSE,0,0.132241214684056,0.806411939651237,,,,,,,0.727034739105961,0.312884384778431,0.429637976895008,3,2
+Sri Lanka,LKA,1992,62710,17736827,FALSE,0,0.307244453211061,0.884412940035002,,,,,,13.7458515462026,0.798204975058191,3.73437723486217,4.95043365815729,3,3
+Sri Lanka,LKA,1993,62710,17924827,FALSE,0,0.492735400268383,1.01780080969592,,,,,,14.0975469444137,0.918329020566026,3.9020207885945,5.16953712174937,3,3
+Sri Lanka,LKA,1994,62710,18094474,FALSE,0.000400345201787991,0.423376237914359,1.20656762382777,,,,,,13.6447673414892,1.09616366187844,3.81877788710828,5.05476908042734,3,3
+Sri Lanka,LKA,1995,62710,18242917,FALSE,0.00078750402946947,0.14807817046104,1.36768154427073,0.609842994217463,,,,,14.5197110299703,1.25168375331134,3.32922024858979,4.13232898699002,4,4
+Sri Lanka,LKA,1996,62710,18367290,FALSE,0.00776754045693832,0.302768183126081,1.40574300129379,0.533612023386306,,,,,16.0512454152174,1.28102346689222,3.6602272326961,4.5421622721555,4,4
+Sri Lanka,LKA,1997,62710,18470897,FALSE,0.0230401718504459,1.03303860248981,1.54630507281243,0.60032492911345,,,,,17.1322389310002,1.41211008969208,4.06698954145326,5.04442813807388,4,4
+Sri Lanka,LKA,1998,62710,18564595,FALSE,0.041815391206914,0.487678918030741,1.57802969332943,0.605140014071815,,,,,19.0969696178581,1.43753758632492,4.3619267268994,5.40683153407139,4,4
+Sri Lanka,LKA,1999,62710,18663293,FALSE,0.0489015862759358,0.470967249655384,1.56170947800649,0.624713678974337,,,,,21.2117227114709,1.42031224198686,4.78360294087662,5.93192897052188,4,4
+Sri Lanka,LKA,2000,62710,18777606,FALSE,0.0903138346377826,0.40861247616328,1.82820022804855,0.625430314279096,,,,,25.5547691134732,1.65460781190238,5.70146519332039,7.0608549289545,4,4
+Sri Lanka,LKA,2001,62710,18911727,FALSE,0.109952968869913,0.398408358000471,1.66340564027039,0.577946996276561,,,,,26.8727931091538,1.49687892884907,5.92450141451422,7.33650684806997,4,4
+Sri Lanka,LKA,2002,62710,19062476,FALSE,0.144344381843896,0.478452510519254,1.61796952786428,0.629444841384688,,,,,26.1005353944417,1.44784821742574,5.79414933121076,7.16407024094284,4,4
+Sri Lanka,LKA,2003,62710,19224036,FALSE,0.198747120414244,0.584124615392949,1.75269612401896,0.721457667578819,1.32007062607562,,2.25142980212727,,27.4489952801957,1.57736701572449,5.49290843495466,6.51667487620385,6,5
+Sri Lanka,LKA,2004,62710,19387153,FALSE,0.195396776720127,0.53975593004751,2.0076905106755,0.851347196728147,1.82314604311399,2.59624518158144,2.97664936964993,100,30.5842913017305,1.80081917674936,5.67876803816188,22.7921438291509,7,6
+Sri Lanka,LKA,2005,62710,19544988,FALSE,0.240175681471005,0.697436745258754,2.18441120749337,0.866214272916886,1.85255063861211,2.94640165140725,2.95261152151932,100,33.4774834938897,1.94799315594708,6.19496208199376,23.3236231982553,7,6
+Sri Lanka,LKA,2006,62710,19695977,FALSE,0.337485357117777,1.13344245760664,2.43473779729911,0.890401431898301,1.85363982081136,3.7044069702464,2.0143590881666,0.0346157888620339,36.7171462283035,2.22711248744167,6.74742561866262,7.16951291371313,7,6
+Sri Lanka,LKA,2007,62710,19842044,FALSE,0.51222457551193,1.45444970602234,2.66710959228896,0.888733919058037,1.93201104936287,,2.18130589608447,0.0875833889766893,,2.45590021877165,1.54076473779315,1.41359462578264,6,5
+Sri Lanka,LKA,2008,62710,19983984,FALSE,,1.78627449842967,3.08639400915526,0.905510818826553,2.02240849604189,,1.08290638061879,0.11005964654667,,2.83973685242164,1.71527142675757,1.34489763936866,5,5
+Sri Lanka,LKA,2009,62710,20123508,FALSE,,0.924105146320844,2.44912440012715,0.904655519624067,1.72371095871325,,1.97156332137867,0.225996426724343,40.5211744155554,2.20786302057081,9.35412456060123,7.79255964169569,5,6
+Sri Lanka,LKA,2010,62710,20261738,FALSE,,1.12573234401353,3.10488782668127,1.13050035856718,1.99211466680145,,1.06806157417413,0.300516186265565,45.8036418991267,2.83725560492505,10.4465648005126,8.71095132784536,5,6
+Sri Lanka,LKA,2011,62710,20398496,FALSE,,2.18434174397826,4.2199776884403,1.31765038579478,2.48655700820916,,1.76816824990298,0.593154921747952,47.7919075500719,3.84578135469634,11.4564091236376,9.58350070103204,5,6
+Sri Lanka,LKA,2012,62710,20425000,FALSE,,2.15814923344169,4.14402400370499,1.42715868080814,2.81682969979693,17.0349753207355,1.76587382976612,0.830856696697964,45.0139364728582,3.77388220743507,11.9240195902191,9.1616428535012,6,6
+Sri Lanka,LKA,2013,62710,20585000,FALSE,,2.12557053856211,4.26259662068435,1.57834211456584,2.92697307202706,16.4124677024209,1.75214831056463,1.60420000425055,43.1637243936515,3.92635398485278,11.5491416134082,9.02505655774124,6,6
+Sri Lanka,LKA,2014,62710,20778000,FALSE,1.3237337783729,2.02736192737687,4.60570860155394,1.73847973213347,2.94364986052505,,2.08304781824851,2.47230316624718,48.8071426726621,4.23545006237516,10.0975790883913,10.2272975631739,6,6
+Sri Lanka,LKA,2015,61893,20970000,FALSE,1.51147870840016,1.53233308428564,4.57161074847883,1.93862860206489,3.10802554338645,95.9347634198149,1.37598370903092,3.58702734274131,55.840085771347,4.21865808126855,23.2435548633461,11.4154527651231,7,6
+Sri Lanka,LKA,2016,61893,21203000,FALSE,1.86549774290784,2.34541874366956,4.62822108254241,2.07028290302255,3.3413565561448,,3.23204964621274,5.3223851110582,59.290494568728,4.28451868176041,12.2386607811805,12.7575249424086,6,6
+Sri Lanka,LKA,2017,61893,21444000,FALSE,2.60188980166185,2.95444089152791,4.98152509368563,2.08722082115041,3.46483637141895,,2.01835327213055,7.18676956810529,63.2442210985978,4.61180339092042,12.9812751631257,13.6838015070721,6,6
+Sri Lanka,LKA,2018,61864,21670000,FALSE,3.14289252916183,3.40408684996747,5.22161213623354,2.23922022762938,3.72752353329354,,1.49797765000811,,,4.84056478774954,3.10115787860007,2.99546237883862,6,4
+Sri Lanka,LKA,2019,61864,21803000,FALSE,3.48414994425815,1.65118474626278,4.84237360208174,1.93080944868813,,,,,,4.51482618560059,2.9771294353227,2.6989401268505,4,3
+Sri Lanka,LKA,2020,61864,21919000,FALSE,4.18275475569631,0.0290995338818058,3.42314552770525,,,,,,,3.22530084284719,2.54499993909445,1.6272001883645,3,2
+Lesotho,LSO,1990,30360,1703757,FALSE,0,0.424203931143388,1.76472281539306,,,,,,,2.85314376610756,0.729642248845481,1.63867384862547,3,2
+Lesotho,LSO,1991,30360,1742534,FALSE,0,0.201104887781291,1.94226863011759,,,,,,,3.03880478275062,0.714457839299626,1.61995483526596,3,2
+Lesotho,LSO,1992,30360,1782284,FALSE,0,0.205967543392468,2.17142877959299,,,,,,,3.3367570745026,0.792465440995152,1.77136230894754,3,2
+Lesotho,LSO,1993,30360,1822237,FALSE,0,0.376723336244516,2.06897693652034,,,,,,,3.12330931265361,0.815233424254951,1.75001632444906,3,2
+Lesotho,LSO,1994,30360,1861323,FALSE,0,1.01954167445939,2.03101575371995,,,,,,,3.18611489281226,1.01685247605978,2.10282828363583,3,2
+Lesotho,LSO,1995,30360,1898598,FALSE,0,0.558446815139102,2.2194952113282,1.33580905133938,,,,,,3.29354734407768,1.02843776945167,1.72926773685205,4,3
+Lesotho,LSO,1996,30360,1934294,FALSE,0.00385405891367313,0.659231161046925,2.12729594037539,1.95800243307474,,,,,,3.02766490865584,1.18709589835268,1.88163283425917,4,3
+Lesotho,LSO,1997,30360,1968054,FALSE,0.00743288080133696,0.728192381162498,2.17004145978506,1.93056250268234,,,,,,2.98883373475056,1.20905730610781,1.8825295395318,4,3
+Lesotho,LSO,1998,30360,1997524,FALSE,0.014367997345368,0.622480331479508,1.79809445764027,1.76218426245211,,,,,,2.39382383912546,1.04928176222931,1.59282947768569,4,3
+Lesotho,LSO,1999,30360,2019732,FALSE,0.0697813913784095,0.478545201216151,1.56352516741355,1.85105566268022,,,,,,2.0452426362601,0.990726855672083,1.45828116671882,4,3
+Lesotho,LSO,2000,30360,2032805,FALSE,0.272934085296493,0.699098732013914,1.52479878491057,1.80328639463141,,,,,,1.99573690502894,1.0750294992131,1.49937401055809,4,3
+Lesotho,LSO,2001,30360,2035738,FALSE,0.336034095814674,0.639771655205978,1.56977321337408,1.75891476195609,,,,,,1.95962530025283,1.0761234315877,1.45277057247163,4,3
+Lesotho,LSO,2002,30360,2029832,FALSE,1.39881892425437,0.613439348112618,1.61539620668941,1.71615903469185,,,,,,1.97758728029081,1.33595337843706,1.4357285543651,4,3
+Lesotho,LSO,2003,30360,2018355,FALSE,1.98891881399381,0.954955734288186,2.29892245097979,1.97871311481393,1.41873265681455,,,,,2.82254264095819,1.80537752851893,1.91873716335344,5,3
+Lesotho,LSO,2004,30360,2005953,FALSE,2.8409153096536,1.23522205593636,2.74455947765969,1.8395568299785,1.33831552486307,,,,,3.39138435352285,2.16506341830704,2.15538774647924,5,3
+Lesotho,LSO,2005,30360,1996115,FALSE,3.38602813479232,0.857718386937372,2.78039468311455,1.84863038401746,1.33387044431271,,,,,3.23649920113956,2.21819289721542,1.98094932403146,5,3
+Lesotho,LSO,2006,30360,1989933,FALSE,3.92238639619642,0.609365967592439,2.99427126470562,2.17792743921952,1.40084185023966,,,,,3.46451219169844,2.4259877669285,2.08393519950347,5,3
+Lesotho,LSO,2007,30360,1986926,FALSE,4.54231230736942,1.69684853797784,3.31591164675468,1.83273073812172,1.71631112030521,,,0.00284379321238345,,3.85225654210086,2.84695080755592,1.8461699028532,5,4
+Lesotho,LSO,2008,30360,1987130,FALSE,4.71923756997111,0.243007232413024,3.45410766739953,1.7897492065297,1.59895040122884,,,0.00358212617180192,,3.91491959329583,2.55152541907834,1.48781453960259,5,4
+Lesotho,LSO,2009,30360,1990135,FALSE,4.89638429472228,2.01318234167365,3.35331308961471,2.0983530837339,1.5755946535335,,3.62467601172513,0.00726415467905917,,3.79875188471757,3.19718176429393,2.30844549530586,6,5
+Lesotho,LSO,2010,30360,1995575,FALSE,5.06680679219651,0.209073137009352,4.01097496779761,2.59179970550908,1.4742580422326,,0,0.00945058112039563,,4.37758643703376,2.37573092050251,1.43758197213452,6,5
+Lesotho,LSO,2011,30360,2003793,FALSE,9.1508256082447,1.33896249810062,4.62781830261151,2.41141469455262,1.24679263329748,1.79355643349491,0,0.0548259951289245,,5.01511342430798,3.22042958950073,1.76406332241803,7,5
+Lesotho,LSO,2012,30360,2014988,FALSE,12.9999783749307,1.23314176688241,4.42841264841929,2.54872912703087,1.19119503490677,37.5599809973577,0,0.0690892597116163,,4.70616989681099,9.79504048577017,1.71142601008718,7,5
+Lesotho,LSO,2013,30360,2028528,FALSE,19.3698093586174,1.09033221108513,3.70779632159375,2.59159278313883,1.25814707415105,,0,0.0986551970752593,,3.96815869129823,5.35190613488702,1.54974777651949,6,5
+Lesotho,LSO,2014,30360,2043448,FALSE,28.2016282952338,2.02739909749454,3.58208269369073,6.41302286948042,1.45646255564982,8.83722744880662,1.76505460246471,0.357951166843982,,3.77386931494607,8.4710691678618,2.86745941024594,7,5
+Lesotho,LSO,2015,30360,2059011,FALSE,31.8050758662107,4.39897022092289,3.51460292209564,6.38223886044288,1.39305752796538,,1.75171346694957,0.62541497792659,,3.67503911852217,9.57052026732434,3.36667532895282,6,5
+Lesotho,LSO,2016,30360,2075041,FALSE,40.968940172793,1.6747389868915,3.39151166114757,7.00031667761806,1.95637154749964,,0,0.929338049822592,,3.62586317530045,10.60710149969,2.64605137792652,6,5
+Lesotho,LSO,2017,30360,2091532,FALSE,48.8444459183055,0.884271826254709,3.82893585138532,6.60242852401699,1.37487932632898,6.37468068747584,0,1.09745120587082,,4.09877788709293,11.0891271345731,2.53658588864709,7,5
+Lesotho,LSO,2018,30360,2108327,FALSE,50.6917502536558,0.850294083692062,4.1832620164512,6.75725002544485,1.2395105165614,,1.71073903493021,,,4.43599223492338,12.8386590828348,3.43856884474762,6,4
+Lesotho,LSO,2019,30360,2125267,FALSE,52.1386474513172,0.737412103882082,3.75760675654891,6.52618297271617,,,,,,4.00570665816113,15.7899623211161,3.75643391158646,4,3
+Lesotho,LSO,2020,30360,2142252,FALSE,,,3.23142468159376,,,,,,,3.43394484654562,3.23142468159376,3.43394484654562,1,1
+Lithuania,LTU,1990,62680,3697838,FALSE,0,,,,,,,,,,0,,1,0
+Lithuania,LTU,1991,62680,3704134,FALSE,0,,,,,,,,,,0,,1,0
+Lithuania,LTU,1992,62680,3700114,FALSE,0,0.118534321502628,,,,,,,,,0.0592671607513139,0.118534321502628,2,1
+Lithuania,LTU,1993,62680,3682613,FALSE,0,0.359379341743565,3.02176444226213,,,,,,,2.6419925962493,1.1270479280019,1.50068596899643,3,2
+Lithuania,LTU,1994,62680,3657144,FALSE,0,0.375429692383395,3.2446988279019,,,,,,,2.84738500692938,1.20670950676176,1.61140734965639,3,2
+Lithuania,LTU,1995,62680,3629102,FALSE,0,0.889000016033384,4.6914398036331,8.70171765941993,,,,,,4.16137352126908,3.57053936977161,4.58403039890747,4,3
+Lithuania,LTU,1996,62680,3601613,FALSE,0.201770577560596,1.85739046337291,6.14057928658045,11.7936548675946,,,,,,5.47818733815002,4.99834879877715,6.37641088970586,4,3
+Lithuania,LTU,1997,62680,3575137,FALSE,0.716883664450954,4.87000819042657,6.91500448078672,12.5775741984926,,,,,,6.25452993582831,6.26986763353922,7.90070410824917,4,3
+Lithuania,LTU,1998,62680,3549331,FALSE,1.45542402855981,11.3848044797839,6.91980205146925,14.6712562924079,,,,,,6.34707318957453,8.60782171305523,10.8010446539221,4,3
+Lithuania,LTU,1999,62680,3524238,FALSE,2.17263517673993,8.10463374930561,5.73246355261799,15.3513725494191,,,,,,5.29914063426183,7.84027625702066,9.58504897766218,4,3
+Lithuania,LTU,2000,62680,3499536,FALSE,4.81080207074074,4.82977234518459,6.6029722300035,14.2031300741498,,,,,,6.11038718529716,7.61166918001967,8.3810965348772,4,3
+Lithuania,LTU,2001,62680,3470818,FALSE,5.4183717971673,5.63683426760967,7.77601757977824,14.6811635132838,,,,,,7.15654531999937,8.37809678945975,9.15818103363094,4,3
+Lithuania,LTU,2002,62680,3443067,FALSE,13.4585246099314,8.85034991404548,9.35950171622969,14.1079702564671,,,,,,8.53097984173146,11.4440866241684,10.4964333374147,4,3
+Lithuania,LTU,2003,62680,3415213,FALSE,19.8730585480628,3.76038361164338,12.2065113495844,12.9282917360728,6.27357581703265,10.2240907350625,15.8414598033737,100,,11.2664795142953,12.4722992972999,28.7593229330771,7,5
+Lithuania,LTU,2004,62680,3377075,FALSE,24.2240287022354,15.2907890041204,16.9612530663412,,7.8374691810779,11.1572603830662,24.5645530045492,100,,15.7416327765561,18.4395768320625,38.8992436963064,6,4
+Lithuania,LTU,2005,62680,3322528,FALSE,28.5558367430006,24.2900273174941,22.1940323867724,,10.549741041315,14.2558365772021,46.6789997808247,100,,20.5749809688451,27.1949465610588,47.886002016791,6,4
+Lithuania,LTU,2006,62680,3269909,FALSE,35.1676985105764,37.2798624215842,27.7978954389776,16.2037071409106,11.3087358829695,15.4285417841876,24.2665898471611,2.06783628911662,,25.9107439955541,26.0240491905662,21.1457479388653,7,5
+Lithuania,LTU,2007,62680,3231294,FALSE,40.4519223953213,47.1894652691522,34.6710527095329,29.6156678881691,12.0902062759682,17.0031068686974,30.1376250588857,3.56926643816278,,32.7776469563967,33.1781400316264,28.6579343221533,7,5
+Lithuania,LTU,2008,62675,3198231,FALSE,45.2274047593697,31.2952595764965,46.2585667149309,31.547535096574,14.06380161045,17.691040005683,19.1717090022747,7.51373168278338,,43.3677602714896,31.8652525258881,26.5791991259237,7,5
+Lithuania,LTU,2009,62675,3162916,FALSE,49.4923441989139,13.3769963445896,30.2481789593895,29.3418525610597,8.94486231129961,15.6852605711061,45.6135704811294,11.0808215691908,,27.3007111741686,30.6263671860313,25.3427904260276,7,5
+Lithuania,LTU,2010,62675,3097282,FALSE,52.5370632201807,17.1275565357406,37.618207342339,32.8817305868416,11.9391484637593,14.9537292799871,24.4545841299705,22.2221799507482,,34.9962159907852,29.9288118491766,26.3364534388172,7,5
+Lithuania,LTU,2011,62674,3028115,FALSE,55.0519549981398,39.0513720374921,51.6868408174581,34.1944764780104,12.6077369269721,17.0966387914133,21.4398565943999,35.4008946211118,,48.38167263224,36.4201899528189,35.6936544726508,7,5
+Lithuania,LTU,2012,62674,2987773,FALSE,58.9427695184444,16.1339238097348,54.1034336820718,36.945299068425,13.2538310588349,17.6284691531921,16.900601940697,37.0227853560107,,50.0167548135826,33.4424161954275,31.40387299769,7,5
+Lithuania,LTU,2013,62675,2957689,FALSE,60.6253752190807,16.3193519583558,59.3278517320813,38.9845363726405,13.5817607413328,17.2186547137688,46.3396581916819,45.0429214210312,7.7911879631693,54.4950937898993,35.2295165929683,34.8287916161296,7,6
+Lithuania,LTU,2014,62650,2932367,FALSE,64.4336454034909,13.5068206135879,57.1478652175714,39.3916199822806,15.6759635811972,17.5840625759722,24.5999037453177,68.1283597789343,,52.2199752389385,36.1106529230368,39.5693358718118,7,5
+Lithuania,LTU,2015,62650,2904910,FALSE,64.3646106262843,21.0407842436232,47.7641568121287,37.7566622709791,16.6460130642765,21.5344463597724,17.3826941840409,75.1409916825306,11.1119935369139,44.402923520456,31.5650497191061,34.4726749064239,7,6
+Lithuania,LTU,2016,62642,2868231,FALSE,67.9262370004567,31.9657270217235,48.7705380464851,40.0861260811876,18.3262418399025,22.4289585199261,16.3474855633542,100,9.51392749514161,45.2604091041432,33.8627142468964,40.5289458775917,7,6
+Lithuania,LTU,2017,62641,2828403,FALSE,71.8821240916677,28.4490410130353,59.2644285689804,42.4502174750754,19.5393520506368,25.3236615073715,12.7520629036856,100,9.68683557395291,54.7488692966967,35.686910161967,41.3478377104077,7,6
+Lithuania,LTU,2018,62630,2801543,FALSE,74.5416773929611,36.6264603973606,68.8524670089181,46.9028702457023,22.008533054273,,29.6109457673282,,,63.5622699382311,51.3068841624541,44.1756365871555,6,4
+Lithuania,LTU,2019,62630,2794137,FALSE,76.4823185324661,33.3148337676564,70.6978310412527,47.9575918926627,,,,,,65.2450578820294,57.1131438085095,48.8391611807828,4,3
+Lithuania,LTU,2020,62630,2794700,FALSE,77.8482349672186,12.4370999092757,67.5087287885923,,,,,,,62.3462552738865,52.5980212216956,37.3916775915811,3,2
+Luxembourg,LUX,1990,,381850,TRUE,0,,,,,,,,,,0,,1,0
+Luxembourg,LUX,1991,,387000,TRUE,0,,,,,,,,,,0,,1,0
+Luxembourg,LUX,1992,,392175,TRUE,1.0232706714376,,,,,,,,,,1.0232706714376,,1,0
+Luxembourg,LUX,1993,,397475,TRUE,1.99129331208549,,,,,,,,,,1.99129331208549,,1,0
+Luxembourg,LUX,1994,,402925,TRUE,3.22773588170445,,,,,,,,,,3.22773588170445,,1,0
+Luxembourg,LUX,1995,,408625,TRUE,10.1986921621531,,,22.8303191117126,,,,,,,16.5145056369329,22.8303191117126,2,1
+Luxembourg,LUX,1996,,414225,TRUE,35.1075986199764,,,21.2312650986377,,,,,,,28.169431859307,21.2312650986377,2,1
+Luxembourg,LUX,1997,,419450,TRUE,44.606438909698,,,42.6300798366182,,,,,,,43.6182593731581,42.6300798366182,2,1
+Luxembourg,LUX,1998,,424700,TRUE,72.4446516565261,,,44.2197512824568,,,,,14.5552206229465,,43.7398745206431,29.3874859527016,2,2
+Luxembourg,LUX,1999,,430475,TRUE,100,,100,47.1822124144093,,,,,23.3582276714269,100,67.635110021459,56.8468133619454,3,3
+Luxembourg,LUX,2000,2430,436300,TRUE,100,,100,50.1718752563386,,,,,17.3875699523291,100,66.8898613021669,55.8531484028892,3,3
+Luxembourg,LUX,2001,2430,441525,TRUE,100,,100,48.3950383724458,,,,,18.0773800002195,100,66.6181045931663,55.4908061242218,3,3
+Luxembourg,LUX,2002,2430,446175,TRUE,100,100,100,52.6553605493387,,,,,17.6441507706828,100,74.0599022640043,67.5748778300054,4,4
+Luxembourg,LUX,2003,2430,451630,TRUE,100,100,100,50.7820371167673,100,100,100,100,16.5246962330657,100,81.0438190499762,77.8844555583055,7,6
+Luxembourg,LUX,2004,2430,458095,TRUE,100,100,100,52.4519988068587,100,100,47.2408207550482,100,17.0354981755174,100,73.8183311053463,69.454719622904,7,6
+Luxembourg,LUX,2005,2430,465158,TRUE,100,100,100,54.7894334469985,100,100,100,100,16.5711833384576,100,81.6229452550652,78.560102797576,7,6
+Luxembourg,LUX,2006,2430,472637,TRUE,100,100,100,51.19795677171,100,100,76.3122078317461,14.6732980599455,17.6072014198646,100,77.873909431903,59.9651106805444,7,6
+Luxembourg,LUX,2007,2430,479993,TRUE,100,100,100,51.7799797579038,99.4398919580808,100,100,,,100,91.9633299596506,87.944994939476,7,4
+Luxembourg,LUX,2008,2430,488650,TRUE,100,100,100,51.3846769569674,100,100,100,100,,100,91.8974461594946,90.2769353913935,7,5
+Luxembourg,LUX,2009,2430,497783,TRUE,100,100,100,53.907263583328,93.428830621355,100,100,100,11.2362846915497,100,80.7347926106968,77.5239247124796,7,6
+Luxembourg,LUX,2010,2430,506953,TRUE,100,100,100,48.9303679146132,93.4359237477154,100,100,100,14.2073992959696,100,80.4482524586547,77.1896278684305,7,6
+Luxembourg,LUX,2011,2430,518347,TRUE,100,100,100,58.9868583518682,100,,100,100,14.8418392402817,100,78.9714495986917,78.9714495986917,6,6
+Luxembourg,LUX,2012,2430,530946,TRUE,100,100,100,57.8845423667836,100,100,81.5178333909053,100,11.0723501510787,100,78.6392465583954,75.0791209847946,7,6
+Luxembourg,LUX,2013,2430,543360,TRUE,100,100,100,57.4339638835963,100,100,73.0174658978767,100,13.3792589299203,100,77.6900983873419,73.9717814518989,7,6
+Luxembourg,LUX,2014,2430,556319,TRUE,100,100,100,62.2975672497735,100,100,100,100,17.3331012942137,100,82.8043812205696,79.9384447573312,7,6
+Luxembourg,LUX,2015,2430,569604,TRUE,100,100,100,59.5436048051112,100,100,100,100,50.2610118286805,100,87.1149452333988,84.967436105632,7,6
+Luxembourg,LUX,2016,2430,582014,TRUE,100,100,100,55.1431125256037,100,100,100,100,51.4151371129201,100,86.6511785197891,84.426374939754,7,6
+Luxembourg,LUX,2017,2430,596336,TRUE,100,100,100,58.0151497836783,100,100,66.5308991412061,100,51.9866345723882,100,82.3618119281818,79.4221139162121,7,6
+Luxembourg,LUX,2018,2430,607950,TRUE,100,100,100,60.0839395717653,100,,83.0580839907265,,,100,88.6284047124984,85.7855058906229,6,4
+Luxembourg,LUX,2019,2430,620001,TRUE,100,100,100,70.3194447232056,,,,,,100,92.5798611808014,90.1064815744019,4,3
+Luxembourg,LUX,2020,2430,632275,TRUE,100,,100,,,,,,,100,100,100,2,1
+Latvia,LVA,1990,62196,2663151,FALSE,0,,,,,,,,,,0,,1,0
+Latvia,LVA,1991,62196,2650581,FALSE,0,,,,,,,,,,0,,1,0
+Latvia,LVA,1992,62196,2614338,FALSE,0,0.572332054055771,1.89348894057894,,,,,,,1.64719876697726,0.821940331544903,1.10976541051651,3,2
+Latvia,LVA,1993,62196,2563290,FALSE,0,1.06498874707448,2.64639721186242,,,,,,,2.32619358548576,1.23712865297897,1.69559116628012,3,2
+Latvia,LVA,1994,62196,2520742,FALSE,0,4.98628047608732,3.12750440852761,,,,,,,2.80313240887871,2.70459496153831,3.89470644248301,3,2
+Latvia,LVA,1995,62196,2485056,FALSE,0,4.31686872898349,4.13008317985247,16.8391011881958,,,,,,3.70831166008356,6.32151327425794,8.28809385908762,4,3
+Latvia,LVA,1996,62196,2457222,FALSE,0.866383318382946,6.75952015075563,5.10839412688069,17.5390704353636,,,,,,4.66639422285648,7.56834200784571,9.65499493632522,4,3
+Latvia,LVA,1997,62196,2432851,FALSE,2.21097947897942,9.28379711943718,5.58706842361633,18.5686366513099,,,,,,5.13930987635724,8.91262041833571,10.9972478823681,4,3
+Latvia,LVA,1998,62196,2410019,FALSE,3.60340647238264,8.00557846380454,6.42152570993751,18.8957838985162,,,,,,5.92726767234039,9.23157363616022,10.9428766782204,4,3
+Latvia,LVA,1999,62196,2390482,FALSE,4.80770424465992,6.70779732722941,6.02235834506897,20.2952696211549,,,,,,5.58917727987519,9.45828238452829,10.8640814094198,4,3
+Latvia,LVA,2000,62196,2367550,FALSE,6.99147093586523,6.13385075228351,5.19595553393998,22.9752792957219,,,,,,4.80490035232471,10.3241391294527,11.3046768001101,4,3
+Latvia,LVA,2001,62196,2337170,FALSE,8.09138071449653,4.83748197448297,5.90429609706239,24.7293073846675,,,,,,5.49117086280294,10.8906165426774,11.6859867406511,4,3
+Latvia,LVA,2002,62196,2310173,FALSE,24.8775274120529,3.92644429868441,6.85677861946411,24.2032526711336,,,,,,6.36209901731784,14.9660007503338,11.4972653290453,4,3
+Latvia,LVA,2003,62196,2287955,FALSE,30.8894062814434,7.71620140790867,9.59915915454633,25.5373732275761,7.92356696949259,,39.4107106269277,,,9.00276314308977,22.6305701396804,20.4167621013756,6,4
+Latvia,LVA,2004,62196,2263122,FALSE,44.6549236154852,13.1132567364402,13.7324764013272,29.9722761730243,11.7071178096261,5.44821177168973,33.4682545807266,100,,13.1648279632793,23.3982332131155,37.9437230906941,7,5
+Latvia,LVA,2005,62196,2238799,FALSE,53.8217508398149,20.2877243646422,18.310947590579,36.6247590164317,15.7790971201899,12.3354825491094,32.2208228366843,100,7.04781071294682,17.7701725450246,25.8070425586012,35.6585482459549,7,6
+Latvia,LVA,2006,62196,2218357,FALSE,63.3273700686004,37.9244068516164,23.6988774484852,42.7121789546214,18.9929525467661,,24.3883015490561,2.44400814819047,9.25883977795048,23.4741237556177,33.5516624417217,23.3669765061754,6,6
+Latvia,LVA,2007,62196,2200325,FALSE,70.4417002575224,69.422909794765,32.9340134150549,47.5176579766015,22.6376690275882,,32.7842232151823,,,32.8069380745107,50.6201009318252,45.6329322652649,6,4
+Latvia,LVA,2008,62196,2177322,FALSE,76.2869384958443,35.7972188107902,36.8302257173428,51.763407121887,28.4561677646175,,28.1609950453144,2.3592929600569,,36.7073027442184,45.7677570382357,30.9576433364534,6,5
+Latvia,LVA,2009,62180,2141669,FALSE,81.7521503302701,7.03850698129299,26.0703418943517,45.3477286840547,32.2799039804498,,18.5251643789354,3.42657710877365,9.24737791459837,24.0931470464315,31.3302116972505,17.9464170190144,6,6
+Latvia,LVA,2010,62240,2097555,FALSE,85.4446364996136,12.0817540501241,30.1840097716052,48.496447315163,37.4461832309977,,20.634294484563,16.7939147061514,23.3256011704152,28.7560784747178,36.6944572152473,25.0146817001891,6,6
+Latvia,LVA,2011,62200,2059709,FALSE,88.7060327164653,34.6523962434609,40.6614493506809,51.8705853827934,39.8301007961135,,17.5111984134521,25.6537988218501,23.8010195367617,38.8320928622065,42.8671136072691,32.0535152100875,6,6
+Latvia,LVA,2012,62180,2034319,FALSE,94.1525067699236,26.7787677264126,42.9408661001323,44.1817614729854,37.2234036224595,,23.048678631456,32.4675040650303,20.9672505251028,41.1380844832605,42.0116385376688,31.4303411507079,6,6
+Latvia,LVA,2013,62190,2012647,FALSE,97.9183181725691,32.3196800851167,45.409554180217,45.858648971922,37.1614506825486,13.132680424802,32.2571972886211,54.695261360581,20.102201252492,43.3123080740997,40.9997543393914,38.0908828388054,7,6
+Latvia,LVA,2014,62140,1993782,FALSE,99.6273271743972,38.2598024314845,47.5987835692474,49.302477274458,36.1902515269108,13.2024599786085,41.6075267194898,62.5745038395496,17.7682727633388,45.2534872815348,43.9095214158606,42.4610117183093,7,6
+Latvia,LVA,2015,62130,1977527,FALSE,100,21.2226776764846,40.7259591385434,52.5949614792448,37.970200909186,12.9951520824241,56.5406774300509,66.7999744292836,17.6248460370202,38.991986695392,43.1006105491097,42.2958539579127,7,6
+Latvia,LVA,2016,62120,1959537,FALSE,100,12.999281574141,41.1497334300272,54.1565316231272,38.3826105805099,12.09978342412,12.8844625445098,74.9036219569624,20.487633358173,39.498463327662,36.2539179934426,35.8216657307626,7,6
+Latvia,LVA,2017,62110,1942248,FALSE,100,39.0063881618756,47.0821274399599,61.1746648393785,42.4977442533897,17.5270933116418,24.1412862131226,79.3489051822962,25.3262431532656,45.1194712682006,44.8939718741777,45.6861598030232,7,6
+Latvia,LVA,2018,62090,1927174,FALSE,100,16.9124536923783,53.3510709821931,62.7184662708998,48.54733758707,,29.9447568080291,,,51.176055185372,52.5853495507001,40.1879329891698,6,4
+Latvia,LVA,2019,62090,1913822,FALSE,100,26.9164917837503,52.1686909889125,68.0816886762716,,,,,,49.8694079292753,61.7917178622336,48.2891961297657,4,3
+Latvia,LVA,2020,62090,1901548,FALSE,100,4.42700882642814,51.2995620217914,,,,,,,48.3347461629662,51.9088569494065,26.3808774946972,3,2
+"Macao SAR, China",MAC,1990,20,343816,TRUE,0,0.0612314264568082,,,,,,,,,0.0306157132284041,0.0612314264568082,2,1
+"Macao SAR, China",MAC,1991,20,353623,TRUE,0,1.32957703161385,,,,,,,,,0.664788515806926,1.32957703161385,2,1
+"Macao SAR, China",MAC,1992,20,362308,TRUE,0,2.36056471240251,,,,,,,,,1.18028235620126,2.36056471240251,2,1
+"Macao SAR, China",MAC,1993,20,370195,TRUE,0,0.426511921798119,,,,,,,,,0.21325596089906,0.426511921798119,2,1
+"Macao SAR, China",MAC,1994,20,377805,TRUE,0.256490544432854,0.403990140046813,,,,,,,,,0.330240342239834,0.403990140046813,2,1
+"Macao SAR, China",MAC,1995,20,385517,TRUE,1.90261729033152,0.249149376140222,,100,,,,,,,34.0505888888239,50.1245746880701,3,2
+"Macao SAR, China",MAC,1996,20,393376,TRUE,4.84289503033318,0.662274156198117,,100,,,,,,,35.1683897288438,50.3311370780991,3,2
+"Macao SAR, China",MAC,1997,20,401353,TRUE,15.4297719336896,0.252432163385146,,100,,,,,,,38.5607346990249,50.1262160816926,3,2
+"Macao SAR, China",MAC,1998,20,409620,TRUE,44.7855770993985,1.91552758391455,,100,,,,,,,48.900368227771,50.9577637919573,3,2
+"Macao SAR, China",MAC,1999,20,418388,TRUE,57.6753240347531,0.987485906213794,,100,,,,,,,52.8876033136556,50.4937429531069,3,2
+"Macao SAR, China",MAC,2000,20,427772,TRUE,83.3327782826226,0.0809979374417156,,100,,,,,50.098466931279,,58.3780607878358,50.0598216229069,3,3
+"Macao SAR, China",MAC,2001,26,437928,TRUE,100,17.0856203152837,,100,,,,,59.4011014835095,,69.1216804496983,58.8289072662644,3,3
+"Macao SAR, China",MAC,2002,27,448813,TRUE,100,43.2260204264374,60.5236006002148,100,,,,,62.4576502669337,58.0075446942882,73.2414542587172,65.9228038469148,4,4
+"Macao SAR, China",MAC,2003,27,460157,TRUE,100,49.7037314581766,65.3491431316549,100,93.2540619006403,,39.1909424098438,,44.9109151029906,62.2394779580185,66.5257886837776,59.2090133858059,6,5
+"Macao SAR, China",MAC,2004,28,471600,TRUE,100,78.9141248046949,81.276549244192,100,100,,22.9440031634688,,61.4920356276134,77.9795387534295,74.1044521399949,68.2659404698413,6,5
+"Macao SAR, China",MAC,2005,28,482863,TRUE,100,100,83.0615998352955,100,100,,,,67.9381861881405,84.4079158303215,90.1999572046872,88.0865255046155,5,4
+"Macao SAR, China",MAC,2006,28.6,493804,TRUE,100,100,93.8271064362635,100,100,,,,76.3209172340465,100,94.029604734062,94.0802293085116,5,4
+"Macao SAR, China",MAC,2007,29.2,504504,TRUE,100,100,100,100,100,,50.0443625443625,,,100,90.0088725088725,87.5110906360906,6,4
+"Macao SAR, China",MAC,2008,29.2,515232,TRUE,100,100,100,100,100,,49.0023544366054,,,100,89.8004708873211,87.2505886091514,6,4
+"Macao SAR, China",MAC,2009,29.5,526401,TRUE,100,83.8189467735947,100,100,100,,61.6662500179059,,53.8180989366808,100,83.2172159546969,79.8606591456363,6,5
+"Macao SAR, China",MAC,2010,29.7,538215,TRUE,100,100,100,100,92.8452179814878,,53.611248995993,,53.3458039042764,100,84.4928421500449,81.3914105800539,6,5
+"Macao SAR, China",MAC,2011,29.9,550833,TRUE,100,100,100,100,81.0753760646803,,26.1915847256595,,56.6546619249438,100,80.4743744417672,76.5692493301207,6,5
+"Macao SAR, China",MAC,2012,29.9,564037,TRUE,100,100,100,100,86.4782224427998,,12.7892223286674,,59.9466093348557,100,78.7893052772539,74.5471663327046,6,5
+"Macao SAR, China",MAC,2013,30.3,577368,TRUE,100,100,100,100,98.2153481046402,,81.2105362002481,,68.9800588816204,100,91.6984325136448,90.0381190163737,6,5
+"Macao SAR, China",MAC,2014,30.3,590210,TRUE,100,100,100,100,98.7570038101723,,54.9993657777328,,79.5188847584512,100,89.086375089364,86.9036501072368,6,5
+"Macao SAR, China",MAC,2015,30.4,602093,TRUE,100,50.7840944708031,100,100,100,,41.9330254314219,,85.5833248898402,100,79.7167407986775,75.660088958413,6,5
+"Macao SAR, China",MAC,2016,30.5,612824,TRUE,100,100,100,100,100,,11.7710706411541,,100,100,85.2951784401924,82.3542141282308,6,5
+"Macao SAR, China",MAC,2017,30.8,622578,TRUE,100,100,100,100,100,,23.173303889937,,100,100,87.1955506483228,84.6346607779874,6,5
+"Macao SAR, China",MAC,2018,32.9,631633,TRUE,100,100,100,100,100,,22.8410947325254,,,100,84.5682189465051,80.7102736831313,6,4
+"Macao SAR, China",MAC,2019,32.9,640446,TRUE,100,100,100,100,,,,,,100,100,100,4,3
+"Macao SAR, China",MAC,2020,32.9,649342,TRUE,,37.6001792588123,100,,,,,,,100,68.8000896294062,68.8000896294062,2,2
+St. Martin (French part),MAF,1990,54.4,31522,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,1991,54.4,32441,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,1992,54.4,31816,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,1993,54.4,30194,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,1994,54.4,28482,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,1995,54.4,27320,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,1996,54.4,26854,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,1997,54.4,26910,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,1998,54.4,27388,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,1999,54.4,28122,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2000,54.4,28935,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2001,54.4,29847,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2002,54.4,30913,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2003,54.4,32055,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2004,54.4,33187,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2005,54.4,34252,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2006,54.4,35240,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2007,54.4,36138,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2008,54.4,36880,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2009,54.4,37380,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2010,54.4,37582,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2011,50,37451,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2012,50,37012,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2013,50,36458,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2014,50,36018,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2015,50,35865,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2016,50,36061,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2017,50,36569,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2018,50,37264,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2019,50,38002,TRUE,,,,,,,,,,,,,0,0
+St. Martin (French part),MAF,2020,50,38659,TRUE,,,,,,,,,,,,,0,0
+Morocco,MAR,1990,446300,24807461,FALSE,0,0.314917541673378,1.32947829240401,,,,,,,1.24891575016604,0.548131944692464,0.781916645919708,3,2
+Morocco,MAR,1991,446300,25260407,FALSE,0,0.590687574106548,1.28450957269495,,,,,,,1.23799014430299,0.625065715600498,0.91433885920477,3,2
+Morocco,MAR,1992,446300,25711410,FALSE,0,0.776001852894813,1.34184080578961,,,,,,1.66359536714096,1.29645369522821,0.945359506456345,1.245350305088,3,3
+Morocco,MAR,1993,446300,26155204,FALSE,0,0.86289984057728,1.23326810666805,,,,,,2.16477057054882,1.2002200239825,1.06523462944854,1.40929681170287,3,3
+Morocco,MAR,1994,446300,26584473,FALSE,0,0.948354844394388,1.30335743910445,,,,,,2.27152415859882,1.25653846678168,1.13080911052442,1.49213915659163,3,3
+Morocco,MAR,1995,446300,26994255,FALSE,0.000360060306985035,0.567697304318573,1.51535137542625,1.8296788656916,,,,,2.28111947294607,1.45604398758725,1.23884141573789,1.53363490763587,4,4
+Morocco,MAR,1996,446300,27383472,FALSE,0.000542908229122632,0.620937469992809,1.51606203323181,1.80320831022765,,,,,2.47148313525965,1.44430438775438,1.28244677138821,1.58498332580862,4,4
+Morocco,MAR,1997,446300,27754573,FALSE,0.00204193314289317,1.71922592536614,1.43028738958462,1.92701848867622,,,,,2.49264641056874,1.35472736794867,1.51424402946772,1.87340454813994,4,4
+Morocco,MAR,1998,446300,28110447,FALSE,0.0132603376673286,0.488000699615362,1.51258583524599,1.96137687334183,,,,,2.70386166334015,1.41783579508359,1.33581708184213,1.64276875784523,4,4
+Morocco,MAR,1999,446300,28455504,FALSE,0.0161644826883573,1.2815490749297,1.57501294432163,2.40333480406373,,,,,3.02067933506563,1.46659365297811,1.65934812821381,2.04303921675929,4,4
+Morocco,MAR,2000,446300,28793672,FALSE,0.0631170737789335,0.738870785755056,1.62536072580661,2.51558336275074,,,,,3.24496763216151,1.51375598823467,1.63757991605057,2.00329444222549,4,4
+Morocco,MAR,2001,446300,29126323,FALSE,0.123340482600422,4.39942586688065,1.64056851804755,2.62488929479553,,,,,3.16827900433545,1.53083564518037,2.39130063333192,2.930857452798,4,4
+Morocco,MAR,2002,446300,29454765,FALSE,0.211058868485972,0.75744686312803,1.78232353030988,2.57292014880867,,,,,2.67607597956375,1.65428300656243,1.59996507805926,1.91518149951572,4,4
+Morocco,MAR,2003,446300,29782884,FALSE,0.294937088574558,3.42450834542223,2.10641502158808,2.7040408079366,1.84838182680487,13.3159572385968,3.75419372469826,100,2.07384835368078,1.93980646651651,3.95341436864247,18.9827329497091,7,6
+Morocco,MAR,2004,446300,30115196,FALSE,1.00968140687252,1.34605191706013,2.55103298778979,2.95736140748496,2.07393097392857,6.68564737660071,3.59300065385325,100,2.39354161896952,2.33837832552837,2.93375962409013,18.7713889871494,7,6
+Morocco,MAR,2005,446300,30455563,FALSE,1.29741162143226,2.51257798300902,2.91228657786666,3.3187813946883,2.51696834288859,8.75911429098963,3.19756121490931,100,2.74270601205608,2.65897996292644,3.5343484421359,19.0717677612649,7,6
+Morocco,MAR,2006,446300,30804689,FALSE,1.68124540181308,4.14555625403445,3.36078922348654,3.51303169243302,2.85643401231451,9.54831357847778,4.09800941036624,0.273862059119769,3.38922927869024,3.06522070709427,4.24802497704305,3.080818233623,7,6
+Morocco,MAR,2007,446300,31163670,FALSE,1.80719475322873,4.86640345017601,4.25716068570822,4.04089287824122,3.35977158593779,10.8019079315311,2.43048213651483,0.5916833112247,,3.87234964654599,4.70067363923335,3.16036228454055,7,5
+Morocco,MAR,2008,446300,31536807,FALSE,2.74932048159523,3.86930177424404,5.63061000946679,4.47841593526289,3.436424286276,11.0257654909805,5.83276113406669,0.584681322261021,,5.09429913156343,5.59769580426935,3.97189185947961,7,5
+Morocco,MAR,2009,446300,31929087,FALSE,3.38827495312743,3.36452024567961,4.42738693935485,4.16618076885099,3.60283596448004,12.7615265869346,3.72777056891138,1.17670990687584,3.9529056335788,4.0852871603708,5.11265224234823,3.4122290473779,7,6
+Morocco,MAR,2010,446300,32343384,FALSE,4.21146291352425,2.46881897229779,4.75320362085722,4.47824849905764,4.6418323195643,16.4420365460832,4.34911494092871,1.70166630360369,7.20313521434173,4.34367602753374,6.27228867244151,4.09077665962721,7,6
+Morocco,MAR,2011,446300,32781860,FALSE,3.68428241973002,3.70517600710601,5.70093877212752,4.50541379106935,4.36519569253689,18.3243633066817,3.19070124823978,2.12664143004033,6.84265667305251,5.21510388946723,6.56479031685812,4.26428217316253,7,6
+Morocco,MAR,2012,446300,33241898,FALSE,4.36681579882869,4.22405206162361,5.73796451634561,4.43975382954733,3.85967807200535,19.2643559953727,2.60403708401774,2.64913543969623,5.76202653138671,5.23497681956852,6.62842940244605,4.15233029430669,7,6
+Morocco,MAR,2013,446300,33715705,FALSE,4.35081759032391,4.95052397768478,5.70611182374911,4.51822103647775,4.2749101689921,19.9536524040327,3.4232567141489,3.38680382666912,5.55204736876644,5.15359060275451,6.92209013074051,4.49740725441692,7,6
+Morocco,MAR,2014,446300,34192358,FALSE,4.35145380784301,5.07519743405531,6.05616096081729,4.38877735306926,4.3115626355312,19.4706933974636,3.05907892113266,4.39665999229665,5.03309888658623,5.52670819526456,6.77635153728104,4.57992013040078,7,6
+Morocco,MAR,2015,446300,34663608,FALSE,4.31345516968373,4.94660741124068,5.16323538285867,4.36238540866419,4.35347150478797,18.5000898657373,3.3296451285023,7.51579811917087,5.59076037974261,4.68642431901074,6.60088267806135,5.07193679438856,7,6
+Morocco,MAR,2016,446300,35126274,FALSE,4.34547486756865,3.411797747986,5.44022043342182,4.33568655133733,4.34285488124582,17.6048516019762,2.87506509584035,10.7598453590883,5.93188401258302,4.93861830958192,6.2778543301019,5.37548284606948,7,6
+Morocco,MAR,2017,446300,35581257,FALSE,4.54691304878436,4.55125764893715,5.9615327639449,4.5697464349412,4.64400255662013,12.5153301638651,2.93966909661515,22.6595158050199,6.97889170003136,5.42133474386233,6.00904869387418,7.85340257156784,7,6
+Morocco,MAR,2018,446300,36029089,FALSE,4.71153826695127,5.2652357667099,6.58639065523497,4.85785344720368,4.88784176055721,,2.60280601959516,,,5.960868655258,4.804764831139,4.67169097219168,6,4
+Morocco,MAR,2019,446300,36471766,FALSE,5.34186557882636,3.14341584599836,6.47327898870913,5.03402687882673,,,,,,5.84596012104929,4.99814682309015,4.67446761529146,4,3
+Morocco,MAR,2020,446300,36910558,FALSE,5.96988027608783,0.586289651906782,5.45395760106201,,,,,,,4.94151620505723,4.00337584301888,2.76390292848201,3,2
+Monaco,MCO,1990,2.027,29433,TRUE,0,,,,,,,,,,0,,1,0
+Monaco,MCO,1991,2.027,29629,TRUE,0,,,,,,,,,,0,,1,0
+Monaco,MCO,1992,2.027,29859,TRUE,0,,,,,,,,,,0,,1,0
+Monaco,MCO,1993,2.027,30145,TRUE,0,,,,,,,,,,0,,1,0
+Monaco,MCO,1994,2.027,30436,TRUE,0,,,,,,,,,,0,,1,0
+Monaco,MCO,1995,2.027,30731,TRUE,0,,,92.1034112463223,,,,,,,46.0517056231612,92.1034112463223,2,1
+Monaco,MCO,1996,2.027,31001,TRUE,,,,88.5582342922269,,,,,,,88.5582342922269,88.5582342922269,1,1
+Monaco,MCO,1997,2.027,31268,TRUE,,,,100,,,,,,,100,100,1,1
+Monaco,MCO,1998,2.027,31554,TRUE,,,,100,,,,,,,100,100,1,1
+Monaco,MCO,1999,2.027,31836,TRUE,,,,100,,,,,,,100,100,1,1
+Monaco,MCO,2000,2.027,32148,TRUE,100,,,100,,,,,,,100,100,2,1
+Monaco,MCO,2001,2.027,32474,TRUE,100,,,100,,,,,,,100,100,2,1
+Monaco,MCO,2002,2.027,32804,TRUE,100,,,97.39256514366,,,,,,,98.69628257183,97.39256514366,2,1
+Monaco,MCO,2003,2.027,33144,TRUE,100,,,86.1308937822702,100,,100,,,,95.3769645940901,93.0654468911351,4,2
+Monaco,MCO,2004,2.027,33499,TRUE,100,,,90.657668046838,100,,100,,,,96.885889348946,95.328834023419,4,2
+Monaco,MCO,2005,2.027,33842,TRUE,100,,,100,100,100,100,100,,,100,100,5,3
+Monaco,MCO,2006,2.027,34189,TRUE,100,,,100,100,100,100,,,,100,100,5,2
+Monaco,MCO,2007,2.027,34524,TRUE,100,,,100,100,100,100,,,,100,100,5,2
+Monaco,MCO,2008,2.027,34860,TRUE,100,,,100,100,,100,21.0521890415671,,,100,73.6840630138557,4,3
+Monaco,MCO,2009,2.027,35223,TRUE,100,,,91.39363798546,100,,100,20.8352289605069,,,97.13121266182,70.7429556486557,4,3
+Monaco,MCO,2010,2.027,35609,TRUE,100,,,95.1789992550396,100,,100,26.792220540375,,,98.3929997516799,73.9904065984715,4,3
+Monaco,MCO,2011,2.027,36025,TRUE,100,,,99.4752459076849,100,100,100,100,,,99.8688114769212,99.8250819692283,5,3
+Monaco,MCO,2012,2.027,36459,TRUE,100,,,97.2915116774711,100,,100,100,,,99.097170559157,99.097170559157,4,3
+Monaco,MCO,2013,2.027,36899,TRUE,100,,,100,100,,100,100,,,100,100,4,3
+Monaco,MCO,2014,2.027,37320,TRUE,100,,,100,100,,100,39.3291055244284,,,100,79.7763685081428,4,3
+Monaco,MCO,2015,2.027,37723,TRUE,100,,,100,100,100,100,44.7453046637331,,,100,81.5817682212444,5,3
+Monaco,MCO,2016,2.027,38070,TRUE,100,,,100,100,,100,67.4701052521244,,,100,89.1567017507081,4,3
+Monaco,MCO,2017,2.027,38392,TRUE,100,,,100,100,,100,95.5775068570738,,,100,98.5258356190246,4,3
+Monaco,MCO,2018,2.027,38682,TRUE,,,,100,100,,100,,,,100,100,3,2
+Monaco,MCO,2019,2.027,38967,TRUE,,,,100,,,,,,,100,100,1,1
+Monaco,MCO,2020,2.027,39244,TRUE,,,,,,,,,,,,,0,0
+Moldova,MDA,1990,32870,2969097,FALSE,0,,,,,,,,,,0,,1,0
+Moldova,MDA,1991,32870,2975523,FALSE,0,,,,,,,,,,0,,1,0
+Moldova,MDA,1992,32870,2977130,FALSE,0,0.250443834902418,,,,,,,,,0.125221917451209,0.250443834902418,2,1
+Moldova,MDA,1993,32950,2973114,FALSE,0,0.206526457936468,,,,,,,,,0.103263228968234,0.206526457936468,2,1
+Moldova,MDA,1994,32940,2964277,FALSE,0.000729383674946911,0.434525041911019,1.10683438817594,,,,,,,0.981789031884797,0.514029604587302,0.708157036897908,3,2
+Moldova,MDA,1995,32930,2952307,FALSE,0.00306746924840447,1.00173042917665,1.51015499288722,0.13021824002805,,,,,,1.34202677532708,0.66129278283508,0.824658481510591,4,3
+Moldova,MDA,1996,32930,2946401,FALSE,0.00412863218183531,0.361720933779167,1.75036698426823,0.118113225488005,,,,,,1.62212000655963,0.558582443929309,0.700651388608932,4,3
+Moldova,MDA,1997,32920,2935524,FALSE,0.0251004083691395,1.1831612308667,1.92456243494816,0.08545018058314,,,,,,1.82887190907542,0.804568563691784,1.03249444017508,4,3
+Moldova,MDA,1998,32910,2934339,FALSE,0.232832022938414,1.1395459048356,1.53950069331388,0.0772054145029362,,,,,,1.50696585257486,0.747271008897706,0.907905723971133,4,3
+Moldova,MDA,1999,32900,2929735,FALSE,0.537082455858437,0.567524569584884,1.02047432433397,0.0565968428970943,,,,,,1.03627112205315,0.545419548168595,0.553464178178376,4,3
+Moldova,MDA,2000,32880,2923783,FALSE,1.14932968247633,1.91440062157569,1.16288157488095,0.0733345257974392,,,,,,1.19052398064249,1.0749866011826,1.05941970933854,4,3
+Moldova,MDA,2001,32880,2917252,FALSE,1.33594778059895,1.55695950970431,1.30870784272782,0.0651735989481196,,,,,,1.31526314013727,1.0666971829948,0.979132082929898,4,3
+Moldova,MDA,2002,32880,2910504,FALSE,3.40855292704098,1.27334982047493,1.5650488865732,0.0736757406118527,,,,,,1.57669102517459,1.58015684367524,0.974572195420458,4,3
+Moldova,MDA,2003,32870,2902320,FALSE,6.68565671678822,1.11615171699225,2.0803524093025,0.0864443997001474,3.77468296614706,,,,,2.13706108942486,2.49215131069578,1.11321906870575,5,3
+Moldova,MDA,2004,32880,2895147,FALSE,9.61729306667473,2.33645521959038,2.57247585618323,0.288068894651097,4.5062288575679,,6.22904000608138,,,2.69489815328978,4.20866660863616,2.88711556840316,6,4
+Moldova,MDA,2005,32890,2888111,FALSE,13.2694697286348,2.89841295233727,3.20981113340753,0.280361835843761,4.13105008624677,,,,,3.28685364126437,4.91451391255584,2.1552094764818,5,3
+Moldova,MDA,2006,32890,2880095,FALSE,17.8452082652586,3.95022998690439,3.53025981617939,0.264274585727284,4.04042539807336,,,0.197877980396257,,3.67304136375639,6.39749316351742,2.02135597919608,5,4
+Moldova,MDA,2007,32890,2873429,FALSE,18.6426624324626,8.36662391954725,4.85502884111996,0.294484853387545,4.29206829843146,,,0.904782753267328,,4.97790938356026,8.03970001162933,3.6359502274406,5,4
+Moldova,MDA,2008,32890,2867964,FALSE,21.3634613948493,11.5894560180555,6.30533457573178,0.3077560034712,5.02501116250623,,6.28807979684769,3.45440334880236,,6.40001654245894,9.17081755779108,5.60794234192713,6,5
+Moldova,MDA,2009,32890,2864346,FALSE,25.149092033853,4.05141910401766,4.53739481539586,0.648706403194112,4.80972195017128,,2.51840894731104,6.14900513140539,,4.59591842533931,7.38100426075433,3.5926916022535,6,5
+Moldova,MDA,2010,32850,2861487,FALSE,29.5682648130696,4.55406612347328,5.171473610141,0.767800708263008,5.43042824902332,,2.52092516743728,24.1079904490725,,5.27468932413387,8.51650608447684,7.44509435447598,6,5
+Moldova,MDA,2011,32850,2859833,FALSE,34.8063126825346,6.05259564826853,6.99022854713366,0.895254461650104,5.4387128136686,,0,31.4971203152974,,7.06272392843864,9.74887826791737,9.10153887073093,6,5
+Moldova,MDA,2012,32860,2859458,FALSE,39.7302039220215,4.25436735460925,7.04916978973363,1.00030612910732,5.76259537860951,,3.784070929488,36.8395948802126,,7.11055890183007,11.1636236249919,10.5977796390495,6,5
+Moldova,MDA,2013,32880,2858692,FALSE,54.979271133256,4.18293802179697,7.63710808907483,1.07451554502549,6.23659059803546,,3.78508488913527,50.6096539620064,,7.73332782836409,14.3317835356577,13.4771040492657,6,5
+Moldova,MDA,2014,32880,2856950,FALSE,61.4309535877391,5.92514360889192,7.44129722294808,1.16574077285015,7.06575674737611,,2.52492854078461,63.1298459462198,5.67492731100363,7.54686734440828,14.0271651740362,14.3279089206931,6,6
+Moldova,MDA,2015,32880,2834530,FALSE,63.765116138025,3.60330507220789,5.91037540567857,1.21654413763297,8.50353313947189,,3.81734957537648,86.4296741790908,6.94225916323929,6.04618781095623,14.2091582486934,18.0092199897506,6,6
+Moldova,MDA,2016,32880,2802170,FALSE,66.3710912226781,1.59210276005702,6.09685272133498,1.29043550864464,8.83793755321068,,1.28714435501675,91.4505378369578,6.83288953438775,6.11992054731687,13.9117526836865,18.0955050903968,6,6
+Moldova,MDA,2017,32890,2755158,FALSE,72.3757623346539,2.54813632215477,7.42113652508007,1.64757626286956,11.113294030358,,2.61821448882227,94.9309581529993,8.07370432531852,7.41017359808498,15.7807550431498,19.5381271917082,6,6
+Moldova,MDA,2018,32885.3,2708214,FALSE,,5.23675842749011,8.7562694208332,1.90044033607593,11.3729447698317,,6.65899610831585,,,8.79513120766448,5.63811607317877,5.64783151988659,5,4
+Moldova,MDA,2019,32885.3,2664974,FALSE,,8.915076664511,9.29968529328928,2.20936020400698,,,,,,9.26725796258305,6.80804072060242,6.79723161036701,3,3
+Moldova,MDA,2020,32885.3,2620495,FALSE,,0.0657761481978188,8.41633049686735,,,,,,,8.42539885487197,4.24105332253258,4.2455875015349,2,2
+Madagascar,MDG,1990,581540,11598647,FALSE,0,0.0897413973976312,0.228749557802466,,,,,,,0.221344808285419,0.106163651733366,0.155543102841525,3,2
+Madagascar,MDG,1991,581540,11942809,FALSE,0,0.0517600143240837,0.197375168492399,,,,,,,0.189173255997434,0.0830450609388277,0.120466635160759,3,2
+Madagascar,MDG,1992,581540,12301338,FALSE,0,0.0821157203635935,0.204160192325033,,,,,,,0.192236171161772,0.0954253042295422,0.137175945762683,3,2
+Madagascar,MDG,1993,581540,12675469,FALSE,0,0.0702515435983998,0.217333314272738,,,,,,,0.202711160637923,0.0958616192903793,0.136481352118161,3,2
+Madagascar,MDG,1994,581540,13066544,FALSE,0,0.0286219842093159,0.245185380530009,,,,,,,0.226868527597869,0.0912691215797751,0.127745255903593,3,2
+Madagascar,MDG,1995,581540,13475403,FALSE,0,0.0365546292397912,0.273589751250071,0.137376406591503,,,,,,0.254223923249425,0.111880196770341,0.142718319693573,4,3
+Madagascar,MDG,1996,581540,13902697,FALSE,0.000696231254655201,0.0345248623527353,0.268436061819742,,,,,,,0.247956531229601,0.101219051809044,0.141240696791168,3,2
+Madagascar,MDG,1997,581540,14347860,FALSE,0.00261688518383981,0.047440320087551,0.226939312106026,,,,,,,0.204891122488708,0.0923321724591391,0.12616572128813,3,2
+Madagascar,MDG,1998,581540,14808791,FALSE,0.0110662208138088,0.049268988371791,0.230298487839789,,,,,,0.541876979362054,0.206133963734611,0.208127669096861,0.265759977156152,3,3
+Madagascar,MDG,1999,581540,15282524,FALSE,0.0289001565992839,0.167558918189274,0.23867053535811,,,,,,0.725102816419058,0.206797068896436,0.290058106641432,0.366486267834923,3,3
+Madagascar,MDG,2000,581540,15766806,FALSE,0.0326288008834564,0.233313937558323,0.265398575257462,,,,,,0.759144013857385,0.230210613416736,0.322621331889157,0.407556188277481,3,3
+Madagascar,MDG,2001,581540,16260933,FALSE,0.0358444782208129,0.25401786346525,0.291791315042542,,,,,,0.804082766816656,0.258662109470116,0.346434105886315,0.438920913250674,3,3
+Madagascar,MDG,2002,581540,16765122,FALSE,0.053079850303673,0.0383565677814519,0.34958561638234,,,,,,0.512281232302775,0.320640066319822,0.23832581669256,0.290425955468016,3,3
+Madagascar,MDG,2003,581540,17279139,FALSE,0.064164149877021,0.0326778567277169,0.266858684541095,,0.215025491583588,0.13840945364758,,100,,0.233355743861653,0.125527536198353,33.4220112001965,5,3
+Madagascar,MDG,2004,581540,17802992,FALSE,0.0772989964027432,0.130349727458785,0.299218279500068,,0.297577861350965,0.318665395604847,,100,,0.26065683102418,0.206383099741611,33.4636688528277,5,3
+Madagascar,MDG,2005,581540,18336722,FALSE,0.0811015147676574,0.287900029218352,0.420516928543237,,0.374940165466307,0.732175998264759,,100,0.704964610698293,0.37360973587233,0.44533181629846,25.3416185939472,5,4
+Madagascar,MDG,2006,581540,18880265,FALSE,0.084292829834854,0.710490753974231,0.470555635581655,,0.37122439708491,0.599002450610758,,0.00377598320493271,0.687547666504085,0.421360881050167,0.510377867301116,0.455793821183354,5,4
+Madagascar,MDG,2007,581540,19433520,FALSE,0.0876147001507407,1.86839606795341,0.665880145196132,,0.374216666063402,0.730505407438669,,0.00555351169944497,,0.589974108820184,0.838099080184738,0.821307896157679,5,3
+Madagascar,MDG,2008,581540,19996476,FALSE,0.216145188294573,2.58615688751595,0.85908012056491,,0.388994705786351,0.928813993932716,,0.00557754162823688,,0.762357240665472,1.14754904757704,1.11803055660322,5,3
+Madagascar,MDG,2009,581540,20569115,FALSE,0.207580757334306,2.81356906742228,0.653093740057073,,0.397886879508621,0.870766376367921,0,0.00809508922878622,,0.580234462743932,0.909001988236316,0.85047465484875,6,4
+Madagascar,MDG,2010,581540,21151640,FALSE,0.210532898270614,1.98197395188932,0.598772701346274,,0.419549131396958,0.949684791040756,0.170520928745823,0.0089446731970831,0.536819429888632,0.541012920113315,0.74138411686357,0.647854380766835,6,5
+Madagascar,MDG,2011,581795,21743970,FALSE,0.228891599873047,1.73037309611373,0.683987431482868,,0.449883609546914,0.820787872565122,0,0.00744919388000395,0.562275074570051,0.624072057301038,0.671052512434137,0.584833884372965,6,5
+Madagascar,MDG,2012,581795,22346641,FALSE,0.269606698291763,1.67066149522992,0.695404938752155,,0.474108908986905,0.580071673486514,0,0.00731098176096991,,0.640536740730613,0.643148961152071,0.579627304430376,6,4
+Madagascar,MDG,2013,581800,22961259,FALSE,0.342247789100915,1.11065526580886,0.731255316551467,,0.363895741318808,0.899856192126238,0.15708186111647,0.0071123115743685,0.698631497272154,0.672260279335131,0.656621320329351,0.529148243021398,6,5
+Madagascar,MDG,2014,581800,23589897,FALSE,0.410857078245218,0.761601796281757,0.739030605650092,,0.351854978284457,0.647268535772905,0.152895847629063,0.217659385506838,0.645220704120015,0.670239185152289,0.559479094616508,0.489523383737992,6,5
+Madagascar,MDG,2015,581800,24234080,FALSE,0.451167812021994,0.741991288892169,0.627252806858053,0.139906530696066,0.378452448864758,0.533401449692462,0.148831616355863,0.380365871797382,0.614446864859729,0.577843769010189,0.465285481339477,0.433897656935233,7,6
+Madagascar,MDG,2016,581800,24894370,FALSE,0.49598949044922,1.11094300059474,0.638009124034562,0.161044140552437,0.412665421018741,0.412137005636187,0.724420280026628,0.49352963015372,,0.590281531446979,0.590423840215629,0.616043716554901,7,5
+Madagascar,MDG,2017,581800,25570511,FALSE,,0.979085777077938,0.779287422555865,0.133943656700702,0.452214261634275,0.367573127013759,0.282106000720697,0.637324209757252,,0.709123123204336,0.508399196813792,0.548316553492185,6,5
+Madagascar,MDG,2018,581800,26262313,FALSE,1.49614394735976,1.21901496505903,0.812148315292926,0.165069213303415,0.426245130232211,,0.274674762828186,,,0.743041123682148,0.793410240768662,0.600450016218194,6,4
+Madagascar,MDG,2019,581800,26969306,FALSE,,0.936610222598034,0.75083800885684,0.217458870089617,,,,,,0.693959017365218,0.634969033848163,0.616009370017623,3,3
+Madagascar,MDG,2020,581800,27691019,FALSE,,,0.516739376876333,,,,,,,0.480181196791676,0.516739376876333,0.480181196791676,1,1
+Maldives,MDV,1990,300,223159,TRUE,0,1.10060845130391,3.630334562155,,,,,,,3.38549744469869,1.57698100448631,2.2430529480013,3,2
+Maldives,MDV,1991,300,229743,TRUE,0,1.2408814484317,3.83993409665838,,,,,,,3.55569006783523,1.69360518169669,2.39828575813347,3,2
+Maldives,MDV,1992,300,236271,TRUE,0,1.22515980222612,4.43381477891462,,,,,,,4.0742494489403,1.88632486038025,2.64970462558321,3,2
+Maldives,MDV,1993,300,242596,TRUE,0,1.24745439622227,4.43368991715224,,,,,,,4.08722431883546,1.89371477112484,2.66733935752887,3,2
+Maldives,MDV,1994,300,248582,TRUE,0,1.54256465882642,5.12795128069168,,,,,,,4.71389580884563,2.2235053131727,3.12823023383602,3,2
+Maldives,MDV,1995,300,254144,TRUE,0,1.24784416172015,5.96298987714773,16.5849780014044,,,,,,5.44985978051712,5.94895301006806,7.76089398121388,4,3
+Maldives,MDV,1996,300,259178,TRUE,2.29355439819211,1.57636104657464,6.70647540523609,17.3877272157166,,,,,,6.13537246537069,6.99102951642987,8.36648690922065,4,3
+Maldives,MDV,1997,300,263836,TRUE,3.0722987224286,1.89656752778367,7.32643701652779,18.369943693607,,,,,,6.74262084424059,7.66631174008677,9.00304402187709,4,3
+Maldives,MDV,1998,300,268445,TRUE,5.55841149453453,1.88182710390113,7.50904937814485,19.593124823723,,,,,,6.91995838621376,8.63560320007588,9.46497010461263,4,3
+Maldives,MDV,1999,300,273522,TRUE,10.7252004098381,1.97586366694095,7.89094000269999,20.9615293842205,,,,,,7.27645088764915,10.3883833659249,10.0712813129369,4,3
+Maldives,MDV,2000,300,279396,TRUE,20.6624331775705,3.50256542788755,7.83258972406969,22.1295416171517,,,,,,7.22954439223889,13.5317824866699,10.953883812426,4,3
+Maldives,MDV,2001,300,286309,TRUE,33.0950849021402,3.14663907495569,7.73994281236314,21.2981766060613,,,,,,7.16089025758714,16.3199608488801,10.535235312868,4,3
+Maldives,MDV,2002,300,294185,TRUE,47.6175336355372,3.68521273794377,7.78560514216647,21.8015709505542,,,,,,7.14029393554333,20.2224806165504,10.8756925413471,4,3
+Maldives,MDV,2003,300,302681,TRUE,51.72298787558,4.60417590193121,8.90324747246418,24.4003408628054,28.786840835397,,,,,8.13854879951929,22.4076880281952,12.381021854752,5,3
+Maldives,MDV,2004,300,311265,TRUE,55.4440819252297,7.45866667908279,10.9295649619147,26.4593329517279,33.7179136623806,,,,,9.92959173607784,25.0729116294888,14.6158637889629,5,3
+Maldives,MDV,2005,300,319604,TRUE,56.3034047551818,7.27193727595172,10.2058691797002,17.9389884696203,30.0771263963448,3.54387115154949,,100,,9.27275858845556,19.0528141664007,33.6209210835069,6,4
+Maldives,MDV,2006,300,327489,TRUE,88.2762653097403,8.54802266286334,13.4359691369431,25.0742613467916,30.4830954134702,4.67442089867251,,0.548919230965304,,12.217231531277,28.0017878710022,11.5971086929743,6,4
+Maldives,MDV,2007,300,335172,TRUE,100,17.3294466289578,24.7931060161058,28.1963454284274,36.0370371141008,10.2451053852436,,1.42967937296026,,23.809001523163,36.1128006917469,17.6911182383771,6,4
+Maldives,MDV,2008,300,343448,TRUE,100,23.1467095155328,28.4723015564417,28.5072451493482,38.8155761330366,44.7985294074297,,1.73497880767663,,26.8803651917815,44.9849571257505,20.0673246660848,6,4
+Maldives,MDV,2009,300,353391,TRUE,100,19.6047236334928,21.8193821067576,22.5488140312733,39.4574314838532,50.5532174136075,0,1.94574648190772,,20.7962488591727,35.7543561975219,12.9791066011693,7,5
+Maldives,MDV,2010,300,365730,TRUE,100,25.9593754008103,24.4456358013148,26.305341415026,45.7397401356832,47.1069728590876,0,5.79903693410061,,23.2433377475625,37.3028875793731,16.2614182994999,7,5
+Maldives,MDV,2011,300,380493,TRUE,100,48.819959031029,30.1220189569885,29.7224849031428,52.2043773725066,36.3685800781702,0,6.43522739941078,,28.0447224840686,40.8388404948884,22.6044787635302,7,5
+Maldives,MDV,2012,300,397231,TRUE,100,25.1713709469602,28.1797474319503,29.2957197026792,51.1214493991148,73.4172195377748,18.1596969888921,6.2019372235744,,26.1593688782406,45.7039591013761,20.9976187480693,7,5
+Maldives,MDV,2013,300,415592,TRUE,100,38.0783600740462,30.8634676574857,32.8828529092043,58.6593721296742,80.7410435380291,0,11.6546585193694,,28.910760964254,47.0942873631276,22.3053264933748,7,5
+Maldives,MDV,2014,300,435018,TRUE,100,33.6112998518489,33.6324364442807,33.6483987896015,60.7954269302994,,0,13.4960326697992,,31.222528906445,40.1784270171462,22.3956520435389,6,5
+Maldives,MDV,2015,300,454914,TRUE,100,28.7283839729561,31.4201778497179,32.9511095711371,57.2904540182436,,15.8570512109862,13.8398319075949,,29.1423195546852,41.7913445209594,24.1037392434719,6,5
+Maldives,MDV,2016,300,475505,TRUE,100,42.1189164344803,32.253659754502,32.8526199208418,53.8867668936034,62.4463221580673,0,25.1646406767616,,29.919299991584,44.9452530446485,26.0110954047335,7,5
+Maldives,MDV,2017,300,496398,TRUE,100,40.4494736649177,33.2083091648796,34.0149284904396,54.250524050705,45.6267070412521,7.26593841493579,46.5774126843419,,30.7919760939347,43.4275594627375,31.8199458697139,7,5
+Maldives,MDV,2018,300,515704,TRUE,,48.9579572428227,36.0255690850919,34.9557548909322,54.2015279236881,,6.99392926426264,,,33.7153083278864,31.7333026207774,31.155737431476,5,4
+Maldives,MDV,2019,300,530957,TRUE,,78.9818972938405,35.6568715277517,38.9621073086104,,,,,,33.6150778594338,51.2002920434009,50.5196941539616,3,3
+Maldives,MDV,2020,300,540542,TRUE,,,18.8003596712919,,,,,,,17.6788909361718,18.8003596712919,17.6788909361718,1,1
+Mexico,MEX,1990,1943950,83943135,FALSE,0,1.49286517270411,2.27015860313604,,,,,,,2.34931457332384,1.25434125861338,1.92108987301397,3,2
+Mexico,MEX,1991,1943950,85512621,FALSE,0.000180141399115431,2.53314528956811,2.47790488456631,,,,,,,2.53547860090306,1.67041010517785,2.53431194523559,3,2
+Mexico,MEX,1992,1943950,87075136,FALSE,0.000520670595055646,2.53860772891675,2.78758969087426,,,,,,1.4068507754701,2.78711062785045,1.68339221646404,2.24418971074576,3,3
+Mexico,MEX,1993,1943950,88625440,FALSE,0.000836605072124131,2.22646981569086,2.85403218608212,,,,,,1.21650341730893,2.87799530916758,1.57446050603851,2.10698951405579,3,3
+Mexico,MEX,1994,1943950,90156396,FALSE,0.0012592127464623,5.85256651119229,3.25392711437851,,,,,,1.15456478492955,3.28107751329679,2.5655794058117,3.42940293647288,3,3
+Mexico,MEX,1995,1943950,91663290,FALSE,0.00293099722678314,4.55813916105079,3.10668131967829,24.9942698851996,,,,,1.14766468227477,3.1717062530684,6.76193720908605,8.4679449953984,4,4
+Mexico,MEX,1996,1943950,93147045,FALSE,0.00563582291705117,4.32511511182157,3.71053814394529,25.2780593671539,,,,,1.29415259462511,3.72547950421897,6.92270020809257,8.65570164445488,4,4
+Mexico,MEX,1997,1943950,94611008,FALSE,0.0173682755764178,5.94754093373582,4.29548959280494,25.6985070765971,,,,,1.55788468858188,4.21732296234092,7.50335811345923,9.35531391531392,4,4
+Mexico,MEX,1998,1943950,96056313,FALSE,0.0345182313519105,5.82470386659021,6.70236893031684,25.6891920232683,,,,,1.6328904371182,6.35491193494106,7.97673469772909,9.87542456547943,4,4
+Mexico,MEX,1999,1943950,97484823,FALSE,0.04991050874929,6.2721652129501,7.52100671941545,27.0711560084468,,,,,1.81972267368827,7.02687846439483,8.54679222464997,10.54748058987,4,4
+Mexico,MEX,2000,1943950,98899845,FALSE,0.134586503926652,8.15197995126554,9.05580856262,28.6109056485833,,,,,2.05439395449031,8.46822096437978,9.60153492417715,11.8213751296797,4,4
+Mexico,MEX,2001,1943950,100298152,FALSE,0.183811573060284,15.0706397175604,8.57624246622469,27.1835893518241,,,,,1.9473379958707,7.99567654047668,10.592324220908,13.049310901433,4,4
+Mexico,MEX,2002,1943950,101684764,FALSE,0.306553423349013,10.759767087515,8.54145777110556,26.8530246677998,,,,,1.76215380588804,7.88994717058941,9.64459135113148,11.8162231829481,4,4
+Mexico,MEX,2003,1943950,103081020,FALSE,0.327812943151038,8.28709066867296,8.56498393367292,25.3766654630887,2.18581898085719,,4.19879116131831,,1.76810875046567,7.89784231642507,8.08724215339494,9.50569967199415,6,5
+Mexico,MEX,2004,1943950,104514934,FALSE,0.353391301957866,12.3156914007756,9.67829283118335,26.5171821577298,2.33444018314397,,3.58902698937665,,1.99563654244345,8.89748448861204,9.07487020391112,10.6630043157875,6,5
+Mexico,MEX,2005,1943950,106005199,FALSE,0.425273967295765,13.4434452416232,10.8150365988066,26.5322856536672,2.53046318391205,,2.48380461700471,,2.25364256160376,9.97857096529742,9.32558144000021,10.9383498078393,6,5
+Mexico,MEX,2006,1943950,107560155,FALSE,0.475382825834103,11.7505374800069,12.2599851667757,24.8142987333435,2.44774839977417,,2.71615991145681,0.114426683693981,2.30197923149085,11.353339948956,9.05305722481797,8.84179033149133,6,6
+Mexico,MEX,2007,1943950,109170503,FALSE,0.499323335406591,15.8459037676136,13.2139322857753,22.6009694218406,2.92029671427781,,3.83243160917273,0.366230554814796,,12.2555682047209,11.1985120839618,10.9802207116325,6,5
+Mexico,MEX,2008,1943950,110815272,FALSE,0.513186591504213,12.0599158970814,14.0645731075283,21.9744438924831,2.84066674287984,,3.51516628599809,0.706107801333955,,12.9546448305428,10.425457154919,10.2420557414879,6,5
+Mexico,MEX,2009,1943950,112463886,FALSE,0.61350453710458,12.2141340493899,10.8291347709245,20.119003306742,2.60277228322403,,2.75808153710399,1.01082605864463,2.33014431096224,9.96282073854661,8.14400041870454,8.06583500023156,6,6
+Mexico,MEX,2010,1943950,114092961,FALSE,0.712882325158851,18.595638496138,13.5999397568108,18.4836434396978,2.66019295261969,,3.12966662713252,1.65730009258014,1.41854073408432,12.484357109613,9.32338522983704,9.29485774987429,6,6
+Mexico,MEX,2011,1943950,115695468,FALSE,0.841714594069915,13.423942501045,15.6152604238154,17.2021803619146,2.6792060737587,,2.58751860250633,3.39060645880934,1.76943138857761,14.3775638557043,8.57334131198813,8.7918738614262,6,6
+Mexico,MEX,2012,1943950,117274156,FALSE,0.8878710812665,13.8317322847037,16.2677066961473,16.9950396557047,2.76745168637977,,1.87607093190366,4.55278215507902,2.05289888651888,15.0645458764919,8.65188658937412,9.0621782984003,6,6
+Mexico,MEX,2013,1943950,118827158,FALSE,0.95805205279998,25.4043004041894,16.5092810993188,17.264233221968,2.88427275305514,,1.91225838902694,8.71415572639177,2.44459015969042,15.5153823295281,10.7487858878323,11.8758200384658,6,6
+Mexico,MEX,2014,1943950,120355137,FALSE,0.966130087907107,12.4974197852246,17.1263421442836,17.3616660631802,3.05002594937683,,2.24759660484868,9.36438684650481,2.51964681526851,15.9273629357818,8.78646691678544,9.98634650846809,6,6
+Mexico,MEX,2015,1943950,121858251,FALSE,1.23454480678984,16.8328163847385,16.4858814953261,18.1536568221125,3.33485900593897,,2.5750522618683,12.896989952226,3.20897615326009,15.2179178200276,9.74848798734922,11.4809015657055,6,6
+Mexico,MEX,2016,1943950,123333379,FALSE,1.26458069411189,16.6260970487873,16.0319395261036,18.9321197603512,3.46000256978023,,1.93012324442697,16.8682550606934,3.67282133322762,14.807765941833,9.74294693450142,12.1395303982199,6,6
+Mexico,MEX,2017,1943950,124777326,FALSE,1.34046543171434,12.6691986749579,17.3283124386955,18.8491220815723,3.65291912682726,,1.64763465075334,17.6445172975242,4.46210988181308,16.0275203987532,9.38280719325108,11.8833504975623,6,6
+Mexico,MEX,2018,1943950,126190782,FALSE,1.36531449157599,17.3119552273218,18.8576116930551,17.5938701023923,3.75979743369995,,1.62917958576361,,,17.4958464313348,11.3515862200218,13.5077128367031,6,4
+Mexico,MEX,2019,1943950,127575529,FALSE,1.43872993120136,12.1128405621104,18.708360102571,17.1534989910089,,,,,,17.4642597093046,12.3533573967229,15.576866420808,4,3
+Mexico,MEX,2020,1943950,128932753,FALSE,1.46218842208455,2.08712138030938,15.8282654531476,,,,,,,14.7559226082484,6.45919175184718,8.42152199427887,3,2
+Marshall Islands,MHL,1990,,47265,TRUE,0,,,,,,,,,,0,,1,0
+Marshall Islands,MHL,1991,180,48403,TRUE,0,,,,,,,,,,0,,1,0
+Marshall Islands,MHL,1992,180,49242,TRUE,0,,,,,,,,,,0,,1,0
+Marshall Islands,MHL,1993,180,49828,TRUE,0,,,,,,,,,,0,,1,0
+Marshall Islands,MHL,1994,180,50214,TRUE,0,,,,,,,,,,0,,1,0
+Marshall Islands,MHL,1995,180,50454,TRUE,0,,,1.32279809020306,,,,,,,0.661399045101531,1.32279809020306,2,1
+Marshall Islands,MHL,1996,180,50523,TRUE,1.92143068529475,,,1.489300397528,,,,,,,1.70536554141137,1.489300397528,2,1
+Marshall Islands,MHL,1997,180,50453,TRUE,,,,1.53952433180061,,,,,,,1.53952433180061,1.53952433180061,1,1
+Marshall Islands,MHL,1998,180,50356,TRUE,,,,1.54249269360356,,,,,,,1.54249269360356,1.54249269360356,1,1
+Marshall Islands,MHL,1999,180,50418,TRUE,50.1924945347925,,,1.10689321957837,,,,,,,25.6496938771855,1.10689321957837,2,1
+Marshall Islands,MHL,2000,180,50754,TRUE,79.1857656442237,0.638606575495694,,1.24316563542904,,,,,,,27.0225126183828,0.940886105462365,3,2
+Marshall Islands,MHL,2001,180,51411,TRUE,86.9549613448031,0.630445588156396,,1.27451847395479,,,,,,,29.6199751356381,0.952482031055594,3,2
+Marshall Islands,MHL,2002,180,52368,TRUE,100,0.702676122010239,,1.39038445429277,,,,,,,34.031020192101,1.0465302881515,3,2
+Marshall Islands,MHL,2003,180,53465,TRUE,100,0.945022461139391,,1.63448252307569,22.4165927536972,,,,,,34.1931683280717,1.28975249210754,4,2
+Marshall Islands,MHL,2004,180,54476,TRUE,100,0.930704568723961,,2.00551561195081,24.3852809223074,,,,,,34.3120733935583,1.46811009033738,4,2
+Marshall Islands,MHL,2005,180,55257,TRUE,100,2.6031294125115,7.32353063137578,2.02111810418629,19.9595332376782,,,,,8.80152783567709,27.9869445370184,4.47525845079162,5,3
+Marshall Islands,MHL,2006,180,55765,TRUE,100,3.78837253667531,6.76708553889634,1.26203042683154,24.3929865595311,,,,,8.57465078294619,27.9543721256008,4.54168458215102,5,3
+Marshall Islands,MHL,2007,180,56046,TRUE,100,5.46795253123384,7.23338403985153,1.55914529525177,21.3404418041232,,,,,8.9760369505803,28.5651204665843,5.33437825902197,5,3
+Marshall Islands,MHL,2008,180,56166,TRUE,100,4.44692843272754,7.23963052845713,1.2962670227466,18.8072834026518,,,0.587873546750633,,8.88005876796628,28.2457064959828,3.80278194254776,5,4
+Marshall Islands,MHL,2009,180,56255,TRUE,100,11.4213901670744,8.08573468933501,1.1646472250615,14.3767180588221,,0,0.586943307134817,,9.52292557781618,24.1343544162942,4.53918125541738,6,5
+Marshall Islands,MHL,2010,180,56361,TRUE,100,7.28118374470624,9.38657100650657,0.990023342153843,16.4807048948415,,0,0.58583921454554,,10.6441491250351,23.5315556186733,3.90023908528814,6,5
+Marshall Islands,MHL,2011,180,56524,TRUE,100,3.39928677985706,10.8481750698758,0.987164190517956,16.6933626777564,,63.8100151669609,0.584149491702246,,12.3537495281898,35.8089282414424,16.2268730314456,6,5
+Marshall Islands,MHL,2012,180,56712,TRUE,100,16.5297483083832,12.8842806086088,0.983886928531893,13.6989733384668,,0,0.582212670873368,,15.6293279838233,26.0795831691048,6.74503517832237,6,5
+Marshall Islands,MHL,2013,180,56933,TRUE,100,25.0738748473089,13.3704162576228,,13.6027354385764,,63.3516114959215,8.97153446199826,,15.8894568344112,50.4489756502133,28.32161940991,5,4
+Marshall Islands,MHL,2014,180,57183,TRUE,100,6.93952528646771,11.3965288771428,1.03950302022715,17.4011266119932,,63.0746427661595,9.94619231397503,,13.3597760416353,36.4900399899994,18.8719278856929,6,5
+Marshall Islands,MHL,2015,180,57444,TRUE,100,4.11809522238938,8.62290680361025,1.33083814722129,17.7487585317162,,100,10.092635154677,,10.8674141190065,42.8143680346442,25.2817965286589,6,5
+Marshall Islands,MHL,2016,180,57723,TRUE,100,2.32189191151069,9.01557010467473,1.13499118638856,17.8328176509692,,62.4845780243109,10.0438525863317,,11.3912613240688,34.991406245377,17.4753150065221,6,5
+Marshall Islands,MHL,2017,180,58053,TRUE,100,4.40871922517596,11.4885729763009,1.25408491012288,17.6469897572771,,0,9.98675806922217,,13.679805339769,23.43027542232,5.865873508858,6,5
+Marshall Islands,MHL,2018,180,58412,TRUE,,7.32239455456605,12.5394953230649,1.41274463427983,21.2732552398021,,61.7475398427943,,,14.8580826780558,20.7555435886763,21.335190427424,5,4
+Marshall Islands,MHL,2019,180,58791,TRUE,,3.11628492511045,,1.25898715076723,,,,,,,2.18763603793884,2.18763603793884,2,2
+Marshall Islands,MHL,2020,180,59194,TRUE,,,,,,,,,,,,,0,0
+North Macedonia,MKD,1990,25430,1996218,FALSE,0,,,,,,,,,,0,,1,0
+North Macedonia,MKD,1991,25430,1993304,FALSE,0,,,,,,,,,,0,,1,0
+North Macedonia,MKD,1992,25430,1988659,FALSE,0,,,,,,,,,,0,,1,0
+North Macedonia,MKD,1993,25430,1984024,FALSE,0,,,,,,,,,,0,,1,0
+North Macedonia,MKD,1994,25430,1981713,FALSE,0,0.531165313006323,,,,,,,,,0.265582656503161,0.531165313006323,2,1
+North Macedonia,MKD,1995,25430,1983259,FALSE,0.0538142903866053,0.209867892618303,,0.898958664467188,,,,,,,0.387546949157366,0.554413278542746,3,2
+North Macedonia,MKD,1996,25430,1989441,FALSE,0.100062936540365,0.247134724413306,3.07211076695773,0.828992326000749,,,,,,2.80457180545325,1.06207518847804,1.2935662852891,4,3
+North Macedonia,MKD,1997,25430,1996869,FALSE,0.661124326549327,0.347336651806606,2.92437703654306,0.734650662053187,,,,,,2.66545025386144,1.16687216923805,1.24914585590708,4,3
+North Macedonia,MKD,1998,25430,2007523,FALSE,1.30856588918284,3.31731848788144,3.08586280319828,0.948587984341603,,,,,,2.79468889301325,2.16508379115104,2.3535317884121,4,3
+North Macedonia,MKD,1999,25430,2017142,FALSE,1.94444750702374,2.05577667985411,3.11768733993113,1.08859428240185,,,,,,2.84303319702028,2.05162645230271,1.99580138642541,4,3
+North Macedonia,MKD,2000,25430,2026350,FALSE,3.21311291694792,4.74779382530738,3.44138139769524,1.34142578032242,,,,,,3.16011070017517,3.18592848006824,3.08311010193499,4,3
+North Macedonia,MKD,2001,25430,2034882,FALSE,4.46455389777886,10.6233844037007,3.0287933770666,0.589562823923495,,,,,,2.77633870404109,4.67657362561741,4.66309531055508,4,3
+North Macedonia,MKD,2002,25430,2020157,FALSE,22.4713173965271,2.66861287348577,3.31321389552437,0.738191738796803,,,,,,3.04188804357242,7.29783397608351,2.14956421861833,4,3
+North Macedonia,MKD,2003,25430,2026773,FALSE,24.646807714478,2.61021652142608,4.08584891327756,0.945558373012488,4.41212262526782,,,,,3.75125845293513,8.07210788054852,2.4356777824579,5,3
+North Macedonia,MKD,2004,25430,2032544,FALSE,31.4975184992407,6.94538050629336,5.35157740245363,0.984706609493051,4.31276019604901,,10.6471416037162,,,4.8839047326917,11.0852649242394,5.86528336304858,6,4
+North Macedonia,MKD,2005,25430,2036855,FALSE,34.0157974554376,4.22963279499901,6.23510983962253,1.17346986097569,4.88366913139066,,,,,5.7604178580039,11.4135024877587,3.72117350465954,5,3
+North Macedonia,MKD,2006,25430,2040228,FALSE,36.7456572591309,9.26370332783257,7.45503622266254,1.20129850678926,4.8167222729835,,8.83920154339931,,,6.81876339602135,12.7009793719629,6.53074169351062,6,4
+North Macedonia,MKD,2007,25230,2043559,FALSE,46.530159171061,16.4567671290507,10.3957028379219,1.36578433919677,5.14231673315632,,,,,9.92724421803301,18.6871033693076,9.24993189542682,5,3
+North Macedonia,MKD,2008,25230,2046898,FALSE,58.9188426390224,13.3463940704419,13.0560019008896,1.51192439313308,5.25127991903232,,8.81039821548826,,,12.0960341097899,19.1287122437951,8.94118769721329,6,4
+North Macedonia,MKD,2009,25220,2050671,FALSE,66.1298091230049,7.13348581247605,9.55237067816446,1.53283553127814,5.87153612929209,,19.3472137999076,,,8.79100766908416,20.7391429889662,9.20113570318648,6,4
+North Macedonia,MKD,2010,25220,2055004,FALSE,66.1560825232536,8.45222113341878,10.6413251374955,1.54733467848233,4.74867553770366,,19.3064199730367,,,9.84076721341335,21.2206766891374,9.78668574958778,6,4
+North Macedonia,MKD,2011,25220,2058539,FALSE,72.1504515649079,11.5462824688199,13.7483971282737,1.92825649238896,5.90266893452561,,14.0169209222552,,,12.6817282007486,22.6780617153291,10.0432970210532,6,4
+North Macedonia,MKD,2012,25220,2061044,FALSE,73.0159037970569,10.859594827762,12.7055533402299,2.06736905278137,5.15813735549472,,19.2498414736756,,,11.7175050639649,23.5796524983012,10.973577604546,6,4
+North Macedonia,MKD,2013,25220,2064032,FALSE,82.7966223283167,10.6233439181917,13.2734226571405,2.35276597504926,5.85014007468452,,5.2423566552708,,,12.3386700102483,22.8577023067938,7.63928413969002,6,4
+North Macedonia,MKD,2014,25220,2067471,FALSE,86.231831884278,5.54508328518789,14.938956031644,2.49574395661028,6.77108963947572,,6.97818213130399,,,13.7165942757531,23.2379594578048,7.18390091221381,6,4
+North Macedonia,MKD,2015,25220,2070226,FALSE,89.0528557560383,7.68815214750703,13.3355745928162,2.85036502621098,7.63705731528886,,8.71111969731154,,,12.3309069620102,24.3276134439768,7.89513595825993,6,4
+North Macedonia,MKD,2016,25220,2072490,FALSE,91.2010844153244,15.858695231133,14.568227211949,2.98792637234655,8.41876500652489,,5.22096217202104,,,13.5107359357064,25.9673790805548,9.39457992780177,6,4
+North Macedonia,MKD,2017,25220,2074502,FALSE,94.0926226031802,11.901654474158,16.3745193191149,3.69358415532958,8.9470290827703,,3.47726567368679,,,15.1217899868539,25.9079292450939,8.54857357250707,6,4
+North Macedonia,MKD,2018,25220,2076217,FALSE,99.8827939158712,15.067222489841,19.5878388890624,4.13520848549172,9.63500479154396,,6.9487867545585,,,18.0457459843589,29.124370106965,11.0492409285625,6,4
+North Macedonia,MKD,2019,25220,2076694,FALSE,100,14.6788645376994,20.2425904658468,4.43259112970088,,,,,,18.6576778152184,34.8385115333118,12.5897111608729,4,3
+North Macedonia,MKD,2020,25220,2072531,FALSE,100,3.59829465582909,18.5950118914869,,,,,,,17.082219890866,40.7311021824386,10.3402572733476,3,2
+Mali,MLI,1990,1220190,8449915,FALSE,0,0.0306931478809343,0.319627453634531,,,,,,,0.286616486227851,0.116773533838488,0.158654817054393,3,2
+Mali,MLI,1991,1220190,8635528,FALSE,0,0.0113734928303034,0.324198369453994,,,,,,,0.288119739400621,0.111857287428099,0.149746616115462,3,2
+Mali,MLI,1992,1220190,8850334,FALSE,0,0.116045156377008,0.344015189280133,,,,,,,0.307523243261008,0.15335344855238,0.211784199819008,3,2
+Mali,MLI,1993,1220190,9087173,FALSE,0,0.0196016399302926,0.3080190891027,,,,,,,0.27303219857351,0.109206909677664,0.146316919251901,3,2
+Mali,MLI,1994,1220190,9334893,FALSE,0,0.0818320106724576,0.265183934469822,,,,,,,0.231774460717131,0.115671981714093,0.156803235694794,3,2
+Mali,MLI,1995,1220190,9585660,FALSE,0,0.509845371402443,0.345747040242738,0.0517735652951727,,,,,,0.30159409976041,0.226841494235088,0.287737678819342,4,3
+Mali,MLI,1996,1220190,9837575,FALSE,0.00054725160712272,0.19277313178536,0.32087292417759,0.119562334537179,,,,,,0.287859267803578,0.158438910526813,0.200064911375372,4,3
+Mali,MLI,1997,1220190,10094363,FALSE,0.00261728883056047,0.343032521171176,0.330627445472522,0.0888047300029892,,,,,,0.294541496249797,0.191270496369312,0.242126249141321,4,3
+Mali,MLI,1998,1220190,10360564,FALSE,0.00500452432714617,0.0433048548969945,0.324142943744198,0.0958658232275169,,,,,,0.292405894784034,0.117079536548964,0.143858857636182,4,3
+Mali,MLI,1999,1220190,10642937,FALSE,0.0149913690853612,0.249834423183186,0.33882921263235,0.0921423921206667,,,,,,0.30931920125732,0.173949349255391,0.217098672187058,4,3
+Mali,MLI,2000,1220190,10946448,FALSE,0.0341111345320613,0.31423194772518,0.308702677705736,0.0939863260434809,,,,,,0.283472306839935,0.187758021501614,0.230563526869532,4,3
+Mali,MLI,2001,1220190,11271603,FALSE,0.0432018909217907,1.2185648358282,0.398187183085282,0.0944664013647429,,,,,,0.374406944447909,0.438605077800003,0.562479393880283,4,3
+Mali,MLI,2002,1220190,11616890,FALSE,0.0511962633997387,1.00750572475964,0.408449492019756,0.0989354032475283,,,,,,0.400844638370811,0.391521720856666,0.502428588792661,4,3
+Mali,MLI,2003,1220190,11982692,FALSE,0.0678473138058835,0.478892712608343,0.491473141426232,0.110063875782991,0.838578586712018,,2.10700409232592,,,0.452384148370104,0.651056227189874,0.78708620727184,6,4
+Mali,MLI,2004,1220190,12369078,FALSE,0.0916610283332579,0.355368332573478,0.517889144847006,0.109526666514901,0.969066971373398,,1.45798955156451,,,0.481288560313161,0.506486944766631,0.601043277741513,6,4
+Mali,MLI,2005,1220190,12775509,FALSE,0.103967815691511,0.771914972387764,0.569597075232201,0.134522391051958,1.10144554705402,,,,,0.541758546772515,0.395000563590858,0.482731970070746,5,3
+Mali,MLI,2006,1220190,13203378,FALSE,0.144754175870553,0.751279629603418,0.697378954779174,0.139316605680213,0.906954308197148,2.37743799208136,1.91220618549897,0.0117281207703019,,0.660333361260153,1.00372892391895,0.694972780562612,7,5
+Mali,MLI,2007,1220190,13651455,FALSE,0.155425105564597,1.11372292068275,0.769315532589213,0.144484685873232,0.965275478850889,1.45157764838993,,0.0113395275747672,,0.727269115812373,0.726905178619944,0.499204062485782,6,4
+Mali,MLI,2008,1220190,14113578,FALSE,0.291391996192741,1.09749387499179,1.0434427607592,0.162085160121992,0.875591547106671,1.51163483237113,,0.0338958846694253,,0.97737702742173,0.821209724887372,0.567712986801235,6,4
+Mali,MLI,2009,1220190,14581427,FALSE,0.323360949283914,2.25399395792664,0.781620108115615,0.131844630335319,0.803386100601736,2.37648624505594,1.48413346538605,0.0310935429609023,,0.76082640111652,1.22523989268391,0.932378399545087,7,5
+Mali,MLI,2010,1220190,15049352,FALSE,0.348118648905879,1.1613801112152,0.955696305723031,0.134964912099634,0.935351039091074,2.96928990063232,1.19832312291496,0.037681898489116,,0.902282413956989,1.12796216691517,0.68692649173518,7,5
+Mali,MLI,2011,1220190,15514593,FALSE,0.371447455544847,1.58458021052334,0.999278799090248,0.123827077804263,1.04563759888827,7.67154444988924,1.62734408057505,0.0732082338514221,,0.940266800033331,2.0630036789045,0.869845280557481,7,5
+Mali,MLI,2012,1220190,15979492,FALSE,0.458997327274771,1.13580276511954,1.0672482876633,0.100416467724744,0.81819536167683,7.35100802859338,0,0.0781937383267481,,1.00327639456207,1.68557881272929,0.46353787314662,7,5
+Mali,MLI,2013,1220190,16449854,FALSE,0.557341125885417,0.828419282850685,1.22412655467055,0.103411511050986,0.657054914786399,6.90647404107344,0.219260140381629,0.0924170435646868,,1.13504750328894,1.63983877598545,0.475711096227385,7,5
+Mali,MLI,2014,1220190,16934213,FALSE,1.08279967294739,0.374606263045028,1.20487439949201,0.11906353761645,0.61388251471285,8.38171725060562,0,0.121233403215697,,1.11295853962316,1.86051018728442,0.345572348700066,7,5
+Mali,MLI,2015,1220190,17438772,FALSE,1.55167054422149,0.899760289352127,1.11859024854775,0.10930714683975,0.605194814912987,8.7973393289622,0,0.130347549311537,,1.02493696683159,2.07944459298722,0.432870390467,7,5
+Mali,MLI,2016,1220190,17965448,FALSE,1.6202296062932,1.10635944878677,1.16562105141485,0.115526673548998,0.601442724345097,7.57376456612671,0,0.383876135217855,,1.07320276034909,1.93025022436176,0.535793003580543,7,5
+Mali,MLI,2017,1220190,18512429,FALSE,2.20737584809439,1.35478633564742,1.13882409415222,0.125194415598515,0.694167617812143,6.84825126698439,0,0.523172949901169,,1.06879395096401,1.94573866007949,0.614389530422224,7,5
+Mali,MLI,2018,1220190,19077755,FALSE,3.15802572049035,1.0744353603036,1.26347165140092,0.127809103184254,0.559569408338628,,0.567173228290849,,,1.18837076241007,1.23818301273399,0.739447113547191,6,4
+Mali,MLI,2019,1220190,19658023,FALSE,3.46456411750749,1.2335657732493,,0.132645022770422,,,,,,,1.61025830450907,0.68310539800986,3,2
+Mali,MLI,2020,1220190,20250834,FALSE,,,,,,,,,,,,,0,0
+Malta,MLT,1990,320,354170,TRUE,0,5.67100139120749,28.885456533868,,,,,,,27.362124056408,11.5188193083585,16.5165627238077,3,2
+Malta,MLT,1991,320,363845,TRUE,0,12.4271482865316,30.4657218584389,,,,,,,28.7743818115341,14.2976233816568,20.6007650490329,3,2
+Malta,MLT,1992,320,367618,TRUE,0,15.4914431786553,34.2226756567796,,,,,,41.1958823380617,32.1916864596414,22.7275002933742,29.6263373254528,3,3
+Malta,MLT,1993,320,371308,TRUE,0,6.77380546229587,31.9006799680874,,,,,,47.3616570926097,30.0254742235873,21.5090356307483,28.053645592831,3,3
+Malta,MLT,1994,320,374797,TRUE,0,17.8716950542333,35.6028918480178,,,,,,63.6609699103486,33.2556912902915,29.2838892031499,38.2627854182911,3,3
+Malta,MLT,1995,320,377419,TRUE,1.56158471935859,76.2728373375714,41.3857338942878,38.3975563918843,,,,,62.2427633087337,39.2254349948571,43.9720951303672,54.0346480082616,4,4
+Malta,MLT,1996,320,379905,TRUE,7.25037900259605,46.8398860577744,39.2177070851801,35.9079415898538,,,,,67.4002537474141,37.7104734177068,39.3232334965637,46.9646387031873,4,4
+Malta,MLT,1997,320,382791,TRUE,26.8291231980092,25.8615589865102,36.7962867159018,39.2867588626639,,,,,59.8723497996904,36.1498552324277,37.7292155125551,40.292630720323,4,4
+Malta,MLT,1998,320,385287,TRUE,44.1973747777376,43.7364999914747,39.0529891826924,41.8068466648311,,,,,67.8744537421649,40.1753321745386,47.3336328717801,48.3982831432523,4,4
+Malta,MLT,1999,320,387578,TRUE,52.445278356743,90.3435062934276,41.6445192641515,43.941803024409,,,,,69.6198150028137,49.8076895640518,59.598984388309,63.4282034711755,4,4
+Malta,MLT,2000,320,390087,TRUE,88.0600949274914,100,46.9224827832634,43.1920394477648,,,,,85.3610377803389,51.5404213890843,72.7071309877717,70.023374654297,4,4
+Malta,MLT,2001,320,393028,TRUE,100,67.3068727521493,39.891412514332,44.4760747789318,,,,,80.3493708202769,43.7552856582702,66.404746173138,58.9719010024071,4,4
+Malta,MLT,2002,320,395969,TRUE,100,65.8719772076495,43.1439414066087,45.4956036139514,,,,,79.3734881089776,46.8108448195589,66.7770020674374,59.3879784375343,4,4
+Malta,MLT,2003,320,398582,TRUE,100,100,49.5608359024648,46.0811970911676,63.5796632592818,,100,,74.3700716216244,53.1668500691149,78.3353507692095,74.7236237563814,6,5
+Malta,MLT,2004,320,401268,TRUE,100,100,76.2971072673263,43.2297197571002,63.1907117488363,,100,,77.5431688058684,81.8203245710319,82.8449993050491,80.5186426268001,6,5
+Malta,MLT,2005,320,403834,TRUE,100,100,81.7563859008608,44.6395924986455,63.1655013250658,17.0946445401244,100,100,77.3880454866142,100,74.4112383466064,87.0046063308766,7,6
+Malta,MLT,2006,320,405308,TRUE,100,100,100,45.586214831441,59.8212351873479,15.5839445165071,100,30.3758604300579,83.2986107096199,100,77.7812528653669,76.5434476618531,7,6
+Malta,MLT,2007,320,406724,TRUE,100,100,100,51.4608022791699,67.4234339398782,17.4506482587761,100,56.8106794701876,,100,78.151908422991,81.6542963498715,7,5
+Malta,MLT,2008,320,409379,TRUE,100,100,100,63.0263674862312,70.0218194129393,16.9363521151182,100,87.2672701965401,,100,79.9937866002249,90.0587275365542,7,5
+Malta,MLT,2009,320,412477,TRUE,100,100,100,55.9559050278851,70.9934097615674,21.8773187168091,100,100,100,100,82.5476033920992,92.6593175046475,7,6
+Malta,MLT,2010,320,414508,TRUE,100,100,100,62.8033115744805,80.8225534162441,30.333970814979,100,100,97.0136700311961,100,84.3072789172365,93.3028302676128,7,6
+Malta,MLT,2011,320,416268,TRUE,100,100,100,66.0689162518203,78.8615062541041,29.6194904374422,100,100,66.8512578031934,100,80.362809213208,88.820029009169,7,6
+Malta,MLT,2012,320,420028,TRUE,100,100,100,68.6877867279934,78.4589927926224,28.9607898063706,100,100,77.0337400461561,100,82.0974737972172,90.9535877956916,7,6
+Malta,MLT,2013,320,425967,TRUE,100,100,100,68.9278731846722,84.356589733711,28.4335539280466,100,100,79.193428664863,100,82.3649793967974,91.3535503082559,7,6
+Malta,MLT,2014,320,434558,TRUE,100,100,100,72.4572549699752,88.2335560983944,25.4307966288451,100,100,77.5645340674435,100,82.2075122380377,91.6702981729031,7,6
+Malta,MLT,2015,320,445053,TRUE,100,100,100,77.4905698404632,90.4707673844,24.5072830709244,100,100,73.8347098682753,100,82.261794682809,91.8875466181231,7,6
+Malta,MLT,2016,320,455356,TRUE,100,100,100,83.8206312662737,93.4137067593942,19.7808025937758,100,100,67.8202072725565,100,81.6316630189437,91.9401397564717,7,6
+Malta,MLT,2017,320,467999,TRUE,100,100,100,92.8475732462678,100,21.5245150410459,100,100,65.9873546647917,100,82.9084918503008,93.1391546518432,7,6
+Malta,MLT,2018,320,484630,TRUE,100,100,100,99.2617374009938,100,,100,,,100,99.8523474801988,99.8154343502484,6,4
+Malta,MLT,2019,320,504062,TRUE,100,100,100,100,,,,,,100,100,100,4,3
+Malta,MLT,2020,320,525285,TRUE,100,100,100,,,,,,,100,100,100,3,2
+Myanmar,MMR,1990,653540,41335188,FALSE,0,0.170983796370291,0.0152943003751033,,,,,,,0.00954221684694675,0.0620926989151315,0.090263006608619,3,2
+Myanmar,MMR,1991,653540,41890192,FALSE,0,0.249245570335214,0,,,,,,,0,0.0830818567784045,0.124622785167607,3,2
+Myanmar,MMR,1992,653540,42401686,FALSE,0,0.177455267219659,0.0373285307940103,,,,,,,0.0266042951530849,0.0715945993378898,0.102029781186372,3,2
+Myanmar,MMR,1993,653540,42889992,FALSE,0,0.107039247080818,0.089851134049602,,,,,,,0.0682091318393588,0.0656301270434732,0.0876241894600883,3,2
+Myanmar,MMR,1994,653540,43383421,FALSE,0,0.127474252372413,0.113785869613791,,,,,,,0.0897892711158085,0.0804200406620682,0.108631761744111,3,2
+Myanmar,MMR,1995,653540,43901598,FALSE,0,0.276930548627441,0.143436296696335,0.0522282465252919,,,,,,0.118522695303425,0.118148772962267,0.149227163485386,4,3
+Myanmar,MMR,1996,653540,44452203,FALSE,,0.306294724385715,0.15438245343354,0.132454613221759,,,,,,0.124333269247969,0.197710597013671,0.187694202285148,3,3
+Myanmar,MMR,1997,653540,45027223,FALSE,,0.377139147039972,0.179305143022595,0.131014334551426,,,,,,0.144457774604928,0.229152874871331,0.217537085398775,3,3
+Myanmar,MMR,1998,653540,45611220,FALSE,,0.302371262189292,0.200984705775223,0.125855863540383,,,,,,0.163210252323728,0.2097372771683,0.197145792684468,3,3
+Myanmar,MMR,1999,653540,46181075,FALSE,0.00000860522839234328,0.24038350771494,0.18381887176067,0.112973746624953,,,,,,0.151972152937107,0.134296182832239,0.168443135759,4,3
+Myanmar,MMR,2000,653540,46719698,FALSE,,0.239188984616449,0.198574836725385,0.106714197314857,,,,,,0.16919568834555,0.181492672885564,0.171699623425619,3,3
+Myanmar,MMR,2001,653540,47225119,FALSE,0.0000160455991286295,0.193456293809934,0.208739926533198,0.120733421072885,,,,,,0.195014608788319,0.130736421753787,0.169734774557046,4,3
+Myanmar,MMR,2002,653540,47702163,FALSE,0.0000234201648524359,0.13838532679836,0.181745658180532,0.122567448801705,,,,,0.240998370698435,0.174186416044993,0.136744044928777,0.169034390585874,4,4
+Myanmar,MMR,2003,653540,48148907,FALSE,0.0013091794180715,0.226708168326749,0.192936656168354,0.149169715143688,0.169708071056052,,,,0.214730086831764,0.189997273726264,0.156970761177725,0.195151311007116,5,4
+Myanmar,MMR,2004,653420,48564489,FALSE,0.00131271457694762,0.190885097829677,0.217226403761254,0.162889233073178,0.207706720032177,,0.371341011875704,,0.265194814268824,0.212078523330909,0.201474879230931,0.240477736075658,6,5
+Myanmar,MMR,2005,653360,48949931,FALSE,0.00349115673508082,0.210473901649985,0.248504384264814,0.162339679233715,0.217921957061244,,,,0.285476219208332,0.267344171032577,0.182057068218385,0.231408492781152,5,4
+Myanmar,MMR,2006,653470,49301049,FALSE,0.00967265361510859,0.245367618998339,0.313385362542871,0.15378104917714,0.209493451269585,0.365857993569314,,0.0012882053157004,0.295711298713138,0.322046439400483,0.230629329435985,0.20363892232096,6,5
+Myanmar,MMR,2007,653520,49621479,FALSE,0.0114620450622347,0.627480396968676,0.402889709660272,0.173832503019883,0.233022912927051,0.0188669828389163,,0.00422230544594107,,0.407419883255571,0.246906327509996,0.303238772172518,6,4
+Myanmar,MMR,2008,653310,49929642,FALSE,0.0115419535627031,0.758847338546895,0.438969368095878,0.17640017226073,0.209921676338809,0.0196486286823364,,0.00870795257350908,,0.459457570200728,0.281081492229708,0.350853258395466,6,4
+Myanmar,MMR,2009,653300,50250366,FALSE,0.0114682868054412,0.941738334368947,0.45231795469378,0.183000976756561,0.224616368939669,,0.358882689262134,0.0141283653425853,0.27118560641972,0.46478083396869,0.369765641384431,0.372286134353106,6,6
+Myanmar,MMR,2010,653260,50600827,FALSE,0.0129418835515005,0.781071443469336,0.552463145616053,0.188685603427291,0.310094492363989,,0.142558828032486,0.0143923277856545,0.297973209740927,0.554434574722621,0.329282352306266,0.329852664529719,6,6
+Myanmar,MMR,2011,653290,50990612,FALSE,0.050344374013848,2.16739149395909,0.770422766769469,0.192949873716776,0.37765066180944,,0.353672681678865,0.0764571279170542,,0.753631538641353,0.706956238027609,0.708820543182627,6,5
+Myanmar,MMR,2012,653150,51413703,FALSE,0.203796255840549,1.13786130804709,0.834405380397158,0.248765809964081,0.42558538768976,,0.0701524513279523,0.192414847197375,,0.830612466596048,0.498996241115366,0.495961376626509,6,5
+Myanmar,MMR,2013,653080,51852464,FALSE,0.404143578222164,1.90704126635521,1.07505159105508,0.477413649211827,0.618049632328139,,0.347794204851798,0.236871703821865,0.117605446368374,1.02801821859212,0.721508289344076,0.6857907482002,6,6
+Myanmar,MMR,2014,653080,52280816,FALSE,0.577198529006475,1.8246483494001,1.22241849550624,0.714447258721667,0.735149232668226,,6.34698110586781,0.453856267680312,0.210354566516685,1.23285374085123,1.8160080508365,1.79719021483963,6,6
+Myanmar,MMR,2015,653080,52680724,FALSE,,3.3999780413459,1.33386897545092,1.07796620056701,0.726109099437365,1.11467128242113,0.684652188397657,0.854625422384148,0.07910783056374,1.31668486085147,1.28170741979106,1.23550242401832,6,6
+Myanmar,MMR,2016,653080,53045199,FALSE,,2.71040919567378,1.25463177091045,0.664283111646465,0.901920750794968,1.18418907202897,0.135989584931043,1.14074131508303,0.0855888612685362,1.22985479539554,1.00584859940987,0.9944778106664,6,6
+Myanmar,MMR,2017,652790,53382521,FALSE,1.15908637495861,3.94718766509327,1.41631246907401,0.782050851198107,1.04121364437718,2.32083129795313,0.2026954083321,1.54921942259034,0.0948517887451474,1.3989553833871,1.41757369362205,1.32916008655768,7,6
+Myanmar,MMR,2018,652790,53708318,FALSE,,1.44393604489459,1.51131314626986,0.801725947859056,1.00380475073045,,1.47741622704588,,,1.48409284897481,1.30859784151735,1.30179276719358,5,4
+Myanmar,MMR,2019,652790,54045422,FALSE,,1.40846903314836,1.52348383866775,0.979456750756276,,,,,,1.52644210092374,1.30380320752413,1.30478929494279,3,3
+Myanmar,MMR,2020,652790,54409794,FALSE,,,,,,,,,,,,,0,0
+Montenegro,MNE,1990,13450,606372,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,1991,13450,607105,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,1992,13450,608516,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,1993,13450,610170,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,1994,13450,611389,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,1995,13450,611712,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,1996,13450,611003,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,1997,13450,609520,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,1998,13450,607662,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,1999,13450,606001,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,2000,13450,604950,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,2001,13450,607389,TRUE,,,,,,,,,,,,,0,0
+Montenegro,MNE,2002,13450,609828,TRUE,,,,2.70770818357099,,,,,,,2.70770818357099,2.70770818357099,1,1
+Montenegro,MNE,2003,13450,612267,TRUE,,,,2.8159617934205,,,,,,,2.8159617934205,2.8159617934205,1,1
+Montenegro,MNE,2004,13450,613353,TRUE,100,,,3.72204104914688,,,,,,,51.8610205245734,3.72204104914688,2,1
+Montenegro,MNE,2005,13450,614261,TRUE,100,,,5.37776666934813,,,,,,,52.6888833346741,5.37776666934813,2,1
+Montenegro,MNE,2006,13450,615025,TRUE,100,,,7.46479401884511,1.84311452867953,,,0.894832054326919,,,53.7323970094226,4.17981303658601,3,2
+Montenegro,MNE,2007,13450,615875,TRUE,100,78.0922666787623,18.6295960519592,19.4076675226484,3.05047790786482,,,0.893596898421528,,17.1501937453679,54.0323825633425,28.8859312113,5,4
+Montenegro,MNE,2008,13450,616969,TRUE,100,77.1694601037362,23.7558901906692,20.2986693784445,4.18131737337005,,,2.25993449736768,,22.2578339390947,55.3060049182125,30.4964744796608,5,4
+Montenegro,MNE,2009,13450,618294,TRUE,100,100,16.2147075664737,20.5105844423924,30.3611548248938,,40.8342650601188,5.93463181274996,,15.7158575792699,55.511911413797,36.5990677789062,6,5
+Montenegro,MNE,2010,13450,619428,TRUE,100,55.6100220067737,15.8169102261408,21.335941985952,35.2955199576655,,17.4683609586455,8.29331815619133,,15.4347055154485,42.0462470355024,23.6284697246022,6,5
+Montenegro,MNE,2011,13450,620079,TRUE,100,40.6462485494042,18.8104251069704,23.5273221047459,31.3805845911006,,0,11.2434405293572,,18.1717656018831,36.5967991522241,18.7177553570781,6,5
+Montenegro,MNE,2012,13450,620601,TRUE,100,45.6526970552541,17.1444389121703,24.7407256204957,29.501797726463,,5.81178131729936,14.0129435470981,,16.5698485631691,38.6699285810439,21.3575992206633,6,5
+Montenegro,MNE,2013,13450,621207,TRUE,100,32.7672428006679,17.8209583034784,25.8899139212683,30.0569953568028,,11.6122236140201,22.2146085834213,,17.2200482564742,37.618067727887,21.9408074351704,6,5
+Montenegro,MNE,2014,13450,621810,TRUE,100,37.021816512527,17.8411218408573,26.3727534633958,29.744022954478,30.8155565808597,11.6009626647925,34.4628099273559,,17.4527468818424,37.2753685104054,25.3822178899827,7,5
+Montenegro,MNE,2015,13450,622159,TRUE,100,50.2099092032249,16.1932178769774,30.4583118526857,31.3899191981559,58.2992609141354,5.79722755324169,48.3624625577078,,15.7345448856154,43.4929879000442,30.1124912104951,7,5
+Montenegro,MNE,2016,13450,622303,TRUE,100,29.007303812223,17.6438148302792,32.4424026814301,33.1433241819273,57.397078778609,11.5917721666047,100,,17.253038209688,41.3470620448577,38.0589033739891,7,5
+Montenegro,MNE,2017,13450,622373,TRUE,100,40.2907881254492,20.0678935160793,36.6352906252375,36.3572804179776,57.9853129917186,11.5904684081646,100,,19.3258241719591,44.4282922777748,41.568474266162,7,5
+Montenegro,MNE,2018,13450,622227,TRUE,100,41.7447655675876,23.3420599425213,40.5485584334246,39.6906131627398,,23.1863760158097,,,22.6502669226151,45.7643519918686,32.0324917348592,6,4
+Montenegro,MNE,2019,13450,622028,TRUE,100,34.8091774540095,23.3967424136933,49.017849152687,,,,,,22.5984092428966,51.8059422550974,35.4751452831977,4,3
+Montenegro,MNE,2020,13450,621306,TRUE,100,0.337556890777713,16.1784293206722,,,,,,,16.0970915586503,38.8386620704833,8.21732422471402,3,2
+Mongolia,MNG,1990,1553560,2184139,FALSE,0,,1.69969116905703,,,,,,,1.52679497903292,0.849845584528515,1.52679497903292,2,1
+Mongolia,MNG,1991,1553560,2217918,FALSE,0,0.219896605171733,0.918822641878375,,,,,,,0.439120994938898,0.379573082350036,0.329508800055315,3,2
+Mongolia,MNG,1992,1553560,2243495,FALSE,0,0.0390988615951785,0.865407556009826,,,,,,,0.769802138348615,0.301502139201668,0.404450499971897,3,2
+Mongolia,MNG,1993,1553560,2263196,FALSE,0,0.149220256179195,0.81275548468909,,,,,,,0.718320778447928,0.320658580289428,0.433770517313561,3,2
+Mongolia,MNG,1994,1553560,2280475,FALSE,0,0.132703689672519,0.849928241957796,,,,,,,0.754435019820037,0.327543977210105,0.443569354746278,3,2
+Mongolia,MNG,1995,1553560,2298017,FALSE,0.0100438021294592,0.187038952463331,1.04577942450955,0.569464895080007,,,,,,0.930922757267682,0.453081768545588,0.562475534937007,4,3
+Mongolia,MNG,1996,1553560,2316571,FALSE,0.0205354032160917,0.301030660804731,1.06028644920719,0.370866483258914,,,,,,0.951352460625692,0.438179749121731,0.541083201563112,4,3
+Mongolia,MNG,1997,1553560,2335744,FALSE,0.126438030088861,0.469433403738139,1.21983910127663,0.425020135914342,,,,,,1.07634770015505,0.560182667754492,0.656933746602509,4,3
+Mongolia,MNG,1998,1553560,2355667,FALSE,0.162139981909994,0.351890165151861,1.20691950776533,1.01445774600542,,,,,,1.0608904953234,0.683851850208149,0.809079468826892,4,3
+Mongolia,MNG,1999,1553560,2376228,FALSE,0.560523276233055,0.561105721974498,1.16095918930176,0.816512661515545,,,,,,1.01459838249379,0.774775212256215,0.797405588661276,4,3
+Mongolia,MNG,2000,1553560,2397417,FALSE,1.37195797180744,0.982348678234078,1.35913964284103,0.799149057574801,,,,,,1.20506108646826,1.12814883761434,0.995519607425714,4,3
+Mongolia,MNG,2001,1553560,2419594,FALSE,1.78981456090629,1.14197678022675,1.42743858113759,0.96251351844617,,,,,,1.26389919696357,1.3304358601792,1.12279649854549,4,3
+Mongolia,MNG,2002,1553560,2443261,FALSE,2.18667581111482,1.3957104933828,1.60106397504671,1.16697307547059,,,,,,1.41672967798785,1.58760583875373,1.32647108228042,4,3
+Mongolia,MNG,2003,1553560,2468765,FALSE,,2.33688482683512,1.84291851912641,1.00728256868496,1.12276442570002,,8.76583384152958,,,1.63371714623284,3.48822993904402,3.43592959582063,5,4
+Mongolia,MNG,2004,1553560,2496394,FALSE,,1.63250790899726,2.49748228162625,1.48273860630259,1.2752703369318,,,,,2.21071504889864,1.87090959897536,1.7753205213995,4,3
+Mongolia,MNG,2005,1553560,2526429,FALSE,,3.29702945262081,2.88013438866158,1.65742813128121,1.38524074478131,,,,,2.56964634229987,2.6115306575212,2.5080346420673,4,3
+Mongolia,MNG,2006,1553560,2558854,FALSE,,5.1396346986333,3.60816772856124,1.93549488566685,1.51613676715799,,,0.178853084518591,,3.20997891559609,3.56109910428713,2.61599039610371,4,4
+Mongolia,MNG,2007,1553560,2593819,FALSE,9.08903835740677,6.5186249164447,4.61870686731069,2.12950561270731,1.70735028407605,,,0.33941140848931,,4.19781156257873,5.58896893846737,3.29633837505501,5,4
+Mongolia,MNG,2008,1553560,2631899,FALSE,9.7537574265692,14.1804233301638,6.20865907412457,2.16329282132919,1.94338801091079,,,0.696993185133911,,5.5888130580799,8.07653316304669,5.6573805986767,5,4
+Mongolia,MNG,2009,1553560,2673794,FALSE,9.79686558715629,11.1118383808595,4.42240918795415,2.11120059739938,1.76530930329638,1.68685917457532,5.39577438994522,0.686070435604434,,4.05230850214513,5.75415788631497,4.67143846119073,7,5
+Mongolia,MNG,2010,1553560,2719902,FALSE,9.82340409112529,28.2795911628736,6.42261624455573,2.48628839124905,1.79212236226701,6.75423717339937,6.63038097934649,4.63776605495097,,6.12199399823385,10.0660863404249,9.63120411733079,7,5
+Mongolia,MNG,2011,1553560,2770357,FALSE,11.8192266357742,73.8656589179217,11.0292617205509,2.74792909967025,2.38675469393884,7.29934833483039,9.11347565713772,7.94811762928062,,10.6615002929979,19.3124833943142,20.8673363194016,7,5
+Mongolia,MNG,2012,1553560,2824698,FALSE,15.2085188215596,67.3425377129456,11.4061166158352,2.68213514011411,3.04281584004462,,2.55375781573626,11.2356076168355,6.73956156360708,10.940549024889,17.6554379449663,16.9156914790213,6,6
+Mongolia,MNG,2013,1553560,2881783,FALSE,16.0889128260397,31.9712510742078,10.7717459691447,2.16949409717157,2.97739479319876,,2.50317063935577,1.65519771666322,7.78409026000858,10.2035901349872,11.8814441443214,9.38113232039903,6,6
+Mongolia,MNG,2014,1553560,2940111,FALSE,17.7676431410161,6.63603650390901,10.880742515321,2.08923908151017,2.90827996782505,,2.45351097104653,2.49599600107201,4.76214343376819,10.2976883097398,7.43155260776184,4.78910238350761,6,6
+Mongolia,MNG,2015,1557255.4,2998433,FALSE,19.6563711032992,1.54652197180019,8.3734114078322,1.89056738058332,2.59988536029155,11.7742397484163,9.62315261951105,3.67122251143558,4.49615997957597,8.08717684962569,8.19434631585975,4.8858002187553,7,6
+Mongolia,MNG,2016,1557255.4,3056358,FALSE,19.0830856389513,59.852521676211,8.83694167325529,1.87060785442385,2.44551025000596,11.063716440164,4.72038589366468,3.72170075836636,4.32567233910511,8.45116002792522,15.6789902165393,13.8236747582827,7,6
+Mongolia,MNG,2017,1557255.4,3113788,FALSE,19.949670413379,21.733323544916,10.3156214971019,2.11697678592196,3.18362638160362,10.8087267721297,1.15833104157936,3.89817226386762,4.82801681951891,10.220940396984,10.1300952677924,7.32596014213132,7,6
+Mongolia,MNG,2018,1557255,3170214,FALSE,38.9425128181121,27.3852236402305,12.3204084200137,2.29002606429178,3.1771802990878,,5.68857070421318,,,12.026286008869,17.3253483293723,11.8475266044011,6,4
+Mongolia,MNG,2019,1557255,3225166,FALSE,41.4871746345408,34.9537517288615,13.2149773979208,2.39788068418382,,,,,,13.1075963878208,23.0134461113767,16.819742933622,4,3
+Mongolia,MNG,2020,1557255,3278292,FALSE,49.9399007970302,0.347405723556763,11.0229009097783,,,,,,,10.8904230406378,20.4367358101217,5.61891438209726,3,2
+Northern Mariana Islands,MNP,1990,,45752,TRUE,0,,,,,,,,,,0,,1,0
+Northern Mariana Islands,MNP,1991,460,46662,TRUE,0,,,,,,,,,,0,,1,0
+Northern Mariana Islands,MNP,1992,460,46473,TRUE,0,,,,,,,,,,0,,1,0
+Northern Mariana Islands,MNP,1993,460,45763,TRUE,0,,,,,,,,,,0,,1,0
+Northern Mariana Islands,MNP,1994,460,45361,TRUE,0,,,,,,,,,,0,,1,0
+Northern Mariana Islands,MNP,1995,460,45872,TRUE,0,,,100,,,,,,,50,100,2,1
+Northern Mariana Islands,MNP,1996,460,47518,TRUE,,,,100,,,,,,,100,100,1,1
+Northern Mariana Islands,MNP,1997,460,50052,TRUE,,,,100,,,,,,,100,100,1,1
+Northern Mariana Islands,MNP,1998,460,52999,TRUE,,,,100,,,,,,,100,100,1,1
+Northern Mariana Islands,MNP,1999,460,55633,TRUE,,,,100,,,,,,,100,100,1,1
+Northern Mariana Islands,MNP,2000,460,57453,TRUE,,,,100,,,,,,,100,100,1,1
+Northern Mariana Islands,MNP,2001,460,58319,TRUE,,,,92.4845988101452,,,,,,,92.4845988101452,92.4845988101452,1,1
+Northern Mariana Islands,MNP,2002,460,58412,TRUE,,,,98.9923969505485,,,,,,,98.9923969505485,98.9923969505485,1,1
+Northern Mariana Islands,MNP,2003,460,57954,TRUE,,,,96.2112924516265,100,,,,,,96.2112924516265,96.2112924516265,2,1
+Northern Mariana Islands,MNP,2004,460,57240,TRUE,,,,100,100,,,,,,100,100,2,1
+Northern Mariana Islands,MNP,2005,460,56547,TRUE,,,,100,100,,,,,,100,100,2,1
+Northern Mariana Islands,MNP,2006,460,55886,TRUE,,,,94.772021201178,100,,,,,,94.772021201178,94.772021201178,2,1
+Northern Mariana Islands,MNP,2007,460,55215,TRUE,,,,85.5831938762876,100,,,,,,85.5831938762876,85.5831938762876,2,1
+Northern Mariana Islands,MNP,2008,460,54621,TRUE,,,,88.2931581273516,100,,,,,,88.2931581273516,88.2931581273516,2,1
+Northern Mariana Islands,MNP,2009,460,54194,TRUE,,,,79.3500931281135,100,,0,,,,39.6750465640567,39.6750465640567,3,2
+Northern Mariana Islands,MNP,2010,460,53971,TRUE,,,,85.3050390311058,100,,0,,,,42.6525195155529,42.6525195155529,3,2
+Northern Mariana Islands,MNP,2011,460,54013,TRUE,,,,76.6921988220256,100,,0,,,,38.3460994110128,38.3460994110128,3,2
+Northern Mariana Islands,MNP,2012,460,54306,TRUE,,,,89.7000862948896,100,,66.4161841656041,,,,78.0581352302469,78.0581352302469,3,2
+Northern Mariana Islands,MNP,2013,460,54786,TRUE,,,,97.3400988263309,100,,100,,,,98.6700494131654,98.6700494131654,3,2
+Northern Mariana Islands,MNP,2014,460,55301,TRUE,,,,100,100,,0,,,,50,50,3,2
+Northern Mariana Islands,MNP,2015,460,55779,TRUE,,,,100,100,,0,,,,50,50,3,2
+Northern Mariana Islands,MNP,2016,460,56187,TRUE,,,,100,100,,0,,,,50,50,3,2
+Northern Mariana Islands,MNP,2017,460,56553,TRUE,,,,100,100,,0,,,,50,50,3,2
+Northern Mariana Islands,MNP,2018,460,56889,TRUE,,,,100,100,,0,,,,50,50,3,2
+Northern Mariana Islands,MNP,2019,460,57213,TRUE,,,,100,,,,,,,100,100,1,1
+Northern Mariana Islands,MNP,2020,460,57557,TRUE,,,,,,,,,,,,,0,0
+Mozambique,MOZ,1990,786380,12987292,FALSE,0,0.0310690837069487,,,,,,,,,0.0155345418534743,0.0310690837069487,2,1
+Mozambique,MOZ,1991,786380,13328029,FALSE,0,0.074041602892884,,,,,,,,,0.037020801446442,0.074041602892884,2,1
+Mozambique,MOZ,1992,786380,13805999,FALSE,0,0.0803733196891516,,,,,,,,,0.0401866598445758,0.0803733196891516,2,1
+Mozambique,MOZ,1993,786380,14370950,FALSE,0,0.0978380044191094,,,,,,,,,0.0489190022095547,0.0978380044191094,2,1
+Mozambique,MOZ,1994,786380,14948050,FALSE,0,0.102781144449202,,,,,,,,,0.0513905722246008,0.102781144449202,2,1
+Mozambique,MOZ,1995,786380,15483277,FALSE,0,0.128037759738861,,,,,,,,,0.0640188798694304,0.128037759738861,2,1
+Mozambique,MOZ,1996,786380,15960445,FALSE,0.000499423591289171,0.199228852511613,,,,,,,,,0.0998641380514512,0.199228852511613,2,1
+Mozambique,MOZ,1997,786380,16397175,FALSE,0.00189187973943519,0.172256674452892,,,,,,,,,0.0870742770961634,0.172256674452892,2,1
+Mozambique,MOZ,1998,786380,16813946,FALSE,0.00314654171550684,0.612734863254353,,,,,,,,,0.30794070248493,0.612734863254353,2,1
+Mozambique,MOZ,1999,786380,17244176,FALSE,0.00854476317382531,0.970820494952646,,,,,,,,,0.489682629063236,0.970820494952646,2,1
+Mozambique,MOZ,2000,786380,17711925,FALSE,0.0162080318853115,0.34494080679769,,,,,,,,,0.180574419341501,0.34494080679769,2,1
+Mozambique,MOZ,2001,786380,18221884,FALSE,0.0230053320140134,0.614818865965028,,0.267880886999011,,,,,,,0.301901694992684,0.44134987648202,3,2
+Mozambique,MOZ,2002,786380,18764147,FALSE,0.0362419913527194,0.812598780316512,,0.609047489949158,,,,,,,0.485962753872796,0.710823135132835,3,2
+Mozambique,MOZ,2003,786380,19331097,FALSE,0.0568500395473043,0.763912781507004,,0.454776336026787,0.384199160989738,,1.67922056754853,,,,0.738689931157406,0.96596989502744,5,3
+Mozambique,MOZ,2004,786380,19910549,FALSE,0.0893898025490381,1.04746351730756,,0.432346891744602,0.391667651131907,,0.90575033799854,,,,0.618737637399935,0.795186915683567,5,3
+Mozambique,MOZ,2005,786380,20493927,FALSE,0.109201687886976,0.293138449452671,0.549633578923339,0.564038817811687,0.950491333787221,,,,,0.525153640770434,0.379003133518668,0.460776969344931,5,3
+Mozambique,MOZ,2006,786380,21080108,FALSE,0.104748156798561,0.809926949960214,0.670701474892192,0.629568918102257,0.713653010127353,,,0.00239555367143468,,0.669421206965372,0.553736374938306,0.527828157174819,5,4
+Mozambique,MOZ,2007,786380,21673319,FALSE,0.109984393195283,0.878395870817233,0.691857431306591,0.704219970714545,0.60844731900626,,0.832082362949878,0.00232694636449193,,0.687731984536094,0.643308005796706,0.620951427076448,6,5
+Mozambique,MOZ,2008,786380,22276596,FALSE,0.18343865761251,1.36076646998828,0.810993653553397,0.783267788365587,0.497833129937606,,1.61909714450866,0.00917919065371226,,0.787188431592048,0.951512742805686,0.911899805021656,6,5
+Mozambique,MOZ,2009,786380,22894718,FALSE,0.306629962164183,1.84789088435243,0.725483315718018,0.906404997093896,0.402003210287223,0.304316594334758,1.26030721926247,0.0191858704737399,,0.675385656902371,0.891838828820959,0.941834925616981,7,5
+Mozambique,MOZ,2010,786380,23531567,FALSE,0.46419483145919,2.78889564036404,0.712958685508669,0.946365205679792,0.485230211596727,,0.306549691084941,0.0398085331742591,,0.667141035129314,1.04379281081933,0.949752021086468,6,5
+Mozambique,MOZ,2011,786380,24187500,FALSE,0.498175015848793,6.79536593276773,1.07255561798643,1.00955831944918,0.605883118641328,1.80073018354258,0.745591172567917,0.0387259667467703,,0.97510058998147,1.98699604036044,1.91286839630261,7,5
+Mozambique,MOZ,2012,786380,24862673,FALSE,0.526789706515968,9.95621081835849,1.62107635166843,1.07640344433242,0.665283921158596,,0.290137532460592,0.115007074031043,,1.43486943551022,2.69412357066718,2.57452566093855,6,5
+Mozambique,MOZ,2013,786380,25560752,FALSE,0.56364305064889,12.3881359985362,1.58555121619676,0.934805591327147,0.752444931504274,,0.282213707742033,0.18364145555476,,1.40177459575979,3.15086991289021,3.03811426978399,6,5
+Mozambique,MOZ,2014,786380,26286192,FALSE,0.59791392589109,8.50246108424156,1.45771976477154,0.807757794452363,0.742902739087171,,0.137212620880852,0.401921989666122,,1.29961498926751,2.30061303804748,2.22979369570168,6,5
+Mozambique,MOZ,2015,786380,27042001,FALSE,0.6296361085385,6.27649841519621,1.28092806631614,0.73258139468931,0.648023563151499,1.61298518105658,1.06702083097987,0.1891809718892,,1.14903443599034,1.93327499946277,1.88286320974899,7,5
+Mozambique,MOZ,2016,786380,27829930,FALSE,0.658871951816676,4.98457961044732,0.974198126471695,0.74715626186679,0.580028395194949,0.931971773388189,0.129601378706209,0.156871250337396,,0.875157458972056,1.40439651711615,1.37867319206595,7,5
+Mozambique,MOZ,2017,786380,28649007,FALSE,0.71318158887954,3.5900688120417,1.11012621019894,0.640523989081905,0.546271995660689,1.54969628449299,0.251792133479342,0.194445173504149,,1.01190710733357,1.30923150302907,1.13774744308813,7,5
+Mozambique,MOZ,2018,786380,29496009,FALSE,0.923602662406794,4.00328257209957,1.31054040309585,1.18055898924749,0.497449007521215,,0,,,1.16857657814038,1.48359692536994,1.58810453487186,6,4
+Mozambique,MOZ,2019,786380,30366043,FALSE,1.30257829915063,3.19439258520186,1.17076389140725,0.811849999025275,,,,,,1.06842385590527,1.61989619369625,1.69155548004413,4,3
+Mozambique,MOZ,2020,786380,31255435,FALSE,,0.215230015156331,0.947675460803192,,,,,,,0.876718858893376,0.581452737979761,0.545974437024853,2,2
+Mauritania,MRT,1990,1030700,2034347,FALSE,0,0.145228043357091,1.13990368758302,,,,,,,1.04066712081841,0.428377243646704,0.592947582087752,3,2
+Mauritania,MRT,1991,1030700,2087914,FALSE,0,0.0476796089398889,1.14051031454977,,,,,,,1.02232685643002,0.396063307829887,0.535003232684956,3,2
+Mauritania,MRT,1992,1030700,2142645,FALSE,0,0.157763150848597,1.16714448514078,,,,,,,1.03883998504466,0.441635878663126,0.598301567946631,3,2
+Mauritania,MRT,1993,1030700,2198538,FALSE,0,0.324543721197897,1.0731180474683,,,,,,,1.02073714068137,0.465887256222067,0.672640430939633,3,2
+Mauritania,MRT,1994,1030700,2255520,FALSE,0,0.063204595465934,0.990682179067962,,,,,,,0.899478765943469,0.351295591511299,0.481341680704701,3,2
+Mauritania,MRT,1995,1030700,2313630,FALSE,0,0.136294196800467,1.02218083541462,,,,,,,0.927813793963491,0.386158344071695,0.532053995381979,3,2
+Mauritania,MRT,1996,1030700,2372900,FALSE,,0.0116634049067841,1.07232417849779,,,,,,,0.967019321105577,0.541993791702286,0.489341363006181,2,2
+Mauritania,MRT,1997,1030700,2433567,FALSE,0.00449128838597961,0.0631014058563804,0.931263057159674,,,,,,,0.837965980140701,0.332951917134011,0.450533692998541,3,2
+Mauritania,MRT,1998,1030700,2496217,FALSE,0.0425993634907954,0.0039602017458778,0.799206058019852,,,,,,,0.717017788102231,0.281921874418842,0.360488994924054,3,2
+Mauritania,MRT,1999,1030700,2561584,FALSE,0.121141957164897,0.258873086282198,,0.11236343173193,,,,,,,0.164126158393008,0.185618259007064,3,2
+Mauritania,MRT,2000,1030700,2630217,FALSE,0.191247559519007,0.668603571003165,,0.137105183582467,,,,,,,0.332318771368213,0.402854377292816,3,2
+Mauritania,MRT,2001,1030700,2702405,FALSE,0.253425842582441,1.24481310312966,,,,,,,,,0.749119472856051,1.24481310312966,2,1
+Mauritania,MRT,2002,1030700,2778097,FALSE,0.342490634224978,1.06889444449165,,,,,,,,,0.705692539358313,1.06889444449165,2,1
+Mauritania,MRT,2003,1030700,2857150,FALSE,0.388734355223168,1.58046933868367,,,1.38936428323844,,,,,,0.984601846953419,1.58046933868367,3,1
+Mauritania,MRT,2004,1030700,2939246,FALSE,0.429090386932772,6.08976524092195,,,1.47141941451497,,,,,,3.25942781392736,6.08976524092195,3,1
+Mauritania,MRT,2005,1030700,3024198,FALSE,0.58030717911211,11.8036378835176,,,1.70398012891947,,,,,,6.19197253131484,11.8036378835176,3,1
+Mauritania,MRT,2006,1030700,3111908,FALSE,0.824639771071967,2.17974984499294,,,1.43219334842983,4.2957892001944,,0.010501322373381,,,2.4333929387531,1.09512558368316,4,2
+Mauritania,MRT,2007,1030700,3202512,FALSE,1.17261735652932,1.92622779352819,,,1.78578790002544,6.0509978332646,,0.0503038376705282,,,3.04994766110737,0.98826581559936,4,2
+Mauritania,MRT,2008,1030700,3296237,FALSE,1.48606659036177,4.60055358666706,,,1.58399381095523,7.08383304543932,,0.0544364117801415,,,4.39015107415605,2.3274949992236,4,2
+Mauritania,MRT,2009,1030700,3393408,FALSE,1.76000483792985,0.0397054965173384,,,1.34065543073936,,1.06288347799537,0.0561184422908784,,,0.954197937480851,0.386235805601194,4,3
+Mauritania,MRT,2010,1030700,3494200,FALSE,2.9986606863654,1.8486697794079,,,1.56778777008843,,0,0.0586970525880928,,,1.61577682192443,0.635788943998664,4,3
+Mauritania,MRT,2011,1030700,3598646,FALSE,3.27558203601722,7.19330618003233,,,1.4650068568734,,0,0.126327491932845,,,3.48962940534985,2.43987789065506,4,3
+Mauritania,MRT,2012,1030700,3706555,FALSE,3.53357773265808,16.433142353193,4.48694979281211,,1.3039197303574,8.84208416203615,0,0.122646484312661,,4.16005769742473,6.65915080813986,5.17896163373259,6,4
+Mauritania,MRT,2013,1030700,3817497,FALSE,4.25429967959683,13.1504846108235,4.32364775283637,,1.49390387544654,,0,0.119078972153209,,4.01442624922377,5.43210801081418,4.32099745805013,5,4
+Mauritania,MRT,2014,1030700,3930894,FALSE,7.13029566697731,5.91722445944638,3.51218219184498,,1.63968582800362,,0.917551401105524,0.317272575017954,,3.21802400435697,4.36931342984355,2.59251810998171,5,4
+Mauritania,MRT,2015,1030700,4046304,FALSE,9.83954963072877,5.44065832605655,2.48752789459525,,1.6843291458264,,0,0.870470905517249,,2.33983849153873,4.44193396284514,2.16274193077813,5,4
+Mauritania,MRT,2016,1030700,4163532,FALSE,11.3246735623362,2.86706356706734,2.38885335060398,,1.48730923645184,5.55385533939854,0,1.74490819648138,,2.19777878000406,4.42688916388122,1.7024376358882,6,4
+Mauritania,MRT,2017,1030700,4282582,FALSE,12.7230976951959,6.12305879088669,2.63052861659028,,1.41327977447228,4.19132765283458,0.842201573092424,1.85062720461933,,2.44779650278791,5.30204286571997,2.81592101784659,6,4
+Mauritania,MRT,2018,1030700,4403312,FALSE,,15.3902654393835,2.89944843398765,,1.01820676816144,,3.27644036788426,,,2.66063897787694,7.18871808041848,7.10911492838158,4,3
+Mauritania,MRT,2019,1030700,4525698,FALSE,,8.6090011213621,3.28085338016156,,,,,,,3.03541278104035,5.94492725076183,5.82220695120123,2,2
+Mauritania,MRT,2020,1030700,4649660,FALSE,,,3.3229784800199,,,,,,,3.0570849322325,3.3229784800199,3.0570849322325,1,1
+Mauritius,MUS,1990,2030,1058775,TRUE,0,1.72514689306792,8.27542214886292,,,,,,,7.50240415188563,3.33352301397695,4.61377552247678,3,2
+Mauritius,MUS,1991,2030,1070266,TRUE,0,1.15720784397359,8.25613360858872,,,,,,,7.5316725533725,3.13778048418744,4.34444019867305,3,2
+Mauritius,MUS,1992,2030,1084441,TRUE,0,2.34661538331514,8.72820310604149,,,,,,35.6321244492273,7.96381464913904,11.676735734646,15.3141848272272,3,3
+Mauritius,MUS,1993,2030,1097374,TRUE,0,1.91592634566504,8.77833513383295,,,,,,32.1666794004124,7.93684404828504,10.7152352199776,14.0064832647875,3,3
+Mauritius,MUS,1994,2030,1112846,TRUE,0,0.829470137052795,9.37658456396791,,,,,,36.462414011741,8.365088253969,11.6671171781904,15.2189908009209,3,3
+Mauritius,MUS,1995,2030,1122457,TRUE,0,0.871994308779243,10.3156101741548,5.88606851289511,,,,,39.0663850308645,9.25279720992862,11.2280116053387,13.7693112656169,4,4
+Mauritius,MUS,1996,2030,1133996,TRUE,0.424498535992825,1.52136957685616,11.8695512120955,6.73672447098083,,,,,40.5570018703251,10.5788965136968,12.2218291332501,14.8484981079647,4,4
+Mauritius,MUS,1997,2030,1148284,TRUE,1.08501135496908,2.23288387411095,10.8903916828994,7.29821488039338,,,,,45.563588632081,9.72884633048275,13.4140180848908,16.205883429267,4,4
+Mauritius,MUS,1998,2030,1160421,TRUE,5.79074289768563,0.978266146790688,10.8832913203227,7.5568612126574,,,,,47.5668826555468,9.73991299897328,14.5552088466007,16.460480753492,4,4
+Mauritius,MUS,1999,2030,1175267,TRUE,10.3690307835816,2.08181968750976,11.2050507165467,7.79214729750093,,,,,46.7103708485035,9.98321886917837,15.6316838667285,16.6418891756731,4,4
+Mauritius,MUS,2000,2030,1186873,TRUE,16.07066292101,10.2949798346625,10.8267570594945,8.60640455901993,,,,,55.5619918052358,9.66986863571056,20.2721592358845,21.0333112086572,4,4
+Mauritius,MUS,2001,2030,1196287,TRUE,19.2273282527794,1.11980809457193,11.0992993739029,8.48789272059147,,,,,58.4766557731453,9.94694537604265,19.6821968429982,19.5078254910878,4,4
+Mauritius,MUS,2002,2030,1204621,TRUE,22.2946019595142,1.48442742830321,11.5224613776745,8.78211669413117,,,,,59.6910807618121,10.3341874733718,20.754937644287,20.0729530894046,4,4
+Mauritius,MUS,2003,2030,1213370,TRUE,26.3100962341544,2.48139479759405,12.4964509369049,8.8289120675419,16.3366367084347,,23.7803624437545,,57.799141118876,11.146107487339,21.9493929331376,20.8071835830211,6,5
+Mauritius,MUS,2004,2030,1221003,TRUE,29.3679002938889,1.64089432138031,13.9225048987431,9.14182884770475,16.4492984909161,,20.67773877794,,63.5928251899817,12.3818911497465,23.0572820549398,21.4870356573507,6,5
+Mauritius,MUS,2005,2030,1228254,TRUE,32.3575990080228,3.16881625730088,15.504277548724,9.54281122096627,16.3242382181525,18.2577539709282,29.3652395782737,100,69.0140434428471,14.0708164726375,25.3157915752947,37.5269544953376,7,6
+Mauritius,MUS,2006,2030,1233996,TRUE,35.45012845341,4.13530128359024,17.0720517486977,9.77404349616067,16.0734687966429,20.8317391300904,17.5371587782973,0.114075352721475,63.7188113554795,16.1342615726148,24.074176320818,18.568941973144,7,6
+Mauritius,MUS,2007,2030,1239630,TRUE,42.727173802551,14.1642774603425,18.8335755755754,11.2289636521829,15.3024077205254,24.871205324232,43.6436351648955,0.168910062462122,,18.8882882430703,25.9114718299632,17.6188149165907,7,5
+Mauritius,MUS,2008,2030,1244121,TRUE,45.9206618396038,15.1641404837771,21.810459177699,11.6766389012876,16.1061672037365,27.8697413014123,26.0916548114498,0.272413907886506,,21.5749166712502,24.7555494192049,14.9559529551302,7,5
+Mauritius,MUS,2009,2030,1247429,TRUE,47.2688191138349,10.3551694128199,17.9796137910539,10.5744465624688,15.4975384648562,29.0640580558803,14.456924190865,0.858007529634691,60.6705778015263,17.1920378353052,27.1956584183499,19.0178605554366,7,6
+Mauritius,MUS,2010,2030,1250400,TRUE,59.348904035617,19.5944129157317,21.4268764353271,11.3459690276002,16.5878846306501,32.0834858994033,8.65354437931213,1.98954344310161,68.2276062144305,36.4988609243643,31.525828415346,24.3849894840901,7,6
+Mauritius,MUS,2011,2030,1252404,TRUE,73.1000759243652,20.7017006358018,25.4907853267361,11.6576020092766,17.2072033037664,29.6349096758581,14.3994960783313,3.40208643928839,71.156932782781,26.4250384771437,35.1630717761643,24.6238094037705,7,6
+Mauritius,MUS,2012,2030,1255882,TRUE,73.8779464217089,26.8691384051656,26.1749849011632,11.8090979607451,16.1836713084882,25.7721220636543,22.9753897088886,4.83485707280057,65.5077494405373,28.7448699872656,36.1409184145519,26.7901837625671,7,6
+Mauritius,MUS,2013,2030,1258653,TRUE,83.4902255233816,16.0729606216314,24.9446098636013,11.9954305513624,16.0681918287873,23.0497941552074,14.3280050073265,6.95066998216115,63.7379611454736,42.3667747579977,33.9455695525692,25.9086336776588,7,6
+Mauritius,MUS,2014,2030,1260934,TRUE,93.0748839143718,20.7546141988136,25.8209365850919,12.4072628049821,15.6950460258722,21.9992741309556,5.72083439307259,9.93896830042571,65.353358469294,48.8837445319739,35.0187377852259,27.1764637830937,7,6
+Mauritius,MUS,2015,2030,1262605,TRUE,100,10.9810078728476,22.882088692411,13.6223727298812,16.4935226288976,19.7358220433854,31.4229472164852,12.3833193755966,69.1450497626332,43.9880637207121,38.2556126168062,30.2571267796926,7,6
+Mauritius,MUS,2016,2030,1263473,TRUE,100,14.1302592486308,22.2938304406171,15.0648383952043,17.9779453611518,16.0560923618932,11.4186762908184,24.6858420347353,75.0134156856252,47.2604475812587,36.282444631827,31.2622465393788,7,6
+Mauritius,MUS,2017,2030,1264613,TRUE,100,19.7417428907978,23.9961326583029,15.8869847074699,19.3417858309649,13.2073163503007,11.4083827931464,55.8849307453984,77.2970493046655,58.3775953335323,37.3625155292405,39.766114295835,7,6
+Mauritius,MUS,2018,2030,1265303,TRUE,100,15.76701451888,25.0368883765134,16.5791809877392,19.1685111518783,,22.8043230580963,,,47.9873406023391,36.0374813882458,25.7844647917637,6,4
+Mauritius,MUS,2019,2030,1265711,TRUE,100,18.424968528909,24.0932178073149,16.6794113381413,,,,,,52.175125068391,39.7993994185913,29.0931683118138,4,3
+Mauritius,MUS,2020,2030,1265740,TRUE,100,,15.8821547493463,,,,,,,35.0589075552894,57.9410773746731,35.0589075552894,2,1
+Malawi,MWI,1990,94280,9404499,FALSE,0,0.108662446639702,0.217051788602759,,,,,,,0.198395875230568,0.108571411747487,0.153529160935135,3,2
+Malawi,MWI,1991,94280,9600361,FALSE,0,0.131115355151303,0.286081692358217,,,,,,,0.258841260364292,0.139065682503173,0.194978307757797,3,2
+Malawi,MWI,1992,94280,9685974,FALSE,0,0.0321495036797937,0.257201978392928,,,,,,,0.231033670560078,0.0964504940242407,0.131591587119936,3,2
+Malawi,MWI,1993,94280,9710335,FALSE,0,0.0361339131943336,0.198030755013123,,,,,,,0.17553455223266,0.0780548894024856,0.105834232713497,3,2
+Malawi,MWI,1994,94280,9745695,FALSE,0,0.112475558068487,0.205184005865096,,,,,,,0.177180317488781,0.105886521311194,0.144827937778634,3,2
+Malawi,MWI,1995,94280,9844418,FALSE,0,0.0251410108356567,0.239573137538845,0.235473716446218,,,,,,0.207087410425075,0.12504696620518,0.155900712568983,4,3
+Malawi,MWI,1996,94280,10022783,FALSE,,0.0774438206045319,0.280441579211484,0.23368144358975,,,,,,0.243248958091847,0.197188947801922,0.18479140742871,3,3
+Malawi,MWI,1997,94280,10264906,FALSE,0.00119134941220112,0.0673754387826391,0.31473098771763,0.243520009462093,,,,,,0.272750066784777,0.156704446343641,0.194548505009836,4,3
+Malawi,MWI,1998,94280,10552345,FALSE,0.00448250196889726,0.073584626784293,0.244653025453445,0.251812820381008,,,,,,0.212396295686292,0.143633243646911,0.179264580950531,4,3
+Malawi,MWI,1999,94280,10854325,FALSE,0.0210630285036839,0.236898879903758,0.242176473468611,0.282818832676473,,,,,,0.213103539021477,0.195739303638132,0.244273750533903,4,3
+Malawi,MWI,2000,94280,11148751,FALSE,0.0297881040850437,0.104644061478569,0.193343120144844,0.246981271418129,,,,,,0.171414655247132,0.143689139281647,0.17434666271461,4,3
+Malawi,MWI,2001,94280,11432001,FALSE,0.0375830106825655,0.076331427373273,0.197908041217976,0.281205672108876,,,,,,0.169637659507763,0.148257037845673,0.175724919663304,4,3
+Malawi,MWI,2002,94280,11713663,FALSE,0.0481007815095508,0.0385496007684487,0.223594023314824,0.395746870173888,,,,,,0.191124967278433,0.176497818941678,0.208473812740257,4,3
+Malawi,MWI,2003,94280,12000183,FALSE,0.0608616245210671,0.245594282406685,0.270703662211505,0.427768095307501,0.488884874006215,,,,,0.239774727796292,0.25123191611169,0.30437903517016,5,3
+Malawi,MWI,2004,94280,12301837,FALSE,0.0739957202912593,0.39090438872625,0.282131619750573,0.420205610001399,0.482223802489628,,,,,0.251136498502032,0.29180933469237,0.354082165743227,5,3
+Malawi,MWI,2005,94280,12625950,FALSE,0.0797692163358606,0.495755448421392,0.329449554765926,0.419965028711238,0.535796094057827,,,,,0.288306827917419,0.331234812058604,0.401342435016683,5,3
+Malawi,MWI,2006,94280,12973693,FALSE,0.0858382551834095,0.140201181297523,0.354559800472658,0.59594010858647,0.48094523035612,,,0.000225518424508689,,0.310950343694779,0.294134836385015,0.26182928800082,5,4
+Malawi,MWI,2007,94280,13341808,FALSE,0.189634223667284,0.453760943928383,0.399895553027324,0.667777645233291,0.48727399326526,,,0.000290490461044188,,0.349445141138508,0.427767091464071,0.367818555190306,5,4
+Malawi,MWI,2008,94280,13727899,FALSE,0.13357004081995,0.683630007620593,0.496207381029513,0.655150198435648,0.457617711606959,0.136921956831581,,0.000423537139404099,,0.444085580459561,0.421095916947457,0.445822330913801,6,4
+Malawi,MWI,2009,94280,14128161,FALSE,0.198387011979458,0.156647733406249,0.575858112710123,0.647726023365929,0.438693100812173,0.14164849311509,0.255291350183318,0.00923899187354168,,0.508889689542111,0.329259787460028,0.31555875767423,7,5
+Malawi,MWI,2010,94280,14539609,FALSE,0.407165343732308,0.42023409833227,0.60511285698468,0.621835701510063,0.367212922136355,0.111658868023478,0.248067007668315,0.0347165246097917,,0.54435812653874,0.402345646041852,0.373842291731836,7,5
+Malawi,MWI,2011,94280,14962118,FALSE,0.582996908711258,2.38522205414305,0.687440183348607,0.621285107923956,0.363663065575052,0.881064468422484,0.723185841195203,0.0950448157473707,,0.642141848391956,0.980199093957426,0.893375933480307,7,5
+Malawi,MWI,2012,94280,15396010,FALSE,0.74021190381304,0.0382535431124082,0.580538565172936,0.606102127429994,0.336955092410348,,0.468536626995864,0.0923631228135681,,0.501111352175459,0.486728553304848,0.341273354505459,6,5
+Malawi,MWI,2013,94280,15839287,FALSE,0.83516222763065,1.26145452857262,0.626866760081366,0.608272910655295,0.348665757596341,0.0132797582618197,0.22771209949648,0.0971884430911252,,0.571341515579425,0.595458047449706,0.553193899478989,7,5
+Malawi,MWI,2014,94280,16289550,FALSE,0.937507091860076,1.62307888791227,0.653522875839503,0.609317377418203,0.629233967379236,2.10611689627747,0.664253579251231,0.113691285170684,,0.598300101212204,1.09896611809313,0.721728246192918,7,5
+Malawi,MWI,2015,94280,16745305,FALSE,1.18887343787206,0.767035292413658,0.508479916866602,0.582537739239712,0.618197390077044,1.45982368415105,0.215391555859824,0.114932734594791,,0.460133803069041,0.787023604400485,0.428006225035405,7,5
+Malawi,MWI,2016,94280,17205253,FALSE,1.2179908276034,0.305684889871356,0.466110051298526,0.597992596459798,0.489635224770159,1.27992832135391,0.628900481259525,0.343685019126297,,0.407064029060272,0.74943452797442,0.45666540315545,7,5
+Malawi,MWI,2017,94280,17670193,FALSE,2.04310754065255,0.236393278865147,0.486871888429803,0.573970115519878,0.652450024220156,1.26670534191043,0.612352784821982,0.386139031826605,,0.438124403699642,0.869900158366631,0.449395922946651,7,5
+Malawi,MWI,2018,94280,18143215,FALSE,2.00685339350195,0.258981393170528,0.514783732073856,0.581732946333838,0.5986359776425,,0.397591859799633,,,0.478573061167021,0.751988664975961,0.429219815117755,6,4
+Malawi,MWI,2019,94280,18628749,FALSE,2.17953125354283,0.246786216708001,0.553632986661561,,,,,,,0.505260044737678,0.993316818970796,0.37602313072284,3,2
+Malawi,MWI,2020,94280,19129955,FALSE,,,0.489059439488646,,,,,,,0.450036638702332,0.489059439488646,0.450036638702332,1,1
+Malaysia,MYS,1990,328550,18029824,FALSE,0,5.9876952323147,8.60868150555426,,,,,,,8.17945810472081,4.86545891262299,7.08357666851776,3,2
+Malaysia,MYS,1991,328550,18519941,FALSE,0,9.88358917832593,10.149161390057,,,,,,,9.48285400104076,6.67758352279432,9.68322158968334,3,2
+Malaysia,MYS,1992,328550,19002660,FALSE,0.000144440242427665,12.228864461048,11.2717824341766,,,,,,9.04651669327929,10.5661961733255,8.13682700718658,10.6138591092176,3,3
+Malaysia,MYS,1993,328550,19484901,FALSE,0.00343330117195503,13.6600595372912,13.04668004791,,,,,,10.1387163628611,12.196839989975,9.21222231230856,11.9985386300424,3,3
+Malaysia,MYS,1994,328550,19977508,FALSE,0.013060670075762,14.6452196429268,16.1424067144422,,,,,,11.5977009907117,14.9930640600024,10.5995970045391,13.7453282312136,3,3
+Malaysia,MYS,1995,328550,20487604,FALSE,0.0186253945921031,14.2708208317355,20.0658398638596,16.6667375516437,,,,,13.2350022827488,18.529051173022,12.8514051849159,15.6754029597875,4,4
+Malaysia,MYS,1996,328550,21017619,FALSE,0.106192498497239,18.4604810709941,21.0106168399142,17.6104597470901,,,,,14.6281501353522,19.4010516135287,14.3631800583696,17.5250356417413,4,4
+Malaysia,MYS,1997,328550,21562790,FALSE,0.280305587859197,15.8887421470758,20.7882598579235,18.2384099727276,,,,,15.174239059578,19.2061450809511,14.0739913250328,17.1268840650831,4,4
+Malaysia,MYS,1998,328550,22114647,FALSE,0.799747245898253,6.00213556642648,16.4732322319196,17.1273608118403,,,,,15.6356006335719,15.0813833318328,11.2076152979313,13.4616200859179,4,4
+Malaysia,MYS,1999,328550,22661293,FALSE,1.4224262237268,10.291834213403,18.3389227815411,18.2237349943726,,,,,17.58173195724,16.9341378496137,13.1717300340567,15.7578597536573,4,4
+Malaysia,MYS,2000,328550,23194252,FALSE,2.41511890486664,10.9933559362486,21.5101883233074,21.3434017583062,,,,,19.3247628431577,19.8805584616307,15.1173655531773,17.8855197498358,4,4
+Malaysia,MYS,2001,328550,23709115,FALSE,2.94948028135456,1.51836315985305,19.2043010450595,25.1167101251728,,,,,17.6164728081569,17.7361507355723,13.2810654839194,15.4969242071888,4,4
+Malaysia,MYS,2002,328550,24208391,FALSE,3.49917022082657,9.2164574403077,19.9428235647549,21.6555681057471,,,,,18.1118526964585,18.4018752621323,14.485174405619,16.8464383761614,4,4
+Malaysia,MYS,2003,328550,24698821,FALSE,3.70893151622348,9.47225001157048,21.0626031511547,21.03863672888,4.35278400548193,,9.34599376330664,,17.8168745495376,19.5309432898722,13.7408816201121,15.4409396686334,6,5
+Malaysia,MYS,2004,328550,25190647,FALSE,4.39365319085855,10.7759397948141,25.1655386756355,22.4053866918887,5.34394489218476,,12.0271215333601,,20.4524999910694,23.29213647648,15.8700233129377,17.7906168975225,6,5
+Malaysia,MYS,2005,328550,25690615,FALSE,4.95835311676394,11.7043845612425,27.4576506918755,7.76804250184762,5.88230480268242,,8.56400810705135,,22.4940927329232,25.4382506798696,13.8244219519507,15.1937557165869,6,5
+Malaysia,MYS,2006,328550,26201954,FALSE,5.16238909502652,25.6578454602413,30.4053658376469,8.13382731083524,5.95316221521904,,7.15799514263171,0.457215317535682,19.2784652228113,28.367067347108,15.9659813448655,14.8420693001939,6,6
+Malaysia,MYS,2007,328550,26720367,FALSE,5.46044290377447,34.2839958580273,33.7142299141475,9.53356386559619,6.23950663341445,,10.6636629087649,1.12868574864854,,31.6383481633334,18.7311790900621,17.4496513088741,6,5
+Malaysia,MYS,2008,328550,27236003,FALSE,5.36668270948776,36.9934288389755,36.2658499565482,9.83430734604904,7.14253614173555,,10.9914871016748,1.7276506677254,,34.1792664655528,19.890351190547,18.7452280839955,6,5
+Malaysia,MYS,2009,328550,27735038,FALSE,5.27956494524775,10.8409393434118,28.8523990231369,10.355505796776,8.05843128018843,,9.23318035865349,3.70435999649446,17.1968630884729,27.2841044304206,13.6264087592831,13.1024921690382,6,6
+Malaysia,MYS,2010,328550,28208028,FALSE,5.22818278530297,40.7916366826334,34.5819819416844,10.5827819586802,8.80039936825746,,13.2978781401847,4.76096696797341,19.663774775733,32.6743866072702,20.6910393807031,20.2952375220792,6,6
+Malaysia,MYS,2011,328550,28650962,FALSE,5.57706518186175,50.8653559793452,38.9441235512505,10.4772410984122,9.61831122501329,,16.2394844316694,4.80275615463057,25.7629317236538,37.147579162857,24.6443669943655,24.2158914250947,6,6
+Malaysia,MYS,2012,328550,29068189,FALSE,5.92956743199247,38.916811133211,38.6592826990546,10.4601504191533,9.92149537667371,,19.1084069180844,7.97792587414248,26.4865592110924,36.681784139748,23.2601296354314,23.2719396159053,6,6
+Malaysia,MYS,2013,328550,29468923,FALSE,5.07181801805311,36.7680733717954,37.833665537084,10.5990285237045,11.1184756747053,,17.8694146849345,8.09605934985996,32.4703288080493,36.0625009848729,23.4353881572702,23.6442342872028,6,6
+Malaysia,MYS,2014,328550,29866606,FALSE,5.58383876944926,39.1785066337532,37.8564511610215,11.158287083755,11.8442860240111,,12.4386454095796,14.1353186059794,35.6591704430886,36.2067529578947,23.6458165834412,24.7961135223418,6,6
+Malaysia,MYS,2015,328550,30270965,FALSE,6.14948705376441,29.5559324998137,31.649989608323,10.3205721263761,11.9754426907068,100,24.9024315919607,18.0178801253239,33.2017137097502,30.0352183881607,33.6828752271412,24.3389580735642,7,6
+Malaysia,MYS,2016,328550,30684652,FALSE,6.72598162266298,33.6860303746008,30.105062554667,10.5915609727656,11.9203653541975,77.9977296689916,11.8719458518554,24.9859229914496,33.0111210172315,28.5064144952618,29.1413474375393,23.7754992838608,7,6
+Malaysia,MYS,2017,328550,31104655,FALSE,6.74903436058221,21.1180757743346,33.0559263309307,10.1325686743059,13.0866677892337,57.5393529377477,10.8999423380824,33.6189773141054,37.2395507537998,31.2492077502487,25.2477787385405,24.0430537674795,7,6
+Malaysia,MYS,2018,328550,31528033,FALSE,6.74652066927903,19.5727007531576,35.8580971470619,9.95178716926467,13.7173569331272,,19.7911468956034,,,34.1475128401404,18.3840505268733,20.8657869145415,6,4
+Malaysia,MYS,2019,328550,31949789,FALSE,6.90228490069277,22.9014016629157,33.9834449207332,9.92267781473215,,,,,,32.4694414631196,18.4274523247684,21.7645069802558,4,3
+Malaysia,MYS,2020,328550,32365998,FALSE,7.24796332363863,4.93192951653158,29.3500190453156,,,,,,,27.8141001320874,13.8433039618286,16.3730148243095,3,2
+Namibia,NAM,1990,823290,1432899,FALSE,0,0.94641876983694,4.697801993151,,,,,,,4.58666588436987,1.88140692099598,2.76654232710341,3,2
+Namibia,NAM,1991,823290,1476399,FALSE,0,3.76752090036922,4.90246975567339,,,,,,,4.8382224405311,2.88999688534754,4.30287167045016,3,2
+Namibia,NAM,1992,823290,1516951,FALSE,0,3.46402462545177,5.35445458659627,,,,,,,5.21608524497354,2.93949307068268,4.34005493521265,3,2
+Namibia,NAM,1993,823290,1555098,FALSE,0,1.80298533944752,5.16129581517365,,,,,,,5.00651407714455,2.32142705154039,3.40474970829604,3,2
+Namibia,NAM,1994,823290,1591826,FALSE,0,2.86793684966679,5.21237344359716,,,,,,,5.04805694535037,2.69343676442132,3.95799689750858,3,2
+Namibia,NAM,1995,823290,1627866,FALSE,0.00993175385213031,4.21772466462429,5.65978650846066,3.14026171568889,,,,,,5.73539307092341,3.25692616065649,4.36445981707886,4,3
+Namibia,NAM,1996,823290,1663378,FALSE,0.0142237805051762,3.96491682949198,5.56663265893239,4.08833112906226,,,,,7.22331342659486,5.58467614726646,4.17148356491733,5.21530938310389,4,4
+Namibia,NAM,1997,823290,1698029,FALSE,0.0906322749070837,2.36659254019596,5.4796119925262,4.36258019189283,,,,,7.05932458309318,5.32446025076975,3.87174831652305,4.77823939148793,4,4
+Namibia,NAM,1998,823290,1731635,FALSE,0.433765226747939,2.49236365044785,4.87095293802346,4.77597413726996,,,,,0.0138909867297,4.73215439050434,2.51738938784378,3.00359579123796,4,4
+Namibia,NAM,1999,823290,1763861,FALSE,0.499311213336051,2.03716984392157,4.49691008313093,4.77822267021361,,,,,,4.10743188973385,2.95290345265054,3.64094146795634,4,3
+Namibia,NAM,2000,823290,1794583,FALSE,2.40075962972987,5.09370700124923,4.15966324288196,5.13639845320015,,,,,5.32525258682444,4.04755820891745,4.42315618277713,4.90072906254782,4,4
+Namibia,NAM,2001,823290,1823667,FALSE,3.47170257049771,9.17873602743887,4.00604291125873,4.6614439264506,,,,,4.4994699599617,3.94701880512945,5.16347907912152,5.57166717974515,4,4
+Namibia,NAM,2002,823290,1851519,FALSE,3.72608867801441,4.25068709014092,3.6888993935826,5.24084764292637,,,,,,3.48239631722322,4.22663070116607,4.32464368343017,4,3
+Namibia,NAM,2003,823290,1879113,FALSE,4.68361057989741,3.67842283464558,4.69904804133486,4.77598276868335,6.41822405017282,,,,6.53627278188581,4.36995207626147,4.8746674012894,4.84015761536905,5,4
+Namibia,NAM,2004,823290,1907737,FALSE,5.22418793636861,5.6579018145322,6.09224350862982,6.27713135307521,6.60070479636764,,,,6.30197502439171,5.79781422516629,5.91068792739951,6.00870560429135,5,4
+Namibia,NAM,2005,823290,1938316,FALSE,5.41925937450387,9.05638972243789,6.40713248240623,5.36333422733569,6.66093347380122,,,,6.88473055954271,6.22502420550463,6.62616927324528,6.88236967870523,5,4
+Namibia,NAM,2006,823290,1971318,FALSE,5.84520299093462,18.1684288372229,7.51004256053287,5.92056905357521,6.40515020139164,,,0.0170138460242004,10.7613564354289,7.18112506615085,9.6411199755389,8.40969864768041,5,5
+Namibia,NAM,2007,823290,2006516,FALSE,6.31282577693332,15.6905474283332,8.5543394456363,6.34340602337531,6.20479889286703,,,0.0203709433685172,,8.22905645636178,9.22527966856954,7.57084521285971,5,4
+Namibia,NAM,2008,823290,2043382,FALSE,6.83142898760888,16.2607658872516,9.8955818042182,6.41323005317144,6.24276030698527,,12.3557812886093,0.0386772786825397,,9.48052309702335,10.3513576041719,8.90979552094764,6,5
+Namibia,NAM,2009,823290,2081039,FALSE,8.18178817251105,18.8205884061773,10.0163662951999,6.41974094617796,6.27934433067833,11.1645206408208,13.8653712777023,0.0379753926078561,10.7235256869126,9.45809284969987,11.3131287750717,9.88754909321298,7,6
+Namibia,NAM,2010,823290,2118877,FALSE,14.3406004661262,6.05315546570416,11.9732026341722,6.38533889645323,6.49686609330431,10.1113347289388,8.51110587659713,0.148821500893442,9.4565558746594,11.3855041281793,9.54732770609301,6.99008029041445,7,6
+Namibia,NAM,2011,823290,2156698,FALSE,14.5749476796909,16.6163157759883,12.1871883609005,6.54933735844842,7.09209354037042,9.43340692962479,10.0342207317778,0.190446260303082,9.55589630964687,11.4472206110825,11.2787590208682,9.06557284120784,7,6
+Namibia,NAM,2012,823290,2194777,FALSE,15.4456416405738,21.0366027243118,13.1025178649217,6.8895473809772,7.92165373931741,9.6022785180692,8.21677395311072,0.427891640207137,9.76875287041567,12.673090079247,12.0088735646257,9.83544310804492,7,6
+Namibia,NAM,2013,823290,2233506,FALSE,16.3020706422036,15.3624938080092,12.0988445408585,7.21605249211076,6.16441774626706,6.83434135279558,4.84457704250264,0.631417794177017,8.04167096852469,11.2417567495482,10.1000072638578,7.88966147581209,7,6
+Namibia,NAM,2014,823290,2273426,FALSE,17.0989000001784,9.02501237098889,13.2331906166179,7.63435027322553,6.21355066479428,3.09861297089611,7.93251528155589,3.88393110759316,8.61397219660847,12.3371558693167,9.51950767286731,8.23782284988143,7,6
+Namibia,NAM,2015,823290,2314901,FALSE,29.0676859092898,17.8702273407218,11.5854926991548,7.80715881483059,7.59200666092539,7.94133350483979,6.23231368822649,3.81434253827274,7.95835137414862,10.7207127617252,12.637509047316,9.06718441965423,7,6
+Namibia,NAM,2016,823290,2358044,FALSE,34.4740091126969,6.81775102167362,10.2553598240593,7.98884944699622,7.44162872110165,6.49921475474113,3.0591433385444,3.74455292815943,8.81296778649763,9.68056124731349,11.1296136121727,6.6839709615308,7,6
+Namibia,NAM,2017,823290,2402623,FALSE,40.1622939047739,6.33362628946219,10.6882163835047,7.9922786508105,8.99501054766639,5.57444491185752,4.50357458989275,3.94020460789262,8.57517517811188,10.1362183734223,11.9756585583448,6.91351294826537,7,6
+Namibia,NAM,2018,823290,2448300,FALSE,42.7967167842911,5.93301403225333,11.1244483917411,8.13092667808557,8.4587235593629,,7.36592185863109,,,10.7693271042737,15.0702055490004,8.04979741831092,6,4
+Namibia,NAM,2019,823290,2494524,FALSE,42.5287316234548,3.26084806742443,10.0246718411434,8.03867035379879,,,,,,9.55050190643521,15.9632304714554,6.95000677588614,4,3
+Namibia,NAM,2020,823290,2540916,FALSE,,0.889415059241863,7.67279804946966,,,,,,,7.13093630950056,4.28110655435576,4.01017568437121,2,2
+New Caledonia,NCL,1990,18280,170899,TRUE,0,,,,,,,,,,0,,1,0
+New Caledonia,NCL,1991,18280,175362,TRUE,0,,,,,,,,,,0,,1,0
+New Caledonia,NCL,1992,18280,179799,TRUE,0,,,,,,,,,,0,,1,0
+New Caledonia,NCL,1993,18280,184496,TRUE,0,,,,,,,,,,0,,1,0
+New Caledonia,NCL,1994,18280,189482,TRUE,0,,,,,,,,,,0,,1,0
+New Caledonia,NCL,1995,18280,193816,TRUE,0.0699958785329068,,,11.3432277261909,,,,,,,5.70661180236188,11.3432277261909,2,1
+New Caledonia,NCL,1996,18280,197564,TRUE,3.35428720636727,,,12.4192703637653,,,,,,,7.8867787850663,12.4192703637653,2,1
+New Caledonia,NCL,1997,18280,201418,TRUE,12.8664926010414,,,12.1816080452653,,,,,,,12.5240503231533,12.1816080452653,2,1
+New Caledonia,NCL,1998,18280,205279,TRUE,24.7050382243534,,,11.5382177469054,,,,,,,18.1216279856294,11.5382177469054,2,1
+New Caledonia,NCL,1999,18280,209214,TRUE,71.2188877982451,,,12.7727927994847,,,,,,,41.9958402988649,12.7727927994847,2,1
+New Caledonia,NCL,2000,18280,213230,TRUE,100,8.71364931610635,,13.1019126418914,,,,,,,40.6051873193326,10.9077809789989,3,2
+New Caledonia,NCL,2001,18280,217324,TRUE,100,21.4640779291802,,12.2960891883419,,,,,,,44.5867223725074,16.8800835587611,3,2
+New Caledonia,NCL,2002,18280,221490,TRUE,100,12.4108757670817,24.957711743686,12.6132503889859,,,,,,26.1540120822789,37.4954594749384,17.0593794127822,4,3
+New Caledonia,NCL,2003,18280,225296,TRUE,100,25.3237760961033,33.6505204928697,13.1550259756007,15.9366658339326,,96.0548957095722,,,35.2685425384558,53.6368436548292,42.450560079933,6,4
+New Caledonia,NCL,2004,18280,228750,TRUE,100,7.38360789995572,37.5274379833834,14.1246986852281,16.831837554166,,,,,38.8267872978361,39.7589361421418,20.1116979610066,5,3
+New Caledonia,NCL,2005,18280,232250,TRUE,100,7.05410869167161,40.9518293242673,14.5394844058078,16.7681214874698,,,,,42.3249112197296,40.6363556054367,21.3061681057363,5,3
+New Caledonia,NCL,2006,18280,235750,TRUE,100,100,49.6433904091944,16.4362948513847,15.9057055244007,,,,,50.4522273463174,66.5199213151448,55.629507399234,5,3
+New Caledonia,NCL,2007,18280,239250,TRUE,100,77.7879850621988,66.1503377623638,16.9066786184144,16.287700219936,,,1.22686187066695,,64.9609669543788,65.2112503607443,40.2206231264148,5,4
+New Caledonia,NCL,2008,18280,242750,TRUE,100,100,61.2276838447565,18.4144031295754,15.9114663330422,,,3.02309463518272,,61.840290583219,69.910521743583,45.8194470869943,5,4
+New Caledonia,NCL,2009,18280,245950,TRUE,100,100,47.6027554903592,17.2363507887219,16.6212990443962,,14.6647582732153,3.87892182039888,,48.6793233616767,55.9007729104593,36.8918708488026,6,5
+New Caledonia,NCL,2010,18280,249750,TRUE,100,100,60.74393634808,20.1357050223694,16.8689072692322,,0,5.28913709872334,,59.9093213684249,56.1759282740899,37.0668326979035,6,5
+New Caledonia,NCL,2011,18280,254350,TRUE,100,100,67.2993208867303,22.5416445930379,16.8914456168241,,56.7217974805944,6.77175380289254,,67.3146748214151,69.3125525920725,50.669974139588,6,5
+New Caledonia,NCL,2012,18280,259000,TRUE,100,100,60.2778547765867,23.9661427401932,16.8152782311132,,41.7775748721695,8.50046633513,,64.1247081224774,65.2043144777899,47.673778413994,6,5
+New Caledonia,NCL,2013,18280,263650,TRUE,100,100,58.4100327572229,28.3353385641602,16.0166290746582,,0,,,61.8227678137292,57.3490742642766,47.5395265944724,6,4
+New Caledonia,NCL,2014,18280,268050,TRUE,100,100,59.0493571993872,29.5923450237221,16.2566263822687,,53.8227539234814,,,60.1680853031478,68.4928912293181,60.8957960625878,6,4
+New Caledonia,NCL,2015,18280,268700,TRUE,100,100,49.5349877342721,30.9674798913522,16.7281443988909,15.0319985325425,13.4231384343033,18.1271039606865,,49.7836968635454,51.492934098745,42.4602838299775,7,5
+New Caledonia,NCL,2016,18280,269350,TRUE,,100,47.1372743054873,34.2302205829519,16.9607791832766,,0,,,47.8400644995124,45.3418737221098,45.5175712706161,5,4
+New Caledonia,NCL,2017,18280,270000,TRUE,100,93.1543795304048,,34.2377958838304,16.8654722066599,,40.0755255255255,,,,66.8669252349402,55.8225669799202,5,3
+New Caledonia,NCL,2018,18280,270650,TRUE,,72.0840058322694,,32.09088417336,16.7887361669859,,26.6528527418976,,,,43.609247582509,43.609247582509,4,3
+New Caledonia,NCL,2019,18280,271300,TRUE,,80.2709112763411,,21.2227740089411,,,,,,,50.7468426426411,50.7468426426411,2,2
+New Caledonia,NCL,2020,18280,271960,TRUE,,,,,,,,,,,,,0,0
+Niger,NER,1990,1266700,8026592,FALSE,0,0.223072494855241,0.342112941313891,,,,,,,0.310787784287062,0.188395145389711,0.266930139571151,3,2
+Niger,NER,1991,1266700,8288739,FALSE,0,0.0663800536133952,0.260272449774677,,,,,,,0.227846131769604,0.108884167796024,0.1471130926915,3,2
+Niger,NER,1992,1266700,8566773,FALSE,0,0.497224904146646,0.245045774688893,,,,,,,0.219002194287615,0.247423559611846,0.35811354921713,3,2
+Niger,NER,1993,1266700,8860297,FALSE,0,0.198518263232371,0.189802319113494,,,,,,,0.164237040960987,0.129440194115288,0.181377652096679,3,2
+Niger,NER,1994,1266700,9168316,FALSE,0,0.0842148837752258,0.140717590058196,,,,,,,0.123448360750311,0.0749774912778072,0.103831622262768,3,2
+Niger,NER,1995,1266700,9490289,FALSE,0,0.020461730151683,0.160421411142172,0.0561485822150159,,,,,,0.139765412224251,0.0592579308772177,0.0721252415303167,4,3
+Niger,NER,1996,1266700,9826600,FALSE,0.000277047880818176,0.0662926044908082,0.17895398235261,0.0949728482269626,,,,,,0.155575812106437,0.0851241207377997,0.105613754941402,4,3
+Niger,NER,1997,1266700,10178196,FALSE,0.000516979870224763,0.0920857502805893,0.143394291138129,0.0916419007856339,,,,,,0.120883072709015,0.0819097305186443,0.101536907925079,4,3
+Niger,NER,1998,1266700,10545720,FALSE,0.00072319614046227,0.00974259205458849,0.174241432433556,0.057295301628743,,,,,,0.148691501239056,0.0605006305643374,0.0719097983074624,4,3
+Niger,NER,1999,1266700,10929922,FALSE,0.00674311748120773,0.0108163141895172,0.138138689645007,0.0418929197575769,,,,,,0.116242785435738,0.0493977602683273,0.0563173397942773,4,3
+Niger,NER,2000,1266700,11331561,FALSE,0.00838240520886101,0.0869086352595643,0.128021043284759,0.0521490563362034,,,,,,0.106274838676649,0.0688652850223469,0.0817775100908057,4,3
+Niger,NER,2001,1266700,11751364,FALSE,0.0234467366744913,0.0990599024829799,0.128318536853501,0.0523016772298544,,,,,,0.105677653943791,0.0757817133102067,0.0856797445522084,4,3
+Niger,NER,2002,1266700,12189988,FALSE,0.0273235178664304,0.0414195404202447,0.132073858256501,0.0374122710135543,,,,,,0.110684818468454,0.0595572968891826,0.0631722099674177,4,3
+Niger,NER,2003,1266700,12647983,FALSE,0.0322462204276139,0.0766909543772407,0.172043551453757,0.0513723729887414,0.214315940952933,,1.71100671022279,,,0.147020031047445,0.408671961894029,0.496522517159055,6,4
+Niger,NER,2004,1266700,13125914,FALSE,0.03790422713608,0.11879427708071,0.217087031259494,0.0512999139549294,0.260028903725538,,,,,0.186930372026232,0.106271362357803,0.119008187687291,5,3
+Niger,NER,2005,1266700,13624474,FALSE,0.042555716392499,0.208530839446951,0.248608579067856,0.0502611461031467,0.318800071858937,,1.32364643849638,,,0.216897803128333,0.374720543901366,0.449834056793702,6,4
+Niger,NER,2006,1266700,14143969,FALSE,0.0544554456100906,0.159910568838448,0.248732862030357,0.0500794814601834,0.190553403679824,,,0.00352101020246265,,0.216403796450561,0.12829458948477,0.107478714237914,5,4
+Niger,NER,2007,1266700,14685404,FALSE,0.0696351586853371,0.361808033628384,0.296860886072486,0.0382529666195259,0.189457185165713,,,0.00488630924527459,,0.263306787328493,0.191639261251433,0.167063524205419,5,4
+Niger,NER,2008,1266700,15250913,FALSE,0.120231230077973,0.912599140680227,0.438781690836957,0.0566941418329713,0.221407589296818,,,0.00470100527956658,,0.389526282791958,0.382076550857032,0.340880142646181,5,4
+Niger,NER,2009,1266700,15843131,FALSE,0.125657285315423,2.01759086570359,0.517841258219366,0.0491532297063424,0.239971040414702,,0.682970549943183,0.00785630331582441,,0.468751377274763,0.678642637777581,0.645264465188741,6,5
+Niger,NER,2010,1266700,16464025,FALSE,0.132055705414492,2.66667682449113,0.561692369055404,0.0531475389743961,0.281905668941483,,0,0.00835818618275673,,0.500024517118344,0.682714487587085,0.645641413353326,6,5
+Niger,NER,2011,1266700,17114770,FALSE,0.137748391495594,2.75864662816512,0.5851022769372,0.0567498354919883,0.242890742005556,100,0,0.0199997151672593,,0.52812510311403,17.256374522015,0.67270425638768,7,5
+Niger,NER,2012,1266700,17795209,FALSE,0.154561491506125,2.07871792134719,0.539813374188856,0.062716152353803,0.287102756781668,,0,0.0347371607130148,,0.510006902496406,0.567161787879194,0.537235627382082,6,5
+Niger,NER,2013,1266700,18504287,FALSE,0.162794818787704,1.94380421504503,0.580871897184623,0.0792955377905563,0.322910873067327,,0.584750544124823,0.0336000897494874,,0.535232051083799,0.670303402586547,0.635336487558739,6,5
+Niger,NER,2014,1266700,19240182,FALSE,0.170002604288434,2.07810599849718,0.586735626941239,0.0837836904882824,0.324618916872391,,0,0.0807145034302244,,0.542649456775166,0.583725584043027,0.557050729838171,6,5
+Niger,NER,2015,1266700,20001663,FALSE,0.324293475274372,1.23587905283476,0.478293458434206,0.0805386441852323,0.361687627297552,,0.540974612555561,0.123281141529439,,0.443270235968638,0.531995848656825,0.484788737414725,6,5
+Niger,NER,2016,1266700,20788789,FALSE,0.544686772686165,0.720572377737016,0.399290095781572,0.0873681593404202,0.326334223261964,4.73436422365331,0,0.184623644106717,,0.374679824850399,1.08104693819975,0.27344880120691,7,5
+Niger,NER,2017,1266700,21602388,FALSE,1.23978793828181,0.746738582211285,0.451389868986354,0.090771046692856,0.325536084083883,4.09187899805537,0.166962897680446,0.251250120962726,,0.422107287190352,1.13125488865135,0.335565986947533,7,5
+Niger,NER,2018,1266700,22442831,FALSE,,0.986234495492622,0.48138421011753,0.0835284223088191,0.31490284073741,,0.160710442336677,,,0.451452965925994,0.427964392563912,0.420481581516028,5,4
+Niger,NER,2019,1266700,23310719,FALSE,,1.4095709662466,0.458217929695447,0.0986040619536853,,,,,,0.429709888553032,0.655464319298578,0.645961638917773,3,3
+Niger,NER,2020,1266700,24206636,FALSE,,,,,,,,,,,,,0,0
+Nigeria,NGA,1990,910770,95212454,FALSE,0,0.461787813816815,0.507226665530753,,,,,,,0.50068969223393,0.323004826449189,0.481238753025372,3,2
+Nigeria,NGA,1991,910770,97667632,FALSE,0,0.504691444512085,0.541644000352035,,,,,,,0.522156897051319,0.348778481621373,0.513424170781702,3,2
+Nigeria,NGA,1992,910770,100161708,FALSE,0,0.506516662345763,0.489341575864526,,,,,,0.11231810571204,0.470757124296272,0.277044085980582,0.363197297451358,3,3
+Nigeria,NGA,1993,910770,102700751,FALSE,0,0.802041890862268,0.443926047244953,,,,,,0.0646852303166803,0.444935951677121,0.327663292105975,0.437221024285356,3,3
+Nigeria,NGA,1994,910770,105293701,FALSE,0,0.95280212911686,0.406499395323336,,,,,,,0.40322527946682,0.453100508146732,0.67801370429184,3,2
+Nigeria,NGA,1995,910770,107948339,FALSE,0,0.214360302727121,0.137522241110149,0.114570255295568,,,,,,0.125420206036469,0.11661319978321,0.151450254686386,4,3
+Nigeria,NGA,1996,910770,110668784,FALSE,0.000209072639909549,0.434537698230508,0.154478140415638,0.133562136121736,,,,,,0.140966151730813,0.180696761851948,0.236355328694352,4,3
+Nigeria,NGA,1997,910770,113457661,FALSE,0.000397972490419608,0.221329190288812,0.158376420604427,0.136881719343562,,,,,,0.145733274895436,0.129246325681805,0.167981394842603,4,3
+Nigeria,NGA,1998,910770,116319763,FALSE,0.000568203603840705,0.172830211365479,0.0995757480862664,0.140266256312835,,,,,,0.088724664840124,0.103310104842105,0.133940377506146,4,3
+Nigeria,NGA,1999,910770,119260055,FALSE,0.000901392472703815,0.433122903818042,0.48776301699304,0.143698792693437,,,,,,0.467635292111819,0.266371526494306,0.348152329541099,4,3
+Nigeria,NGA,2000,910770,122283853,FALSE,0.00137269470620989,0.469531728986205,0.614522961323461,0.146765450978074,,,,,,0.586406113535296,0.308048208998487,0.400901097833192,4,3
+Nigeria,NGA,2001,910770,125394046,FALSE,0.00187803848768948,0.449280076243357,0.644608786446594,0.168374360908552,,,,,,0.604664554559357,0.316035315521548,0.407439663903755,4,3
+Nigeria,NGA,2002,910770,128596079,FALSE,0.00652775541108051,0.697889108815768,0.600399389710764,0.191824208893643,,,,,,0.561996553993552,0.374160115707814,0.483903290567654,4,3
+Nigeria,NGA,2003,910770,131900634,FALSE,0.0110930424036756,0.722448831560821,0.866552351715422,0.206046518063337,0.128428372757435,,0.410172095605389,,,0.799738806809846,0.443262567869729,0.534601563009848,6,4
+Nigeria,NGA,2004,910770,135320420,FALSE,0.0248965520695498,0.691920712045468,1.01838630915807,0.236082955100558,0.139148300246948,,0.346498812705908,,,0.922557496183117,0.46355706821591,0.549264994008763,6,4
+Nigeria,NGA,2005,910770,138865014,FALSE,0.0669494950779334,1.57830313248916,1.52349652059517,0.241567138517815,0.185918519783882,,0.519468106962823,,,1.37068004806608,0.78595687872858,0.92750460650897,6,4
+Nigeria,NGA,2006,910770,142538305,FALSE,0.101903213699461,1.59203192185188,1.57702014072322,0.258997176786189,0.171613619760482,,0.303648675824843,0.00193296798697713,0.0466585061019376,1.49133434580136,0.646709939164588,0.615767265725531,6,6
+Nigeria,NGA,2007,910770,146339971,FALSE,0.121182748411433,2.06908483596144,1.84912999979767,0.433446099271904,0.177651708889929,2.70612881415283,,0.00336428388927028,,1.84985122254869,1.43579449951905,1.08893661041783,6,4
+Nigeria,NGA,2008,910770,150269622,FALSE,0.13945493481441,2.69842767003006,2.41280961165022,0.469041862031738,0.184791926147481,3.31896778815023,0.888080359981208,0.341753268333994,,2.37766595640639,1.65446370444298,1.35499382335668,7,5
+Nigeria,NGA,2009,910770,154324939,FALSE,0.15785630341926,2.86510889585792,1.65328499916634,0.475019299688396,0.20551468401986,3.55418400974611,0.888115026549904,0.380324244929199,0.0514003452934632,1.65744087149758,1.37785269710306,1.05290144730274,7,6
+Nigeria,NGA,2010,910770,158503203,FALSE,0.190053070975523,1.91979025541064,2.30599235506522,0.467057627207584,0.221984330183013,3.88082045611747,0.295819667851538,0.416596525775587,0.0501478597285104,2.29209905375228,1.30138304176521,0.906918498287691,7,6
+Nigeria,NGA,2011,910770,162805080,FALSE,0.222037448631996,2.60177935829249,2.83378243238056,0.279478189143302,0.216618795819588,1.00633382003163,0.2658489991072,0.54081789947203,0.0168994515442917,2.78760205723114,1.03230852844735,1.08207099246508,7,6
+Nigeria,NGA,2012,910770,167228803,FALSE,0.252191177170893,2.25552796529022,2.55765449577616,0.338006290887522,0.241128619809589,1.17681221674397,0.150976271002078,0.658163567386163,0.116100742125207,2.53000213773674,0.978181308428006,1.00812949573799,7,6
+Nigeria,NGA,2013,910770,171765819,FALSE,0.291280704766836,1.73384767644419,2.44224809588817,0.284130101483805,0.242565453498253,,0.335973461383238,0.145156660373259,0.04915131535711,2.46141821218017,0.856105225887225,0.834946237870295,6,6
+Nigeria,NGA,2014,910770,176404931,FALSE,0.311834145350871,1.56837049757742,2.30791127568022,0.329300810932425,0.280594006427416,1.18714574382023,0.122676750933815,0.195419247163773,0.0911063397021504,2.2766221346947,0.845477937713876,0.763915963500714,7,6
+Nigeria,NGA,2015,910770,181137454,FALSE,0.354301441396406,1.0894389978742,1.57817009803135,0.402076051017846,0.261393165590063,2.87528101764858,0.219031290294443,0.198413739450693,0.0636626767380886,1.53861576303405,0.940280224714416,0.585206419734886,7,6
+Nigeria,NGA,2016,910770,185960244,FALSE,0.361593700064662,0.893577070533212,1.07368538370435,0.342485879761906,0.24765121121644,2.29458300686486,0.232746347480419,0.603696104364349,0.071252375968964,1.02612453910269,0.752846252054053,0.528313719535256,7,6
+Nigeria,NGA,2017,910770,190873247,FALSE,0.384262553002443,0.625878849430473,1.25216328583137,,0.215344945206823,1.50605007121204,0.151170364793859,0.694834158737145,0.0227422556108567,1.21804848538152,0.657044563313508,0.542534822790772,6,5
+Nigeria,NGA,2018,910770,195874685,FALSE,0.426606497711158,0.30022735585786,1.66262794072931,,0.224482630984072,,0.294620801849697,,,1.61929377934958,0.671020649037007,0.738047312352378,5,3
+Nigeria,NGA,2019,910770,200963603,FALSE,0.437962537079429,0.565342680809533,2.01774897636042,,,,,,,1.90855344063576,1.00701806474979,1.23694806072265,3,2
+Nigeria,NGA,2020,910770,206139587,FALSE,,0.0718863695365431,1.27790296551941,,,,,,,1.19646054338429,0.674894667527975,0.634173456460415,2,2
+Nicaragua,NIC,1990,120340,4173435,FALSE,0,0.00704109772061841,0.584677090197367,,,,,,,0.62033926815206,0.197239395972662,0.313690182936339,3,2
+Nicaragua,NIC,1991,120340,4267570,FALSE,0,0.431646138290402,0.621004985208557,,,,,,,0.720012674747489,0.350883707832987,0.575829406518946,3,2
+Nicaragua,NIC,1992,120340,4364514,FALSE,0,0.150735168614091,0.642899576152514,,,,,,,0.796671176724755,0.264544914922202,0.473703172669423,3,2
+Nicaragua,NIC,1993,120340,4462496,FALSE,0,0.381340655452198,0.603437529770505,,,,,,,0.723489051689291,0.328259395074235,0.552414853570745,3,2
+Nicaragua,NIC,1994,120340,4559010,FALSE,0.00756494753948456,0.449268074986892,0.714524947679482,,,,,,,0.83758694329824,0.390452656735286,0.643427509142566,3,2
+Nicaragua,NIC,1995,120340,4652185,FALSE,0.0169181039598927,0.838115760009417,0.854097660383131,1.55484424472421,,,,,,0.910062323620066,0.815993942269162,1.10100744278456,4,3
+Nicaragua,NIC,1996,120340,4741571,FALSE,0.0464573234248542,1.10998781409547,0.95286834653913,1.71509446613288,,,,,,0.974916747697841,0.956101987548084,1.26666634264206,4,3
+Nicaragua,NIC,1997,120340,4827658,FALSE,0.111892938396675,1.8478796178785,1.16936829959508,1.96882971258304,,,,,,1.1392818724993,1.27449264211333,1.65199706765361,4,3
+Nicaragua,NIC,1998,120340,4910642,FALSE,0.162060591419109,1.94883780245988,1.19219169236716,2.23733821124814,,,,,,1.13253466700981,1.38510707437357,1.77290356023928,4,3
+Nicaragua,NIC,1999,120340,4991041,FALSE,0.261316911041915,2.96404250103199,1.35517407942475,2.38868865993089,,,,,,1.28252531377986,1.74230553785739,2.21175215824758,4,3
+Nicaragua,NIC,2000,120340,5069310,FALSE,0.50651025979847,2.30572541250955,1.37355556051971,2.55547714776786,,,,,,1.33822724550121,1.68531709514889,2.06647660192621,4,3
+Nicaragua,NIC,2001,120340,5145367,FALSE,0.737576384218919,1.28030310513032,1.3311032059688,2.55545672113147,,,,,,1.26919524584611,1.47610985411238,1.70165169070263,4,3
+Nicaragua,NIC,2002,120340,5219324,FALSE,0.860590360686569,1.71341352738625,1.29579974528599,2.58439561771132,,,,,,1.22821311665455,1.61354981276753,1.84200742058404,4,3
+Nicaragua,NIC,2003,120340,5292115,FALSE,0.930762672273935,1.66829836743323,1.3864094857626,2.77149010772406,2.6263471433923,,,,,1.302080355691,1.68924015829845,1.91395627694943,5,3
+Nicaragua,NIC,2004,120340,5364930,FALSE,1.13308740818323,2.04378483257179,1.61342344305662,3.25012131474626,2.611231898561,,6.72291585779739,,,1.49763850150807,2.95266657127106,3.37861512665588,6,4
+Nicaragua,NIC,2005,120340,5438692,FALSE,1.23605192027588,1.94429414546897,1.85891517931763,3.44725271963122,2.64789828726834,,,,,1.70936984932566,2.12162849117343,2.36697223814195,5,3
+Nicaragua,NIC,2006,120340,5513757,FALSE,1.33287387284443,2.44838785352704,2.55010969719661,3.66468668335928,2.7469644933925,,,0.0547263034024171,,2.33483421954682,2.49901452673184,2.12565876495889,5,4
+Nicaragua,NIC,2007,120340,5590066,FALSE,1.82752263855928,3.1148188497512,2.95434508835667,4.18617496391472,2.62305509041713,,,0.105703409836149,,2.68516191600668,3.02071538514547,2.52296478487718,5,4
+Nicaragua,NIC,2008,120340,5667436,FALSE,2.44965169887138,5.0008007624197,3.47416151250941,4.18473695102582,2.93667603492398,,,0.168227525931866,,3.1425401624993,3.77733773120658,3.12407635046917,5,4
+Nicaragua,NIC,2009,120340,5745538,FALSE,3.32818342003722,3.53434965785118,3.0043037870798,3.94811395837518,2.77172727515198,,3.13878117009869,0.38308187524921,,2.72204846682664,3.39074639868841,2.74527502568018,6,5
+Nicaragua,NIC,2010,120340,5824058,FALSE,4.49768879804167,3.80298760329222,3.61120624010343,4.12639231675067,2.53105025934625,,1.23858563815721,0.629933478349031,,3.25082476406206,3.45537211926904,2.60974476012224,6,5
+Nicaragua,NIC,2011,120340,5903035,FALSE,4.70376483474851,7.01384007267315,4.44216779478561,4.18435113259834,2.56525732844991,,1.22201453906246,0.994473162934648,,3.98829364352515,4.31322767477362,3.48059451015875,6,5
+Nicaragua,NIC,2012,120340,5982530,FALSE,5.91104107706199,6.15159958453312,4.86734091110758,4.49017263146489,2.71182843602122,,0.602888292628252,1.34927039281954,,4.41370896786631,4.40460849935917,3.40152797386242,6,5
+Nicaragua,NIC,2013,120340,6062462,FALSE,6.69726930410528,8.0679454709521,4.83004377487745,4.54116068514019,2.58224345867546,,0,2.42096203797849,,4.41885460254461,4.827283847015,3.88978455932308,6,5
+Nicaragua,NIC,2014,120340,6142734,FALSE,7.50526536706801,8.359498560326,4.96267495148566,4.64396311508982,2.59236482591068,,2.34865927601442,2.98668269714194,,4.50092217222307,5.56401225399678,4.56794516415905,6,5
+Nicaragua,NIC,2015,120340,6223234,FALSE,8.29391893946464,7.13220149687514,4.83709871445254,4.64633787541111,3.15591479655826,,1.73870882757934,3.47022514951785,,4.40453442659529,5.32965317075655,4.27840155519575,6,5
+Nicaragua,NIC,2016,120340,6303970,FALSE,10.2103005990946,7.33585067515981,4.75308914855196,4.96451134702298,3.40864544567208,,0.572146964103144,5.28994991337018,,4.38637650256049,5.56717974678649,4.50976708044332,6,5
+Nicaragua,NIC,2017,120340,6384843,FALSE,11.4312407104841,7.55548247105473,5.00858141834303,5.59226317830814,3.42226053522418,,0,5.74696198448642,,4.6440350483868,5.91751355563801,4.70774853644722,6,5
+Nicaragua,NIC,2018,120340,6465502,FALSE,,6.19134525991232,4.57081257096661,4.48157553119437,2.34152572860871,,0.557852630359916,,,4.2614512655389,3.9503964981083,3.87305617175138,5,4
+Nicaragua,NIC,2019,120340,6545503,FALSE,,3.76642897329238,4.38524268840872,4.46018931937461,,,,,,4.03773375179213,4.20395366035857,4.08811734815304,3,3
+Nicaragua,NIC,2020,120340,6624554,FALSE,,0.261516848495141,4.08104806880371,,,,,,,3.70552708229457,2.17128245864943,1.98352196539486,2,2
+Netherlands,NLD,1990,33760,14951510,FALSE,0.0585840440909658,71.5570230901385,47.7495583894935,,,,,,,49.3284025320827,39.7883885079076,60.4427128111106,3,2
+Netherlands,NLD,1991,33760,15069798,FALSE,0.0923863412105205,53.7220031240233,48.6743442678524,,,,,,,50.2216779720635,34.1629112443621,51.9718405480434,3,2
+Netherlands,NLD,1992,33760,15184166,FALSE,0.2277197631654,54.772500297505,51.8412838890224,,,,,,29.4149061280533,53.1132487249039,34.0641025194365,45.7668850501541,3,3
+Netherlands,NLD,1993,33760,15290368,FALSE,0.336993005600946,46.8538321881615,48.0789609777004,,,,,,33.970379977052,49.7598244834563,32.3100415371287,43.5280122162233,3,3
+Netherlands,NLD,1994,33760,15382838,FALSE,0.554673687345999,70.4461919224579,52.9633148595152,,,,,,37.936982548017,53.9788321108026,40.475290754334,54.1206688604258,3,3
+Netherlands,NLD,1995,33760,15459006,FALSE,1.09685624695457,91.9053623120841,69.6586771221618,14.8402845104912,,,,,40.7339268423081,69.7948475994589,43.6470214068,54.3186053160856,4,4
+Netherlands,NLD,1996,33760,15530498,FALSE,1.62747801485496,100,69.5381707897583,15.1630632322426,,,,,54.6773938442094,70.3014666687518,48.201221176213,60.0354809363009,4,4
+Netherlands,NLD,1997,33760,15610650,FALSE,2.36020450147201,99.8308981562448,67.7129998276695,16.106179418583,,,,,61.5428770226389,68.9699186009041,49.5106317853217,61.6124682995927,4,4
+Netherlands,NLD,1998,33760,15707209,FALSE,3.70958727960015,100,70.4006804978228,17.6823438174416,,,,,57.9479371570472,71.5199875801864,49.9481097503824,61.7875671386688,4,4
+Netherlands,NLD,1999,33760,15812088,FALSE,6.4900201124057,100,71.1822180834662,18.4815966973681,,,,,61.3692570978995,73.5238159228438,51.5046183982279,63.3436674295279,4,4
+Netherlands,NLD,2000,33760,15925513,FALSE,7.23468880401524,100,72.6625896465782,18.2286713742382,,,,,63.1802218872298,76.0316747891137,52.2612343424123,64.3601420126454,4,4
+Netherlands,NLD,2001,33760,16046180,FALSE,8.05997133510505,100,72.1487057725659,17.9515246028881,,,,,59.5028583406216,74.6703237786767,51.5326120102361,63.0311766805466,4,4
+Netherlands,NLD,2002,33760,16148929,FALSE,9.94170770144514,100,75.3553619792182,19.7931355535206,,,,,58.5995947597358,76.5540593457974,52.7379599987839,63.7366974147635,4,4
+Netherlands,NLD,2003,33760,16225302,FALSE,10.388930864872,100,90.7358348004255,19.1698788928798,28.4498335255876,,59.5749574137773,,58.1101209394579,94.7090834891006,56.3299538185687,66.3128081470431,6,5
+Netherlands,NLD,2004,33760,16281779,FALSE,11.0237814011113,100,100,19.97632476273,29.5454256649958,,46.076896009818,,63.6887917115035,100,56.7942989808605,65.9484024968103,6,5
+Netherlands,NLD,2005,33760,16319868,FALSE,13.001200956315,100,100,20.1343992831862,30.1380734094337,,75.3632246522079,,68.7235553284431,100,62.8703967033587,72.8442358527675,6,5
+Netherlands,NLD,2006,33760,16346101,FALSE,13.4130138779569,100,100,20.3867190696791,31.3281726554667,,86.274870272932,29.6841263681248,72.4249094662403,100,65.4165854478014,68.128437529496,6,6
+Netherlands,NLD,2007,33760,16381696,FALSE,13.7228634479448,100,100,21.1559065035193,32.518319416227,,93.1329245004154,57.3572703689082,,100,65.6023388903759,74.3292202745686,6,5
+Netherlands,NLD,2008,33760,16445593,FALSE,13.9243957528234,100,100,21.0530196884004,32.292253465849,13.8102915807227,93.8676545894844,89.2497179266454,,100,57.1092269352385,80.8340784409061,7,5
+Netherlands,NLD,2009,33730,16530388,FALSE,14.203175159346,100,100,20.7671752023528,30.0255839773223,12.7660761665342,100,96.6195796550137,74.3830392939937,100,60.3027808317467,81.96163235856,7,6
+Netherlands,NLD,2010,33730,16615394,FALSE,14.3023529542759,100,100,21.3847363623013,30.3905044869452,12.2816140516935,75.9764742295039,100,71.9640430627905,100,56.5584600943665,78.2208756090993,7,6
+Netherlands,NLD,2011,33720,16693074,FALSE,14.345641454987,100,100,21.7284015373259,32.2548691860964,12.6867141045058,69.7891548930429,100,67.0141316214111,100,55.0805776587533,76.42194800863,7,6
+Netherlands,NLD,2012,33720,16754962,FALSE,14.5177826569013,100,100,21.9729540857256,32.5081873908282,12.0551915707946,38.3175992233775,100,76.329386605737,100,51.8847020203623,72.7699899858067,7,6
+Netherlands,NLD,2013,33690,16804432,FALSE,14.6459526077493,100,100,22.3195956795479,33.3992515822922,,62.8876720205782,61.1406912002816,79.2571477919608,100,63.1850613499727,70.9341844487281,6,6
+Netherlands,NLD,2014,33690,16865008,FALSE,14.2377046104183,100,100,22.9424408467495,34.2430303012673,14.4059795895168,81.0539891635792,67.4483556834164,81.3646855718456,100,59.1435428260156,75.4682452109318,7,6
+Netherlands,NLD,2015,33670,16939923,FALSE,14.1836269698502,100,100,23.3350696887063,35.1834710610311,14.9878090021518,76.6501138775558,73.6484768599464,82.7125360298148,100,58.8384507954398,76.0576994093372,7,6
+Netherlands,NLD,2016,33670,17030314,FALSE,13.9063614721709,100,100,24.2369529003904,37.0531809076072,14.0952413090046,76.4550685515443,77.5668513906585,87.1965715982014,100,59.4128851187588,77.5759074067991,7,6
+Netherlands,NLD,2017,33670,17131296,FALSE,14.2504345337909,100,100,27.4375272687242,38.5986570486914,,49.8976235924859,81.3935000654673,96.3131085127232,100,64.6497823179541,75.8402932399001,6,6
+Netherlands,NLD,2018,33670,17231624,FALSE,13.9690244448386,100,100,27.95173018756,39.1201433589959,,61.5379261644408,,,100,60.6917361593679,72.3724140880002,6,4
+Netherlands,NLD,2019,33670,17344874,FALSE,14.08875044446,100,100,14.0964455821092,,,,,,100,57.0462990066423,71.3654818607031,4,3
+Netherlands,NLD,2020,33670,17441139,FALSE,13.7173291193734,100,100,,,,,,,100,71.2391097064578,100,3,2
+Norway,NOR,1990,365244,4241473,FALSE,0.436819187145588,25.527920729662,49.0129470200493,,,,,,,48.1462126141019,24.9925623122856,36.837066671882,3,2
+Norway,NOR,1991,365244,4261732,FALSE,0.865057570113977,21.9910877838545,48.6283575498296,,,,,,,47.4441989566921,23.8281676345994,34.7176433702733,3,2
+Norway,NOR,1992,365244,4286401,FALSE,1.35445238650514,8.06617452083386,49.3940313458985,,,,,,,47.2894928470281,19.6048860844125,27.677833683931,3,2
+Norway,NOR,1993,365244,4311991,FALSE,1.6912392581077,17.3917420903053,45.5393287625788,,,,,,,43.5735005746715,21.5407700369972,30.4826213324884,3,2
+Norway,NOR,1994,365244,4336613,FALSE,2.5082387263232,49.5783500602716,48.4206037476739,,,,,,,46.787205762594,33.5023975114229,48.1827779114328,3,2
+Norway,NOR,1995,365244,4359184,FALSE,3.85978153032059,52.8418866135504,57.0827732210361,9.66857210593337,,,,,,55.3691616085846,30.8632533677101,39.2932067760228,4,3
+Norway,NOR,1996,365244,4381336,FALSE,10.9113578216319,100,63.7183592328577,9.53095538129711,,,,,,61.6894684024651,46.0401681089467,57.0734745945874,4,3
+Norway,NOR,1997,365244,4405157,FALSE,12.1412773582717,100,64.2524186646337,9.52628898851051,,,,,,62.4443046955386,46.479996252854,57.3235312280164,4,3
+Norway,NOR,1998,365244,4431464,FALSE,13.3354946769193,100,60.0669548927901,8.92421024438966,,,,,,59.6928434083735,45.5816649535248,56.2056845509211,4,3
+Norway,NOR,1999,365244,4461913,FALSE,23.4830221259311,100,61.4303311690238,14.9564560770549,,,,,,59.6779608506606,49.9674523430025,58.2114723092385,4,3
+Norway,NOR,2000,365244,4490967,FALSE,30.3304304426806,100,68.7046172233926,14.8705068239064,,,,,,68.3592515726179,53.4763886224949,61.0765861321748,4,3
+Norway,NOR,2001,365244,4513751,FALSE,37.1413316163802,49.7561286623585,67.853636837141,14.5882059992991,,,,,,68.4060796396989,42.3348257787947,44.2501381004522,4,3
+Norway,NOR,2002,365244,4538159,FALSE,42.0441254484751,100,70.4913733713126,15.3636514420977,,,,,,71.0564122875323,56.9747875654714,62.14002124321,4,3
+Norway,NOR,2003,365244,4564855,FALSE,44.833839350066,100,80.2155816877751,15.5851534263208,30.1317219177215,,98.7653851353794,,,82.6663472905268,67.8799919199082,74.2542214630567,6,4
+Norway,NOR,2004,365244,4591910,FALSE,44.3186831857795,100,95.7429303373704,17.4271892758298,33.1516398423789,19.8428290814518,84.8305189143751,100,,99.3735643890502,60.3603584658011,80.326254515851,7,5
+Norway,NOR,2005,365244,4623291,FALSE,46.4541748920159,100,100,18.3651686362895,33.8581264598072,20.9942610780411,76.4533608494761,100,,100,60.3778275759704,78.9637058971531,7,5
+Norway,NOR,2006,365244,4660677,FALSE,46.3962805220196,100,100,19.0414868435587,38.3513860760627,25.63715988067,67.3274215022549,10.4292790601646,,100,59.7337247914172,59.3596374811956,7,5
+Norway,NOR,2007,365244,4709153,FALSE,48.3550651467474,100,100,20.0475751184354,40.0937900476698,26.1731574536392,100,19.7442739040579,,100,65.762632953137,67.9583698044987,7,5
+Norway,NOR,2008,365244,4768212,FALSE,49.7558219844193,100,100,11.0733857863076,43.4027724274408,30.4572245271661,100,49.4085936931362,,100,65.2144053829822,72.0963958958888,7,5
+Norway,NOR,2009,365244,4828726,FALSE,49.9514203788452,100,100,27.6367859673702,38.6176451170887,29.1429710542069,100,51.4156620202841,,100,67.788529566737,75.8104895975309,7,5
+Norway,NOR,2010,365244,4889252,FALSE,50.0349012847021,100,100,30.7010625827623,41.7426635826889,30.7380610819331,100,51.1047354284935,,100,68.5790041582329,76.3611596022512,7,5
+Norway,NOR,2011,365244,4953088,FALSE,49.4429220180039,100,100,32.1104808039143,43.0881478790483,31.8776499947343,100,56.7052481054384,,100,68.9051754694421,77.7631457818705,7,5
+Norway,NOR,2012,365244,5018573,FALSE,49.4032324591252,100,100,33.373784522507,43.9530407913794,30.3557766578137,100,67.7730916774994,,100,68.8554656065743,80.2293752400013,7,5
+Norway,NOR,2013,365122.96,5079623,FALSE,49.017512575018,100,100,33.618367797736,47.571778982768,31.8042820698369,100,38.1415305357614,,100,69.0733604070985,74.3519796666995,7,5
+Norway,NOR,2014,365108,5137232,FALSE,49.1034720837844,100,100,33.2106136323234,46.977210606247,30.0402474412961,100,44.7137418077342,,100,68.7257221929007,75.5848710880115,7,5
+Norway,NOR,2015,365190.7,5188607,FALSE,48.87491306628,100,100,33.0362884999704,44.6516841261824,26.4088622676115,100,53.1818077522207,,100,68.0533439723103,77.2436192504382,7,5
+Norway,NOR,2016,365145.73,5234519,FALSE,48.690376841103,100,100,32.4657046671699,43.5089216634163,0.0201989488120558,99.2218789941943,64.4922068508823,,100,63.3996932418799,79.2359581024493,7,5
+Norway,NOR,2017,365122.96,5276968,FALSE,47.8317877909626,76.4282816845467,100,33.1990273192089,42.2791428255331,20.22843361259,100,67.8674584491116,,100,62.9479217345514,75.4989534905735,7,5
+Norway,NOR,2018,365107.85,5311916,FALSE,47.5832020648913,100,100,31.5535537842407,44.1213114227926,,100,,,100,75.8273511698264,82.8883884460602,6,4
+Norway,NOR,2019,365107.85,5347896,FALSE,48.0018788083796,100,100,33.5469208274233,,,,,,100,70.3871999089507,77.8489736091411,4,3
+Norway,NOR,2020,365107.85,5379475,FALSE,47.2331532908503,49.2325363705844,100,,,,,,,100,65.4885632204782,74.6162681852922,3,2
+Nepal,NPL,1990,143000,18905480,FALSE,0,0.01378027738352,0.122647155679111,,,,,,,0.0976559587040664,0.0454758110208771,0.0557181180437932,3,2
+Nepal,NPL,1991,143000,19405506,FALSE,0,0.0050174982063785,0.143320123194748,,,,,,,0.116408186110131,0.0494458738003755,0.0607128421582548,3,2
+Nepal,NPL,1992,143000,19938322,FALSE,0,0,0.159337146137365,,,,,,,0.131049363701866,0.0531123820457884,0.0655246818509329,3,2
+Nepal,NPL,1993,143000,20489973,FALSE,0,0,0.17923384942114,,,,,,,0.148578260578802,0.0597446164737134,0.0742891302894008,3,2
+Nepal,NPL,1994,143000,21040899,FALSE,0,0,0.238267877477924,,,,,,,0.201415661927758,0.0794226258259747,0.100707830963879,3,2
+Nepal,NPL,1995,143000,21576074,FALSE,0.000112286390138271,0,0.259399156671131,0.259229252608814,,,,,,0.221036668734114,0.129685173917521,0.160088640447643,4,3
+Nepal,NPL,1996,143000,22090352,FALSE,0.000534853134348928,0.0380413542869762,0.277740990146076,0.280656466483015,,,,,,0.235644927529927,0.149243416012604,0.184780916099973,4,3
+Nepal,NPL,1997,143000,22584772,FALSE,0.00255152318962663,0.0447750713734527,0.304272999298447,0.296533786415632,,,,,0.516839802569169,0.258302367775387,0.232994636569265,0.27911275703341,4,4
+Nepal,NPL,1998,143000,23057875,FALSE,0.00731540697447639,0.0228724530208202,0.222380032707254,0.307278754871826,,,,,,0.187527477412522,0.139961661893594,0.172559561768389,4,3
+Nepal,NPL,1999,143000,23509971,FALSE,0.016341839605522,0.00811714059360567,0.267962939711308,0.317360019398498,,,,,,0.228427238903421,0.152445484827234,0.184634799631842,4,3
+Nepal,NPL,2000,143350,23941099,FALSE,0.02239166221723,0.00088818141284437,0.272367189836568,0.312633694399635,,,,,0.62113873711235,0.234194040366722,0.245883892995725,0.292213663322888,4,4
+Nepal,NPL,2001,143350,24347113,FALSE,0.0258229916672655,0.0375593277796386,0.24354787916733,0.278456937553392,,,,,0.610355466539982,0.210685547473082,0.239148520541522,0.284264319836524,4,4
+Nepal,NPL,2002,143350,24725625,FALSE,0.0331551640604736,0.0105587947883975,0.216253894768399,0.250589029965481,,,,,0.631513580879165,0.186532389353252,0.228414092892383,0.269798448746574,4,4
+Nepal,NPL,2003,143350,25080880,FALSE,0.0399812748659992,0.0258425062906109,0.252014840412943,0.287220175391448,0.421503757635279,,1.8694864320895,,0.564017784019847,0.216814320561349,0.506427168845058,0.592676243670551,6,5
+Nepal,NPL,2004,143350,25419337,FALSE,0.04635669553747,0.000720098089976201,0.297604121838675,0.319219177750556,0.447105748664138,,0.709459357121961,,,0.25854946204093,0.274671890067728,0.321987023750856,6,4
+Nepal,NPL,2005,143350,25744500,FALSE,0.084100858259111,0.00417692900091669,0.337302013687069,0.351502658765507,0.625379254753384,,,,,0.300602280063167,0.194270614928151,0.218760622609864,5,3
+Nepal,NPL,2006,143350,26066687,FALSE,0.114699890166663,0.011185704576709,0.348806119327006,0.370907814862986,0.619879661138809,,,,,0.312295431186884,0.211399882233341,0.231462983542193,5,3
+Nepal,NPL,2007,143350,26382586,FALSE,0.139996392318404,0.00954515127109028,0.428834974824725,0.457158630156668,0.60258325031779,,,,,0.386759482904813,0.258883787142722,0.284487754777524,5,3
+Nepal,NPL,2008,143350,26666581,FALSE,0.169939313692066,0.00163669990080327,0.513684334021397,0.481885230462846,0.761321101367408,,,,,0.461461253462845,0.291786394519278,0.314994394608832,5,3
+Nepal,NPL,2009,143350,26883531,FALSE,0.191953046788078,0.0624375403979361,0.559776799270301,0.49515588969328,0.807130783621379,,1.0733105847732,,,0.497065194844595,0.476526772184558,0.531992302427252,6,4
+Nepal,NPL,2010,143350,27013207,FALSE,0.76897484765936,0.142458766157792,0.629236481167722,0.613742433260287,0.988898659667554,,0.934638418943781,,,0.562746050899332,0.617810189437788,0.563396417315298,6,4
+Nepal,NPL,2011,143350,27041220,FALSE,0.871829021884754,0.152497650377414,0.705436119809335,0.676897009453218,1.15656309854525,,1.20043310455947,,,0.637471038999537,0.721418581216839,0.66682470084741,6,4
+Nepal,NPL,2012,143350,26989160,FALSE,1.08211477640193,0.149431242285371,0.748488736486016,0.747971791192432,1.11284312911526,,1.06910990851062,,,0.670645684831583,0.759423290975273,0.659289656705001,6,4
+Nepal,NPL,2013,143350,26916795,FALSE,1.29432514406863,0.120870565539988,0.834356263341112,0.802339165171565,1.06320553553447,,0.669990111619399,,,0.74975490406786,0.744376249948139,0.585738686599703,6,4
+Nepal,NPL,2014,143350,26905982,FALSE,1.50318883946887,0.0495589616001457,0.968057039013836,0.35522905503861,1.25385262218389,,0.402155620705161,,,0.869957802628007,0.655637903165324,0.419225359992981,6,4
+Nepal,NPL,2015,143350,27015033,FALSE,1.70478035297471,0.0842529457865365,0.853546871064614,0.240921053704119,1.21385020236239,,0.801064495600793,,,0.774772490253186,0.736913143826154,0.475252746336159,6,4
+Nepal,NPL,2016,143350,27263430,FALSE,1.89170342623222,0.17051780949997,1.03858782304861,0.334066278085329,1.24772446779629,,0.926060333607366,,,0.944654849424098,0.8721871340947,0.593824817654191,6,4
+Nepal,NPL,2017,143350,27632682,FALSE,2.02897671722275,0.311515213024883,1.21006419147698,0.938020858052473,1.53093473066534,,0.522106004375152,,,1.11042840365414,1.00213659683045,0.720517619776662,6,4
+Nepal,NPL,2018,143350,28095712,FALSE,,0.106560654186532,1.45317423047057,0.505725788378874,1.52686880543457,,1.41212902062316,,,1.34826105438682,0.869397423414782,0.843169129393845,5,4
+Nepal,NPL,2019,143350,28608715,FALSE,,0.284480746216729,1.36271645453469,0.506822190458713,,,,,,1.24494060000456,0.718006463736711,0.678747845559999,3,3
+Nepal,NPL,2020,143350,29136808,FALSE,,,0.997105231032735,,,,,,,0.920407483899493,0.997105231032735,0.920407483899493,1,1
+Nauru,NRU,1990,20,9506,TRUE,0,,,,,,,,,,0,,1,0
+Nauru,NRU,1991,20,9766,TRUE,0,,,,,,,,,,0,,1,0
+Nauru,NRU,1992,20,10030,TRUE,0,,,,,,,,,,0,,1,0
+Nauru,NRU,1993,20,10287,TRUE,0,,,,,,,,,,0,,1,0
+Nauru,NRU,1994,20,10496,TRUE,0,,,,,,,,,,0,,1,0
+Nauru,NRU,1995,20,10626,TRUE,0,,,,,,,,,,0,,1,0
+Nauru,NRU,1996,20,10677,TRUE,,,,,,,,,,,,,0,0
+Nauru,NRU,1997,20,10643,TRUE,,,,,,,,,,,,,0,0
+Nauru,NRU,1998,20,10567,TRUE,,,,,,,,,,,,,0,0
+Nauru,NRU,1999,20,10449,TRUE,,,,,,,,,,,,,0,0
+Nauru,NRU,2000,20,10335,TRUE,,,,,,,,,,,,,0,0
+Nauru,NRU,2001,20,10219,TRUE,100,,,,,,,,,,100,,1,0
+Nauru,NRU,2002,20,10102,TRUE,,,,,,,,,,,,,0,0
+Nauru,NRU,2003,20,9990,TRUE,,,,,50.2969733302717,,,,,,,,1,0
+Nauru,NRU,2004,20,9906,TRUE,,,,,51.9607063707347,,,,,,,,1,0
+Nauru,NRU,2005,20,9848,TRUE,,,,,51.7689436851907,,,,,,,,1,0
+Nauru,NRU,2006,20,9827,TRUE,,,,,58.3647937207766,,,,,,,,1,0
+Nauru,NRU,2007,20,9846,TRUE,,,,,44.0620073136331,,,,,,,,1,0
+Nauru,NRU,2008,20,9880,TRUE,,12.9193953073872,14.2315344006387,,33.7385412833639,,,,,15.1468440135165,13.575464854013,14.0331196604519,3,2
+Nauru,NRU,2009,20,9945,TRUE,,14.5270511270939,16.5616546822792,,26.8632740044095,,0,,,17.8127380308996,10.3629019364577,10.7799297193312,4,3
+Nauru,NRU,2010,20,10009,TRUE,,17.0406629957251,11.9667881698305,,25.7119064727349,,100,1.09972386528141,,13.6592939594903,43.0024837218519,32.9499202051242,4,4
+Nauru,NRU,2011,20,10069,TRUE,100,38.9832824726146,21.3415680856225,,25.3152428192514,,0,0.947399259263337,,21.9139471404406,40.0812126395593,15.4611572180796,5,4
+Nauru,NRU,2012,20,10136,TRUE,,35.5387135501388,29.054907373782,,12.5728675071613,,0,1.4479615203695,,31.0677764075671,21.5312069746403,17.0136128695188,4,4
+Nauru,NRU,2013,20,10208,TRUE,,23.6559657741065,36.2849710572737,,12.4841721918769,,0,,,37.452969798292,19.9803122771268,20.3696451907995,4,3
+Nauru,NRU,2014,20,10289,TRUE,,100,41.718617826558,,65.9879307095538,,0,,,43.0384564916826,47.2395392755194,47.6794854972275,4,3
+Nauru,NRU,2015,20,10374,TRUE,,18.7621820171339,32.5651991277179,,68.9914279269087,,0,,,35.0640697984109,17.1091270482839,17.9420839385149,4,3
+Nauru,NRU,2016,20,10474,TRUE,,20.6311274051656,34.8144238228639,,73.2472093031157,,0,,,38.5934797727335,18.4818504093432,19.7415357259664,4,3
+Nauru,NRU,2017,20,10577,TRUE,100,7.44710791126075,30.0346519492007,,61.410158619203,,0,,,35.8892102965079,34.3704399651154,14.4454394025896,5,3
+Nauru,NRU,2018,20,10678,TRUE,,1.03733988963842,28.4909330323774,,70.9295916974661,,100,,,33.598674731361,43.1760909740053,44.8786715403331,4,3
+Nauru,NRU,2019,20,10764,TRUE,,,,,,,,,,,,,0,0
+Nauru,NRU,2020,20,10834,TRUE,,,,,,,,,,,,,0,0
+New Zealand,NZL,1990,263310,3329800,FALSE,0,53.3169244700968,,,,,,,,,26.6584622350484,53.3169244700968,2,1
+New Zealand,NZL,1991,263310,3495100,FALSE,0,39.6547570539511,,,,,,,,,19.8273785269755,39.6547570539511,2,1
+New Zealand,NZL,1992,263310,3531700,FALSE,0.212084088158248,18.3699790156548,,,,,,,44.3343697068241,,20.9721442702124,31.3521743612394,2,2
+New Zealand,NZL,1993,263310,3572200,FALSE,0.462867716371658,44.2080983497471,,,,,,,46.0613214755104,,30.2440958472097,45.1347099126287,2,2
+New Zealand,NZL,1994,263310,3620000,FALSE,2.29292701184134,56.0414591625499,,,,,,,55.6260373468135,,37.9868078404016,55.8337482546817,2,2
+New Zealand,NZL,1995,263310,3673400,FALSE,3.48292351672524,55.3230918428703,,7.70056610432373,,,,,61.0810386172386,,31.8969050202895,41.3682321881442,3,3
+New Zealand,NZL,1996,263310,3732000,FALSE,5.64458598576325,60.608608874353,,8.53336723867552,,,,,60.1909828217221,,33.7443862301285,43.1109863115836,3,3
+New Zealand,NZL,1997,263310,3781300,FALSE,10.1151460494974,40.4009374794379,,8.44458006666431,,,,,72.0092675116662,,32.7424827768165,40.2849283525895,3,3
+New Zealand,NZL,1998,263310,3815000,FALSE,21.7222945775823,25.6051547849243,,8.44002535849354,,,,,58.4375642846445,,28.5512597514112,30.8275814760208,3,3
+New Zealand,NZL,1999,263310,3835100,FALSE,28.3418865752714,23.0466226705864,,8.84241084674378,,,,,64.2484157394842,,31.1198339580215,32.0458164189381,3,3
+New Zealand,NZL,2000,263310,3857700,FALSE,32.1719684741063,64.220730565395,22.5362544465688,9.66602632883138,,,,,71.8837933049584,23.5691409143614,40.095754623972,42.3349227783866,4,4
+New Zealand,NZL,2001,263310,3880500,FALSE,35.9396410252696,9.79470512311465,22.354760344541,10.0036695132893,,,,,66.4665630930798,22.6912437582257,28.9118678198589,27.2390453719274,4,4
+New Zealand,NZL,2002,263310,3948500,FALSE,39.1948471868375,47.266359961868,24.545468454467,10.268241354998,,,,,68.3786018196231,25.5326498680435,37.9307037555587,37.8614632511331,4,4
+New Zealand,NZL,2003,263310,4027200,FALSE,39.6528994174903,43.6642103203479,28.8713776658973,10.489856715564,13.578690298405,,40.302413184937,,67.2721502227406,30.3896017173854,38.3754845878295,38.423646432195,6,5
+New Zealand,NZL,2004,263310,4087500,FALSE,39.6351380376441,34.051800559157,35.2607272112812,12.0855808070506,16.7479030257275,,30.0014943383751,,71.8386851607136,37.2292518954645,37.1455710190369,37.0413625521522,6,5
+New Zealand,NZL,2005,263310,4133900,FALSE,39.7431830884272,27.0281639981291,38.3692608021359,12.4524166555092,17.4706546202391,,32.2822274365611,,75.0904201669302,41.0920758840734,37.4942786912821,37.5890608282406,6,5
+New Zealand,NZL,2006,263310,4184600,FALSE,43.1926881751279,34.7185454256345,37.7904618214725,12.3944238970183,16.776877842966,21.7637702277371,14.6526678903728,1.61914608120694,76.8531183164582,40.7358178243975,34.4808108219745,30.1622865725147,7,6
+New Zealand,NZL,2007,263310,4223800,FALSE,43.2631582390257,86.4567824114621,44.6184280863109,12.7481809482954,15.9810611805753,22.0989589693147,35.0108170815827,3.33813828500618,,49.0448394462039,40.6993876226653,37.3197516345101,7,5
+New Zealand,NZL,2008,263310,4259800,FALSE,44.2934286742666,35.3281230113506,49.1589828520653,12.6889125511473,14.5397881742652,,37.2550544816848,13.7823797917016,,52.5608611885927,35.7449003141029,30.3230662048954,6,5
+New Zealand,NZL,2009,263310,4302600,FALSE,48.5224188614297,21.6610743251218,38.4250733389453,12.3960948886872,16.5713610638912,,25.9867792070414,17.0566262983074,71.2163695876855,39.6963347459788,36.3679683681518,31.3355465088037,6,6
+New Zealand,NZL,2010,263310,4350700,FALSE,48.4435525836173,13.3024778123009,46.2727339993065,12.719741950304,16.7864495931541,23.3395057099,31.5025851695813,20.2416849235551,68.3470607281093,47.8830632043371,34.846808279017,32.3327689646979,7,6
+New Zealand,NZL,2011,263310,4384000,FALSE,48.5356669384868,14.9936013749889,54.8329124740706,13.0581575204575,17.3801856853094,22.5235521630762,30.440579379562,25.1099430520375,58.4939720685025,56.5343867806523,34.6969202741635,33.1051066960334,7,6
+New Zealand,NZL,2012,263310,4408100,FALSE,48.516608113037,39.1772996679283,55.288878230631,13.077700191335,16.9904416704127,21.4187903472439,27.8194932302144,31.6320670853317,66.4078019103107,57.1361972034555,38.8152245272429,39.208426548096,7,6
+New Zealand,NZL,2013,263310,4442100,FALSE,48.8148753797341,14.6492560487466,56.9162922060665,13.417883951535,16.9740510252391,18.619052671207,25.9826463865094,24.7815186258337,75.3904039169555,58.8282690468185,36.2557729372506,35.5083296627331,7,6
+New Zealand,NZL,2014,263310,4516500,FALSE,49.5882970530542,45.388042537338,59.3607358140764,13.7966277368038,17.0829854796933,17.3542449401378,43.9220306324259,32.4977603662655,77.9502299139205,61.397382946601,43.9086012325367,45.8253456888925,7,6
+New Zealand,NZL,2015,263310,4609400,FALSE,50.1362642778363,0.847772776986434,51.0925922722458,14.6017150970767,17.5304561306613,12.7524970133038,27.387058056451,41.0772223927554,80.1752061073077,52.6785502720289,33.8561579430297,36.1279207837677,7,6
+New Zealand,NZL,2016,263310,4714100,FALSE,49.1601551741948,24.5595830032354,50.1406861861909,15.730774195899,19.0982020548537,17.8685193408313,35.9600926948883,60.7144348256666,81.712665210466,51.5789271188383,39.3046394008151,45.0427461748323,7,6
+New Zealand,NZL,2017,263310,4813600,FALSE,49.4178672804637,19.8060858720712,54.9374271991962,16.5942303094749,19.5934958717492,16.5473095161077,27.7238449393385,100,82.2474472512762,56.8427989457257,38.1820303382755,50.5357345529811,7,6
+New Zealand,NZL,2018,263310,4900600,FALSE,,29.6197263884927,57.5552788318201,17.0928473374244,19.7287856658738,,28.7036474298238,,,58.9772972964229,33.2428749968903,33.598379613041,5,4
+New Zealand,NZL,2019,263310,4979300,FALSE,,39.4073436537566,56.0864744849087,17.3520777071445,,,,,,56.7072147773032,37.6152986152699,37.8222120460681,3,3
+New Zealand,NZL,2020,263310,5084300,FALSE,,6.63602625620127,46.9036385925973,,,,,,,47.3077786237563,26.7698324243993,26.9719024399788,2,2
+Oman,OMN,1990,309500,1812158,FALSE,0,3.44313574089869,11.8705188782033,,,,,,,11.5544505173422,5.10455153970067,7.49879312912046,3,2
+Oman,OMN,1991,309500,1893761,FALSE,0,3.13213919303525,11.4683607373024,,,,,,,11.0970161253587,4.86683331011255,7.114577659197,3,2
+Oman,OMN,1992,309500,1983272,FALSE,0,2.3063487075001,12.3179127648631,,,,,,,11.9125301930764,4.87475382412106,7.10943945028826,3,2
+Oman,OMN,1993,309500,2072106,FALSE,0,3.00568561784903,12.0068609392742,,,,,,,11.635170863566,5.00418218570773,7.32042824070752,3,2
+Oman,OMN,1994,309500,2148416,FALSE,0,1.56096020438424,11.3918574323377,,,,,,,10.9301099272882,4.31760587890733,6.24553506583623,3,2
+Oman,OMN,1995,309500,2204267,FALSE,0,0.921125239017014,12.1611564764718,,,,,,,11.6202591726767,4.36076057182961,6.27069220584685,3,2
+Oman,OMN,1996,309500,2236652,FALSE,0,1.18832004729393,14.2089659207964,,,,,,,13.3276640105095,5.13242865603012,7.25799202890171,3,2
+Oman,OMN,1997,309500,2249759,FALSE,0.512067503926135,1.25742744185487,15.1553611231529,,,,,,,14.3510485611864,5.64161868964462,7.80423800152061,3,2
+Oman,OMN,1998,309500,2251859,FALSE,1.00356715109204,1.98663552919208,13.9439445601056,,,,,,,13.3062215757573,5.64471574679656,7.64642855247469,3,2
+Oman,OMN,1999,309500,2254898,FALSE,2.92241016965289,0.779967831573282,14.6232512536142,,,,,,,13.7625873837225,6.10854308494678,7.27127760764789,3,2
+Oman,OMN,2000,309500,2267973,FALSE,4.06604207514081,1.58575173526028,19.2955051991377,,,,,,,18.2102451502617,8.31576633651292,9.89799844276099,3,2
+Oman,OMN,2001,309500,2294959,FALSE,6.72726625545659,0.099407223369226,19.8758932847345,5.79473559144858,,,,,,18.750901360713,8.12432558875222,8.21501472517695,4,3
+Oman,OMN,2002,309500,2334860,FALSE,7.71126480768487,2.10073121798678,19.9525383946649,5.78413177877617,,,,,,18.5507373898107,8.88716654977817,8.81186679552455,4,3
+Oman,OMN,2003,309500,2386164,FALSE,7.96520014486774,2.08424649027037,21.2409510201966,6.15865607282386,15.8717786386671,,,,,19.6298855915529,9.36226343203963,9.29092938488238,5,3
+Oman,OMN,2004,309500,2445524,FALSE,7.23962568759347,2.73797230443369,24.8383095337706,6.98771518436343,17.389850336087,,7.37428317468423,,,23.3954394546284,9.83558117696909,10.1238525295274,6,4
+Oman,OMN,2005,309500,2511254,FALSE,6.97161981329316,30.9464350219341,29.6436285316788,17.3987024935856,16.9824563838798,17.6326226260765,7.18126740126108,100,,28.0983634740723,18.2957126479716,36.7249536781706,7,5
+Oman,OMN,2006,309500,2580753,FALSE,8.42426306738626,31.7926331079961,34.347957185114,19.0577470913649,20.2320791124859,34.7306896845197,,0.179040689992307,,33.4732233830885,25.6706580272762,21.1256610681104,6,4
+Oman,OMN,2007,309500,2657162,FALSE,16.4434562552613,55.6137606134604,41.6805301081554,19.6800588745702,18.7166825281099,44.8414385773754,12.2164834796206,0.345127201369625,,40.5747156939132,31.7459546514072,25.6860291725868,7,5
+Oman,OMN,2008,309500,2750956,FALSE,19.0441435091982,56.3796443822933,58.1287149984415,20.4883446933244,17.3585168001048,65.7392781295907,6.55553432569859,0.400049751309781,,54.7051847246814,37.7226100064245,27.7057515754615,7,5
+Oman,OMN,2009,309500,2876186,FALSE,24.4080407668337,24.3230972088525,42.705268940438,17.1211626907149,19.4277593687123,48.2203707366474,8.77814615643115,0.437996015056343,19.0195485238694,40.6398378374847,26.367947860541,18.3866314054015,7,6
+Oman,OMN,2010,309500,3041435,FALSE,30.8572128187354,39.5223294169338,49.8030069035633,17.2892391845945,21.6352642829365,42.2241169363631,7.11532016425923,1.35234764641519,21.3348011835384,47.3444118943114,29.735146658284,22.3264082483421,7,6
+Oman,OMN,2011,309500,3251102,FALSE,38.6745915826621,38.475378538764,58.499157831297,17.6874537075137,22.3373280280188,42.3708637384997,7.76585326485637,2.9795733698614,33.5378011200674,54.8545350275361,33.8587285405229,25.8834325047665,7,6
+Oman,OMN,2012,309500,3498031,FALSE,44.9306488577345,28.2068982771774,61.6918875099406,19.7448835723962,22.8744560687225,40.7057058907574,2.06218715460057,9.6093096034907,35.9802189878842,57.6088809885234,33.3317757500701,25.5353964306787,7,6
+Oman,OMN,2013,309500,3764805,FALSE,46.2346519485273,29.6615663209042,65.0212707559685,20.0816322251429,23.0900964022429,41.9945794813529,6.70621216267007,9.15177901133954,39.2255798203727,60.9050753997043,35.5607846735626,27.621974156689,7,6
+Oman,OMN,2014,309500,4027255,FALSE,45.673762547835,28.7799609805424,56.8005598362595,20.9688143916214,22.1342062550269,41.525956218969,8.06037255541943,16.9441002881367,37.3348575128648,53.2265967968104,34.1634691490731,27.5524504208992,7,6
+Oman,OMN,2015,309500,4267341,FALSE,45.1359212986501,25.7707829555578,42.9745500896221,22.9374819197806,25.2082776961426,39.1730061544491,4.22604766914256,31.7077472574311,45.2053799150073,39.394300779982,32.2033100003156,28.2069567494836,7,6
+Oman,OMN,2016,309500,4479217,FALSE,44.9397666377872,25.6725444340684,33.6131626276934,24.7028118264654,26.3705045239321,36.5201115017729,1.61045883568369,32.5918004527064,53.3735680559067,31.313486060887,31.4903462741968,28.2107782776196,7,6
+Oman,OMN,2017,309500,4665926,FALSE,45.0167174738484,50.2042967222597,37.1941298015152,24.8520104469735,27.7958113250647,27.1836758597027,3.09203129007815,43.5975823671332,63.0438263647865,34.9046268323568,35.7980982798806,36.6157290039313,7,6
+Oman,OMN,2018,309500,4829476,FALSE,46.3747089001207,60.4601055949263,40.8940547884925,23.1827894579942,28.6719426457935,,5.22780961766475,,,39.1373743025427,35.2278936718397,32.002019743282,6,4
+Oman,OMN,2019,309500,4974992,FALSE,47.5456137104295,35.6832012657841,37.0004212072675,24.7560061596297,,,,,,36.0162303723415,36.2463105857777,32.1518125992518,4,3
+Oman,OMN,2020,309500,5106622,FALSE,48.8501188514377,,28.3699469361095,,,,,,,27.6707360355288,38.6100328937736,27.6707360355288,2,1
+Pakistan,PAK,1990,770880,107647918,FALSE,0,0.100721413656198,0.344896094093243,,,,,,,0.313337899125026,0.148539169249814,0.207029656390612,3,2
+Pakistan,PAK,1991,770880,110778655,FALSE,0,0.103790088580853,0.375552807428667,,,,,,,0.340577382252241,0.159780965336507,0.222183735416547,3,2
+Pakistan,PAK,1992,770880,113911126,FALSE,0,0.134012987094554,0.405244886442283,,,,,,0.890637367744394,0.370030603466792,0.357473810320308,0.46489365276858,3,3
+Pakistan,PAK,1993,770880,117086680,FALSE,0,0.13137127038114,0.38314520769815,,,,,,0.748599255212176,0.351963389517276,0.315778933322867,0.410644638370198,3,3
+Pakistan,PAK,1994,770880,120362764,FALSE,0,0.153769619477586,0.379100643281151,,,,,,0.87938075233561,0.352995538886584,0.353062753773587,0.462048636899927,3,3
+Pakistan,PAK,1995,770880,123776835,FALSE,0.00000259673338863428,0.256202511723224,0.438841983634983,0.0356451844763887,,,,,0.668852043756085,0.410053542799736,0.279908864064814,0.342688320688858,4,4
+Pakistan,PAK,1996,770880,127349293,FALSE,0.0000615376563399641,0.319865159023347,0.458657886844988,0.0337459647343297,,,,,0.912530295210677,0.427313844613275,0.344972168693936,0.423363815895407,4,4
+Pakistan,PAK,1997,770880,131057432,FALSE,0.000550634008524865,0.247834792136878,0.39361332029411,0.0333061889791913,,,,,0.911488071588808,0.371496920865884,0.317358601401502,0.39103149339269,4,4
+Pakistan,PAK,1998,770880,134843233,FALSE,0.000853733407869062,0.180844313762961,0.341415445882207,0.0371951304544529,,,,,0.876988452134895,0.322022494558119,0.287459415128477,0.354262597727607,4,4
+Pakistan,PAK,1999,770880,138624625,FALSE,0.00104604200121765,0.174962094842257,0.319873530419694,0.0364037785798186,,,,,0.815768387150115,0.298056109612618,0.26961076659862,0.331297592546202,4,4
+Pakistan,PAK,2000,770880,142343583,FALSE,,0.0982906059690007,0.33623963914089,0.0460825162229901,,,,,0.940972355475308,0.317155232140782,0.355396279202047,0.35062517745202,3,4
+Pakistan,PAK,2001,770880,145978408,FALSE,0.0236604679968256,0.121381350452075,0.333548234077223,0.0401554893538097,,,,,0.895604095317435,0.311682424097438,0.282869927439474,0.342205839805189,4,4
+Pakistan,PAK,2002,770880,149549695,FALSE,0.0451456480654769,0.25133589247295,0.361902468132867,0.0389994005703663,,,,,0.803471242816585,0.339114823714775,0.300170930411649,0.358230339893669,4,4
+Pakistan,PAK,2003,770880,153093371,FALSE,0.08625594312976,0.15842655124971,0.435795102146379,0.0383010864451214,0.243514041723987,,0.353391914398824,,0.870704328831812,0.403570319177985,0.323812487700268,0.36487884002069,6,5
+Pakistan,PAK,2004,770880,156664698,FALSE,0.10306926833147,0.328667055485957,0.54930933383765,0.0487933945026635,0.283505918075291,,0.230223997067757,,0.994276963279411,0.505149893480147,0.375723335417485,0.421422260763187,6,5
+Pakistan,PAK,2005,770880,160304007,FALSE,0.103474704130289,0.614503833677066,0.692143159939451,0.0590197815480565,0.304069908987419,,0.314996256844423,,1.03774834335081,0.642929054907876,0.470314346581683,0.533839454065647,6,5
+Pakistan,PAK,2006,770880,164022626,FALSE,0.10380653384207,1.17173077196919,0.782655754179347,0.0650550448766514,0.346367966940045,,0.219896326821234,0.0113207304517446,1.06910925099748,0.734439543366089,0.56870894711433,0.545258611413733,6,6
+Pakistan,PAK,2007,770880,167808106,FALSE,0.106147817969572,1.48664020918207,0.820289548104048,0.0593559904034621,0.333378766865149,2.47009542702424,0.150455074447244,0.0308085123314673,,0.786117156483659,0.848830677855105,0.50267538856958,7,5
+Pakistan,PAK,2008,770880,171648984,FALSE,0.10682475288069,1.40201592283583,0.996596955157732,0.0567921753611318,0.320315742254979,3.67895883891376,0.210126341167117,0.0383683371700007,,0.944744855493217,1.07521916438604,0.530409526405459,7,5
+Pakistan,PAK,2009,770880,175525610,FALSE,0.111927258474183,0.60194322666416,0.754044160038108,0.0577204667764866,0.308529455096792,6.46148129520651,0.123291317909585,0.0814196229108018,0.851128932129754,0.704780149615532,1.28021952245697,0.403380619334387,7,6
+Pakistan,PAK,2010,770880,179424643,FALSE,0.116794660924007,0.505752016246365,0.879882263052389,0.0599552409867799,0.334086824241192,6.77255843747554,0.140714121867201,0.245301114043315,0.930904191703926,0.81041530956041,1.34379441889374,0.448840332401333,7,6
+Pakistan,PAK,2011,770880,183340168,FALSE,0.114300322559953,0.332040503765468,0.999012834091619,0.0754735817384837,0.374407549435536,6.87315719741581,0.0590181192148351,0.268079890950815,1.10197319995263,0.916306773300363,1.36499653696269,0.458815344820432,7,6
+Pakistan,PAK,2012,770880,187280125,FALSE,0.11329439439905,0.219201429043334,0.999054692918292,0.0612065013608346,0.382361469945746,12.3601367774304,0,0.32121733372236,1.08043873814203,0.912679784451561,2.11904750475628,0.432457297786688,7,6
+Pakistan,PAK,2013,770880,191260799,FALSE,0.123262688990285,0.354292322244151,0.96398165211426,,0.379856540907615,9.82443239537544,0.0942900300572648,0.420789872776997,1.0346004840219,0.885345446657209,2.06580992880055,0.557863631151504,6,5
+Pakistan,PAK,2014,770880,195305012,FALSE,0.134122520244104,0.451154996199995,0.974513881600026,,0.401765948982851,4.9176455481767,0.073870040719637,0.545599191623924,0.800411271620807,0.897248491298663,1.22528637642688,0.553656798292605,6,5
+Pakistan,PAK,2015,770880,199426953,FALSE,0.144485386929215,0.373433310791291,0.898874658479459,,0.454995347716414,9.88842274855712,0.0904290328624059,1.48384379672513,1.09563011582648,0.84040144585417,2.08187920890766,0.776747540411895,6,5
+Pakistan,PAK,2016,770880,203631356,FALSE,0.159324336111522,0.566030626686688,0.897938403106976,,0.513542874773263,14.2716148641996,0.0885619329003854,1.77821844515178,1.33023031644548,0.838612859933624,2.88561674657511,0.920330836223591,6,5
+Pakistan,PAK,2017,770880,207906210,FALSE,0.173618839892645,0.537515738610987,1.05576074552132,,0.519209188258522,10.1397127142031,0,2.37356478129777,1.38226170959472,0.977731584132128,2.21481162463713,1.05421476272712,6,5
+Pakistan,PAK,2018,770880,212228288,FALSE,0.189337737357108,0.363307884454326,1.09286501745362,,0.509376817954435,,0.033989788366924,,,1.0113549980265,0.419875106907994,0.469550890282583,5,3
+Pakistan,PAK,2019,770880,216565317,FALSE,0.206482218832526,0.469646474016629,0.952321968109884,,,,,,,0.889558180105985,0.542816886986347,0.679602327061307,3,2
+Pakistan,PAK,2020,770880,220892331,FALSE,,0.00675083513155589,0.820363203937408,,,,,,,0.762751691516104,0.413557019534482,0.38475126332383,2,2
+Panama,PAN,1990,74340,2470946,FALSE,0,2.40511177035058,8.41427052774698,,,,,,,9.52723214388357,3.60646076603252,5.96617195711707,3,2
+Panama,PAN,1991,74340,2523115,FALSE,0,2.44925030362697,10.3647764554505,,,,,,,11.2377349843701,4.27134225302582,6.84349264399856,3,2
+Panama,PAN,1992,74340,2575949,FALSE,0,2.66462626538517,11.9163417234412,,,,,,,12.6248756619273,4.86032266294211,7.64475096365622,3,2
+Panama,PAN,1993,74340,2629584,FALSE,0,3.07562293716062,12.3308093759862,,,,,,,12.714192399521,5.1354774377156,7.89490766834083,3,2
+Panama,PAN,1994,74340,2684117,FALSE,0.00745299274124679,6.56059652923693,13.310854991257,,,,,,,13.7172272019921,6.62630150441171,10.1389118656145,3,2
+Panama,PAN,1995,74340,2739667,FALSE,0.0536609708650906,5.43662184636375,13.5437951958445,2.66787541223528,,,,,,14.7500266327688,5.42548835632715,7.61817463045595,4,3
+Panama,PAN,1996,74340,2796291,FALSE,0.206087902958886,6.91853139178163,12.8689849673552,2.73980739710644,,,,,4.16940379204184,13.5996422658101,5.38056309024879,6.856846211685,4,4
+Panama,PAN,1997,74340,2853907,FALSE,0.494785368370141,20.3642331311477,14.3912824174963,2.96965820168948,,,,,5.2030742421652,15.0177047202206,8.68460667217377,10.8886675738057,4,4
+Panama,PAN,1998,74340,2912318,FALSE,2.47406626822021,21.4949131303251,14.1131780178995,3.08525983313811,,,,,6.40489138076602,15.1651248909295,9.51446172606977,11.5375473087897,4,4
+Panama,PAN,1999,74340,2971197,FALSE,3.38267371951032,19.6533381997801,12.0600719418602,3.17128037157973,,,,,7.76483215360103,13.1802554567508,9.20643927726627,10.9424265454279,4,4
+Panama,PAN,2000,74340,3030333,FALSE,5.66609628533865,14.9321484272768,12.6631167952502,3.26971694881597,,,,,11.6952680862873,13.6700351708276,9.64526930859377,10.8917921583019,4,4
+Panama,PAN,2001,74340,3089641,FALSE,6.16234326961349,10.5969531766191,12.2922771440496,3.68267643209178,,,,,13.2361428110965,13.0535936008263,9.1940785666941,10.1423415051584,4,4
+Panama,PAN,2002,74340,3149195,FALSE,7.08528206017381,5.50954776627269,11.6462607661325,3.85602765232545,,,,,12.8554185939485,11.6507637951006,8.19050736777058,8.46793945191181,4,4
+Panama,PAN,2003,74340,3209056,FALSE,8.15250903892905,17.5446806794206,11.3815533535833,4.25347610058393,14.3043160362123,,24.7267547031091,,14.3025423713489,11.5504818683126,13.3935860411625,14.475587144555,6,5
+Panama,PAN,2004,74340,3269356,FALSE,8.9263044711545,20.6151310884865,13.1817502287159,4.680333948874,14.4655492594286,,7.72249369021944,,17.0796548029581,13.2159942340524,12.0342780384014,12.6627215529181,6,5
+Panama,PAN,2005,74340,3330222,FALSE,9.03307140415873,17.0051142774365,15.4141683188675,4.94130589105809,14.6464266591257,,11.9135511897616,,21.2969109053152,15.5165848723188,13.2673536644329,14.134693427178,6,5
+Panama,PAN,2006,74340,3391673,FALSE,13.3995353707862,43.207657280373,17.3187638664187,5.36751699462095,16.0208273168574,,8.5074175424277,0.713503356227827,24.417360734371,17.6647248120236,18.7030419648329,16.6463634533407,6,6
+Panama,PAN,2007,74340,3453671,FALSE,16.9061297816108,32.3754818279758,21.2083825877907,6.12586623208913,18.7445637478687,,7.31036079611552,,,21.626843588685,16.7852442451164,16.8596381112164,6,4
+Panama,PAN,2008,74340,3516204,FALSE,25.1950157157746,32.8462276409589,27.3288722431511,6.71477636727054,22.2159653680376,14.6158173580504,13.3349387193874,3.13060824326103,,27.0867469650643,20.0059413407655,16.6226595871884,7,5
+Panama,PAN,2009,74340,3579215,FALSE,28.6010424251718,15.4312333783654,24.4384785674103,6.44041383585244,25.0360012905751,15.4661917809752,6.04623745256538,4.1006941847786,32.0386700208507,23.9714721912101,18.3517524944559,14.6714535106038,7,6
+Panama,PAN,2010,74340,3642691,FALSE,28.8361405640054,32.4088443270343,27.8976295274458,7.06183551563025,25.2725957091127,15.9566217924259,10.8916101503724,5.03657186242712,37.9352881812906,27.4302242907959,22.9982814368864,20.1273957212584,7,6
+Panama,PAN,2011,74340,3706479,FALSE,30.1773726002308,68.7998744758807,37.2702930714907,7.92352522735852,28.2381195048004,20.1921668003931,9.73106092681841,13.3213351050454,51.0855355495645,35.7680877164823,32.1685469502481,31.1049031668583,7,6
+Panama,PAN,2012,74340,3770635,FALSE,27.9979393939531,40.5354546930684,40.5600888434458,8.15918326268512,33.798036819243,20.6943601767984,12.4351375470882,16.4540098430489,60.61940219863,38.9722600851474,30.143080873667,29.5292412716113,7,6
+Panama,PAN,2013,74340,3835447,FALSE,30.0709946649126,49.8768512414265,39.1011637077094,8.93346203533148,37.0211014658297,21.265369190735,20.6884726970652,21.1868371433038,74.6089959063166,37.9862875054318,34.9350442062138,35.5468177548126,7,6
+Panama,PAN,2014,74120,3901311,FALSE,30.1608980961647,65.6450527024554,36.5566363139334,9.83197362037318,40.0992082632046,20.2021378162906,17.5656718084379,21.4446501229188,86.0960735413701,36.4527389664955,38.0083491284322,39.5060267936752,7,6
+Panama,PAN,2015,74120,3968490,FALSE,33.7991500124355,69.2562507085348,32.5456002888734,10.7675097255931,41.5210170761829,20.4523209285716,19.0860360598725,23.6706169082976,86.968486906829,32.2366398662837,38.9821935186728,40.3309233625685,7,6
+Panama,PAN,2016,74120,4037073,FALSE,35.0382374306887,64.5269542584028,30.3393755679316,10.3197624999838,41.461630745171,20.9494047323135,19.6552156823869,32.9031472779853,95.9339032565843,30.7086543858276,39.5375504897559,42.3412728935284,7,6
+Panama,PAN,2017,74120,4106764,FALSE,38.2392270854376,46.0774610532776,31.8405486668258,10.0144598161253,41.0074856038148,,5.26954648082621,36.2762091373531,97.8393321560718,32.0972960870528,38.2134292097607,37.9290507884511,6,6
+Panama,PAN,2018,74177,4176868,FALSE,38.7607067816012,63.6035253760121,33.244544122254,10.198269202312,41.1683458821258,,9.49868903452785,,,33.6999142859416,31.0611469033414,29.2500994746984,6,4
+Panama,PAN,2019,74177,4246440,FALSE,39.2501395594115,83.6254725958633,31.8475883475368,10.6147518726937,,,,,,32.2429984156146,41.3344880938763,42.1610742947239,4,3
+Panama,PAN,2020,74177,4314768,FALSE,,30.6546369307479,21.045745227345,,,,,,,20.6332210100508,25.8501910790464,25.6439289703994,2,2
+Peru,PER,1990,1280000,22071433,FALSE,0,0.180233692004703,0.855468486509212,,,,,,,0.939129815232306,0.345234059504638,0.559681753618504,3,2
+Peru,PER,1991,1280000,22522383,FALSE,0,0.0331050162055692,0.929541358890582,,,,,,,0.970373108504139,0.320882125032051,0.501739062354854,3,2
+Peru,PER,1992,1280000,22966822,FALSE,0,0.150883024217901,0.986566907444868,,,,,,0.472778800160296,1.01729376733665,0.402557182955766,0.546985197238283,3,3
+Peru,PER,1993,1280000,23408135,FALSE,0,1.4494481099659,0.933833066982619,,,,,,0.458140675712732,0.99230133109389,0.710355463165313,0.966630038924175,3,3
+Peru,PER,1994,1280000,23851405,FALSE,0.000934015096448956,6.04832479919708,1.19469364423817,,,,,,0.697912473567713,1.26508054152375,1.98546623302485,2.67043927142952,3,3
+Peru,PER,1995,1280000,24299168,FALSE,0.00360188736190112,4.62969153889279,1.51738758926376,0.252512774973987,,,,,0.977593459258185,1.63150505951057,1.47615744995012,1.87282570815888,4,4
+Peru,PER,1996,1280000,24753825,FALSE,0.0260566328291336,6.18035155582434,1.61351643952184,0.248829646452282,,,,,1.03080148895687,1.66602177283309,1.81991115271689,2.28150111601665,4,4
+Peru,PER,1997,1280000,25210957,FALSE,0.0419173318312072,3.86950527514367,1.76105527936544,0.276575557340872,,,,,0.847177428658163,1.80249113610281,1.35924617446787,1.69893734931138,4,4
+Peru,PER,1998,1280000,25658070,FALSE,0.121528151012568,2.9161638280086,1.61617069337545,0.253265903642222,,,,,0.785721630773823,1.63070497801171,1.13857004136253,1.39646408510909,4,4
+Peru,PER,1999,1280000,26078295,FALSE,0.196122043919299,3.47802269553777,1.45789235106645,0.237515703969003,,,,,0.209870246972867,1.45960532558014,1.11588460829308,1.34625349301494,4,4
+Peru,PER,2000,1280000,26459944,FALSE,0.304560303977959,1.34212418905011,1.56654374064071,0.333695233643452,,,,,0.325037064315812,1.58888485822031,0.774392106325608,0.897435336307422,4,4
+Peru,PER,2001,1280000,26799289,FALSE,0.740781530184042,1.99442866466713,1.53784854472141,0.479038481627184,,,,,0.340956809917146,1.52594341596251,1.01861080622338,1.08509184304349,4,4
+Peru,PER,2002,1280000,27100964,FALSE,0.866712504898163,3.48891482909018,1.61191055376804,0.550788575339118,,,,,0.931266092495518,1.56954873792786,1.4899185111182,1.63512955871317,4,4
+Peru,PER,2003,1280000,27372217,FALSE,1.11010257203003,2.23524770798514,1.84051092474664,0.634521019350173,1.11523880592322,,3.16244515872189,,0.644727250037637,1.81371940599052,1.60459243881192,1.69813210841707,6,5
+Peru,PER,2004,1280000,27624226,FALSE,1.33703903958433,2.53879710689007,2.31857458201268,1.44315000940833,1.2605041561227,,3.39472786422069,,0.973875390732383,2.35015440713441,2.00102733214141,2.14014095567718,6,5
+Peru,PER,2005,1280000,27866140,FALSE,1.60743858776364,4.05869568615832,2.94119747836732,1.64596325499243,1.27848213969495,,3.49469022358414,,1.42285645204661,3.04281842574761,2.52847361381874,2.73300480850582,6,5
+Peru,PER,2006,1280000,28102055,FALSE,1.92951144965349,5.41023636883465,3.75061372865022,1.7639787316347,1.23327792888312,,2.95196695892303,0.40002189239545,1.65823303027295,3.99909502800698,2.91075671132817,2.69725533501129,6,6
+Peru,PER,2007,1280000,28333050,FALSE,2.32981966547468,8.60142101126725,4.61940031418442,1.87049457262114,1.52478813210108,13.4999060046485,2.80060002507815,0.647439403715898,,4.89383692056898,5.62027359887903,3.76275838665028,7,5
+Peru,PER,2008,1280000,28562321,FALSE,2.80360636313493,11.7615176487521,5.7310437152771,1.90990857817272,1.71669240074983,14.5613987688742,8.33435845853079,1.02765301378561,,5.92834662013454,7.51697225545696,5.79235686387514,7,5
+Peru,PER,2009,1280000,28792663,FALSE,2.85668864102078,10.4212595215445,4.67026318489685,1.92752674501229,1.82587144427578,14.2969608663213,2.88116239327491,1.14687361785684,2.90210767277527,4.89907758746055,5.70799557497799,4.02966792298739,7,6
+Peru,PER,2010,1280000,29027680,FALSE,3.13767139090397,13.433603584738,6.09017357679885,2.09353627039131,1.91071301452669,,3.35485050913566,2.13977309907309,2.82013900902179,6.30590754212353,5.15499572349826,5.02463500241389,6,6
+Peru,PER,2011,1280000,29264314,FALSE,3.22329361054244,12.027020475383,7.64345686222271,2.25301846718479,2.21118596761108,,2.83472689084179,2.71287528736296,3.41236358595737,7.81870530868508,5.23231331535534,5.17645166923582,6,6
+Peru,PER,2012,1280000,29506790,FALSE,3.39122410897104,22.8585615695923,8.11703944378675,2.44322418726293,2.34975275357467,,2.5669597825871,3.8251519873537,4.77042040069476,8.19660873267859,7.35790491548248,7.44348777669489,6,6
+Peru,PER,2013,1280000,29773986,FALSE,3.44876959601312,15.1995597791663,7.90251621082766,2.59917584107748,2.47699718458345,,2.78620194950847,4.86877504095759,5.48234374801502,7.92885904998626,6.23642785410134,6.47748590145186,6,6
+Peru,PER,2014,1280000,30090372,FALSE,3.49956117895434,7.3414159391097,7.5152644933176,2.62431451699577,2.59902437988418,,3.95556129418443,7.02152032070448,5.71635121805763,7.42727286535805,5.10874477343658,5.68107269240168,6,6
+Peru,PER,2015,1280000,30470739,FALSE,3.51197825464639,12.239136490452,6.76898983454341,2.77971217657271,2.69928497760406,2.56863874276897,3.19596866446288,9.60695029360046,6.57530486141292,6.60491291441311,5.37710414640847,6.83366423348568,7,6
+Peru,PER,2016,1280000,30926036,FALSE,3.85067528338103,11.1966438059196,6.72867747275464,2.93242129875128,2.7849807884901,,3.14891721095542,11.3391848464261,6.81199663185031,6.64781190802796,5.77822195060205,7.01282928365512,6,6
+Peru,PER,2017,1280000,31444299,FALSE,4.20279198608203,10.2666391001572,7.62576372220005,3.03782575681094,2.92690893737376,,2.63819962524329,12.6030294358501,7.4080878603937,7.65859892369504,5.86321800848121,7.26873011702505,6,6
+Peru,PER,2018,1280000,31989265,FALSE,4.50819141355407,8.92154895421965,8.12178335631547,3.21200081965769,3.13753306614969,,1.57850335611531,,,8.12511209748335,5.26840557997244,5.459291306869,6,4
+Peru,PER,2019,1280000,32510462,FALSE,4.83041862244256,13.2051702970834,7.96490233036703,3.19336613577107,,,,,,7.91714147816718,7.29846434641602,8.10522597034056,4,3
+Peru,PER,2020,1280000,32971846,FALSE,5.1839919630976,,6.44636397630659,,,,,,,6.30185656263787,5.8151779697021,6.30185656263787,2,1
+Philippines,PHL,1990,298170,61895169,FALSE,0,0.391148390538768,0.954729350196899,,,,,,,0.961502117596492,0.448625913578556,0.67632525406763,3,2
+Philippines,PHL,1991,298170,63454785,FALSE,0,0.394667127012921,0.966628814749009,,,,,,,0.980854943297095,0.453765313920643,0.687761035155008,3,2
+Philippines,PHL,1992,298170,65020124,FALSE,0,0.221925561559082,1.13015040748687,,,,,,2.29778479575305,1.14091646741136,0.91246519119975,1.2202089415745,3,3
+Philippines,PHL,1993,298170,66593904,FALSE,0,1.06167058472119,1.29664368861066,,,,,,2.27872331396567,1.27196378927758,1.15925939682438,1.53745256265481,3,3
+Philippines,PHL,1994,298170,68180846,FALSE,0.000224533794978961,1.21772003412836,1.60283276271164,,,,,,2.31231422468477,1.56736277225432,1.28327288882994,1.69913234368915,3,3
+Philippines,PHL,1995,298170,69784087,FALSE,0.0010730193531368,1.17968781785545,2.04620177922981,0.586064110877864,,,,,2.31548239381735,2.03528621578408,1.22570182422672,1.52913013458369,4,4
+Philippines,PHL,1996,298170,71401743,FALSE,0.00205246399134534,1.04362335202456,2.49687069542666,0.708011090354498,,,,,2.39979489912294,2.43491164521564,1.330070500184,1.64658524667941,4,4
+Philippines,PHL,1997,298170,73030879,FALSE,0.00491081004445038,0.815553517242323,2.97170186137426,0.689356936725022,,,,,2.66973243931123,2.89939023849395,1.43025111293946,1.76850828294313,4,4
+Philippines,PHL,1998,298170,74672009,FALSE,0.0387072749059165,1.43726005758048,2.44417811115603,0.6437524613426,,,,,1.88788774449397,2.38508832389551,1.2903571298958,1.58849714682814,4,4
+Philippines,PHL,1999,298170,76325927,FALSE,0.0491323307246889,1.46185481414424,1.69772628943481,0.623405040599199,,,,,1.47651013181863,1.65355350245405,1.06172572134432,1.30383087225403,4,4
+Philippines,PHL,2000,298170,77991757,FALSE,0.0665771984884442,1.18938070946276,1.90909915168133,0.568938142876102,,,,,1.55723061358886,1.84006471355418,1.0582451632195,1.28890354487048,4,4
+Philippines,PHL,2001,298170,79672869,FALSE,0.0829841141244087,0.652329647410794,1.70498353707651,0.545009888305166,,,,,1.9403557984944,1.66973889764561,0.985132597082257,1.20185855796399,4,4
+Philippines,PHL,2002,298170,81365260,FALSE,0.139473650739597,1.11095942616734,1.79437323343319,0.581121391364732,,,,,1.98630152395008,1.74090399785426,1.12244584513099,1.3548215848341,4,4
+Philippines,PHL,2003,298170,83051970,FALSE,0.15321220624597,0.420360937817622,1.89146821762136,0.541206110046281,0.719037102651332,,1.823984265352,,1.90471450949437,1.81978194774061,1.12249104109627,1.30200955409018,6,5
+Philippines,PHL,2004,298170,84710544,FALSE,0.162147230227795,0.556583357743285,2.03521457021686,0.602427379478547,0.7762721575248,,1.1921812746749,,2.04275131809092,1.95662353780906,1.09855085507205,1.27011337355934,6,5
+Philippines,PHL,2005,298170,86326251,FALSE,0.16378564430987,1.24887492254333,2.13539127825523,0.669366129812208,0.806877978663444,,1.33699207571882,,2.19000969716772,2.08020180806008,1.29073662463453,1.50508892666043,6,5
+Philippines,PHL,2006,298170,87888675,FALSE,0.17109543762053,1.88419991035563,2.45566203882256,0.770919265349045,0.80716533661209,,1.02595621600203,,2.07147557025179,2.4126625074279,1.39655140640027,1.63304269387728,6,5
+Philippines,PHL,2007,298170,89405482,FALSE,0.174914283826239,4.06745221778604,2.68499794806521,0.835264278571722,0.891393030379061,,2.25915284085878,0.0819737525262291,,2.64910363894588,2.0043563138216,1.97858934573773,6,5
+Philippines,PHL,2008,298170,90901967,FALSE,0.179238870208533,1.59706308414335,2.94696189871099,0.866392088798268,0.98748162475309,,1.54743730236987,0.403556326987195,,2.86774949699333,1.4274186488462,1.4564396598584,6,5
+Philippines,PHL,2009,298170,92414161,FALSE,0.255105063207472,1.88021633306528,2.46017655478282,0.814201917771573,1.02019758243226,,1.56114485410836,1.78666830857749,2.01926473849333,2.41499362708408,1.49835157690481,1.74608162985002,6,6
+Philippines,PHL,2010,298170,93966784,FALSE,0.696916487685291,1.76550899923924,3.05714677932671,0.453609853922223,1.06966640195663,,1.57373364176419,1.9523958575601,2.90604950776071,2.94965622555066,1.74216087828306,1.93349234763285,6,6
+Philippines,PHL,2011,298170,95570049,FALSE,0.794861172820581,1.99942089946227,3.20709591953157,0.496438681984718,1.19203051188729,,1.47185332712966,3.07149218878708,2.99744923592677,3.1124045478822,1.8278532061426,2.19150981352878,6,6
+Philippines,PHL,2012,298170,97212639,FALSE,0.976386633127932,3.33350208849626,3.60574785216986,0.532512605358894,1.27719841039155,,0.890451447729293,4.06138913271714,3.11403902153181,3.49939153096149,2.07543994140234,2.57188097113248,6,6
+Philippines,PHL,2013,298170,98871558,FALSE,1.27432433462134,3.27565696263781,3.54333435276361,0.573682801099038,1.390944903539,,1.67806272129014,4.11942720118713,3.54889119023372,3.42682169043905,2.31565872710761,2.77042376114782,6,6
+Philippines,PHL,2014,298170,100513137,FALSE,,5.45155501320212,3.89542019809222,1.00421798303542,1.43347541260427,,1.22005055028885,5.25687232376711,4.3197818985477,3.75221033066143,3.17820512863326,3.5007813499171,5,6
+Philippines,PHL,2015,298170,102113206,FALSE,,4.80139141266351,3.80964093533167,1.24483044202148,1.44417771607773,,1.73075623115356,6.28847598309461,5.04125170948274,3.67812703912021,3.32557414613059,3.79747213625602,5,6
+Philippines,PHL,2016,298170,103663812,FALSE,,4.51702111693487,4.07894226229274,1.36610872176269,1.53984776155901,,0.904623589664344,7.29172649370066,5.62913459019963,3.8960512089678,3.29916605617086,3.93411095353833,5,6
+Philippines,PHL,2017,298170,105172921,FALSE,,5.65525994482581,4.67399345906836,0.763302908073404,1.69193430657749,,1.16599507688969,8.30355663340733,6.29604016128256,4.44065313738958,3.71091831002797,4.43746797697806,5,6
+Philippines,PHL,2018,298170,106651394,FALSE,,5.78376604835786,4.95576434311384,0.815006522537332,1.78731743812996,,1.99529544396335,,,4.7298503364281,3.3874580894931,3.33097958782166,5,4
+Philippines,PHL,2019,298170,108116622,FALSE,1.13582187571392,4.87701856705248,5.01435711586334,0.926750858403716,,,,,,4.79915849714125,2.98848710425836,3.53430930753248,4,3
+Philippines,PHL,2020,298170,109581085,FALSE,,1.41093162950111,3.9410176962127,,,,,,,3.80344475328815,2.6759746628569,2.60718819139463,2,2
+Palau,PLW,1990,,15063,TRUE,0,5.82341502320088,,,,,,,,,2.91170751160044,5.82341502320088,2,1
+Palau,PLW,1991,460,15442,TRUE,0,5.6804883107418,,,,,,,,,2.8402441553709,5.6804883107418,2,1
+Palau,PLW,1992,460,15859,TRUE,0,2.76556215696056,,,,,,,,,1.38278107848028,2.76556215696056,2,1
+Palau,PLW,1993,460,16285,TRUE,0,,,,,,,,,,0,,1,0
+Palau,PLW,1994,460,16735,TRUE,0,,,,,,,,,,0,,1,0
+Palau,PLW,1995,460,17158,TRUE,0,0.536799192908256,,37.5228420967402,,,,,,,12.6865470965495,19.0298206448242,3,2
+Palau,PLW,1996,460,17599,TRUE,,,,47.6267763916059,,,,,,,47.6267763916059,47.6267763916059,1,1
+Palau,PLW,1997,460,18016,TRUE,,0.0243444994711576,,49.8958053841601,,,,,,,24.9600749418156,24.9600749418156,2,2
+Palau,PLW,1998,460,18409,TRUE,,0.0905341903088176,,48.1706936307381,,,,,,,24.1306139105234,24.1306139105234,2,2
+Palau,PLW,1999,460,18773,TRUE,,,,35.5889041128569,,,,,,,35.5889041128569,35.5889041128569,1,1
+Palau,PLW,2000,460,19104,TRUE,,7.29525699736629,,36.8799149255598,,,,,,,22.087585961463,22.087585961463,2,2
+Palau,PLW,2001,460,19390,TRUE,,3.23877650988569,,33.8298937919748,,,,,,,18.5343351509302,18.5343351509302,2,2
+Palau,PLW,2002,460,19642,TRUE,100,4.24481688732053,,36.4881922665907,,,,,,,46.9110030513038,20.3665045769556,3,2
+Palau,PLW,2003,460,19812,TRUE,100,10.1693699591478,,38.6277338947484,96.8714670223912,,,,,,49.5990346179654,24.3985519269481,4,2
+Palau,PLW,2004,460,19861,TRUE,100,15.115896500151,,54.4353024931636,100,,,,,,56.5170663311048,34.7755994966573,4,2
+Palau,PLW,2005,460,19784,TRUE,,8.80549414942004,27.0783232655261,49.7349361991055,100,,,,,25.5620539687274,28.5395845380172,28.0341614390843,4,3
+Palau,PLW,2006,460,19545,TRUE,,74.6877452782067,28.279861545775,50.9646602564835,100,43.4185071340531,,0.375372792878558,,26.4640355203483,49.3376935536296,38.1229534619792,5,4
+Palau,PLW,2007,460,19159,TRUE,,10.0341722280713,29.2810986042313,55.7958454715696,100,73.4564777518086,,0.478699935154588,,27.8454498206664,42.1418985139202,23.5385418638655,5,4
+Palau,PLW,2008,460,18708,TRUE,,11.116343797236,33.603028522688,52.5955495764865,100,65.5971660039295,,0.627541868634765,,31.7994073772652,40.728021975085,24.0347106549056,5,4
+Palau,PLW,2009,460,18290,TRUE,,6.69245225133627,29.4628880587188,47.1557437259758,100,56.5867031491943,0,0.922760085796099,,27.1476134751051,27.979557437045,16.3837139076427,6,5
+Palau,PLW,2010,460,17954,TRUE,,6.55966673702712,32.4930902827865,57.5108875858706,100,55.8780330980043,0,1.30791288382647,,30.4598375066612,30.4883355407377,19.1676609426771,6,5
+Palau,PLW,2011,460,17748,TRUE,,20.5756154919834,37.9745031069259,75.9746295466204,100,49.8823981991605,100,1.40579542237896,,36.6919082940396,56.881429268938,46.9295897510045,6,5
+Palau,PLW,2012,460,17635,TRUE,,53.8174952442424,43.2777989913236,82.6611582640708,100,50.3606143423486,0,2.49679798250562,,41.6357066095774,46.0234133683971,36.1222316200793,6,5
+Palau,PLW,2013,460,17603,TRUE,,44.9506301685459,45.147407044323,74.5301401499052,100,46.0402878932548,100,2.50133704341635,,43.9682619942258,62.1336930512058,53.1900738712187,6,5
+Palau,PLW,2014,460,17625,TRUE,,99.1901732500084,52.1458753413404,96.4929777536013,100,45.5301638550482,100,,,50.4189440007963,78.6718380399997,86.5255237511015,6,4
+Palau,PLW,2015,460,17665,TRUE,,85.8638251279675,53.1800663947119,100,100,47.2435067279493,100,,,52.2851051460872,77.2574796501258,84.5372325685137,6,4
+Palau,PLW,2016,460,17718,TRUE,,87.2449703581699,52.9515622983026,94.6152318836636,100,,100,,,54.0583099986516,83.702941135034,83.9796280601213,5,4
+Palau,PLW,2017,460,17809,TRUE,,67.6876796914857,47.4364457953445,83.8998906158023,100,,0,,,47.1370197666033,49.7560040256581,49.6811475184728,5,4
+Palau,PLW,2018,460,17911,TRUE,,55.5859773665507,,71.8920043668251,100,,100,,,,75.8259939111253,75.8259939111253,4,3
+Palau,PLW,2019,460,18001,TRUE,,53.6025279395158,,63.4343672011383,,,,,,,58.5184475703271,58.5184475703271,2,2
+Palau,PLW,2020,460,18092,TRUE,,,,,,,,,,,,,0,0
+Papua New Guinea,PNG,1990,452860,4615843,FALSE,0,1.47697047348338,1.47672194117924,,,,,,,1.42462305811021,0.984564138220873,1.4507967657968,3,2
+Papua New Guinea,PNG,1991,452860,4725543,FALSE,0,1.15529834861618,1.85442320235856,,,,,,,1.80178675318931,1.00324051699158,1.47854255090274,3,2
+Papua New Guinea,PNG,1992,452860,4836216,FALSE,0,0.982936837887742,2.10610652463157,,,,,,,2.04298757430012,1.02968112083977,1.51296220609393,3,2
+Papua New Guinea,PNG,1993,452860,4949053,FALSE,0,0.550819003760327,2.33329224950896,,,,,,,2.21419170826931,0.96137041775643,1.38250535601482,3,2
+Papua New Guinea,PNG,1994,452860,5065664,FALSE,0,0.540928364331129,2.26393012543873,,,,,,,2.15520292109556,0.934952829923287,1.34806564271335,3,2
+Papua New Guinea,PNG,1995,452860,5187063,FALSE,0,4.12552091904241,2.24593842720045,0.117987338937406,,,,,,2.17076691011925,1.62236167129507,2.13809172269969,4,3
+Papua New Guinea,PNG,1996,452860,5314258,FALSE,0.00101886763797363,0.918519519383475,2.35402925440974,,,,,,,2.24429258562952,1.0911892138104,1.5814060525065,3,2
+Papua New Guinea,PNG,1997,452860,5446633,FALSE,0.0483765106581584,0.230102531494163,2.16708440792321,0.141289859472104,,,,,,2.03170878412843,0.646713327386909,0.801033725031565,4,3
+Papua New Guinea,PNG,1998,452860,5581767,FALSE,0.110264224859512,0.861392655265541,1.68002596014592,0.140010427735418,,,,,,1.57152629647079,0.697923317001598,0.857643126490583,4,3
+Papua New Guinea,PNG,1999,452860,5716166,FALSE,0.305710158658481,2.29843013011237,1.64418345271188,0.121807965410368,,,,,,1.54080669670917,1.09253292672327,1.3203482640773,4,3
+Papua New Guinea,PNG,2000,452860,5847590,FALSE,0.374157366908979,0.72798242844816,1.6616773890175,0.106573100834873,,,,,1.4976527895756,1.54064686817856,0.873608614957022,0.968213796759298,4,4
+Papua New Guinea,PNG,2001,452860,5974627,FALSE,0.396389798484215,0.468540141367305,1.45729543872448,0.0758105477605997,,,,,1.40819303740966,1.35816023521967,0.761245792749254,0.827675990439311,4,4
+Papua New Guinea,PNG,2002,452860,6098621,FALSE,0.56767816271296,0.152194733372838,1.41092893487041,0.181803291066115,,,,,1.45061284223222,1.31198339555862,0.75264359285091,0.77414856555745,4,4
+Papua New Guinea,PNG,2003,452860,6223378,FALSE,0.57850022901505,1.53690996640142,1.70969574006009,,0.535466718159792,,,,,1.6560504661425,1.27503531182552,1.59648021627196,4,2
+Papua New Guinea,PNG,2004,452860,6354247,FALSE,0.621623209201214,0.24061286474871,1.97307433312978,,0.509349753958822,,2.83809969717678,,,1.87237501507278,1.41835252606412,1.65036252566609,5,3
+Papua New Guinea,PNG,2005,452860,6494902,FALSE,0.692162360746694,0.325462826470475,2.31423322915991,,0.480157348902918,,2.77663719737211,,,2.20540831808498,1.5271239034373,1.76916944730919,5,3
+Papua New Guinea,PNG,2006,452860,6646891,FALSE,0.691427671243697,1.62484587995515,2.87106798603947,,0.583446822466828,,,0.000772224576852057,,2.80196074547262,1.72911384574611,1.47585961666821,4,3
+Papua New Guinea,PNG,2007,452860,6808503,FALSE,0.688893654182783,1.08572490391725,3.36122401502324,,0.604467908453256,,,0.00118241520005447,,3.21975297353299,1.71194752437442,1.43555343088343,4,3
+Papua New Guinea,PNG,2008,452860,6976200,FALSE,0.431811308299743,0.791478615478205,3.79907803714306,0.20750793880904,0.742024766893732,,,0.0101983611973545,,3.56042283277575,1.30746897493251,1.14240193706509,5,4
+Papua New Guinea,PNG,2009,452860,7144774,FALSE,0.590272396096075,2.61832937216416,3.11424344348655,0.212779250629563,0.868556204164241,,1.5144484474795,0.019199567776828,,2.92769475914179,1.61001458197117,1.45849027943837,6,5
+Papua New Guinea,PNG,2010,452860,7310512,FALSE,0.458645639935391,0.255894145767129,4.04913782190571,0.241156568608083,0.895757097060573,,2.96022820067648,0.0277966376218586,0.989484287559796,3.72943599793249,1.49242444407543,1.36733263969431,6,6
+Papua New Guinea,PNG,2011,452860,7472196,FALSE,0.701127230221074,2.05812696705285,4.68012266248342,0.266796300800766,1.0252571000134,,0.482695756012998,0.101836316240582,1.45855346498299,4.26297826929245,1.60790373025902,1.43849784573044,6,6
+Papua New Guinea,PNG,2012,452860,7631003,FALSE,1.20143841497779,0.698935552592664,4.81598204872353,0.27713303992923,0.939312402369051,,0.945300977419953,0.260993918318681,1.3150626574918,4.43117824017909,1.54230878185583,1.3214340643219,6,6
+Papua New Guinea,PNG,2013,452860,7788388,FALSE,1.7152905347204,0.201751857787993,4.84304025047145,0.282421735309723,1.01344467592429,,0.926198668401548,0.400357375446696,1.41231464080786,4.42011986623285,1.56350294791649,1.27386069066444,6,6
+Papua New Guinea,PNG,2014,452860,7946733,FALSE,2.14259372709945,0.48938380553194,4.5504189694428,0.290523360160149,0.981486932632052,,2.72323026126382,0.590930868514684,0.982029372474646,4.08673276300237,1.86302991599547,1.52713840515793,6,6
+Papua New Guinea,PNG,2015,452860,8107772,FALSE,2.55235252500175,1.16054204848714,3.696513562299,0.296710516522752,1.01364665817907,,1.77942709651791,0.733068635581323,1.00743978470251,3.33265932147655,1.74883092225518,1.3849745672147,6,6
+Papua New Guinea,PNG,2016,452860,8271766,FALSE,3.04058871820364,0.483321008993049,3.31446255474638,0.289330589321254,1.04892106657097,,0.872074306090694,3.45115385658874,0.975418479043504,2.95054456941575,1.49586594273309,1.50364046824217,6,6
+Papua New Guinea,PNG,2017,452860,8438038,FALSE,3.47975047763462,2.60983142862185,4.23931664078186,0.260566015490388,1.05057721325269,,0.427445017111478,3.45272505426098,1.69118264294678,3.82269897676274,2.11801537043116,2.0440748558657,6,6
+Papua New Guinea,PNG,2018,452860,8606324,FALSE,,10.1511924213341,4.30313942499268,0.273792254510826,0.926606461936664,,0.838173719069209,,,3.92170576555767,3.89157445497672,3.79621604011796,5,4
+Papua New Guinea,PNG,2019,452860,8776119,FALSE,,9.08765234912092,,0.290614273539946,,,,,,,4.68913331133043,4.68913331133043,2,2
+Papua New Guinea,PNG,2020,452860,8947027,FALSE,,,,,,,,,,,,,0,0
+Poland,POL,1990,306290,38110782,FALSE,0,0.108588913346847,2.12895502159908,,,,,,,2.1058204423963,0.745847978315309,1.10720467787157,3,2
+Poland,POL,1991,306290,38246193,FALSE,0.000358166028688972,0.341733279797986,2.25072571380193,,,,,,,2.18107984667287,0.864272386542867,1.26140656323543,3,2
+Poland,POL,1992,306290,38363667,FALSE,0.00355925595707961,0.789981930581377,2.28338975010694,,,,,,0.965744848187976,2.29632129842718,1.01066894620834,1.35068269239884,3,3
+Poland,POL,1993,306290,38461408,FALSE,0.00885126436159004,1.97620778933685,2.38406389580006,,,,,,1.13061294870273,2.33675366663064,1.37493397455031,1.81452480155674,3,3
+Poland,POL,1994,306290,38542652,FALSE,0.026444335558715,2.16662910665151,2.81841732338884,,,,,,1.25239004095404,2.65520977399983,1.56597020163827,2.02474297386846,3,3
+Poland,POL,1995,306290,38594998,FALSE,0.0439635806905488,4.20578710653193,4.32172440463709,37.3382195491628,,,,,1.49309351400439,3.99982432287919,9.48055763100535,11.7592311231446,4,4
+Poland,POL,1996,306290,38624370,FALSE,0.087839651989402,5.172329642559,4.87910010129973,41.5623873774995,,,,,1.32137331250898,4.48533085894105,10.6046060171713,13.1353552978771,4,4
+Poland,POL,1997,306290,38649660,FALSE,0.140529086882272,5.62512870942606,5.34236034934179,42.8788641031163,,,,,1.42530519917888,4.88724182865878,11.0824374895891,13.704134960095,4,4
+Poland,POL,1998,306290,38663481,FALSE,0.277932026825291,7.61962536458355,5.92196458843187,43.3326322168924,,,,,1.57365983886684,5.48060119666074,11.74516280712,14.5016296542509,4,4
+Poland,POL,1999,306290,38660271,FALSE,0.369708879023785,8.59363623247296,5.62847948647344,45.3142662364371,,,,,1.57202857049375,5.17177207201802,12.2956238809802,15.1629257778555,4,4
+Poland,POL,2000,306290,38258629,FALSE,0.498816491887498,10.7106584101573,6.50820463136398,44.8301248492182,,,,,1.72783967475724,6.05577888794697,12.8551288114769,15.8311004555199,4,4
+Poland,POL,2001,306290,38248076,FALSE,0.678063040494073,6.65544399239758,6.90237039597339,36.3816897264444,,,,,1.6644899405545,6.44143901211949,10.4564114191728,12.785765667879,4,4
+Poland,POL,2002,306290,38230364,FALSE,1.44916231769205,4.9112949619947,7.55901978048854,30.4326612624398,,,,,1.73020630355896,6.97215137700182,9.21646892523481,11.0115784762488,4,4
+Poland,POL,2003,306240,38204570,FALSE,1.70520093954277,7.41381846456221,9.4523050555677,28.889425784119,2.70303791684205,,10.6680455923099,,1.83564087010916,8.76434957676146,9.99407278436845,11.5142560575723,6,5
+Poland,POL,2004,306330,38182222,FALSE,2.23171102470014,18.3868769425606,11.5580246523268,31.5419521575705,3.42092507786441,,9.91858766669515,,1.98283593491132,11.1912145442974,12.6033313964607,14.604293449207,6,5
+Poland,POL,2005,306330,38165445,FALSE,2.66371898591294,17.43883996379,13.6286426188031,33.5620463342206,4.25266192198821,2.11201826802114,11.1515031746933,100,2.11452123715811,13.199863629901,11.8101843689427,29.5777957232938,7,6
+Poland,POL,2006,306320,38141267,FALSE,3.06168172908286,37.1145170866987,17.0444444624556,34.9732525763288,5.103469123046,,8.60533956709026,1.38921796180941,2.23639249157677,16.6242252486554,17.1726046522055,16.8238241553599,6,6
+Poland,POL,2007,306320,38120560,FALSE,3.33958184426253,37.5270101466018,22.1109685188374,36.253555001251,5.7075143628541,,9.84001596301101,2.01624764367644,,21.5997587766281,21.8142262947928,21.4473175062337,6,5
+Poland,POL,2008,306300,38125759,FALSE,3.65036600745399,22.1332807238499,27.6967957330094,35.1044155760873,6.21406004919943,2.67649323525744,10.0278794059815,7.2463141453132,,26.3885383370971,16.8815384469399,20.1800856376658,7,5
+Poland,POL,2009,306280,38151603,FALSE,4.04886625892542,22.9414005679885,21.0973897685152,29.6459646989908,5.44716168221157,3.36191505585889,11.4391647704285,9.33066282872317,2.45529296722536,20.3538797932207,13.569999155419,16.0277276044295,7,6
+Poland,POL,2010,306280,38042794,FALSE,4.29111479701629,32.1782346336246,24.9953711275411,32.282156542844,5.73877315316127,3.63167644665672,7.01586218930187,12.1587302447453,2.64667595471601,24.1767436600624,15.2915845273858,18.4097338708824,7,6
+Poland,POL,2011,306230,38063255,FALSE,4.2633449488076,26.9768858282962,29.2604048864115,33.195130153488,5.65654308910385,4.41695000746627,10.8024101431129,17.7931061393181,2.23314475438083,28.1661999393094,15.8783243888519,19.8611461596509,7,6
+Poland,POL,2012,306220,38063164,FALSE,4.28812997000555,10.0074668358431,28.2758279024109,36.918125169068,5.95465141731577,4.37760214628673,5.96976724608942,19.5948305852078,2.40264692973134,27.2932109579331,13.1770808856336,17.0310079539788,7,6
+Poland,POL,2013,306210,38040196,FALSE,4.32784902295911,4.84937473350244,29.9979656298629,39.8815872125342,6.24105814937528,4.42271097876945,11.472666254742,9.2601968321677,2.33634506402554,28.8544068812202,13.8983569851994,16.109096163032,7,6
+Poland,POL,2014,306190,38011735,FALSE,4.58956611255607,30.6630113126995,32.2355184864224,34.8811900142991,6.27720107879605,6.17036418976514,9.014209513016,10.232468071345,2.45186225449353,30.9971726269462,17.1436745547503,19.7066522987999,7,6
+Poland,POL,2015,306190,37986412,FALSE,4.68895958957151,23.0665666933563,28.9834688687619,39.0275931162424,6.80993063177735,6.73548279971695,11.2990107720197,11.5916630987075,2.57200623851496,27.6935724287803,16.6247268683119,19.2084020579368,7,6
+Poland,POL,2016,306190,37970087,FALSE,5.05686835788942,37.2448768993319,30.0857981862693,39.9827427514233,7.61999177697319,5.17626879826045,7.69422996268302,12.756322705513,2.94276302286951,28.8172552044754,18.3119354255324,21.573031757716,7,6
+Poland,POL,2017,306190,37974826,FALSE,5.2414236113615,18.1188659107658,35.1613678714875,41.7461329423626,8.47144875805574,4.9401868161112,4.93888923834594,12.7547307893423,4.14851139987946,33.5009475422455,16.327911112902,19.2013463038236,7,6
+Poland,POL,2018,306170,37974750,FALSE,5.3487916600936,23.0563261136835,40.1622759454181,43.0392349535175,9.75801983707551,,7.59830634260354,,,38.1487014999557,23.8409870030632,27.96064222744,6,4
+Poland,POL,2019,306170,37965475,FALSE,5.54978579147379,22.1470125762891,40.3349380863889,44.511710403494,,,,,,38.2849497624842,28.1358617144114,34.9812242474224,4,3
+Poland,POL,2020,306170,37950802,FALSE,5.99374944539931,5.38432139331019,40.2711677255943,,,,,,,37.924734646271,17.2164128547679,21.6545280197906,3,2
+Puerto Rico,PRI,1990,8870,3537000,FALSE,0,,,,,,,,,,0,,1,0
+Puerto Rico,PRI,1991,8870,3562110,FALSE,0,,,,,,,,,,0,,1,0
+Puerto Rico,PRI,1992,8870,3585176,FALSE,0,,,,,,,,,,0,,1,0
+Puerto Rico,PRI,1993,8870,3615497,FALSE,0,,,,,,,,,,0,,1,0
+Puerto Rico,PRI,1994,8870,3649237,FALSE,0.0195638275004099,,,,,,,,,,0.0195638275004099,,1,0
+Puerto Rico,PRI,1995,8870,3683103,FALSE,0.0960871970631212,,,17.5586684615231,,,,,,,8.82737782929313,17.5586684615231,2,1
+Puerto Rico,PRI,1996,8870,3724655,FALSE,0.188592202325916,,,17.2649239491891,,,,,,,8.72675807575749,17.2649239491891,2,1
+Puerto Rico,PRI,1997,8870,3759430,FALSE,0.92798152000675,,,18.0972270737335,,,,,,,9.5126042968701,18.0972270737335,2,1
+Puerto Rico,PRI,1998,8870,3781101,FALSE,1.83424289259376,,,19.0215955517426,,,,,,,10.4279192221682,19.0215955517426,2,1
+Puerto Rico,PRI,1999,8870,3800081,FALSE,3.62975173814065,,,17.1172144053605,,,,,,,10.3734830717506,17.1172144053605,2,1
+Puerto Rico,PRI,2000,8870,3810605,FALSE,7.20046605173815,,,18.5682659214691,,,,,,,12.8843659866036,18.5682659214691,2,1
+Puerto Rico,PRI,2001,8870,3818774,FALSE,10.7213870367197,,,19.8455238179525,,,,,,,15.2834554273361,19.8455238179525,2,1
+Puerto Rico,PRI,2002,8870,3823701,FALSE,12.0212622806401,,,17.7612437214043,,,,,,,14.8912530010222,17.7612437214043,2,1
+Puerto Rico,PRI,2003,8870,3826095,FALSE,13.4921271988473,,,18.0136568872619,53.6056011762302,,9.42683675469976,,,,13.6442069469363,13.7202468209808,4,2
+Puerto Rico,PRI,2004,8870,3826878,FALSE,15.1483865231464,,,19.8384129702924,54.1774989494388,,11.3098895673098,,,,15.4322296869162,15.5741512688011,4,2
+Puerto Rico,PRI,2005,8870,3821362,FALSE,16.0403450782761,,,20.6077489540264,51.8965005207743,,10.3823637410615,,,,15.676819257788,15.4950563475439,4,2
+Puerto Rico,PRI,2006,8870,3805214,FALSE,17.5143649571165,,,20.7175543722705,50.9289112766239,,17.0614192398513,,,,18.4311128564127,18.8894868060609,4,2
+Puerto Rico,PRI,2007,8870,3782995,FALSE,19.2912530907721,,,20.8809907780173,47.9066969727706,,15.2547800768324,1.35785591780766,,,18.4756746485406,12.4978755908858,4,3
+Puerto Rico,PRI,2008,8870,3760866,FALSE,26.467372572655,,,21.4819176996121,44.9676212185123,,11.5084045981876,8.85187749113274,,,19.8192316234849,13.9473999296442,4,3
+Puerto Rico,PRI,2009,8870,3740410,FALSE,29.063236855543,,,17.9619156310567,41.6001272068261,,15.4284575104753,10.7848271503547,,,20.817869999025,14.7250667639622,4,3
+Puerto Rico,PRI,2010,8870,3721525,FALSE,31.8854356557123,,,17.491621643264,40.5400551939924,,7.7533748606763,17.3591711135365,,,19.0434773865509,14.2013892058256,4,3
+Puerto Rico,PRI,2011,8870,3678732,FALSE,34.1789078529167,,,16.9653212981157,38.5603230557273,,8.82401209864586,21.4215027008103,,,19.9894137498927,15.7369453658573,4,3
+Puerto Rico,PRI,2012,8870,3634488,FALSE,49.730272148013,,,16.9546074365038,42.176591051016,,8.9314301424783,25.5783616211678,,,25.205436575665,17.1547997333833,4,3
+Puerto Rico,PRI,2013,8870,3593077,FALSE,50.3034298298756,,,17.0688873138542,42.0125829527748,,14.0534595173335,33.4459032755239,,,27.1419255536878,21.5227500355705,4,3
+Puerto Rico,PRI,2014,8870,3534874,FALSE,,,,18.0372774054455,43.9386638210387,,9.18312100393838,47.2119550215232,,,13.6101992046919,24.810784476969,3,3
+Puerto Rico,PRI,2015,8870,3473232,FALSE,47.8657339628478,,,20.2741061883912,42.0776738232126,,17.6537455758942,60.2818402313597,,,28.5978619090444,32.7365639985484,4,3
+Puerto Rico,PRI,2016,8870,3406672,FALSE,52.782035666108,,,20.6524230440092,42.7775169329294,,9.52870592639258,70.5118060041673,,,27.6543882121699,33.5643116581897,4,3
+Puerto Rico,PRI,2017,8870,3325286,FALSE,54.1502545499458,,,20.8912401939086,40.6106651277105,,2.16931553995494,,,,25.7369367612698,11.5302778669318,4,2
+Puerto Rico,PRI,2018,8870,3193354,FALSE,58.1228780171602,,,16.2041750419778,39.7992959103702,,3.38840976975678,,,,25.9051542762983,9.79629240586731,4,2
+Puerto Rico,PRI,2019,8870,3193694,FALSE,63.7597251053223,,,18.7547547127234,,,,,,,41.2572399090229,18.7547547127234,2,1
+Puerto Rico,PRI,2020,8870,3194034,FALSE,,,,,,,,,,,,,0,0
+"Korea, Dem. People's Rep.",PRK,1990,120410,20293057,FALSE,0,0.0105427411506322,,,,,,,,,0.00527137057531609,0.0105427411506322,2,1
+"Korea, Dem. People's Rep.",PRK,1991,120410,20609151,FALSE,0,0.00118324291657934,,,,,,,,,0.00059162145828967,0.00118324291657934,2,1
+"Korea, Dem. People's Rep.",PRK,1992,120410,20937407,FALSE,0,0.00305207976375608,,,,,,,,,0.00152603988187804,0.00305207976375608,2,1
+"Korea, Dem. People's Rep.",PRK,1993,120410,21265832,FALSE,0,0.0123023277304538,,,,,,,,,0.00615116386522689,0.0123023277304538,2,1
+"Korea, Dem. People's Rep.",PRK,1994,120410,21577979,FALSE,0,0.00133744013110228,,,,,,,,,0.00066872006555114,0.00133744013110228,2,1
+"Korea, Dem. People's Rep.",PRK,1995,120410,21862300,FALSE,0,,,,,,,,,,0,,1,0
+"Korea, Dem. People's Rep.",PRK,1996,120410,22113428,FALSE,,0.00131893926235285,,,,,,,,,0.00131893926235285,0.00131893926235285,1,1
+"Korea, Dem. People's Rep.",PRK,1997,120410,22335263,FALSE,0,,,,,,,,,,0,,1,0
+"Korea, Dem. People's Rep.",PRK,1998,120410,22536754,FALSE,0,0.0597222889324356,,,,,,,,,0.0298611444662178,0.0597222889324356,2,1
+"Korea, Dem. People's Rep.",PRK,1999,120410,22731470,FALSE,0,,,,,,,,,,0,,1,0
+"Korea, Dem. People's Rep.",PRK,2000,120410,22929078,FALSE,0,0.0158801777878973,,,,,,,,,0.00794008889394866,0.0158801777878973,2,1
+"Korea, Dem. People's Rep.",PRK,2001,120410,23132982,FALSE,0,0.0376176065824734,,,,,,,,,0.0188088032912367,0.0376176065824734,2,1
+"Korea, Dem. People's Rep.",PRK,2002,120410,23339453,FALSE,0,0.0105158953461138,,,,,,,,,0.00525794767305688,0.0105158953461138,2,1
+"Korea, Dem. People's Rep.",PRK,2003,120410,23542434,FALSE,0,0.0106264298164855,,,0.0516711839727122,,,,,,0.00531321490824276,0.0106264298164855,3,1
+"Korea, Dem. People's Rep.",PRK,2004,120410,23732740,FALSE,0,0.120046823291803,,,0.045145917566432,,,,,,0.0600234116459013,0.120046823291803,3,1
+"Korea, Dem. People's Rep.",PRK,2005,120410,23904167,FALSE,0,0.0109720251066887,,,0.0443965218484664,,,,,,0.00548601255334436,0.0109720251066887,3,1
+"Korea, Dem. People's Rep.",PRK,2006,120410,24054866,FALSE,0,0.42991589796619,,,0.0406403120431022,,,,,,0.214957948983095,0.42991589796619,3,1
+"Korea, Dem. People's Rep.",PRK,2007,120410,24188330,FALSE,0,0.0399872018904293,,,0.0347293199809977,,,,,,0.0199936009452146,0.0399872018904293,3,1
+"Korea, Dem. People's Rep.",PRK,2008,120410,24310143,FALSE,0,0.308445841948316,,,0.0472489180373513,,,,,,0.154222920974158,0.308445841948316,3,1
+"Korea, Dem. People's Rep.",PRK,2009,120410,24428340,FALSE,0,0.15503064353732,,,0.0471102065400136,,,,,,0.0775153217686601,0.15503064353732,3,1
+"Korea, Dem. People's Rep.",PRK,2010,120410,24548840,FALSE,0,0.0242710123007328,,,0.0471679186704603,,,,,,0.0121355061503664,0.0242710123007328,3,1
+"Korea, Dem. People's Rep.",PRK,2011,120410,24673392,FALSE,0,0.183313447812379,,,0.047216957172808,,,,,,0.0916567239061893,0.183313447812379,3,1
+"Korea, Dem. People's Rep.",PRK,2012,120410,24800638,FALSE,0,0.362911925023313,,,0.053980891022454,,,,,,0.181455962511657,0.362911925023313,3,1
+"Korea, Dem. People's Rep.",PRK,2013,120410,24929500,FALSE,0,0.209373547476814,,,0.0559521568663622,,,,,,0.104686773738407,0.209373547476814,3,1
+"Korea, Dem. People's Rep.",PRK,2014,120410,25057793,FALSE,,0.179253338628828,,,0.0600565602338125,,,,,,0.179253338628828,0.179253338628828,2,1
+"Korea, Dem. People's Rep.",PRK,2015,120410,25183832,FALSE,,0.138340489898015,,,0.0555599710306892,,,,,,0.138340489898015,0.138340489898015,2,1
+"Korea, Dem. People's Rep.",PRK,2016,120410,25307665,FALSE,,0.154716632720645,,,0.056633518728736,,,,,,0.154716632720645,0.154716632720645,2,1
+"Korea, Dem. People's Rep.",PRK,2017,120410,25429816,FALSE,,0.0220607617338802,,,0.0618453110063039,,,,,,0.0220607617338802,0.0220607617338802,2,1
+"Korea, Dem. People's Rep.",PRK,2018,120410,25549606,FALSE,,0.00136068171429162,,,0.0633680439853453,,,,,,0.00136068171429162,0.00136068171429162,2,1
+"Korea, Dem. People's Rep.",PRK,2019,120410,25666158,FALSE,,0.0440179381227108,,,,,,,,,0.0440179381227108,0.0440179381227108,1,1
+"Korea, Dem. People's Rep.",PRK,2020,120410,25778815,FALSE,,,,,,,,,,,,,0,0
+Portugal,PRT,1990,91500,9983218,FALSE,0,12.1826269847515,11.7655831924588,,,,,,,10.8871990891748,7.98273672573677,11.5349130369631,3,2
+Portugal,PRT,1991,91500,9960235,FALSE,0.0263600183902153,12.822066176943,12.1379868634866,,,,,,,11.2354505626962,8.32880435293994,12.0287583698196,3,2
+Portugal,PRT,1992,91500,9952494,FALSE,0.0659118429512504,11.2853014806081,13.6528323326576,,,,,,9.09232226269404,12.6921313964233,8.52409197972775,11.0232517132418,3,3
+Portugal,PRT,1993,91500,9964675,FALSE,0.11833696012055,7.39969609859862,12.6376848045576,,,,,,9.36451941753001,12.0505866254632,7.38005932020171,9.60493404719728,3,3
+Portugal,PRT,1994,91500,9991525,FALSE,0.188475660631882,6.83272376595429,13.9598362071006,,,,,,8.83691870778773,13.2773869574834,7.45448858536862,9.64900981040848,3,3
+Portugal,PRT,1995,91500,10026176,FALSE,0.390415994656932,6.00524897588592,17.2759811954483,11.5223065347243,,,,,9.05388438607643,16.8412615287964,8.84956741735837,10.8556753563708,4,4
+Portugal,PRT,1996,91500,10063945,FALSE,0.775873632648128,10.9943618805256,17.7875172108501,11.7434089227785,,,,,9.37896610690078,17.6533106559553,10.1360255507406,12.4425118915401,4,4
+Portugal,PRT,1997,91500,10108977,FALSE,1.28344240687806,22.2969354646051,17.3881549145649,12.2222411050755,,,,,10.6202256412798,17.2304207978892,12.7621999064807,15.5924557522124,4,4
+Portugal,PRT,1998,91500,10160196,FALSE,2.54477743009283,56.8833391584657,18.7591006256871,13.5033259631427,,,,,12.3882845953455,18.6569702316624,20.8157655545468,25.3579799871541,4,4
+Portugal,PRT,1999,91500,10217828,FALSE,3.77940005965757,14.5421245854321,19.056751612205,13.8278132176963,,,,,13.3060878427979,19.1607651305043,12.9024354635578,15.2091976941076,4,4
+Portugal,PRT,2000,91500,10289898,FALSE,4.1826733563462,68.5091364638538,18.7826168340228,14.2799193500954,,,,,12.6917752748197,19.130527803041,23.6892242558276,28.6528397229525,4,4
+Portugal,PRT,2001,91500,10362722,FALSE,4.57205097716985,54.8186415435079,18.492216659099,14.2616162916895,,,,,12.5313283610709,19.4330671961703,20.9351707665074,25.2611633481096,4,4
+Portugal,PRT,2002,91500,10419631,FALSE,4.86958976039247,8.28225998494706,19.5092617340052,13.5739643099279,,,,,14.1042825415017,19.9490913581631,12.0678716661549,13.977399548635,4,4
+Portugal,PRT,2003,91500,10458821,FALSE,7.43104532176096,81.2680148491065,23.4169681396195,13.5962709199402,14.5522647639497,27.685248296195,39.6585513022155,100,15.8080066568749,24.003091199017,29.8377293551018,45.722322487859,7,6
+Portugal,PRT,2004,91500,10483861,FALSE,7.94049785217655,44.643442664274,27.6970994450594,12.3262704986156,15.7655451323567,29.8234752410833,46.4444955093486,100,17.7126120797448,28.6372879696636,26.6554133271861,41.6273514536078,7,6
+Portugal,PRT,2005,91470,10503330,FALSE,8.72633790328225,25.4875239569933,28.602859321592,12.2721920907498,16.979480263221,35.8851210625471,42.9244498803867,100,18.829001030162,30.1500591310389,24.6753550351019,38.2772043482218,7,6
+Portugal,PRT,2006,91470,10522288,FALSE,9.4624321647779,92.7291343943317,32.948480498819,13.0235922782681,18.6018946341801,,40.447674600912,2.20970820817137,21.4964546649433,36.207905502224,35.0179614336753,34.3524116081417,6,6
+Portugal,PRT,2007,91470,10542964,FALSE,10.4575824210308,68.9470908921921,38.7771966496244,7.81990986304057,20.664121781579,14.5876659220961,64.315679337603,3.53733907673841,,43.1898344894839,34.1508541809312,37.5619707318116,7,5
+Portugal,PRT,2008,91470,10558177,FALSE,10.948637655801,55.65484809672,43.7603018783188,8.00884007102027,21.5283837381937,15.0420490959874,54.3162678813085,,,48.4831681493661,31.2884907798593,41.6157810496037,7,4
+Portugal,PRT,2009,91590,10568247,FALSE,11.9643590517019,38.2689237933429,34.4159610572334,7.4000308205516,20.5951980346317,14.6564918069461,68.5985345305382,,26.5615141655657,37.9398843618619,28.8379736036971,35.7537775343721,7,5
+Portugal,PRT,2010,91590,10573100,FALSE,13.205047362573,51.0407195525172,36.9225354900736,7.76085061768532,22.2375331962448,14.2808479722658,49.804920544155,,30.5935831860826,41.2676932996807,29.0869292464789,36.0935534400242,7,5
+Portugal,PRT,2011,91590,10557560,FALSE,13.7083061028744,100,41.3878195160162,8.35680173603024,23.1464829999836,14.5543288107756,56.0276007672944,,33.0222777187889,44.5459216060546,38.1510192359685,48.3905203656336,7,5
+Portugal,PRT,2012,91590,10514844,FALSE,15.0320270271295,100,37.9469033396637,10.239261106009,23.209285789883,13.9184328624848,48.7087793424435,,34.8597381542124,39.0789171015802,37.2435916902776,46.577339140849,7,5
+Portugal,PRT,2013,91605.2,10457295,FALSE,15.5545181551911,95.7818728911818,41.1551710674264,12.390115037654,23.6848696280148,15.4652037906656,47.5972062590782,15.4392831573268,36.3508276631288,41.3565939481113,37.7564164091894,41.4859831594135,7,6
+Portugal,PRT,2014,91605.6,10401062,FALSE,16.2668212101694,65.2433112714903,43.001515507178,14.0128240719254,25.5841881766046,14.666364132939,52.0158032511098,19.0506800054278,39.088943311088,43.4355747475372,34.8993689651286,38.8078561097631,7,6
+Portugal,PRT,2015,91605.6,10358076,FALSE,17.3567379609534,10.1054333355759,37.577280801406,15.9674021644375,27.7673839714369,14.5043480701541,71.3832806349312,24.0893319713968,38.6428977733195,37.8664105131059,29.3624829629682,33.0091260654611,7,6
+Portugal,PRT,2016,91605.6,10325452,FALSE,17.8658647117009,44.7837270929008,38.3944129525851,17.9990935556321,30.3064164087521,13.9255056658482,66.3691513443176,27.7192024175763,37.8549183532238,38.5165692361213,33.8846676680298,38.873776999962,7,6
+Portugal,PRT,2017,91605.6,10300300,FALSE,18.765920629435,55.1955197624726,43.9313867409288,20.7874639708583,34.2878936091934,15.4223800206986,65.1305590417073,28.7112702765397,46.3706871432456,43.585799028238,37.943416758478,43.2968832038436,7,6
+Portugal,PRT,2018,91605.6,10283822,FALSE,19.0175322004032,39.6631020878137,49.2213600447922,22.0552005750585,37.4008847151815,,65.9363699499945,,,48.7709774519684,39.1787129716124,44.1064125162088,6,4
+Portugal,PRT,2019,91605.6,10286263,FALSE,19.1875627286244,50.9618626889349,48.856944207669,23.9419101622261,,,,,,47.6647750343497,35.7370699468636,40.8561826285036,4,3
+Portugal,PRT,2020,91605.6,10305564,FALSE,19.8926374860497,1.5140431134018,40.8963023534823,,,,,,,40.1176522990768,20.7676609843113,20.8158477062393,3,2
+Paraguay,PRY,1990,397300,4223413,FALSE,0,0.798586584833773,2.64511157495107,,,,,,,2.41835219606402,1.14789938659495,1.60846939044889,3,2
+Paraguay,PRY,1991,397300,4334348,FALSE,0,0.871241586113331,2.64778156088094,,,,,,,2.42261402608907,1.17300771566476,1.6469278061012,3,2
+Paraguay,PRY,1992,397300,4445019,FALSE,0,1.15937376286815,2.58254147676828,,,,,,3.37137909974079,2.41126967715802,1.7783235848443,2.31400751325565,3,3
+Paraguay,PRY,1993,397300,4555518,FALSE,0,0.722075682401608,3.50469861426038,,,,,,3.49857184636453,3.21381333721309,1.93133653575663,2.47815362199308,3,3
+Paraguay,PRY,1994,397300,4666096,FALSE,0,1.28867382687717,4.10172773869173,,,,,,3.71029634416912,3.75153886053437,2.2751744774345,2.91683634386022,3,3
+Paraguay,PRY,1995,397300,4776838,FALSE,0,0.867661881848189,5.40231981702371,39.869212415885,,,,,4.03486453927191,5.21134708248536,10.0348117308058,12.4957714798726,4,4
+Paraguay,PRY,1996,397300,4887638,FALSE,0.0109115276762641,1.25718249584727,4.97574664439705,31.9812640269128,,,,,,4.64486230548653,9.55627617370834,12.6277696094155,4,3
+Paraguay,PRY,1997,397300,4998096,FALSE,0.0521877187083939,2.07181329917888,4.60756544349469,26.6248655626616,,,,,,4.45296183237041,8.3391080060109,11.0498802314036,4,3
+Paraguay,PRY,1998,397300,5107840,FALSE,0.09995411550547,2.9881416579295,4.45548470516684,23.3486648945259,,,,,,4.29062268376722,7.72306134328193,10.2091430787409,4,3
+Paraguay,PRY,1999,397300,5216346,FALSE,0.191655947063801,0.737381819895138,3.17774738349794,15.2966014914344,,,,,,3.13371624418707,4.85084666047282,6.3892331851722,4,3
+Paraguay,PRY,2000,397300,5323202,FALSE,0.36789957046525,0.969756589004108,3.1484118768836,8.9534189234255,,,,,,3.28405143558513,3.35987173994462,4.40240898267158,4,3
+Paraguay,PRY,2001,397300,5428442,FALSE,0.530220001301639,1.03983053826852,2.72720772467364,7.94286236837259,,,,,,2.82012431605676,3.0600301581541,3.93427240756596,4,3
+Paraguay,PRY,2002,397300,5531958,FALSE,0.849949880130862,1.38666054374271,2.4820653793945,7.01244362664157,,,,,,2.43697234853619,2.93277985747741,3.61202550630682,4,3
+Paraguay,PRY,2003,397300,5632983,FALSE,0.982106662646102,1.09239185520131,2.66648196156501,6.16419938268874,1.48690785440449,,4.48209786556804,,,2.77614557492423,3.07745554553384,3.62870866959558,6,4
+Paraguay,PRY,2004,397300,5730556,FALSE,1.5781354493738,1.22670203634289,3.21957736755115,5.48685667404285,1.59457960489111,,,,,3.30506795456419,2.87781788182767,3.33954222164998,5,3
+Paraguay,PRY,2005,397300,5824095,FALSE,3.55630347519557,0.267337034127522,3.75723310816715,5.52177344550652,1.64889941131101,,,,,3.82923937336046,3.27566176574919,3.20611661766483,5,3
+Paraguay,PRY,2006,397300,5913212,FALSE,3.52710060735884,1.93883725708259,4.68253705546653,8.95562521229079,1.50463399119266,,,0.0619434745130755,,4.6631815629816,4.77602503304969,3.90489687671701,5,4
+Paraguay,PRY,2007,397300,5998430,FALSE,4.89534282758323,1.47916802646962,5.69123428641401,9.43390629791908,1.8113605449658,,,0.122234822042818,,5.44026094269128,5.37491285959648,4.1188925222807,5,4
+Paraguay,PRY,2008,397300,6081296,FALSE,6.14671284008179,2.97768334145837,7.67343212432986,9.85667248942791,1.74190857302399,,,0.361925185623364,,7.18968838839318,6.66362519882448,5.09649235122571,5,4
+Paraguay,PRY,2009,397300,6163970,FALSE,8.03186465940911,0.507505188844886,6.027665973332,9.75007118967779,1.63659846126322,7.50223552219792,2.92570964597272,0.499941566862674,,5.68918288657631,5.79084202990574,3.87448209558688,7,5
+Paraguay,PRY,2010,397300,6248017,FALSE,8.3011465626574,4.55663265218989,8.24232517962973,10.1963500059907,1.87818690575641,,3.46362434413731,1.24612443894808,,7.67745557615617,6.952015748921,5.42803740348442,6,5
+Paraguay,PRY,2011,397300,6333981,FALSE,10.2411951711943,4.02475506064903,9.86627850471802,11.1990988322175,1.71915691103036,11.9845718960988,5.69436077768042,1.72453118067368,,9.04733526820239,8.83504337375968,6.3380162238846,7,5
+Paraguay,PRY,2012,397300,6421510,FALSE,11.9684535956708,5.1717399584459,9.11207156024411,12.699827412064,1.91403320208363,,3.93172027779776,2.39724836567879,,8.47038287585283,8.5767625608445,6.53418377796785,6,5
+Paraguay,PRY,2013,397300,6510273,FALSE,14.8471213989028,2.55858657789736,10.1094707136021,14.1332526241091,1.83519633010768,,2.77008145226575,3.42554805278068,,9.36686188951454,8.8837025533554,6.45086611931348,6,5
+Paraguay,PRY,2014,397300,6599524,FALSE,17.0675402999827,4.56890083835937,9.83003449025377,14.2734288089559,2.00794103327159,6.84162275271823,5.46523854947311,4.60934134625942,,9.08801119929998,9.67446095662385,7.60098414846955,7,5
+Paraguay,PRY,2015,397300,6688746,FALSE,19.4701469972732,4.28055719182124,8.30143212297927,17.0179595799654,1.92505960115774,6.47088635075042,3.77463594537468,6.1375753160978,,7.71261237130338,9.88593636469404,7.78466808091249,7,5
+Paraguay,PRY,2016,397300,6777878,FALSE,20.6393573512188,3.62494368898337,8.32099794281759,18.2512831754633,2.06426279327191,,3.19285531309117,8.35231851206125,,7.77483586002303,10.8058874943149,8.23924730992443,6,5
+Paraguay,PRY,2017,397300,6867058,FALSE,23.2977098057764,5.8315895033764,9.33360195328698,19.3551582782624,2.11988125531488,,2.10092723684425,8.54949701702232,,8.6304741747373,11.9837973555093,8.89352924204854,6,5
+Paraguay,PRY,2018,397300,6956069,FALSE,24.474928129249,2.88546909780988,9.7838751330052,14.7572282171866,2.57971306841173,,1.55553257046356,,,9.06638938387889,10.6914066295428,7.06615481733473,6,4
+Paraguay,PRY,2019,397300,7044639,FALSE,25.4776093154986,4.17220977125686,9.03618908294979,15.0217472424663,,,,,,8.35288275383893,13.4269388530429,9.18227992252069,4,3
+Paraguay,PRY,2020,397300,7132530,FALSE,27.366332160066,0.334073253145663,7.53784677121228,,,,,,,6.99948498747359,11.7460840614746,3.66677912030963,3,2
+West Bank and Gaza,PSE,1990,6020,1978248,FALSE,0,,,,,,,,,,0,,1,0
+West Bank and Gaza,PSE,1991,6020,2068845,FALSE,0,,,,,,,,,,0,,1,0
+West Bank and Gaza,PSE,1992,6020,2163591,FALSE,0,,,,,,,,,,0,,1,0
+West Bank and Gaza,PSE,1993,6020,2262676,FALSE,0,,,,,,,,,,0,,1,0
+West Bank and Gaza,PSE,1994,6020,2366298,FALSE,0,,,,,,,,,,0,,1,0
+West Bank and Gaza,PSE,1995,6020,2474666,FALSE,0,4.45916218277737,3.43595702041103,,,,,,,3.55238550986168,2.6317064010628,4.00577384631952,3,2
+West Bank and Gaza,PSE,1996,6020,2587997,FALSE,,5.40782038537659,3.84817196231981,1.03121837822999,,,,,,3.86234687025632,3.42907024197547,3.43379521128764,3,3
+West Bank and Gaza,PSE,1997,6020,2706518,FALSE,,5.17100678210656,3.94467567534252,0.941112614257834,,,,,,4.00073809512406,3.3522650239023,3.37095249716282,3,3
+West Bank and Gaza,PSE,1998,6020,2776568,FALSE,,5.68514793947434,3.74376866945183,0.873580921866665,,,,,,3.99812307101569,3.43416584359761,3.5189506441189,3,3
+West Bank and Gaza,PSE,1999,6020,2848431,FALSE,,5.54653006713813,3.87494173644438,1.27798368960903,,,,,,4.11105176242367,3.56648516439718,3.64518850639028,3,3
+West Bank and Gaza,PSE,2000,6020,2922153,FALSE,0.99619849830781,4.20475632684291,3.09219697200597,1.28727716088879,,,,,,3.11884510697091,2.39510723951137,2.87029286490087,4,3
+West Bank and Gaza,PSE,2001,6020,2997784,FALSE,1.60505379702703,5.60159691607757,2.63525533061843,0.172796201199016,,,,,,2.54166311555661,2.50367556123051,2.77201874427773,4,3
+West Bank and Gaza,PSE,2002,6020,3075373,FALSE,2.64053490087956,5.07124754908112,2.0952335823588,0.128899269648037,,,,,,1.98353768438397,2.48397882549188,2.39456150103771,4,3
+West Bank and Gaza,PSE,2003,6020,3154969,FALSE,3.4295319884518,0.782269643699366,2.28686155705213,0.141012319912707,0.036688870091689,,,,,2.15540409226832,1.659918877279,1.02622868529346,5,3
+West Bank and Gaza,PSE,2004,6020,3236626,FALSE,3.56175917791453,0.785047665222,2.75357030901698,0.208730344933389,0.012231892145053,,,,,2.58876023588338,1.82727687427172,1.19417941534626,5,3
+West Bank and Gaza,PSE,2005,6020,3320396,FALSE,12.6264391600896,0.903820918874533,3.09341738835011,0.320502442829052,,,,,,2.96250765128172,4.23604497753582,1.39561033766177,4,3
+West Bank and Gaza,PSE,2006,6020,3406334,FALSE,14.1573397041501,1.90575481703867,3.1013826768749,0.437199853301979,,,,,,2.97554360186158,4.90041926284142,1.77283275740074,4,3
+West Bank and Gaza,PSE,2007,6020,3494496,FALSE,15.8735649952261,0.68723460607483,3.66663073061532,0.916293196108174,,,,,,3.54156637495104,5.2859308820061,1.71503139237802,4,3
+West Bank and Gaza,PSE,2008,6020,3591977,FALSE,17.7632804656125,0.681132476535081,3.8759230004214,1.30736924986594,,,,,,3.78020459582893,5.90692629810874,1.92290210740999,4,3
+West Bank and Gaza,PSE,2009,6020,3689099,FALSE,22.8852198794817,4.3962668819596,3.94748142752106,1.3025486083558,,,,,,3.83629857590236,8.13287919932954,3.17837135540592,4,3
+West Bank and Gaza,PSE,2010,6020,3786161,FALSE,25.8754325535248,2.75726658775623,4.20007982942464,1.67339228936955,,,,,,4.12815472435244,8.62654281501881,2.85293786715941,4,3
+West Bank and Gaza,PSE,2011,6020,3882986,FALSE,27.7127551191172,5.39216746878444,4.64958977355508,1.40324761898528,,,,,,4.56960532194785,9.78943999511049,3.78834013657253,4,3
+West Bank and Gaza,PSE,2012,6020,3979998,FALSE,28.5641937125931,1.06515429029508,4.92973275052283,1.49415055465952,,,,,,4.84901885919062,9.01330782701763,2.46944123471507,4,3
+West Bank and Gaza,PSE,2013,6020,4076708,FALSE,29.9427307484302,2.41038824526798,5.2781996863964,1.62256248252069,,,,,,5.31888705685979,9.81347029065382,3.11727926154948,4,3
+West Bank and Gaza,PSE,2014,6020,4173398,FALSE,33.6865771932064,3.64844583231406,5.45639038488781,1.61695589362733,,,,,,5.65510934528793,11.1020923260089,3.64017035707644,4,3
+West Bank and Gaza,PSE,2015,6020,4270092,FALSE,34.7825101693298,1.85095119375534,5.56605043183258,1.22754099389035,,,,,,5.79998793252092,10.856763197202,2.95949337338887,4,3
+West Bank and Gaza,PSE,2016,6020,4367088,FALSE,35.929400678487,3.42929385019406,5.54619789650787,1.11122956737099,,,,,,5.87784018180706,11.50403049814,3.47278786645737,4,3
+West Bank and Gaza,PSE,2017,6020,4454805,FALSE,37.2211772894584,1.88238608827504,5.95811232927664,1.37019458171734,,,,,,6.40251923728593,11.6079675721818,3.21836663575944,4,3
+West Bank and Gaza,PSE,2018,6020,4569087,FALSE,36.9208330384753,2.7118332194623,6.11653130292815,1.60973591273322,,,,,,6.81791006768313,11.8397333683997,3.71315973329288,4,3
+West Bank and Gaza,PSE,2019,6020,4685306,FALSE,39.483962959345,1.91753725691367,6.06679244746387,1.78237818917592,,,,,,6.83334002749403,12.3126677132246,3.51108515786121,4,3
+West Bank and Gaza,PSE,2020,6020,4803269,FALSE,,,5.22162271411941,,,,,,,5.8235390046822,5.22162271411941,5.8235390046822,1,1
+French Polynesia,PYF,1990,3660,199906,TRUE,0,4.86186784528119,,,,,,,,,2.4309339226406,4.86186784528119,2,1
+French Polynesia,PYF,1991,3660,203716,TRUE,0,7.2812792287379,,,,,,,,,3.64063961436895,7.2812792287379,2,1
+French Polynesia,PYF,1992,3660,207238,TRUE,0,0.00634908418059006,,,,,,,,,0.00317454209029503,0.00634908418059006,2,1
+French Polynesia,PYF,1993,3660,210644,TRUE,0,0.674613674261072,,,,,,,,,0.337306837130536,0.674613674261072,2,1
+French Polynesia,PYF,1994,3660,214196,TRUE,0,0.317380006551094,,,,,,,,,0.158690003275547,0.317380006551094,2,1
+French Polynesia,PYF,1995,3660,218064,TRUE,0,0.619478110836687,,13.8698961787035,,,,,,,4.82979142984673,7.24468714477009,3,2
+French Polynesia,PYF,1996,3660,222323,TRUE,1.07186027420557,0.891709464292588,,13.6041653398638,,,,,,,5.18924502612064,7.24793740207817,3,2
+French Polynesia,PYF,1997,3660,226854,TRUE,2.47550355646074,2.77823865593202,,10.7620328686185,,,,,,,5.33859169367043,6.77013576227527,3,2
+French Polynesia,PYF,1998,3660,231562,TRUE,14.8887432044685,2.0323179500646,,11.0678045560018,,,,,,,9.32962190351163,6.55006125303321,3,2
+French Polynesia,PYF,1999,3660,236217,TRUE,38.2458727634105,0.822530099845743,,12.1353466690799,,,,,,,17.0679165107787,6.47893838446281,3,2
+French Polynesia,PYF,2000,3660,240681,TRUE,69.1878506633485,2.49448187489611,,,,,,,,,35.8411662691223,2.49448187489611,2,1
+French Polynesia,PYF,2001,3660,244929,TRUE,66.8598348028462,4.93882160181729,,,,,,,,,35.8993282023318,4.93882160181729,2,1
+French Polynesia,PYF,2002,3660,248976,TRUE,86.2745944583709,4.39713265111356,25.0174425819844,,,,,,,27.3552388223289,38.563056563823,15.8761857367212,3,2
+French Polynesia,PYF,2003,3660,252707,TRUE,100,11.0865574122754,30.803313732105,,16.2932086325218,,,,,32.5752370517922,47.2966237147935,21.8308972320338,4,2
+French Polynesia,PYF,2004,3660,255995,TRUE,100,2.69009985026647,31.1438936748174,,16.8690642653927,,,,,33.5152588881412,44.611331175028,18.1026793692038,4,2
+French Polynesia,PYF,2005,3660,258780,TRUE,100,3.99544863165889,33.5546784295649,,17.1042632705116,,,,,34.7308591221937,45.8500423537413,19.3631538769263,4,2
+French Polynesia,PYF,2006,3660,261007,TRUE,100,6.86648857738096,31.3138524555382,,18.1415936007548,5.4887822218905,,0.432896526554653,,33.4356263014456,35.9172808137024,13.5783371351271,5,3
+French Polynesia,PYF,2007,3660,262717,TRUE,100,12.0100529592331,35.0636473844835,11.2347978620601,16.6893006301647,12.162728446714,96.1018170924648,0.62841209240241,,37.6920566113621,44.4288406241592,31.5334273235045,7,5
+French Polynesia,PYF,2008,3660,264064,TRUE,100,7.28351320679916,40.1996814941093,10.4414198015175,15.1746586503355,17.4329062999102,,0.955929201527644,,42.9898172598922,35.0715041604672,15.4176698674341,6,4
+French Polynesia,PYF,2009,3660,265256,TRUE,100,4.90047607676099,33.3956287330494,12.7301447913106,13.2675496561081,15.8015268454003,27.1948404356342,1.59074015740536,,36.6331118638584,32.3371028136926,16.6098626649939,7,5
+French Polynesia,PYF,2010,3660,266449,TRUE,100,16.8074240136064,31.3256012222501,12.2172196436247,11.7454362352297,14.6223128202058,0,4.81993168232489,,33.996113627704,29.1620929499478,13.568137793452,7,5
+French Polynesia,PYF,2011,3660,267702,TRUE,100,26.5409420418558,32.6084309933564,12.7045731870324,11.4706992712433,,0,5.48272569131394,,35.6702345254003,34.3707892444489,16.0796950891205,6,5
+French Polynesia,PYF,2012,3660,268995,TRUE,100,30.6950972512436,29.9953669376773,13.2305851309299,14.3497116091541,10.7605105306649,0,5.45637089693692,,32.3652434290804,30.7802599750859,16.3494593416381,7,5
+French Polynesia,PYF,2013,3660,270332,TRUE,100,26.6517320461763,30.8032000394491,9.61510473916157,13.1181250804374,9.95510308923947,0,,,33.5374146793414,29.5041899856711,17.4510628661698,7,4
+French Polynesia,PYF,2014,3660,271713,TRUE,100,14.9372102520682,31.1396174751395,12.3381729390534,11.5178456090651,9.45581507737228,53.0971620393179,,,33.1907972889267,36.8279962971586,28.3908356298415,7,4
+French Polynesia,PYF,2015,3660,273119,TRUE,100,7.82809175338745,26.9218206719511,13.0752646782042,12.2124165713404,7.59787387782621,0,16.3317515262288,,28.60034057044,25.9038418302282,13.1670897056521,7,5
+French Polynesia,PYF,2016,3660,274576,TRUE,100,13.7008400669504,27.0464835231392,12.7846617990703,11.7280287450098,6.87634152199361,13.1358796737417,21.0788241390653,,29.1846310906572,28.9240344308159,17.976967353897,7,5
+French Polynesia,PYF,2017,3660,276108,TRUE,100,15.0440219217624,,13.5936599596038,11.3966166886173,6.24679899324021,13.0629945430676,,,,29.5894950835348,13.9002254748113,6,3
+French Polynesia,PYF,2018,3520,277673,TRUE,,11.6220808621936,,13.6045345028302,12.3828460202577,,0,,,,8.40887178834126,8.40887178834126,4,3
+French Polynesia,PYF,2019,3520,279285,TRUE,,5.80557621188789,,15.7878277263303,,,,,,,10.7967019691091,10.7967019691091,2,2
+French Polynesia,PYF,2020,3520,280904,TRUE,,,,,,,,,,,,,0,0
+Qatar,QAT,1990,11610,476275,TRUE,0,0.631974591048775,,,,,,,,,0.315987295524388,0.631974591048775,2,1
+Qatar,QAT,1991,11610,487354,TRUE,0,4.04136708417274,,,,,,,,,2.02068354208637,4.04136708417274,2,1
+Qatar,QAT,1992,11610,495403,TRUE,0,3.90659795028571,,,,,,,,,1.95329897514286,3.90659795028571,2,1
+Qatar,QAT,1993,11610,501479,TRUE,0,6.67485674771718,,,,,,,,,3.33742837385859,6.67485674771718,2,1
+Qatar,QAT,1994,11610,507044,TRUE,0,14.1088723802128,,,,,,,,,7.05443619010639,14.1088723802128,2,1
+Qatar,QAT,1995,11610,513447,TRUE,0.970402165831868,8.39436664750641,,,,,,,,,4.68238440666914,8.39436664750641,2,1
+Qatar,QAT,1996,11610,522531,TRUE,4.66307879423237,29.1962583907855,,,,,,,,,16.9296685925089,29.1962583907855,2,1
+Qatar,QAT,1997,11610,535320,TRUE,15.0897023257721,35.4411530611859,,,,,,,,,25.265427693479,35.4411530611859,2,1
+Qatar,QAT,1998,11610,551566,TRUE,16.7172159657076,29.3201829346137,,,,,,,,,23.0186994501607,29.3201829346137,2,1
+Qatar,QAT,1999,11610,570486,TRUE,18.6914195117381,9.26020883663186,,,,,,,,,13.975814174185,9.26020883663186,2,1
+Qatar,QAT,2000,11610,592467,TRUE,21.5038315093931,19.9393914026869,,,,,,,,,20.72161145604,19.9393914026869,2,1
+Qatar,QAT,2001,11610,615013,TRUE,26.2805751307116,22.3022750703508,,,,,,,,,24.2914251005312,22.3022750703508,2,1
+Qatar,QAT,2002,11610,640872,TRUE,41.7979575405521,44.1389989125837,,,,,,,,,42.9684782265679,44.1389989125837,2,1
+Qatar,QAT,2003,11610,681791,TRUE,73.9301578118432,45.8725174934987,,,73.8356839754312,100,,100,100,,79.9506688263355,81.9575058311663,4,3
+Qatar,QAT,2004,11610,753332,TRUE,71.9836053579036,95.2997523550042,,,77.5154519965235,100,38.3023399754403,100,100,,81.1171395376696,83.4005230826111,5,4
+Qatar,QAT,2005,11610,865410,TRUE,74.8649695980523,100,,,82.7370752557878,100,,100,100,,93.7162423995131,100,4,3
+Qatar,QAT,2006,11610,1022704,FALSE,74.212196290568,100,,,80.8544917836521,51.4548770457912,17.6336324943351,1.66828800899054,100,,68.6601411661389,54.8254801258314,5,4
+Qatar,QAT,2007,11610,1218441,FALSE,79.5448951367004,100,,,78.959876718312,,32.5619133550745,2.520569973982,,,70.7022694972583,45.0274944430188,4,3
+Qatar,QAT,2008,11610,1436670,FALSE,80.7721786395276,100,,,79.5125738427734,,37.6578890486051,5.30477930820405,,,72.8100225627109,47.654222785603,4,3
+Qatar,QAT,2009,11610,1654944,FALSE,84.0477927112372,100,,10.8770273089068,76.1227143256347,,28.3322969628367,7.35448980314072,100,,64.6514233965961,49.3127628149769,5,5
+Qatar,QAT,2010,11610,1856329,FALSE,97.3664274692903,100,,11.1234773651872,78.9361112882107,,21.3727040143586,9.68653700656603,100,,65.9725217697672,48.4365436772224,5,5
+Qatar,QAT,2011,11610,2035862,FALSE,88.7801446943065,100,100,12.2726364993425,83.0974027137272,,37.2042619997049,12.9770919818012,100,100,73.0428405322257,60.4089984134748,6,6
+Qatar,QAT,2012,11610,2196078,FALSE,82.6609833304703,44.6561344293043,100,12.8541275267981,88.0959234192959,,29.5628622259097,20.0506298029943,100,100,61.6223512520804,51.1872923308344,6,6
+Qatar,QAT,2013,11610,2336579,FALSE,95.6276880138033,100,100,13.5784301989813,87.5642755893015,,32.4160849015776,28.2360829727297,100,100,73.6037005190604,62.3717663455481,6,6
+Qatar,QAT,2014,11490,2459202,FALSE,97.4528440913518,100,100,14.0226315226304,90.7930463922033,,51.3328735928994,41.7791512390912,100,100,77.1347248678136,67.8557760591035,6,6
+Qatar,QAT,2015,11490,2565708,FALSE,94.8315042646204,87.0824440188499,100,13.9234162988871,99.817176643109,,25.3038737655849,44.6929121142466,100,100,70.1902063913237,61.8337743662614,6,6
+Qatar,QAT,2016,11490,2654379,FALSE,93.8739924144051,100,100,13.4445186026604,100,,19.0233429974251,54.742964410883,100,100,71.0569756690818,64.5351376684948,6,6
+Qatar,QAT,2017,11490,2724727,FALSE,93.6270484236082,43.1514762372729,100,10.0567275728033,100,,11.913551587251,61.409845007899,100,100,59.7914673034892,54.421933400871,6,6
+Qatar,QAT,2018,11490,2781682,FALSE,93.8420169817119,90.0153970392696,100,7.94235143515601,96.1548464644203,,10.3729967618076,,,100,60.434552443589,52.0826863090583,6,4
+Qatar,QAT,2019,11490,2832071,FALSE,92.1723119987736,100,100,9.16290586478968,,,,,,100,75.3338044658908,69.7209686215966,4,3
+Qatar,QAT,2020,11490,2881060,FALSE,90.6050217159055,41.5585920935464,100,,,,,,,100,77.3878712698173,70.7792960467732,3,2
+Romania,ROU,1990,229350,23201835,FALSE,0,0.0340447854642853,1.65980403475338,,,,,,,1.45693249255378,0.56461627340589,0.745488639009033,3,2
+Romania,ROU,1991,229460,23001155,FALSE,0,0.0819932373235696,1.13347345016366,,,,,,,0.996543219764452,0.405155562495743,0.539268228544011,3,2
+Romania,ROU,1992,229460,22794284,FALSE,0,0.155854119832245,1.18550645090021,,,,,,1.11083635216199,1.04273474152189,0.613049230723611,0.769808404505377,3,3
+Romania,ROU,1993,229460,22763280,FALSE,0.000426146634684565,0.194601308553556,1.3038888472004,,,,,,0.95119979478441,1.15322268534012,0.612529024293263,0.766341262892697,3,3
+Romania,ROU,1994,229510,22730211,FALSE,0.00303088913145048,0.65799541961183,1.55568687969042,,,,,,1.42787595931034,1.38214914828556,0.911147286936008,1.15600684240258,3,3
+Romania,ROU,1995,229490,22684270,FALSE,0.00865521563964614,0.813985204464899,2.17076678079294,5.98677048872559,,,,,1.44284507450934,1.92476677178415,2.08460455282648,2.542091884871,4,4
+Romania,ROU,1996,229520,22619004,FALSE,0.0256658562878362,0.50998570960622,2.3297959842642,5.88106046978365,,,,,1.02798299752358,2.06994559675076,1.9548982034931,2.37224369341605,4,4
+Romania,ROU,1997,229530,22553978,FALSE,0.0517351501740873,2.38022212767161,2.34928264528345,6.13447344247821,,,,,0.92034948434821,2.11203232479129,2.36721256999111,2.88676934482233,4,4
+Romania,ROU,1998,229590,22507344,FALSE,0.260425136648768,3.97525636540519,2.35605685888786,6.32637815587935,,,,,0.956245868284192,2.14051294503372,2.77487247702107,3.34959833365061,4,4
+Romania,ROU,1999,229600,22472040,FALSE,0.314446643102953,2.06296429302057,2.21079435838514,6.2141479750201,,,,,1.00816618192205,1.98959364340172,2.36210389029016,2.81871802334111,4,4
+Romania,ROU,2000,229710,22442971,FALSE,0.4217828523363,2.04804812424812,2.73704432995107,6.30555597505046,,,,,1.20945470723247,2.47128987746287,2.54437719776368,3.00858717099848,4,4
+Romania,ROU,2001,229710,22131970,FALSE,0.537184576940799,2.32652244649965,3.15848008385267,6.2262232512724,,,,,1.09492227639487,2.86618762397104,2.66866652699208,3.12846389953449,4,4
+Romania,ROU,2002,229870,21730496,FALSE,0.793179257396618,2.341248827767,3.74868012619403,5.89685305670952,,,,,0.948032605236514,3.39420340816133,2.74559877466074,3.14508447446859,4,4
+Romania,ROU,2003,229950,21574326,FALSE,1.080607217065,3.82800332281751,4.9318654841659,6.80724739634397,2.11539525342923,,6.85438280617384,,1.0138760830775,4.44733470804765,4.08599705160729,4.59016886329209,6,5
+Romania,ROU,2004,230000,21451748,FALSE,1.83165496064085,13.3161173746894,6.65865631490305,7.68426577015809,2.54273058732057,9.96307643890579,6.05287283361257,100,0.904729545636246,6.21376234681829,6.63019617693514,22.3619579784858,7,6
+Romania,ROU,2005,229980,21319685,FALSE,2.64163475751877,14.0487690105348,6.58018433887758,7.3939828254864,3.16474096947277,12.9258380092234,4.2294214212092,100,1.18111477155357,6.32434764698233,7.00013501920054,22.1962726126277,7,6
+Romania,ROU,2006,229980,21193760,FALSE,3.04789607176296,23.8154582345353,8.590369926632,8.56366026744301,3.96885430629767,14.2345049868808,5.61600729699736,1.12527695483021,1.48239638708264,8.32513064564227,9.33575616733344,8.1546549644218,7,6
+Romania,ROU,2007,229890,20882982,FALSE,3.54984193372662,22.6176957025948,12.8391597157361,10.8777947652289,4.91449192773196,16.2926080514489,6.73587204138732,4.04129289061864,,12.417254825716,12.1521620350205,11.3379820451091,7,5
+Romania,ROU,2008,229900,20537875,FALSE,4.13497223935121,29.8563411692139,16.536563246306,12.9723011413769,5.73611384681232,18.3510532245806,8.78084343511025,7.4681194654806,,15.7551491358809,15.1053457426565,14.9665508694125,7,5
+Romania,ROU,2009,230060,20367487,FALSE,4.70715751816739,10.015856376638,12.1163615652129,11.5086228048793,5.98630109562076,18.2109233270415,8.50012916518716,13.331763275047,2.49384561067,11.3100340039017,9.65041376682803,9.52670853938719,7,6
+Romania,ROU,2010,230050,20246871,FALSE,5.1660248193412,7.47200054338767,14.0892736955363,11.0401985963174,6.27148836291892,19.2937065026502,7.66006183295107,15.9484569879053,2.81604754513301,12.924156845164,9.6481876479024,9.6434870584764,7,6
+Romania,ROU,2011,230170,20147528,FALSE,5.20189812212594,5.28316144197923,17.5617754571138,11.1814673914823,6.26653241154472,21.4543993895142,6.80273516916305,43.3461985187391,2.86526212646257,16.1865002167416,10.0500998711202,14.2775541440946,7,6
+Romania,ROU,2012,230020,20058035,FALSE,5.99170004894835,7.11744703990869,16.4436945704259,11.5578025286587,5.89795101778766,24.2720695107845,6.65326887703606,45.8812282407911,3.07808344904584,15.2888065748701,10.7305808606869,14.9294394517184,7,6
+Romania,ROU,2013,230030,19983693,FALSE,6.5231743991813,8.59317756731289,18.6758995425844,11.7813489072592,5.57032452251224,29.3361242771927,7.76094207330866,13.4041861985712,2.79204081615126,17.6130756334248,12.2089582261415,10.3241285326713,7,6
+Romania,ROU,2014,230080,19908979,FALSE,7.11545683495014,9.11681415752815,20.1977628577337,12.6541846988218,5.95357439468911,36.9316513728467,8.15239588018946,16.7720623206528,2.6751851435283,18.808626419716,13.834778706514,11.3632114367394,7,6
+Romania,ROU,2015,230080,19815616,FALSE,7.37148283877527,11.8370583375695,18.101537000522,13.7609019140314,6.46665726620175,46.9063349129238,7.64475282961107,18.7028657582974,3.28744630995393,17.0833801610352,15.5585020204838,12.0527342184164,7,6
+Romania,ROU,2016,230080,19702267,FALSE,7.91124254170751,16.7130499530524,19.5072770253729,16.2459604929296,7.36765281844238,49.1204898447212,5.49195272396415,21.6041157678654,3.46573300180896,18.54098199772,16.9222436547938,13.6769656562234,7,6
+Romania,ROU,2017,230080,19588715,FALSE,8.52453738996533,14.193536203207,22.6489605239615,19.1481869781116,8.38564798789444,46.9429465541529,4.78728337870706,23.4152578630094,3.76101126524602,21.4099761315831,17.1437803276216,14.4525419699773,7,6
+Romania,ROU,2018,230080,19473970,FALSE,9.50747058361988,19.9251137377355,26.1008044328585,20.4337743315998,8.87359722884476,,6.48239190085049,,,24.6917442456835,16.4899109973328,17.8832560539673,6,4
+Romania,ROU,2019,230080,19371648,FALSE,9.96013801786714,21.0312536580397,26.4533653454672,22.4995202758746,,,,,,25.0861910806449,19.9860693243122,22.8723216715197,4,3
+Romania,ROU,2020,230080,19286123,FALSE,10.6559525338161,1.2938102257128,24.6705428278509,,,,,,,23.5135132996964,12.2067685291266,12.4036617627046,3,2
+Russian Federation,RUS,1990,16389950,147969407,FALSE,0,,,,,,,,,,0,,1,0
+Russian Federation,RUS,1991,16389950,148394216,FALSE,0,,,,,,,,,,0,,1,0
+Russian Federation,RUS,1992,16389950,148538197,FALSE,0.0000118601422904892,0.805204536205704,,,,,,,1.40819094156468,,0.737802445970891,1.10669773888519,2,2
+Russian Federation,RUS,1993,16386180,148458777,FALSE,0.000237269714061765,0.659611752723876,,,,,,,0.843648489563712,,0.501165837333883,0.751630121143794,2,2
+Russian Federation,RUS,1994,16381330,148407912,FALSE,0.000949907905549487,0.295687035498946,2.21332768555882,,,,,,1.37323823063419,2.05060814465828,0.970800714899376,1.2398444702638,3,3
+Russian Federation,RUS,1995,16378380,148375787,FALSE,0.0026155123127038,0.789680412852636,2.78042499102007,2.5872867368546,,,,,1.7044775575391,2.5913412362893,1.57289704211582,1.91819648588391,4,4
+Russian Federation,RUS,1996,16377960,148160129,FALSE,0.00476924811911439,1.0367256862598,3.03384516292471,2.33269774234025,,,,,2.00343081480808,2.84458578395043,1.68229373089039,2.05436000683964,4,4
+Russian Federation,RUS,1997,16378650,147915361,FALSE,0.00837586528987637,2.38651479515982,3.10008087705834,2.35109687484514,,,,,2.05197259042973,2.95053502286924,1.97960820055658,2.43502982082598,4,4
+Russian Federation,RUS,1998,16381300,147670784,FALSE,0.0144169876494166,1.17944192012488,2.58846249663272,2.20510860156006,,,,,1.5546990334323,2.5455098625961,1.50842580787988,1.87118985442834,4,4
+Russian Federation,RUS,1999,16388510,147214776,FALSE,0.018131399120313,1.62418608904008,2.12383043070193,2.59383973669039,,,,,1.53680144910915,2.0688079437139,1.57935782093237,1.95590880463838,4,4
+Russian Federation,RUS,2000,16381340,146596869,FALSE,0.0353303235289622,1.75226332447138,2.75120828531131,3.27508549422682,,,,,1.61056308154502,2.63017848703681,1.8848901018167,2.31702259682001,4,4
+Russian Federation,RUS,2001,16380440,145976482,FALSE,0.0528353098415246,1.61894211705417,2.96851336439326,3.29608407274615,,,,,1.78187314566675,2.84463439906741,1.94364960194037,2.38538343363362,4,4
+Russian Federation,RUS,2002,16380940,145306497,FALSE,0.0744214874134205,2.1148232509952,3.28507200265655,3.65506121131519,,,,,1.80982515024736,3.12448914524926,2.18784062052554,2.67604968945175,4,4
+Russian Federation,RUS,2003,16380980,144648618,FALSE,0.150286259628969,5.35245620676016,4.11524763485797,3.61760670962536,1.19074764219735,,2.51842383331327,,1.90549001248325,4.10678673313913,2.9432517761115,3.50015269906423,6,5
+Russian Federation,RUS,2004,16381230,144067316,FALSE,0.233813702639216,8.88492168519422,5.49313398867525,3.92547924858448,1.4296736874534,,2.67879850562921,,2.35570216408204,5.33728942980185,3.92864154913407,4.63643820665836,6,5
+Russian Federation,RUS,2005,16381390,143518814,FALSE,0.277914549671543,10.2032114893291,7.26520139815565,4.28295555101499,1.50585307171547,,2.13615038841019,,2.3897025474317,7.13803935016468,4.42585598733553,5.23001186527014,6,5
+Russian Federation,RUS,2006,16377740,143049637,FALSE,0.330036598472828,20.7224711754163,9.14103909283088,4.37989081736509,1.65505904892629,,1.89102050847775,0.245464682287578,2.77129864841473,9.29960424406443,6.53929280682959,6.55162501267098,6,6
+Russian Federation,RUS,2007,16377740,142805114,FALSE,0.452339387858946,30.9197995369802,11.3830696010385,4.86385150540721,1.89304880209909,,2.27311016856691,0.418053762386275,,11.734849286205,9.97843403997036,10.0419328519091,6,5
+Russian Federation,RUS,2008,16376870,142742366,FALSE,0.492360127632141,40.0807186859087,15.0430122133525,5.12300460221318,2.17927945944756,,2.02143058062933,2.57054544258302,,15.6847384754838,12.5521052419472,13.0960875573636,6,5
+Russian Federation,RUS,2009,16376870,142785349,FALSE,0.532021819932382,24.5315261477302,9.96487814602369,4.73018607247677,2.15325029817175,,2.14712344380844,4.1117011803849,3.52262885219173,10.2934671849273,7.57139408036053,8.22277214691988,6,6
+Russian Federation,RUS,2010,16376870,142849468,FALSE,0.788505854503451,29.4085621784318,12.882668363914,5.23736851559074,2.43250742728065,,1.71692775374016,5.65109304654783,4.99844642246157,13.0954913519904,9.17207984810694,10.0179815447938,6,6
+Russian Federation,RUS,2011,16376870,142960908,FALSE,0.897829510750941,37.4083232155168,16.6081953500693,5.83269134926942,2.83447615167074,7.56653956187718,1.36237980563228,6.16003321047548,6.02837865082031,16.6906220964347,10.8149053491337,12.2470713880248,7,6
+Russian Federation,RUS,2012,16376870,143201721,FALSE,1.16704482005669,30.4467521580755,17.4415092725489,6.44486207913221,3.18025907670349,14.8707979539451,1.23415463399052,9.73704876983517,7.83296292092363,17.674250733041,11.3482976912389,12.2283385491663,7,6
+Russian Federation,RUS,2013,16376870,143506995,FALSE,1.24067860590202,47.5932829654203,17.8618950454831,7.18208507870098,3.44824525495755,16.6217075536538,1.60852805138193,10.9948152892737,8.74978418517718,18.0487599889203,14.4082802122456,15.6962092598124,7,6
+Russian Federation,RUS,2014,16376870,143819667,FALSE,1.28442609036463,24.1263515713454,16.6425532167646,6.61312690716121,3.63232768303469,16.9462308007675,1.70534546027155,13.5223123462609,8.54339924233389,16.951408296713,10.8373476127155,11.910323970681,7,6
+Russian Federation,RUS,2015,16376870,144096870,FALSE,1.27430639820005,8.80792865533142,11.2936465209738,5.75474764875209,3.34961242914585,12.9781155240018,1.32660936186023,14.2620291769325,7.82939097123157,11.5271481655871,7.03782072576442,8.25130899661582,7,6
+Russian Federation,RUS,2016,16376870,144342397,FALSE,1.32644017454018,16.667386857884,9.99405277269293,4.73090384909662,3.02438557517286,7.1806067153484,0.849584811232615,28.5695162402378,7.2694676267571,10.4485191696272,6.85977754393598,11.4225630924726,7,6
+Russian Federation,RUS,2017,16376870,144496739,FALSE,1.377898237223,19.8248807649679,12.3157105277093,5.38067668593262,3.42990399385518,6.0272298097294,1.07332722424818,38.2168724594665,8.95841851922437,12.7538060675047,7.85116310986211,14.3679969535574,7,6
+Russian Federation,RUS,2018,16376870,144477859,FALSE,1.46613139586186,12.1918704103027,14.233536076291,5.59124820210845,4.02606777298827,,0.898716963287106,,,14.5950236346708,6.87630060957022,8.31921480259225,6,4
+Russian Federation,RUS,2019,16376870,144406261,FALSE,1.49910046408332,16.3698660054018,13.9392853320224,5.86607650507776,,,,,,14.5593679746879,9.41858207664633,12.2651034950558,4,3
+Russian Federation,RUS,2020,16376870,144104080,FALSE,1.5450072004479,1.74150500659435,11.4493830803736,,,,,,,11.844237408312,4.91196509580529,6.79287120745319,3,2
+Rwanda,RWA,1990,24670,7288883,FALSE,0,0.0460921549836702,,,,,,,,,0.0230460774918351,0.0460921549836702,2,1
+Rwanda,RWA,1991,24670,7083928,FALSE,0,0.0283563653007692,,,,,,,,,0.0141781826503846,0.0283563653007692,2,1
+Rwanda,RWA,1992,24670,6702239,FALSE,0,0.0359916703000006,,,,,,,,,0.0179958351500003,0.0359916703000006,2,1
+Rwanda,RWA,1993,24670,6263758,FALSE,0,0.0408918820688581,,,,,,,,,0.0204459410344291,0.0408918820688581,2,1
+Rwanda,RWA,1994,24670,5936253,FALSE,0,0.00000738833911681956,,,,,,,,,0.00000369416955840978,0.00000738833911681956,2,1
+Rwanda,RWA,1995,24670,5836490,FALSE,0,0.0150292556818353,,,,,,,,,0.00751462784091765,0.0150292556818353,2,1
+Rwanda,RWA,1996,24670,6013112,FALSE,0.000384821590578908,0.0161924626630715,,,,,,,,,0.0082886421268252,0.0161924626630715,2,1
+Rwanda,RWA,1997,24670,6419898,FALSE,0.000663363666821067,0.0176941970324677,,,,,,,,,0.00917878034964436,0.0176941970324677,2,1
+Rwanda,RWA,1998,24670,6962800,FALSE,0.00442558233797728,0.0447232803980275,,,,,,,,,0.0245744313680024,0.0447232803980275,2,1
+Rwanda,RWA,1999,24670,7501238,FALSE,0.023458454981613,0.010173620331763,,,,,,,,,0.016816037656688,0.010173620331763,2,1
+Rwanda,RWA,2000,24670,7933688,FALSE,0.0207451762050408,0.0447784570054461,,,,,,,,,0.0327618166052434,0.0447784570054461,2,1
+Rwanda,RWA,2001,24670,8231150,FALSE,0.0765915546179217,0.0985758283561705,,,,,,,,,0.0875836914870461,0.0985758283561705,2,1
+Rwanda,RWA,2002,24670,8427061,FALSE,0.0910096329184376,0.00780682320572453,,,,,,,,,0.0494082280620811,0.00780682320572453,2,1
+Rwanda,RWA,2003,24670,8557160,FALSE,0.109258305457977,0.0240894801735641,,,0.521179275971046,,,,,,0.0666738928157707,0.0240894801735641,3,1
+Rwanda,RWA,2004,24670,8680516,FALSE,0.130016935720992,0.0389049092131998,,,0.502729677898916,,,,,,0.0844609224670959,0.0389049092131998,3,1
+Rwanda,RWA,2005,24670,8840220,FALSE,0.164762724747503,0.0394920081138264,,,0.562927068222502,0.543392504243121,,100,,,0.249215745701483,50.0197460040569,4,2
+Rwanda,RWA,2006,24670,9043342,FALSE,,0.148619311909434,,0.711841283884834,0.65756899456113,0.576408322236647,,0.00556956832010099,,,0.478956306010305,0.288676721371456,4,3
+Rwanda,RWA,2007,24670,9273759,FALSE,0.597515472969373,0.450374090002857,,0.797603014345854,0.714391679454458,2.25813734417853,2.72247543645258,0.0122340763510393,,,1.36522107158984,0.995671654288084,6,4
+Rwanda,RWA,2008,24670,9524532,FALSE,1.23761043498885,0.471030203876675,,0.851815428882148,0.926370772844014,1.27452335873708,,0.0204617989749875,,,0.958744856621188,0.44776914391127,5,3
+Rwanda,RWA,2009,24670,9782770,FALSE,2.06178785025342,0.532032695528942,,0.823082646732784,1.08050888123093,1.55994175723469,1.84344377783455,0.0262202390158468,,,1.36405774551688,0.806194839778031,6,4
+Rwanda,RWA,2010,24670,10039338,FALSE,2.08737272722524,0.944484607703262,0.527442978879334,0.805640694773209,1.28845031619921,2.03568809520321,0,0.119993484104962,,0.463060092533406,1.06677151729738,0.466635775822968,7,5
+Rwanda,RWA,2011,24670,10293333,FALSE,1.78138221099244,0.477766261647404,0.697959380809483,1.07014787022375,1.42591489527341,1.67783136726931,1.05120390954921,0.240943910632057,,0.615960789691751,1.12604850008193,0.691204548348835,7,5
+Rwanda,RWA,2012,24670,10549668,FALSE,1.99232109893198,1.12089612395859,0.763396489818716,1.22028993579488,1.83476229852994,2.72529885139067,1.02566183996424,0.42103288775612,,0.682945272363532,1.47464405664318,0.894165211967473,7,5
+Rwanda,RWA,2013,24670,10811538,FALSE,2.18057045937132,0.948307074333997,0.801665511440909,1.25923792308664,1.85216345432413,2.28608310003264,1.33442523988624,0.67827795041503,1.00774802301912,0.727945853084242,1.40257676159584,0.992657010637545,7,6
+Rwanda,RWA,2014,24670,11083629,FALSE,2.50518024839064,1.25750760046118,0.831149280712212,1.33570000211091,1.78983438233644,1.7972146175397,1.95249983410522,0.759619861577051,1.01191791311034,0.756084317889271,1.52730992806146,1.17888825487566,7,6
+Rwanda,RWA,2015,24670,11369066,FALSE,4.14727478636688,0.638601279238212,0.895727164666781,1.38547258967713,1.75540818263851,2.72635117304265,1.90347947525186,0.817361251424162,1.01946439813779,0.799138771564031,1.81662440948304,1.09391962754886,7,6
+Rwanda,RWA,2016,24670,11668829,FALSE,4.48970508107454,1.23097267280379,0.910126104617469,1.43208735751462,1.77474635443733,2.83130395910609,1.85458059105878,1.19635807128255,,0.84385412840359,2.12479596102921,1.31157056421266,7,5
+Rwanda,RWA,2017,24670,11980960,FALSE,4.75920787834895,1.06055923896859,0.966530926995778,1.59043057360933,1.90296771042464,2.75317788045845,1.80626458846234,1.41363407242978,1.20858575773279,0.891749354217868,2.02067954922517,1.32853726423678,7,6
+Rwanda,RWA,2018,24670,12301969,FALSE,5.32329426812589,1.36959681842124,1.02098622344914,1.68812658202769,1.94371448339964,,6.45014960942761,,,0.945967038531399,3.17043070029031,2.61346001210198,6,4
+Rwanda,RWA,2019,24670,12626938,FALSE,5.39374479441785,1.33799110721226,1.11008624300848,1.57056411643214,,,,,,1.01889394763942,2.35309656526768,1.30914972376127,4,3
+Rwanda,RWA,2020,24670,12952209,FALSE,,,0.990586092518587,,,,,,,0.891229743495971,0.990586092518587,0.891229743495971,1,1
+Saudi Arabia,SAU,1990,2149690,16233786,FALSE,0,6.75337757686656,13.5646938209499,,,,,,,13.2229692515694,6.77269046593881,9.98817341421797,3,2
+Saudi Arabia,SAU,1991,2149690,16772695,FALSE,0,0.752850505300349,16.5980580875837,,,,,,,15.8626029285163,5.783636197628,8.30772671690835,3,2
+Saudi Arabia,SAU,1992,2149690,17282686,FALSE,0,0.69586206956254,16.2207184158908,,,,,,9.44426767235621,15.332050258371,6.59021203945238,8.49072666676324,3,3
+Saudi Arabia,SAU,1993,2149690,17763297,FALSE,0,3.4865745824932,13.0236256687236,,,,,,9.64953336887289,12.4045458184741,6.53993340502242,8.5135512566134,3,3
+Saudi Arabia,SAU,1994,2149690,18214475,FALSE,0,1.53139074213094,11.3286781872116,,,,,,9.0654140722591,10.6725889252396,5.48137075040042,7.08979791320987,3,3
+Saudi Arabia,SAU,1995,2149690,18638790,FALSE,0.00153976595888316,4.69266090441579,12.7262862593437,2.86497349309566,,,,,9.36046723400656,11.9447958726142,5.92918553136412,7.21572437603306,4,4
+Saudi Arabia,SAU,1996,2149690,19033843,FALSE,0.0036790072178072,3.34319697592097,14.327605859913,,,,,,9.40787073446572,13.4008881506235,6.77058814437938,8.71731862033674,3,3
+Saudi Arabia,SAU,1997,2149690,19407138,FALSE,0.00703207098037691,7.60567644695554,14.5702877057357,,,,,,9.15403022607507,13.6969538177331,7.83425661243667,10.1522201635879,3,3
+Saudi Arabia,SAU,1998,2149690,19783301,FALSE,0.0134301945076793,9.77987731759688,10.7067717936784,,,,,,8.85125045667705,10.3088277555497,7.337832440615,9.64665184327456,3,3
+Saudi Arabia,SAU,1999,2149690,20194531,FALSE,0.0640241136294449,1.93209038648999,12.0126634818628,,,,,,0.891046736069615,11.4171408259069,3.72495617951296,4.74675931615549,3,3
+Saudi Arabia,SAU,2000,2149690,20663840,FALSE,0.280241381754718,7.28244727673825,15.7925776864133,,,,,,9.08818088317495,14.4525668262268,8.1108618070203,10.2743983287133,3,3
+Saudi Arabia,SAU,2001,2149690,21202646,FALSE,0.578320524078323,0.135013165365631,13.7556913693971,,,,,,8.655872003779,12.9083700288388,5.78122426565502,7.23308506599449,3,3
+Saudi Arabia,SAU,2002,2149690,21805322,FALSE,0.766996578982654,5.29832500069689,14.0820744415639,,,,,,8.61797192329877,13.0602211264754,7.19134198613555,8.99217268349036,3,3
+Saudi Arabia,SAU,2003,2149690,22456645,FALSE,0.933353432446389,2.06927420060371,16.5211085060811,,3.32607136290649,,0.803057913881904,,8.29135806810471,15.1382117855731,5.72363042422356,6.57547549204086,5,4
+Saudi Arabia,SAU,2004,2149690,23132686,FALSE,1.15892961753642,0.78314295191975,20.7351575110927,8.0421564340985,3.47029068927924,,,,8.75821610800922,18.8839170558185,7.89552052453132,9.1168581374615,5,4
+Saudi Arabia,SAU,2005,2149690,23816175,FALSE,1.39739434296211,22.9223361953552,28.3710726732864,7.8669145595516,3.4895092566952,,0.908659085003523,,8.87095158103793,25.6916422476853,11.7228880728661,13.2521007337267,6,5
+Saudi Arabia,SAU,2006,2149690,24498313,FALSE,2.08071120069446,32.8190930283903,33.4005211395402,6.59261576348451,3.68894741655523,,0.883358122813754,0.100093364501699,9.18612207928816,30.7145251131546,14.1604035557019,13.3826345786055,6,6
+Saudi Arabia,SAU,2007,2149690,25184589,FALSE,3.12033685668783,42.5856588141446,37.9290026499169,8.82374809844794,4.20678672146331,,0.716072296692493,0.359041528410111,,35.2084632312888,18.634963743178,17.5385967937968,6,5
+Saudi Arabia,SAU,2008,2149690,25888535,FALSE,3.64258856411465,72.7696260120758,46.6518145997143,10.5198663295548,4.78692224934138,,1.39320254981493,0.510149462080031,,43.6082911427589,26.9954196110549,25.7602270992569,6,5
+Saudi Arabia,SAU,2009,2149690,26630303,FALSE,3.73785614147277,63.6302046042124,33.047321245887,9.02433697901878,5.42890544715996,,1.0835167132112,1.4880316741652,10.3452820331142,31.3816065868419,20.1447529528194,19.4921630984273,6,6
+Saudi Arabia,SAU,2010,2149690,27421468,FALSE,3.91659125417918,53.0047998355075,38.4380646286714,14.0197844724014,6.27291196029455,,1.31531882147859,3.31851194801173,10.838935620167,35.9104692393382,20.2555824387342,19.7346366561507,6,6
+Saudi Arabia,SAU,2011,2149690,28267591,FALSE,4.4016945774505,30.6251299274596,49.1134651504496,13.5963960305183,7.45297743563487,92.3525309635358,1.65873225153374,3.37494887030881,12.3091961669939,45.2322554640069,29.1510207239917,17.7994431184702,7,6
+Saudi Arabia,SAU,2012,2149690,29154906,FALSE,4.85173652417273,24.9479471370815,50.9725468022881,16.6366841094067,8.22891592091076,,0.618557524640501,5.18529188725583,14.6144957459213,47.2616066113631,18.7736613072518,18.2107638359448,6,6
+Saudi Arabia,SAU,2013,2149690,30052058,FALSE,5.27346721398438,20.1518704984037,49.7005605320404,17.1659982637506,8.62028700889128,100,1.44021975358784,9.27475565385932,16.013800173341,46.1023066184633,29.9637023478726,18.3581584935676,7,6
+Saudi Arabia,SAU,2014,2149690,30916603,FALSE,5.48301292877225,19.0206003721389,48.0153223879121,17.8109374819315,9.42967128033611,100,0.816635032027325,31.3804027779103,18.1991110012209,44.6168050922537,29.9065170291433,21.9740819595804,7,6
+Saudi Arabia,SAU,2015,2149690,31717676,FALSE,5.7494231392382,18.7105396763025,35.4603899175799,17.9567833540405,10.2592443306463,73.5147912235386,0.796009804787749,42.7017616043294,17.2335327157857,33.3018333777231,24.2030671187533,21.7834100888282,7,6
+Saudi Arabia,SAU,2016,2149690,32443443,FALSE,6.04574445606493,22.1552416529178,29.7179492668447,18.1605149736409,11.4453852854117,66.1761713565516,0.222343682653983,39.6591699674709,18.9036944777492,28.1141973949889,23.0545228380604,21.2025270249036,7,6
+Saudi Arabia,SAU,2017,2149690,33101183,FALSE,7.45263707571664,11.5254321949016,32.2698953772146,17.3775820327855,11.0498950602383,48.6477303594115,0.980665122321328,100,21.2257367897011,29.9812719620193,19.9256684217217,30.1817813502881,7,6
+Saudi Arabia,SAU,2018,2149690,33702757,FALSE,7.25233510180382,30.58096821307,37.6189891625926,16.216728620041,10.7129104492113,,1.07017870891016,,,34.8919515883586,18.5478399612835,20.689956782595,6,4
+Saudi Arabia,SAU,2019,2149690,34268529,FALSE,7.31718115139755,23.1778719769967,35.6058857713583,16.8327185894182,,,,,,33.2279692346773,20.7334143722927,24.4128532670308,4,3
+Saudi Arabia,SAU,2020,2149690,34813867,FALSE,7.36339996081273,6.11540753216526,25.4204848729368,,,,,,,24.0499446547293,12.9664307886383,15.0826760934473,3,2
+Sudan,SDN,1990,2481353.271,20147592,FALSE,0,0.0677665218849231,0.127101990479162,,,,,,,0.114356891466477,0.0649561707880283,0.0910617066757002,3,2
+Sudan,SDN,1991,2481353.271,20891442,FALSE,0,0.00130161485039124,0.160505881278783,,,,,,,0.14010701223726,0.0539358320430582,0.0707043135438258,3,2
+Sudan,SDN,1992,2481353.271,21696240,FALSE,0,0.000181935419328481,0.116133248881664,,,,,,2.55455671610599,0.097005051771873,0.667717975101746,0.883914567765731,3,3
+Sudan,SDN,1993,2481353.271,22527837,FALSE,0,0.000311501190263317,0.071246100874576,,,,,,2.16021885554965,0.0506012955154162,0.557944114403623,0.73704388408511,3,3
+Sudan,SDN,1994,2481353.271,23338465,FALSE,0,0.186385034470819,0.155666297837477,,,,,,2.12696473086263,0.124085356439402,0.617254015792731,0.812478373924283,3,3
+Sudan,SDN,1995,2481353.271,24094741,FALSE,0,0.0218432977954338,0.154614765741797,0.111481874657405,,,,,2.21960678512716,0.122173679931612,0.501509344664359,0.618776409377902,4,4
+Sudan,SDN,1996,2481353.271,24782384,FALSE,0,0.000707906878486548,0.177774002521118,0.0171737746832452,,,,,2.07475454526856,0.142456470350494,0.454082045870282,0.558773174295197,4,4
+Sudan,SDN,1997,2481353.271,25413912,FALSE,0.000126966886741564,0.168954744913123,0.173278135899952,0.0128868638580786,,,,,2.25495624019641,0.139770182565092,0.522040590350861,0.644142007883176,4,4
+Sudan,SDN,1998,2481353.271,26015518,FALSE,0.000483818449728869,0.624955840842797,0.198831515196239,0.0153569530480203,,,,,2.14297617872929,0.162275548569501,0.596520861253214,0.736391130297401,4,4
+Sudan,SDN,1999,2481353.271,26626512,FALSE,0.000865198919494407,0.61077980591959,0.179299176910447,0.0163399183013864,,,,,2.61572244640585,0.154516075254037,0.684601309291353,0.849339561470215,4,4
+Sudan,SDN,2000,2481353.271,27275019,FALSE,0.00247638238936313,0.630669386773535,0.303245251106883,0.0154714692658938,,,,,3.39505930379003,0.29711681075413,0.869384358665141,1.0845792426459,4,4
+Sudan,SDN,2001,2481353.271,27971077,FALSE,0.0131282895017534,0.900040239491468,0.287890123438194,0.0202619504589697,,,,,3.21289951993101,0.282957548321108,0.88684402456428,1.10403981455064,4,4
+Sudan,SDN,2002,2481353.271,28704786,FALSE,0.0401049115822797,1.0896927590864,0.399644341607292,0.0205533050005407,,,,,2.98092053538728,0.385399183895664,0.90618317053276,1.11914144584247,4,4
+Sudan,SDN,2003,2481353.271,29460517,FALSE,0.0478781780883072,2.00859312832393,0.450158463185578,0.0199887851171879,0.388474375527942,,,,3.17371796603778,0.444341932643267,1.14006730415056,1.41166045303054,5,4
+Sudan,SDN,2004,2481353.271,30214189,FALSE,0.0686260304044744,2.19347588833488,0.640397268144446,0.0230724807713235,0.472106604408344,,,,3.72366626818194,0.628071466609784,1.32984758716741,1.64207152597448,5,4
+Sudan,SDN,2005,2481353.271,30949514,FALSE,0.109354698436151,2.21309581935268,0.932916928766799,0.0951039231753,0.505585927847408,,0.582690457966044,,3.76415881719717,0.905676459185064,1.28288677414903,1.51214509537525,6,5
+Sudan,SDN,2006,2481353.271,31661824,FALSE,,2.55137170236802,1.15108965719528,0.12439326663321,0.558806177912357,3.06896960050659,1.02524654535619,0.00457106284943449,3.96839466063408,1.27696235377941,1.98157757211556,1.49182326527006,6,6
+Sudan,SDN,2007,2481353.271,32360619,FALSE,0.700997010245544,2.0389186907301,1.44187808409766,0.162218214029574,0.652281588127031,2.24710856446898,,,,1.49378591789945,1.31822411271437,1.23164094088638,6,3
+Sudan,SDN,2008,2481353.271,33060844,FALSE,,2.19305614161414,1.63418701056777,0.160221440342885,0.803384269667187,2.14099560436757,0.545478708483259,0.0401338400182926,,1.78284545794314,1.33478778107513,0.944347117680344,6,5
+Sudan,SDN,2009,2481353.271,33783779,FALSE,,2.24112904588837,1.33775863620232,0.149570189754793,0.856887145318373,0.980363915942978,0.106761215117388,0.164983328502106,3.10345734870367,1.41911081771348,1.31984005860159,1.19750199094664,6,6
+Sudan,SDN,2010,2481353.271,34545014,FALSE,1.26632794854256,2.62015472111966,1.57419090729244,0.172616428248222,0.911041494920743,5.09820625544162,0.939677595026468,0.282437572711164,3.6615117029226,1.63729542938668,2.19038365122765,1.55228224156913,7,6
+Sudan,SDN,2011,1849374.861,35349676,FALSE,1.29382010582928,2.15187623639665,1.4714590818517,0.182743793386978,0.909531067899719,6.19638403771215,0.510159880573912,0.2760059396699,4.12202060486614,1.50301327410707,2.27549482008812,1.45763662150011,7,6
+Sudan,SDN,2012,1849379.89,36193781,FALSE,,2.80099149435727,0.988533029985298,0.191537811526843,0.939535377153037,,0.199304808596665,0.269566387635029,5.27493542715488,0.972030832474923,1.89106051432419,1.6180611269576,5,6
+Sudan,SDN,2013,1849378.197,37072555,FALSE,,1.99686795283962,1.05874602708472,0.19220600968807,0.835425396928778,8.78492052578911,0.0972902271585354,0.395806183892641,5.31522483491265,1.07441717137175,2.90754259624545,1.51196872997721,6,6
+Sudan,SDN,2014,1849349.416,37977657,FALSE,,1.44505995724356,0.994195131971689,0.217338651420138,0.755052197919035,7.63279022199284,0,0.45806281857221,4.99866970063718,0.913947202189872,2.54800894387757,1.33884638834383,6,6
+Sudan,SDN,2015,1849351.206,38902948,FALSE,,1.94856225155622,0.897534944789433,0.229933776771473,0.812461792846358,7.3011666918575,0.185425397442749,0.435318454831732,4.91949200873833,0.837182445273705,2.58035251185929,1.4259857224357,6,6
+Sudan,SDN,2016,1849240.201,39847433,FALSE,0.926902077810924,1.17086171607782,0.785041219084391,0.242436163733567,0.815482729653685,6.25731531856654,0.18103034628591,0.424997673542464,4.9535792336483,0.719840045741059,2.07388086788678,1.28212419650485,7,6
+Sudan,SDN,2017,1849238.953,40813398,FALSE,,1.14479513871516,0.892450354981448,0.240533230349489,0.857810309107216,5.81516879919439,0.353491497796611,0.474256999170194,4.64791668315358,0.853799484244974,2.18239261736511,1.285798838905,6,6
+Sudan,SDN,2018,1849233.715,41801532,FALSE,,1.19169188101073,0.72787016030788,0.241497022466945,0.781775595606438,,0.0862838543165666,,,0.728331422175748,0.561835729525531,0.561951044992498,5,4
+Sudan,SDN,2019,1849233.715,42813237,FALSE,1.55407060394411,0.845516214518994,0.803311933199859,,,,,,,0.779913501859165,1.06763291722099,0.81271485818908,3,2
+Sudan,SDN,2020,1849233.715,43849269,FALSE,,,0.821887883165626,,,,,,,0.783024814892777,0.821887883165626,0.783024814892777,1,1
+Senegal,SEN,1990,192530,7526306,FALSE,0,0.387190274922744,1.02042831435482,,,,,,,0.963538700256311,0.469206196425855,0.675364487589527,3,2
+Senegal,SEN,1991,192530,7755503,FALSE,0,0.150949092635678,0.908425699292342,,,,,,,0.85303739713976,0.353124930642673,0.501993244887719,3,2
+Senegal,SEN,1992,192530,7990090,FALSE,0,0.399206677444951,0.927309059468929,,,,,,,0.869690826046034,0.442171912304627,0.634448751745493,3,2
+Senegal,SEN,1993,192530,8226749,FALSE,0,0.00602483412201163,0.79093372427928,,,,,,,0.741918647154272,0.265652852800431,0.373971740638142,3,2
+Senegal,SEN,1994,192530,8461066,FALSE,0,0.436851724915858,0.747120870083438,,,,,,,0.697484817688731,0.394657531666432,0.567168271302294,3,2
+Senegal,SEN,1995,192530,8690155,FALSE,0.000208845700512552,0.176642376649579,0.888219984355334,,,,,,,0.836843585373463,0.355023735568475,0.506742981011521,3,2
+Senegal,SEN,1996,192530,8912872,FALSE,0.00330289612423263,0.104073107419275,0.781218426228777,,,,,,,0.726096974677094,0.296198143257428,0.415085041048185,3,2
+Senegal,SEN,1997,192530,9130876,FALSE,0.00784547681021881,0.868101647789279,0.713162061468898,,,,,,,0.658720711666986,0.529703062022799,0.763411179728132,3,2
+Senegal,SEN,1998,192530,9347777,FALSE,0.0223819506245607,0.384260143301206,0.76844306880276,,,,,,,0.713692929491308,0.391695054242842,0.548976536396257,3,2
+Senegal,SEN,1999,192530,9568717,FALSE,0.0851625709266457,0.830227502972649,0.782638894328052,,,,,,,0.733342782548632,0.566009656075782,0.781785142760641,3,2
+Senegal,SEN,2000,192530,9797731,FALSE,0.108003043503235,0.451421752108889,0.71633114549876,,,,,,,0.674590694058913,0.425251980370294,0.563006223083901,3,2
+Senegal,SEN,2001,192530,10036102,FALSE,0.25677587808034,0.22353716614037,0.743963734003604,,,,,,,0.688185649295283,0.408092259408105,0.455861407717827,3,2
+Senegal,SEN,2002,192530,10283694,FALSE,0.256365813046368,0.516655007465548,0.812233813968805,,,,,,,0.752253812409732,0.528418211493574,0.63445440993764,3,2
+Senegal,SEN,2003,192530,10541470,FALSE,0.522191951324056,0.511968743858287,0.990633790468146,0.577050086279549,1.72550862828039,6.66092072307699,7.18521641130158,100,,0.929212661414105,2.74133028438477,21.8406895805707,7,5
+Senegal,SEN,2004,192530,10810086,FALSE,1.0628132173845,0.856427824663364,1.16585336760683,0.759333342584706,1.93358821367165,9.72106864966081,5.67206903386838,100,,1.09434689783963,3.20626090596143,21.6764354197912,7,5
+Senegal,SEN,2005,192530,11090123,FALSE,1.13061175475939,1.12134842149688,1.28232908866709,0.851852017244655,2.2845376701039,10.0148685913863,3.57748694674264,100,,1.20533434650264,2.99641613671615,21.3512043463974,7,5
+Senegal,SEN,2006,192530,11382272,FALSE,1.29146776698518,1.42211706236477,1.33127662313102,0.933475422307994,2.38886432827619,10.9429160567942,3.16878501699599,0.0798391641506382,,1.22913826602299,3.18167299142985,1.36667098636848,7,5
+Senegal,SEN,2007,192530,11687078,FALSE,1.54428827234132,1.61304920788549,1.67723391095256,0.912210227124569,2.5351890972708,13.1184295279336,4.01198356551269,0.106953415696964,,1.54153622011409,3.8128657852917,1.63714652726676,7,5
+Senegal,SEN,2008,192530,12004700,FALSE,1.55361632553337,2.3346289816843,2.08853093526947,0.886012525796693,2.55115835405159,14.6794794465537,3.00448765674885,0.177174609922741,,1.92660597052995,4.09112597859772,1.66578194893651,7,5
+Senegal,SEN,2009,192530,12335092,FALSE,1.59269994251431,1.49001444262561,1.61361373583658,0.801182587425825,2.15945990306974,13.5639955702315,4.9708225973551,0.277138244867921,,1.48759122129627,4.00538814599815,1.80534981871414,7,5
+Senegal,SEN,2010,192530,12678143,FALSE,1.65291086719845,0.968831251029879,1.56925211573874,0.866658997759838,1.98864069689491,14.1404708947896,3.98285160233342,0.312471724268527,,1.45423515290203,3.86349595480832,1.51700974565874,7,5
+Senegal,SEN,2011,192530,13033814,FALSE,1.96956197297507,1.29951219502394,1.85947464514722,0.909144088934861,1.95406163867575,13.451821924732,2.49053543925636,0.517905027170263,,1.74742415753808,3.66334171101158,1.3929041815847,7,5
+Senegal,SEN,2012,192530,13401990,FALSE,2.11090923510647,1.08698475486218,1.93325588509246,0.875064098739091,1.76900199420225,12.5715145423823,0.807372031458902,0.739139082017931,,1.80344203556098,3.23085009127356,1.06240040052782,7,5
+Senegal,SEN,2013,192530,13782429,FALSE,2.48977800340752,1.09690483516039,1.98273665072625,0.940773161459341,1.87341639393733,13.2130180156708,2.6169532941525,1.14471533189502,,1.85967917652587,3.72336066009614,1.53180515983862,7,5
+Senegal,SEN,2014,192530,14174740,FALSE,3.27094512869856,1.33221856423219,1.93229789168023,0.834993017595259,1.83845319716287,11.9541158505427,2.29007203487864,1.24246527077484,,1.82313308801578,3.60244041460459,1.50457639509934,7,5
+Senegal,SEN,2015,192530,14578450,FALSE,3.89909194213833,1.32532852373098,1.67233315990735,0.843494657792978,1.5789939042117,10.290608730541,1.48443653363587,1.28356595592622,,1.59072146474988,3.25254892462442,1.30550942716719,7,5
+Senegal,SEN,2016,192530,14993514,FALSE,4.48382865271502,2.03673692983888,1.61974071089099,0.986197979848829,1.59930780818718,7.72591728005103,2.64612887080842,1.36060748215946,,1.56130133433557,3.24975840402553,1.71819451939823,7,5
+Senegal,SEN,2017,192530,15419354,FALSE,5.03585110330385,1.90777310938076,1.85953321476646,1.08261241159957,1.52630680763048,6.45303186980999,2.10522280477351,1.48009148366391,,1.78728351623811,3.07400408560569,1.67259666513117,7,5
+Senegal,SEN,2018,192530,15854324,FALSE,5.83232974820495,2.4915379198405,2.13628191573423,,0.0681882180088576,,3.41244189657405,,,2.05595014339013,3.46814787008843,2.65330998660156,5,3
+Senegal,SEN,2019,192530,16296362,FALSE,6.34923682240813,2.95299797719565,,,,,,,,,4.65111739980189,2.95299797719565,2,1
+Senegal,SEN,2020,192530,16743930,FALSE,,,,,,,,,,,,,0,0
+Singapore,SGP,1990,670,3047132,TRUE,0,100,100,,,,,,,100,66.6666666666667,100,3,2
+Singapore,SGP,1991,670,3135083,TRUE,0.134943096976065,75.7255184361281,100,,,,,,,100,58.6201538443681,87.8627592180641,3,2
+Singapore,SGP,1992,670,3230698,TRUE,0.382189692359874,47.8043455065285,100,,,,,,,100,49.3955117329628,73.9021727532643,3,2
+Singapore,SGP,1993,670,3313471,TRUE,0.603413113331579,90.5144284072294,100,,,,,,,100,63.7059471735203,95.2572142036147,3,2
+Singapore,SGP,1994,670,3419048,TRUE,0.908035714217821,100,100,,,,,,,100,66.9693452380726,100,3,2
+Singapore,SGP,1995,670,3524506,TRUE,2.13557956667939,100,100,34.4794606645372,,,,,,100,59.1537600578041,78.1598202215124,4,3
+Singapore,SGP,1996,670,3670704,TRUE,5.95868014293708,100,100,35.0686390345539,,,,,,100,60.2568297943727,78.356213011518,4,3
+Singapore,SGP,1997,670,3796038,TRUE,9.29617691691417,100,100,34.7811735424072,,,,,2.97837554520806,100,49.4111452009059,59.4398872719038,4,4
+Singapore,SGP,1998,670,3927213,TRUE,13.0671862194243,100,100,30.8911091492003,,,,,,100,60.9895738421561,76.9637030497334,4,3
+Singapore,SGP,1999,670,3958723,TRUE,15.9836101080581,100,100,33.5358896301202,,,,,,100,62.3798749345446,77.8452965433734,4,3
+Singapore,SGP,2000,670,4027887,TRUE,23.4120970952467,100,100,36.5972621355892,,,,,,100,65.002339807709,78.8657540451964,4,3
+Singapore,SGP,2001,670,4138012,TRUE,26.3785719143888,100,100,34.8893348897514,,,,,2.99712167733238,100,52.8530056962945,59.4716141417709,4,4
+Singapore,SGP,2002,675,4175950,TRUE,29.482048875346,94.4457914568311,100,34.8079876533457,,,,,4.50480076240601,100,52.6481257495858,58.4396449681457,4,4
+Singapore,SGP,2003,687,4114826,TRUE,34.2729967151497,100,100,30.5483406117861,45.9672739961444,,100,,3.20972491341887,100,61.3385103733925,66.751613105041,6,5
+Singapore,SGP,2004,689,4166664,TRUE,38.9778879793568,100,100,39.3404680181632,53.3930205666106,,100,,3.53611083540618,100,63.642411138821,68.5753157707139,6,5
+Singapore,SGP,2005,689,4265762,TRUE,37.4583210683213,100,100,40.157966447097,58.8405174248511,,100,,3.95857383625514,100,63.5958102252789,68.8233080566704,6,5
+Singapore,SGP,2006,694,4401365,TRUE,35.1139527196438,100,100,42.1830542275488,59.6540012364982,,100,11.0112255220617,4.14572481102157,100,63.573788626369,59.556667426772,6,6
+Singapore,SGP,2007,695,4588599,TRUE,39.9036078280009,100,100,43.1753580950022,57.6514026520966,100,100,16.7202611789702,,100,80.5131609871672,71.9791238547945,7,5
+Singapore,SGP,2008,700,4839396,TRUE,37.3484878975889,100,100,42.5317529011928,57.6225460586735,100,100,25.7951595016569,,100,79.9800401331303,73.6653824805699,7,5
+Singapore,SGP,2009,700,4987573,TRUE,36.238892731523,100,100,40.5374300559943,59.4647550041204,100,100,57.9739724243732,3.84689782695419,100,68.6604600877817,67.059716717887,7,6
+Singapore,SGP,2010,702,5076732,TRUE,36.6344102904761,100,100,45.4247905097836,63.7304666522976,100,100,89.8717147300508,3.80307020654865,100,69.4088958581155,73.1832625743972,7,6
+Singapore,SGP,2011,704,5183688,TRUE,35.8785256795527,100,100,49.0338874176922,70.352899816872,100,100,100,3.75565005711625,100,69.8097233077659,75.4649229124681,7,6
+Singapore,SGP,2012,706,5312437,TRUE,35.5020799428518,100,100,51.5499536798929,74.8084403829243,100,100,100,,100,81.1753389371241,90.3099907359786,7,5
+Singapore,SGP,2013,707,5399162,TRUE,39.2507806437003,100,100,54.4816021017482,77.5646617485714,100,100,100,,100,82.2887304575747,90.8963204203496,7,5
+Singapore,SGP,2014,709,5469724,TRUE,37.8475232233258,100,100,53.2967999818901,76.0786856969065,100,100,100,2.40583976516784,100,70.5071661386263,75.950439957843,7,6
+Singapore,SGP,2015,709,5535002,TRUE,37.39345784632,100,100,53.4550366271629,75.7327584612888,100,100,100,2.80594752922434,100,70.5220631432439,76.0434973593979,7,6
+Singapore,SGP,2016,709,5607283,TRUE,39.4524460934128,100,100,56.0600565727111,77.9939452229005,100,100,100,3.16837855806021,100,71.2401258891692,76.5380725217952,7,6
+Singapore,SGP,2017,709,5612253,TRUE,39.4175084922241,100,100,59.1208580492586,80.8716402957221,100,100,100,3.62002471841783,100,71.7369130371286,77.1234804612794,7,6
+Singapore,SGP,2018,709,5638676,TRUE,40.9578638711414,100,100,62.2305248734915,83.466047776598,,100,,,100,80.6376777489266,90.5576312183729,6,4
+Singapore,SGP,2019,709,5703569,TRUE,40.8517530380312,100,100,63.5266975408966,,,,,,100,76.094612644732,87.8422325136322,4,3
+Singapore,SGP,2020,709,5685807,TRUE,34.9564396661559,100,100,,,,,,,100,78.318813222052,100,3,2
+Solomon Islands,SLB,1990,27990,311869,TRUE,0,1.46818006054536,1.91322084223055,,,,,,,1.72902775508188,1.12713363425864,1.59860390781362,3,2
+Solomon Islands,SLB,1991,27990,320781,TRUE,0,1.98434401690501,2.18918326554191,,,,,,,1.98086928824043,1.39117576081564,1.98260665257272,3,2
+Solomon Islands,SLB,1992,27990,330004,TRUE,0,1.88365867937574,2.18528750845751,,,,,,,1.97615025931557,1.35631539594442,1.92990446934566,3,2
+Solomon Islands,SLB,1993,27990,339501,TRUE,0,3.01920397144816,2.73474799180559,,,,,,,2.41409046783589,1.91798398775125,2.71664721964202,3,2
+Solomon Islands,SLB,1994,27990,349273,TRUE,0,0.263249849925971,3.01201335203224,,,,,,,2.65993041233479,1.09175440065274,1.46159013113038,3,2
+Solomon Islands,SLB,1995,27990,359276,TRUE,0.181341007653473,0.247313722421507,2.93573285036325,0.397532265911128,,,,,,2.61103152138194,0.940479961587339,1.08529250323819,4,3
+Solomon Islands,SLB,1996,27990,369517,TRUE,1.90467905042222,0.705562813474541,2.91289303127664,0.337161700395958,,,,,,2.60453519271534,1.46507414889234,1.21575323552861,4,3
+Solomon Islands,SLB,1997,27990,379998,TRUE,2.70168559076104,3.90947010789162,3.26362117880328,0.439711806472959,,,,,,2.92139716264516,2.57862217098223,2.42352635900325,4,3
+Solomon Islands,SLB,1998,27990,390702,TRUE,3.40787310411994,0.988381494069433,2.50929981781526,0.489810573070271,,,,,,2.24934675454386,1.84884124726873,1.24251294056119,4,3
+Solomon Islands,SLB,1999,27990,401592,TRUE,3.22576541424106,1.08126240419976,2.48287273145868,,,,,,,2.30733420572977,2.26330018329983,1.69429830496477,3,2
+Solomon Islands,SLB,2000,27990,412665,TRUE,3.05513522559909,1.37841177497203,1.64147067697774,0.151623413294991,,,,,,1.51967468203443,1.55666027271096,1.01656995676715,4,3
+Solomon Islands,SLB,2001,27990,423949,TRUE,2.89507114914078,1.0389466179403,1.43549701388546,,,,,,,1.31382476431565,1.78983826032218,1.17638569112798,3,2
+Solomon Islands,SLB,2002,27990,435434,TRUE,3.01944499444376,0.187285958767992,0.890839930569067,,,,,,,0.829275783083031,1.36585696126027,0.508280870925512,3,2
+Solomon Islands,SLB,2003,27990,447016,TRUE,3.25583200009881,0.179348983726516,1.30289451478708,0.177906158494953,1.39610693894094,,,,,1.17683215338832,1.22899541427684,0.51136243186993,5,3
+Solomon Islands,SLB,2004,27990,458549,TRUE,3.71128189382057,1.11689382559733,1.4349366819463,0.146902902882833,2.4407251720472,,,,,1.32977245458307,1.60250382606176,0.864523061021076,5,3
+Solomon Islands,SLB,2005,27990,469918,TRUE,4.70645269444458,1.5870760430295,1.96621973672089,0.241548312929714,3.12231631428869,,,,,1.77908175877711,2.12532419678117,1.20256870491211,5,3
+Solomon Islands,SLB,2006,27990,481086,TRUE,8.96425109090299,4.47170459499536,2.10435847117387,0.288934597721956,3.27396701743842,,,,,2.00069279920154,3.95731218869854,2.25377733063962,5,3
+Solomon Islands,SLB,2007,27990,492133,TRUE,10.6454151319846,8.74878613156395,2.79605879336929,0.336721667719873,4.05212545131213,,,,,2.70223588127585,5.63174543115944,3.92924789351989,5,3
+Solomon Islands,SLB,2008,27990,503366,TRUE,15.6117817407681,6.87918242870967,3.09686402794867,0.391921997168211,5.55399165370608,,,0.0436274876529399,,3.10544681528595,6.49493754864867,2.60504468220419,5,4
+Solomon Islands,SLB,2009,27990,515182,TRUE,20.3382885471503,4.39004745729368,2.63020454768851,0.43005958181535,4.81279452691604,,0,0.0426243186287502,,2.62807434844179,5.55772002678957,1.49816114123591,6,5
+Solomon Islands,SLB,2010,27990,527861,TRUE,24.8122142247154,13.9764741856186,3.92027859925617,0.470324668719272,4.11669444331384,,13.6657085759217,0.138918572020716,,3.74892283361047,11.3690000508462,6.40006976717814,6,5
+Solomon Islands,SLB,2011,27990,541522,TRUE,29.0235304483418,10.0223681293992,5.08811004269239,0.512262281764462,3.84531000285918,,6.66048156362493,0.174712738315643,,4.95705075630619,10.2613504931646,4.46537509388208,6,5
+Solomon Islands,SLB,2012,27990,556066,TRUE,32.9629030545129,2.08407281495484,5.42829816618442,0.520672219970086,3.32150677883858,,0,0.183337963664065,,5.21252543342623,8.19918925112445,1.60012168640304,6,5
+Solomon Islands,SLB,2013,27990,571329,TRUE,36.679111931297,4.33419067349561,5.40857849970064,0.51735500436079,3.00104018501759,,18.938985929109,0.2779873936414,,4.94082747801226,13.1756444075926,5.8018692957238,6,5
+Solomon Islands,SLB,2014,27990,587079,TRUE,40.1569812293924,1.62078212372165,5.11997343713303,0.414460083323988,2.93717193444399,,0,0.275526876664589,,4.85013554353595,9.46243937471421,1.43218092544924,6,5
+Solomon Islands,SLB,2015,27990,603133,TRUE,43.4332368342889,2.68598027837934,4.56046219983908,0.433601577032932,3.96435534520344,,0,0.504854715495304,,4.42734288970338,10.222656177908,1.61035589212219,6,5
+Solomon Islands,SLB,2016,27990,619438,TRUE,46.520626675434,2.74077855501014,4.57708763773037,0.453527979377743,4.16859965796059,0.0995297794497278,5.82269298508858,0.929922777539279,,4.42075249759748,10.0357072686818,2.87353495892264,7,5
+Solomon Islands,SLB,2017,27990,636030,TRUE,49.1097590455746,3.44142216062576,4.80478196676329,0.489408126904566,4.27561332510917,,0,1.03835389635935,,4.56888132041611,11.5690742599737,1.90761310086116,6,5
+Solomon Islands,SLB,2018,27990,652856,TRUE,,2.28735928173662,5.2577350495142,0.517693481515412,4.3005255316455,,0,,,4.93273321178082,2.01569695319156,1.93444649375821,5,4
+Solomon Islands,SLB,2019,27990,669821,TRUE,,2.41189757047958,4.81774658757831,0.522680836427038,,,,,,4.57258636281143,2.58410833149497,2.50238825657268,3,3
+Solomon Islands,SLB,2020,27990,686878,TRUE,,0.212414428566221,3.43211457789106,,,,,,,3.23058924058291,1.82226450322864,1.72150183457457,2,2
+Sierra Leone,SLE,1990,72180,4319763,FALSE,0,0.330832338929893,0.199651124565966,,,,,,,0.196568975968731,0.176827821165286,0.263700657449312,3,2
+Sierra Leone,SLE,1991,72180,4348663,FALSE,0,0.0756873349810328,0.195304254706115,,,,,,,0.169431613768807,0.090330529895716,0.12255947437492,3,2
+Sierra Leone,SLE,1992,72180,4347727,FALSE,0,0.0599337247782088,0.18410256872732,,,,,,,0.158103833862182,0.0813454311685095,0.109018779320196,3,2
+Sierra Leone,SLE,1993,72180,4328965,FALSE,0,0.0765226911154656,0.199664945413404,,,,,,,0.164889156675638,0.0920625455096231,0.120705923895552,3,2
+Sierra Leone,SLE,1994,72180,4309780,FALSE,0,0.0311831133735244,0.249593331698193,,,,,,,0.233503995428091,0.0935921483572393,0.132343554400808,3,2
+Sierra Leone,SLE,1995,72180,4303953,FALSE,0,0.0807799581862138,0.180163513346766,,,,,,,0.15923476915715,0.0869811571776598,0.120007363671682,3,2
+Sierra Leone,SLE,1996,72180,4312660,FALSE,0.00152219763356644,0.00675203873153037,0.210879310285404,,,,,,,0.177316752158426,0.0730511822168334,0.0920343954449784,3,2
+Sierra Leone,SLE,1997,72180,4335295,FALSE,0.00301375898022039,0.0182104558215349,0.0552460333696171,0.015359375209202,,,,,,0.0398833606481459,0.0229574058451436,0.0244843972262942,4,3
+Sierra Leone,SLE,1998,72180,4381484,FALSE,0.00885124133661521,0.00104990784206117,0.0605803677705884,0.0179547060496665,,,,,,0.0557472460576018,0.0221090557497328,0.0249172866497765,4,3
+Sierra Leone,SLE,1999,72180,4462374,FALSE,0.0284647377479667,0.00622350996105381,0.0791787494665804,0.0339367476463773,,,,,,0.0651396537342789,0.0369509362054946,0.0350999704472367,4,3
+Sierra Leone,SLE,2000,72180,4584570,FALSE,0.0675667810387222,0.373107864495324,0.122746634066033,0.0329934709462961,,,,,,0.102934580324085,0.149103687636594,0.169678638588568,4,3
+Sierra Leone,SLE,2001,72180,4754069,FALSE,0.088305305457657,0.0907404380496458,0.143649634257749,0.0496522594356351,,,,,,0.120464087165128,0.0930869093001717,0.0869522615501362,4,3
+Sierra Leone,SLE,2002,72180,4965770,FALSE,0.0929462402374539,0.0919741044998283,0.173289216965601,0.0645979026241521,,,,,,0.154736917695593,0.105701866081759,0.103769641606524,4,3
+Sierra Leone,SLE,2003,72180,5201074,FALSE,0.0957792788239297,0.072648052356073,0.232327539155393,0.0289103621731801,0.680256344902682,,,,,0.197114757271099,0.107416308127144,0.0995577239334507,5,3
+Sierra Leone,SLE,2004,72180,5433995,FALSE,0.0978607026448919,0.493582765532605,0.21405977917825,0.0611420936602237,0.617174646865926,,,,,0.202960510641531,0.216661335253993,0.252561789944787,5,3
+Sierra Leone,SLE,2005,72180,5645629,FALSE,0.0999382041811442,0.76351823533017,0.268238561320276,0.134106732394523,0.887022881238478,,,,,0.244226017996039,0.316450433306528,0.380616995240244,5,3
+Sierra Leone,SLE,2006,72180,5829240,FALSE,0.102307612160431,0.443690648288661,0.268087461006784,0.138172705262753,0.970866741538106,,,,,0.244328742664365,0.238064606679657,0.27539736540526,5,3
+Sierra Leone,SLE,2007,72180,5989641,FALSE,0.104888123937204,0.707189629798004,0.293244983660407,0.142546204963694,0.579773023505774,,,,,0.310515799694596,0.311967235589827,0.386750544818764,5,3
+Sierra Leone,SLE,2008,72180,6133599,FALSE,0.10676765967968,0.412045560679541,0.325845709170882,0.143127599908607,0.503772805490363,,,,,0.309553839203971,0.246946632359678,0.28824233326404,5,3
+Sierra Leone,SLE,2009,72180,6272735,FALSE,0.108575415838445,0.775033292888419,0.393105048320143,0.137984012155364,0.451129691755771,,0.574995962255268,,,0.350077970777264,0.397938746291528,0.459522809519079,6,4
+Sierra Leone,SLE,2010,72180,6415636,FALSE,0.236811817985498,1.63002412451295,0.54618092550158,0.142452175880114,0.57208006842132,,0,0.0193352069974192,,0.487070079673984,0.511093808776029,0.455776317412894,6,5
+Sierra Leone,SLE,2011,72180,6563238,FALSE,0.359202582371239,6.35159858762272,1.07600551207863,0.181786775702607,0.701830887967759,,0.549545406900877,0.0172206173791695,,1.00491132007686,1.70362777293521,1.62101254153645,6,5
+Sierra Leone,SLE,2012,72180,6712586,FALSE,0.975585282100853,4.72036515283929,1.30549056478413,0.322488173920748,0.662797702785884,,0,0.016835005833934,,1.19393531319374,1.464785834729,1.25072472915754,6,5
+Sierra Leone,SLE,2013,72180,6863975,FALSE,1.52650908115166,2.74544712206061,1.37814488338483,0.363128435450399,0.848467858878785,,0,,,1.33453503789964,1.2026459044095,1.11077764885266,6,4
+Sierra Leone,SLE,2014,72180,7017153,FALSE,2.26116970807032,2.34440874584661,1.47073762568863,0.251299111938522,0.701353374302558,,0.513997243226319,,,1.39354950236322,1.36832248695408,1.12581365084367,6,4
+Sierra Leone,SLE,2015,72180,7171909,FALSE,2.31724716121426,1.54374459120222,0.977762608344025,0.154378645381025,0.312957211022758,,0,,,0.879404208523509,0.998626601228306,0.644381861276689,6,4
+Sierra Leone,SLE,2016,72180,7328846,FALSE,4.20797783456765,0.828901817853932,0.672739031620511,0.250494975911988,0.523939087676776,,0.984274276549759,,,0.607564002250911,1.38887758730077,0.667808768141648,6,4
+Sierra Leone,SLE,2017,72180,7488427,FALSE,4.63032825002261,2.42314742286213,0.712777312929769,0.2727038004352,0.493088186544751,,0.481649523631238,0.015079303459938,,0.646232225625619,1.70412126197619,0.767762455202825,6,5
+Sierra Leone,SLE,2018,72180,7650149,FALSE,5.4100625586086,1.43583164807589,0.693138984125558,0.281199635946136,0.588673608019553,,0.471467588055775,,,0.6224546312612,1.65834008296239,0.70273837583475,6,4
+Sierra Leone,SLE,2019,72180,7813207,FALSE,5.6324201720563,1.92231334164735,0.754601264163008,0.298622773137748,,,,,,0.677049721253506,2.1519893877511,0.965995278679533,4,3
+Sierra Leone,SLE,2020,72180,7976985,FALSE,,,,,,,,,,,,,0,0
+El Salvador,SLV,1990,20720,5270074,FALSE,0,0.0157979585842886,1.15438983007416,,,,,,,1.07372077331707,0.390062596219482,0.54475936595068,3,2
+El Salvador,SLV,1991,20720,5342190,FALSE,0,0.206730342642069,1.09963431186013,,,,,,,1.02105546126204,0.435454884834065,0.613892901952057,3,2
+El Salvador,SLV,1992,20720,5416327,FALSE,0,0.123969471645506,1.25761448451588,,,,,,3.17017712275438,1.15031442779248,1.13794026972894,1.48148700739746,3,3
+El Salvador,SLV,1993,20720,5490478,FALSE,0,0.13126249558755,1.41979118243784,,,,,,4.29709940711312,1.29632307564159,1.46203827128463,1.90822832611409,3,3
+El Salvador,SLV,1994,20720,5561916,FALSE,0,,1.63467902783321,,,,,,4.45002838531761,1.48078152599556,2.02823580438361,2.96540495565658,2,2
+El Salvador,SLV,1995,20720,5628602,FALSE,0,0.296392653421392,1.98985896403644,0.749619549184656,,,,,5.34208522111999,1.79449340522819,1.67559127755249,2.04564770723856,4,4
+El Salvador,SLV,1996,20720,5689943,FALSE,0.0397711863398057,0.0554671314230861,1.93258772827232,1.04896079524959,,,,,5.55030441961836,1.74503221557296,1.72541825218063,2.099941140466,4,4
+El Salvador,SLV,1997,20720,5746288,FALSE,0.117137075337486,0.450655031915442,2.31718345243491,1.32405820915527,,,,,5.41017953950882,2.13093902767884,1.92384266167038,2.32895795206459,4,4
+El Salvador,SLV,1998,20720,5797764,FALSE,0.192133296014726,8.34160908895102,2.40619826478252,1.817252868268,,,,,4.88669696784467,2.23426206373556,3.52877809717219,4.31995524719981,4,4
+El Salvador,SLV,1999,20720,5844834,FALSE,0.378895912949518,2.02305145820313,2.43695085699997,1.63425516005385,,,,,5.79692740762496,2.30438634298901,2.45401615916629,2.93965509221774,4,4
+El Salvador,SLV,2000,20720,5887930,FALSE,0.523812044016694,1.32889734832227,2.83542484536156,3.69166939696382,,,,,6.29638468308096,2.66195116205753,2.93523766354906,3.49472564760614,4,4
+El Salvador,SLV,2001,20720,5927001,FALSE,0.662935616825734,2.1356031324025,2.84089566993341,3.55869559530981,,,,,6.66433916389746,2.68971000478957,3.17249383567378,3.76208697409983,4,4
+El Salvador,SLV,2002,20720,5962139,FALSE,0.83476954846097,3.64649854818138,2.86189484824858,3.84130381236294,,,,,7.52398690422645,2.7203681509906,3.74169073229606,4.43303935394034,4,4
+El Salvador,SLV,2003,20720,5994075,FALSE,1.09252889001827,1.16926735643257,3.12553035227199,3.52088401219173,5.31230883213452,,6.01727088382661,,10.9721549062766,2.97202136926554,4.31627273350296,4.93031970559861,6,5
+El Salvador,SLV,2004,20720,6023801,FALSE,1.39153603119333,2.66497674333761,3.33753372484583,4.25168305765675,5.21365272724178,,,,9.19474948265603,3.17103972448806,4.16809580793791,4.82061225203461,5,4
+El Salvador,SLV,2005,20720,6052124,FALSE,1.81784381463646,4.522346487991,3.90014393998845,5.1069280615541,5.16656306338722,,3.57573370667617,,9.93363635639498,3.69553156824535,4.80943872787353,5.36683523617232,6,5
+El Salvador,SLV,2006,20720,6079395,FALSE,2.36983124705003,1.92934096363515,4.4759409796048,5.47966010766473,4.84824074262677,,,0.0185999994611506,9.49184496781484,4.22165898385577,4.74932365315391,4.22822100448633,5,5
+El Salvador,SLV,2007,20720,6105810,FALSE,2.62127761265584,11.8214090484933,5.19471802818864,5.43406236296443,5.03761543528492,,,0.0143122532225168,,4.90732393828176,6.26786676307557,5.54427690074051,5,4
+El Salvador,SLV,2008,20720,6131767,FALSE,4.30615821330962,7.02744244634635,5.68747125364305,3.71320586711534,5.49957657842877,64.9538754351961,4.70571996267607,0.0238260310111175,,5.22503382233145,15.0656455297144,4.13904562589607,7,5
+El Salvador,SLV,2009,20720,6157678,FALSE,5.15160151530774,2.64742170447946,4.53181934244069,5.57569478337001,5.65237092791011,50.927466397881,4.10017884681224,0.178661652806792,7.75163138332604,4.1989908709633,11.5265448533739,4.07542987362631,7,6
+El Salvador,SLV,2010,20720,6183877,FALSE,6.73521363328127,1.5998189207495,5.27019612652033,5.94495766200445,6.23289344491479,,3.4995495194655,0.338830092083392,7.07462104627718,4.82444354047956,5.02072615138304,3.8803701301766,6,6
+El Salvador,SLV,2011,20720,6210567,FALSE,7.97160272236947,1.54254726057664,6.22689522248361,6.06805998477384,6.66510655751423,63.223918595133,0.580751692606697,0.78640754354866,8.47384114591772,5.69212478224767,13.441088089123,3.8572887349452,7,6
+El Salvador,SLV,2012,20720,6237922,FALSE,8.5335259995169,3.27660779789392,6.40339035056193,6.23034488479596,7.16713090304556,,1.73461481113292,2.75522062527065,10.7696494197865,5.94277509805706,6.15802221061468,5.11820210615616,6,6
+El Salvador,SLV,2013,20720,6266076,FALSE,9.66064729311722,2.17858893434608,6.79379438649302,6.46794500690249,8.05340892286341,,1.72682104268954,8.78096525521905,12.2361673491239,6.32095722890255,6.51066066877871,6.28524080286394,6,6
+El Salvador,SLV,2014,20720,6295124,FALSE,10.3036589584096,4.91981898834236,6.74958227122652,6.56159627328269,8.54306167432532,69.2306037194331,2.29180381342595,11.1197196854877,13.5511153474374,6.32102315869019,16.2297399102225,7.46084621111105,7,6
+El Salvador,SLV,2015,20720,6325121,FALSE,11.1000072222695,4.11007544462241,6.78631114280494,6.89538285707524,8.16189856709053,57.5103972454516,0.570233723164711,12.4335466537855,10.6445468659902,6.37816159660984,13.9452792144826,6.83865785687464,7,6
+El Salvador,SLV,2016,20720,6356137,FALSE,11.9502229337646,4.21665621058848,6.65758901403457,7.36820102162319,8.41128833429795,43.3130828050523,0,14.4788749563131,10.1890488606237,6.32038829023291,11.9564001208124,7.09552822323022,7,6
+El Salvador,SLV,2017,20720,6388124,FALSE,13.8683476367823,6.10255476678262,6.99239237129617,7.82953087191924,8.11668137117792,,2.25843912691569,21.4030592817831,10.5435837203511,6.67820514816504,7.93247474900787,9.13589548598614,6,6
+El Salvador,SLV,2018,20720,6420740,FALSE,17.8691592970223,5.64259493130023,7.45690928221718,8.17950054877317,8.47323019477919,,0,,,7.14947815721867,7.82963281186257,5.24289340932302,6,4
+El Salvador,SLV,2019,20720,6453550,FALSE,20.4942508986493,5.14337058979998,7.62388046027789,8.54073525895563,,,,,,7.2636488257307,10.4505593019207,6.98258489149544,4,3
+El Salvador,SLV,2020,20720,6486201,FALSE,,0.658048733349145,6.34330276111228,,,,,,,6.07441349218567,3.50067574723071,3.3662311127674,2,2
+San Marino,SMR,1990,60,24124,TRUE,0,,,,,,,,,,0,,1,0
+San Marino,SMR,1991,60,24454,TRUE,0,,,,,,,,,,0,,1,0
+San Marino,SMR,1992,60,24830,TRUE,0,,,,,,,,,,0,,1,0
+San Marino,SMR,1993,60,25208,TRUE,0,,,,,,,,,,0,,1,0
+San Marino,SMR,1994,60,25588,TRUE,0,,,,,,,,,,0,,1,0
+San Marino,SMR,1995,60,25925,TRUE,100,,,100,,,,,,,100,100,2,1
+San Marino,SMR,1996,60,26253,TRUE,100,,,100,,,,,,,100,100,2,1
+San Marino,SMR,1997,60,26563,TRUE,100,,,100,,,,,,,100,100,2,1
+San Marino,SMR,1998,60,26851,TRUE,100,,,100,,,,,,,100,100,2,1
+San Marino,SMR,1999,60,27141,TRUE,100,,,100,,,,,,,100,100,2,1
+San Marino,SMR,2000,60,27460,TRUE,100,,,100,,,,,,,100,100,2,1
+San Marino,SMR,2001,60,27818,TRUE,100,,,100,,,,,,,100,100,2,1
+San Marino,SMR,2002,60,28175,TRUE,100,,,100,,,,,,,100,100,2,1
+San Marino,SMR,2003,60,28561,TRUE,100,,,100,,,,,,,100,100,2,1
+San Marino,SMR,2004,60,28942,TRUE,100,,,100,,,,,,,100,100,2,1
+San Marino,SMR,2005,60,29324,TRUE,100,,,100,,,,,,,100,100,2,1
+San Marino,SMR,2006,60,29694,TRUE,100,,,100,,,,3.83069291560279,,,100,51.9153464578014,2,2
+San Marino,SMR,2007,60,30068,TRUE,100,,,100,,,,3.78304356462702,,,100,51.8915217823135,2,2
+San Marino,SMR,2008,60,30434,TRUE,100,,,100,,,,100,,,100,100,2,2
+San Marino,SMR,2009,60,30825,TRUE,100,,,100,,,,100,,,100,100,2,2
+San Marino,SMR,2010,60,31221,TRUE,,,,100,,,,100,,,100,100,1,2
+San Marino,SMR,2011,60,31655,TRUE,100,,,100,,,,100,,,100,100,2,2
+San Marino,SMR,2012,60,32103,TRUE,,,,100,,,,100,,,100,100,1,2
+San Marino,SMR,2013,60,32554,TRUE,,,,100,,,,100,,,100,100,1,2
+San Marino,SMR,2014,60,32941,TRUE,,,,100,,,,74.6335873028896,,,100,87.3167936514448,1,2
+San Marino,SMR,2015,60,33270,TRUE,,,,100,,,,86.0276739574879,,,100,93.013836978744,1,2
+San Marino,SMR,2016,60,33503,TRUE,,,,100,,,,96.5352195220961,,,100,98.267609761048,1,2
+San Marino,SMR,2017,60,33671,TRUE,100,,,100,,,,100,,,100,100,2,2
+San Marino,SMR,2018,60,33784,TRUE,,,,100,,,,,,,100,100,1,1
+San Marino,SMR,2019,60,33864,TRUE,,,,100,,,,,,,100,100,1,1
+San Marino,SMR,2020,60,33938,TRUE,,,,,,,,,,,,,0,0
+Somalia,SOM,1990,627340,7225089,FALSE,0,0.0339334354057171,,,,,,,,,0.0169667177028586,0.0339334354057171,2,1
+Somalia,SOM,1991,627340,7274026,FALSE,0,0.000904431402511569,,,,,,,,,0.000452215701255784,0.000904431402511569,2,1
+Somalia,SOM,1992,627340,7295380,FALSE,0,0.000360713631755199,,,,,,,,,0.0001803568158776,0.000360713631755199,2,1
+Somalia,SOM,1993,627340,7315864,FALSE,0,0.0119901218085075,,,,,,,,,0.00599506090425375,0.0119901218085075,2,1
+Somalia,SOM,1994,627340,7372592,FALSE,0,0.0059489322408235,,,,,,,,,0.00297446612041175,0.0059489322408235,2,1
+Somalia,SOM,1995,627340,7491647,FALSE,0,0.00585439359959665,,,,,,,,,0.00292719679979833,0.00585439359959665,2,1
+Somalia,SOM,1996,627340,7682683,FALSE,0.000514694683910338,0.00742146530338538,,,,,,,,,0.00396807999364786,0.00742146530338538,2,1
+Somalia,SOM,1997,627340,7936122,FALSE,0.000973283280521641,0.0060791599816587,,,,,,,,,0.00352622163109017,0.0060791599816587,2,1
+Somalia,SOM,1998,627340,8235064,FALSE,0.0022789203832079,0.000213035625453487,,,,,,,,,0.00124597800433069,0.000213035625453487,2,1
+Somalia,SOM,1999,627340,8553595,FALSE,0.00425996314617982,0.0041533215800213,,,,,,,,,0.00420664236310056,0.0041533215800213,2,1
+Somalia,SOM,2000,627340,8872250,FALSE,0.00590488329921834,0.0013347170747842,,,,,,,,,0.00361980018700127,0.0013347170747842,2,1
+Somalia,SOM,2001,627340,9186719,FALSE,0.0225370507111378,0.000190967200573948,,,,,,,,,0.0113640089558559,0.000190967200573948,2,1
+Somalia,SOM,2002,627340,9501335,FALSE,0.0318743759262732,0.000646253082815546,,,,,,,,,0.0162603145045444,0.000646253082815546,2,1
+Somalia,SOM,2003,627340,9815412,FALSE,0.100397534093819,0.00379812815907797,,,0.258306911119767,,,,,,0.0520978311264485,0.00379812815907797,3,1
+Somalia,SOM,2004,627340,10130251,FALSE,0.272402300561301,0.0207383657803017,,,0.256019074622748,,,,,,0.146570333170802,0.0207383657803017,3,1
+Somalia,SOM,2005,627340,10446856,FALSE,0.270132829778683,0.100759233776526,,,0.263680406242233,,,,,,0.185446031777604,0.100759233776526,3,1
+Somalia,SOM,2006,627340,10763904,FALSE,0.267746239514009,0.391165586736448,,,0.292285522183288,,,,,,0.329455913125228,0.391165586736448,3,1
+Somalia,SOM,2007,627340,11080122,FALSE,0.265310599909927,0.558127977729891,,,0.304455968193375,,,,,,0.411719288819909,0.558127977729891,3,1
+Somalia,SOM,2008,627340,11397188,FALSE,0.262630287914519,0.334796387627339,,,0.302593177924116,,,,,,0.298713337770929,0.334796387627339,3,1
+Somalia,SOM,2009,627340,11717691,FALSE,0.25945351793033,0.404241537577808,,,0.315385289016546,,,,,,0.331847527754069,0.404241537577808,3,1
+Somalia,SOM,2010,627340,12043886,FALSE,,0.407859525379981,,,0.29986535672788,,,,,,0.407859525379981,0.407859525379981,2,1
+Somalia,SOM,2011,627340,12376305,FALSE,0.264566044002481,0.361466780692478,,,0.33552292011434,,,,,,0.313016412347479,0.361466780692478,3,1
+Somalia,SOM,2012,627340,12715487,FALSE,0.283609914005835,0.370209325292535,,,0.396876393942128,,,0.00277472943859606,,,0.326909619649185,0.186492027365565,3,2
+Somalia,SOM,2013,627340,13063711,FALSE,0.300773651825407,0.866188402651227,,,0.479680266182931,,,0.00550666828383293,,,0.583481027238317,0.43584753546753,3,2
+Somalia,SOM,2014,627340,13423571,FALSE,0.31807873399682,0.852769513755242,,,0.401757045856316,,,0.00535606796817657,,,0.585424123876031,0.42906279086171,3,2
+Somalia,SOM,2015,627340,13797204,FALSE,0.334146315074497,0.963187340341778,,,0.46507931311029,,,0.0105270881580689,,,0.648666827708138,0.486857214249924,3,2
+Somalia,SOM,2016,627340,14185635,FALSE,0.347155589442422,1.02029176569032,,,0.439326054169673,,,0.0159265620080226,,,0.683723677566369,0.51810916384917,3,2
+Somalia,SOM,2017,627340,14589165,FALSE,0.359826321023746,1.10931568333284,,,0.517169533830058,,,0.0185202020852501,,,0.734571002178295,0.563917942709047,3,2
+Somalia,SOM,2018,627340,15008225,FALSE,,1.19231238210201,,,0.52765703687268,,,,,,1.19231238210201,1.19231238210201,2,1
+Somalia,SOM,2019,627340,15442906,FALSE,,1.26951465355777,,,,,,,,,1.26951465355777,1.26951465355777,1,1
+Somalia,SOM,2020,627340,15893219,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,1990,87460,7586000,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,1991,87460,7595636,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,1992,87460,7646424,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,1993,87460,7699307,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,1994,87460,7734639,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,1995,87460,7625357,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,1996,87460,7617794,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,1997,87460,7596501,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,1998,87460,7567745,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,1999,87460,7540401,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,2000,87460,7516346,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,2001,87460,7503433,FALSE,,,,,,,,,,,,,0,0
+Serbia,SRB,2002,87460,7496522,FALSE,,,,0.504136313288786,,,,,,,0.504136313288786,0.504136313288786,1,1
+Serbia,SRB,2003,87460,7480591,FALSE,,,,0.549059161938704,,,,,,,0.549059161938704,0.549059161938704,1,1
+Serbia,SRB,2004,87460,7463157,FALSE,8.24822270260436,,,0.636614534750689,,,,,,,4.44241861867752,0.636614534750689,2,1
+Serbia,SRB,2005,87460,7440769,FALSE,9.25876413038884,,,0.738124284441491,,,,,,,4.99844420741516,0.738124284441491,2,1
+Serbia,SRB,2006,87460,7411569,FALSE,9.61332980345002,,,0.767262921398374,2.61219337384787,25.9626638344345,,0.855805717438251,,,12.1144188530943,0.811534319418313,4,2
+Serbia,SRB,2007,87460,7381579,FALSE,11.763846652775,31.8697309346621,10.5889977102922,1.14396289738573,2.7383735482971,,9.77242754510193,2.09985706217913,,10.0512517572526,13.0277931480434,10.9874460393163,6,5
+Serbia,SRB,2008,87460,7350222,FALSE,12.6871663897569,26.1612624617613,13.4722943085667,1.06621270611996,3.26729469799472,28.2248742744615,5.88847079279613,3.30695623235487,,12.6866877548133,14.5833801555771,9.82191798956912,7,5
+Serbia,SRB,2009,87460,7320807,FALSE,13.632675963468,17.8301886149855,9.71899678976862,1.06884321324018,7.45531880883454,25.8110937806594,11.8242613328196,9.28960530175836,,9.08304261310652,13.3143432824902,9.81918821518204,7,5
+Serbia,SRB,2010,87460,7291436,FALSE,14.693502588694,11.3437401293118,10.4009189938789,1.13646475492513,8.51571988915974,23.48037406645,8.90391842585622,14.8532150396384,,9.67908733533685,11.6598198265193,9.18328513701367,7,5
+Serbia,SRB,2011,87460,7234099,FALSE,15.2806946375276,31.7711832719413,12.8236852749983,1.28150417651917,8.93290926208148,23.6177580162377,9.97165589604814,26.6843034788027,2.18616904650332,12.1922680808098,13.8475214742537,14.0145139917707,7,6
+Serbia,SRB,2012,87460,7199077,FALSE,17.501825587896,9.76324224084312,12.2484598361696,1.36536741037959,9.01927733027606,21.0673344283703,7.51512443323769,34.0519490038764,2.30492321232427,11.6279151373421,10.2523253070315,11.1047535730005,7,6
+Serbia,SRB,2013,87460,7164132,FALSE,19.5434928108316,14.6385883289577,14.1999584734618,1.56194880026657,9.32981175682661,19.7373523014447,8.05523359379151,44.2533357481972,2.53523767610198,13.4564881500587,11.4674017121223,14.0834720495623,7,6
+Serbia,SRB,2014,87460,7130576,FALSE,22.8038288079639,14.4560650107052,14.6212806653834,1.75159591979757,10.6947731658877,18.3811961772871,11.1280688321028,8.54229899039991,4.01444309150159,13.8266590789006,12.4509255006774,8.95318848723462,7,6
+Serbia,SRB,2015,87460,7095383,FALSE,24.1137997026561,16.6118909739753,12.9617955015259,1.93663665696129,10.8970679924161,15.2491300936913,9.14994318859903,12.1599716329425,4.70153177659428,12.3373957544357,12.1035325562862,9.48289499725136,7,6
+Serbia,SRB,2016,87460,7058322,FALSE,24.8860929958705,16.2031106232703,13.9892915855208,2.20325435078553,11.4581890325469,13.7634330775429,7.15398959726719,27.38138300696,5.3988374367048,13.3286626213903,11.942572809566,11.9448729393964,7,6
+Serbia,SRB,2017,87460,7020858,FALSE,26.2404139278168,19.0165238072891,16.2127944194918,2.58875658483269,11.8283188983938,11.9686818721231,8.73334200094263,47.8348625326705,5.67256762293005,15.4393593703486,12.9190114622037,16.5475686531689,7,6
+Serbia,SRB,2018,87460,6982604,FALSE,27.5208093610259,27.8256483039949,18.9335727393503,2.97525268946175,12.225214206219,,9.29772780346005,,,17.7510218082533,17.3106021794586,14.4624126512925,6,4
+Serbia,SRB,2019,87460,6945235,FALSE,29.1986798802485,28.8246769882264,19.964621860728,3.22914748684033,,,,,,18.7304674877049,20.3042815540108,16.9280973209239,4,3
+Serbia,SRB,2020,87460,6908224,FALSE,29.7158197805959,0.824673002173575,19.4633893769553,,,,,,,17.9284266460475,16.6679607199082,9.37654982411055,3,2
+South Sudan,SSD,1990,,5492620,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,1991,,5420179,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,1992,,5305449,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,1993,,5185712,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,1994,,5111371,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,1995,,5118084,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,1996,,5221925,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,1997,,5411653,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,1998,,5661934,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,1999,,5933884,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,2000,,6199396,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,2001,,6447791,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,2002,,6688225,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,2003,,6935665,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,2004,,7213354,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,2005,,7535931,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,2006,,7907407,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,2007,,8315144,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,2008,,8736932,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,2009,,9142258,FALSE,,,,,,,,,,,,,0,0
+South Sudan,SSD,2010,,9508372,FALSE,,,,,,,,0.000120493170167983,,,,0.000120493170167983,0,1
+South Sudan,SSD,2011,631978.41,9830695,FALSE,,,,,1.35448902568587,2.84493431698914,0,0.000112901294281142,,,1.42246715849457,0.0000564506471405708,3,2
+South Sudan,SSD,2012,631973.704,10113648,FALSE,,0.698195852753154,,,1.47019108609545,7.41184884149731,0.35662673817571,0.00351712698199582,,,2.82222381080873,0.352779905970287,4,3
+South Sudan,SSD,2013,631972.755,10355030,FALSE,0.968855522480535,3.35877605821126,,,1.37574484604445,,0.348313553635025,0.0034325518615326,,,1.55864837810894,1.23684072123594,4,3
+South Sudan,SSD,2014,631957.217,10554882,FALSE,1.12080595168505,0.00430420091285259,2.03454865102355,,1.0347507129226,,0,0.0033654552336323,,1.76878198495286,0.789914700905363,0.444112910274837,5,4
+South Sudan,SSD,2015,631957.218,10715657,FALSE,1.3444943445054,0.00482972526012546,1.27509317830224,,0.974587760948612,,0,0.0214212568672747,,1.17204714078193,0.656104312016943,0.299574530727332,5,4
+South Sudan,SSD,2016,631945.102,10832520,FALSE,1.615267206469,0.0397595271855369,0.792410157120126,,0.848196067312966,10.2411640410006,0,0.0341695081466235,,0.720719935676088,2.53772018635506,0.198662242752062,6,4
+South Sudan,SSD,2017,631944.08,10910774,FALSE,1.91523679373648,0.174463025242788,0.913593433337363,,0.747517329078589,19.6435887333969,0,0.0254485986978309,,0.893291641950304,4.52937639714271,0.273300816472731,6,4
+South Sudan,SSD,2018,631928.123,10975924,FALSE,,0.240315374074097,1.4314904318998,,0.757806707023982,,0,,,1.33651101581706,0.557268601991298,0.525608796630385,4,3
+South Sudan,SSD,2019,631928.123,11062114,FALSE,,1.20050126263036,1.60987815612042,,,,,,,1.50492390857303,1.40518970937539,1.3527125856017,2,2
+South Sudan,SSD,2020,631928.123,11193729,FALSE,,,1.38634522993184,,,,,,,1.33210561512343,1.38634522993184,1.33210561512343,1,1
+Sao Tome and Principe,STP,1990,960,119211,TRUE,0,0,0.569175635675769,,,,,,,0.494738720912955,0.189725211891923,0.247369360456477,3,2
+Sao Tome and Principe,STP,1991,960,121949,TRUE,0,,,,,,,,,,0,,1,0
+Sao Tome and Principe,STP,1992,960,124574,TRUE,0,,,,,,,,,,0,,1,0
+Sao Tome and Principe,STP,1993,960,127066,TRUE,0,0.165680387504714,,,,,,,,,0.0828401937523569,0.165680387504714,2,1
+Sao Tome and Principe,STP,1994,960,129426,TRUE,0,,,,,,,,,,0,,1,0
+Sao Tome and Principe,STP,1995,960,131679,TRUE,0,0.00999226533780727,,0.570523642796403,,,,,,,0.193505302711403,0.290257954067105,3,2
+Sao Tome and Principe,STP,1996,960,133799,TRUE,,0.104895373501416,,0.579619408486704,,,,,,,0.34225739099406,0.34225739099406,2,2
+Sao Tome and Principe,STP,1997,960,135831,TRUE,,0.129157704050585,0.759910243864768,0.427831717118195,,,,,,0.741020574244876,0.438966555011183,0.432669998471219,3,3
+Sao Tome and Principe,STP,1998,960,137855,TRUE,5.62159831178484,1.33624468491094,0.627818387782761,0.492025916928789,,,,,,0.616105710514996,2.01942182535183,0.814792104118241,4,3
+Sao Tome and Principe,STP,1999,960,139964,TRUE,6.79748672258203,0.940078525490214,0.829412177515017,0.501948809983031,,,,,,0.793312476534757,2.26723155889257,0.745113270669334,4,3
+Sao Tome and Principe,STP,2000,960,142264,TRUE,85.4081301429609,1.1715148663014,0.877906189785033,0.604817555805987,,,,,,0.817517659886919,22.0155921887133,0.864616693998102,4,3
+Sao Tome and Principe,STP,2001,960,144760,TRUE,100,0.90893306674297,0.800177541722469,0.627931213142255,,,,,,0.771101859853835,25.5842604554019,0.769322046579687,4,3
+Sao Tome and Principe,STP,2002,960,147450,TRUE,100,1.07082116575147,0.867235016754087,0.756506898378249,,,,,,0.82631756489837,25.673640770221,0.884548543009364,4,3
+Sao Tome and Principe,STP,2003,960,150405,TRUE,100,0.99146152615011,0.974521537949141,0.806229964286541,6.77742861116348,,,,,0.909219001356098,25.6930532570965,0.90230349726425,5,3
+Sao Tome and Principe,STP,2004,960,153736,TRUE,100,0.998793613178294,1.04705339750413,0.836140899701121,8.36842820101662,,,,,0.969897209282194,25.7204969775959,0.934943907387203,5,3
+Sao Tome and Principe,STP,2005,960,157472,TRUE,100,8.4160092195539,1.0161003765953,1.21741589399931,9.02595100412297,6.13887207600741,,100,,0.968386215412986,23.3576795132312,27.6504528322416,6,4
+Sao Tome and Principe,STP,2006,960,161676,TRUE,100,11.1453813880064,1.35550642644425,0.922740217863851,9.09441560788622,6.84503643013206,,0.01804583079379,,1.29474497465556,24.0537328924893,3.34522810282989,6,4
+Sao Tome and Principe,STP,2007,960,166297,TRUE,100,10.3259065964405,1.37393337761013,1.48876233169584,9.09221773122491,6.65473866620535,,0.0351936431692793,,1.30470508507597,23.9686681943904,3.2886419140954,6,4
+Sao Tome and Principe,STP,2008,960,171122,TRUE,100,20.3089166480109,1.81567375113908,1.75910002897713,6.58691231985352,7.49386028946928,,0.0513528018696218,,1.62508439422202,26.2755101435193,5.93611346826991,6,4
+Sao Tome and Principe,STP,2009,960,175877,TRUE,100,3.90276694631917,1.64532928831764,1.04842240827649,7.04986341514329,8.23947298341778,0,0.0499614281191116,,1.47001678489294,19.1393319377218,1.29423351352154,7,5
+Sao Tome and Principe,STP,2010,960,180372,TRUE,100,12.3172667167058,1.90481225826833,0.537342539468241,6.38490054460175,8.52820406498862,19.9964367933898,0.162637748531239,,1.70307828343783,23.8806770621368,6.94335241630657,7,5
+Sao Tome and Principe,STP,2011,960,184521,TRUE,100,7.7129912315097,2.27540766960587,0.801735016688007,6.32098951272913,8.58282746552182,19.5468120013294,0.198750640974109,,2.02651300417272,23.1532955641091,6.05736037893478,7,5
+Sao Tome and Principe,STP,2012,960,188394,TRUE,100,5.32525299876226,2.23136547004246,,9.40467366418834,7.8525966807766,0,0.798460301386975,,1.98815419955373,23.0818430299163,2.02796687492574,6,4
+Sao Tome and Principe,STP,2013,960,192076,TRUE,100,2.9850174727952,2.8077255437614,,6.04675588449355,,0,1.18433565442036,,2.54130107900491,26.4481857541392,1.67766355155512,5,4
+Sao Tome and Principe,STP,2014,960,195727,TRUE,100,6.81694173420199,3.87211815893021,,6.58513775677474,,0,2.62455609309431,,3.57529999141888,27.6722649732831,3.2541994546788,5,4
+Sao Tome and Principe,STP,2015,960,199439,TRUE,100,6.72466261836666,3.31072736916516,1.55785946103148,10.8870369021552,,18.0847141095638,3.9740055210843,,3.00244138657701,25.9355927116254,6.66873661932465,6,5
+Sao Tome and Principe,STP,2016,960,203221,TRUE,100,5.25243927829267,3.31243923467491,1.72610455747141,10.346662225012,4.233654834267,0,7.83631580796807,,2.98816647988985,19.0874396507843,3.5606052247244,7,5
+Sao Tome and Principe,STP,2017,960,207086,TRUE,100,7.31327755415397,3.29594423211924,1.69386186126673,9.2065987363698,0.637558259410268,0,13.7323350194267,,2.94081876113447,18.823440317825,5.13605863919638,7,5
+Sao Tome and Principe,STP,2018,960,211032,TRUE,100,5.42279313344944,3.34853680191781,1.92120239714249,6.38616011811557,,0,,,2.9462670893479,22.138506466502,2.57256565498496,6,4
+Sao Tome and Principe,STP,2019,960,215048,TRUE,100,5.12540872495049,2.91239087526534,,,,,,,2.60553476978251,36.0125998667386,3.8654717473665,3,2
+Sao Tome and Principe,STP,2020,960,219161,TRUE,,0.170793991717569,2.27417785149242,,,,,,,2.07335082274472,1.222485921605,1.12207240723114,2,2
+Suriname,SUR,1990,156000,405169,TRUE,0,8.31350636151294,,,,,,,,,4.15675318075647,8.31350636151294,2,1
+Suriname,SUR,1991,156000,413009,TRUE,0,1.96458776824208,,,,,,,,,0.982293884121039,1.96458776824208,2,1
+Suriname,SUR,1992,156000,420658,TRUE,0,5.66147898869151,,,,,,,,,2.83073949434576,5.66147898869151,2,1
+Suriname,SUR,1993,156000,428028,TRUE,0,4.77499542441444,,,,,,,,,2.38749771220722,4.77499542441444,2,1
+Suriname,SUR,1994,156000,435099,TRUE,0,3.04423434084328,,,,,,,,,1.52211717042164,3.04423434084328,2,1
+Suriname,SUR,1995,156000,441851,TRUE,0.680113150817759,2.0447988916922,,1.89558717049588,,,,,15.5635955524188,,5.04602369135616,6.50132720486896,3,3
+Suriname,SUR,1996,156000,448207,TRUE,1.32261394512008,1.86902002807238,,2.00420262961405,,,,,16.4685012789249,,5.41608447043285,6.78057464553711,3,3
+Suriname,SUR,1997,156000,454165,TRUE,5.78548811515463,0.888450810332334,,2.08488286841215,,,,,16.4323185079825,,6.29778507547041,6.46855072890901,3,3
+Suriname,SUR,1998,156000,459838,TRUE,9.51404733023153,0.867952098891046,,1.84780054410788,,,,,,,4.07659999107682,1.35787632149946,3,2
+Suriname,SUR,1999,156000,465380,TRUE,10.6487585688681,5.79597660020865,,1.8779852418286,,,,,,,6.10757347030178,3.83698092101862,3,2
+Suriname,SUR,2000,156000,470944,TRUE,13.9411346767389,9.05224333260744,,1.85578048743012,,,,,,,8.28305283225884,5.45401191001878,3,2
+Suriname,SUR,2001,156000,476574,TRUE,16.843683030306,2.46640090862272,,1.73187934194758,,,,,18.6349709915993,,9.9192335681189,7.61108374738986,3,3
+Suriname,SUR,2002,156000,482228,TRUE,22.6057928476349,6.69398313286801,,,,,,,,,14.6498879902515,6.69398313286801,2,1
+Suriname,SUR,2003,156000,487938,TRUE,25.3385048933285,6.84036439837596,,2.48819903024385,5.44333005635593,,,,18.3960481549064,,13.2657791192137,9.24153719450873,4,3
+Suriname,SUR,2004,156000,493680,TRUE,32.2396815477666,3.31377121662202,,,5.48426026389856,,,,20.9170231882909,,18.8234919842265,12.1153972024565,3,2
+Suriname,SUR,2005,156000,499461,TRUE,33.5817145729064,2.4587573542732,14.3000331138751,,4.55210991972109,,,,22.9412600614935,12.8837688261968,18.320441275637,12.7612620806545,4,3
+Suriname,SUR,2006,156000,505292,TRUE,49.2469367939172,14.1830244895993,12.3311398435465,3.70093224886662,4.12117769225853,,,0.290367789103506,24.4848062429663,11.2227938632077,20.7893679237792,10.7763849267487,5,5
+Suriname,SUR,2007,156000,511181,TRUE,72.3048458388049,21.1667250856223,14.0446678439469,3.96721782434221,4.5963408812652,,,0.287021362074655,,12.6573499075687,27.8708641481791,9.51957854490196,5,4
+Suriname,SUR,2008,156000,517122,TRUE,100,19.6258991634677,17.9373795009076,3.54575977603718,5.84227288541504,,,0.460409077912879,,15.9562089846599,35.2772596101031,9.89706925051941,5,4
+Suriname,SUR,2009,156000,523113,TRUE,100,7.8308803128425,15.5246472066965,3.5051349906991,6.68905495402861,,20.6846166925538,0.457940758915512,24.9013665519331,13.8031070905004,28.7411076257875,11.8638410662407,6,6
+Suriname,SUR,2010,156000,529126,TRUE,100,21.1948744688763,18.1734498409684,4.72800565644011,7.07163080467494,50.6701725276001,6.81651874467952,0.712792780833355,,16.527412040554,33.5971702064274,9.99592073827664,7,5
+Suriname,SUR,2011,156000,535177,TRUE,100,17.8395764899523,22.9717229007369,5.01501619380136,7.05577209610313,51.729398707082,0,,,21.2683471213045,32.9259523819288,11.0307349512646,7,4
+Suriname,SUR,2012,156000,541247,TRUE,100,14.00797139033,24.3784055362007,5.3852007179643,7.69668688698898,53.4087177380563,6.66386566077465,,16.7328598803008,22.3001824244815,31.5110029890895,13.0180160147702,7,5
+Suriname,SUR,2013,156000,547295,TRUE,100,15.0368771837026,23.4344326557312,5.54763800115002,8.78950361350156,,19.7706755806136,,,21.2258992607971,32.7579246842395,15.3952725065658,6,4
+Suriname,SUR,2014,156000,553278,TRUE,100,22.4690209618207,22.3548707290181,5.55350063405622,8.11406957307425,,6.51896026463604,,19.2281457891988,19.9974906854766,29.3540830631217,14.7534236670377,6,5
+Suriname,SUR,2015,156000,559136,TRUE,100,20.923401321288,19.5432007306681,4.97387072145981,8.31837026031936,22.6303580023646,32.2533095463116,1.19560443825352,18.9776392242875,17.2604942865406,31.3288256494828,15.9307199230235,7,6
+Suriname,SUR,2016,156000,564883,TRUE,100,23.2918162373439,14.1344001202443,5.52540029906971,8.22504049771521,18.9604547168392,6.38503424124517,21.6961501686939,,13.1426292259727,28.0495176024571,14.0082060344651,7,5
+Suriname,SUR,2017,156000,570501,TRUE,100,7.54966463008815,16.6017289322564,5.9394315598388,6.58868714487092,,6.32215771277754,18.7810908148063,,16.1920144591329,27.2825965669922,10.9568718353287,6,5
+Suriname,SUR,2018,156000,575987,TRUE,,10.8683635745315,18.0497027470814,,6.57697955085437,,6.26194219191978,,,17.4787363488665,11.7266695045109,11.5363473717726,4,3
+Suriname,SUR,2019,156000,581363,TRUE,,13.2857023290059,19.5216113007952,,,,,,,18.7368290972388,16.4036568149005,16.0112657131223,2,2
+Suriname,SUR,2020,156000,586634,TRUE,,0.0516660701970233,17.6650976762136,,,,,,,17.1934866793373,8.85838187320529,8.62257637476718,2,2
+Slovak Republic,SVK,1990,48100,5299187,FALSE,0,,,,,,,,,,0,,1,0
+Slovak Republic,SVK,1991,48100,5303294,FALSE,0,,,,,,,,,,0,,1,0
+Slovak Republic,SVK,1992,48100,5305016,FALSE,0,,,,,,,,95.819866849951,,47.9099334249755,95.819866849951,1,1
+Slovak Republic,SVK,1993,48100,5325305,FALSE,0.0628782993803407,2.13698769561586,6.96927980872731,,,,,,100,6.25179986828165,27.2922864509309,36.1295958546325,3,3
+Slovak Republic,SVK,1994,48100,5346331,FALSE,0.156056520442582,2.32768141658946,7.75209724289565,,,,,,100,6.94545484997909,27.5589587949819,36.4243787555229,3,3
+Slovak Republic,SVK,1995,48100,5361999,FALSE,0.25560217002104,2.01398323139212,9.72161329810007,,,,,,100,8.70218612605862,27.9977996748783,36.9053897858169,3,3
+Slovak Republic,SVK,1996,48100,5373361,FALSE,0.381849052775628,3.25254527659013,10.779956411934,,,,,,100,9.62093761253808,28.6035876853249,37.6244942963761,3,3
+Slovak Republic,SVK,1997,48100,5383291,FALSE,0.570960802324977,2.24010013277728,11.4810515589552,,,,,,100,10.336765403686,28.5730281235144,37.5256218454878,3,3
+Slovak Republic,SVK,1998,48100,5390516,FALSE,1.30709250334264,7.12720245188914,12.6915293639817,,,,,,100,11.5061043963947,30.2814560798034,39.5444356160946,3,3
+Slovak Republic,SVK,1999,48100,5396020,FALSE,2.63974168395549,5.93672391601596,11.2867534687655,,,,,,100,10.198338729322,29.9658047671842,38.711687548446,3,3
+Slovak Republic,SVK,2000,48100,5388720,FALSE,4.5824097095965,19.0068426424548,12.8638889111407,,,,,,100,11.6014993546608,34.113285315798,43.5361139990386,3,3
+Slovak Republic,SVK,2001,48100,5378867,FALSE,6.10122708983602,12.6966518752286,14.5852941153841,,,,,,100,13.1333807693307,33.3457932701122,41.9433442148531,3,3
+Slovak Republic,SVK,2002,48100,5376912,FALSE,19.5550771351549,35.2700065174848,12.4878345667298,,,,,,100,11.3680265821408,41.8282295548424,48.8793443665418,3,3
+Slovak Republic,SVK,2003,48110,5373374,FALSE,20.9816813481448,11.4493731861852,17.0719354440424,,2.37539162184994,,17.4521129051746,,100,15.698565974205,33.3910205767094,36.1500130163912,5,4
+Slovak Republic,SVK,2004,48100,5372280,FALSE,25.7887339177714,33.2078656536263,36.3323047105715,,4.02206591350199,14.5672190433899,27.5262438274232,100,100,34.1695590482631,39.5703945254637,58.9807337058625,6,5
+Slovak Republic,SVK,2005,48100,5372807,FALSE,26.9075556873132,40.3077616211862,41.7426313413273,6.75217763590108,4.83647362847737,20.2379269293402,17.4539546515871,100,100,39.3826387346239,36.2002868380936,50.6494221072164,7,6
+Slovak Republic,SVK,2006,48100,5373054,FALSE,27.3402129938723,50.6132132273322,52.672462739222,7.11813362880707,5.47218758052497,18.2785041563823,15.4393270266478,,100,49.6117904676604,38.7802648246091,44.5564928700895,7,5
+Slovak Republic,SVK,2007,48100,5374622,FALSE,30.1200468853631,54.6891029686707,65.1101774325887,8.14220753669303,5.04097979434537,24.6277541128876,14.763743485689,,,60.819087787754,32.908838736982,34.6035354447017,7,4
+Slovak Republic,SVK,2008,48100,5379233,FALSE,32.1638153268404,42.1102269002597,73.7015392851816,8.31589147073925,5.5538439035526,29.1970886166656,18.7741122803798,,,68.8000662728804,34.0437789800111,34.5000742310648,7,4
+Slovak Republic,SVK,2009,48090,5386406,FALSE,34.0419201560771,32.6906373386684,54.47137174567,7.28316463555921,4.13665503170295,29.5121783162096,14.7314444066304,,100,50.964321046578,38.9615309426878,41.1339134854872,7,5
+Slovak Republic,SVK,2010,48091,5391428,FALSE,36.784472318524,27.2974885240497,61.4615541708633,6.06415816337257,3.28444030250654,22.2458785157483,15.3867097618364,,100,57.6704566676508,38.4628944934849,41.2837626233819,7,5
+Slovak Republic,SVK,2011,48088,5398384,FALSE,36.1208255944959,66.0484595186468,74.8819331116872,7.39076769340871,3.01685359021944,22.244154674197,10.6900058900509,,100,70.4341550601964,45.3394494974981,50.9126776324606,7,5
+Slovak Republic,SVK,2012,48088,5407579,FALSE,37.159011118548,24.4032083496485,74.3927192627345,6.03930238797886,2.32182368131497,22.7947948104659,10.0048394040031,,100,69.0882843888154,39.2562679047684,41.9071269060892,7,5
+Slovak Republic,SVK,2013,48088,5413393,FALSE,37.6865149756931,18.4774972937629,80.3548159731686,33.0131056109266,2.44520499727223,26.4481945116608,15.3242777381649,,100,74.003291774696,44.4720580147681,48.1636344835101,7,5
+Slovak Republic,SVK,2014,48080,5418649,FALSE,38.6638835261535,5.19738925482173,80.6174782312441,31.2996722004966,2.94313767330226,27.9637578335665,9.98440007084044,,100,74.8185995015206,41.960940159589,44.2600122055359,7,5
+Slovak Republic,SVK,2015,48082,5423801,FALSE,37.4944619445296,23.7633665150031,70.6606188863656,39.671242826688,3.38413235999778,26.5689079772992,10.6399104164693,,100,65.8944838402463,44.1140726523364,47.9938007196814,7,5
+Slovak Republic,SVK,2016,48080,5430798,FALSE,38.8165610383655,71.2020206644424,73.1304477476779,45.7894012954255,3.63477930883207,28.2371822177625,11.9544772888536,,100,67.5960448396004,52.7328700360753,59.3083888176644,7,5
+Slovak Republic,SVK,2017,48080,5439232,FALSE,39.3101097784506,46.1582317289303,79.5440714749588,43.0494902542102,3.75757373863926,32.4930594468536,3.97864694570553,,100,73.4363961993633,49.2190870898727,53.3245530256419,7,5
+Slovak Republic,SVK,2018,48080,5446771,FALSE,38.6897754436496,25.8384832916781,89.1120627508151,10.3962278091997,4.42020129335942,,11.2572300274886,,,82.1528144264348,35.0587558645662,32.4111888887003,6,4
+Slovak Republic,SVK,2019,48080,5454147,FALSE,39.7923836915273,18.9260226204026,85.857699357261,11.6116296702592,,,,,,79.6346684280618,39.0469338348625,36.7241069062412,4,3
+Slovak Republic,SVK,2020,48080,5458827,FALSE,43.1495656079208,14.7968102128584,79.1186011309951,,,,,,,73.1586019205981,45.6883256505914,43.9777060667283,3,2
+Slovenia,SVN,1990,20140,1998161,FALSE,0,,,,,,,,,,0,,1,0
+Slovenia,SVN,1991,20140,1999429,FALSE,0,,,,,,,,,,0,,1,0
+Slovenia,SVN,1992,20140,1996498,FALSE,0,2.47798939337199,15.8324234030661,,,,,,,14.1285079743134,6.10347093214602,8.30324868384271,3,2
+Slovenia,SVN,1993,20140,1991746,FALSE,0.538945734435628,2.50812393907674,15.7608287420407,,,,,,,14.0863695240048,6.26929947185103,8.29724673154075,3,2
+Slovenia,SVN,1994,20140,1989443,FALSE,1.41092591231421,2.86155709014605,19.0445638859718,,,,,,,17.1729609249251,7.77234896281067,10.0172590075356,3,2
+Slovenia,SVN,1995,20140,1989872,FALSE,3.81624292742758,3.53539909082438,23.903636302947,4.4673298728896,,,,,,21.5684021399047,8.93065204852213,9.85704370120622,4,3
+Slovenia,SVN,1996,20140,1988628,FALSE,6.68134813770525,3.98091476617364,24.1126880725255,5.08099674681609,,,,,,21.8188971691701,9.96398693080512,10.2936028940533,4,3
+Slovenia,SVN,1997,20140,1985956,FALSE,10.013762033872,8.06971401196228,24.075488843762,5.95643939125824,,,,,,21.8251638271251,12.0288510702136,11.9504390767819,4,3
+Slovenia,SVN,1998,20140,1981629,FALSE,13.357094341936,4.89578115514505,25.9809903877252,5.98783965860619,,,,,,23.5613331162944,12.5554263858531,11.4816513100152,4,3
+Slovenia,SVN,1999,20140,1983045,FALSE,16.6582712623873,3.41265652224167,25.3747650678473,5.41385314625604,,,,,,23.0512433030086,12.7148864996831,10.6259176571688,4,3
+Slovenia,SVN,2000,20140,1988925,FALSE,19.900711869749,4.43458401132242,26.7137974923815,6.65605065490582,,,,,,24.2764190102469,14.4262860070897,11.7890178921584,4,3
+Slovenia,SVN,2001,20140,1992060,FALSE,39.6801277284217,13.9080961623545,27.4294102266972,7.43223988420096,,,,,,24.9700657992157,22.1124685004186,15.4368006152571,4,3
+Slovenia,SVN,2002,20140,1994530,FALSE,36.5616986283526,48.1859569957691,30.4626514081405,7.92855702474475,,,,,,27.8153564540783,30.7847160142518,27.9766234915307,4,3
+Slovenia,SVN,2003,20140,1995733,FALSE,41.8107004043309,27.3716208946458,37.9074298515357,8.35595153623349,9.53360019729,,70.4829226126915,,,34.6794453597232,37.1857250598875,35.2224851008235,6,4
+Slovenia,SVN,2004,20140,1997012,FALSE,53.5304647831186,27.336520683269,47.6271901843315,9.11706553619984,11.1452259413947,,97.5292357051705,,,43.5264466519566,47.0280953784179,44.377317144149,6,4
+Slovenia,SVN,2005,20140,2000474,FALSE,61.2944036227975,44.5085804198989,53.5441428953856,50.345980994618,13.4968722065187,24.6137953766895,66.7099397442806,100,,48.9127876609917,50.1694738422783,62.0954577639578,7,5
+Slovenia,SVN,2006,20140,2006868,FALSE,70.4969719480546,34.9352332231417,62.8758460448665,51.0330181351044,14.9195279140113,25.1456032194218,71.8890788491779,2.25434205924642,,57.9553297061305,52.7292919032945,43.6134003945602,7,5
+Slovenia,SVN,2007,20140,2018122,FALSE,73.6473303475592,89.1110672160044,79.8684855421396,44.0608305873351,16.0958328527281,25.3032616117502,94.7218536623439,4.9313003373515,,74.4437907714596,67.7854714945221,61.4537685148989,7,5
+Slovenia,SVN,2008,20146.2,2021316,FALSE,75.1638251858298,52.357489021571,89.7632711300417,44.7604757178614,18.2495396679025,27.9616491621299,100,31.2284351970609,,84.9655695632239,65.0011183695723,62.6623938999434,7,5
+Slovenia,SVN,2009,20145.8,2039669,FALSE,82.1931022753043,14.7720346351809,67.8223979767731,44.0658700225336,17.1275194231729,26.4910811344585,68.9646675978282,35.2845297687633,,62.441808228439,50.7181922736798,45.105782050549,7,5
+Slovenia,SVN,2010,20146.2,2048583,FALSE,89.5075293411176,11.1049766492447,72.5138271021491,43.8148205332112,15.5800717564492,25.2570870456724,66.9039513152737,37.9571464650804,,65.9382981099539,51.5170319977781,45.1438386145528,7,5
+Slovenia,SVN,2011,20146,2052843,FALSE,85.9275514356749,19.0141648562943,85.0172367903065,43.2504841003064,15.1429587452795,23.9833573375409,43.9244172264671,44.5249444852689,,77.9512367039767,50.186201957765,45.7330494744627,7,5
+Slovenia,SVN,2012,20145.7,2057159,FALSE,87.0333280955969,12.7868268649187,78.0459659568878,40.4020059302069,13.3000611710099,22.6455159218293,54.3520049817327,49.6978131764108,,70.9058741669773,49.2109412918621,45.6289050240493,7,5
+Slovenia,SVN,2013,20140,2059953,FALSE,92.4158385080276,2.89790831548695,80.9432613806672,40.9369252691167,12.1718310525976,22.9003374511163,54.2782850949591,40.9700304277553,,73.2460556627067,49.0620926698956,42.4658409540049,7,5
+Slovenia,SVN,2014,20140,2061980,FALSE,90.9458754439462,26.2060626678903,84.8716135254225,43.2827004718639,11.8175058524589,23.2270686543899,50.7265451758124,48.0479929447487,,77.3313801840186,53.2099776565542,49.1189362888668,7,5
+Slovenia,SVN,2015,20142.6,2063531,FALSE,92.7926359867403,43.697739376904,73.6865150517344,46.688161642679,12.2778221224204,21.4989859757368,50.6884178728702,56.9029880599984,,68.3816137838209,54.8420759844441,53.2717841472545,7,5
+Slovenia,SVN,2016,20142,2065042,FALSE,95.7689117961259,40.8604207731474,76.894392103095,51.7954518087943,11.8296543968607,26.4547087838152,50.651328942279,69.2997968249026,,71.4769588402576,57.0708690345428,56.8167914378762,7,5
+Slovenia,SVN,2017,20138.1,2066388,FALSE,100,38.7844423998576,89.606699172499,55.2654996889227,13.4506086918293,32.5171213826323,69.8183941698713,71.0304196464091,,82.668071355643,64.3320261356305,63.5133654521408,7,5
+Slovenia,SVN,2018,20136.4,2073894,FALSE,100,42.0221995699766,100,57.601796899058,14.2422596063524,,76.5222721513641,,,94.0015885491125,75.2292537240798,67.5369642923778,6,4
+Slovenia,SVN,2019,20136.4,2088385,FALSE,100,72.3737790423072,100,62.5362080698138,,,,,,92.4694566033303,83.7274967780303,75.7931479051504,4,3
+Slovenia,SVN,2020,20136.4,2100126,FALSE,100,17.0030068478176,90.532474119139,,,,,,,83.5576120909469,69.1784936556522,50.2803094693823,3,2
+Sweden,SWE,1990,410340,8558835,FALSE,0.17879529841589,85.1237180644463,39.8217826309289,,,,,,,40.7639183281592,41.708098664597,62.9438181963027,3,2
+Sweden,SWE,1991,410340,8617375,FALSE,0.352770715693929,69.286196765767,37.814184418813,,,,,,,39.3133698133795,35.8177173000913,54.2997832895732,3,2
+Sweden,SWE,1992,410340,8668067,FALSE,0.452655028267326,2.14634589805317,38.7474172290236,,,,,,,40.3521809431077,13.7821393851147,21.2492634205804,3,2
+Sweden,SWE,1993,410340,8718561,FALSE,0.515679332924172,26.0356444714039,32.3746030094706,,,,,,,34.0208706222744,19.6419756045995,30.0282575468392,3,2
+Sweden,SWE,1994,410340,8780745,FALSE,1.0181126926666,64.7053696450765,38.2034718362805,,,,,,,39.5081466258064,34.6423180580079,52.1067581354414,3,2
+Sweden,SWE,1995,410340,8826939,FALSE,1.51288830292346,100,48.2428012457577,3.17765409207124,,,,,,50.9427340511274,38.2333359101881,51.3734627143996,4,3
+Sweden,SWE,1996,410340,8840998,FALSE,2.6795084767977,52.6039853585427,50.8346539196821,3.26328585723367,,,,,,53.3650285856038,27.345358403064,36.41076660046,4,3
+Sweden,SWE,1997,410340,8846062,FALSE,7.02627735196455,100,50.5996833972565,3.27789607322747,,,,,,52.6602053231356,40.2259642056121,51.979367132121,4,3
+Sweden,SWE,1998,410340,8850974,FALSE,9.90483992191716,100,52.9652561339295,3.52998859611067,,,,,,54.7148331828582,41.6000211629893,52.748273926323,4,3
+Sweden,SWE,1999,410340,8857874,FALSE,12.2526408250938,100,53.6163485355129,3.55740918967302,,,,,,55.9941650135183,42.3565996375699,53.1838580677304,4,3
+Sweden,SWE,2000,410340,8872109,FALSE,13.4892270999127,100,56.7974162423186,5.23995995676225,,,,,,60.1432635787439,43.8816508247484,55.127741178502,4,3
+Sweden,SWE,2001,410340,8895960,FALSE,15.2427760692413,100,52.1352755620221,5.60826374259992,,,,,,54.8085184340155,43.2465788434658,53.4722607255385,4,3
+Sweden,SWE,2002,410340,8924958,FALSE,20.7123335039204,100,53.3819019429047,5.81870581327994,,,,,,55.3716932304799,44.9782353150262,53.7301330145866,4,3
+Sweden,SWE,2003,410340,8958229,FALSE,23.1384412888887,100,65.9672194613933,5.78624111633268,25.4150751188894,,93.4087499854015,,,69.1564010241044,57.6601303704032,67.0878480314596,6,4
+Sweden,SWE,2004,410340,8993531,FALSE,24.4340271659234,100,79.4685267787061,6.31462650107612,26.3907773338959,,66.5732237261818,,,84.7386508121882,55.3580808343775,64.4066252598615,6,4
+Sweden,SWE,2005,410340,9029572,FALSE,24.6091943241157,100,86.558293609271,6.56790426555278,26.1179410333391,16.7547827952228,67.905271760449,100,,94.0265389623447,50.3992411257686,73.6999429976693,7,5
+Sweden,SWE,2006,410340,9080505,FALSE,25.3163858768139,100,98.189676111762,6.32503419736601,25.4207610331968,15.2732841144909,69.9076014301324,23.7913332844392,,100,52.5019969550942,60.0047937823875,7,5
+Sweden,SWE,2007,410340,9148092,FALSE,23.4828812709289,100,100,6.93561525661141,25.8071347686461,22.1786495751839,72.1509912018162,36.5676493787001,,100,54.1246895507567,63.1308511674255,7,5
+Sweden,SWE,2008,410340,9219637,FALSE,25.5707685488816,100,100,6.00029670200988,27.6688881772307,23.3925754702139,48.5098127903371,71.6398963810448,,100,50.5789089185737,65.2300011746784,7,5
+Sweden,SWE,2009,410340,9298515,FALSE,25.6355648051629,100,92.3384762654954,6.39880034212031,23.5348697323664,20.4466144444756,99.6876281218458,94.7096159983253,,100,57.41784732985,80.1592088924583,7,5
+Sweden,SWE,2010,410340,9378126,FALSE,25.1386261852,100,100,6.71234805324505,24.9492859379588,22.0943782857077,64.2276664494216,100,,100,53.0288364955957,74.1880029005333,7,5
+Sweden,SWE,2011,410340,9449213,FALSE,25.7173932933975,100,100,14.8691448378866,26.7574281706268,22.2829184384313,64.50788475646,100,,100,54.5628902210292,75.8754059188693,7,5
+Sweden,SWE,2012,407340,9519374,FALSE,25.6406691195793,100,100,15.7868282338813,26.1180872545982,20.6056347158841,67.8213416361429,100,,100,54.9757456175813,76.7216339740049,7,5
+Sweden,SWE,2013,407340,9600379,FALSE,25.8618694702953,100,100,13.8922270381317,26.445097470909,,44.3317999300945,29.0482847344279,,100,56.8171792877043,57.4544623405308,6,5
+Sweden,SWE,2014,407310,9696110,FALSE,24.9950024843976,56.2224841157741,100,13.1812386711643,26.4923943891843,19.0987631312371,74.0248060471841,34.8165590767109,,100,47.9203824082929,55.6490175821667,7,5
+Sweden,SWE,2015,407310,9799186,FALSE,24.221563071895,100,100,8.03422176421033,27.339329928776,15.4441113275631,51.5299558169037,39.6927865109063,,100,49.871641996762,59.8513928184041,7,5
+Sweden,SWE,2016,407310,9923085,FALSE,23.6659131774329,74.759565800311,100,8.30115244003287,28.6932178953129,15.0366131326256,58.8830149255158,44.3741847233528,,100,46.7743765793197,57.2635835778425,7,5
+Sweden,SWE,2017,407310,10057698,FALSE,24.223043897547,100,100,35.2369006693999,29.4268112812135,11.5616085831072,58.0949201459581,46.6989682053676,,100,54.8527455493354,68.0061578041451,7,5
+Sweden,SWE,2018,407310,10175214,FALSE,22.9755009435675,59.3193359085206,100,32.6857203328054,29.7539684616491,,59.196312593391,,,100,54.8353739556569,62.8003422086793,6,4
+Sweden,SWE,2019,407310,10278887,FALSE,24.0807870702964,100,100,31.5263881014776,,,,,,100,63.9017937929435,77.1754627004925,4,3
+Sweden,SWE,2020,407310,10353442,FALSE,23.9190168175119,100,100,,,,,,,100,74.639672272504,100,3,2
+Eswatini,SWZ,1990,17200,822423,TRUE,0,2.01170135177921,4.15657722272809,,,,,,,4.30702795110722,2.0560928581691,3.15936465144321,3,2
+Eswatini,SWZ,1991,17200,845267,TRUE,0,5.56025004100268,4.26084877912495,,,,,,,4.41217816989354,3.27369960670921,4.98621410544811,3,2
+Eswatini,SWZ,1992,17200,866995,TRUE,0,6.09458455565832,4.77557484885139,,,,,,,4.92697555762585,3.6233864681699,5.51078005664208,3,2
+Eswatini,SWZ,1993,17200,887706,TRUE,0,4.92597393939741,4.92887589043104,,,,,,,4.9289472535706,3.28494994327615,4.92746059648401,3,2
+Eswatini,SWZ,1994,17200,907622,TRUE,0,6.18311413444506,5.11628046167329,,,,,,,5.15171051601911,3.76646486537278,5.66741232523208,3,2
+Eswatini,SWZ,1995,17200,926836,TRUE,0.00291599434411939,3.42371165701513,5.905428782972,,,,,,,5.71680428217726,3.11068547811042,4.57025796959619,3,2
+Eswatini,SWZ,1996,17200,945506,TRUE,0.139628091456884,1.30637606753454,5.64792402738925,17.1764620634396,,,,,,5.53586261442014,6.06759756245508,8.00623358179811,4,3
+Eswatini,SWZ,1997,17200,963416,TRUE,0.240752118687131,1.24285540151854,5.81582622815178,20.6146813820237,,,,,,5.57903473660712,6.97852878259529,9.14552384004979,4,3
+Eswatini,SWZ,1998,17200,979922,TRUE,0.256888810942904,7.90597406834732,5.88144074831978,12.2218544922568,,,,,,5.74048386409142,6.56653952996671,8.62277080823185,4,3
+Eswatini,SWZ,1999,17200,994105,TRUE,1.24034720566597,4.91968417745882,5.35097505950279,15.3102023473079,,,,,,5.16299628641987,6.70530219748387,8.46429427039553,4,3
+Eswatini,SWZ,2000,17200,1005432,FALSE,2.41303327867833,4.69950442947688,6.40017191339393,13.905306735964,,,,,,6.05695541892579,6.85450408937827,8.22058886145554,4,3
+Eswatini,SWZ,2001,17200,1013608,FALSE,3.31202946182059,2.03493968876215,5.82947529406904,15.7226955380925,,,,,,5.46420948826539,6.72478499568606,7.74061490504,4,3
+Eswatini,SWZ,2002,17200,1019054,FALSE,4.66855497911231,4.01433827837319,5.628274542619,16.3419913783116,,,,,,5.43724346703207,7.66328979460402,8.59785770790561,4,3
+Eswatini,SWZ,2003,17200,1022796,FALSE,6.24158318469633,3.31317317050023,8.71430845471031,18.3250768466517,4.64471676901026,,,,,7.96119181670598,9.14853541413965,9.86648061128598,5,3
+Eswatini,SWZ,2004,17200,1026287,FALSE,8.24084891700049,3.03546378451692,9.39400100488904,,4.6408519393212,,,,,8.73377155398633,6.89010456880215,5.88461766925163,4,2
+Eswatini,SWZ,2005,17200,1030575,FALSE,9.39680833408368,2.88881434037181,9.32468277146104,26.6855715295544,4.54542324816996,,,,,8.90074287542593,12.0739692438677,12.8250429151174,5,3
+Eswatini,SWZ,2006,17200,1036095,FALSE,9.34567736007605,5.14939816784039,9.34509899400122,26.6371891901799,4.51173203832525,,,,,9.12958611330645,12.6193409280244,13.6387244904422,5,3
+Eswatini,SWZ,2007,17200,1042651,FALSE,10.3005398494371,2.55159941365466,10.5468616605091,27.4949810175177,5.43781269237798,,,,,10.2338772889848,12.7234954852796,13.4268192400524,5,3
+Eswatini,SWZ,2008,17200,1049948,FALSE,17.0898352029199,4.74830367052759,9.00610566834368,27.3385946039944,4.34011715086561,,,0.0250518998830096,,9.08610902434818,14.5457097864464,10.2995147996883,5,4
+Eswatini,SWZ,2009,17200,1057462,FALSE,22.1456199661227,3.01621474095918,9.19353180839294,29.7405776107488,3.49101977017302,,20.4648335200544,0.0304251341035753,,9.4480682024193,16.9121555292556,12.5400238416571,6,5
+Eswatini,SWZ,2010,17200,1064841,FALSE,27.1581012282796,5.74852974512971,10.6139256864894,28.3366100645405,3.4276808158775,,6.7743396381193,0.110160157922065,,10.5764789204586,15.7263012725117,10.309223705234,6,5
+Eswatini,SWZ,2011,17200,1072029,FALSE,44.3002690896194,4.05463748165042,8.3797001501564,29.3704306418535,3.34980831823395,,0,0.350390832991755,,8.30643685927059,17.2210074726559,8.41637916315325,6,5
+Eswatini,SWZ,2012,17200,1079285,FALSE,50.4384520468943,1.41176605282845,8.42540471938389,30.1747094157571,3.04111475015035,,0,0.316075752890881,,8.49301341031695,18.0900664469727,8.07911292635867,6,5
+Eswatini,SWZ,2013,17200,1086843,FALSE,59.5312819345481,3.49774494149456,8.3710053803186,32.0997242060777,3.01093035426662,,0,0.330758038775525,,8.54568290198503,20.6999512924878,8.89478201766657,6,5
+Eswatini,SWZ,2014,17200,1095022,FALSE,59.8042788769197,1.05386087610035,8.62152329601278,33.0802707408425,2.26540238058005,,3.2938126332597,0.395306641284846,,8.67774301525776,21.170749284627,9.30019878134904,6,5
+Eswatini,SWZ,2015,17200,1104038,FALSE,60.8415992583031,1.29981996405379,7.488198680629,32.6670709246277,,,,1.19772587855584,,7.80857753983474,25.5741722069034,10.743298576768,4,4
+Eswatini,SWZ,2016,17200,1113994,FALSE,,1.34492013836339,7.22788242622768,33.4546875325097,,,,1.41957186561921,,7.21836315723868,14.0091633657002,10.8593856734327,3,4
+Eswatini,SWZ,2017,17200,1124808,FALSE,,4.73710547130941,8.27152652922735,33.4138381106644,,,,1.63101883831877,,8.477339134094,15.4741567037337,12.0648253885966,3,4
+Eswatini,SWZ,2018,17200,1136274,FALSE,,1.51257055949764,8.40803007852112,32.0075437724512,0,,0,,,8.47771304165717,10.4820361026175,10.4994568434015,5,4
+Eswatini,SWZ,2019,17200,1148133,FALSE,,5.68728744850079,8.38381039514378,31.1796355092225,,,,,,8.61899733432039,15.083577784289,15.1619734306812,3,3
+Eswatini,SWZ,2020,17200,1160164,FALSE,,0.532012169684332,7.26844439688812,,,,,,,7.47786761489505,3.90022828328623,4.00493989228969,2,2
+Sint Maarten (Dutch part),SXM,1990,34,28814,TRUE,,,,,,,,,,,,,0,0
+Sint Maarten (Dutch part),SXM,1991,34,29852,TRUE,,,,,,,,,,,,,0,0
+Sint Maarten (Dutch part),SXM,1992,34,30458,TRUE,,,,,,,,,,,,,0,0
+Sint Maarten (Dutch part),SXM,1993,34,30765,TRUE,,,,,,,,,,,,,0,0
+Sint Maarten (Dutch part),SXM,1994,34,30950,TRUE,,,,,,,,,,,,,0,0
+Sint Maarten (Dutch part),SXM,1995,34,31164,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,1996,34,31434,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,1997,34,31731,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,1998,34,31240,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,1999,34,31084,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2000,34,30519,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2001,34,30600,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2002,34,30777,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2003,34,31472,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2004,34,32488,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2005,34,33011,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2006,34,33441,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2007,34,33811,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2008,34,33964,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2009,34,34238,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2010,34,34056,TRUE,,,,100,,,,,,,100,100,1,1
+Sint Maarten (Dutch part),SXM,2011,34,33435,TRUE,,65.1275785589523,100,100,,,,,,100,88.3758595196508,88.3758595196508,3,3
+Sint Maarten (Dutch part),SXM,2012,34,34640,TRUE,,20.5793542501505,100,100,,,,,,100,73.5264514167168,73.5264514167168,3,3
+Sint Maarten (Dutch part),SXM,2013,34,36607,TRUE,,60.8691171268152,100,100,,,,,,100,86.9563723756051,86.9563723756051,3,3
+Sint Maarten (Dutch part),SXM,2014,34,37685,TRUE,,56.9432975444501,100,100,,,,,,100,85.64776584815,85.64776584815,3,3
+Sint Maarten (Dutch part),SXM,2015,34,38825,TRUE,,31.4916396426761,100,100,,,,,,100,77.163879880892,77.163879880892,3,3
+Sint Maarten (Dutch part),SXM,2016,34,39969,TRUE,,48.104594928398,100,100,,,,,,100,82.7015316427993,82.7015316427993,3,3
+Sint Maarten (Dutch part),SXM,2017,34,40574,TRUE,,71.8052968143056,100,100,,,,,,100,90.6017656047685,90.6017656047685,3,3
+Sint Maarten (Dutch part),SXM,2018,34,40654,TRUE,,55.9228456925773,100,100,,,,,,100,85.3076152308591,85.3076152308591,3,3
+Sint Maarten (Dutch part),SXM,2019,34,40733,TRUE,,60.8806038474043,100,100,,,,,,100,86.9602012824681,86.9602012824681,3,3
+Sint Maarten (Dutch part),SXM,2020,34,40812,TRUE,,2.09465813012325,76.0971588411123,,,,,,,69.806410931197,39.0959084856178,35.9505345306601,2,2
+Seychelles,SYC,1990,460,69507,TRUE,0,13.4817395884007,16.5252803293457,,,,,,,15.1364682159458,10.0023399725821,14.3091039021733,3,2
+Seychelles,SYC,1991,460,70439,TRUE,0,12.9001028435373,15.3329648642786,,,,,,,14.0410839512672,9.41102256927196,13.4705933974022,3,2
+Seychelles,SYC,1992,460,70763,TRUE,0,6.31337497813497,17.0326274178109,,,,,,,15.4913034055768,7.78200079864862,10.9023391918559,3,2
+Seychelles,SYC,1993,460,72253,TRUE,0,12.0430962470941,20.5594565573251,,,,,,,18.608175653379,10.8675176014731,15.3256359502365,3,2
+Seychelles,SYC,1994,460,74205,TRUE,0,26.0463183045927,18.6001060337188,,,,,,,17.0718047580114,14.8821414461038,21.5590615313021,3,2
+Seychelles,SYC,1995,460,75304,TRUE,0,36.6067171048589,20.8457872889752,25.4869353971706,,,,,,19.5006573492727,20.7348599477512,27.1981032837674,4,3
+Seychelles,SYC,1996,460,76417,TRUE,22.33173103403,23.6969069385989,22.5946002637141,27.1823029000863,,,,,,20.77072796772,23.9513852841073,23.883312602135,4,3
+Seychelles,SYC,1997,460,77319,TRUE,43.4650920748794,35.8991906143732,25.0145871765095,26.0796043892625,,,,,,22.7567488656527,32.6146185637561,28.2451812897628,4,3
+Seychelles,SYC,1998,460,78846,TRUE,83.9265350420244,31.2687891817528,25.6522506176269,25.4204240293408,,,,,,23.2760327638861,41.5669997176862,26.6550819916599,4,3
+Seychelles,SYC,1999,460,80410,TRUE,100,35.0180514025105,28.5098939107351,24.4727347500538,,,,,,26.0262324350448,47.0001700158249,28.5056728625364,4,3
+Seychelles,SYC,2000,460,81131,TRUE,100,18.8277823338972,29.2957821503585,26.3514931175344,,,,,,27.0382854154178,43.6187644004475,24.0725202889498,4,3
+Seychelles,SYC,2001,460,81202,TRUE,100,39.5790999540955,34.3733723060547,26.7772562719512,,,,,,31.2804236174396,50.1824321330254,32.5455932811621,4,3
+Seychelles,SYC,2002,460,83723,TRUE,100,29.5715612208974,33.1066831089052,27.2767905675479,,,,,,31.0750427393835,47.4887587243376,29.3077981759429,4,3
+Seychelles,SYC,2003,460,82781,TRUE,100,35.2715157227634,35.4066286326477,25.972971452988,41.3336911262807,,,,100,32.7109792197399,59.3302231616798,48.4888665988728,5,4
+Seychelles,SYC,2004,460,82475,TRUE,100,24.2573396820152,38.0964003461284,25.627464270275,42.2300576889972,,,,100,34.6976689347185,57.5962408596837,46.1456182217522,5,4
+Seychelles,SYC,2005,460,82858,TRUE,100,44.0770192915075,46.8199749020899,27.4149512918751,41.6206872794113,,,,100,42.5128393862755,63.6623890970945,53.5012024924145,5,4
+Seychelles,SYC,2006,460,84600,TRUE,100,74.2526855081426,52.4423152660564,29.5786848146782,38.0690902555393,,,0.225432239155347,,47.5169568432978,64.0684213972193,37.8934398513185,5,4
+Seychelles,SYC,2007,460,85033,TRUE,100,99.9343325093497,51.2506556890456,32.7138778745145,40.2389593113925,16.6834654937521,,0.379633984575294,,46.8102043282436,60.1164663133324,44.9595121741708,6,4
+Seychelles,SYC,2008,460,86956,TRUE,100,97.2375279684059,55.2381732240523,31.7109855954165,42.5907236665083,26.3229955126943,,0.628647132837194,,50.4268904393974,62.1019364601138,45.0010127840143,6,4
+Seychelles,SYC,2009,460,87298,TRUE,,87.2111808025625,50.9995423162727,31.5867484526358,42.1992362863875,31.8176084200199,41.3159212959896,1.252478855355,,46.1517666484048,48.5862002574961,41.5036192109895,6,5
+Seychelles,SYC,2010,460,89770,TRUE,100,81.076892710235,50.8645374701696,33.8293354705516,41.7743676555172,21.583661903413,0,1.51637919913403,,45.2672286556558,47.8924045923949,32.3379672071153,7,5
+Seychelles,SYC,2011,460,87441,TRUE,100,75.8191135447489,58.7209445145078,35.8418420054907,49.2223640524948,20.9198468548215,41.2483537161892,1.84632596964536,,53.5741372404746,55.4250167726264,41.6659544953097,7,5
+Seychelles,SYC,2012,460,88303,TRUE,100,100,72.5195814732527,35.9046593314531,55.5426847312287,14.2019862381375,81.6913875473607,5.63804790014033,,69.3601525898144,67.3862690983673,58.5188494737537,7,5
+Seychelles,SYC,2013,460,89949,TRUE,100,61.0931984072781,80.7401384123344,38.353842867802,57.3330651513612,13.2582647970921,0,9.05951033679776,,74.2875351519721,48.9075740807511,36.55881735277,7,5
+Seychelles,SYC,2014,460,91359,TRUE,100,88.9229250242341,78.3013650333188,38.4267292889406,52.6114843328026,11.6789272745467,39.479386785071,11.7713883480122,,71.5055521161856,59.4682222343519,50.0211963124887,7,5
+Seychelles,SYC,2015,460,93419,TRUE,100,90.5919631011101,70.3611024865326,45.7716955159265,76.9812272945094,7.12711961411476,38.6088193761151,16.4350574196054,,64.780747452399,58.7434500156332,51.2376565730312,7,5
+Seychelles,SYC,2016,460,94677,TRUE,100,55.2587019171159,72.8354571693088,51.450660842063,88.2818415475264,7.69072525495265,76.1916262090539,21.6341608293475,,67.324232148787,60.5711952320824,54.3718763892735,7,5
+Seychelles,SYC,2017,460,95843,TRUE,100,86.460458939117,82.5102020468791,57.7958776447148,100,29.5143033176561,0,28.2394178922444,,75.9198719097254,59.3801403247278,49.6831252771603,7,5
+Seychelles,SYC,2018,460,96762,TRUE,100,100,88.3910894359875,59.8833851879701,96.2336209427181,,37.2749353805967,,,80.7154526279751,77.1098820009109,69.4684432991355,6,4
+Seychelles,SYC,2019,460,97625,TRUE,100,100,84.2841808607257,62.7137492764507,,,,,,76.6132040435062,86.7494825342941,79.7756511066523,4,3
+Seychelles,SYC,2020,460,98462,TRUE,100,3.22608441021079,59.8558494629346,,,,,,,54.3750250261732,54.3606446243818,28.800554718192,3,2
+Syrian Arab Republic,SYR,1990,183780,12446168,FALSE,0,0.140955996246355,1.51412568216245,,,,,,,1.52685212564032,0.551693892802935,0.833904060943337,3,2
+Syrian Arab Republic,SYR,1991,183780,12815400,FALSE,0,0.184808021080171,1.44570680922199,,,,,,,1.5019703320158,0.543504943434054,0.843389176547988,3,2
+Syrian Arab Republic,SYR,1992,183780,13187669,FALSE,0,0.189568441859781,1.50746934083913,,,,,,16.6708514822781,1.6008066472806,4.59197231624426,6.15374219047283,3,3
+Syrian Arab Republic,SYR,1993,183780,13565074,FALSE,0,0.352422439932792,1.71032557694504,,,,,,17.279199683127,1.71759680347534,4.83548692500122,6.44973964217839,3,3
+Syrian Arab Republic,SYR,1994,183780,13950486,FALSE,0,0.789121010698595,1.94040700249006,,,,,,17.3701553627037,1.93373608943827,5.0249208439731,6.69767082094687,3,3
+Syrian Arab Republic,SYR,1995,183780,14345491,FALSE,0,0.305734047354932,1.8675423188957,3.38495508512522,,,,,19.1264977423695,1.83546901323224,4.93694583874906,6.16316397202046,4,4
+Syrian Arab Republic,SYR,1996,183780,14754148,FALSE,0,0.26456664742716,1.93661259372761,3.54393031878569,,,,,20.1140038534572,1.90482241280422,5.17182268267953,6.45683080811856,4,4
+Syrian Arab Republic,SYR,1997,183780,15175308,FALSE,0.00562858546297586,0.23121270551998,1.67292808242253,3.70570055276658,,,,,23.4873645499496,1.6504174120055,5.82056689522434,7.26867380506042,4,4
+Syrian Arab Republic,SYR,1998,183780,15599588,FALSE,0.0106943577383412,0.230547250367989,1.45390450360537,3.79488437768974,,,,,24.9629437170532,1.42345147444469,6.09059484129092,7.60295670488889,4,4
+Syrian Arab Republic,SYR,1999,183780,16013992,FALSE,0.0203315626791606,0.720303233261478,1.57243748060131,4.30427005431485,,,,,28.3194669489117,1.52922373349693,6.9873618559537,8.71831599249624,4,4
+Syrian Arab Republic,SYR,2000,183780,16410847,FALSE,0.0290025130375127,0.721592466662696,1.76586383566754,5.38379017922143,,,,,29.927961917215,1.73513479908454,7.56564218236083,9.44211984054591,4,4
+Syrian Arab Republic,SYR,2001,183780,16766555,FALSE,0.055268657211545,0.287745188394164,1.90481309258926,5.1883925168723,,,,,26.9918914021193,1.84897629867098,6.88562217143731,8.57925135151418,4,4
+Syrian Arab Republic,SYR,2002,183780,17084628,FALSE,0.320922196629791,0.295223915816739,2.02514197414807,5.67056217913269,,,,,21.1318887741015,1.93633569127392,5.88874780796576,7.25850264008122,4,4
+Syrian Arab Republic,SYR,2003,183590,17415214,FALSE,0.511100319960908,0.40294928558202,1.80048826125333,6.16069181497831,1.34086349216863,,1.65684891258749,,18.488729256263,1.73576453675851,4.83680130843751,5.68899676123386,6,5
+Syrian Arab Republic,SYR,2004,183570,17827827,FALSE,0.634980845034289,0.676540041475066,2.54412866215196,7.250733679493,1.58352440408697,4.1299672304746,3.23700452987101,100,15.6234507206329,2.39224056989864,4.87097224416184,21.5299949235618,7,6
+Syrian Arab Republic,SYR,2005,183570,18361178,FALSE,0.805781691877274,1.19434194928118,2.94189369798001,6.89451948258109,1.62383648408719,4.70302559365355,1.3750523567214,100,15.0797413176994,2.75316071551425,4.71347944139914,21.2161359702996,7,6
+Syrian Arab Republic,SYR,2006,183630,19059257,FALSE,1.07649592622792,1.51648692878896,3.14185957949527,6.19641474880057,1.71500952498524,,,0.0253024694035101,15.6829719184117,2.93662644505608,5.52284582034488,5.27156050209216,5,5
+Syrian Arab Republic,SYR,2007,183640,19878257,FALSE,1.5154256477118,2.74023759903321,3.72397647875065,5.88361256961397,1.7548688157967,10.086634635224,1.45155475041793,0.0388752923651078,,3.44735619081255,4.23357361345859,2.71232728044855,7,5
+Syrian Arab Republic,SYR,2008,183640,20664037,FALSE,1.77471229828145,3.1107595162659,4.53191066900448,7.17302571905255,1.74048527257903,11.2609768682725,1.04726795561699,0.0709189356719579,,4.18334474017407,4.81644217108231,3.11706337335629,7,5
+Syrian Arab Republic,SYR,2009,183640,21205873,FALSE,2.13700255285594,5.31446862639268,3.65302717759302,7.40904125334585,1.96412476118224,14.5753092016291,0.850424148370901,0.123264838745036,18.8995111498043,3.36454388001145,7.54839772999882,5.99354231611169,7,6
+Syrian Arab Republic,SYR,2010,183630,21362541,FALSE,2.53823910186022,3.0163817618193,4.38099395292683,9.79593910836778,2.27258609232228,13.2383663965908,0.84418733176388,0.196907644112369,25.7745026982339,4.03482084313105,8.51265862165182,7.27712323123805,7,6
+Syrian Arab Republic,SYR,2011,183630,21081814,FALSE,2.79569400232476,1.67299689811197,,3.73020789480793,2.19567667773763,21.6323224289538,0.342171437173034,0.567311456598026,27.4463267253852,,9.60328656445944,6.75180288241522,6,5
+Syrian Arab Republic,SYR,2012,183630,20438861,FALSE,3.11434316142003,,,,1.19806792553212,22.2817878849764,0.352935253808644,0.718014266183719,31.30221261517,,14.2628197288438,10.7910540450541,4,3
+Syrian Arab Republic,SYR,2013,183630,19578466,FALSE,3.50540114406572,,,,0.339755437095639,17.9364826757115,0,0.712088789420078,33.7699232873397,,13.8029517767792,11.4940040255866,4,3
+Syrian Arab Republic,SYR,2014,183630,18710711,FALSE,3.93257072892193,,,,0.0387157967585325,,0,0.902009295477859,35.532634714466,,13.1550684811293,12.1448813366479,3,3
+Syrian Arab Republic,SYR,2015,183630,17997411,FALSE,4.36348764556246,,,,0.041289102511323,5.14866128530775,0,1.93925033981002,37.1071428235489,,11.6548229386048,13.0154643877863,4,3
+Syrian Arab Republic,SYR,2016,183630,17465567,FALSE,4.77979630423982,,,0.723992514814551,0.336068393315634,4.05004020520073,0,3.90764274778082,39.3460349370683,,9.77997279226468,10.9944175499159,5,4
+Syrian Arab Republic,SYR,2017,183630,17095669,FALSE,5.24846981688273,,,0.915914511485039,0.364606675088636,,0,6.43909159923356,43.2799935979768,,12.3610944815861,12.6587499271738,4,4
+Syrian Arab Republic,SYR,2018,183630,16945062,FALSE,,,,1.29040528492165,0.39433804725369,,0,,,,0.645202642460826,0.645202642460826,3,2
+Syrian Arab Republic,SYR,2019,183630,17070132,FALSE,,,,1.72358636016704,,,,,,,1.72358636016704,1.72358636016704,1,1
+Syrian Arab Republic,SYR,2020,183630,17500657,FALSE,,,,,,,,,,,,,0,0
+Turks and Caicos Islands,TCA,1990,950,12115,TRUE,0,,,,,,,,,,0,,1,0
+Turks and Caicos Islands,TCA,1991,950,12815,TRUE,0,,,,,,,,,,0,,1,0
+Turks and Caicos Islands,TCA,1992,950,13639,TRUE,0,,,,,,,,,,0,,1,0
+Turks and Caicos Islands,TCA,1993,950,14526,TRUE,0,,,,,,,,,,0,,1,0
+Turks and Caicos Islands,TCA,1994,950,15399,TRUE,0,,,,,,,,,,0,,1,0
+Turks and Caicos Islands,TCA,1995,950,16221,TRUE,0,,,,,,,,,,0,,1,0
+Turks and Caicos Islands,TCA,1996,950,16930,TRUE,,,,,,,,,,,,,0,0
+Turks and Caicos Islands,TCA,1997,950,17566,TRUE,,,,,,,,,,,,,0,0
+Turks and Caicos Islands,TCA,1998,950,18228,TRUE,,,,,,,,,,,,,0,0
+Turks and Caicos Islands,TCA,1999,950,19069,TRUE,,,,,,,,,,,,,0,0
+Turks and Caicos Islands,TCA,2000,950,20171,TRUE,,,,,,,,,,,,,0,0
+Turks and Caicos Islands,TCA,2001,950,21578,TRUE,,,,,,,,,,,,,0,0
+Turks and Caicos Islands,TCA,2002,950,23230,TRUE,,,,,,,,,,,,,0,0
+Turks and Caicos Islands,TCA,2003,950,25008,TRUE,,,,,100,,,,,,,,1,0
+Turks and Caicos Islands,TCA,2004,950,26709,TRUE,,,,,100,,,,,,,,1,0
+Turks and Caicos Islands,TCA,2005,950,28181,TRUE,,,,,100,,,,,,,,1,0
+Turks and Caicos Islands,TCA,2006,950,29394,TRUE,,,,,100,,,,,,,,1,0
+Turks and Caicos Islands,TCA,2007,950,30383,TRUE,,,,,100,,,,,,,,1,0
+Turks and Caicos Islands,TCA,2008,950,31200,TRUE,,,,100,100,,,,,,100,100,2,1
+Turks and Caicos Islands,TCA,2009,950,31933,TRUE,,,,100,100,,100,,,,100,100,3,2
+Turks and Caicos Islands,TCA,2010,950,32658,TRUE,,,,100,100,,0,,,,50,50,3,2
+Turks and Caicos Islands,TCA,2011,950,33371,TRUE,,,,100,100,,0,,,,50,50,3,2
+Turks and Caicos Islands,TCA,2012,950,34067,TRUE,,,,100,100,,100,,,,100,100,3,2
+Turks and Caicos Islands,TCA,2013,950,34733,TRUE,,,,100,100,,0,,,,50,50,3,2
+Turks and Caicos Islands,TCA,2014,950,35371,TRUE,,89.6264174301142,74.1920320981135,100,100,,0,,,65.8044842443534,65.9546123820569,63.8577254186169,5,4
+Turks and Caicos Islands,TCA,2015,950,35979,TRUE,,85.2252085920985,74.5537415095029,100,100,,100,,,66.0928093331837,89.9447375254004,87.8295044813205,5,4
+Turks and Caicos Islands,TCA,2016,950,36558,TRUE,,21.6523917846201,78.011714533711,100,100,,98.6595901662371,,,68.8633870761441,74.5809241211421,72.2938422567503,5,4
+Turks and Caicos Islands,TCA,2017,950,37116,TRUE,,54.860444734838,70.8542276876198,100,100,,97.1763470551056,,,64.2624021182174,80.7227548693908,79.0747984770402,5,4
+Turks and Caicos Islands,TCA,2018,950,37667,TRUE,,100,88.0367183448448,100,100,,0,,,80.9325926864202,72.0091795862112,70.2331481716051,5,4
+Turks and Caicos Islands,TCA,2019,950,38194,TRUE,,30.9607030707457,,100,,,,,,,65.4803515353729,65.4803515353729,2,2
+Turks and Caicos Islands,TCA,2020,950,38718,TRUE,,,,,,,,,,,,,0,0
+Chad,TCD,1990,1259200,5963250,FALSE,0,0.0695761465658397,0.269775784764473,,,,,,,0.231962601601088,0.113117310443438,0.150769374083464,3,2
+Chad,TCD,1991,1259200,6157085,FALSE,0,0.105016918810358,0.230036102298421,,,,,,,0.194547686528235,0.111684340369593,0.149782302669296,3,2
+Chad,TCD,1992,1259200,6356741,FALSE,0,0.108567346490899,0.219252716490818,,,,,,,0.188974274439046,0.109273354327239,0.148770810464973,3,2
+Chad,TCD,1993,1259200,6563925,FALSE,0,0.174335824353037,0.201200377610994,,,,,,,0.168811958249218,0.12517873398801,0.171573891301128,3,2
+Chad,TCD,1994,1259200,6781057,FALSE,0,0.178750509055426,0.176527585374454,,,,,,,0.146211706064122,0.118426031476627,0.162481107559774,3,2
+Chad,TCD,1995,1259200,7010159,FALSE,0,0.219388829945985,,0.0314719836903437,,,,,,,0.0836202712121096,0.125430406818164,3,2
+Chad,TCD,1996,1259200,7250974,FALSE,,0.24636978067031,,0.0320538456177373,,,,,,,0.139211813144023,0.139211813144023,2,2
+Chad,TCD,1997,1259200,7503494,FALSE,0.000229767351138173,0.264432741536163,,0.0422590249123913,,,,,,,0.102307177933231,0.153345883224277,3,2
+Chad,TCD,1998,1259200,7770053,FALSE,0.00143901991912403,0.124182327800319,,0.0626474997683288,,,,,,,0.0627562824959239,0.0934149137843238,3,2
+Chad,TCD,1999,1259200,8053532,FALSE,0.00400774723264666,0.145254780312097,,0.0679332026407928,,,,,,,0.0723985767285122,0.106593991476445,3,2
+Chad,TCD,2000,1259200,8355654,FALSE,0.0111940935994586,0.604543106203266,,0.0610627580985071,,,,,,,0.225599985967077,0.332802932150887,3,2
+Chad,TCD,2001,1259200,8678049,FALSE,0.0138652763179768,2.3241748446279,,0.078338136608722,,,,,,,0.805459419184865,1.20125649061831,3,2
+Chad,TCD,2002,1259200,9019226,FALSE,0.0482320958743613,4.49384358143751,,0.0416474070802448,,,,,,,1.52790769479737,2.26774549425888,3,2
+Chad,TCD,2003,1259200,9373913,FALSE,0.0895081773522301,3.33443912683482,,0.0257613193695252,0.235796570790244,,,,,,1.14990287451886,1.68010022310217,4,2
+Chad,TCD,2004,1259200,9734761,FALSE,0.0971182566526648,2.10309418251263,,0.0309920044919673,0.251651997119384,,,,,,0.74373481455242,1.0670430935023,4,2
+Chad,TCD,2005,1259200,10096630,FALSE,0.103583827177404,0.431536913618532,,0.0334386566331883,0.318299682960686,,,,,,0.189519799143041,0.23248778512586,4,2
+Chad,TCD,2006,1259200,10457122,FALSE,0.145550351484897,1.16771838518613,,0.0519845868320747,0.325066957010022,,,0.000274935882715651,,,0.455084441167701,0.406659302633641,4,3
+Chad,TCD,2007,1259200,10818031,FALSE,0.205147103418287,1.30407121289218,,0.085012828876388,0.369662565341361,,,0.000295977963100526,,,0.53141038172895,0.463126673243888,4,3
+Chad,TCD,2008,1259200,11183589,FALSE,0.278728165945981,1.8280413336716,,0.127808208020134,0.357947241909293,,,0.00113575194541003,,,0.744859235879239,0.652328431212382,4,3
+Chad,TCD,2009,1259200,11560142,FALSE,0.339893754234312,1.42236643266919,,0.14146215083905,0.282182646418502,,0.312002854056403,0.00110783599123449,,,0.55393129794974,0.46923481838897,5,4
+Chad,TCD,2010,1259200,11952134,FALSE,0.372579162212927,1.1485716883182,,0.110348991462496,0.327203821879654,,0.301770152283876,0.00106786022976273,,,0.483317498569374,0.390439673073583,5,4
+Chad,TCD,2011,1259200,12360986,FALSE,0.40263876044286,1.00023301253607,,0.148909967684094,0.350020587181539,1.55733970962139,0.583577604132437,0.00285749092673807,,,0.738539810883371,0.433894518819836,6,4
+Chad,TCD,2012,1259200,12784748,FALSE,0.430271139439467,1.98902410590506,,0.155328341433965,0.297893251583966,1.77728327833169,0,0.00758094970160064,,,0.870381373022037,0.537983349260157,6,4
+Chad,TCD,2013,1259200,13220433,FALSE,0.495346869988013,1.72577637144467,,0.0876778606526868,0.265014477576705,2.16202011936595,0.272819906677587,0.00871523844312481,,,0.948728225625782,0.523747344304517,6,4
+Chad,TCD,2014,1259200,13663562,FALSE,0.555967186555456,2.16845374940707,,0.104346905281979,0.338512216519783,2.08952324483109,0.263971964067444,0.0128869996067612,,,1.03645261002861,0.637414904590814,6,4
+Chad,TCD,2015,1259200,14110971,FALSE,0.649720005023803,1.73945276951897,,0.101853243503287,0.381907114167662,1.74794150593322,0.255602346379799,0.0490884993417442,,,0.898913974071816,0.536499214685949,6,4
+Chad,TCD,2016,1259200,14561658,FALSE,0.899444294933481,0.736971396952019,,0.127020139084996,0.341740802635673,,0.247691389077899,0.132688532637386,,,0.502781805012099,0.311092864438075,5,4
+Chad,TCD,2017,1259200,15016761,FALSE,1.13384073650182,1.06131897881732,,0.110992180313365,0.309609131697425,,0,0.0685526111832512,,,0.576537973908125,0.310215942578484,5,4
+Chad,TCD,2018,1259200,15477727,FALSE,1.35393526068757,1.30601992532286,,,0.284328863547529,,0.466062917028747,,,,1.04200603434639,0.886041421175804,4,2
+Chad,TCD,2019,1259200,15946882,FALSE,1.60977578044599,1.55843921197448,,,,,,,,,1.58410749621023,1.55843921197448,2,1
+Chad,TCD,2020,1259200,16425859,FALSE,1.65851858601579,,,,,,,,,,1.65851858601579,,1,0
+Togo,TGO,1990,54390,3774310,FALSE,0,0.211951694420795,0.929754298925595,,,,,,,0.855425916445886,0.380568664448797,0.533688805433341,3,2
+Togo,TGO,1991,54390,3862998,FALSE,0,0.0735693991075815,0.891493535578597,,,,,,,0.815324876065162,0.321687644895393,0.444447137586372,3,2
+Togo,TGO,1992,54390,3945902,FALSE,0,0.145714103044354,0.758829485420181,,,,,,64.6351206030087,0.698971826627525,16.3849160478683,21.8266021775602,3,3
+Togo,TGO,1993,54390,4029044,FALSE,0,0.275177579902442,0.473647866689734,,,,,,69.9157736901877,0.424358960171129,17.666149784195,23.5384367434204,3,3
+Togo,TGO,1994,54390,4120615,FALSE,0,0.23363659294637,0.484561245320253,,,,,,74.8460093951644,0.442946535126762,18.8910518083578,25.1741975077459,3,3
+Togo,TGO,1995,54390,4226293,FALSE,0,0.493904782181695,0.611950801808971,0.150888718202346,,,,,77.6825539811625,0.547706042465621,15.7878596566711,19.718763381003,4,4
+Togo,TGO,1996,54390,4348808,FALSE,0.0065831054148683,0.146483143235983,0.699680136293982,0.160563925741776,,,,,83.0835053641897,0.6562105966431,16.8193631349753,21.0116907574526,4,4
+Togo,TGO,1997,54390,4485945,FALSE,0.123290770343229,0.181362089413756,0.614205258227548,0.247683156023802,,,,,84.3404715165924,0.570756787164129,17.1014025581201,21.3350683872985,4,4
+Togo,TGO,1998,54390,4632451,FALSE,0.172796435205441,0.185262787809074,0.588167576533275,0.179489655038054,,,,,91.3946654084716,0.552524662176572,18.5040763726115,23.0779856283738,4,4
+Togo,TGO,1999,54390,4780455,FALSE,0.323493221443804,0.364080591107944,0.508682696585028,0.176428792335771,,,,,100,0.484278389518016,20.2745370602945,25.2561969432404,4,4
+Togo,TGO,2000,54390,4924406,FALSE,0.425550621548994,0.570561661381625,0.467128746906792,0.146560033277646,,,,,100,0.43620554375958,20.321960212623,25.2883318096047,4,4
+Togo,TGO,2001,54390,5062571,FALSE,0.465678809900552,0.644007838593426,0.476093574430994,0.135321842978663,,,,,100,0.437091765564627,20.3442204131807,25.3041053617842,4,4
+Togo,TGO,2002,54390,5197040,FALSE,0.504033073167514,0.54622242945772,0.540978737781877,0.134120379749875,,,,,100,0.490121180912918,20.3450709240314,25.2926159975301,4,4
+Togo,TGO,2003,54390,5330629,FALSE,0.589682015216102,0.422810582020424,0.713103091439718,0.137559510694284,1.10510412942644,,,,100,0.641324874416699,20.3726310398741,25.3004237417829,5,4
+Togo,TGO,2004,54390,5467770,FALSE,0.718614730294387,0.711376316859188,0.779182690594426,0.182951098209881,1.3938269185855,2.2135930186554,,100,100,0.712944618791934,17.4342863091022,40.3214544067722,6,5
+Togo,TGO,2005,54390,5611643,FALSE,0.840228802265948,0.782407851300466,0.815597237036777,0.173893727975207,2.31768462045753,3.03782494360238,,100,100,0.74844317926292,17.6083254270301,40.3409489517077,6,5
+Togo,TGO,2006,54390,5762881,FALSE,0.909086980131811,0.698804616245832,0.820983584642357,0.196695577681091,1.18665777750367,3.30044124124313,,0.00170439747407566,100,0.75416732481672,17.654335333324,20.3302743832435,6,5
+Togo,TGO,2007,54390,5920360,FALSE,0.973396228213131,0.554738024228456,0.899191485920608,0.175009741237189,1.13723284716737,3.80703247082136,,0.00342426146927317,,0.828346745113269,1.28187359008415,0.390379693012047,6,4
+Togo,TGO,2008,54390,6083417,FALSE,1.03342448860218,0.445573114563874,1.08093331158083,0.146317142334065,0.862117535568939,,,0.0243781890614525,,0.99474273184852,0.676562014270237,0.402752794451978,5,4
+Togo,TGO,2009,54390,6250840,FALSE,1.08955726121508,0.571497327846227,1.08371613632757,0.29005858605404,1.27541309302206,,2.88505008710613,0.158973437408862,100,0.988233385824584,17.6533132330915,17.4823021373733,6,6
+Togo,TGO,2010,54390,6421674,FALSE,1.22373700809532,1.37579944255403,1.14042699568608,0.380672616685207,1.80748955090018,5.56901656602985,0.56165998107305,0.158512670441888,100,1.05830242864338,15.7501875157319,17.2558245232329,7,6
+Togo,TGO,2011,54390,6595939,FALSE,1.3899734592771,13.2650066570972,1.4976357421904,0.551066684280435,1.91724417614782,5.45264832528347,2.18728359816384,0.154321824593168,100,1.4743723690075,17.7633734951846,19.6053418555237,7,6
+Togo,TGO,2012,54390,6773807,FALSE,1.54682886156898,3.50816338109333,1.40650048271959,0.419989286635574,1.81799319052065,5.77128128800233,0.53246236529876,0.174318467363608,100,1.37476763534575,16.1693179521884,17.6682835226228,7,6
+Togo,TGO,2013,54390,6954721,FALSE,1.69491489185335,1.2882601498476,1.65734553403567,0.569724614204409,1.70509047122956,,2.07444542911056,0.210934989876019,100,1.61889576021673,17.8807817698419,17.6270434905426,6,6
+Togo,TGO,2014,54390,7137997,FALSE,2.09176835499856,2.53759937525304,1.47341656321161,0.478474732763626,1.37245861507963,6.17708665481067,1.51588630422399,0.360147805433015,100,1.45690489449441,16.3248902836088,17.7248355186947,7,6
+Togo,TGO,2015,54390,7323162,FALSE,2.54680941144418,3.63246070411088,1.25571712691061,0.451410261925094,1.79123870772438,6.06459131158175,0.492519119104193,0.373887503311603,100,1.25352551322901,16.3490725621538,17.7006338502801,7,6
+Togo,TGO,2016,54390,7509952,FALSE,3.94494123018596,1.7711612537032,1.2437453087927,0.854247361849627,1.94670896857908,4.57621132245693,1.4408070639988,0.364585287961366,100,1.21986367872405,16.2615876487125,17.6084441077062,7,6
+Togo,TGO,2017,54390,7698476,FALSE,4.20568468754672,0.690116328764349,1.11827206702452,1.1504644025215,1.78818245025223,3.47998856013627,0.937015922968987,0.696645657361902,100,1.11035581184342,15.9402202812803,17.43076635391,7,6
+Togo,TGO,2018,54390,7889095,FALSE,5.14659040864696,1.39641486540082,1.1984924585531,1.24427889150257,1.48300134318412,,2.7431262754199,,,1.16567597491073,2.34578057990467,1.63737400180851,6,4
+Togo,TGO,2019,54390,8082359,FALSE,6.25510012877277,2.10841976755423,1.1372023769451,1.71950639036759,,,,,,1.11181646530449,2.80505716590992,1.64658087440877,4,3
+Togo,TGO,2020,54390,8278737,FALSE,,,,,,,,,,,,,0,0
+Thailand,THA,1990,510890,56558196,FALSE,0,2.00359655273845,2.74701205498672,,,,,,,2.57801363502116,1.58353620257506,2.29080509387981,3,2
+Thailand,THA,1991,510890,57232471,FALSE,0.00000238914825505942,1.67143402035508,3.24968225207832,,,,,,,3.03865257251239,1.64037288719389,2.35504329643373,3,2
+Thailand,THA,1992,510890,57811025,FALSE,0.000015574551353032,1.71425538218999,3.64581872145538,,,,,,,3.35371979525688,1.78669655939891,2.53398758872344,3,2
+Thailand,THA,1993,510890,58337773,FALSE,0.000609811920586732,1.53153553052074,4.13568813759388,,,,,,,3.81431775484749,1.8892778266784,2.67292664268411,3,2
+Thailand,THA,1994,510890,58875275,FALSE,0.00171802922732956,1.38521024934631,4.88320818080781,,,,,,,4.50909452661923,2.09004548646049,2.94715238798277,3,2
+Thailand,THA,1995,510890,59467272,FALSE,0.00329598908740746,2.17830094617901,6.16860310660178,1.79048872528444,,,,,,5.73421273238361,2.53517219178816,3.23433413461569,4,3
+Thailand,THA,1996,510890,60130190,FALSE,0.00503036753626503,2.38298452582182,6.19510992269106,1.83477583960455,,,,,,5.81026145905767,2.60447516391342,3.34267394149468,4,3
+Thailand,THA,1997,510890,60846588,FALSE,0.0155206840605894,3.22530915917755,5.72247783975939,1.78620375850215,,,,,,5.37920131442616,2.68737786037492,3.46357141070195,4,3
+Thailand,THA,1998,510890,61585103,FALSE,0.0464142497786502,5.30204581255369,4.45754851791915,1.82414027568661,,,,,0.0238965475677803,4.24110633041874,2.33080908070118,2.8477972415567,4,4
+Thailand,THA,1999,510890,62298569,FALSE,0.102016687238376,4.53978022801863,4.92392106230463,2.00817350184998,,,,,,4.61011643799446,2.89347286985291,3.71935672262103,4,3
+Thailand,THA,2000,510890,62952639,FALSE,0.15350222262444,2.36108857782988,5.85866835209471,2.21538406359171,,,,,,5.44820446340479,2.64716080403518,3.34155903494213,4,3
+Thailand,THA,2001,510890,63539190,FALSE,0.229066272075468,3.79293373574048,5.49351181263547,2.32033934171266,,,,,,5.14007614693315,2.95896279054102,3.75111640812876,4,3
+Thailand,THA,2002,510890,64069093,FALSE,0.307916953782458,2.4044076470926,5.82224189195595,2.48676166954824,,,,,,5.43216909569267,2.75533204059481,3.44111280411117,4,3
+Thailand,THA,2003,510890,64549867,FALSE,0.377361215404172,3.97834923272496,6.6702973618494,2.30092387148009,2.7763010408784,,6.20225135398033,,,6.19743847950366,3.90583660708779,4.66974073442226,6,4
+Thailand,THA,2004,510890,64995303,FALSE,0.430323141277677,4.00625186888317,8.20023079590768,2.69857914536406,3.25031796013493,,5.49382672210071,,,7.57818106147297,4.16584233470666,4.94420969945523,6,4
+Thailand,THA,2005,510890,65416189,FALSE,0.601690791566249,5.87798658973081,9.65477658122705,2.71240525459717,3.55808086350096,,4.0800756522212,,,8.87091428856862,4.5853869738685,5.38534544627945,6,4
+Thailand,THA,2006,510890,65812540,FALSE,0.683033198921579,6.63640205309802,10.9712037367708,3.17413450674058,3.63191131859106,1.18298210242929,3.72667908298656,0.110385340074649,,10.0673675324396,4.39573911349114,4.74299370306788,7,5
+Thailand,THA,2007,510890,66182064,FALSE,0.792785568802556,6.74692485781602,12.5412109753593,3.3909853516701,3.93265444859815,2.67045346889412,4.85033164664462,0.244653197726626,,11.6053869717191,5.16544864486446,5.36765640511529,7,5
+Thailand,THA,2008,510890,66530980,FALSE,0.716576499772825,7.18640715797611,14.9557359981599,3.37501990945963,4.01425639130286,,3.46958705594036,0.607625278573203,,13.7253453849266,5.94066532426176,5.67279695737518,6,5
+Thailand,THA,2009,510890,66866834,FALSE,0.787409029351492,8.13843801370839,12.1553766886754,3.41456138707596,3.77637489242852,,7.12008053563959,1.14784985088592,0.321482519231742,11.2199007395251,5.32289136228043,5.22705217434445,6,6
+Thailand,THA,2010,510890,67195032,FALSE,0.873224570436527,14.9327622264045,15.619129649872,3.86502919070024,3.98485124649055,2.5763229052346,4.50882995297886,2.07780563581037,0.397531785446249,14.4724304555154,6.11040432586757,6.70906487447593,7,6
+Thailand,THA,2011,510890,67518379,FALSE,0.918311409265509,6.26815884817118,18.5349150219057,4.42945585834877,4.40052969406632,3.3009619554454,6.94453355653945,3.94530138870546,0.458130497532799,16.9211445522271,5.83635244960125,6.4944541169208,7,6
+Thailand,THA,2012,510890,67835969,FALSE,1.02175059851391,17.5599253149536,19.4901881206101,5.02617398496615,4.7883363529169,3.73762470281789,4.7852453726541,5.10231373321262,0.363776691636553,18.1269122031436,7.4263835408789,8.49405788342778,7,6
+Thailand,THA,2013,510890,68144519,FALSE,1.11245560970363,18.0582878989769,19.7428182445773,5.79527417101539,5.5382393664432,3.5918239544466,4.44600647886256,7.70160817189802,0.292759250956102,18.5175425234021,7.57706080121979,9.13524641585185,7,6
+Thailand,THA,2014,510890,68438748,FALSE,1.33540810368746,6.86813690172054,18.8152459072824,5.54616911263186,5.7615825392504,3.35880154081103,14.8617101797046,13.7792159433148,,17.5684108260269,8.46424529097297,11.7247285926797,7,5
+Thailand,THA,2015,510890,68714519,FALSE,1.49877799983959,8.88397244586933,17.6114769691079,6.48970231308724,6.695486575307,4.04724726741152,16.2192849645774,15.5715860768056,0.37587053126103,16.3464428196951,7.87519035587913,10.6478098585493,7,6
+Thailand,THA,2016,510890,68971313,FALSE,1.80420386320292,10.7332908279833,17.4505059051791,7.17305111326721,7.28586989759958,2.49512724822497,15.1653081653849,16.8117397873035,0.479584068177939,16.2615910137462,7.90015302734576,11.1040941626438,7,6
+Thailand,THA,2017,510890,69209817,FALSE,2.0018742907439,14.2599129569097,19.2757502392838,7.81900291101989,7.631068492181,1.51377840393219,16.468009819271,46.2534202489422,0.37339234101499,18.0147152066008,8.81596013745363,17.1980755806264,7,6
+Thailand,THA,2018,510890,69428454,FALSE,2.14367811453056,19.301643921594,21.2995517076287,8.42234611662947,8.49046446616853,,9.61072098768035,,,19.9192576242523,12.1555881696126,14.313492162539,6,4
+Thailand,THA,2019,510890,69625581,FALSE,2.50762263031994,9.42420989705346,20.6993507039854,8.78548299494104,,,,,,19.4036189765637,10.354166556575,12.5377706228527,4,3
+Thailand,THA,2020,510890,69799978,FALSE,2.9213496783252,11.4087440047821,17.0046979379553,,,,,,,15.9726886162058,10.4449305403542,13.6907163104939,3,2
+Tajikistan,TJK,1990,139960,5283811,FALSE,0,,,,,,,,,,0,,1,0
+Tajikistan,TJK,1991,139960,5400636,FALSE,0,,,,,,,,,,0,,1,0
+Tajikistan,TJK,1992,139960,5502490,FALSE,0,0.0717368777090258,,,,,,,3.07055990415084,,1.04743226061995,1.57114839092993,2,2
+Tajikistan,TJK,1993,139960,5593317,FALSE,0,0.0705719794220741,,,,,,,2.35211570464779,,0.807562561356622,1.21134384203493,2,2
+Tajikistan,TJK,1994,139960,5679169,FALSE,0,0.0926735237086358,,,,,,,,,0.0463367618543179,0.0926735237086358,2,1
+Tajikistan,TJK,1995,139960,5764806,FALSE,0,0.0760807046190929,,,,,,,,,0.0380403523095465,0.0760807046190929,2,1
+Tajikistan,TJK,1996,139960,5851354,FALSE,,0.134919696270346,,0,,,,,2.44074221074123,,0.858553969003859,0.858553969003859,2,3
+Tajikistan,TJK,1997,139960,5938404,FALSE,,0.13294193262201,,0.00284262163392032,,,,,2.74222924821037,,0.959337934155435,0.959337934155435,2,3
+Tajikistan,TJK,1998,139960,6027395,FALSE,,0.21786485007576,,0.00499619909427238,,,,,3.28294435055585,,1.16860179990863,1.16860179990863,2,3
+Tajikistan,TJK,1999,139960,6119664,FALSE,0.0140363290517154,0.0480390472258294,,0.0156183336669104,,,,,2.78060833287363,,0.71457551070452,0.948088571255455,3,3
+Tajikistan,TJK,2000,139960,6216329,FALSE,0.0204792360860732,0.166108772184642,,0.0261009757152489,,,,,3.00466227709301,,0.804337815269745,1.06562400833097,3,3
+Tajikistan,TJK,2001,139960,6318510,FALSE,0.0212506233104279,0.0659109862479633,,0.0137352644711194,,,,,3.04416587603292,,0.786265687515608,1.04127070891733,3,3
+Tajikistan,TJK,2002,139960,6426861,FALSE,0.0226057119379526,0.246129183412706,0.600379716627546,,,,,,3.29590278941908,0.526303908141054,1.04125435034932,1.35611196032428,3,3
+Tajikistan,TJK,2003,139960,6541550,FALSE,0.0258617475866701,0.212201356346736,0.754186558306286,,0.501823296454901,,,,3.54000863920513,0.669997639612807,1.13306457536121,1.47406921172156,4,3
+Tajikistan,TJK,2004,139960,6662391,FALSE,0.0304630980209699,1.79076288518788,0.929694653443353,,0.821594047659118,,,,4.46416963543325,0.819693460240876,1.80377256802136,2.35820866028734,4,3
+Tajikistan,TJK,2005,139960,6789318,FALSE,0.115241701270157,0.351936727096053,0.631178225238832,,0.643007372694824,,,,4.99699665074033,0.673748008168342,1.52383832608634,2.00756046200158,4,3
+Tajikistan,TJK,2006,139960,6922590,FALSE,1.42746324305219,2.14542189436199,0.767665931059245,,1.01157874345055,,,0.0140946604655739,4.52791460004349,0.878461915922896,2.21711641712923,1.89147326769849,4,4
+Tajikistan,TJK,2007,139960,7062667,FALSE,2.66953272488221,2.23539185465879,1.22502375124292,,1.33957309823168,,,0.0258664960886453,,1.38194965895478,2.04331611026131,1.21440266990074,4,3
+Tajikistan,TJK,2008,139960,7209924,FALSE,3.18991362097632,2.96014809436081,1.46013748871159,0.546137371439692,1.63140175225436,,,,,1.742494902454,2.0390841438721,1.74959345608483,5,3
+Tajikistan,TJK,2009,139960,7364752,FALSE,3.5816771601712,0.887695084957491,1.08981524594937,0.33998764660962,1.63400311260871,,0.979475560697033,,4.56012323762905,1.27208474763053,1.90646232266896,1.60787325550474,6,5
+Tajikistan,TJK,2010,139960,7527397,FALSE,4.01931696863277,0.547353695545638,1.30748114976285,0.256759970524467,2.02001848964918,,1.91662392579921,0.107133387776182,2.57836409299917,1.54938379221551,1.77098330054402,1.15926981081003,6,6
+Tajikistan,TJK,2011,139960,7697507,FALSE,4.43414016443839,0.831219667975801,1.56416147585882,0.287351487706015,2.48546399437748,,1.40570081870557,0.171501614364813,3.07367353359961,1.89816321056324,1.93270785804737,1.27793505548584,6,6
+Tajikistan,TJK,2012,139960,7874838,FALSE,4.82659521602298,1.34635501053035,1.89705116458408,0.39808784766179,2.62429800931923,,0,0.232872525186155,2.04951794455009,2.27210120708689,1.75293453055821,1.04982242250255,6,6
+Tajikistan,TJK,2013,139960,8059782,FALSE,5.20010103017575,1.54077163676505,1.8495712291007,0.334659422680532,2.39980373829144,,0.44750556495167,0.464269274659618,,2.37568738597065,1.87452177673474,1.0325786570055,6,5
+Tajikistan,TJK,2014,138786,8252828,FALSE,5.55139473943089,1.73565889453006,1.43805205636122,0.340045022204613,2.99971070689975,,1.31111321984317,0.515654261936288,,1.89147063117529,2.07525278647399,1.15878840593789,6,5
+Tajikistan,TJK,2015,138790,8454019,FALSE,5.88095806362204,2.35539441722864,1.14956801037194,0.616433048137915,2.55279850440648,,0.853273998389949,0.306323982257271,,1.48220640743697,2.1711255075501,1.12272637069015,6,5
+Tajikistan,TJK,2016,138790,8663575,FALSE,6.18921824668222,1.40083271975917,1.03059254862241,0.511747488192272,2.1398859403308,,0,0.369813352646691,,1.26457440186591,1.82647820065121,0.709393592492809,6,5
+Tajikistan,TJK,2017,138790,8880270,FALSE,6.4777063912399,1.52391361258281,1.02151324945296,0.630549741514961,1.99597635322056,,0.812317034796757,0.363513699076796,,1.34298092959546,2.09320000591748,0.934655003513356,6,5
+Tajikistan,TJK,2018,138790,9100847,FALSE,,1.20071333554762,1.11515489047691,1.42146099217146,1.91792096134021,,0,,,1.39656287471647,0.934332304548998,1.00468430060889,5,4
+Tajikistan,TJK,2019,138790,9321023,FALSE,,1.1105772991264,1.16959742655731,,,,,,,1.45375952685989,1.14008736284186,1.28216841299315,2,2
+Tajikistan,TJK,2020,138790,9537642,FALSE,,0.323436821419841,1.11230784964869,,,,,,,1.34166874784913,0.717872335534265,0.832552784634484,2,2
+Turkmenistan,TKM,1990,469930,3683978,FALSE,0,,,,,,,,,,0,,1,0
+Turkmenistan,TKM,1991,469930,3789188,FALSE,0,,,,,,,,,,0,,1,0
+Turkmenistan,TKM,1992,469930,3899843,FALSE,0,,,,,,,,14.4121983562838,,7.20609917814192,14.4121983562838,1,1
+Turkmenistan,TKM,1993,469930,4010789,FALSE,0,0.863886125530852,,,,,,,19.6648796860047,,6.84292193717852,10.2643829057678,2,2
+Turkmenistan,TKM,1994,469930,4115105,FALSE,0,1.09778053669723,,,,,,,21.7709723296647,,7.62291762212066,11.434376433181,2,2
+Turkmenistan,TKM,1995,469930,4207841,FALSE,0,2.42859906246608,,0.731840065409054,,,,,22.46402574566,,6.40611621838378,8.54148829117838,3,3
+Turkmenistan,TKM,1996,469930,4287337,FALSE,,1.10544353516331,,0.879750017825095,,,,,25.8169768688092,,9.26739014059919,9.26739014059919,2,3
+Turkmenistan,TKM,1997,469930,4355125,FALSE,,1.0862230497786,,1.0110800926289,,,,,29.3295810062338,,10.4756280495471,10.4756280495471,2,3
+Turkmenistan,TKM,1998,469930,4413477,FALSE,,0.619107980035444,,2.02711655348031,,,,,30.2240125437473,,10.956745692421,10.956745692421,2,3
+Turkmenistan,TKM,1999,469930,4466133,FALSE,0.0264056194735662,1.22754545843231,,,,,,,30.5209316707862,,10.5916275828974,15.8742385646093,2,2
+Turkmenistan,TKM,2000,469930,4516128,FALSE,0.0773073788872374,1.27222602689474,,0.208359399193659,,,,,39.0501462126174,,10.1520097543983,13.5102438795686,3,3
+Turkmenistan,TKM,2001,469930,4564087,FALSE,0.100558520394133,1.6336319929989,,0.293988849694483,,,,,36.3862243624614,,9.60360093138724,12.7712817350516,3,3
+Turkmenistan,TKM,2002,469930,4610018,FALSE,0.171675855958653,2.62582442589975,,0.206721368392085,,,,,40.8698122639949,,10.9685084785614,14.5674526860956,3,3
+Turkmenistan,TKM,2003,469930,4655752,FALSE,0.23922180970406,2.12901059933512,,0.0872607868181295,1.18189738667005,,,,38.9886209506007,,10.3610285366145,13.7349641122513,4,3
+Turkmenistan,TKM,2004,469930,4703396,FALSE,0.419958123766808,3.29824366743687,,0.0811965278118605,1.22670833111492,,,,44.6978583546584,,12.1243141684185,16.0257661833024,4,3
+Turkmenistan,TKM,2005,469930,4754652,FALSE,0.549418475553419,3.85766504328702,,0.0828605111711741,1.17943600565921,,,,52.3542591956651,,14.2110508064192,18.7649282500411,4,3
+Turkmenistan,TKM,2006,469930,4810114,FALSE,0.718609880622123,6.66441165962093,,0.0818883490377406,1.09701790487525,,,0.0107214749888382,59.9339385376674,,16.8497121067371,16.6727400053287,4,4
+Turkmenistan,TKM,2007,469930,4870142,FALSE,0.756432513646899,7.7088813861352,,0.0933329778909334,1.24452709853852,,,0.0116427883998183,,,2.85288229255768,2.60461905080865,4,3
+Turkmenistan,TKM,2008,469930,4935765,FALSE,0.928749661806299,11.3473812399339,,,1.30194718443488,,,0.011783889905628,,,6.13806545087009,5.67958256491975,3,2
+Turkmenistan,TKM,2009,469930,5007953,FALSE,1.01997484461621,39.8746265741056,,,1.40795971140299,,1.4404277745008,0.0343266775086684,100,,35.5837572983057,35.3373452565288,4,4
+Turkmenistan,TKM,2010,469930,5087211,FALSE,1.54474428674641,31.3156321239753,,,1.39177223745338,,0,0.0561505073600647,100,,33.2150941026804,32.8429456578338,4,4
+Turkmenistan,TKM,2011,469930,5174076,FALSE,2.53135056633735,28.745031565974,,,1.07133578235265,,1.3941802545217,0.0566243448468474,100,,33.1676405967083,32.5489590413357,4,4
+Turkmenistan,TKM,2012,469930,5267906,FALSE,3.57813037862816,26.0562603048825,,,1.1280592020081,,0,0.0904418261655083,100,,32.4085976708777,31.536675532762,4,4
+Turkmenistan,TKM,2013,469930,5366376,FALSE,4.68603176682274,23.3862097598256,,,1.2059811912748,,0,,100,,32.0180603816621,41.1287365866085,4,3
+Turkmenistan,TKM,2014,469930,5466324,FALSE,5.84627923983446,30.7310558215177,,,1.15653810517648,,1.31964270588326,,100,,34.4742444418089,44.0168995091336,4,3
+Turkmenistan,TKM,2015,469930,5565283,FALSE,7.05871603366329,23.9811140624359,,,1.79923451566815,,0,0.19307568118687,100,,32.7599575240248,31.0435474359057,4,4
+Turkmenistan,TKM,2016,469930,5662371,FALSE,8.32253765823712,17.3748535997717,,,1.9479953302043,,0.636976506360551,0.293708119009846,100,,31.5835919410924,29.5763845562855,4,4
+Turkmenistan,TKM,2017,469930,5757667,FALSE,9.66824993531187,15.8896863449942,,,1.78417012990682,,0,0.382274647763609,100,,31.3894840700765,29.0679902481894,4,4
+Turkmenistan,TKM,2018,469930,5850902,FALSE,,14.8808956330413,,,1.73098742134702,,0,,,,7.44044781652066,7.44044781652066,3,2
+Turkmenistan,TKM,2019,469930,5942094,FALSE,,15.9863967510624,,,,,,,,,15.9863967510624,15.9863967510624,1,1
+Turkmenistan,TKM,2020,469930,6031187,FALSE,,,,,,,,,,,,,0,0
+Timor-Leste,TLS,1990,14870,737814,TRUE,0,,,,,,,,,,0,,1,0
+Timor-Leste,TLS,1991,14870,759526,TRUE,0,,,,,,,,,,0,,1,0
+Timor-Leste,TLS,1992,14870,783204,TRUE,0,,,,,,,,,,0,,1,0
+Timor-Leste,TLS,1993,14870,806867,TRUE,0,,,,,,,,,,0,,1,0
+Timor-Leste,TLS,1994,14870,827828,TRUE,0,,,,,,,,,,0,,1,0
+Timor-Leste,TLS,1995,14870,844333,TRUE,0,,,,,,,,,,0,,1,0
+Timor-Leste,TLS,1996,14870,855358,TRUE,,,,,,,,,,,,,0,0
+Timor-Leste,TLS,1997,14870,861870,TRUE,,,,,,,,,,,,,0,0
+Timor-Leste,TLS,1998,14870,866523,TRUE,,,,,,,,,,,,,0,0
+Timor-Leste,TLS,1999,14870,873138,TRUE,,,,,,,,,,,,,0,0
+Timor-Leste,TLS,2000,14870,884366,TRUE,,,,,,,,,,,,,0,0
+Timor-Leste,TLS,2001,14870,901214,TRUE,,,,,,,,,,,,,0,0
+Timor-Leste,TLS,2002,14870,922699,TRUE,0,,,,,,,,,,0,,1,0
+Timor-Leste,TLS,2003,14870,947110,TRUE,0,0.209267189732202,,,2.55483043962026,,,,,,0.104633594866101,0.209267189732202,3,1
+Timor-Leste,TLS,2004,14870,971889,TRUE,0,,,,2.17942482754904,,,,,,0,,2,0
+Timor-Leste,TLS,2005,14870,995130,TRUE,0.260681257581288,0.0400189097148027,,,2.20236929456914,,,,,,0.150350083648046,0.0400189097148027,3,1
+Timor-Leste,TLS,2006,14870,1016437,FALSE,1.28855996120492,0.365827623763047,0.857130399313016,0.165867910875045,1.96564662122598,,,0.00494305253989218,,2.091502510309,0.669346473789007,0.657035274371746,5,4
+Timor-Leste,TLS,2007,14870,1036388,FALSE,2.52750904349963,0.367967544484235,1.29287225446072,0.256418411423924,1.78585931732126,2.379121893856,,0.00697010711545738,,3.86144599978321,1.3647778295449,1.12320051570171,6,4
+Timor-Leste,TLS,2008,14870,1055428,FALSE,3.72286888718297,1.64967699734661,1.93124724769344,0.412906166098322,1.92314109177602,,,0.00475633708317132,,6.5470372792313,1.92917482458033,2.15359419493985,5,4
+Timor-Leste,TLS,2009,14870,1074286,FALSE,4.87669027163064,1.95781181062648,2.72908265572618,0.496096011997607,1.8802177686709,,0,0.0237986961867497,,6.25197943311081,2.01193614999618,1.74593719038433,6,5
+Timor-Leste,TLS,2010,14870,1093517,FALSE,7.18639045183887,2.25941014423493,3.14304696565779,0.442909633884265,1.79555818811438,,0,0.028076063468365,,7.48858921993183,2.60635143912317,2.04379701230388,6,5
+Timor-Leste,TLS,2011,14870,1113154,FALSE,9.41282173921846,3.23314953473835,4.23706444670853,0.555114774912093,1.94661073891727,,0,0.0460387340657925,,10.5427871166579,3.48763009911549,2.87541803207482,6,5
+Timor-Leste,TLS,2012,14870,1133002,FALSE,16.1838728422558,2.05355648420898,3.72825873368438,0.620418238513428,1.76103249509777,,0,0.0659577463743622,,10.5489972723979,4.51722125973251,2.65778594829894,6,5
+Timor-Leste,TLS,2013,14870,1153288,FALSE,24.9844622230696,2.60592980404823,2.67311667686607,0.830679566710934,1.74914682260888,,0,0.130974965968644,,8.49268551422004,6.21883765413896,2.41205397018957,6,5
+Timor-Leste,TLS,2014,14870,1174333,FALSE,39.0356915330266,1.73937939762363,2.65214226273018,0.619220408001553,2.06007605488911,,3.07135820699691,0.332354993448643,,6.20398272305554,9.42355836167576,2.39325914582526,6,5
+Timor-Leste,TLS,2015,14870,1196294,FALSE,50.3622361887742,2.04071541993591,2.81519056534822,0.624073815532088,2.58773242327646,,0,0.332386377803944,,4.79922449134144,11.1684431979181,1.55928002092268,6,5
+Timor-Leste,TLS,2016,14870,1219289,FALSE,54.2382051760161,0.652711864259619,2.46704335327945,0.652129381723928,2.87260210095515,,0,0.342366839713847,,3.17173611968212,11.6020179550558,0.963788841075903,6,5
+Timor-Leste,TLS,2017,14870,1243260,FALSE,57.925664850948,0.236921190120288,2.36095746508629,0.720627581838205,3.54665199602139,2.68163151701113,2.9010804636981,0.655110162512914,,3.4200363434664,11.1378138447837,1.58675514832718,7,5
+Timor-Leste,TLS,2018,14870,1267975,FALSE,,1.65774098901293,2.21673507808733,0.713259381768054,3.63792955982814,,0,,,3.48118824402993,1.14693386221708,1.46304715370273,5,4
+Timor-Leste,TLS,2019,14870,1293120,FALSE,,2.52955807266221,2.12675438224125,0.701240542073588,,,,,,3.91936399484758,1.78585099899235,2.38338753652779,3,3
+Timor-Leste,TLS,2020,14870,1318442,FALSE,,23.082070082644,1.63309798482723,,,,,,,2.70861758190176,12.3575840337356,12.8953438322729,2,2
+Tonga,TON,1990,720,95069,TRUE,0,0.0462739203678552,2.76609621639612,,,,,,,2.54872224625214,0.937456712254659,1.29749808331,3,2
+Tonga,TON,1991,720,95243,TRUE,0,0.103600970412476,2.69292051552921,,,,,,,2.47009171872208,0.932173828647227,1.28684634456728,3,2
+Tonga,TON,1992,720,95398,TRUE,0,0.573012599809295,2.63291627491191,,,,,,,2.39754306195511,1.0686429582404,1.4852778308822,3,2
+Tonga,TON,1993,720,95556,TRUE,0,0.161582361273781,2.41024440876579,,,,,,,2.26139430543624,0.857275590013189,1.21148833335501,3,2
+Tonga,TON,1994,720,95739,TRUE,0,1.14031614611373,3.02007415118425,,,,,,,2.81959490424174,1.38679676576599,1.97995552517773,3,2
+Tonga,TON,1995,720,95972,TRUE,3.36349622248263,0.470000634117476,,4.17562616837982,,,,,,,2.66970767499331,2.32281340124865,3,2
+Tonga,TON,1996,720,96267,TRUE,4.45691347082909,0.129841188466076,,3.91044539332921,,,,,,,2.83240001754146,2.02014329089764,3,2
+Tonga,TON,1997,720,96621,TRUE,13.850028575635,0.00477812180243134,,3.64465709302146,,,,,,,5.83315459681962,1.82471760741195,3,2
+Tonga,TON,1998,720,97036,TRUE,20.6547485538259,0.020659719650956,,4.38020495069766,,,,,,,8.35187107472484,2.20043233517431,3,2
+Tonga,TON,1999,720,97475,TRUE,27.3561893289257,2.03494481364736,,5.48210891189276,,,,,,,11.6244143514886,3.75852686277006,3,2
+Tonga,TON,2000,720,97962,TRUE,65.0952113262325,8.96193667025959,,5.33084153883145,,,,,,,26.4626631784412,7.14638910454552,3,2
+Tonga,TON,2001,720,98482,TRUE,75.1508412208576,5.78821779200229,2.752342368481,4.68592580402475,,,,,,2.58945168355329,22.0943317963414,4.35453175986011,4,3
+Tonga,TON,2002,720,99023,TRUE,76.9074588438282,3.24845536489649,3.2521711996984,5.51906401695519,,,,,,3.03639322684666,22.2317873563446,3.93463753623278,4,3
+Tonga,TON,2003,720,99591,TRUE,78.534094509025,2.2967088562144,3.58845084961576,6.21944963312333,29.4587531385389,,,,,3.35502985750783,22.6596759619946,3.95706278228185,5,3
+Tonga,TON,2004,720,100214,TRUE,100,7.15007977186238,4.07520739119533,6.1807761692768,26.7318382577669,,,,,3.77312631738759,29.3515158330836,5.70132741950892,5,3
+Tonga,TON,2005,720,100908,TRUE,100,4.60111496374523,4.68962439833696,7.2217359479528,28.4183856097494,,,,,4.36244536906257,29.1281188275087,5.39509876025353,5,3
+Tonga,TON,2006,720,101714,TRUE,100,5.02770930461517,4.72104000220239,6.44790296308895,23.132475273285,,,0.0576102558774872,,4.35227684466639,29.0491630674766,3.971374842062,5,4
+Tonga,TON,2007,720,102577,TRUE,100,8.41935054641943,5.18798991658236,7.6963481446389,19.0667147816747,,,0.0857424807809143,,4.80617757949329,30.3259221519102,5.25190468783313,5,4
+Tonga,TON,2008,720,103384,TRUE,100,9.22630668624314,6.39407293939336,7.63626026123259,17.2819241693485,,,0.0850723209528529,,5.91692565477473,30.8141599717173,5.71614123080083,5,4
+Tonga,TON,2009,720,103897,TRUE,100,0.305974665827863,6.61574994633688,8.73270216230884,17.3145437714149,,34.7151245685371,0.21179588556753,,6.06455670158917,30.0739102686021,10.0060307967661,6,5
+Tonga,TON,2010,720,103981,TRUE,100,3.27168588083681,6.26235596222977,7.59240883668839,17.5127132416231,,0,0.352781868050278,,5.80281588449694,23.425290135951,3.40393849401449,6,5
+Tonga,TON,2011,720,103558,TRUE,100,9.8502512924634,7.60253049655835,8.0222673209339,16.2824350623466,,34.8287654966038,0.708557691989932,,7.39187031777975,32.0607629213119,12.1603424239542,6,5
+Tonga,TON,2012,720,102736,TRUE,100,3.53716269334113,8.57353966730432,6.7621281420374,16.5320237884883,,0,0.71422781454016,,8.22443447654009,23.7745661005366,3.84759062529176,6,5
+Tonga,TON,2013,720,101768,TRUE,100,4.15688134413413,8.8206611282614,7.12488505826913,16.6892941209134,,70.8827391183338,2.30751627387317,,8.50899440113797,38.1970333297997,18.5962032391496,6,5
+Tonga,TON,2014,720,101023,TRUE,100,6.10905628018112,7.81916043905153,7.91096054141663,17.9042396683897,,35.7027340041109,3.632146853132,,7.69749355171446,31.508382252952,12.210478246111,6,5
+Tonga,TON,2015,720,100780,TRUE,100,2.85852494222503,7.81680214674309,8.74970618894565,19.69859325977,84.6958679159442,71.5776403512065,5.09731131976751,,7.37051568361559,45.9497569241774,19.1307396971521,7,5
+Tonga,TON,2016,720,101143,TRUE,100,2.5356745924341,8.80227188031011,10.4118038251142,22.0271154093577,,71.3207497760062,10.5427071578985,,8.30285248649399,38.6141000147729,20.6227575675894,6,5
+Tonga,TON,2017,720,102002,TRUE,100,2.65963161704976,9.57011365997968,10.3122002362967,24.2446513942558,,35.3600644820425,10.9359729007976,,9.54307043998897,31.5804019990737,13.7621879352351,6,5
+Tonga,TON,2018,720,103199,TRUE,,10.2020446446124,9.97658229091669,9.09783370083491,22.8945826659458,,100,,,10.2652371348826,32.319115159091,32.3912788700825,5,4
+Tonga,TON,2019,720,104497,TRUE,,1.33732272519169,10.1475323858896,10.926211683826,,,,,,10.3141682495339,7.47035559830244,7.52590088618389,3,3
+Tonga,TON,2020,720,105697,TRUE,,0.253393133174829,9.33568104581718,,,,,,,9.52821308725137,4.794537089496,4.8908031102131,2,2
+Trinidad and Tobago,TTO,1990,5130,1221121,FALSE,0,3.92974659012022,7.32397623592837,,,,,,,7.22580931689066,3.7512409420162,5.57777795350544,3,2
+Trinidad and Tobago,TTO,1991,5130,1229108,FALSE,0,6.04270997158087,7.68784169281306,,,,,,,7.64815531505982,4.57685055479798,6.84543264332035,3,2
+Trinidad and Tobago,TTO,1992,5130,1236685,FALSE,0,6.30860005235279,7.20439014599823,,,,,,,7.16491611403487,4.50433006611701,6.73675808319383,3,2
+Trinidad and Tobago,TTO,1993,5130,1243605,FALSE,0,13.3739230668107,6.32985937695047,,,,,,,6.22144644488591,6.56792748125374,9.79768475584833,3,2
+Trinidad and Tobago,TTO,1994,5130,1249527,FALSE,0,18.118010212927,6.89248139650201,,,,,,,6.91291488838744,8.33683053647632,12.5154625506572,3,2
+Trinidad and Tobago,TTO,1995,5130,1254200,FALSE,0.33030657324643,10.4536542239284,9.43285851744273,5.25794880209454,,,,,,9.1644255514244,6.36869202917804,8.2920095258158,4,3
+Trinidad and Tobago,TTO,1996,5130,1257547,FALSE,0.818789747311397,12.3951657926836,9.59111011496637,5.45647171448335,,,,,,9.38299773830529,7.06538434236117,9.07821174849073,4,3
+Trinidad and Tobago,TTO,1997,5130,1259838,FALSE,2.43928791089423,35.4171737498452,11.9180163549766,3.46983864888038,,,,,,11.2785169528617,13.3110791661491,16.7218431171958,4,3
+Trinidad and Tobago,TTO,1998,5130,1261699,FALSE,5.65715403991902,25.4028636594901,11.8215866411164,3.6283988437261,,,,,,11.1265427700977,11.6275007960629,13.3859350911046,4,3
+Trinidad and Tobago,TTO,1999,5130,1263927,FALSE,12.0499952588073,31.4873423815958,12.2230452500176,4.0448967211773,,,,,,11.5893422996987,14.9513199028995,15.7071938008239,4,3
+Trinidad and Tobago,TTO,2000,5130,1267159,FALSE,15.9617563830969,24.3911571806003,16.2367720659637,4.82069114447553,,,,,,15.5262770848542,15.3525941935341,14.9127084699767,4,3
+Trinidad and Tobago,TTO,2001,5130,1271627,FALSE,31.6914661022755,33.9696946476609,16.734837262695,4.46939007277547,,,,,,15.9018017061836,21.7163470213517,18.1136288088733,4,3
+Trinidad and Tobago,TTO,2002,5130,1277210,FALSE,45.1179456651083,38.2613303884811,16.240933593121,4.28815438570147,,,,,,15.2157519981117,25.977091008103,19.2550789240981,4,3
+Trinidad and Tobago,TTO,2003,5130,1283564,FALSE,53.0028247571586,35.3144279759481,19.1051312868728,4.48459718421354,26.051245740082,,47.7697676579072,,,18.0988011973922,31.9353497724201,26.4168985038653,6,4
+Trinidad and Tobago,TTO,2004,5130,1290115,FALSE,54.8707178350016,34.7951445631184,23.6581396248354,4.71605468468948,25.3964626145212,,27.95717666485,,,21.5736429215187,29.199446674499,22.2605047085442,6,4
+Trinidad and Tobago,TTO,2005,5130,1296497,FALSE,58.5453880030616,43.3246553224859,31.937945915636,4.95518808307288,25.9104622117001,,27.8195576025035,,,29.5242410290029,33.316546985352,26.4059105092663,6,4
+Trinidad and Tobago,TTO,2006,5130,1302552,FALSE,60.3386433767964,42.1804521007333,40.3345086446671,4.97877818521897,29.8791906902195,,35.9973074893477,0.225256739978553,,37.7147617702873,36.7659379593527,24.2193112571132,6,5
+Trinidad and Tobago,TTO,2007,5130,1308450,FALSE,64.6636901487685,27.8215106150463,40.9566665074152,4.9284764664256,25.2616110585952,57.2754076570677,22.0523354949585,0.504680769503955,,38.2859804189035,36.2830144816136,18.7185967529676,7,5
+Trinidad and Tobago,TTO,2008,5130,1314449,FALSE,69.3506598442332,100,54.1460467987193,4.45312544876547,27.8651640221731,,27.4396138404556,3.51730501988436,,50.3806584608104,51.0778891864347,37.1581405539832,6,5
+Trinidad and Tobago,TTO,2009,5130,1320921,FALSE,87.8500424219542,23.5445212320162,31.6794180785414,7.39259947030205,27.3222383726207,,21.8441363097251,6.94469470307488,,30.3142345791989,34.4621435025078,18.0080372588634,6,5
+Trinidad and Tobago,TTO,2010,5130,1328144,FALSE,95.6558792306128,18.1427331718791,34.5118252192601,6.97737823878928,26.0220107515783,,16.2940041018021,10.6090977973515,,32.8867659138581,34.3163639924687,16.981995844736,6,5
+Trinidad and Tobago,TTO,2011,5130,1336180,FALSE,100,3.55352435678529,53.6283489080505,4.46250231904655,25.5591432095793,50.5452234862141,2.69933489297647,11.4789999108419,,52.3837255239726,35.8148223271788,14.9156174007246,7,5
+Trinidad and Tobago,TTO,2012,5130,1344814,FALSE,100,68.2849382556859,53.6735590080574,4.55127421057504,24.4782271805344,48.1860547900766,10.7280182904024,13.3698701790586,5.79627456915835,52.1827044826682,41.6028741605651,25.8188466645914,7,6
+Trinidad and Tobago,TTO,2013,5130,1353708,FALSE,100,38.6350753391353,55.5605896292248,4.18933022849732,23.9208446965376,48.2056866258877,18.6506846979416,16.426371166641,,52.3035311179136,44.2068944201144,26.0409985100258,7,5
+Trinidad and Tobago,TTO,2014,5130,1362337,FALSE,100,21.8636128394811,48.56225095852,4.055781931561,24.794880302755,46.933636443693,21.1800592499348,23.0532739553137,,46.2635089168039,40.432556903865,23.2832473786189,7,5
+Trinidad and Tobago,TTO,2015,5130,1370332,FALSE,100,9.76728826752984,41.0977947183435,4.59946902362272,24.4731207561852,41.4477573955971,15.7923654879137,61.2380460174842,,38.0108143469202,35.4507791488345,25.8815966286941,7,5
+Trinidad and Tobago,TTO,2016,5130,1377563,FALSE,100,1.55807542446394,33.8312815124775,4.3372202707186,23.9353971737029,34.5122056784349,10.472979594537,96.2623130173577,,31.6238647433959,30.785293746772,28.8508906100946,7,5
+Trinidad and Tobago,TTO,2017,5130,1384060,FALSE,100,15.3030657248423,35.2216641946458,4.0798735721008,23.1288006435999,29.240960550363,7.81786330931599,96.807822095702,,32.067951880371,31.9439045585447,31.2153153164664,7,5
+Trinidad and Tobago,TTO,2018,5130,1389841,FALSE,,24.1481938036873,36.0240615169826,4.37755682928559,24.1472010485034,,28.5462655586288,,,34.3191502632921,23.2740194271461,22.8477916137235,5,4
+Trinidad and Tobago,TTO,2019,5130,1394969,FALSE,,9.37352432583697,30.3627563170309,4.17858271891201,,,,,,29.3755177385972,14.6382877872599,14.3092082611154,3,3
+Trinidad and Tobago,TTO,2020,5130,1399491,FALSE,,4.64949598054185,22.3963807042819,,,,,,,20.8025955763455,13.5229383424119,12.7260457784437,2,2
+Tunisia,TUN,1990,155360,8242509,FALSE,0,0.413550908959134,3.26204070189707,,,,,,,3.0095824981648,1.22519720361873,1.71156670356197,3,2
+Tunisia,TUN,1991,155360,8427851,FALSE,0,0.669769953520723,3.0747754787347,,,,,,,2.84599352378662,1.24818181075181,1.75788173865367,3,2
+Tunisia,TUN,1992,155360,8613855,FALSE,0,2.70003507853207,3.6836689710834,,,,,,5.13500953870161,3.39554191706144,2.87967839707927,3.74352884476504,3,3
+Tunisia,TUN,1993,155360,8795934,FALSE,0,2.81075777716977,3.52502668595387,,,,,,4.93669494138362,3.24201079877897,2.81811985112681,3.66315450577745,3,3
+Tunisia,TUN,1994,155360,8967916,FALSE,0.00215552512214659,2.14181657016591,3.86928357693824,,,,,,5.23849947667197,3.56745371423928,2.81293878722457,3.64925658702572,3,3
+Tunisia,TUN,1995,155360,9125400,FALSE,0.00321269206176297,1.3568824461135,4.41388856010707,7.85011114088729,,,,,6.8112529313038,4.07313319275961,4.08706955409468,5.02284492776605,4,4
+Tunisia,TUN,1996,155360,9267335,FALSE,0.00780568694476573,1.13283125214444,4.31555930613506,6.96302028128451,,,,,7.06272076665628,4.01594980068913,3.89638745863301,4.79363052519359,4,4
+Tunisia,TUN,1997,155360,9395119,FALSE,0.0121721259850135,1.64627511723055,4.30633112167385,7.29628123798965,,,,,4.02499278294921,3.98646446867815,3.45721047716566,4.23850340171189,4,4
+Tunisia,TUN,1998,155360,9509862,FALSE,0.0297322066963634,3.00942842562573,4.41399487968698,7.97467297716345,,,,,3.41818979527031,4.08260691037702,3.76920365688857,4.62122452710913,4,4
+Tunisia,TUN,1999,155360,9613587,FALSE,0.436642748708482,1.59594803372655,4.47414285943828,7.97454165881012,,,,,3.82653617382516,4.1394254396961,3.66156229490172,4.38411282651448,4,4
+Tunisia,TUN,2000,155360,9708347,FALSE,0.74219733800399,3.51345213655401,4.40375761631235,8.36967828269556,,,,,3.84373070479222,4.08920883042444,4.17456321567163,4.95401748861656,4,4
+Tunisia,TUN,2001,155360,9793915,FALSE,1.14953379239513,2.04687201922291,4.85618400292617,8.75051191626991,,,,,3.42694105495062,4.50721777047056,4.04600855715295,4.6828856902285,4,4
+Tunisia,TUN,2002,155360,9871261,FALSE,1.39392864145175,3.53952519068157,4.82168965052589,8.61671225695732,,,,,3.934630641009,4.47434417158261,4.46129727612511,5.14130306505763,4,4
+Tunisia,TUN,2003,155360,9945282,FALSE,1.70961879406045,2.40309372567569,5.49142478332203,9.02283842043023,3.92698555875826,,8.34127557547768,,3.62537511035766,5.09411368906042,5.09893773488729,5.69733930420034,6,5
+Tunisia,TUN,2004,155360,10022278,FALSE,2.22914070914009,2.60889811690635,6.64535644043007,10.0710616294066,4.1007725217109,,10.4364618125362,,4.06957329288314,6.16387666631103,6.01008200021707,6.66997430360866,6,5
+Tunisia,TUN,2005,155360,10106778,FALSE,2.50241041270508,3.14639039836673,6.96927968848196,10.3582542454668,4.31190597058531,,8.92172880738376,,4.158145601057,6.53162572270142,6.00936819224356,6.62322895499514,6,5
+Tunisia,TUN,2006,155360,10201211,FALSE,3.33466666686845,14.0717802878552,7.6600984041376,10.5398186040437,4.46659855599544,,5.65704961467386,0.088232235132782,3.95362108245921,7.13497945322128,7.53617244333967,6.90758021289767,6,6
+Tunisia,TUN,2007,155360,10304729,FALSE,4.34684975490611,6.53598321915584,9.51824969531368,11.2037279848778,4.7604305191927,9.59520369201771,8.05031727062767,0.225935182024266,,8.91595152251979,8.20838860281648,6.98638303584108,7,5
+Tunisia,TUN,2008,155360,10414425,FALSE,6.92446155904679,11.1301505182655,11.9336051774877,11.8590626447556,5.27042794534893,10.0055651605541,11.082466244033,0.811679729969227,,11.1099292373415,10.4892185506905,9.19865767487297,7,5
+Tunisia,TUN,2009,155360,10525691,FALSE,8.47884334154528,6.67641549660539,9.34228210189732,12.0245257635951,5.63386565737435,9.27880999738735,10.2799824656565,1.96328976912231,3.99941566151865,8.69987741446594,8.58289640402938,7.27391776182732,7,6
+Tunisia,TUN,2010,155360,10635245,FALSE,9.06390643250263,5.80877188122738,10.5107195963971,11.5100010585793,6.22989803344249,,7.80013416125701,3.53293579843737,3.40519705040245,9.74541011429995,8.01645503006097,6.96707501070058,6,6
+Tunisia,TUN,2011,155360,10741872,FALSE,9.53480637868919,1.853584104268,10.8408649163107,9.10114328146594,6.12947309667861,,4.36500871215603,4.1974610869941,5.56911564033853,10.0494934071591,6.87742050553807,5.85596770539695,6,6
+Tunisia,TUN,2012,155360,10846993,FALSE,10.0078836717563,6.33894238426354,10.7689776104482,11.0814531577032,7.02592931240497,18.2635157143924,4.65522215808217,5.71561598188449,5.51489684930024,9.92954175731344,9.51869879227801,7.20594538142451,7,6
+Tunisia,TUN,2013,155360,10952949,FALSE,10.4750990682749,4.32532235695526,10.62372253634,11.3391352013051,7.9710395959711,17.8853128674755,5.26878713273994,6.17490847553448,5.6605486102148,9.84915191984246,9.3682753961865,7.10297561609867,7,6
+Tunisia,TUN,2014,155360,11063195,FALSE,10.9295008146597,4.14894977998044,10.5429590294925,10.7594529888554,7.68021745238004,10.8875755217253,4.23822999277016,8.84095905574494,5.1921010241127,9.69440912566081,8.09982416451374,7.14568366118741,7,6
+Tunisia,TUN,2015,155360,11179951,FALSE,10.8950215572015,3.92935846514305,8.53965798987043,5.82155218407269,6.28472947453141,8.61496807254168,4.19396872713171,9.78066473028196,5.07539114873201,7.84627426257954,6.72427402067044,6.10786825299016,7,6
+Tunisia,TUN,2016,155360,11303942,FALSE,11.4938838676966,3.35302382282298,8.15691864897588,8.11657201837784,5.95556002433606,8.46002208773085,0.638148585209885,12.3352144852342,4.57419278106344,7.47276247656552,6.39896597312535,6.08165236154564,7,6
+Tunisia,TUN,2017,155360,11433438,FALSE,12.7154709317932,3.33116596323281,8.46336108199278,7.49125463518067,6.3871717379284,5.81520254372561,3.47006475832294,15.0839386962582,4.043716713306,7.74486765242132,6.47574808965057,6.86083473645366,7,6
+Tunisia,TUN,2018,155360,11565203,FALSE,14.5390051790852,3.87934499336233,9.18222669802474,11.3574511413357,7.33933245288586,,4.67799479693175,,,8.39808014807582,8.72720456174794,7.07821776992639,6,4
+Tunisia,TUN,2019,155360,11694721,FALSE,14.9400156178675,3.12021162452712,8.77696737747086,12.6817554191102,,,,,,8.03650897307208,9.87973750974393,7.94615867223648,4,3
+Tunisia,TUN,2020,155360,11818618,FALSE,,,7.23164675076028,,,,,,,6.72977255409531,7.23164675076028,6.72977255409531,1,1
+Turkey,TUR,1990,769630,53921758,FALSE,0,0.593769711300647,2.05148830586602,,,,,,,1.95329570087069,0.881752672388888,1.27353270608567,3,2
+Turkey,TUR,1991,769630,54840595,FALSE,0,0.669395090570001,2.00050506661554,,,,,,,1.91317071689649,0.889966719061848,1.29128290373325,3,2
+Turkey,TUR,1992,769630,55748946,FALSE,0,0.715132384291872,2.16959238766862,,,,,,0.380158543648596,2.06279592325142,0.816220828902271,1.05269561706396,3,3
+Turkey,TUR,1993,769630,56653808,FALSE,0.000391056858515913,0.568232639921968,2.51876685990932,,,,,,0.427127272843885,2.37943515683545,0.878629457383423,1.1249316898671,3,3
+Turkey,TUR,1994,769630,57564209,FALSE,0.00226931507021169,0.500578337008592,2.29467823643591,,,,,,0.441057255766194,2.18130148348141,0.809645786070226,1.04097902541873,3,3
+Turkey,TUR,1995,769630,58486453,FALSE,0.00365877002579318,0.748401209195281,3.13485618775772,2.43036305984336,,,,,0.426004477906093,2.95534786276909,1.34865674094565,1.64002915242846,4,4
+Turkey,TUR,1996,769630,59423278,FALSE,0.00849564582348431,0.614081400990729,3.785742810138,2.63059574553802,,,,,0.458825551093411,3.51819764165257,1.49954823071673,1.80542508481868,4,4
+Turkey,TUR,1997,769630,60372571,FALSE,0.020552971487378,0.767155618750819,4.25807286890918,2.88036996614063,,,,,0.548132268156037,3.95409962379657,1.69485673868881,2.03743936921102,4,4
+Turkey,TUR,1998,769630,61329665,FALSE,0.0298469931160426,0.934682729363341,4.25265471151218,2.84173546493544,,,,,0.558084421853425,3.98480293489334,1.72340086415609,2.07982638776139,4,4
+Turkey,TUR,1999,769630,62287391,FALSE,0.0963944136155832,1.00551207471597,3.58372947116378,2.38669886519346,,,,,0.579330664081086,3.40466793783148,1.53033309775398,1.8440523854555,4,4
+Turkey,TUR,2000,769630,63240196,FALSE,0.155813224798254,1.28441981833649,4.22380946085151,3.01670217368109,,,,,0.55468908690933,4.00911336882797,1.84708675291533,2.21623111193872,4,4
+Turkey,TUR,2001,769630,64192243,FALSE,0.211766133774136,2.62981127488592,3.51093283314418,3.11633208314026,,,,,0.547359193897726,3.40750272691245,2.00324030376844,2.42525131970909,4,4
+Turkey,TUR,2002,769630,65145357,FALSE,0.457587221212062,0.824730096311635,3.97351477719388,3.42725668099556,,,,,0.50024394039181,3.77563674232548,1.83666654322099,2.13196686500612,4,4
+Turkey,TUR,2003,769630,66089402,FALSE,0.488704511578778,1.44804529536327,5.23484944271026,3.66704683797869,1.92559627061755,,4.63883407918066,,0.48200222202347,4.89253142081824,2.65991373147252,3.02569197107287,6,5
+Turkey,TUR,2004,769630,67010930,FALSE,0.569937158322324,2.33331359722065,6.95049372911764,4.49727203060771,2.07766245691076,5.48994958722,5.05945740412715,100,0.555219760769282,6.41774970460036,3.63652046676925,19.8105020828875,7,6
+Turkey,TUR,2005,769630,67903461,FALSE,0.5963931861765,7.16629396096761,8.14803171260123,5.25303180372042,2.36076575922774,5.44700384689374,5.78970349398546,100,0.576110227117926,7.54643505605382,4.71093831878041,21.0552624236409,7,6
+Turkey,TUR,2006,769630,68756809,FALSE,0.694903045552315,13.4651491995351,9.34875480478355,4.9623740333855,2.76704347198641,4.79237945928902,4.87852990165161,0.491173743395355,0.585902392708653,8.67199086287977,5.53257040527224,5.50918668892599,7,6
+Turkey,TUR,2007,769630,69581854,FALSE,1.07780562470939,15.2241939489213,11.2118681494583,5.61512615054958,2.94310487017163,6.61060090736276,6.01289650152878,1.07568788067815,,10.4384462433201,7.62541521375502,7.67327014499959,7,5
+Turkey,TUR,2008,769630,70418612,FALSE,1.27851893847731,13.9514639331164,13.3644785949641,6.21427749950982,3.24334757462948,7.96251649600076,5.94144750377196,1.77158164478188,,12.3798083384688,8.11878382764007,8.05171578392978,7,5
+Turkey,TUR,2009,769630,71321406,FALSE,1.3368927913411,6.2343562240836,10.042591345987,6.35531991626521,3.96409748610344,8.6566861337848,6.11909519805278,2.46944154335128,0.590309170660832,9.35456970741015,5.61932154002505,5.18718195997064,7,6
+Turkey,TUR,2010,769630,72326992,FALSE,1.44216830274535,6.4163128844902,11.8204137482008,6.64199175398254,4.78473898778856,9.16873300167923,6.63243454864735,3.95711753694571,0.636436823589575,10.8327073479871,6.10835586619072,5.85283348260707,7,6
+Turkey,TUR,2011,769630,73443254,FALSE,1.53601267436594,11.0789358568828,14.3320423943267,7.11944322371884,5.17142219175205,2.03678817607301,6.0405284815889,6.79480251611282,0.658691049770215,13.0127854686664,6.11463455096092,7.45086443279,7,6
+Turkey,TUR,2012,769630,74651046,FALSE,1.58359648867327,10.4872481882329,14.6729076637004,7.08022790354238,5.70081194119644,14.5567892244959,5.74953602630536,8.65103630583694,0.765836788123775,13.3493643289493,7.84230604043914,7.68054159016511,7,6
+Turkey,TUR,2013,769630,75925454,FALSE,1.59565660244943,9.93516357771449,15.9300302639426,7.58039619535093,6.30625960832962,12.7166240579083,7.64821722191961,11.6541838198765,0.944775651526259,14.471851409679,8.05012336725879,8.70576464601112,7,6
+Turkey,TUR,2014,769630,77229262,FALSE,1.73118657242901,11.5779231114552,15.7318865593981,7.80191184692175,7.08863524306141,9.97996107915787,6.72515569047922,15.7834314939172,0.959832440819335,14.2572460707477,7.78683675723721,9.51758344239007,7,6
+Turkey,TUR,2015,769630,78529413,FALSE,1.79275375770111,13.6046172275916,13.5110453100431,7.71231897944582,7.83144592283654,6.89625658960263,6.43009545508282,22.7392886471284,0.80647838263732,12.3223956890748,7.25050938601491,10.6025323968268,7,6
+Turkey,TUR,2016,769630,79827868,FALSE,1.91462867038664,9.32531055252987,12.6122568111248,5.90285931445054,7.63355764793625,6.22458250446928,3.75012114410566,28.2873686224827,0.886408425548484,11.5591034831038,5.80230963180218,9.9518619237035,7,6
+Turkey,TUR,2017,769630,81116451,FALSE,2.08884958581733,7.43181732209017,14.2096288151584,7.01582790075658,7.52253384236171,5.15525943975922,1.24500422638466,39.8983902964895,1.05116997231473,12.9784220536765,5.45679389461159,11.6034386286187,7,6
+Turkey,TUR,2018,769630,82340090,FALSE,2.26007882903423,8.74037368075404,14.2327542915873,8.03855746813174,8.06940435680655,,1.31410979656348,,,13.0728396331621,6.91717481321417,7.79147014465285,6,4
+Turkey,TUR,2019,769630,83429607,FALSE,2.32268260146856,6.41828678958684,13.669844094917,8.93854359557909,,,,,,12.6046526622906,7.83733927038788,9.32049434915217,4,3
+Turkey,TUR,2020,769630,84339067,FALSE,2.41233239313573,1.68490508439048,12.4121748698671,,,,,,,11.4187168177699,5.50313744913112,6.55181095108021,3,2
+Tuvalu,TUV,1990,30,8910,TRUE,0,,,,,,,,,,0,,1,0
+Tuvalu,TUV,1991,30,9014,TRUE,0,,,,,,,,,,0,,1,0
+Tuvalu,TUV,1992,30,9110,TRUE,0,,,,,,,,,,0,,1,0
+Tuvalu,TUV,1993,30,9194,TRUE,0,,,,,,,,,,0,,1,0
+Tuvalu,TUV,1994,30,9259,TRUE,0,,,,,,,,,,0,,1,0
+Tuvalu,TUV,1995,30,9298,TRUE,0,,,1.17440857217644,,,,,,,0.58720428608822,1.17440857217644,2,1
+Tuvalu,TUV,1996,30,9317,TRUE,,,,1.30239557192424,,,,,,,1.30239557192424,1.30239557192424,1,1
+Tuvalu,TUV,1997,30,9328,TRUE,,,,1.30085801433279,,,,,,,1.30085801433279,1.30085801433279,1,1
+Tuvalu,TUV,1998,30,9332,TRUE,,,,3.77363059706743,,,,,,,3.77363059706743,3.77363059706743,1,1
+Tuvalu,TUV,1999,30,9344,TRUE,,,,4.28881510048365,,,,,,,4.28881510048365,4.28881510048365,1,1
+Tuvalu,TUV,2000,30,9392,TRUE,100,,,5.17229459699724,,,,,,,52.5861472984986,5.17229459699724,2,1
+Tuvalu,TUV,2001,30,9478,TRUE,,0.0430808003399512,6.93554506981131,4.99717959215414,,,,,,8.99797389451187,3.9919351541018,4.67941142900199,3,3
+Tuvalu,TUV,2002,30,9593,TRUE,,0.0447122694905245,4.99853840213766,5.06389005529648,,,,,,7.12760440909048,3.36904690897489,4.07873557795916,3,3
+Tuvalu,TUV,2003,30,9724,TRUE,,0.049494214122966,5.54206432941597,4.99565050128687,29.2383663371392,,,,,6.3939843077379,3.5290696816086,3.81304300771591,4,3
+Tuvalu,TUV,2004,30,9871,TRUE,,0.0519716395066595,6.69426821859548,4.42896447030128,33.2726656144698,,,,,7.85893798485954,3.7250681094678,4.11329136488916,4,3
+Tuvalu,TUV,2005,30,9997,TRUE,,0.0500897585267707,5.49007011164779,4.00857650459843,38.2474527985859,,,,,6.59287035588138,3.18291212492433,3.55051220633553,4,3
+Tuvalu,TUV,2006,30,10118,TRUE,,0.045873204401127,5.81804377336373,3.72049525283593,32.7026202768028,,,0.102014613685187,,7.91119801478565,3.19480407686693,2.94489527142697,4,4
+Tuvalu,TUV,2007,30,10219,TRUE,100,0.0474425849599138,8.22329565869872,4.15921413001661,24.9436203511173,,,0.215335616932246,,10.179893848562,28.1074880934188,3.65047154511769,5,4
+Tuvalu,TUV,2008,30,10315,TRUE,100,7.17647145827324,10.1799015780395,2.00063417327772,32.5532730981658,,,0.213330490365122,,12.8221560931757,29.8392518023976,5.55314805377296,5,4
+Tuvalu,TUV,2009,30,10413,TRUE,100,7.3754414704488,13.021031710669,1.86513039717284,30.5991225443052,,0,0.281799318742912,,14.7492097416003,24.4523207156581,4.85431618559298,6,5
+Tuvalu,TUV,2010,30,10521,TRUE,100,1.89773885012079,15.2117578280326,1.96143352577153,26.0913891218993,,0,0.278905456904406,,16.4695315404148,23.814186040785,4.12152187464231,6,5
+Tuvalu,TUV,2011,30,10626,TRUE,100,0.491536995404405,18.1748164802759,3.77120494675766,25.6028718181111,,0,0.276148376743708,,19.2795846986997,24.4875116844876,4.76369500352109,6,5
+Tuvalu,TUV,2012,30,10744,TRUE,100,5.40907547768177,16.816935785755,1.2422879733013,28.9719342425538,,0,0.273114254164777,,18.4257407890362,24.6936598473476,5.07004369883681,6,5
+Tuvalu,TUV,2013,30,10849,TRUE,100,1.36238362368136,12.113426478147,1.45419674138134,26.8840386156277,,0,,,16.7592370415959,22.9860013686419,4.89395435166465,6,4
+Tuvalu,TUV,2014,30,10973,TRUE,100,1.19909915922457,12.2444298186304,1.54845497984852,29.9309309262338,,0,,,15.9211534553002,22.9983967915407,4.66717689859333,6,4
+Tuvalu,TUV,2015,30,11099,TRUE,100,1.18548653700074,19.4550137950021,2.62536935308978,23.8491402888519,,0,,,23.0372794084665,24.6531739370185,6.71203382463925,6,4
+Tuvalu,TUV,2016,30,11232,TRUE,100,1.1714489916463,14.6803969814845,2.70241951291265,27.9313186697565,,0,2.22140142388676,,19.8800000993327,23.7108530972087,5.19505400555568,6,5
+Tuvalu,TUV,2017,30,11365,TRUE,100,1.15773999772734,14.1071696819541,2.67077718299232,28.4671301733303,,100,2.48598683140679,,18.9830977951198,43.5871373725348,25.0595203614492,6,5
+Tuvalu,TUV,2018,30,11505,TRUE,,1.13931395895241,14.3630086940967,2.84943691704979,36.2166716799452,,0,,,21.9836255093849,4.58793989252473,6.49309409634677,5,4
+Tuvalu,TUV,2019,30,11655,TRUE,,1.1246509736377,17.5868599527506,,,,,,,21.4487701166675,9.35575546319417,11.2867105451526,2,2
+Tuvalu,TUV,2020,30,11792,TRUE,,,,,,,,,,,,,0,0
+Tanzania,TZA,1990,885800,25203848,FALSE,0,0.0000174017278025314,0.155079635446116,,,,,,,0.138525106173854,0.0516990123913062,0.0692712539508284,3,2
+Tanzania,TZA,1991,885800,26056605,FALSE,0,0.0000168322197950337,0.150874657225096,,,,,,,0.134595183075553,0.0502971631482971,0.0673060076476738,3,2
+Tanzania,TZA,1992,885800,26961204,FALSE,0,0.0197969208977436,0.16404767431871,,,,,,,0.149088377734051,0.0612815317388179,0.0844426493158971,3,2
+Tanzania,TZA,1993,885800,27887204,FALSE,0,0.0321745442406206,0.203585942305073,,,,,,,0.179257350111345,0.0785868288485646,0.105715947175983,3,2
+Tanzania,TZA,1994,885800,28792649,FALSE,0,0.0776529166949157,0.192999100422995,,,,,,,0.168752222067238,0.0902173390393036,0.123202569381077,3,2
+Tanzania,TZA,1995,885800,29649128,FALSE,0,0.177418631785101,0.239716770297407,0.183741986935544,,,,,,0.208520764939716,0.150219347254513,0.189893794553454,4,3
+Tanzania,TZA,1996,885800,30444523,FALSE,0.00013957198963053,0.218064055925269,0.243121885871932,0.18768199721987,,,,,,0.209913699415179,0.162251877751675,0.205219917520106,4,3
+Tanzania,TZA,1997,885800,31192853,FALSE,0.00066344151492621,0.230166326083823,0.21075556034986,0.138747615108382,,,,,,0.185208141573126,0.145083235764248,0.184707360921777,4,3
+Tanzania,TZA,1998,885800,31924201,FALSE,0.000758509224665136,0.242830863107379,0.230524120822991,0.181959830187692,,,,,,0.199456291203825,0.164018330835682,0.208082328166299,4,3
+Tanzania,TZA,1999,885800,32682240,FALSE,0.00602173732021978,0.693404105997526,0.214500119107276,0.231602078242874,,,,,,0.186420212509743,0.286382010166974,0.370475465583381,4,3
+Tanzania,TZA,2000,885800,33499177,FALSE,0.00916406085679938,0.606711070840513,0.208252723599069,0.180226653542432,,,,,,0.183139090853627,0.251088627209703,0.32335893841219,4,3
+Tanzania,TZA,2001,885800,34385849,FALSE,0.013049491688587,0.701556074505033,0.241685402554562,0.184020671645144,,,,,,0.22440676849321,0.285077910098331,0.369994504881129,4,3
+Tanzania,TZA,2002,885800,35334790,FALSE,0.016493475191359,0.491291198768776,0.238770278335859,0.196229436929117,,,,,,0.209263778652077,0.235696097306278,0.298928138116656,4,3
+Tanzania,TZA,2003,885800,36337778,FALSE,0.048800196134054,0.387029151495195,0.283347113953396,0.191107345566148,0.553064389036925,,0.69480255730224,,,0.255811913358091,0.321017272890207,0.382187741930419,6,4
+Tanzania,TZA,2004,885800,37379766,FALSE,0.0614982480735003,0.519247880991883,0.354981799324588,0.188014492368748,0.598571546719171,,1.44735950084491,,,0.319338643855999,0.514220384320725,0.618490129515384,6,4
+Tanzania,TZA,2005,885800,38450323,FALSE,0.0749389815745357,1.06711833445805,0.41349486657475,0.192217389545819,0.554688701169224,,0.562824499127973,,,0.376763443616432,0.462118814256226,0.54973091668707,6,4
+Tanzania,TZA,2006,885800,39548666,FALSE,0.0861046502895153,0.446965957679941,0.485542651399354,0.19636089061349,0.493236050141902,,1.36798443364586,0.00174459049686828,,0.421205529690913,0.516591716725633,0.486852280425416,6,5
+Tanzania,TZA,2007,885800,40681416,FALSE,0.103024144196927,0.626933820634406,0.579063966475339,0.213248773424212,0.563916312068316,,0.4432979050308,0.00169292113407197,,0.519140602302983,0.393113721952337,0.360862804505295,6,5
+Tanzania,TZA,2008,885800,41853944,FALSE,0.118913813257158,1.4495281459017,0.785805604366983,0.222036518449009,0.586124938203683,,0.517054827229276,0.00518432900927594,,0.702644598778858,0.618667781840826,0.579289683873624,6,5
+Tanzania,TZA,2009,885800,43073830,FALSE,0.145952939457178,0.96999609825794,0.675797666839881,0.199913623934817,0.558993590993783,,3.43314465393928,0.0250196955532495,,0.608478688131118,1.08496099648582,1.04731055196328,6,5
+Tanzania,TZA,2010,885800,44346532,FALSE,0.171298448398762,1.79326829679243,0.803480448413864,0.213035939128921,0.63276288846747,,0.731989046531884,0.0571313446650453,,0.732681904566061,0.742614435853172,0.705621306336868,6,5
+Tanzania,TZA,2011,885800,45673520,FALSE,0.183527263417367,1.18052225184125,0.991439156553571,0.229411991747999,0.839932291001406,,1.10556756217086,0.0802290609037469,,0.901434561301449,0.73809364514621,0.699433085593062,6,5
+Tanzania,TZA,2012,885800,47053033,FALSE,0.219899664452433,1.67748528280814,1.05998170636205,0.276602189597011,0.887080786328838,,0.536577123117251,0.116865970550828,,0.952060864765819,0.754109193267377,0.711918286167809,6,5
+Tanzania,TZA,2013,885800,48483132,FALSE,0.237726229966492,1.8881886315007,1.05871720300265,0.273161083612363,0.831072996612549,,0.371964139744241,0.151257709633846,,0.955515066962029,0.76595145756529,0.728017326290636,6,5
+Tanzania,TZA,2014,885800,49960563,FALSE,0.367016686701899,1.24314607081307,1.03330475513953,0.275738846209927,0.68201166137112,,0.577543098911403,0.146781440905028,,0.92354255158714,0.699349891555166,0.633350401685314,6,5
+Tanzania,TZA,2015,885800,51482638,FALSE,0.508808434131618,1.28301159679768,0.935308559955487,0.266835824137338,0.702777780800228,,0.910760728012128,0.163821037357299,,0.844118317921977,0.780945028606851,0.693709500845285,6,5
+Tanzania,TZA,2016,885800,53049231,FALSE,0.666815857158304,0.714354818369055,0.833669960709959,0.292575127579114,0.711901515484479,,0.61190662077035,0.168525432152916,,0.762245860096732,0.623864476917356,0.509921571793633,6,5
+Tanzania,TZA,2017,885800,54660345,FALSE,0.766765727294409,0.754668648377544,0.730774108978202,0.293465151287447,0.710227033200909,,0.923798819092016,0.170402255589781,,0.674848971822121,0.693894491005923,0.563436769233782,6,5
+Tanzania,TZA,2018,885800,56313444,FALSE,0.883805309597392,0.756700985768562,0.763689848396492,0.323421682303401,0.97045649066947,,0.384291605105591,,,0.690202854999075,0.622381886234288,0.538654282044157,6,4
+Tanzania,TZA,2019,885800,58005461,FALSE,0.903183940758438,0.749031597711839,0.797003223195107,0.318343078019046,,,,,,0.736764409310238,0.691890459921108,0.601379695013708,4,3
+Tanzania,TZA,2020,885800,59734213,FALSE,,,,,,,,,,,,,0,0
+Uganda,UGA,1990,199810,17354395,FALSE,0,0.0149361004495503,0.0823504179124392,,,,,,,0.0641299788462015,0.0324288394539965,0.0395330396478759,3,2
+Uganda,UGA,1991,199810,17953534,FALSE,0,0.00244292016531327,0.0714292622302357,,,,,,,0.0581164249231471,0.0246240607985163,0.0302796725442302,3,2
+Uganda,UGA,1992,199810,18561668,FALSE,0,0.00708864907731958,0.0733670554854747,,,,,,,0.0609750228197483,0.0268185681875981,0.0340318359485339,3,2
+Uganda,UGA,1993,199810,19175986,FALSE,0,0.124880365656252,0.0962597327884328,,,,,,,0.0783902836692085,0.0737133661482282,0.10163532466273,3,2
+Uganda,UGA,1994,199810,19793541,FALSE,0,0.1954358864746,0.166951705209556,,,,,,,0.141457153617622,0.120795863894719,0.168446520046111,3,2
+Uganda,UGA,1995,199810,20413157,FALSE,0.000367449539382411,0.267483802952864,0.217176130649489,0.0937634389365733,,,,,,0.189958871418313,0.144697705519577,0.183735371102584,4,3
+Uganda,UGA,1996,199810,21032817,FALSE,0.000576127223661358,0.254461629713752,0.243213944364065,0.0990442081044359,,,,,,0.210133145828423,0.149323977351479,0.187879661215537,4,3
+Uganda,UGA,1997,199810,21655392,FALSE,0.0012482483716767,0.354430609857654,0.2377100034463,0.179739065467686,,,,,,0.203760151389387,0.193281981785829,0.245976608904909,4,3
+Uganda,UGA,1998,199810,22290787,FALSE,0.00767242765174088,0.413193152485817,0.2420332463274,0.236156577141006,,,,,,0.208645463059339,0.224763850901491,0.285998397562054,4,3
+Uganda,UGA,1999,199810,22952406,FALSE,0.0120453709491144,0.267903889669026,0.181971336135077,0.271648698663871,,,,,,0.163774040424929,0.183392323854272,0.234442209585942,4,3
+Uganda,UGA,2000,199810,23650159,FALSE,0.0181328895385982,0.298016997464206,0.173820203382775,0.176270445596776,,,,,,0.15797937818103,0.166560133995589,0.210755607080671,4,3
+Uganda,UGA,2001,199810,24388974,FALSE,0.0255563192869512,0.27243775337601,0.174078346942171,0.176365677651714,,,,,,0.158768564566665,0.162109524314211,0.202523998531463,4,3
+Uganda,UGA,2002,199810,25167261,FALSE,0.0399775434772178,0.321786646008003,0.178356447934531,0.209964508977431,,,,,,0.15578121508662,0.187521286599296,0.229177456690685,4,3
+Uganda,UGA,2003,199810,25980547,FALSE,0.0468683310891779,0.341331347763119,0.186576396979893,0.229530787641834,0.418060202798096,,1.94357579007717,,,0.164694373663874,0.54957653071024,0.6697830747865,6,4
+Uganda,UGA,2004,199810,26821300,FALSE,0.0703153399536484,0.483074505390886,0.237170184472542,0.335067857414588,0.35818826976834,,2.28607688866886,,,0.221653167260797,0.682340955180104,0.831468104683782,6,4
+Uganda,UGA,2005,199810,27684590,FALSE,0.164845227802614,0.601707776695862,0.302428026727308,0.286837421364421,0.371299789741038,,1.56338120115081,,,0.276958146137482,0.583839930748202,0.682221136337143,6,4
+Uganda,UGA,2006,199810,28571475,FALSE,0.231896183115033,0.988984340415218,0.360747490646719,0.335712805722825,0.38527292311243,,0.757426201614855,0.00330516529972185,,0.329753752596033,0.53495340430293,0.483036453129731,6,5
+Uganda,UGA,2007,199810,29486335,FALSE,0.326206697236857,1.17850451930651,0.484050585626048,0.375102013025744,0.372171619448591,,2.07945660435772,0.00846069042389686,,0.440661730728239,0.888664083910575,0.816437111568422,6,5
+Uganda,UGA,2008,199810,30431734,FALSE,,1.05045433378725,0.624994937089111,0.469986853781144,0.505445367994269,0.465002412278063,2.01485574414044,0.00878764538384868,,0.569050247956999,0.925058856215202,0.822626965009937,6,5
+Uganda,UGA,2009,199810,31411096,FALSE,,1.21536194796452,0.622965860484041,0.430923205883074,0.543853174039704,0.897517243074676,1.95203484953387,0.0272713412501445,,0.562421040752764,1.02376062138804,0.837602477076876,6,5
+Uganda,UGA,2010,200520,32428164,FALSE,,0.785919464771759,0.681660487473189,0.474303200785942,0.633457747018024,0.50884584969084,1.22346643708445,0.0815417486184157,,0.608046631409871,0.734839087961236,0.634655496534088,6,5
+Uganda,UGA,2011,200520,33476772,FALSE,,1.18716519455949,0.811743391416418,0.549394429679934,0.607324411214663,0.805092205183018,0.754182066331876,0.413933673985111,,0.724602553462253,0.821515457434146,0.725855583603732,6,5
+Uganda,UGA,2012,200520,34558700,FALSE,,1.58858673202864,0.849837824292996,0.584173529541624,0.742510724339837,0.901002404858332,0.730570915025191,0.529317449412062,,0.767600299538794,0.930834281149356,0.840049785109262,6,5
+Uganda,UGA,2013,200520,35694519,FALSE,,1.40469714321504,0.79795041512551,0.569282210091752,0.736463319551965,,1.41464750266455,0.538460985246039,,0.726306984608695,1.04664431777421,0.930678965165215,5,5
+Uganda,UGA,2014,200520,36911530,FALSE,,1.28991218262071,0.793084948806196,0.583375492323862,0.629102220661806,0.854885799981065,0.684002561830438,0.547226594968841,,0.716267466588482,0.841052197112454,0.764156859666466,6,5
+Uganda,UGA,2015,200520,38225447,FALSE,,0.846696107700956,0.72542721482874,0.578845357573592,0.668962932596836,0.887103281968973,0.754847376366282,0.686188887314731,,0.649071280995601,0.758583867687709,0.703129801990233,6,5
+Uganda,UGA,2016,200520,39649173,FALSE,,0.692309650592096,0.656437961082215,0.577923046726338,0.634849245073,,0.636774468942419,0.925063775855489,,0.596162541098855,0.640861281835767,0.68564669664304,5,5
+Uganda,UGA,2017,200520,41166588,FALSE,,0.855533926610672,0.68642562415641,0.412266700349632,0.616310991759388,,1.05137612006046,1.35261353291769,,0.635650451905932,0.751400592794294,0.861488146368877,5,5
+Uganda,UGA,2018,200520,42729032,FALSE,,1.08359928846878,0.800702558790018,,0.74479600257442,,0.506465575531498,,,0.739351238866678,0.796922474263432,0.776472034288985,4,3
+Uganda,UGA,2019,200520,44269587,FALSE,,1.25462617994587,0.839940997537767,,,,,,,0.762264234150546,1.04728358874182,1.00844520704821,2,2
+Uganda,UGA,2020,200520,45741000,FALSE,,,0.804546233737465,,,,,,,0.725090414855736,0.804546233737465,0.725090414855736,1,1
+Ukraine,UKR,1990,579350,51891400,FALSE,0,,,,,,,,,,0,,1,0
+Ukraine,UKR,1991,579350,52000500,FALSE,0,,,,,,,,,,0,,1,0
+Ukraine,UKR,1992,579350,52150400,FALSE,0,0.168202162388927,,,,,,,,,0.0841010811944634,0.168202162388927,2,1
+Ukraine,UKR,1993,579350,52179200,FALSE,0.0000390051478113713,0.168109324202891,,,,,,,,,0.0840741646753512,0.168109324202891,2,1
+Ukraine,UKR,1994,579350,51921400,FALSE,0.000688212791890226,0.141068256851484,1.52084002341458,,,,,,,1.336590443586,0.554198831019316,0.738829350218742,3,2
+Ukraine,UKR,1995,579350,51512800,FALSE,0.00219086593743844,0.23584345868376,1.52916612296384,1.4434409856739,,,,,,1.36344456647862,0.802660358314734,1.01424300361209,4,3
+Ukraine,UKR,1996,579350,51057800,FALSE,0.00505758847069184,0.451838121306576,1.79013726415247,1.60454478817252,,,,,,1.58596788412176,0.962894440525564,1.21411693120028,4,3
+Ukraine,UKR,1997,579350,50594600,FALSE,0.0102937854985422,0.57646998720047,1.98229856992407,3.53839819419315,,,,,,1.76228616927273,1.52686513420406,1.95905145022212,4,3
+Ukraine,UKR,1998,579350,50144500,FALSE,0.015727787263734,0.653365983002849,1.62129761525004,2.90638227589601,,,,,,1.45306783808777,1.29919341535316,1.67093869899554,4,3
+Ukraine,UKR,1999,579350,49674000,FALSE,0.0213773622133535,0.444117692844555,1.43856399737352,2.68619170392369,,,,,,1.29136120639182,1.14756268908878,1.47389020105335,4,3
+Ukraine,UKR,2000,579350,49176500,FALSE,0.0381488937068503,0.531554582927893,1.69780329246983,2.88654803399059,,,,,0.253811002558394,1.52586039002959,1.08157316113071,1.29944350237662,4,4
+Ukraine,UKR,2001,579350,48662400,FALSE,0.066681994947128,0.734553288606779,1.91598468306002,2.96349125827329,,,,,0.283950127812152,1.70759671007562,1.19293227053987,1.42239784619196,4,4
+Ukraine,UKR,2002,579340,48202470,FALSE,0.101833052609947,0.635104737839611,2.07975466535356,3.22263146304348,,,,,0.30246590673139,1.84839300605747,1.2683579651156,1.50214877841799,4,4
+Ukraine,UKR,2003,579340,47812949,FALSE,0.172473306096308,1.31816707656497,2.66219530993185,3.85054121791541,1.10451466340604,,1.43327592382241,,0.261205771805151,2.36572859329726,1.61630976768935,1.84578371668104,6,5
+Ukraine,UKR,2004,579340,47451626,FALSE,0.192630230801462,1.58885403368477,3.73239801175307,4.75592920230831,1.25897306705358,,1.74822961467828,,0.326914101485885,3.3181886087571,2.05749253245196,2.34762311218287,6,5
+Ukraine,UKR,2005,579380,47105171,FALSE,0.208521333028353,7.52598272381646,4.30648106754406,5.28245801965346,1.36940647993423,,0.842259340705297,,0.361647043180451,3.86987301972698,3.08789158798801,3.57644402941653,6,5
+Ukraine,UKR,2006,579360,46787786,FALSE,0.252281725079975,5.37788582833138,5.12214780981602,5.63635988449104,1.72023398263618,,1.0021496820744,0.0812645828263367,0.380015444755124,4.67028493961198,2.96180672909132,2.85799339368171,6,6
+Ukraine,UKR,2007,579330,46509355,FALSE,0.36890630452439,10.5315989258752,6.77495562863192,11.4983915746775,1.79162745698235,,1.24079890501076,0.150770223910078,,6.28217033310794,6.08293026774394,5.94074599251628,6,5
+Ukraine,UKR,2008,579320,46258189,FALSE,0.622901179039228,10.9007185882804,9.3422743303942,11.7969200304063,2.10615824104609,,1.48144901757068,2.19028125414325,,8.73421670265399,6.82885262913817,7.02071711861093,6,5
+Ukraine,UKR,2009,579320,46053331,FALSE,1.01813900849177,4.65129441793272,5.5373979127599,10.5481744479045,2.05879936597992,,0.939814050965555,2.783822028372,0.362492521457463,5.37305650299811,3.84288539325199,4.10977566160506,6,6
+Ukraine,UKR,2010,579320,45870741,FALSE,1.33056243830868,6.8297391558601,7.09552689373217,11.0830166772002,2.43224015677255,,1.10081418048516,5.21621497310319,0.298024984265203,6.72815042303285,4.62294738830858,5.20932673232445,6,6
+Ukraine,UKR,2011,579320,45706086,FALSE,1.64531090162398,7.09999785978852,9.35610897073908,11.9242878298182,2.86457026650267,,0.868041299144938,8.193237852137,,8.86388852927752,6.17874937222294,7.38989067403324,6,5
+Ukraine,UKR,2012,579320,45593342,FALSE,2.02637176940446,8.80675965831719,9.90628527068118,12.472273217101,2.96498897309398,,1.10751175384691,10.3492816556384,,9.45719111248831,6.86384033387014,8.43860347947835,6,5
+Ukraine,UKR,2013,579320,45489648,FALSE,2.35830630249153,4.76195923017707,9.48713764875611,13.3544624461112,2.97164483751285,,2.22007267069476,15.2279456632187,,9.15894061038854,6.43638765964614,8.94467612411806,6,5
+Ukraine,UKR,2014,579290,45272155,FALSE,2.67524740022723,1.3514570953138,7.202889017903,9.6219990261841,2.71597520714732,,0.717022984120718,18.6448542121067,,6.88054542539253,4.31372310474977,7.44317574862357,6,5
+Ukraine,UKR,2015,579290,45154036,FALSE,2.83590039455444,0.395327528432356,5.2180778143545,9.78088290739661,2.76949881740562,,0.479265768928912,24.5947239014397,,4.92065379852742,3.74189088273336,8.03417078094499,6,5
+Ukraine,UKR,2016,579290,45004673,FALSE,3.08490147466014,4.03461365053276,5.25611451473409,10.5148881545537,3.03909283939834,,0.400713643369578,29.2336175344095,0.440330628682113,5.19289400400329,3.95526034442206,8.30284293592516,6,6
+Ukraine,UKR,2017,579300,44831135,FALSE,3.44090811300842,4.06197114185331,6.25693280967951,11.2834255648833,3.60478228282373,,0.643623641881438,30.1042164517559,0.447305985963782,6.27030380089493,4.3556945428783,8.80180776453878,6,6
+Ukraine,UKR,2018,579400,44622518,FALSE,3.67206400463923,4.6117223541719,6.99672449490222,11.5194004686489,4.02088426060388,,1.45492352877422,,,7.1795615287198,5.6509669702273,6.19140197007871,6,4
+Ukraine,UKR,2019,579400,44386203,FALSE,4.13846235354923,6.377349067134,7.57338398190448,11.7824460999614,,,,,,7.79572264466271,7.46791037563728,8.65183927058604,4,3
+Ukraine,UKR,2020,579400,44134693,FALSE,,0.359739132874448,6.74881841963056,,,,,,,6.89508661285217,3.5542787762525,3.62741287286331,2,2
+Uruguay,URY,1990,175020,3109598,FALSE,0,0.58589740084112,2.9327235188312,,,,,,,3.1253294532992,1.17287363989077,1.85561342707016,3,2
+Uruguay,URY,1991,175020,3131657,FALSE,0,0.452923843060131,3.18162518953234,,,,,,,3.2471834097874,1.21151634419749,1.85005362642376,3,2
+Uruguay,URY,1992,175020,3154459,FALSE,0,0.157113377090742,3.8845016842824,,,,,,100,3.81580001562642,26.0104037653433,34.6576377975724,3,3
+Uruguay,URY,1993,175020,3177734,FALSE,0,1.40090203858633,4.24483645354251,,,,,,100,4.165218916545,26.4114346230322,35.1887069850438,3,3
+Uruguay,URY,1994,175020,3201149,FALSE,0.0511223961456013,2.11680983977587,5.05162706039909,,,,,,100,4.94447035256913,26.8048898240801,35.6870933974483,3,3
+Uruguay,URY,1995,175020,3224275,FALSE,0.25195606180643,2.1301927623163,5.27147954123909,8.20073423122943,,,,,100,5.28299883787032,23.1708725193183,28.903481457854,4,4
+Uruguay,URY,1996,175020,3247383,FALSE,1.49025115496044,1.84761639567063,5.78993206408867,8.44537694214248,,,,,100,5.78051615334046,23.5146353113724,29.0183773727884,4,4
+Uruguay,URY,1997,175020,3270158,FALSE,2.69404083494463,1.69526486220263,6.32774944234855,11.2357951635513,,,,,100,6.36151861506072,24.3905700606094,29.8231446602037,4,4
+Uruguay,URY,1998,175020,3291053,FALSE,5.56128654193693,2.31085895999577,6.30946289748116,10.9909627624813,,,,,100,6.42172032882026,25.034514232379,29.9308855128243,4,4
+Uruguay,URY,1999,175020,3308005,FALSE,7.89704357561045,3.15949089373102,5.47838970556876,11.2027090009866,,,,,100,5.81796958601015,25.5475266351794,30.0450423701819,4,4
+Uruguay,URY,2000,175020,3319734,FALSE,8.31598298046321,3.53818433767353,5.68529185767892,10.6215444730775,,,,,100,6.00121735317399,25.6322007297786,30.0402365409812,4,4
+Uruguay,URY,2001,175020,3325471,FALSE,8.76037831858885,4.35461377679407,5.04330071175741,9.74110900748431,,,,,100,5.50716702515976,25.5798803629249,29.9007224523595,4,4
+Uruguay,URY,2002,175020,3326046,FALSE,8.99358405917242,2.37368179077688,3.73415103526526,6.87961690686856,,,,,100,3.76424875652386,24.3962067584166,28.2543868635423,4,4
+Uruguay,URY,2003,175020,3323661,FALSE,12.5605504213038,5.33255542567237,4.17464512774945,7.31949887650026,7.60208903091754,,32.555642383179,,100,4.26169067358954,26.9904820390675,29.8938774717882,6,5
+Uruguay,URY,2004,175020,3321486,FALSE,13.4567616922414,5.16002268121761,5.81527044655976,8.92257094261159,8.26386326893689,,7.60129083220013,,100,5.92882530280498,23.4926527658051,25.5225419517669,6,5
+Uruguay,URY,2005,175020,3321799,FALSE,15.8409980988836,11.1187553408756,7.08454474670716,9.41543078423345,7.0964611510103,,28.2307056296091,,100,7.2237701813583,28.6150724333848,31.1977323872153,6,5
+Uruguay,URY,2006,175020,3325403,FALSE,23.1589113414796,20.0761423088659,8.44936223554397,9.09471325984218,5.99195946177568,4.93966462715203,13.0154352923744,0.58648295929349,100,8.60321359872316,25.5334612950369,25.2293312365165,7,6
+Uruguay,URY,2007,175020,3331753,FALSE,26.731369776671,19.4483928284443,9.91792638276218,8.93153218303006,5.8988728256917,16.1831721350616,17.3208388367195,0.661357905180131,,10.1251591404015,16.4222053571148,11.2974561787551,7,5
+Uruguay,URY,2008,175020,3340221,FALSE,30.8199863641291,28.4584137223093,14.2366123572335,10.8691601765277,6.44969756772981,15.8121740657907,16.1971197293411,1.53786570415909,,13.9957049754619,19.3989110692219,14.2116528615598,7,5
+Uruguay,URY,2009,175020,3349676,FALSE,32.6880169245067,22.1673533245085,12.1713970850736,11.3462011490332,7.00299156726302,15.5629186897894,15.0746407002236,3.50534168158142,100,11.975263384076,29.8586468390193,27.3448000399038,7,6
+Uruguay,URY,2010,175020,3359273,FALSE,36.181600594967,30.6659630380699,14.9496037149781,13.5052278461576,9.58352454633089,15.6283546663389,16.1052583280548,8.24256896303348,100,14.5978585854262,32.4337154555095,30.5194794601237,7,6
+Uruguay,URY,2011,175020,3368926,FALSE,39.9692613438159,37.3544336535936,18.3992693693186,17.2274651081947,11.517613788114,15.8495550412121,11.7766820257466,12.1400516250454,100,17.7595709762855,34.3680952202688,32.709700564811,7,6
+Uruguay,URY,2012,175020,3378975,FALSE,42.214150829831,100,25.0428851779139,17.8700927706671,11.3912264023014,16.1203143762304,11.7416584231225,16.5150975839615,100,26.0148031971156,44.7127287968235,45.3569419958111,7,6
+Uruguay,URY,2013,175020,3389436,FALSE,44.5849408739751,39.4039138064097,25.4978450493968,19.7933388407549,7.4169167055656,14.1089528446314,12.769548552493,25.688342246355,100,26.1790384604716,36.5940771382373,37.305696984414,7,6
+Uruguay,URY,2014,175020,3400439,FALSE,47.3448408916109,76.3975554051566,25.5211174611606,19.9722154965549,8.68032539113331,13.1062349247748,19.0923440624435,27.514581286073,100,25.8688521782937,43.0620440345287,44.8075914047536,7,6
+Uruguay,URY,2015,175020,3412013,FALSE,49.5724629835164,58.7619376494761,21.957252418006,19.5911513890151,6.97199138647892,9.71587693077044,16.9134047135098,34.8626486518783,100,21.9342720166537,39.5017265834705,42.0105690700888,7,6
+Uruguay,URY,2016,175020,3424139,FALSE,50.7962658136678,23.4097404412802,19.7211814050022,18.9683198904497,7.31022849232005,8.07496782663344,15.8001644966689,47.3544365821426,100,20.1590547254136,33.8243771248146,37.6152860226592,7,6
+Uruguay,URY,2017,175020,3436645,FALSE,53.6011150111957,93.9088692997679,21.2205799027637,21.2358119722106,7.88630883317811,6.32634561781949,11.5446228138985,55.2530990472671,100,22.6898191098197,43.976763516808,50.772037040494,7,6
+Uruguay,URY,2018,175020,3449290,FALSE,61.3060524989801,51.4447183978603,21.6590701461784,20.7811163976992,7.80835659782413,,8.36530949220807,,,23.2451535373488,32.7112533865852,25.9590744562791,6,4
+Uruguay,URY,2019,175020,3461731,FALSE,63.0718213600332,17.3152412223256,21.2210071400666,19.9273807999059,,,,,,22.3326814538834,30.3838626305828,19.8584344920383,4,3
+Uruguay,URY,2020,175020,3473727,FALSE,,26.1477806151191,17.2303374050213,,,,,,,17.6035447743022,21.6890590100702,21.8756626947107,2,2
+United States,USA,1990,9158960,249623000,FALSE,0.00823474058812041,23.0467209388964,11.122575197958,,,,,,,12.3996161738721,11.3925102924808,17.7231685563843,3,2
+United States,USA,1991,9158960,252981000,FALSE,0.0120442355390518,14.5317853582816,11.3234109890559,,,,,,,12.2000258328056,8.62241352762552,13.3659055955436,3,2
+United States,USA,1992,9158960,256514000,FALSE,0.0176072812410503,15.2309979027418,11.9696671311387,,,,,,5.77715645298328,12.4776329543621,8.2488571920262,11.1619291033624,3,3
+United States,USA,1993,9158960,259919000,FALSE,0.0228940664471719,22.4476450524586,12.585661924317,,,,,,6.35096031874185,13.0196340269853,10.3517903404912,13.9394131327286,3,3
+United States,USA,1994,9158960,263126000,FALSE,0.0484101032387534,24.3242826728615,13.8020041393824,,,,,,6.85843361339366,14.6165346314603,11.2582826322191,15.2664169725718,3,3
+United States,USA,1995,9158960,266278000,FALSE,0.0908688229800807,29.5064190856553,15.2753306917345,7.01342109484454,,,,,7.46114014835169,16.5428960350656,11.8694359687132,15.1309690909793,4,4
+United States,USA,1996,9158960,269394000,FALSE,0.159655253608865,32.6719756327743,16.1949992901504,7.19364495078323,,,,,8.14545345671456,17.5499039086587,12.8731457168063,16.3902444872327,4,4
+United States,USA,1997,9158960,272657000,FALSE,0.207673857385664,39.1737402916842,17.5086466636956,7.1720078466162,,,,,7.53090837501536,19.212133736227,14.3185954068794,18.2721975623857,4,4
+United States,USA,1998,9158960,275854000,FALSE,0.285761772114147,61.3572617432098,17.7902751320319,6.93557624652742,,,,,7.15264422387455,19.5546374567337,18.7043038235516,23.7500299175864,4,4
+United States,USA,1999,9158960,279040000,FALSE,0.336528878564801,88.0095091783854,19.1160173942799,6.97874761430406,,,,,7.46031551044703,21.245160091621,24.3802237151962,30.9234330986894,4,4
+United States,USA,2000,9161920,282162411,FALSE,0.399929269055972,83.2368210524839,21.7061931149009,7.15896206006961,,,,,7.86150523922993,24.3756654525851,24.0726821471481,30.6582384510921,4,4
+United States,USA,2001,9161920,284968955,FALSE,0.451158824732206,49.0254466091027,20.2649745980884,6.63717076108191,,,,,7.23574042804123,22.1898126246039,16.7228982442093,21.2720426057074,4,4
+United States,USA,2002,9161920,287625193,FALSE,0.535374494327906,44.2272764809887,20.0922383416043,6.13606559911483,,,,,7.00166278230634,21.9664177787838,15.5985235396684,19.8328556602984,4,4
+United States,USA,2003,9161920,290107933,FALSE,0.557083583716483,47.217716067827,21.2524313605228,5.77555802696651,5.17390418687877,,13.2780219888489,,7.37853809612534,23.451260670584,15.9098915206678,19.4202189700704,6,5
+United States,USA,2004,9161920,292805298,FALSE,0.579337059813994,88.0228320955376,24.3160963837632,6.10813796694912,5.37149242685444,,13.3035198054411,,8.04289332131102,27.2073336821469,23.3954694388027,28.5369433742771,6,5
+United States,USA,2005,9161920,295516599,FALSE,0.602473630107618,28.9312478178095,26.9787244598812,6.19341149959758,5.49238520246512,,12.6810554959449,,8.76911139457298,30.9854139603815,14.0260040496523,17.5120480336613,6,5
+United States,USA,2006,9161920,298379912,FALSE,0.605147591442451,85.5873502407812,29.8981020759977,13.5026212921684,5.42791938181389,,10.8066148360007,5.0144341678764,9.27870571000332,35.5693350243899,24.9464236243989,26.62651021187,6,6
+United States,USA,2007,9161920,301231207,FALSE,0.652193393737878,100,32.3547553728053,12.7285072704213,5.77944824472432,,13.3384991190146,8.28667176782292,,39.3596833166311,31.8147910311958,34.742672294778,6,5
+United States,USA,2008,9147420,304093966,FALSE,0.637439557582384,98.7497240508458,35.0647323359274,12.4563847016911,5.79200297404494,,12.7978017287715,12.0666062003669,,41.3428337910628,31.9412164749636,35.4826700945476,6,5
+United States,USA,2009,9147420,306771529,FALSE,0.606259269330007,67.7219134019162,28.2024180172932,11.5006592624497,5.46575288812082,,12.8507018196788,16.7458441067707,9.85745747126764,32.908903197124,21.7899015403226,25.2642465432012,6,6
+United States,USA,2010,9147420,309327143,FALSE,0.607093585227875,87.039318105107,33.1895902561692,11.1459234455244,5.54211884407397,,11.0071706466724,21.3525208810165,9.76147522943724,37.7947597105044,25.4584285446897,29.6835280030437,6,6
+United States,USA,2011,9147420,311583481,FALSE,0.586215065876042,98.5491629633092,37.5611184267335,10.1884189344507,5.59874713643023,,8.70492735642673,25.9085634650571,10.2547371125462,42.2666965579354,27.6407633098904,32.6454177316209,6,6
+United States,USA,2012,9147420,313877662,FALSE,0.623412185287384,87.6943006202605,38.6676406218618,11.1433760703256,5.70242172990391,,7.56113896891975,31.7983011131124,10.5587031052871,43.2003345145379,26.0414285953237,31.9926923987405,6,6
+United States,USA,2013,9147420,316059947,FALSE,0.591757597933847,94.4909717006965,38.800729589288,11.4630426152197,5.75861078482641,,9.1522240001908,39.7056552737673,10.7973779032649,43.5349995302457,27.5493505677656,34.8573785038975,6,6
+United States,USA,2014,9147420,318386329,FALSE,0.600597531020053,88.0779615456728,40.0070690834831,11.4453753169128,5.88940788789197,,9.73106756219542,46.100058112321,11.4040394125449,44.9470353796326,26.8776850753048,35.2842562215466,6,6
+United States,USA,2015,9147420,320738994,FALSE,0.608885258921257,100,38.0712421137042,11.634798831461,5.9888500266804,,10.5255747926623,54.9143105852223,11.6490549241756,43.0024793467086,28.7482593201541,38.6210364133717,6,6
+United States,USA,2016,9147420,323071755,FALSE,0.693597941803176,100,37.0968121515379,11.910208798785,6.15134485088248,,7.88183693709743,63.1497995344151,12.6075631829649,42.4320748741572,28.3650031686981,39.66358055457,6,6
+United States,USA,2017,9147420,325122128,FALSE,0.703166012738192,100,39.3643470690445,12.0428436713138,6.3159909710831,,6.40104705681719,69.0718573410588,13.175095617787,45.7622049395137,28.6144165712835,41.0755081044151,6,6
+United States,USA,2018,9147420,326838199,FALSE,0.709284016840234,46.206443056191,41.8517634272391,12.1598765747894,6.49080437766251,,6.83092592560463,,,49.3019344251989,21.5516586001329,28.624794995446,6,4
+United States,USA,2019,9147420,328329953,FALSE,0.713492157057392,56.6909664024016,41.4761338818338,6.14075401710957,,,,,,49.3300058904391,26.2553366146006,37.3872421033168,4,3
+United States,USA,2020,9147420,329484123,FALSE,,41.4906641485178,36.2817039839678,,,,,,,42.8662198294507,38.8861840662428,42.1784419889843,2,2
+Uzbekistan,UZB,1990,425400,20510000,FALSE,0,,,,,,,,,,0,,1,0
+Uzbekistan,UZB,1991,425400,20952000,FALSE,0,,,,,,,,,,0,,1,0
+Uzbekistan,UZB,1992,425400,21449000,FALSE,0,0.0184032566658183,,,,,,,,,0.00920162833290916,0.0184032566658183,2,1
+Uzbekistan,UZB,1993,425400,21942000,FALSE,0,0.0959454202838117,,,,,,,,,0.0479727101419059,0.0959454202838117,2,1
+Uzbekistan,UZB,1994,425400,22377000,FALSE,0,0.143080424902728,,,,,,,,,0.0715402124513638,0.143080424902728,2,1
+Uzbekistan,UZB,1995,425400,22785000,FALSE,0.000175562415477517,0.0461978146119684,,0.0475970870252426,,,,,,,0.0313234880175628,0.0468974508186055,3,2
+Uzbekistan,UZB,1996,425400,23225000,FALSE,0.000483301004260705,0.16995972108725,,0.0890353033441633,,,,,,,0.0864927751452245,0.129497512215706,3,2
+Uzbekistan,UZB,1997,425400,23667000,FALSE,0.00116623530411141,0.309109290625732,,0.617570662254974,,,,,,,0.309282062728272,0.463339976440353,3,2
+Uzbekistan,UZB,1998,425400,24051000,FALSE,0.00226043962897051,0.25457250902309,,0.53293371526848,,,,,,,0.26325555464018,0.393753112145785,3,2
+Uzbekistan,UZB,1999,425400,24311650,FALSE,0.00330654242012289,0.218648955951784,,0.342823826958933,,,,,,,0.18825977511028,0.280736391455358,3,2
+Uzbekistan,UZB,2000,425400,24650400,FALSE,0.0514692705587204,0.132909447857586,,0.254315040066801,,,,,,,0.146231252827703,0.193612243962194,3,2
+Uzbekistan,UZB,2001,425400,24964450,FALSE,0.0627018594186644,0.14546802995745,,0.255476996375635,,,,,,,0.15454896191725,0.200472513166542,3,2
+Uzbekistan,UZB,2002,425400,25271850,FALSE,0.112145314309684,0.113327515838556,,0.285038777233829,,,,,,,0.170170535794023,0.199183146536192,3,2
+Uzbekistan,UZB,2003,425400,25567650,FALSE,0.195950934023863,0.141693020297986,,0.298353815589047,0.799217489129242,,0.705343920402794,,0.523453232236788,,0.372958984510095,0.417210997131654,5,4
+Uzbekistan,UZB,2004,425400,25864350,FALSE,0.262686360810445,0.299466573629808,,0.335307064608364,0.827648269219629,,1.11560423433716,,,,0.503266058346445,0.583459290858445,5,3
+Uzbekistan,UZB,2005,425400,26167000,FALSE,0.334706211020235,0.321144725317029,,0.376444052766622,0.870789013983416,,0.8270257875868,,,,0.464830194172671,0.508204855223484,5,3
+Uzbekistan,UZB,2006,425400,26488250,FALSE,0.631754906348919,0.28777676641416,,0.664917118494073,0.88870352638422,,,0.00628902825991373,,,0.528149597085717,0.319660971056049,4,3
+Uzbekistan,UZB,2007,425400,26868000,FALSE,0.730292149348466,1.1511613158535,,0.971088834325668,0.862245246671973,,,0.00977675585432463,,,0.950847433175878,0.710675635344498,4,3
+Uzbekistan,UZB,2008,425400,27302800,FALSE,0.871162619851786,1.14262795174341,,0.985856548591694,0.930535691261191,,,0.022064458678327,,,0.99988237339563,0.716849653004477,4,3
+Uzbekistan,UZB,2009,425400,27767400,FALSE,1.12260465533815,1.32995240131139,,1.10627139554118,0.938234567919999,,0,0.0334546238321471,,,0.88970711304768,0.61741960517118,5,4
+Uzbekistan,UZB,2010,425400,28562400,FALSE,1.45820143534628,2.55776446659099,2.03270565092336,1.09798080211085,0.97410616983291,,0.252555618386221,0.0656656631363484,,1.87045645999122,1.47984159467154,1.16888460204313,6,5
+Uzbekistan,UZB,2011,425400,29339400,FALSE,1.66064502995581,2.41976182260158,2.42184580001458,0.575317484628859,1.00756863828489,,0.122933573873266,0.121204766699721,,2.24124196135756,1.44010074221482,1.0960919218322,6,5
+Uzbekistan,UZB,2012,425400,29774500,FALSE,2.07626421954216,1.1008484075197,2.38223114831486,0.771704418935,1.08468716751346,25.2024139605868,0,0.123129163852633,,2.20872261008093,5.25557702581642,0.840880920077653,7,5
+Uzbekistan,UZB,2013,425400,30243200,FALSE,2.3212512280776,1.0091987109575,2.43611037113234,2.04146952774306,1.06200809742986,,0,0.24254950350419,,2.28001002222498,1.5616059675821,1.11464555288595,6,5
+Uzbekistan,UZB,2014,425400,30757700,FALSE,3.02335810256926,1.1594517210075,2.26906003534728,1.83430546507015,1.01511943679997,11.2554975250005,0.469059428669543,0.392626931080779,,2.12035817721754,3.33512204627738,1.1951603446091,7,5
+Uzbekistan,UZB,2015,440591,31298900,FALSE,3.58203469841395,1.46543891283128,2.01112382448475,2.09792765771278,0.8956419940238,,0.115237190358041,0.61867034451802,,1.92495313401211,1.85435245676016,1.24444544788645,6,5
+Uzbekistan,UZB,2016,440588,31847900,FALSE,3.8485690518278,2.29762771939883,1.86364093853155,2.23948766812867,0.80489413668988,,0,1.8433591423724,,1.85557133948129,2.04986507557737,1.64720917387624,6,5
+Uzbekistan,UZB,2017,440587,32388600,FALSE,3.93869062142161,2.44492196501285,2.11962750210933,2.95108985522637,0.801637876289255,10.277806805422,0.111360086490225,3.62527902079853,,2.10286353647515,3.64058280594706,2.24710289280063,7,5
+Uzbekistan,UZB,2018,440555,32956100,FALSE,4.38751248191272,0.83404324892787,2.72097251192331,5.13697504034664,0.971432437168631,,0.328327438376868,,,2.68416602275959,2.68156614429748,2.24587793760274,6,4
+Uzbekistan,UZB,2019,440555,33580350,FALSE,5.49164619439632,3.02957401333395,3.09954374351034,5.49220343480214,,,,,,3.02712391578294,4.27824184651069,3.84963378797301,4,3
+Uzbekistan,UZB,2020,440555,34232050,FALSE,,0.014490432864392,2.58368021742999,,,,,,,2.45649475559611,1.29908532514719,1.23549259423025,2,2
+St. Vincent and the Grenadines,VCT,1990,390,107489,TRUE,0,3.12825236593655,6.31977461435645,,,,,,,5.9203700535903,3.14934232676433,4.52431120976342,3,2
+St. Vincent and the Grenadines,VCT,1991,390,107772,TRUE,0,3.62044971118261,5.98426009207552,,,,,,,5.67014773203797,3.20156993441938,4.64529872161029,3,2
+St. Vincent and the Grenadines,VCT,1992,390,107941,TRUE,0,5.64790763877118,6.67921997494099,,,,,,,6.18700312861341,4.10904253790406,5.9174553836923,3,2
+St. Vincent and the Grenadines,VCT,1993,390,108036,TRUE,0,12.7473636358552,6.28692011444352,,,,,,,5.7662287478404,6.34476125009958,9.25679619184782,3,2
+St. Vincent and the Grenadines,VCT,1994,390,108059,TRUE,0,19.0418125311432,6.28383221538964,,,,,,,5.87393068414274,8.44188158217761,12.457871607643,3,2
+St. Vincent and the Grenadines,VCT,1995,390,108043,TRUE,3.11871963119419,12.4383235171249,6.92296411657184,24.5096691303323,,,,,,6.43040765061251,11.7474190988058,14.4594667660232,4,3
+St. Vincent and the Grenadines,VCT,1996,390,107983,TRUE,11.7227648980785,17.3207341123548,7.48039717718198,24.2982909328844,,,,,,6.87116097726279,15.2055467801249,16.163395340834,4,3
+St. Vincent and the Grenadines,VCT,1997,390,107895,TRUE,22.4905032982268,37.5889765091499,8.42320790405632,22.5166608627174,,,,,,7.7164749278004,22.7548371435376,22.6073707665559,4,3
+St. Vincent and the Grenadines,VCT,1998,390,107807,TRUE,45.0481873124923,36.1882228422569,9.08408870680285,22.7604067538196,,,,,,8.33036738212568,28.2702264038429,22.4263323260674,4,3
+St. Vincent and the Grenadines,VCT,1999,390,107763,TRUE,67.6243191377963,23.1158339422273,9.32865255415396,25.1369986624332,,,,,,8.66215902354358,31.3014510741527,18.971663876068,4,3
+St. Vincent and the Grenadines,VCT,2000,390,107787,TRUE,78.8621144991707,15.3583965176037,8.48988689912884,28.8506129627977,,,,,,7.92134921026034,32.8902527196752,17.3767862302206,4,3
+St. Vincent and the Grenadines,VCT,2001,390,107893,TRUE,100,8.55301698251565,8.60523842191902,28.5970817952615,,,,,,7.93868051470916,36.4388342999241,15.0295930974955,4,3
+St. Vincent and the Grenadines,VCT,2002,390,108095,TRUE,100,13.8149114363706,8.76211027555642,27.7569631827634,,,,,,8.13645854439389,37.5834962236726,16.5694443878426,4,3
+St. Vincent and the Grenadines,VCT,2003,390,108322,TRUE,100,22.3358163917833,9.21522246035563,27.1380588177157,100,,,,,8.66927181294473,39.6722744174637,19.3810490074812,5,3
+St. Vincent and the Grenadines,VCT,2004,390,108520,TRUE,100,26.5474832692752,10.145363228354,29.3273840019691,100,,,,,9.64084529017284,41.5050576248996,21.8385708538057,5,3
+St. Vincent and the Grenadines,VCT,2005,390,108617,TRUE,100,16.1871650035943,10.916508703417,28.6301390501543,100,,,,,10.450880762823,38.9334531892914,18.4227282721905,5,3
+St. Vincent and the Grenadines,VCT,2006,390,108602,TRUE,100,44.0651534739945,11.9453684452391,34.2269738676893,100,91.4007492021995,,,,11.4788303265174,56.3276489978245,29.9236525560671,6,3
+St. Vincent and the Grenadines,VCT,2007,390,108516,TRUE,100,48.26083920313,13.6604065562861,36.7169178055409,100,90.3004128888159,,,,12.9019194237253,57.7877152907546,32.6265588107987,6,3
+St. Vincent and the Grenadines,VCT,2008,390,108401,TRUE,100,64.4298717519112,14.2698070316566,28.0148003191823,100,91.5702329202515,,,,13.3242593927034,59.6569424046003,35.2563104879323,6,3
+St. Vincent and the Grenadines,VCT,2009,390,108293,TRUE,100,44.6401669583767,12.9292630542286,30.398453070461,98.5260061493084,82.2600394606038,33.3059135613317,,,12.098454422914,50.588972684167,30.1107470032709,7,4
+St. Vincent and the Grenadines,VCT,2010,390,108260,TRUE,100,39.3856819018952,12.7546539068819,25.9192808197103,99.6654703302792,75.2318263720101,0,,,11.8917856082641,42.2152405000829,19.2991870824674,7,4
+St. Vincent and the Grenadines,VCT,2011,390,108315,TRUE,100,34.6709245658175,12.4588736692394,23.3265770241093,95.4962112638287,,66.5982975081438,,,11.5224532722392,47.410934553462,34.0295630925775,6,4
+St. Vincent and the Grenadines,VCT,2012,390,108435,TRUE,100,46.6771145751217,13.1359444588599,22.4045219626454,85.1052973994231,,0,,,12.11669830136,36.4435161993254,20.2995837097818,6,4
+St. Vincent and the Grenadines,VCT,2013,390,108624,TRUE,100,51.1717235751481,13.7471891756421,22.3655367538689,82.362174358293,45.6894917205615,0,,,12.6660996338361,38.8289902042034,21.5508399907133,7,4
+St. Vincent and the Grenadines,VCT,2014,390,108868,TRUE,100,51.6700118215545,15.6309687796548,22.873328322853,75.8733769260765,61.9528448149108,0,,,14.4971644284426,42.0211922898289,22.2601261432125,7,4
+St. Vincent and the Grenadines,VCT,2015,390,109135,TRUE,100,51.2343776887065,15.4929359587444,23.0399875298411,64.3230310596049,,0,,,14.137427727645,37.9534602354584,22.1029482365481,6,4
+St. Vincent and the Grenadines,VCT,2016,390,109467,TRUE,100,34.9974275955181,16.3447025069656,25.1895799553537,58.5523839537575,,0,,,14.6270766786467,35.3063420115675,18.7035210573796,6,4
+St. Vincent and the Grenadines,VCT,2017,390,109826,TRUE,100,65.2023606355728,15.7285337082864,33.5136685149557,65.2127905001898,68.1136951707586,0,,,14.0846523459192,47.0930430049289,28.2001703741119,7,4
+St. Vincent and the Grenadines,VCT,2018,390,110210,TRUE,,49.5856867896581,16.5400449857229,39.238848199772,69.4782136604654,,32.7265883068442,,,14.7379423377987,34.5227920704993,34.0722664085182,5,4
+St. Vincent and the Grenadines,VCT,2019,390,110593,TRUE,,47.3187860720269,16.6520681969264,43.0573313843911,,,,,,14.9402520710232,35.6760618844481,35.1054565091471,3,3
+St. Vincent and the Grenadines,VCT,2020,390,110947,TRUE,,,11.3354486462751,,,,,,,10.0750640909034,11.3354486462751,10.0750640909034,1,1
+"Venezuela, RB",VEN,1990,882050,19632665,FALSE,0,1.84527039524273,3.4445123122782,,,,,,,3.65983172526295,1.76326090250698,2.75255106025284,3,2
+"Venezuela, RB",VEN,1991,882050,20096314,FALSE,0,4.59185907028461,3.58342115440096,,,,,,,3.64442225332793,2.72509340822852,4.11814066180627,3,2
+"Venezuela, RB",VEN,1992,882050,20557694,FALSE,0.00153951648880029,1.67476733743003,3.80569817708149,,,,,,,3.83007465415668,1.82733501033344,2.75242099579336,3,2
+"Venezuela, RB",VEN,1993,882050,21016900,FALSE,0.00518330138457125,2.62525325861686,3.66311112284763,,,,,,,3.68930213579789,2.09784922761636,3.15727769720738,3,2
+"Venezuela, RB",VEN,1994,882050,21474553,FALSE,0.00676833792506741,2.34260199192884,3.43606128839121,,,,,,,3.50389538563683,1.9284772060817,2.92324868878283,3,2
+"Venezuela, RB",VEN,1995,882050,21931087,FALSE,0.0145975142610248,2.19584360645082,4.1167565599771,0.781228730134544,,,,,,4.13972847865375,1.77710660270587,2.37226693841304,4,3
+"Venezuela, RB",VEN,1996,882050,22385650,FALSE,0.0290504691473318,5.27037835242974,4.29191562104945,0.796810291620981,,,,,,4.20682074645166,2.59703868356187,3.42466979683412,4,3
+"Venezuela, RB",VEN,1997,882050,22837743,FALSE,0.0448428783422046,12.980412321002,4.62629802805009,0.739517843032917,,,,,,4.72021892482434,4.59776776760681,6.1467163629531,4,3
+"Venezuela, RB",VEN,1998,882050,23288567,FALSE,0.155670171047423,11.4993490500996,4.11343827830269,0.814893949061572,,,,,,4.26999069137091,4.14583786212783,5.52807789684404,4,3
+"Venezuela, RB",VEN,1999,882050,23739835,FALSE,0.313349562920101,7.10543722190467,4.14062637795066,0.743599478253877,,,,,,4.14740296090096,3.07575316025733,3.99881322035317,4,3
+"Venezuela, RB",VEN,2000,882050,24192449,FALSE,0.363766335134213,9.47433625227702,5.5640308065195,0.779874212544871,,,,,,5.51428229434475,4.0455019016189,5.25616425305555,4,3
+"Venezuela, RB",VEN,2001,882050,24646471,FALSE,0.492724169745942,6.99175993274639,5.0606640517399,0.8487792217604,,,,,,5.03905192298784,3.34848184399816,4.29319702583155,4,3
+"Venezuela, RB",VEN,2002,882050,25100407,FALSE,0.512454485447576,3.08580983314818,4.30723922537337,0.710473381631423,,,,,,4.23955693540636,2.15399423140014,2.67861338339532,4,3
+"Venezuela, RB",VEN,2003,882050,25551624,FALSE,0.768874988791529,4.16076636848224,3.94896525373934,0.600914115717586,1.78846869249748,,2.11735893810348,,,3.9248591567624,2.31937593296683,2.70097464476643,6,4
+"Venezuela, RB",VEN,2004,882050,25996594,FALSE,0.846854798158105,3.56654537985476,5.76061049467548,0.668641212688984,1.91490302217432,,1.66489377676043,,,5.66431693158174,2.50150913242755,2.89109932522148,6,4
+"Venezuela, RB",VEN,2005,882050,26432445,FALSE,1.24401384358217,5.77100517034621,7.87163565574269,0.877733156669958,1.90545536143957,,1.63744093925354,,,7.72126559054263,3.48036575311891,4.00186121420309,6,4
+"Venezuela, RB",VEN,2006,882050,26850190,FALSE,1.48530896339336,3.96607152501686,9.57383596046542,0.893462715502918,1.86062183948755,,1.74629545879805,,,9.75081078533508,3.53299492463532,4.08916012116323,6,4
+"Venezuela, RB",VEN,2007,882050,27247601,FALSE,2.00251645224938,7.94039427065973,11.5451427072847,1.02753606821471,2.01139146359662,,1.58845424841503,,,11.6333205326644,4.82080874936472,5.54742627998846,6,4
+"Venezuela, RB",VEN,2008,882050,27635827,FALSE,2.45305282529913,4.52305238430631,14.2058641813424,1.07418153223422,2.18151622907857,,2.34920964555725,,,13.7025039209478,4.92107211374786,5.41223687076139,6,4
+"Venezuela, RB",VEN,2009,882050,28031010,FALSE,3.05579418623111,5.65312304277544,9.93987224421977,0.959774119188499,2.06424787758437,,1.28671685297722,,,9.3890137353824,4.17905608907841,4.32215693758089,6,4
+"Venezuela, RB",VEN,2010,882050,28439942,FALSE,3.44198905859263,6.298197134499,10.5773605472019,0.857961101478515,1.74770405405644,,1.26821541946088,,,9.97208847071694,4.48874465224659,4.59911553153883,6,4
+"Venezuela, RB",VEN,2011,882050,28887873,FALSE,3.64704896453769,9.27651533952053,13.7899543626026,0.984248151299297,1.7848031135631,,0.249710132504203,,,13.024783873702,5.58949539009287,5.88381437425652,6,4
+"Venezuela, RB",VEN,2012,882050,29360827,FALSE,4.37609314235209,12.3880401495619,15.2393593181116,1.15497012586784,1.94110243214316,,0.491375436706507,,,14.3887957526619,6.72996763451999,7.10579536619953,6,4
+"Venezuela, RB",VEN,2013,882050,29781046,FALSE,4.82889198510152,3.47855735772259,13.5631625182147,1.22880057476264,1.96751069406491,,0.726662985033628,,,12.7993008146697,4.76521508416701,4.55833043304714,6,4
+"Venezuela, RB",VEN,2014,882050,30042973,FALSE,4.96989304043732,8.27896340192708,11.3224760474544,1.0320724372855,1.65547731105408,,0.720327638139667,,,10.6814205756007,5.26474651304879,5.17819601323824,6,4
+"Venezuela, RB",VEN,2015,882050,30081827,FALSE,,8.08018929402758,6.87699038014907,0.976220405549616,1.57568283579927,,0.599497712904422,,,6.66788990135791,4.13322444815767,4.08094932845988,5,4
+"Venezuela, RB",VEN,2016,882050,29851249,FALSE,,4.62374057206304,4.37908214973652,0.898312728041045,1.65454583928229,,0.120825674573861,,,4.39818247702956,2.50549028110362,2.51026536292688,5,4
+"Venezuela, RB",VEN,2017,882050,29402480,FALSE,,3.43384414066911,,0.621593603422361,1.28259380045597,,0,,,,1.35181258136382,1.35181258136382,4,3
+"Venezuela, RB",VEN,2018,882050,28887117,FALSE,,2.34879620325131,,,1.0137045674062,,0,,,,1.17439810162565,1.17439810162565,3,2
+"Venezuela, RB",VEN,2019,882050,28515829,FALSE,,3.09150019790578,,,,,,,,,3.09150019790578,3.09150019790578,1,1
+"Venezuela, RB",VEN,2020,882050,28435943,FALSE,,,,,,,,,,,,,0,0
+British Virgin Islands,VGB,1990,150,17489,TRUE,0,100,,,,,,,,,50,100,2,1
+British Virgin Islands,VGB,1991,150,18007,TRUE,0,100,,,,,,,,,50,100,2,1
+British Virgin Islands,VGB,1992,150,18443,TRUE,0,100,,,,,,,,,50,100,2,1
+British Virgin Islands,VGB,1993,150,18783,TRUE,0,100,,,,,,,,,50,100,2,1
+British Virgin Islands,VGB,1994,150,19068,TRUE,0,100,,,,,,,,,50,100,2,1
+British Virgin Islands,VGB,1995,150,19307,TRUE,0,100,,100,,,,,,,66.6666666666667,100,3,2
+British Virgin Islands,VGB,1996,150,19508,TRUE,,100,,100,,,,,,,100,100,2,2
+British Virgin Islands,VGB,1997,150,19660,TRUE,,100,,100,,,,,,,100,100,2,2
+British Virgin Islands,VGB,1998,150,19820,TRUE,,100,,100,,,,,,,100,100,2,2
+British Virgin Islands,VGB,1999,150,20026,TRUE,,100,,100,,,,,,,100,100,2,2
+British Virgin Islands,VGB,2000,150,20313,TRUE,,100,,100,,,,,,,100,100,2,2
+British Virgin Islands,VGB,2001,150,20675,TRUE,,100,,100,,,,,,,100,100,2,2
+British Virgin Islands,VGB,2002,150,21128,TRUE,100,100,,100,,,,,,,100,100,3,2
+British Virgin Islands,VGB,2003,150,21674,TRUE,,100,,100,100,,,,,,100,100,3,2
+British Virgin Islands,VGB,2004,150,22329,TRUE,,100,,100,100,,,,,,100,100,3,2
+British Virgin Islands,VGB,2005,150,23106,TRUE,,100,,100,100,,,,,,100,100,3,2
+British Virgin Islands,VGB,2006,150,24022,TRUE,,100,,100,100,,,,,,100,100,3,2
+British Virgin Islands,VGB,2007,150,25050,TRUE,,100,,100,100,,,,,,100,100,3,2
+British Virgin Islands,VGB,2008,150,26096,TRUE,,100,,100,100,,,,,,100,100,3,2
+British Virgin Islands,VGB,2009,150,27035,TRUE,100,100,,100,100,100,100,3.50168034090097,,,100,75.8754200852253,6,4
+British Virgin Islands,VGB,2010,150,27796,TRUE,100,100,,100,100,100,0,9.87441441002088,,,80,52.4686036025052,6,4
+British Virgin Islands,VGB,2011,150,28326,TRUE,100,100,,100,100,,0,,,,75,66.6666666666667,5,3
+British Virgin Islands,VGB,2012,150,28654,TRUE,100,100,,100,100,,100,,,,100,100,5,3
+British Virgin Islands,VGB,2013,150,28850,TRUE,,100,,100,100,,0,,,,66.6666666666667,66.6666666666667,4,3
+British Virgin Islands,VGB,2014,150,28985,TRUE,,100,,100,100,100,100,,,,100,100,5,3
+British Virgin Islands,VGB,2015,150,29148,TRUE,,100,,100,100,,100,,,,100,100,4,3
+British Virgin Islands,VGB,2016,150,29355,TRUE,100,100,,100,100,100,0,,,,80,66.6666666666667,6,3
+British Virgin Islands,VGB,2017,150,29567,TRUE,100,100,,100,100,,0,58.4533976586512,,,75,64.6133494146628,5,4
+British Virgin Islands,VGB,2018,150,29795,TRUE,,100,,78.2804143941135,100,,0,,,,59.4268047980378,59.4268047980378,4,3
+British Virgin Islands,VGB,2019,150,30033,TRUE,,100,,100,,,,,,,100,100,2,2
+British Virgin Islands,VGB,2020,150,30237,TRUE,,,,,,,,,,,,,0,0
+Virgin Islands (U.S.),VIR,1990,350,103963,TRUE,0,,,,,,,,,,0,,1,0
+Virgin Islands (U.S.),VIR,1991,350,104807,TRUE,0,,,,,,,,,,0,,1,0
+Virgin Islands (U.S.),VIR,1992,350,105712,TRUE,0,,,,,,,,,,0,,1,0
+Virgin Islands (U.S.),VIR,1993,350,106578,TRUE,0,,,,,,,,,,0,,1,0
+Virgin Islands (U.S.),VIR,1994,350,107318,TRUE,22.9598161162185,,,,,,,,,,22.9598161162185,,1,0
+Virgin Islands (U.S.),VIR,1995,350,107818,TRUE,68.0746452577701,,,100,,,,,,,84.037322628885,100,2,1
+Virgin Islands (U.S.),VIR,1996,350,108095,TRUE,100,,,100,,,,,,,100,100,2,1
+Virgin Islands (U.S.),VIR,1997,350,108357,TRUE,100,,,100,,,,,,,100,100,2,1
+Virgin Islands (U.S.),VIR,1998,350,108537,TRUE,100,,,100,,,,,,,100,100,2,1
+Virgin Islands (U.S.),VIR,1999,350,108599,TRUE,100,,,100,,,,,,,100,100,2,1
+Virgin Islands (U.S.),VIR,2000,350,108642,TRUE,100,,,100,,,,,,,100,100,2,1
+Virgin Islands (U.S.),VIR,2001,350,108549,TRUE,100,,,100,,,,,,,100,100,2,1
+Virgin Islands (U.S.),VIR,2002,350,108509,TRUE,100,,,100,,,,,,,100,100,2,1
+Virgin Islands (U.S.),VIR,2003,350,108505,TRUE,100,,,100,100,,,,,,100,100,3,1
+Virgin Islands (U.S.),VIR,2004,350,108466,TRUE,100,,,100,100,,,,,,100,100,3,1
+Virgin Islands (U.S.),VIR,2005,350,108453,TRUE,100,,,100,100,,,,,,100,100,3,1
+Virgin Islands (U.S.),VIR,2006,350,108369,TRUE,100,,,100,100,,100,,,,100,100,4,2
+Virgin Islands (U.S.),VIR,2007,350,108337,TRUE,100,,,100,100,,,,,,100,100,3,1
+Virgin Islands (U.S.),VIR,2008,350,108397,TRUE,100,,,100,100,,,,,,100,100,3,1
+Virgin Islands (U.S.),VIR,2009,350,108404,TRUE,100,,,100,100,,66.5436201117541,,,,88.8478733705847,83.2718100558771,4,2
+Virgin Islands (U.S.),VIR,2010,350,108357,TRUE,100,,,100,100,,66.5724834998624,,,,88.8574944999541,83.2862417499312,4,2
+Virgin Islands (U.S.),VIR,2011,350,108290,TRUE,100,,,100,100,,0,,,,66.6666666666667,50,4,2
+Virgin Islands (U.S.),VIR,2012,350,108188,TRUE,100,,,100,100,,0,,,,66.6666666666667,50,4,2
+Virgin Islands (U.S.),VIR,2013,350,108041,TRUE,100,,,100,100,,33.3835978683768,,,,77.7945326227923,66.6917989341884,4,2
+Virgin Islands (U.S.),VIR,2014,350,107882,TRUE,100,,,100,100,,0,,,,66.6666666666667,50,4,2
+Virgin Islands (U.S.),VIR,2015,350,107712,TRUE,100,,,100,100,,33.4855661142426,,,,77.8285220380809,66.7427830571213,4,2
+Virgin Islands (U.S.),VIR,2016,350,107516,TRUE,100,,,100,100,,0,,,,66.6666666666667,50,4,2
+Virgin Islands (U.S.),VIR,2017,350,107281,TRUE,100,,,100,100,,0,,,,66.6666666666667,50,4,2
+Virgin Islands (U.S.),VIR,2018,350,107001,TRUE,,,,100,100,,0,,,,50,50,3,2
+Virgin Islands (U.S.),VIR,2019,350,106669,TRUE,,,,100,,,,,,,100,100,1,1
+Virgin Islands (U.S.),VIR,2020,350,106290,TRUE,,,,,,,,,,,,,0,0
+Vietnam,VNM,1990,325490,67988855,FALSE,0,0.116116517104204,,,,,,,,,0.058058258552102,0.116116517104204,2,1
+Vietnam,VNM,1991,325490,69436956,FALSE,0,0.23698460017569,,,,,,,,,0.118492300087845,0.23698460017569,2,1
+Vietnam,VNM,1992,325490,70883488,FALSE,0,0.293253276599114,,,,,,,,,0.146626638299557,0.293253276599114,2,1
+Vietnam,VNM,1993,325490,72300308,FALSE,0,0.561917401242436,,,,,,,,,0.280958700621218,0.561917401242436,2,1
+Vietnam,VNM,1994,325490,73651220,FALSE,0,1.15795260612897,,,,,,,,,0.578976303064484,1.15795260612897,2,1
+Vietnam,VNM,1995,325490,74910462,FALSE,0,1.04239983275209,,0.217633534911471,,,,,,,0.420011122554519,0.630016683831779,3,2
+Vietnam,VNM,1996,325490,76068739,FALSE,0.00000464237961115138,1.38088821667116,0.656333400320239,0.255180029017349,,,,,,0.579427409500654,0.573101572097089,0.73849855172972,4,3
+Vietnam,VNM,1997,325490,77133212,FALSE,0.000135229296418902,1.26232382944026,0.755542192293614,0.268805137556484,,,,,,0.670197561897723,0.571701597146693,0.733775509631488,4,3
+Vietnam,VNM,1998,325490,78115712,FALSE,0.000438567114058339,0.93820399362338,0.750918611176086,0.234925538961537,,,,,0,0.669013660651303,0.384897342175012,0.460535798309055,4,4
+Vietnam,VNM,1999,325490,79035871,FALSE,0.00427300688170094,0.783555342220487,0.808106139508371,0.272443431765365,,,,,0.380406336434153,0.71295429811081,0.449756851362015,0.537339852132704,4,4
+Vietnam,VNM,2000,311060,79910411,FALSE,0.00833431184380934,0.712410892504535,1.00577980214494,0.323868970372713,,,,,0.503638453206994,0.896454739484153,0.510806486014599,0.609093263892099,4,4
+Vietnam,VNM,2001,311090,80742500,FALSE,0.0410607567707433,0.706155560224277,1.03368073545566,0.34910246294056,,,,,0.78637757454178,0.920583479440257,0.583275417986604,0.690554769286719,4,4
+Vietnam,VNM,2002,310550,81534406,FALSE,0.0595961106001427,0.753089074398021,1.18195408050014,0.390097239817898,,,,,0.576743162697006,1.04863562706662,0.592295933602641,0.692141275994887,4,4
+Vietnam,VNM,2003,310070,82301650,FALSE,0.120318002708333,0.772713826010709,1.43780046137282,0.357074101882628,0.530029255551742,,1.13942709204165,,0.578752414120039,1.27257950694735,0.734347649689363,0.824109388200475,6,5
+Vietnam,VNM,2004,310070,83062819,FALSE,0.241012005820524,0.850116475074754,1.822263108427,0.426767521898619,0.713129486503742,,0.998718064671485,,0.666650503057465,1.61425868380667,0.834254613158308,0.911302249701799,6,5
+Vietnam,VNM,2005,310070,83832662,FALSE,0.398078621420435,1.05628785173459,2.15495216101755,0.502389205668095,0.781295196480628,,0.688380344605504,,0.653135614549611,1.92213177894195,0.908870633165966,0.964464959099951,6,5
+Vietnam,VNM,2006,310070,84617545,FALSE,0.534144308593565,1.2880276763452,2.61085950470701,0.512933429437102,0.798389868825711,,0.895118657049708,,0.680046541546027,2.34175162570371,1.0868550196131,1.14357558601635,6,5
+Vietnam,VNM,2007,310070,85419588,FALSE,0.63648718780723,3.53461903728665,3.37176703356231,0.59997460863431,0.921782294806072,,0.760040558277469,,,3.05101372302778,1.78057768511359,1.98641198180655,6,4
+Vietnam,VNM,2008,310070,86243424,FALSE,0.726524524564121,5.0239605212388,4.25776666284938,0.595215495442363,1.0177178456567,,1.08734933494442,,,3.88952127864982,2.33816330780782,2.64901165756885,6,4
+Vietnam,VNM,2009,310070,87092250,FALSE,0.798546313022719,4.17982216617519,3.73349758252496,0.521192603489809,1.0217656376963,,1.53230052042518,,0.680045175591229,3.36591921353185,1.90756739353818,2.05585593584265,6,5
+Vietnam,VNM,2010,310070,87967655,FALSE,0.912688456966464,4.43737584229582,4.55524739033924,0.695930290620501,1.07321209605273,,1.80406174384302,,0.78838401686953,4.10711940432855,2.19894795682243,2.36657425959148,6,5
+Vietnam,VNM,2011,310070,88871384,FALSE,1.0336866712134,4.13562639096348,5.81567963400667,0.820609201091726,1.23289284160913,,0.730520314068152,,0.854390597751691,5.21747982325538,2.23175213484919,2.35172526542609,6,5
+Vietnam,VNM,2012,310070,89801926,FALSE,1.07343873189024,4.67298878161664,6.46049265182498,0.924910245488802,1.32881187942362,,1.24508149431245,,0.950226761761819,5.80453984806261,2.55452311114916,2.71954942624847,6,5
+Vietnam,VNM,2013,310070,90752593,FALSE,1.11126281140108,5.24650408042897,7.42426108090026,1.01211942908117,1.41180580404007,,1.27178199209706,,0.920617610031585,6.67202064172189,2.83109116732335,3.02460875067213,6,5
+Vietnam,VNM,2014,310070,91713850,FALSE,1.17101922714567,4.94953782944351,8.24033172579103,1.04149754326202,1.50381060714843,,0.983165927855307,,0.928696539485595,7.42150319395661,2.88570813216386,3.06488020680061,6,5
+Vietnam,VNM,2015,310070,92677082,FALSE,1.27190670413913,6.10487227240671,8.94139728367926,1.03983320061275,1.76261371619119,,1.01186536850318,,0.871536202561644,8.1122337753587,3.20690183865045,3.4280681638886,6,5
+Vietnam,VNM,2016,310070,93640435,FALSE,1.48261210294942,6.36993071809661,9.55841337006427,1.29753172594961,2.0616366622842,,0.423692716402591,,0.861142472627899,8.70596768753298,3.33222051768173,3.53165306412194,6,5
+Vietnam,VNM,2017,310070,94600643,FALSE,1.60988937120947,6.75962585798409,11.4608041364364,1.65790051067345,2.49174119710226,,0.571898432650817,,0.956963342423764,10.4364163259072,3.83618027522967,4.07656089392786,6,5
+Vietnam,VNM,2018,310070,95545959,FALSE,1.9149449867621,7.38956412463272,12.7285879977745,1.96900242033291,2.78351248460169,,1.47222442546832,,,11.5550436870873,5.0948647909941,5.59645866438031,6,4
+Vietnam,VNM,2019,310070,96462108,FALSE,1.86454186810559,7.54990269708161,13.5704271527955,2.26651090519874,,,,,,12.3038121878259,6.31284565579536,7.37340859670208,4,3
+Vietnam,VNM,2020,310070,97338583,FALSE,1.89157523733783,0.171221303827181,13.8859302652517,,,,,,,12.5308247952815,5.31624226880556,6.35102304955434,3,2
+Vanuatu,VUT,1990,12190,146575,TRUE,0,3.92321093205111,2.88542869527221,,,,,,,3.45615886465884,2.26954654244111,3.68968489835498,3,2
+Vanuatu,VUT,1991,12190,150718,TRUE,0,7.41310385106062,2.88232094268039,,,,,,,3.55149564758321,3.43180826458034,5.48229974932191,3,2
+Vanuatu,VUT,1992,12190,155176,TRUE,0,7.47666385487461,2.78901696601877,,,,,,,3.31825481175647,3.42189360696446,5.39745933331554,3,2
+Vanuatu,VUT,1993,12190,159743,TRUE,0,7.12975445166581,2.70342148332812,,,,,,,3.12864606968262,3.27772531166464,5.12920026067421,3,2
+Vanuatu,VUT,1994,12190,164128,TRUE,0,7.9596008623791,3.07794341855528,,,,,,,3.4214025854769,3.67918142697813,5.690501723928,3,2
+Vanuatu,VUT,1995,12190,168161,TRUE,0,8.09700508579732,3.19421601610657,6.71687170035301,,,,,,3.57545820608873,4.50202320056422,6.12977833074635,4,3
+Vanuatu,VUT,1996,12190,171721,TRUE,0.867139190951918,8.3600695492998,3.35142250634579,8.06318295598397,,,,,,3.70294058596003,5.16045355064537,6.7087310304146,4,3
+Vanuatu,VUT,1997,12190,174917,TRUE,2.08917771409062,7.58076024428421,3.25501743550606,6.38793304322142,,,,,,3.57666583018054,4.82822210927558,5.84845303922872,4,3
+Vanuatu,VUT,1998,12190,177987,TRUE,4.03526439022787,5.02281437522716,3.78107790045949,6.14122213058788,,,,,,3.89539123206233,4.7450946991256,5.01980924595913,4,3
+Vanuatu,VUT,1999,12190,181259,TRUE,7.77928948440018,3.24319857180366,3.92671657739596,7.23669567536372,,,,,,3.97536580962093,5.54647507724088,4.81842001892944,4,3
+Vanuatu,VUT,2000,12190,184964,TRUE,29.8584935933374,4.80316631001385,3.93990235197832,7.74848312788151,,,,,,4.01425298699889,11.5875113458028,5.52196747496475,4,3
+Vanuatu,VUT,2001,12190,189209,TRUE,39.187498951561,4.17344030489002,3.67184091170508,7.51040544864959,,,,,,3.63239763453486,13.6357964042014,5.10541446269149,4,3
+Vanuatu,VUT,2002,12190,193927,TRUE,47.412048616894,3.33154830607223,3.0040740168876,6.88915793412298,,,,,,3.23360797247888,15.1592072184942,4.4847714042247,4,3
+Vanuatu,VUT,2003,12190,198960,TRUE,51.3902571684834,4.11869545092189,3.48817725393974,6.95907848252084,9.74286463541499,,,,,3.70966091860557,16.4890520889665,4.92914495068277,5,3
+Vanuatu,VUT,2004,12190,204123,TRUE,60.9124441170389,4.42660028599807,3.98041218734911,6.66399588695635,13.1829147127667,,,,,4.22971164872866,18.9958631193356,5.10676927389436,5,3
+Vanuatu,VUT,2005,12190,209282,TRUE,63.6130769954303,2.93830478227081,4.37698846715999,8.1249711125592,13.6660352248906,,,,,4.64236715440027,19.7633353393551,5.23521434974343,5,3
+Vanuatu,VUT,2006,12190,214379,TRUE,71.4878360260801,9.03836722923461,4.50278495867752,9.57506857502783,12.4949652867404,,,,,4.75704976152679,23.651014197255,7.79016185526308,5,3
+Vanuatu,VUT,2007,12190,219464,TRUE,81.1634905474546,6.95246490941942,5.16192601646753,10.1281197411038,14.439177702371,,,,,5.44564103365615,25.8515003036113,7.50874189472644,5,3
+Vanuatu,VUT,2008,12190,224700,TRUE,84.7410528054257,7.45240229739079,7.79882344465323,11.6545332412105,13.9390341014916,,,0.0815403889429211,,7.55785931373974,27.9117029471701,6.68658381032099,5,4
+Vanuatu,VUT,2009,12190,230244,TRUE,85.3273063328848,6.13209185045506,6.26110048375347,12.951431876052,14.0291842714907,,31.3302174849056,0.168821940129494,,6.17801870386907,28.4004296056102,11.3521163710822,6,5
+Vanuatu,VUT,2010,12190,236216,TRUE,88.7147371075455,11.8977330145571,7.06971021043189,13.302798421236,14.0998928245053,,15.2690643195097,0.164550985371761,,7.04279492483649,27.250808614656,9.53538833310221,6,5
+Vanuatu,VUT,2011,12190,242658,TRUE,99.3135045689215,11.1906450397635,7.49561245710302,13.5603587774457,13.2103499531828,2.06075429582031,14.8637065223372,0.181350058154315,,7.45781618426534,24.7474302768985,9.45077531639321,7,5
+Vanuatu,VUT,2012,12190,249505,TRUE,100,10.6836648827594,7.29008981497731,16.7473017054967,13.7221129506755,2.01584265734905,28.9116233926959,0.176370341338137,,7.36827231908304,27.6080870755464,12.7774465282747,7,5
+Vanuatu,VUT,2013,12190,256637,TRUE,100,10.2132264537182,7.57504627809095,18.1279222111213,14.2194124670176,,14.0540814352463,0.171465883597287,,7.17725571248047,29.9940552756353,9.9487903392327,6,5
+Vanuatu,VUT,2014,12190,263888,TRUE,100,2.27973965194262,7.26706340973426,16.3408043015363,13.0576806350108,,0,1.11230509297563,,6.95357867932549,25.1775214726426,5.337285545156,6,5
+Vanuatu,VUT,2015,12190,271128,TRUE,100,5.26339832647363,7.13829307772848,14.0673973159762,13.0072805909506,1.99029957435619,13.30293181559,1.24500661391331,,6.79799609002418,23.6270533516874,8.13534603239546,7,5
+Vanuatu,VUT,2016,12190,278326,TRUE,100,7.87162091526243,7.16243256324648,16.4096359495048,11.7989600554626,1.57605358702012,0,1.76652853822557,,6.96992170442663,22.1699571691723,6.60354142148388,7,5
+Vanuatu,VUT,2017,12190,285499,TRUE,100,6.03547343606437,7.19639727226533,15.359067866146,12.5584848675743,1.34929933139867,12.6333097394292,2.23624832873618,,7.00972383929043,23.7622579408839,8.65476464193324,7,5
+Vanuatu,VUT,2018,12190,292675,TRUE,,5.83729674435447,7.33787953561765,15.7295681600125,13.8752709235223,,12.3235578621245,,,7.1527775117836,10.3070755755273,10.2608000695688,5,4
+Vanuatu,VUT,2019,12190,299882,TRUE,,4.19949948758132,6.81782009142636,11.7867042404698,,,,,,6.90135824893739,7.60134127315916,7.62918732566283,3,3
+Vanuatu,VUT,2020,12190,307150,TRUE,,0.262298259585289,4.23873118513014,,,,,,,4.58257580140573,2.25051472235771,2.42243703049551,2,2
+Samoa,WSM,1990,2830,162797,TRUE,0,1.77810237063194,2.03508165291352,,,,,,,1.87542269756631,1.27106134118182,1.82676253409912,3,2
+Samoa,WSM,1991,2830,164000,TRUE,0,0.853112013955411,2.16619996575531,,,,,,,2.00712440570623,1.00643732657024,1.43011820983082,3,2
+Samoa,WSM,1992,2830,165490,TRUE,0,1.32512690335481,2.53227864397569,,,,,,,2.31516201366126,1.28580184911017,1.82014445850804,3,2
+Samoa,WSM,1993,2830,167117,TRUE,0,1.31222587310799,2.39274946644021,,,,,,,2.19243143320991,1.2349917798494,1.75232865315895,3,2
+Samoa,WSM,1994,2830,168689,TRUE,0,0.779998403818342,2.02015694617221,,,,,,,1.86176664010291,0.933385116663517,1.32088252196062,3,2
+Samoa,WSM,1995,2830,170050,TRUE,0,0.887239828582751,2.52239151816372,,,,,,,2.30819117924574,1.13654378224882,1.59771550391424,3,2
+Samoa,WSM,1996,2830,171165,TRUE,,0.297236574573046,2.79365602858825,,,,,,,2.53012824822611,1.54544630158065,1.41368241139958,2,2
+Samoa,WSM,1997,2830,172065,TRUE,2.65764397828465,5.09541402634049,3.05664919940374,,,,,,,2.78183438697011,3.6032357346763,3.9386242066553,3,2
+Samoa,WSM,1998,2830,172839,TRUE,3.49123081260375,0.761270030153567,2.88721706154041,,,,,,,2.61699816024498,2.37990596809924,1.68913409519928,3,2
+Samoa,WSM,1999,2830,173606,TRUE,4.30491736618376,0.181522991743605,3.02370517728334,4.05705656655492,,,,,,2.69642288523245,2.89180052544141,2.31166748117699,4,3
+Samoa,WSM,2000,2830,174454,TRUE,8.50455671097663,0.30340020171922,,4.24623114851044,,,,,,,4.3513960204021,2.27481567511483,3,2
+Samoa,WSM,2001,2830,175394,TRUE,25.2384160216121,0.353732546607606,,3.87716138873417,,,,,,,9.82310331898464,2.11544696767089,3,2
+Samoa,WSM,2002,2830,176410,TRUE,33.3331125996321,0.397643510575042,,3.64823700039465,,,,,,,12.4596643702006,2.02294025548485,3,2
+Samoa,WSM,2003,2830,177481,TRUE,41.3203446438738,1.91994756901775,,3.48932005991275,47.6176349200038,,,,,,15.5765374242681,2.70463381446525,4,2
+Samoa,WSM,2004,2830,178597,TRUE,45.1087527217474,0.758099984350495,4.08166544368569,3.67156374724714,56.9821523358035,,,,,3.8761175488331,13.4050204742577,2.76859376014358,5,3
+Samoa,WSM,2005,2830,179722,TRUE,48.8646249667636,0.918478231815566,5.31355918320293,3.5133857647061,39.318023461393,,,,,5.22773717856292,14.652512036622,3.21986705836153,5,3
+Samoa,WSM,2006,2830,180874,TRUE,64.7241271112424,5.31710949633479,5.82786276408594,11.2146930928252,35.8016141803788,,,,,5.60987135762763,21.7709481161221,7.38055798226254,5,3
+Samoa,WSM,2007,2830,182045,TRUE,68.3484099351586,1.64351938536543,6.34085984777935,11.6096592272972,36.2041433437682,,99.0633441538438,,,6.15528392908947,37.4011585098889,29.617951673899,6,4
+Samoa,WSM,2008,2830,183270,TRUE,71.9169307697614,10.9842890871634,6.59735427002933,11.598333570155,27.0145300119539,,,0.200108069806497,,6.54657339431118,25.2742269242773,7.33232603035902,5,4
+Samoa,WSM,2009,2830,184553,TRUE,85.1618790019505,2.58166938569867,6.0065595878369,11.3202215623933,15.802968615117,,19.5434227419619,0.198716159961702,,5.70668967208716,24.9227504559683,7.87014390442055,6,5
+Samoa,WSM,2010,2830,185944,TRUE,98.6122719637174,0.0793557339260655,7.68592107706853,12.150164905473,33.6785219646021,,38.79444668607,0.197228783888745,,7.14269856037366,31.464432073251,11.6727789339463,6,5
+Samoa,WSM,2011,2830,187469,TRUE,100,3.69466601177759,8.15134354170272,11.9865155696879,33.6921911015675,,38.47886634374,0.313064213674538,,7.6133119391088,32.4622782933816,12.4172848155978,6,5
+Samoa,WSM,2012,2830,189089,TRUE,100,7.46978047033173,7.89394713009207,12.2692779101895,42.6072550963649,18.2116660165574,19.0746013638937,0.343138041951191,,7.26500785166467,27.4865454818441,9.28436112760616,7,5
+Samoa,WSM,2013,2830,190712,TRUE,100,3.19444262763638,8.13884016157184,11.2093824081283,43.7869628477946,18.3121951429394,56.7368172526736,0.680544892470349,,7.9638363391551,32.9319462654916,15.9570047040128,7,5
+Samoa,WSM,2014,2830,192220,TRUE,100,6.20136766155678,8.04435859573828,11.9430081227053,46.0830644289064,,56.2917068561643,1.03645789555399,,7.66486012877109,36.4960882472329,16.6274801329503,6,5
+Samoa,WSM,2015,2830,193510,TRUE,100,6.92923092920603,7.50211067835471,12.1144901302842,56.3526668134273,30.7295506909679,55.9164482036685,1.31959681222587,,6.89661889192101,35.5319717720802,16.6352769934611,7,5
+Samoa,WSM,2016,2830,194540,TRUE,100,4.03173280365603,8.02557415991554,9.11544867963742,64.4961509860605,,0,1.86534197842312,,7.4626839051144,24.2345511286418,4.49504147336619,6,5
+Samoa,WSM,2017,2830,195358,TRUE,100,2.09015935641536,8.49054439228229,13.2435400232604,64.3515549571244,27.0600463233557,55.3875034136912,2.62951366932758,,7.78531323888178,34.3786322515008,16.2272059403153,7,5
+Samoa,WSM,2018,2830,196128,TRUE,,3.74587745928749,8.86396305207404,14.6161356058055,30.2174490938351,,0,,,8.26164528843257,6.80649402929174,6.65591458838138,5,4
+Samoa,WSM,2019,2830,197093,TRUE,,1.55920478796555,9.70348079275778,15.407464883915,,,,,,8.97314996228198,8.89005015487945,8.64660654472085,3,3
+Samoa,WSM,2020,2830,198410,TRUE,,,5.9686242723828,,,,,,,5.67393256913317,5.9686242723828,5.67393256913317,1,1
+Kosovo,XKX,1990,10887,1862000,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,1991,10887,1898000,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,1992,10887,1932000,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,1993,10887,1965000,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,1994,10887,1997000,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,1995,10887,2029000,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,1996,10887,2059000,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,1997,10887,2086000,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,1998,10887,1966000,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,1999,10887,1762000,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,2000,10887,1700000,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,2001,10887,1701154,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,2002,10887,1702310,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,2003,10887,1703466,FALSE,,,,,,,,,,,,,0,0
+Kosovo,XKX,2004,10887,1704622,FALSE,,1.37357676973539,2.82586806869451,,,,,,,2.73677382061069,2.09972241921495,2.05517529517304,2,2
+Kosovo,XKX,2005,10887,1705780,FALSE,,3.44224185051867,3.05161977378063,,,,,,,2.97042022963289,3.24693081214965,3.20633104007578,2,2
+Kosovo,XKX,2006,10887,1719536,FALSE,,9.62004446108234,3.43356935932173,,,,,,,3.32846936188213,6.52680691020204,6.47425691148223,2,2
+Kosovo,XKX,2007,10887,1733404,FALSE,,15.6194033862663,4.33447887283944,,,,,,,4.25948284271038,9.97694112955289,9.93944311448836,2,2
+Kosovo,XKX,2008,10887,1747383,FALSE,,14.4492726794267,5.40758580990831,,,,,,,5.26135287815226,9.9284292446675,9.85531277878948,2,2
+Kosovo,XKX,2009,10887,1761474,FALSE,,10.4013361248082,5.36846116439567,,,,,,,5.20016081518821,7.88489864460196,7.80074846999823,2,2
+Kosovo,XKX,2010,10887,1775680,FALSE,,13.3415554252111,5.9222569609534,,,,,,,5.65531329871169,9.63190619308225,9.4984343619614,2,2
+Kosovo,XKX,2011,10887,1791000,FALSE,,13.2821659196873,7.35929104721101,,,,,9.42440774515143,,7.03582754528854,10.3207284834491,9.91413373670908,2,3
+Kosovo,XKX,2012,10887,1807106,FALSE,,7.60387193563455,6.6491178558716,,,,,15.5132774944395,,6.26978347744592,7.12649489575308,9.79564430250667,2,3
+Kosovo,XKX,2013,10887,1818117,FALSE,,9.92493788526358,6.69192476327224,,,,,,,6.36217201104781,8.30843132426791,8.1435549481557,2,2
+Kosovo,XKX,2014,10887,1812771,FALSE,,5.69543262533989,7.22612750361504,,,,,,,6.80683162514005,6.46078006447746,6.25113212523997,2,2
+Kosovo,XKX,2015,10887,1788196,FALSE,,9.42882007252035,6.26492124438292,,,,,,,5.93363339154711,7.84687065845164,7.68122673203373,2,2
+Kosovo,XKX,2016,10887,1777557,FALSE,,7.17631108504372,6.79322219558492,,,,,,,6.39898456431095,6.98476664031432,6.78764782467734,2,2
+Kosovo,XKX,2017,10887,1791003,FALSE,100,8.25160333890124,7.82461994437839,,,,,,,7.27977290047985,38.6920744277599,7.76568811969055,3,2
+Kosovo,XKX,2018,,1797085,FALSE,100,9.10526199507269,9.08630936728952,,,,,,,8.51926619868103,39.3971904541207,8.81226409687686,3,2
+Kosovo,XKX,2019,,1788878,FALSE,,8.80232548812747,9.11275017534587,,,,,,,8.48901662050314,8.95753783173667,8.6456710543153,2,2
+Kosovo,XKX,2020,,1775378,FALSE,,1.68951912648547,7.96818915644448,,,,,,,7.53297296279022,4.82885414146498,4.61124604463785,2,2
+"Yemen, Rep.",YEM,1990,527970,11709987,FALSE,0,0.490278057299584,,,,,,,,,0.245139028649792,0.490278057299584,2,1
+"Yemen, Rep.",YEM,1991,527970,12302127,FALSE,0,1.00715768052505,,,,,,,,,0.503578840262525,1.00715768052505,2,1
+"Yemen, Rep.",YEM,1992,527970,12954157,FALSE,0,2.43094151765464,,,,,,,3.81240626157142,,2.08111592640869,3.12167388961303,2,2
+"Yemen, Rep.",YEM,1993,527970,13634082,FALSE,0,2.9054832213261,,,,,,,5.79691016990984,,2.90079779707865,4.35119669561797,2,2
+"Yemen, Rep.",YEM,1994,527970,14297617,FALSE,0,0.055955405491893,,,,,,,4.52024539976279,,1.52540026841823,2.28810040262734,2,2
+"Yemen, Rep.",YEM,1995,527970,14913313,FALSE,0,0.641419442987932,,,,,,,4.65542832484485,,1.76561592261093,2.64842388391639,2,2
+"Yemen, Rep.",YEM,1996,527970,15469274,FALSE,0.000105170370912184,0.193633847625654,,,,,,,4.44399270581272,,1.54591057460309,2.31881327671919,2,2
+"Yemen, Rep.",YEM,1997,527970,15975676,FALSE,0.00246364913674353,0.394193651007595,,,,,,,3.83359236330576,,1.41008322115003,2.11389300715668,2,2
+"Yemen, Rep.",YEM,1998,527970,16450306,FALSE,0.00371389866952112,0.595630685885892,,,,,,,1.94207141861596,,0.847138667723792,1.26885105225093,2,2
+"Yemen, Rep.",YEM,1999,527970,16921157,FALSE,0.00876640314843348,0.807650836388174,,,,,,,2.79576749138561,,1.20406157697407,1.80170916388689,2,2
+"Yemen, Rep.",YEM,2000,527970,17409071,FALSE,0.0124135352915255,0.0376978953652978,,,,,,,1.34560236396536,,0.465237931540729,0.691650129665331,2,2
+"Yemen, Rep.",YEM,2001,527970,17918369,FALSE,0.0132743794464323,0.415509314250061,,,,,,,1.0135640498644,,0.480782581186963,0.714536682057228,2,2
+"Yemen, Rep.",YEM,2002,527970,18443684,FALSE,0.0736824515097331,0.338615076031197,,,,,,,1.57337725694992,,0.661891594830284,0.955996166490559,2,2
+"Yemen, Rep.",YEM,2003,527970,18985001,FALSE,0.0834389687951162,0.318818430895527,,,0.53971947261705,,,,0.573691634246896,,0.325316344645846,0.446255032571211,3,2
+"Yemen, Rep.",YEM,2004,527970,19540096,FALSE,0.118133812277245,0.370645311431751,,,0.586294538095301,,,,0.611116892988138,,0.366632005565711,0.490881102209945,3,2
+"Yemen, Rep.",YEM,2005,527970,20107416,FALSE,0.136605387822973,0.71042194296914,1.49493926950188,,0.619672083558098,,,,0.642674277680108,1.50277899196878,0.746160219493526,0.951958404206009,4,3
+"Yemen, Rep.",YEM,2006,527970,20687648,FALSE,0.158000087443483,2.39613395251276,1.79193022846777,,0.687540202743397,,,,0.597561345869038,1.74657207713013,1.23590640357326,1.58008912517064,4,3
+"Yemen, Rep.",YEM,2007,527970,21282514,FALSE,0.61663744298715,1.97175487285263,1.90953724989153,,0.698552915255589,5.67156175811301,,,,1.86944366455211,2.54237283096108,1.92059926870237,5,2
+"Yemen, Rep.",YEM,2008,527970,21892149,FALSE,0.824415067398741,3.57507727056824,2.37843195915846,,0.755736379077625,7.40272856333426,,,,2.31655485098287,3.54516321511493,2.94581606077556,5,2
+"Yemen, Rep.",YEM,2009,527970,22516464,FALSE,1.15870863311584,0.391672960088849,1.80021258865237,,0.74005641428771,8.74808704291474,0.160184889478974,,0.572398259337985,1.6945720855862,2.13854406226479,0.704707048623003,6,4
+"Yemen, Rep.",YEM,2010,527970,23154854,FALSE,1.39714025084309,0.492290486617158,2.04138767566966,0.54154900103655,0.786602340340658,10.7232258627071,0.155768518225047,,0.604217444839149,1.95025844303646,2.27936846284825,0.748816778750873,7,5
+"Yemen, Rep.",YEM,2011,527970,23807586,FALSE,1.63995417404238,1.06055328330628,2.10555697648483,0.598097337822799,0.759520207750901,,0.302995633181566,,0.647108715057326,2.04753956858348,1.05904435331586,0.931258907590291,6,5
+"Yemen, Rep.",YEM,2012,527970,24473176,FALSE,1.86738160027844,0.0407801974568003,2.24395714010003,0.634904035618366,0.694235171722956,,0,,0.265992298325524,2.08455219075347,0.842169211963193,0.605245744430832,6,5
+"Yemen, Rep.",YEM,2013,527970,25147112,FALSE,2.08332475122749,0.242361544484552,2.13604602106927,0.637655932147418,0.717777814738787,,0,,0.295605945900217,2.00367197238647,0.899165699138159,0.635859078983732,6,5
+"Yemen, Rep.",YEM,2014,527970,25823488,FALSE,2.28742433865072,0.415588482367926,2.27386044618592,0.571521803296068,0.703856910229537,,0,,0.438786202786726,2.12414167847873,0.997863545547894,0.710007633385889,6,5
+"Yemen, Rep.",YEM,2015,527970,26497881,FALSE,2.38099225458442,0.0328949457968436,0.835292370446293,0.181009925627617,0.391355227871319,,0,,1.08275791963915,0.76487444966885,0.752157902682387,0.412307448146491,6,5
+"Yemen, Rep.",YEM,2016,527970,27168210,FALSE,2.36985601043647,0.906921886323935,0.780773693468636,,0.213382484610615,,0,,1.29689821727079,0.701040069102041,1.07088996149997,0.726215043174191,5,4
+"Yemen, Rep.",YEM,2017,527970,27834811,FALSE,2.51441251354069,0.434025553457209,,,0.0534093253892002,,0,,0.942303491702834,,0.972685389675183,0.458776348386681,4,3
+"Yemen, Rep.",YEM,2018,527970,28498683,FALSE,,0.439694216460344,,,0.0293223484522874,,0,,,,0.219847108230172,0.219847108230172,3,2
+"Yemen, Rep.",YEM,2019,527970,29161922,FALSE,,0.562962089201269,,,,,,,,,0.562962089201269,0.562962089201269,1,1
+"Yemen, Rep.",YEM,2020,527970,29825968,FALSE,,,,,,,,,,,,,0,0
+South Africa,ZAF,1990,1213090,36800507,FALSE,0,0.123586228143838,3.12961833034961,,,,,,,3.04841515559624,1.08440151949782,1.58600069187004,3,2
+South Africa,ZAF,1991,1213090,37718952,FALSE,0.000922509764275057,0.535545765492842,2.98518694114153,,,,,,,2.87883989579407,1.17388507213288,1.70719283064346,3,2
+South Africa,ZAF,1992,1213090,38672611,FALSE,0.00263278958433173,2.20288160863842,3.12160510946628,,,,,,,2.98284343958441,1.77570650256301,2.59286252411141,3,2
+South Africa,ZAF,1993,1213090,39633754,FALSE,0.00751779602777595,0.335529011959417,3.16632469353677,,,,,,,2.97536895704507,1.16979050050799,1.65544898450224,3,2
+South Africa,ZAF,1994,1213090,40564061,FALSE,0.0159442644584998,1.76772010686255,3.3585285936166,,,,,,,3.15535696392419,1.71406432164588,2.46153853539337,3,2
+South Africa,ZAF,1995,1213090,41435761,FALSE,0.0427820595943149,3.96120230037101,3.91981176730518,1.37178186953932,,,,,,3.68196050549528,2.32389449920246,3.00498155846853,4,3
+South Africa,ZAF,1996,1213090,42241007,FALSE,0.0522074565111249,1.93577826826883,3.90284439924243,1.48997231962223,,,,,,3.66832429847456,1.84520061091116,2.36469162878854,4,3
+South Africa,ZAF,1997,1213090,42987456,FALSE,0.0994531314701258,6.25852072655263,3.98154816412696,1.45955320176173,,,,,,3.76910074681443,2.94976880597786,3.82905822504293,4,3
+South Africa,ZAF,1998,1213090,43682259,FALSE,0.174276416437622,2.19318433199427,3.69868864972177,1.63877019066233,,,,,,3.5226582979779,1.926229897204,2.45153760687817,4,3
+South Africa,ZAF,1999,1213090,44338551,FALSE,0.243184167947304,3.05412549409983,3.45609214647763,1.64956155140644,,,,,,3.33721703075257,2.1007408399828,2.68030135875295,4,3
+South Africa,ZAF,2000,1213090,44967713,FALSE,0.311566778468178,1.21529004665979,3.73233841417362,1.61970780334517,,,,,,3.64131240474112,1.71972576066169,2.15877008491536,4,3
+South Africa,ZAF,2001,1213090,45571272,FALSE,0.364809712604001,10.3798565344809,3.51672189983789,1.5734456187341,,,,,,3.47246696058073,3.95870844141422,5.14192303793191,4,3
+South Africa,ZAF,2002,1213090,46150913,FALSE,0.380871245233249,1.78860321912986,3.60065491963197,1.72265424027143,,,,,,3.4677321557657,1.87319590606663,2.32632987172233,4,3
+South Africa,ZAF,2003,1213090,46719203,FALSE,0.392911424896769,1.25390932182373,4.6579567408916,1.72508414711772,1.82270986027028,,7.72016016047469,,,4.53252882857867,3.1500043590409,3.8079206144987,6,4
+South Africa,ZAF,2004,1213090,47291610,FALSE,0.466666925622537,1.8611837109124,5.96269412232421,1.74913938297414,1.89412486363177,,8.61819030044853,,,5.69319712995806,3.73157488845636,4.48042763107328,6,4
+South Africa,ZAF,2005,1213090,47880595,FALSE,0.409687634527209,6.80733149846273,6.8758672960402,1.90596581341628,2.22454371569386,,7.53289990923734,,,6.63622874887748,4.70635043033675,5.72060649249846,6,4
+South Africa,ZAF,2006,1213090,48489464,FALSE,0.410950109898908,5.92640842979289,8.07750444275412,2.1302879390553,2.16286651200634,,6.69448020206527,0.0374991707668923,,7.81629771004096,4.6479262247133,4.52099469034426,6,5
+South Africa,ZAF,2007,1213090,49119766,FALSE,0.430113801929936,8.54407721919349,9.35261719821538,2.27580538775734,2.25604690593333,,7.19600608714494,0.0503884757889667,,9.19461922791572,5.55972393884822,5.45217927956009,6,5
+South Africa,ZAF,2008,1213090,49779472,FALSE,0.443600863402147,10.5768429786186,10.199361781377,2.37276836407246,2.26255781190997,,7.31800704971373,22.1139196452532,,9.81251963962882,6.18211620743678,10.4388115354574,6,5
+South Africa,ZAF,2009,1213090,50477013,FALSE,0.518945136982352,7.76423211983331,7.8974343839652,2.29254838404284,2.16434610703033,,8.00287642411205,29.0778053173407,0.870814534269336,7.51805658536042,4.55780849720085,9.25438889415977,6,6
+South Africa,ZAF,2010,1213090,51216967,FALSE,1.22747450120949,3.30081158318352,9.9269789113518,2.67946275929773,2.31428547440652,,4.92953459760339,35.8221576363245,,9.40503836421419,4.41285247052919,11.2274009881247,6,5
+South Africa,ZAF,2011,1213090,52003759,FALSE,1.71110201949547,3.62037662391972,11.6078519028658,2.82437837312317,2.37737248663982,,6.31143902605298,39.5138192330406,,11.0285066792744,5.21502958909143,12.6597039870822,6,5
+South Africa,ZAF,2012,1213090,52832659,FALSE,2.03280856535262,6.24679731689292,11.0221644538549,3.00353810280265,2.27040101896194,,5.32492958927525,44.4501631663541,,10.5527065089187,5.52604760563567,13.9156269368487,6,5
+South Africa,ZAF,2013,1213090,53687125,FALSE,2.26880880620287,12.0517891317249,10.5895826374235,3.23832695785871,2.30673416840488,2.72529701730769,7.65872435694577,47.8435969998946,,10.1725516217441,6.4220881512439,16.1929978136336,7,5
+South Africa,ZAF,2014,1213090,54544184,FALSE,2.35322105260847,10.8422898170245,10.0167170917778,3.23463609029997,2.30622575918737,7.90887596184068,6.94324652865311,5.6509210726337,,9.71233363854893,6.88316442370076,7.27668542943204,7,5
+South Africa,ZAF,2015,1213090,55386369,FALSE,2.45549744300183,5.57168307353846,8.57487161340474,3.05865584912875,2.36260185788384,6.60327533255777,7.29351471473599,5.82999851197375,,8.39945449017057,5.59291633772792,6.0306613279095,7,5
+South Africa,ZAF,2016,1213090,56207649,FALSE,2.51659560247793,5.23255061063481,7.77237533446559,3.2665947789584,2.36960852979957,6.15338928696138,8.6628358203549,6.87741012286051,,7.55111726614352,5.60072357230883,6.31810171979043,7,5
+South Africa,ZAF,2017,1213090,57009751,FALSE,2.5807755037831,7.3145947759236,8.62016367123637,3.18950428303462,2.37975027602704,18.1413057274727,5.06130580685721,7.14816891526908,,8.3797324626391,7.48460829471794,6.21866124874472,7,5
+South Africa,ZAF,2018,1213090,57792520,FALSE,2.82831679007333,7.2827770130988,9.1991882693092,3.15238024309936,2.32704546827489,,3.99420248549513,,,9.04027307089546,5.29137296021516,5.86740820314719,6,4
+South Africa,ZAF,2019,1213090,58558267,FALSE,3.05078254627277,6.18436632356181,8.6375490929103,3.06819629364928,,,,,,8.51959749967311,5.23522356409854,5.92405337229473,4,3
+South Africa,ZAF,2020,1213090,59308690,FALSE,,1.44927617908409,7.02530050232318,,,,,,,6.90651780332009,4.23728834070363,4.17789699120209,2,2
+Zambia,ZMB,1990,743390,8036849,FALSE,0,1.10618346632057,0.942595228472424,,,,,,,0.927776553098003,0.682926231597666,1.01698000970929,3,2
+Zambia,ZMB,1991,743390,8246662,FALSE,0,0.182421132754106,0.657295373213774,,,,,,,0.743330930025368,0.279905501989293,0.462876031389737,3,2
+Zambia,ZMB,1992,743390,8451346,FALSE,0,0.233531707390241,,,,,,,,,0.116765853695121,0.233531707390241,2,1
+Zambia,ZMB,1993,743390,8656484,FALSE,0,1.59294297751044,,,,,,,,,0.796471488755218,1.59294297751044,2,1
+Zambia,ZMB,1994,743390,8869745,FALSE,0.0020011704748997,0.197791707640918,,,,,,,,,0.0998964390579091,0.197791707640918,2,1
+Zambia,ZMB,1995,743390,9096608,FALSE,0.00252935216621386,0.515897615512772,,0.216223193338654,,,,,1.39596511301475,,0.532653818508098,0.709361973955392,3,3
+Zambia,ZMB,1996,743390,9339740,FALSE,0.00254359602457837,0.596856581277838,,0.341924744852791,,,,,2.05118906345233,,0.748128496401883,0.996656796527652,3,3
+Zambia,ZMB,1997,743390,9597610,FALSE,0.00254634778190044,0.947774187665163,0.60728480273424,0.430159837040573,,,,,3.54303254249274,0.59352948741842,1.10615954354292,1.37862401365422,4,4
+Zambia,ZMB,1998,743390,9866474,FALSE,0.0080248408024695,0.880161641225935,0.493021512743636,0.444254226462142,,,,,3.25224906221307,0.482776814322766,1.01554225668945,1.26486043605598,4,4
+Zambia,ZMB,1999,743390,10140564,FALSE,0.0379863338223865,0.70066774787403,0.452083133495482,0.482521362048465,,,,,3.36810453677379,0.428352973711913,1.00827262280283,1.24491165510205,4,4
+Zambia,ZMB,2000,743390,10415942,FALSE,0.0480521450235052,0.512449705949668,0.469296467246307,0.531539098016055,,,,,3.92527885895729,0.452984954950663,1.09732325503856,1.35556315446842,4,4
+Zambia,ZMB,2001,743390,10692197,FALSE,0.0571143815696861,0.594785364116414,0.56709725440987,0.557533454579315,,,,,5.175412370635,0.527594712415914,1.39038856506206,1.71383147543666,4,4
+Zambia,ZMB,2002,743390,10971704,FALSE,0.11406240691586,1.19280487363432,0.553636757027187,0.624119314990127,,,,,6.05983238515665,0.538247360067025,1.70889114754483,2.10375098346203,4,4
+Zambia,ZMB,2003,743390,11256740,FALSE,0.228161594986052,1.35199804168804,0.616936788242675,0.444244807074633,0.933299620259062,,2.24288569169059,,6.3964792645039,0.56965248608738,1.88011769803098,2.20105205820891,6,5
+Zambia,ZMB,2004,743390,11550641,FALSE,0.456637238903816,1.47722753292958,0.852301872225108,0.540178943709529,0.963610903100889,,,,7.56508718671592,0.813148023560085,2.17828655489679,2.59891042172878,5,4
+Zambia,ZMB,2005,743390,11856244,FALSE,0.630056882606009,1.32040546696314,1.06407865254157,0.684007069490165,1.05242467509402,,1.82526471147049,,7.88712561166582,1.02909149912617,2.23515639912287,2.54917887174316,6,5
+Zambia,ZMB,2006,743390,12173518,FALSE,0.895124163320852,2.21858336692371,1.49177256862985,0.75395740793338,1.14514664823209,,,0.00169750116924771,7.44112747006985,1.50251684266881,2.56011299537553,2.383576517753,5,5
+Zambia,ZMB,2007,743390,12502958,FALSE,1.0203079789069,4.64410074978398,1.83382918580253,0.870078077491646,1.39447884285605,,1.44237759468491,0.020784992806593,,1.8558712062685,1.96213871733399,1.76664252420713,6,5
+Zambia,ZMB,2008,743390,12848531,FALSE,1.13150010972371,3.20402244762938,2.03733573407126,0.766272103993184,1.2840394640244,,1.40358352923665,0.0228504052876744,,2.01078998230502,1.70854278493084,1.48150369369038,6,5
+Zambia,ZMB,2009,743390,13215142,FALSE,1.25075606971496,3.20055781302429,1.60714537338142,0.651211028852577,1.04692537737592,,1.36464568345058,0.0251677970493743,9.81068220497129,1.46244693615273,2.98083302889919,2.75245191058347,6,6
+Zambia,ZMB,2010,743390,13605986,FALSE,1.92524087748914,9.10545249961095,2.38981919044634,0.726210800021467,1.22360547463623,,1.85562303835099,0.026858073574381,12.7270389850668,2.29382265557603,4.78823089849762,4.45583434203344,6,6
+Zambia,ZMB,2011,743390,14023199,FALSE,2.14815610115828,3.47133060505016,2.88939889889108,0.795520581064833,1.32417505833422,1.67670024319666,1.54321305600696,0.153069119286349,14.6178033292224,2.69461411726083,3.87744611637005,3.87925846798192,7,6
+Zambia,ZMB,2012,743390,14465148,FALSE,,7.37818108010211,3.26901977292776,0.719942555084719,1.31381468829326,1.98193378029501,1.24671980449052,0.261577898640155,14.4580069612054,2.9006701776033,4.84230065901758,4.49418307952103,6,6
+Zambia,ZMB,2013,743390,14926551,FALSE,,7.37304359833595,3.62760143693276,0.74321863157591,1.50237998282858,2.05738645537401,1.44981809821866,0.460183780606782,15.9475311109276,3.32809666611291,5.19976655522749,4.88364864762964,6,6
+Zambia,ZMB,2014,743390,15399793,FALSE,,7.07393333170702,3.31024993033492,0.745577409375605,1.4279721030619,2.17344436921509,1.4052645891918,0.466911792124999,16.6568070933222,3.09527585934666,5.22754612052443,4.90729501251138,6,6
+Zambia,ZMB,2015,743390,15879370,FALSE,,4.76239250837326,2.56636614520957,0.711540912693916,1.49005490056946,1.32869082702453,0.454274608790814,0.479889770984394,18.6851887137073,2.28233595825432,4.75140895263324,4.56260374546734,6,6
+Zambia,ZMB,2016,743390,16363449,FALSE,,2.25020720647775,2.23196944986653,0.708265657093584,1.49534321657041,1.23781627517331,1.54292539922855,0.719759122640998,20.3197337756845,2.04357084902431,4.71515296058737,4.59741033502495,6,6
+Zambia,ZMB,2017,743390,16853608,FALSE,,3.06965238123602,2.51889986092366,0.725826688677433,1.54181731804942,0.783841160864508,1.07003713902011,1.12307768740149,24.7254861131992,2.35429513247969,5.48229055732016,5.51139585700233,6,6
+Zambia,ZMB,2018,743390,17351714,FALSE,2.15878137527642,1.14694939410602,2.77536944649629,0.749055457149917,1.45356237634445,,1.66291228511364,,,2.47310088188818,1.69861359162846,1.50800450456444,6,4
+Zambia,ZMB,2019,743390,17861034,FALSE,2.78651957153855,3.05517679218349,2.16922546052244,0.859600852420994,,,,,,1.94440456664111,2.21763066916637,1.95306073708186,4,3
+Zambia,ZMB,2020,743390,18383956,FALSE,,0.0624237742838362,1.85651003249498,,,,,,,1.67892929041467,0.95946690338941,0.870676532349254,2,2
+Zimbabwe,ZWE,1990,386850,10432409,FALSE,0,0.124045986128028,0.8915510274779,,,,,,,0.829635383454704,0.338532337868643,0.476840684791366,3,2
+Zimbabwe,ZWE,1991,386850,10681008,FALSE,0,0.05991240283906,0.921419494001642,,,,,,,0.85333881303455,0.327110632280234,0.456625607936805,3,2
+Zimbabwe,ZWE,1992,386850,10900511,FALSE,0,0.0778558194649715,0.90991044526955,,,,,,,0.846745747625534,0.329255421578174,0.462300783545253,3,2
+Zimbabwe,ZWE,1993,386850,11092775,FALSE,0,0.137020837684373,0.840369242608808,,,,,,,0.783558107023069,0.32579669343106,0.460289472353721,3,2
+Zimbabwe,ZWE,1994,386850,11261752,FALSE,0.000404555991683085,0.153347860560689,1.00478769992478,,,,,,1.25227413103361,0.931616758407769,0.60270356187769,0.779079583334023,3,3
+Zimbabwe,ZWE,1995,386850,11410721,FALSE,0.00176385696279164,0.503905185957384,,1.77857347271049,,,,,2.56600805491982,,1.21256264263762,1.61616223786256,3,3
+Zimbabwe,ZWE,1996,386850,11541215,FALSE,0.00381089319826088,0.501247808624189,,1.75213166680809,,,,,,,0.752396789543514,1.12668973771614,3,2
+Zimbabwe,ZWE,1997,386850,11653254,FALSE,0.00743597079222149,0.614607980343849,,1.51948441279161,,,,,,,0.713842787975893,1.06704619656773,3,2
+Zimbabwe,ZWE,1998,386850,11747079,FALSE,0.0182067859923835,1.69095345804466,,2.38013887345227,,,,,1.15536119716823,,1.31116507866439,1.74215117622172,3,3
+Zimbabwe,ZWE,1999,386850,11822722,FALSE,0.0358213462998364,0.252261316540484,,2.65054885179846,,,,,1.08204585518858,,1.00516934245684,1.32828534117584,3,3
+Zimbabwe,ZWE,2000,386850,11881482,FALSE,0.0885030279347838,0.113325327816024,,2.00966256751834,,,,,1.67925835650758,,0.972687319944182,1.26741541728065,3,3
+Zimbabwe,ZWE,2001,386850,11923906,FALSE,0.175712619223023,0.0290581372373428,,2.25720480130826,,,,,1.68691978643471,,1.03722383605083,1.3243942416601,3,3
+Zimbabwe,ZWE,2002,386850,11954293,FALSE,0.241037094107694,0.106764855286265,,2.07261214194386,,,,,1.70652770950526,,1.03173545021077,1.29530156891179,3,3
+Zimbabwe,ZWE,2003,386850,11982219,FALSE,0.393505082542231,0.0146413782780093,,2.6770914442065,1.1250050973428,,2.10708726664745,,2.1100129342664,,1.46046762118812,1.72720825584959,5,4
+Zimbabwe,ZWE,2004,386850,12019911,FALSE,0.457649652265016,0.031748787174981,,2.37560268968709,1.14655334235923,,,,2.67750486969038,,1.38562649970437,1.69495211551749,4,3
+Zimbabwe,ZWE,2005,386850,12076697,FALSE,0.520568836179196,0.377334574237308,,2.04354313581558,1.25197157487231,,,,3.04202268649763,,1.49586730818243,1.82096679885017,4,3
+Zimbabwe,ZWE,2006,386850,12155496,FALSE,0.517194205993634,0.14436273109645,,2.82479338064094,1.36725172152152,2.62824419977252,,0.0032095475176821,3.2656334913198,,1.87604560176467,1.55949978764372,5,4
+Zimbabwe,ZWE,2007,386850,12255920,FALSE,0.641195449033894,0.257659287740218,,3.02465336023916,1.31743123601786,,,0.0033020985574691,,,1.30783603233776,1.09520491551228,4,3
+Zimbabwe,ZWE,2008,386850,12379553,FALSE,0.740590564862135,0.211154586497215,,2.49986072122835,1.28801660353179,2.46871379909872,,0.0070620521802036,,,1.4800799179216,0.906025786635257,5,3
+Zimbabwe,ZWE,2009,386850,12526964,FALSE,0.836429335176343,0.367623015118422,1.02183958559357,2.56643126507313,1.15758431952817,5.54370934214453,0.287922699969226,0.0168783861856075,3.2072379749464,0.904479355088542,1.97588474543166,1.22509544939689,7,6
+Zimbabwe,ZWE,2010,386850,12697728,FALSE,1.32028913144751,0.572986887786546,1.86248905791127,2.76246287279638,1.31051110839248,4.75294557964996,0,0.0249725895834718,2.5063616034264,1.64326403036043,1.96821930471687,1.25167466399221,7,6
+Zimbabwe,ZWE,2011,386850,12894323,FALSE,1.70645890890323,1.3163508038135,2.6158270498497,2.93418299647938,1.47070858691571,6.20385414046279,1.39859894051719,0.199092201363799,2.22234800921615,2.32038811959498,2.6282315498917,1.73182684516417,7,6
+Zimbabwe,ZWE,2012,386850,13115149,FALSE,2.3967520697549,1.33381497923589,2.30327870306839,2.32714936658443,1.46403811023443,6.02744798628646,0.550020026047329,0.346821772057499,1.62394182665702,2.05232215751881,2.36605785109063,1.37234502135016,7,6
+Zimbabwe,ZWE,2013,386850,13350378,FALSE,3.04125775763837,1.31425589982601,2.23741785318198,4.34712016211802,1.7492268615781,5.77512634104761,1.08065773037956,0.497925900845706,1.58364096671641,1.99288071482203,2.76849667298685,1.80274689578462,7,6
+Zimbabwe,ZWE,2014,386850,13586710,FALSE,3.15507652162601,1.75866052743416,2.09245241788847,4.52451156275598,1.3056264434202,5.10407723376358,2.12372078143851,0.617656008590985,1.87890724443919,1.87278663021306,2.94820089847799,2.12937379247865,7,6
+Zimbabwe,ZWE,2015,386850,13814642,FALSE,4.31240694654643,1.33723566373536,1.91991605775183,4.79102560756872,1.50193567957027,4.29250959951975,2.87193618700146,0.834194702514774,1.60163897249732,1.72466491877998,3.01809557637441,2.19344934201627,7,6
+Zimbabwe,ZWE,2016,386850,14030338,FALSE,4.31652821726897,1.16228529613553,1.7294313709735,4.63942306679062,1.51025924490256,3.11929102725701,1.28535652430373,1.70744698466272,,1.56135233423954,2.70871925045489,2.07117284122643,7,5
+Zimbabwe,ZWE,2017,386850,14236599,FALSE,4.48950715257329,0.891622212050521,1.80793248971642,4.4279795212588,1.62023199565629,2.44992174189892,0.506693669927389,2.45712915278175,,1.62826871145804,2.42894279790422,1.9823386534953,7,5
+Zimbabwe,ZWE,2018,386850,14438812,FALSE,4.53548401796231,2.34321697867776,2.11034895380961,4.09419306783079,1.73264132479708,,0.499597514989086,,,1.88220640343439,2.71656810665391,2.204803491233,6,4
+Zimbabwe,ZWE,2019,386850,14645473,FALSE,4.48937013291546,0.938344730197489,1.72399727274878,4.61785722850837,,,,,,1.54938203181978,2.94239234109253,2.36852799684188,4,3
+Zimbabwe,ZWE,2020,386850,14862927,FALSE,,,1.71240621242626,,,,,,,1.55532975783407,1.71240621242626,1.55532975783407,1,1
diff --git a/data_processed/KGI.xlsx b/data_processed/KGI.xlsx
new file mode 100644
index 0000000..9a8ca76
Binary files /dev/null and b/data_processed/KGI.xlsx differ
diff --git a/rsconnect/shinyapps.io/milanschroeder/data-project-globalization_dashboard.dcf b/rsconnect/shinyapps.io/milanschroeder/data-project-globalization_dashboard.dcf
new file mode 100644
index 0000000..4499822
--- /dev/null
+++ b/rsconnect/shinyapps.io/milanschroeder/data-project-globalization_dashboard.dcf
@@ -0,0 +1,14 @@
+name: data-project-globalization_dashboard
+title: data-project-globalization_dashboard
+username:
+account: milanschroeder
+server: shinyapps.io
+hostUrl: https://api.shinyapps.io/v1
+appId: 5362792
+bundleId: 5401322
+url: https://milanschroeder.shinyapps.io/data-project-globalization_dashboard/
+when: 1640185049.66056
+lastSyncTime: 1640185049.66056
+asMultiple: FALSE
+asStatic: FALSE
+ignoredFiles: data